R version 4.4.0 beta (2024-04-15 r86425 ucrt) -- "Puppy Cup" Copyright (C) 2024 The R Foundation for Statistical Computing Platform: x86_64-w64-mingw32/x64 R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details. R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications. Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R. > source("incl/start.R") Loading required package: future [13:30:35.700] plan(): Setting new future strategy stack: [13:30:35.702] List of future strategies: [13:30:35.702] 1. mirai_multisession: [13:30:35.702] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:30:35.702] - tweaked: FALSE [13:30:35.702] - call: future::plan(future.mirai::mirai_multisession) [13:30:35.715] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:30:35.716] < mirai | $data > [13:30:35.720] getGlobalsAndPackages() ... [13:30:35.721] Not searching for globals [13:30:35.721] - globals: [0] [13:30:35.721] getGlobalsAndPackages() ... DONE [13:30:35.722] getGlobalsAndPackages() ... [13:30:35.722] [13:30:35.722] - globals: [0] [13:30:35.722] getGlobalsAndPackages() ... DONE [13:30:35.999] Packages needed by the future expression (n = 0): [13:30:35.999] Packages needed by future strategies (n = 0): [13:30:36.000] { [13:30:36.000] { [13:30:36.000] { [13:30:36.000] ...future.startTime <- base::Sys.time() [13:30:36.000] { [13:30:36.000] { [13:30:36.000] { [13:30:36.000] base::local({ [13:30:36.000] has_future <- base::requireNamespace("future", [13:30:36.000] quietly = TRUE) [13:30:36.000] if (has_future) { [13:30:36.000] ns <- base::getNamespace("future") [13:30:36.000] version <- ns[[".package"]][["version"]] [13:30:36.000] if (is.null(version)) [13:30:36.000] version <- utils::packageVersion("future") [13:30:36.000] } [13:30:36.000] else { [13:30:36.000] version <- NULL [13:30:36.000] } [13:30:36.000] if (!has_future || version < "1.8.0") { [13:30:36.000] info <- base::c(r_version = base::gsub("R version ", [13:30:36.000] "", base::R.version$version.string), [13:30:36.000] platform = base::sprintf("%s (%s-bit)", [13:30:36.000] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:36.000] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:36.000] "release", "version")], collapse = " "), [13:30:36.000] hostname = base::Sys.info()[["nodename"]]) [13:30:36.000] info <- base::sprintf("%s: %s", base::names(info), [13:30:36.000] info) [13:30:36.000] info <- base::paste(info, collapse = "; ") [13:30:36.000] if (!has_future) { [13:30:36.000] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:36.000] info) [13:30:36.000] } [13:30:36.000] else { [13:30:36.000] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:36.000] info, version) [13:30:36.000] } [13:30:36.000] base::stop(msg) [13:30:36.000] } [13:30:36.000] }) [13:30:36.000] } [13:30:36.000] ...future.strategy.old <- future::plan("list") [13:30:36.000] options(future.plan = NULL) [13:30:36.000] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.000] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:36.000] } [13:30:36.000] ...future.workdir <- getwd() [13:30:36.000] } [13:30:36.000] ...future.oldOptions <- base::as.list(base::.Options) [13:30:36.000] ...future.oldEnvVars <- base::Sys.getenv() [13:30:36.000] } [13:30:36.000] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:36.000] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:36.000] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:36.000] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:36.000] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:36.000] future.stdout.windows.reencode = NULL, width = 80L) [13:30:36.000] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:36.000] base::names(...future.oldOptions)) [13:30:36.000] } [13:30:36.000] if (FALSE) { [13:30:36.000] } [13:30:36.000] else { [13:30:36.000] if (TRUE) { [13:30:36.000] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:36.000] open = "w") [13:30:36.000] } [13:30:36.000] else { [13:30:36.000] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:36.000] windows = "NUL", "/dev/null"), open = "w") [13:30:36.000] } [13:30:36.000] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:36.000] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:36.000] base::sink(type = "output", split = FALSE) [13:30:36.000] base::close(...future.stdout) [13:30:36.000] }, add = TRUE) [13:30:36.000] } [13:30:36.000] ...future.frame <- base::sys.nframe() [13:30:36.000] ...future.conditions <- base::list() [13:30:36.000] ...future.rng <- base::globalenv()$.Random.seed [13:30:36.000] if (FALSE) { [13:30:36.000] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:36.000] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:36.000] } [13:30:36.000] ...future.result <- base::tryCatch({ [13:30:36.000] base::withCallingHandlers({ [13:30:36.000] ...future.value <- base::withVisible(base::local(NA)) [13:30:36.000] future::FutureResult(value = ...future.value$value, [13:30:36.000] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.000] ...future.rng), globalenv = if (FALSE) [13:30:36.000] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:36.000] ...future.globalenv.names)) [13:30:36.000] else NULL, started = ...future.startTime, version = "1.8") [13:30:36.000] }, condition = base::local({ [13:30:36.000] c <- base::c [13:30:36.000] inherits <- base::inherits [13:30:36.000] invokeRestart <- base::invokeRestart [13:30:36.000] length <- base::length [13:30:36.000] list <- base::list [13:30:36.000] seq.int <- base::seq.int [13:30:36.000] signalCondition <- base::signalCondition [13:30:36.000] sys.calls <- base::sys.calls [13:30:36.000] `[[` <- base::`[[` [13:30:36.000] `+` <- base::`+` [13:30:36.000] `<<-` <- base::`<<-` [13:30:36.000] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:36.000] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:36.000] 3L)] [13:30:36.000] } [13:30:36.000] function(cond) { [13:30:36.000] is_error <- inherits(cond, "error") [13:30:36.000] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:36.000] NULL) [13:30:36.000] if (is_error) { [13:30:36.000] sessionInformation <- function() { [13:30:36.000] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:36.000] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:36.000] search = base::search(), system = base::Sys.info()) [13:30:36.000] } [13:30:36.000] ...future.conditions[[length(...future.conditions) + [13:30:36.000] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:36.000] cond$call), session = sessionInformation(), [13:30:36.000] timestamp = base::Sys.time(), signaled = 0L) [13:30:36.000] signalCondition(cond) [13:30:36.000] } [13:30:36.000] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:36.000] signal <- FALSE && inherits(cond, character(0)) [13:30:36.000] ...future.conditions[[length(...future.conditions) + [13:30:36.000] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:36.000] if (FALSE && !signal) { [13:30:36.000] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.000] { [13:30:36.000] inherits <- base::inherits [13:30:36.000] invokeRestart <- base::invokeRestart [13:30:36.000] is.null <- base::is.null [13:30:36.000] muffled <- FALSE [13:30:36.000] if (inherits(cond, "message")) { [13:30:36.000] muffled <- grepl(pattern, "muffleMessage") [13:30:36.000] if (muffled) [13:30:36.000] invokeRestart("muffleMessage") [13:30:36.000] } [13:30:36.000] else if (inherits(cond, "warning")) { [13:30:36.000] muffled <- grepl(pattern, "muffleWarning") [13:30:36.000] if (muffled) [13:30:36.000] invokeRestart("muffleWarning") [13:30:36.000] } [13:30:36.000] else if (inherits(cond, "condition")) { [13:30:36.000] if (!is.null(pattern)) { [13:30:36.000] computeRestarts <- base::computeRestarts [13:30:36.000] grepl <- base::grepl [13:30:36.000] restarts <- computeRestarts(cond) [13:30:36.000] for (restart in restarts) { [13:30:36.000] name <- restart$name [13:30:36.000] if (is.null(name)) [13:30:36.000] next [13:30:36.000] if (!grepl(pattern, name)) [13:30:36.000] next [13:30:36.000] invokeRestart(restart) [13:30:36.000] muffled <- TRUE [13:30:36.000] break [13:30:36.000] } [13:30:36.000] } [13:30:36.000] } [13:30:36.000] invisible(muffled) [13:30:36.000] } [13:30:36.000] muffleCondition(cond, pattern = "^muffle") [13:30:36.000] } [13:30:36.000] } [13:30:36.000] else { [13:30:36.000] if (TRUE) { [13:30:36.000] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.000] { [13:30:36.000] inherits <- base::inherits [13:30:36.000] invokeRestart <- base::invokeRestart [13:30:36.000] is.null <- base::is.null [13:30:36.000] muffled <- FALSE [13:30:36.000] if (inherits(cond, "message")) { [13:30:36.000] muffled <- grepl(pattern, "muffleMessage") [13:30:36.000] if (muffled) [13:30:36.000] invokeRestart("muffleMessage") [13:30:36.000] } [13:30:36.000] else if (inherits(cond, "warning")) { [13:30:36.000] muffled <- grepl(pattern, "muffleWarning") [13:30:36.000] if (muffled) [13:30:36.000] invokeRestart("muffleWarning") [13:30:36.000] } [13:30:36.000] else if (inherits(cond, "condition")) { [13:30:36.000] if (!is.null(pattern)) { [13:30:36.000] computeRestarts <- base::computeRestarts [13:30:36.000] grepl <- base::grepl [13:30:36.000] restarts <- computeRestarts(cond) [13:30:36.000] for (restart in restarts) { [13:30:36.000] name <- restart$name [13:30:36.000] if (is.null(name)) [13:30:36.000] next [13:30:36.000] if (!grepl(pattern, name)) [13:30:36.000] next [13:30:36.000] invokeRestart(restart) [13:30:36.000] muffled <- TRUE [13:30:36.000] break [13:30:36.000] } [13:30:36.000] } [13:30:36.000] } [13:30:36.000] invisible(muffled) [13:30:36.000] } [13:30:36.000] muffleCondition(cond, pattern = "^muffle") [13:30:36.000] } [13:30:36.000] } [13:30:36.000] } [13:30:36.000] })) [13:30:36.000] }, error = function(ex) { [13:30:36.000] base::structure(base::list(value = NULL, visible = NULL, [13:30:36.000] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.000] ...future.rng), started = ...future.startTime, [13:30:36.000] finished = Sys.time(), session_uuid = NA_character_, [13:30:36.000] version = "1.8"), class = "FutureResult") [13:30:36.000] }, finally = { [13:30:36.000] if (!identical(...future.workdir, getwd())) [13:30:36.000] setwd(...future.workdir) [13:30:36.000] { [13:30:36.000] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:36.000] ...future.oldOptions$nwarnings <- NULL [13:30:36.000] } [13:30:36.000] base::options(...future.oldOptions) [13:30:36.000] if (.Platform$OS.type == "windows") { [13:30:36.000] old_names <- names(...future.oldEnvVars) [13:30:36.000] envs <- base::Sys.getenv() [13:30:36.000] names <- names(envs) [13:30:36.000] common <- intersect(names, old_names) [13:30:36.000] added <- setdiff(names, old_names) [13:30:36.000] removed <- setdiff(old_names, names) [13:30:36.000] changed <- common[...future.oldEnvVars[common] != [13:30:36.000] envs[common]] [13:30:36.000] NAMES <- toupper(changed) [13:30:36.000] args <- list() [13:30:36.000] for (kk in seq_along(NAMES)) { [13:30:36.000] name <- changed[[kk]] [13:30:36.000] NAME <- NAMES[[kk]] [13:30:36.000] if (name != NAME && is.element(NAME, old_names)) [13:30:36.000] next [13:30:36.000] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.000] } [13:30:36.000] NAMES <- toupper(added) [13:30:36.000] for (kk in seq_along(NAMES)) { [13:30:36.000] name <- added[[kk]] [13:30:36.000] NAME <- NAMES[[kk]] [13:30:36.000] if (name != NAME && is.element(NAME, old_names)) [13:30:36.000] next [13:30:36.000] args[[name]] <- "" [13:30:36.000] } [13:30:36.000] NAMES <- toupper(removed) [13:30:36.000] for (kk in seq_along(NAMES)) { [13:30:36.000] name <- removed[[kk]] [13:30:36.000] NAME <- NAMES[[kk]] [13:30:36.000] if (name != NAME && is.element(NAME, old_names)) [13:30:36.000] next [13:30:36.000] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.000] } [13:30:36.000] if (length(args) > 0) [13:30:36.000] base::do.call(base::Sys.setenv, args = args) [13:30:36.000] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:36.000] } [13:30:36.000] else { [13:30:36.000] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:36.000] } [13:30:36.000] { [13:30:36.000] if (base::length(...future.futureOptionsAdded) > [13:30:36.000] 0L) { [13:30:36.000] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:36.000] base::names(opts) <- ...future.futureOptionsAdded [13:30:36.000] base::options(opts) [13:30:36.000] } [13:30:36.000] { [13:30:36.000] NULL [13:30:36.000] options(future.plan = NULL) [13:30:36.000] if (is.na(NA_character_)) [13:30:36.000] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.000] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:36.000] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:36.000] .init = FALSE) [13:30:36.000] } [13:30:36.000] } [13:30:36.000] } [13:30:36.000] }) [13:30:36.000] if (TRUE) { [13:30:36.000] base::sink(type = "output", split = FALSE) [13:30:36.000] if (TRUE) { [13:30:36.000] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:36.000] } [13:30:36.000] else { [13:30:36.000] ...future.result["stdout"] <- base::list(NULL) [13:30:36.000] } [13:30:36.000] base::close(...future.stdout) [13:30:36.000] ...future.stdout <- NULL [13:30:36.000] } [13:30:36.000] ...future.result$conditions <- ...future.conditions [13:30:36.000] ...future.result$finished <- base::Sys.time() [13:30:36.000] ...future.result [13:30:36.000] } [13:30:36.105] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:30:36.105] 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:30:36.114] - plan('mirai_cluster') ...[13:30:36.115] plan(): Setting new future strategy stack: [13:30:36.115] List of future strategies: [13:30:36.115] 1. mirai_cluster: [13:30:36.115] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = "") [13:30:36.115] - tweaked: FALSE [13:30:36.115] - call: plan(strategy) [13:30:36.129] plan(): plan_init() of 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:30:36.129] < mirai | $data > [13:30:36.130] getGlobalsAndPackages() ... [13:30:36.130] Not searching for globals [13:30:36.130] - globals: [0] [13:30:36.130] getGlobalsAndPackages() ... DONE [13:30:36.130] getGlobalsAndPackages() ... [13:30:36.130] [13:30:36.131] - globals: [0] [13:30:36.131] getGlobalsAndPackages() ... DONE [13:30:36.131] Packages needed by the future expression (n = 0): [13:30:36.131] Packages needed by future strategies (n = 0): [13:30:36.132] { [13:30:36.132] { [13:30:36.132] { [13:30:36.132] ...future.startTime <- base::Sys.time() [13:30:36.132] { [13:30:36.132] { [13:30:36.132] { [13:30:36.132] base::local({ [13:30:36.132] has_future <- base::requireNamespace("future", [13:30:36.132] quietly = TRUE) [13:30:36.132] if (has_future) { [13:30:36.132] ns <- base::getNamespace("future") [13:30:36.132] version <- ns[[".package"]][["version"]] [13:30:36.132] if (is.null(version)) [13:30:36.132] version <- utils::packageVersion("future") [13:30:36.132] } [13:30:36.132] else { [13:30:36.132] version <- NULL [13:30:36.132] } [13:30:36.132] if (!has_future || version < "1.8.0") { [13:30:36.132] info <- base::c(r_version = base::gsub("R version ", [13:30:36.132] "", base::R.version$version.string), [13:30:36.132] platform = base::sprintf("%s (%s-bit)", [13:30:36.132] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:36.132] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:36.132] "release", "version")], collapse = " "), [13:30:36.132] hostname = base::Sys.info()[["nodename"]]) [13:30:36.132] info <- base::sprintf("%s: %s", base::names(info), [13:30:36.132] info) [13:30:36.132] info <- base::paste(info, collapse = "; ") [13:30:36.132] if (!has_future) { [13:30:36.132] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:36.132] info) [13:30:36.132] } [13:30:36.132] else { [13:30:36.132] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:36.132] info, version) [13:30:36.132] } [13:30:36.132] base::stop(msg) [13:30:36.132] } [13:30:36.132] }) [13:30:36.132] } [13:30:36.132] ...future.strategy.old <- future::plan("list") [13:30:36.132] options(future.plan = NULL) [13:30:36.132] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.132] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:36.132] } [13:30:36.132] ...future.workdir <- getwd() [13:30:36.132] } [13:30:36.132] ...future.oldOptions <- base::as.list(base::.Options) [13:30:36.132] ...future.oldEnvVars <- base::Sys.getenv() [13:30:36.132] } [13:30:36.132] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:36.132] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:36.132] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:36.132] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:36.132] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:36.132] future.stdout.windows.reencode = NULL, width = 80L) [13:30:36.132] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:36.132] base::names(...future.oldOptions)) [13:30:36.132] } [13:30:36.132] if (FALSE) { [13:30:36.132] } [13:30:36.132] else { [13:30:36.132] if (TRUE) { [13:30:36.132] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:36.132] open = "w") [13:30:36.132] } [13:30:36.132] else { [13:30:36.132] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:36.132] windows = "NUL", "/dev/null"), open = "w") [13:30:36.132] } [13:30:36.132] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:36.132] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:36.132] base::sink(type = "output", split = FALSE) [13:30:36.132] base::close(...future.stdout) [13:30:36.132] }, add = TRUE) [13:30:36.132] } [13:30:36.132] ...future.frame <- base::sys.nframe() [13:30:36.132] ...future.conditions <- base::list() [13:30:36.132] ...future.rng <- base::globalenv()$.Random.seed [13:30:36.132] if (FALSE) { [13:30:36.132] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:36.132] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:36.132] } [13:30:36.132] ...future.result <- base::tryCatch({ [13:30:36.132] base::withCallingHandlers({ [13:30:36.132] ...future.value <- base::withVisible(base::local(NA)) [13:30:36.132] future::FutureResult(value = ...future.value$value, [13:30:36.132] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.132] ...future.rng), globalenv = if (FALSE) [13:30:36.132] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:36.132] ...future.globalenv.names)) [13:30:36.132] else NULL, started = ...future.startTime, version = "1.8") [13:30:36.132] }, condition = base::local({ [13:30:36.132] c <- base::c [13:30:36.132] inherits <- base::inherits [13:30:36.132] invokeRestart <- base::invokeRestart [13:30:36.132] length <- base::length [13:30:36.132] list <- base::list [13:30:36.132] seq.int <- base::seq.int [13:30:36.132] signalCondition <- base::signalCondition [13:30:36.132] sys.calls <- base::sys.calls [13:30:36.132] `[[` <- base::`[[` [13:30:36.132] `+` <- base::`+` [13:30:36.132] `<<-` <- base::`<<-` [13:30:36.132] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:36.132] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:36.132] 3L)] [13:30:36.132] } [13:30:36.132] function(cond) { [13:30:36.132] is_error <- inherits(cond, "error") [13:30:36.132] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:36.132] NULL) [13:30:36.132] if (is_error) { [13:30:36.132] sessionInformation <- function() { [13:30:36.132] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:36.132] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:36.132] search = base::search(), system = base::Sys.info()) [13:30:36.132] } [13:30:36.132] ...future.conditions[[length(...future.conditions) + [13:30:36.132] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:36.132] cond$call), session = sessionInformation(), [13:30:36.132] timestamp = base::Sys.time(), signaled = 0L) [13:30:36.132] signalCondition(cond) [13:30:36.132] } [13:30:36.132] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:36.132] signal <- FALSE && inherits(cond, character(0)) [13:30:36.132] ...future.conditions[[length(...future.conditions) + [13:30:36.132] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:36.132] if (FALSE && !signal) { [13:30:36.132] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.132] { [13:30:36.132] inherits <- base::inherits [13:30:36.132] invokeRestart <- base::invokeRestart [13:30:36.132] is.null <- base::is.null [13:30:36.132] muffled <- FALSE [13:30:36.132] if (inherits(cond, "message")) { [13:30:36.132] muffled <- grepl(pattern, "muffleMessage") [13:30:36.132] if (muffled) [13:30:36.132] invokeRestart("muffleMessage") [13:30:36.132] } [13:30:36.132] else if (inherits(cond, "warning")) { [13:30:36.132] muffled <- grepl(pattern, "muffleWarning") [13:30:36.132] if (muffled) [13:30:36.132] invokeRestart("muffleWarning") [13:30:36.132] } [13:30:36.132] else if (inherits(cond, "condition")) { [13:30:36.132] if (!is.null(pattern)) { [13:30:36.132] computeRestarts <- base::computeRestarts [13:30:36.132] grepl <- base::grepl [13:30:36.132] restarts <- computeRestarts(cond) [13:30:36.132] for (restart in restarts) { [13:30:36.132] name <- restart$name [13:30:36.132] if (is.null(name)) [13:30:36.132] next [13:30:36.132] if (!grepl(pattern, name)) [13:30:36.132] next [13:30:36.132] invokeRestart(restart) [13:30:36.132] muffled <- TRUE [13:30:36.132] break [13:30:36.132] } [13:30:36.132] } [13:30:36.132] } [13:30:36.132] invisible(muffled) [13:30:36.132] } [13:30:36.132] muffleCondition(cond, pattern = "^muffle") [13:30:36.132] } [13:30:36.132] } [13:30:36.132] else { [13:30:36.132] if (TRUE) { [13:30:36.132] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.132] { [13:30:36.132] inherits <- base::inherits [13:30:36.132] invokeRestart <- base::invokeRestart [13:30:36.132] is.null <- base::is.null [13:30:36.132] muffled <- FALSE [13:30:36.132] if (inherits(cond, "message")) { [13:30:36.132] muffled <- grepl(pattern, "muffleMessage") [13:30:36.132] if (muffled) [13:30:36.132] invokeRestart("muffleMessage") [13:30:36.132] } [13:30:36.132] else if (inherits(cond, "warning")) { [13:30:36.132] muffled <- grepl(pattern, "muffleWarning") [13:30:36.132] if (muffled) [13:30:36.132] invokeRestart("muffleWarning") [13:30:36.132] } [13:30:36.132] else if (inherits(cond, "condition")) { [13:30:36.132] if (!is.null(pattern)) { [13:30:36.132] computeRestarts <- base::computeRestarts [13:30:36.132] grepl <- base::grepl [13:30:36.132] restarts <- computeRestarts(cond) [13:30:36.132] for (restart in restarts) { [13:30:36.132] name <- restart$name [13:30:36.132] if (is.null(name)) [13:30:36.132] next [13:30:36.132] if (!grepl(pattern, name)) [13:30:36.132] next [13:30:36.132] invokeRestart(restart) [13:30:36.132] muffled <- TRUE [13:30:36.132] break [13:30:36.132] } [13:30:36.132] } [13:30:36.132] } [13:30:36.132] invisible(muffled) [13:30:36.132] } [13:30:36.132] muffleCondition(cond, pattern = "^muffle") [13:30:36.132] } [13:30:36.132] } [13:30:36.132] } [13:30:36.132] })) [13:30:36.132] }, error = function(ex) { [13:30:36.132] base::structure(base::list(value = NULL, visible = NULL, [13:30:36.132] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.132] ...future.rng), started = ...future.startTime, [13:30:36.132] finished = Sys.time(), session_uuid = NA_character_, [13:30:36.132] version = "1.8"), class = "FutureResult") [13:30:36.132] }, finally = { [13:30:36.132] if (!identical(...future.workdir, getwd())) [13:30:36.132] setwd(...future.workdir) [13:30:36.132] { [13:30:36.132] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:36.132] ...future.oldOptions$nwarnings <- NULL [13:30:36.132] } [13:30:36.132] base::options(...future.oldOptions) [13:30:36.132] if (.Platform$OS.type == "windows") { [13:30:36.132] old_names <- names(...future.oldEnvVars) [13:30:36.132] envs <- base::Sys.getenv() [13:30:36.132] names <- names(envs) [13:30:36.132] common <- intersect(names, old_names) [13:30:36.132] added <- setdiff(names, old_names) [13:30:36.132] removed <- setdiff(old_names, names) [13:30:36.132] changed <- common[...future.oldEnvVars[common] != [13:30:36.132] envs[common]] [13:30:36.132] NAMES <- toupper(changed) [13:30:36.132] args <- list() [13:30:36.132] for (kk in seq_along(NAMES)) { [13:30:36.132] name <- changed[[kk]] [13:30:36.132] NAME <- NAMES[[kk]] [13:30:36.132] if (name != NAME && is.element(NAME, old_names)) [13:30:36.132] next [13:30:36.132] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.132] } [13:30:36.132] NAMES <- toupper(added) [13:30:36.132] for (kk in seq_along(NAMES)) { [13:30:36.132] name <- added[[kk]] [13:30:36.132] NAME <- NAMES[[kk]] [13:30:36.132] if (name != NAME && is.element(NAME, old_names)) [13:30:36.132] next [13:30:36.132] args[[name]] <- "" [13:30:36.132] } [13:30:36.132] NAMES <- toupper(removed) [13:30:36.132] for (kk in seq_along(NAMES)) { [13:30:36.132] name <- removed[[kk]] [13:30:36.132] NAME <- NAMES[[kk]] [13:30:36.132] if (name != NAME && is.element(NAME, old_names)) [13:30:36.132] next [13:30:36.132] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.132] } [13:30:36.132] if (length(args) > 0) [13:30:36.132] base::do.call(base::Sys.setenv, args = args) [13:30:36.132] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:36.132] } [13:30:36.132] else { [13:30:36.132] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:36.132] } [13:30:36.132] { [13:30:36.132] if (base::length(...future.futureOptionsAdded) > [13:30:36.132] 0L) { [13:30:36.132] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:36.132] base::names(opts) <- ...future.futureOptionsAdded [13:30:36.132] base::options(opts) [13:30:36.132] } [13:30:36.132] { [13:30:36.132] NULL [13:30:36.132] options(future.plan = NULL) [13:30:36.132] if (is.na(NA_character_)) [13:30:36.132] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.132] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:36.132] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:36.132] .init = FALSE) [13:30:36.132] } [13:30:36.132] } [13:30:36.132] } [13:30:36.132] }) [13:30:36.132] if (TRUE) { [13:30:36.132] base::sink(type = "output", split = FALSE) [13:30:36.132] if (TRUE) { [13:30:36.132] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:36.132] } [13:30:36.132] else { [13:30:36.132] ...future.result["stdout"] <- base::list(NULL) [13:30:36.132] } [13:30:36.132] base::close(...future.stdout) [13:30:36.132] ...future.stdout <- NULL [13:30:36.132] } [13:30:36.132] ...future.result$conditions <- ...future.conditions [13:30:36.132] ...future.result$finished <- base::Sys.time() [13:30:36.132] ...future.result [13:30:36.132] } [13:30:36.233] plan(): plan_init() of 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:30:36.233] plan(): nbrOfWorkers() = 2 [13:30:36.233] getGlobalsAndPackages() ... [13:30:36.234] Searching for globals... [13:30:36.238] - globals found: [2] '*', 'a' [13:30:36.238] Searching for globals ... DONE [13:30:36.238] Resolving globals: FALSE [13:30:36.239] The total size of the 1 globals is 56 bytes (56 bytes) [13:30:36.240] 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:30:36.240] - globals: [1] 'a' [13:30:36.240] [13:30:36.241] getGlobalsAndPackages() ... DONE [13:30:36.241] run() for 'Future' ... [13:30:36.241] - state: 'created' [13:30:36.242] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:36.242] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:36.242] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:36.242] - Field: 'label' [13:30:36.242] - Field: 'local' [13:30:36.243] - Field: 'owner' [13:30:36.243] - Field: 'envir' [13:30:36.243] - Field: 'packages' [13:30:36.243] - Field: 'gc' [13:30:36.243] - Field: 'conditions' [13:30:36.243] - Field: 'expr' [13:30:36.244] - Field: 'uuid' [13:30:36.244] - Field: 'seed' [13:30:36.244] - Field: 'version' [13:30:36.244] - Field: 'result' [13:30:36.244] - Field: 'asynchronous' [13:30:36.245] - Field: 'calls' [13:30:36.245] - Field: 'globals' [13:30:36.245] - Field: 'stdout' [13:30:36.245] - Field: 'earlySignal' [13:30:36.245] - Field: 'lazy' [13:30:36.245] - Field: 'state' [13:30:36.246] - Field: '.cluster' [13:30:36.246] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:36.246] - Launch lazy future ... [13:30:36.246] Packages needed by the future expression (n = 0): [13:30:36.246] Packages needed by future strategies (n = 0): [13:30:36.247] { [13:30:36.247] { [13:30:36.247] { [13:30:36.247] ...future.startTime <- base::Sys.time() [13:30:36.247] { [13:30:36.247] { [13:30:36.247] { [13:30:36.247] base::local({ [13:30:36.247] has_future <- base::requireNamespace("future", [13:30:36.247] quietly = TRUE) [13:30:36.247] if (has_future) { [13:30:36.247] ns <- base::getNamespace("future") [13:30:36.247] version <- ns[[".package"]][["version"]] [13:30:36.247] if (is.null(version)) [13:30:36.247] version <- utils::packageVersion("future") [13:30:36.247] } [13:30:36.247] else { [13:30:36.247] version <- NULL [13:30:36.247] } [13:30:36.247] if (!has_future || version < "1.8.0") { [13:30:36.247] info <- base::c(r_version = base::gsub("R version ", [13:30:36.247] "", base::R.version$version.string), [13:30:36.247] platform = base::sprintf("%s (%s-bit)", [13:30:36.247] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:36.247] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:36.247] "release", "version")], collapse = " "), [13:30:36.247] hostname = base::Sys.info()[["nodename"]]) [13:30:36.247] info <- base::sprintf("%s: %s", base::names(info), [13:30:36.247] info) [13:30:36.247] info <- base::paste(info, collapse = "; ") [13:30:36.247] if (!has_future) { [13:30:36.247] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:36.247] info) [13:30:36.247] } [13:30:36.247] else { [13:30:36.247] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:36.247] info, version) [13:30:36.247] } [13:30:36.247] base::stop(msg) [13:30:36.247] } [13:30:36.247] }) [13:30:36.247] } [13:30:36.247] ...future.strategy.old <- future::plan("list") [13:30:36.247] options(future.plan = NULL) [13:30:36.247] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.247] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:36.247] } [13:30:36.247] ...future.workdir <- getwd() [13:30:36.247] } [13:30:36.247] ...future.oldOptions <- base::as.list(base::.Options) [13:30:36.247] ...future.oldEnvVars <- base::Sys.getenv() [13:30:36.247] } [13:30:36.247] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:36.247] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:36.247] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:36.247] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:36.247] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:36.247] future.stdout.windows.reencode = NULL, width = 80L) [13:30:36.247] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:36.247] base::names(...future.oldOptions)) [13:30:36.247] } [13:30:36.247] if (FALSE) { [13:30:36.247] } [13:30:36.247] else { [13:30:36.247] if (TRUE) { [13:30:36.247] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:36.247] open = "w") [13:30:36.247] } [13:30:36.247] else { [13:30:36.247] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:36.247] windows = "NUL", "/dev/null"), open = "w") [13:30:36.247] } [13:30:36.247] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:36.247] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:36.247] base::sink(type = "output", split = FALSE) [13:30:36.247] base::close(...future.stdout) [13:30:36.247] }, add = TRUE) [13:30:36.247] } [13:30:36.247] ...future.frame <- base::sys.nframe() [13:30:36.247] ...future.conditions <- base::list() [13:30:36.247] ...future.rng <- base::globalenv()$.Random.seed [13:30:36.247] if (FALSE) { [13:30:36.247] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:36.247] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:36.247] } [13:30:36.247] ...future.result <- base::tryCatch({ [13:30:36.247] base::withCallingHandlers({ [13:30:36.247] ...future.value <- base::withVisible(base::local(2 * [13:30:36.247] a)) [13:30:36.247] future::FutureResult(value = ...future.value$value, [13:30:36.247] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.247] ...future.rng), globalenv = if (FALSE) [13:30:36.247] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:36.247] ...future.globalenv.names)) [13:30:36.247] else NULL, started = ...future.startTime, version = "1.8") [13:30:36.247] }, condition = base::local({ [13:30:36.247] c <- base::c [13:30:36.247] inherits <- base::inherits [13:30:36.247] invokeRestart <- base::invokeRestart [13:30:36.247] length <- base::length [13:30:36.247] list <- base::list [13:30:36.247] seq.int <- base::seq.int [13:30:36.247] signalCondition <- base::signalCondition [13:30:36.247] sys.calls <- base::sys.calls [13:30:36.247] `[[` <- base::`[[` [13:30:36.247] `+` <- base::`+` [13:30:36.247] `<<-` <- base::`<<-` [13:30:36.247] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:36.247] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:36.247] 3L)] [13:30:36.247] } [13:30:36.247] function(cond) { [13:30:36.247] is_error <- inherits(cond, "error") [13:30:36.247] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:36.247] NULL) [13:30:36.247] if (is_error) { [13:30:36.247] sessionInformation <- function() { [13:30:36.247] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:36.247] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:36.247] search = base::search(), system = base::Sys.info()) [13:30:36.247] } [13:30:36.247] ...future.conditions[[length(...future.conditions) + [13:30:36.247] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:36.247] cond$call), session = sessionInformation(), [13:30:36.247] timestamp = base::Sys.time(), signaled = 0L) [13:30:36.247] signalCondition(cond) [13:30:36.247] } [13:30:36.247] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:36.247] signal <- FALSE && inherits(cond, character(0)) [13:30:36.247] ...future.conditions[[length(...future.conditions) + [13:30:36.247] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:36.247] if (FALSE && !signal) { [13:30:36.247] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.247] { [13:30:36.247] inherits <- base::inherits [13:30:36.247] invokeRestart <- base::invokeRestart [13:30:36.247] is.null <- base::is.null [13:30:36.247] muffled <- FALSE [13:30:36.247] if (inherits(cond, "message")) { [13:30:36.247] muffled <- grepl(pattern, "muffleMessage") [13:30:36.247] if (muffled) [13:30:36.247] invokeRestart("muffleMessage") [13:30:36.247] } [13:30:36.247] else if (inherits(cond, "warning")) { [13:30:36.247] muffled <- grepl(pattern, "muffleWarning") [13:30:36.247] if (muffled) [13:30:36.247] invokeRestart("muffleWarning") [13:30:36.247] } [13:30:36.247] else if (inherits(cond, "condition")) { [13:30:36.247] if (!is.null(pattern)) { [13:30:36.247] computeRestarts <- base::computeRestarts [13:30:36.247] grepl <- base::grepl [13:30:36.247] restarts <- computeRestarts(cond) [13:30:36.247] for (restart in restarts) { [13:30:36.247] name <- restart$name [13:30:36.247] if (is.null(name)) [13:30:36.247] next [13:30:36.247] if (!grepl(pattern, name)) [13:30:36.247] next [13:30:36.247] invokeRestart(restart) [13:30:36.247] muffled <- TRUE [13:30:36.247] break [13:30:36.247] } [13:30:36.247] } [13:30:36.247] } [13:30:36.247] invisible(muffled) [13:30:36.247] } [13:30:36.247] muffleCondition(cond, pattern = "^muffle") [13:30:36.247] } [13:30:36.247] } [13:30:36.247] else { [13:30:36.247] if (TRUE) { [13:30:36.247] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.247] { [13:30:36.247] inherits <- base::inherits [13:30:36.247] invokeRestart <- base::invokeRestart [13:30:36.247] is.null <- base::is.null [13:30:36.247] muffled <- FALSE [13:30:36.247] if (inherits(cond, "message")) { [13:30:36.247] muffled <- grepl(pattern, "muffleMessage") [13:30:36.247] if (muffled) [13:30:36.247] invokeRestart("muffleMessage") [13:30:36.247] } [13:30:36.247] else if (inherits(cond, "warning")) { [13:30:36.247] muffled <- grepl(pattern, "muffleWarning") [13:30:36.247] if (muffled) [13:30:36.247] invokeRestart("muffleWarning") [13:30:36.247] } [13:30:36.247] else if (inherits(cond, "condition")) { [13:30:36.247] if (!is.null(pattern)) { [13:30:36.247] computeRestarts <- base::computeRestarts [13:30:36.247] grepl <- base::grepl [13:30:36.247] restarts <- computeRestarts(cond) [13:30:36.247] for (restart in restarts) { [13:30:36.247] name <- restart$name [13:30:36.247] if (is.null(name)) [13:30:36.247] next [13:30:36.247] if (!grepl(pattern, name)) [13:30:36.247] next [13:30:36.247] invokeRestart(restart) [13:30:36.247] muffled <- TRUE [13:30:36.247] break [13:30:36.247] } [13:30:36.247] } [13:30:36.247] } [13:30:36.247] invisible(muffled) [13:30:36.247] } [13:30:36.247] muffleCondition(cond, pattern = "^muffle") [13:30:36.247] } [13:30:36.247] } [13:30:36.247] } [13:30:36.247] })) [13:30:36.247] }, error = function(ex) { [13:30:36.247] base::structure(base::list(value = NULL, visible = NULL, [13:30:36.247] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.247] ...future.rng), started = ...future.startTime, [13:30:36.247] finished = Sys.time(), session_uuid = NA_character_, [13:30:36.247] version = "1.8"), class = "FutureResult") [13:30:36.247] }, finally = { [13:30:36.247] if (!identical(...future.workdir, getwd())) [13:30:36.247] setwd(...future.workdir) [13:30:36.247] { [13:30:36.247] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:36.247] ...future.oldOptions$nwarnings <- NULL [13:30:36.247] } [13:30:36.247] base::options(...future.oldOptions) [13:30:36.247] if (.Platform$OS.type == "windows") { [13:30:36.247] old_names <- names(...future.oldEnvVars) [13:30:36.247] envs <- base::Sys.getenv() [13:30:36.247] names <- names(envs) [13:30:36.247] common <- intersect(names, old_names) [13:30:36.247] added <- setdiff(names, old_names) [13:30:36.247] removed <- setdiff(old_names, names) [13:30:36.247] changed <- common[...future.oldEnvVars[common] != [13:30:36.247] envs[common]] [13:30:36.247] NAMES <- toupper(changed) [13:30:36.247] args <- list() [13:30:36.247] for (kk in seq_along(NAMES)) { [13:30:36.247] name <- changed[[kk]] [13:30:36.247] NAME <- NAMES[[kk]] [13:30:36.247] if (name != NAME && is.element(NAME, old_names)) [13:30:36.247] next [13:30:36.247] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.247] } [13:30:36.247] NAMES <- toupper(added) [13:30:36.247] for (kk in seq_along(NAMES)) { [13:30:36.247] name <- added[[kk]] [13:30:36.247] NAME <- NAMES[[kk]] [13:30:36.247] if (name != NAME && is.element(NAME, old_names)) [13:30:36.247] next [13:30:36.247] args[[name]] <- "" [13:30:36.247] } [13:30:36.247] NAMES <- toupper(removed) [13:30:36.247] for (kk in seq_along(NAMES)) { [13:30:36.247] name <- removed[[kk]] [13:30:36.247] NAME <- NAMES[[kk]] [13:30:36.247] if (name != NAME && is.element(NAME, old_names)) [13:30:36.247] next [13:30:36.247] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.247] } [13:30:36.247] if (length(args) > 0) [13:30:36.247] base::do.call(base::Sys.setenv, args = args) [13:30:36.247] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:36.247] } [13:30:36.247] else { [13:30:36.247] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:36.247] } [13:30:36.247] { [13:30:36.247] if (base::length(...future.futureOptionsAdded) > [13:30:36.247] 0L) { [13:30:36.247] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:36.247] base::names(opts) <- ...future.futureOptionsAdded [13:30:36.247] base::options(opts) [13:30:36.247] } [13:30:36.247] { [13:30:36.247] NULL [13:30:36.247] options(future.plan = NULL) [13:30:36.247] if (is.na(NA_character_)) [13:30:36.247] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.247] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:36.247] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:36.247] .init = FALSE) [13:30:36.247] } [13:30:36.247] } [13:30:36.247] } [13:30:36.247] }) [13:30:36.247] if (TRUE) { [13:30:36.247] base::sink(type = "output", split = FALSE) [13:30:36.247] if (TRUE) { [13:30:36.247] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:36.247] } [13:30:36.247] else { [13:30:36.247] ...future.result["stdout"] <- base::list(NULL) [13:30:36.247] } [13:30:36.247] base::close(...future.stdout) [13:30:36.247] ...future.stdout <- NULL [13:30:36.247] } [13:30:36.247] ...future.result$conditions <- ...future.conditions [13:30:36.247] ...future.result$finished <- base::Sys.time() [13:30:36.247] ...future.result [13:30:36.247] } [13:30:36.251] - Launch lazy future ... done [13:30:36.251] run() for 'MiraiFuture' ... done [13:30:36.254] getGlobalsAndPackages() ... [13:30:36.254] Searching for globals... [13:30:36.257] - globals found: [3] '{', '*', 'a' [13:30:36.258] Searching for globals ... DONE [13:30:36.258] Resolving globals: FALSE [13:30:36.258] The total size of the 1 globals is 56 bytes (56 bytes) [13:30:36.259] 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:30:36.259] - globals: [1] 'a' [13:30:36.259] [13:30:36.259] getGlobalsAndPackages() ... DONE [13:30:36.260] run() for 'Future' ... [13:30:36.260] - state: 'created' [13:30:36.260] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:36.260] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:36.261] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:36.261] - Field: 'label' [13:30:36.261] - Field: 'local' [13:30:36.261] - Field: 'owner' [13:30:36.261] - Field: 'envir' [13:30:36.261] - Field: 'packages' [13:30:36.262] - Field: 'gc' [13:30:36.262] - Field: 'conditions' [13:30:36.262] - Field: 'expr' [13:30:36.262] - Field: 'uuid' [13:30:36.262] - Field: 'seed' [13:30:36.262] - Field: 'version' [13:30:36.263] - Field: 'result' [13:30:36.263] - Field: 'asynchronous' [13:30:36.263] - Field: 'calls' [13:30:36.263] - Field: 'globals' [13:30:36.263] - Field: 'stdout' [13:30:36.263] - Field: 'earlySignal' [13:30:36.264] - Field: 'lazy' [13:30:36.264] - Field: 'state' [13:30:36.264] - Field: '.cluster' [13:30:36.264] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:36.264] - Launch lazy future ... [13:30:36.265] Packages needed by the future expression (n = 0): [13:30:36.265] Packages needed by future strategies (n = 0): [13:30:36.265] { [13:30:36.265] { [13:30:36.265] { [13:30:36.265] ...future.startTime <- base::Sys.time() [13:30:36.265] { [13:30:36.265] { [13:30:36.265] { [13:30:36.265] base::local({ [13:30:36.265] has_future <- base::requireNamespace("future", [13:30:36.265] quietly = TRUE) [13:30:36.265] if (has_future) { [13:30:36.265] ns <- base::getNamespace("future") [13:30:36.265] version <- ns[[".package"]][["version"]] [13:30:36.265] if (is.null(version)) [13:30:36.265] version <- utils::packageVersion("future") [13:30:36.265] } [13:30:36.265] else { [13:30:36.265] version <- NULL [13:30:36.265] } [13:30:36.265] if (!has_future || version < "1.8.0") { [13:30:36.265] info <- base::c(r_version = base::gsub("R version ", [13:30:36.265] "", base::R.version$version.string), [13:30:36.265] platform = base::sprintf("%s (%s-bit)", [13:30:36.265] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:36.265] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:36.265] "release", "version")], collapse = " "), [13:30:36.265] hostname = base::Sys.info()[["nodename"]]) [13:30:36.265] info <- base::sprintf("%s: %s", base::names(info), [13:30:36.265] info) [13:30:36.265] info <- base::paste(info, collapse = "; ") [13:30:36.265] if (!has_future) { [13:30:36.265] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:36.265] info) [13:30:36.265] } [13:30:36.265] else { [13:30:36.265] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:36.265] info, version) [13:30:36.265] } [13:30:36.265] base::stop(msg) [13:30:36.265] } [13:30:36.265] }) [13:30:36.265] } [13:30:36.265] ...future.strategy.old <- future::plan("list") [13:30:36.265] options(future.plan = NULL) [13:30:36.265] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.265] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:36.265] } [13:30:36.265] ...future.workdir <- getwd() [13:30:36.265] } [13:30:36.265] ...future.oldOptions <- base::as.list(base::.Options) [13:30:36.265] ...future.oldEnvVars <- base::Sys.getenv() [13:30:36.265] } [13:30:36.265] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:36.265] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:36.265] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:36.265] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:36.265] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:36.265] future.stdout.windows.reencode = NULL, width = 80L) [13:30:36.265] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:36.265] base::names(...future.oldOptions)) [13:30:36.265] } [13:30:36.265] if (FALSE) { [13:30:36.265] } [13:30:36.265] else { [13:30:36.265] if (TRUE) { [13:30:36.265] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:36.265] open = "w") [13:30:36.265] } [13:30:36.265] else { [13:30:36.265] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:36.265] windows = "NUL", "/dev/null"), open = "w") [13:30:36.265] } [13:30:36.265] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:36.265] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:36.265] base::sink(type = "output", split = FALSE) [13:30:36.265] base::close(...future.stdout) [13:30:36.265] }, add = TRUE) [13:30:36.265] } [13:30:36.265] ...future.frame <- base::sys.nframe() [13:30:36.265] ...future.conditions <- base::list() [13:30:36.265] ...future.rng <- base::globalenv()$.Random.seed [13:30:36.265] if (FALSE) { [13:30:36.265] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:36.265] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:36.265] } [13:30:36.265] ...future.result <- base::tryCatch({ [13:30:36.265] base::withCallingHandlers({ [13:30:36.265] ...future.value <- base::withVisible(base::local({ [13:30:36.265] 2 * a [13:30:36.265] })) [13:30:36.265] future::FutureResult(value = ...future.value$value, [13:30:36.265] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.265] ...future.rng), globalenv = if (FALSE) [13:30:36.265] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:36.265] ...future.globalenv.names)) [13:30:36.265] else NULL, started = ...future.startTime, version = "1.8") [13:30:36.265] }, condition = base::local({ [13:30:36.265] c <- base::c [13:30:36.265] inherits <- base::inherits [13:30:36.265] invokeRestart <- base::invokeRestart [13:30:36.265] length <- base::length [13:30:36.265] list <- base::list [13:30:36.265] seq.int <- base::seq.int [13:30:36.265] signalCondition <- base::signalCondition [13:30:36.265] sys.calls <- base::sys.calls [13:30:36.265] `[[` <- base::`[[` [13:30:36.265] `+` <- base::`+` [13:30:36.265] `<<-` <- base::`<<-` [13:30:36.265] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:36.265] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:36.265] 3L)] [13:30:36.265] } [13:30:36.265] function(cond) { [13:30:36.265] is_error <- inherits(cond, "error") [13:30:36.265] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:36.265] NULL) [13:30:36.265] if (is_error) { [13:30:36.265] sessionInformation <- function() { [13:30:36.265] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:36.265] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:36.265] search = base::search(), system = base::Sys.info()) [13:30:36.265] } [13:30:36.265] ...future.conditions[[length(...future.conditions) + [13:30:36.265] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:36.265] cond$call), session = sessionInformation(), [13:30:36.265] timestamp = base::Sys.time(), signaled = 0L) [13:30:36.265] signalCondition(cond) [13:30:36.265] } [13:30:36.265] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:36.265] signal <- FALSE && inherits(cond, character(0)) [13:30:36.265] ...future.conditions[[length(...future.conditions) + [13:30:36.265] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:36.265] if (FALSE && !signal) { [13:30:36.265] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.265] { [13:30:36.265] inherits <- base::inherits [13:30:36.265] invokeRestart <- base::invokeRestart [13:30:36.265] is.null <- base::is.null [13:30:36.265] muffled <- FALSE [13:30:36.265] if (inherits(cond, "message")) { [13:30:36.265] muffled <- grepl(pattern, "muffleMessage") [13:30:36.265] if (muffled) [13:30:36.265] invokeRestart("muffleMessage") [13:30:36.265] } [13:30:36.265] else if (inherits(cond, "warning")) { [13:30:36.265] muffled <- grepl(pattern, "muffleWarning") [13:30:36.265] if (muffled) [13:30:36.265] invokeRestart("muffleWarning") [13:30:36.265] } [13:30:36.265] else if (inherits(cond, "condition")) { [13:30:36.265] if (!is.null(pattern)) { [13:30:36.265] computeRestarts <- base::computeRestarts [13:30:36.265] grepl <- base::grepl [13:30:36.265] restarts <- computeRestarts(cond) [13:30:36.265] for (restart in restarts) { [13:30:36.265] name <- restart$name [13:30:36.265] if (is.null(name)) [13:30:36.265] next [13:30:36.265] if (!grepl(pattern, name)) [13:30:36.265] next [13:30:36.265] invokeRestart(restart) [13:30:36.265] muffled <- TRUE [13:30:36.265] break [13:30:36.265] } [13:30:36.265] } [13:30:36.265] } [13:30:36.265] invisible(muffled) [13:30:36.265] } [13:30:36.265] muffleCondition(cond, pattern = "^muffle") [13:30:36.265] } [13:30:36.265] } [13:30:36.265] else { [13:30:36.265] if (TRUE) { [13:30:36.265] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.265] { [13:30:36.265] inherits <- base::inherits [13:30:36.265] invokeRestart <- base::invokeRestart [13:30:36.265] is.null <- base::is.null [13:30:36.265] muffled <- FALSE [13:30:36.265] if (inherits(cond, "message")) { [13:30:36.265] muffled <- grepl(pattern, "muffleMessage") [13:30:36.265] if (muffled) [13:30:36.265] invokeRestart("muffleMessage") [13:30:36.265] } [13:30:36.265] else if (inherits(cond, "warning")) { [13:30:36.265] muffled <- grepl(pattern, "muffleWarning") [13:30:36.265] if (muffled) [13:30:36.265] invokeRestart("muffleWarning") [13:30:36.265] } [13:30:36.265] else if (inherits(cond, "condition")) { [13:30:36.265] if (!is.null(pattern)) { [13:30:36.265] computeRestarts <- base::computeRestarts [13:30:36.265] grepl <- base::grepl [13:30:36.265] restarts <- computeRestarts(cond) [13:30:36.265] for (restart in restarts) { [13:30:36.265] name <- restart$name [13:30:36.265] if (is.null(name)) [13:30:36.265] next [13:30:36.265] if (!grepl(pattern, name)) [13:30:36.265] next [13:30:36.265] invokeRestart(restart) [13:30:36.265] muffled <- TRUE [13:30:36.265] break [13:30:36.265] } [13:30:36.265] } [13:30:36.265] } [13:30:36.265] invisible(muffled) [13:30:36.265] } [13:30:36.265] muffleCondition(cond, pattern = "^muffle") [13:30:36.265] } [13:30:36.265] } [13:30:36.265] } [13:30:36.265] })) [13:30:36.265] }, error = function(ex) { [13:30:36.265] base::structure(base::list(value = NULL, visible = NULL, [13:30:36.265] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.265] ...future.rng), started = ...future.startTime, [13:30:36.265] finished = Sys.time(), session_uuid = NA_character_, [13:30:36.265] version = "1.8"), class = "FutureResult") [13:30:36.265] }, finally = { [13:30:36.265] if (!identical(...future.workdir, getwd())) [13:30:36.265] setwd(...future.workdir) [13:30:36.265] { [13:30:36.265] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:36.265] ...future.oldOptions$nwarnings <- NULL [13:30:36.265] } [13:30:36.265] base::options(...future.oldOptions) [13:30:36.265] if (.Platform$OS.type == "windows") { [13:30:36.265] old_names <- names(...future.oldEnvVars) [13:30:36.265] envs <- base::Sys.getenv() [13:30:36.265] names <- names(envs) [13:30:36.265] common <- intersect(names, old_names) [13:30:36.265] added <- setdiff(names, old_names) [13:30:36.265] removed <- setdiff(old_names, names) [13:30:36.265] changed <- common[...future.oldEnvVars[common] != [13:30:36.265] envs[common]] [13:30:36.265] NAMES <- toupper(changed) [13:30:36.265] args <- list() [13:30:36.265] for (kk in seq_along(NAMES)) { [13:30:36.265] name <- changed[[kk]] [13:30:36.265] NAME <- NAMES[[kk]] [13:30:36.265] if (name != NAME && is.element(NAME, old_names)) [13:30:36.265] next [13:30:36.265] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.265] } [13:30:36.265] NAMES <- toupper(added) [13:30:36.265] for (kk in seq_along(NAMES)) { [13:30:36.265] name <- added[[kk]] [13:30:36.265] NAME <- NAMES[[kk]] [13:30:36.265] if (name != NAME && is.element(NAME, old_names)) [13:30:36.265] next [13:30:36.265] args[[name]] <- "" [13:30:36.265] } [13:30:36.265] NAMES <- toupper(removed) [13:30:36.265] for (kk in seq_along(NAMES)) { [13:30:36.265] name <- removed[[kk]] [13:30:36.265] NAME <- NAMES[[kk]] [13:30:36.265] if (name != NAME && is.element(NAME, old_names)) [13:30:36.265] next [13:30:36.265] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.265] } [13:30:36.265] if (length(args) > 0) [13:30:36.265] base::do.call(base::Sys.setenv, args = args) [13:30:36.265] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:36.265] } [13:30:36.265] else { [13:30:36.265] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:36.265] } [13:30:36.265] { [13:30:36.265] if (base::length(...future.futureOptionsAdded) > [13:30:36.265] 0L) { [13:30:36.265] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:36.265] base::names(opts) <- ...future.futureOptionsAdded [13:30:36.265] base::options(opts) [13:30:36.265] } [13:30:36.265] { [13:30:36.265] NULL [13:30:36.265] options(future.plan = NULL) [13:30:36.265] if (is.na(NA_character_)) [13:30:36.265] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.265] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:36.265] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:36.265] .init = FALSE) [13:30:36.265] } [13:30:36.265] } [13:30:36.265] } [13:30:36.265] }) [13:30:36.265] if (TRUE) { [13:30:36.265] base::sink(type = "output", split = FALSE) [13:30:36.265] if (TRUE) { [13:30:36.265] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:36.265] } [13:30:36.265] else { [13:30:36.265] ...future.result["stdout"] <- base::list(NULL) [13:30:36.265] } [13:30:36.265] base::close(...future.stdout) [13:30:36.265] ...future.stdout <- NULL [13:30:36.265] } [13:30:36.265] ...future.result$conditions <- ...future.conditions [13:30:36.265] ...future.result$finished <- base::Sys.time() [13:30:36.265] ...future.result [13:30:36.265] } [13:30:36.269] - Launch lazy future ... done [13:30:36.269] run() for 'MiraiFuture' ... done [13:30:36.271] - plan('mirai_cluster') ... DONE[13:30:36.271] - plan('mirai_multisession') ...[13:30:36.272] plan(): Setting new future strategy stack: [13:30:36.272] List of future strategies: [13:30:36.272] 1. mirai_multisession: [13:30:36.272] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:30:36.272] - tweaked: FALSE [13:30:36.272] - call: plan(strategy) [13:30:36.272] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:30:36.273] < mirai | $data > [13:30:36.275] getGlobalsAndPackages() ... [13:30:36.275] Not searching for globals [13:30:36.275] - globals: [0] [13:30:36.275] getGlobalsAndPackages() ... DONE [13:30:36.277] getGlobalsAndPackages() ... [13:30:36.277] [13:30:36.278] - globals: [0] [13:30:36.278] getGlobalsAndPackages() ... DONE [13:30:36.278] Packages needed by the future expression (n = 0): [13:30:36.278] Packages needed by future strategies (n = 0): [13:30:36.279] { [13:30:36.279] { [13:30:36.279] { [13:30:36.279] ...future.startTime <- base::Sys.time() [13:30:36.279] { [13:30:36.279] { [13:30:36.279] { [13:30:36.279] base::local({ [13:30:36.279] has_future <- base::requireNamespace("future", [13:30:36.279] quietly = TRUE) [13:30:36.279] if (has_future) { [13:30:36.279] ns <- base::getNamespace("future") [13:30:36.279] version <- ns[[".package"]][["version"]] [13:30:36.279] if (is.null(version)) [13:30:36.279] version <- utils::packageVersion("future") [13:30:36.279] } [13:30:36.279] else { [13:30:36.279] version <- NULL [13:30:36.279] } [13:30:36.279] if (!has_future || version < "1.8.0") { [13:30:36.279] info <- base::c(r_version = base::gsub("R version ", [13:30:36.279] "", base::R.version$version.string), [13:30:36.279] platform = base::sprintf("%s (%s-bit)", [13:30:36.279] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:36.279] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:36.279] "release", "version")], collapse = " "), [13:30:36.279] hostname = base::Sys.info()[["nodename"]]) [13:30:36.279] info <- base::sprintf("%s: %s", base::names(info), [13:30:36.279] info) [13:30:36.279] info <- base::paste(info, collapse = "; ") [13:30:36.279] if (!has_future) { [13:30:36.279] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:36.279] info) [13:30:36.279] } [13:30:36.279] else { [13:30:36.279] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:36.279] info, version) [13:30:36.279] } [13:30:36.279] base::stop(msg) [13:30:36.279] } [13:30:36.279] }) [13:30:36.279] } [13:30:36.279] ...future.strategy.old <- future::plan("list") [13:30:36.279] options(future.plan = NULL) [13:30:36.279] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.279] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:36.279] } [13:30:36.279] ...future.workdir <- getwd() [13:30:36.279] } [13:30:36.279] ...future.oldOptions <- base::as.list(base::.Options) [13:30:36.279] ...future.oldEnvVars <- base::Sys.getenv() [13:30:36.279] } [13:30:36.279] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:36.279] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:36.279] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:36.279] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:36.279] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:36.279] future.stdout.windows.reencode = NULL, width = 80L) [13:30:36.279] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:36.279] base::names(...future.oldOptions)) [13:30:36.279] } [13:30:36.279] if (FALSE) { [13:30:36.279] } [13:30:36.279] else { [13:30:36.279] if (TRUE) { [13:30:36.279] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:36.279] open = "w") [13:30:36.279] } [13:30:36.279] else { [13:30:36.279] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:36.279] windows = "NUL", "/dev/null"), open = "w") [13:30:36.279] } [13:30:36.279] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:36.279] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:36.279] base::sink(type = "output", split = FALSE) [13:30:36.279] base::close(...future.stdout) [13:30:36.279] }, add = TRUE) [13:30:36.279] } [13:30:36.279] ...future.frame <- base::sys.nframe() [13:30:36.279] ...future.conditions <- base::list() [13:30:36.279] ...future.rng <- base::globalenv()$.Random.seed [13:30:36.279] if (FALSE) { [13:30:36.279] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:36.279] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:36.279] } [13:30:36.279] ...future.result <- base::tryCatch({ [13:30:36.279] base::withCallingHandlers({ [13:30:36.279] ...future.value <- base::withVisible(base::local(NA)) [13:30:36.279] future::FutureResult(value = ...future.value$value, [13:30:36.279] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.279] ...future.rng), globalenv = if (FALSE) [13:30:36.279] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:36.279] ...future.globalenv.names)) [13:30:36.279] else NULL, started = ...future.startTime, version = "1.8") [13:30:36.279] }, condition = base::local({ [13:30:36.279] c <- base::c [13:30:36.279] inherits <- base::inherits [13:30:36.279] invokeRestart <- base::invokeRestart [13:30:36.279] length <- base::length [13:30:36.279] list <- base::list [13:30:36.279] seq.int <- base::seq.int [13:30:36.279] signalCondition <- base::signalCondition [13:30:36.279] sys.calls <- base::sys.calls [13:30:36.279] `[[` <- base::`[[` [13:30:36.279] `+` <- base::`+` [13:30:36.279] `<<-` <- base::`<<-` [13:30:36.279] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:36.279] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:36.279] 3L)] [13:30:36.279] } [13:30:36.279] function(cond) { [13:30:36.279] is_error <- inherits(cond, "error") [13:30:36.279] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:36.279] NULL) [13:30:36.279] if (is_error) { [13:30:36.279] sessionInformation <- function() { [13:30:36.279] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:36.279] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:36.279] search = base::search(), system = base::Sys.info()) [13:30:36.279] } [13:30:36.279] ...future.conditions[[length(...future.conditions) + [13:30:36.279] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:36.279] cond$call), session = sessionInformation(), [13:30:36.279] timestamp = base::Sys.time(), signaled = 0L) [13:30:36.279] signalCondition(cond) [13:30:36.279] } [13:30:36.279] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:36.279] signal <- FALSE && inherits(cond, character(0)) [13:30:36.279] ...future.conditions[[length(...future.conditions) + [13:30:36.279] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:36.279] if (FALSE && !signal) { [13:30:36.279] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.279] { [13:30:36.279] inherits <- base::inherits [13:30:36.279] invokeRestart <- base::invokeRestart [13:30:36.279] is.null <- base::is.null [13:30:36.279] muffled <- FALSE [13:30:36.279] if (inherits(cond, "message")) { [13:30:36.279] muffled <- grepl(pattern, "muffleMessage") [13:30:36.279] if (muffled) [13:30:36.279] invokeRestart("muffleMessage") [13:30:36.279] } [13:30:36.279] else if (inherits(cond, "warning")) { [13:30:36.279] muffled <- grepl(pattern, "muffleWarning") [13:30:36.279] if (muffled) [13:30:36.279] invokeRestart("muffleWarning") [13:30:36.279] } [13:30:36.279] else if (inherits(cond, "condition")) { [13:30:36.279] if (!is.null(pattern)) { [13:30:36.279] computeRestarts <- base::computeRestarts [13:30:36.279] grepl <- base::grepl [13:30:36.279] restarts <- computeRestarts(cond) [13:30:36.279] for (restart in restarts) { [13:30:36.279] name <- restart$name [13:30:36.279] if (is.null(name)) [13:30:36.279] next [13:30:36.279] if (!grepl(pattern, name)) [13:30:36.279] next [13:30:36.279] invokeRestart(restart) [13:30:36.279] muffled <- TRUE [13:30:36.279] break [13:30:36.279] } [13:30:36.279] } [13:30:36.279] } [13:30:36.279] invisible(muffled) [13:30:36.279] } [13:30:36.279] muffleCondition(cond, pattern = "^muffle") [13:30:36.279] } [13:30:36.279] } [13:30:36.279] else { [13:30:36.279] if (TRUE) { [13:30:36.279] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.279] { [13:30:36.279] inherits <- base::inherits [13:30:36.279] invokeRestart <- base::invokeRestart [13:30:36.279] is.null <- base::is.null [13:30:36.279] muffled <- FALSE [13:30:36.279] if (inherits(cond, "message")) { [13:30:36.279] muffled <- grepl(pattern, "muffleMessage") [13:30:36.279] if (muffled) [13:30:36.279] invokeRestart("muffleMessage") [13:30:36.279] } [13:30:36.279] else if (inherits(cond, "warning")) { [13:30:36.279] muffled <- grepl(pattern, "muffleWarning") [13:30:36.279] if (muffled) [13:30:36.279] invokeRestart("muffleWarning") [13:30:36.279] } [13:30:36.279] else if (inherits(cond, "condition")) { [13:30:36.279] if (!is.null(pattern)) { [13:30:36.279] computeRestarts <- base::computeRestarts [13:30:36.279] grepl <- base::grepl [13:30:36.279] restarts <- computeRestarts(cond) [13:30:36.279] for (restart in restarts) { [13:30:36.279] name <- restart$name [13:30:36.279] if (is.null(name)) [13:30:36.279] next [13:30:36.279] if (!grepl(pattern, name)) [13:30:36.279] next [13:30:36.279] invokeRestart(restart) [13:30:36.279] muffled <- TRUE [13:30:36.279] break [13:30:36.279] } [13:30:36.279] } [13:30:36.279] } [13:30:36.279] invisible(muffled) [13:30:36.279] } [13:30:36.279] muffleCondition(cond, pattern = "^muffle") [13:30:36.279] } [13:30:36.279] } [13:30:36.279] } [13:30:36.279] })) [13:30:36.279] }, error = function(ex) { [13:30:36.279] base::structure(base::list(value = NULL, visible = NULL, [13:30:36.279] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.279] ...future.rng), started = ...future.startTime, [13:30:36.279] finished = Sys.time(), session_uuid = NA_character_, [13:30:36.279] version = "1.8"), class = "FutureResult") [13:30:36.279] }, finally = { [13:30:36.279] if (!identical(...future.workdir, getwd())) [13:30:36.279] setwd(...future.workdir) [13:30:36.279] { [13:30:36.279] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:36.279] ...future.oldOptions$nwarnings <- NULL [13:30:36.279] } [13:30:36.279] base::options(...future.oldOptions) [13:30:36.279] if (.Platform$OS.type == "windows") { [13:30:36.279] old_names <- names(...future.oldEnvVars) [13:30:36.279] envs <- base::Sys.getenv() [13:30:36.279] names <- names(envs) [13:30:36.279] common <- intersect(names, old_names) [13:30:36.279] added <- setdiff(names, old_names) [13:30:36.279] removed <- setdiff(old_names, names) [13:30:36.279] changed <- common[...future.oldEnvVars[common] != [13:30:36.279] envs[common]] [13:30:36.279] NAMES <- toupper(changed) [13:30:36.279] args <- list() [13:30:36.279] for (kk in seq_along(NAMES)) { [13:30:36.279] name <- changed[[kk]] [13:30:36.279] NAME <- NAMES[[kk]] [13:30:36.279] if (name != NAME && is.element(NAME, old_names)) [13:30:36.279] next [13:30:36.279] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.279] } [13:30:36.279] NAMES <- toupper(added) [13:30:36.279] for (kk in seq_along(NAMES)) { [13:30:36.279] name <- added[[kk]] [13:30:36.279] NAME <- NAMES[[kk]] [13:30:36.279] if (name != NAME && is.element(NAME, old_names)) [13:30:36.279] next [13:30:36.279] args[[name]] <- "" [13:30:36.279] } [13:30:36.279] NAMES <- toupper(removed) [13:30:36.279] for (kk in seq_along(NAMES)) { [13:30:36.279] name <- removed[[kk]] [13:30:36.279] NAME <- NAMES[[kk]] [13:30:36.279] if (name != NAME && is.element(NAME, old_names)) [13:30:36.279] next [13:30:36.279] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.279] } [13:30:36.279] if (length(args) > 0) [13:30:36.279] base::do.call(base::Sys.setenv, args = args) [13:30:36.279] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:36.279] } [13:30:36.279] else { [13:30:36.279] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:36.279] } [13:30:36.279] { [13:30:36.279] if (base::length(...future.futureOptionsAdded) > [13:30:36.279] 0L) { [13:30:36.279] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:36.279] base::names(opts) <- ...future.futureOptionsAdded [13:30:36.279] base::options(opts) [13:30:36.279] } [13:30:36.279] { [13:30:36.279] NULL [13:30:36.279] options(future.plan = NULL) [13:30:36.279] if (is.na(NA_character_)) [13:30:36.279] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.279] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:36.279] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:36.279] .init = FALSE) [13:30:36.279] } [13:30:36.279] } [13:30:36.279] } [13:30:36.279] }) [13:30:36.279] if (TRUE) { [13:30:36.279] base::sink(type = "output", split = FALSE) [13:30:36.279] if (TRUE) { [13:30:36.279] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:36.279] } [13:30:36.279] else { [13:30:36.279] ...future.result["stdout"] <- base::list(NULL) [13:30:36.279] } [13:30:36.279] base::close(...future.stdout) [13:30:36.279] ...future.stdout <- NULL [13:30:36.279] } [13:30:36.279] ...future.result$conditions <- ...future.conditions [13:30:36.279] ...future.result$finished <- base::Sys.time() [13:30:36.279] ...future.result [13:30:36.279] } [13:30:36.285] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:30:36.285] plan(): nbrOfWorkers() = 2 [13:30:36.285] getGlobalsAndPackages() ... [13:30:36.285] Searching for globals... [13:30:36.286] - globals found: [2] '*', 'a' [13:30:36.286] Searching for globals ... DONE [13:30:36.286] Resolving globals: FALSE [13:30:36.287] The total size of the 1 globals is 56 bytes (56 bytes) [13:30:36.287] 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:30:36.287] - globals: [1] 'a' [13:30:36.287] [13:30:36.288] getGlobalsAndPackages() ... DONE [13:30:36.288] run() for 'Future' ... [13:30:36.288] - state: 'created' [13:30:36.288] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:36.291] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:36.291] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:36.291] - Field: 'label' [13:30:36.291] - Field: 'local' [13:30:36.291] - Field: 'owner' [13:30:36.291] - Field: 'envir' [13:30:36.292] - Field: 'packages' [13:30:36.292] - Field: 'gc' [13:30:36.292] - Field: 'conditions' [13:30:36.292] - Field: 'expr' [13:30:36.292] - Field: 'uuid' [13:30:36.292] - Field: 'seed' [13:30:36.293] - Field: 'version' [13:30:36.293] - Field: 'result' [13:30:36.293] - Field: 'asynchronous' [13:30:36.293] - Field: 'calls' [13:30:36.293] - Field: 'globals' [13:30:36.293] - Field: 'stdout' [13:30:36.294] - Field: 'earlySignal' [13:30:36.294] - Field: 'lazy' [13:30:36.294] - Field: 'state' [13:30:36.294] - Field: '.cluster' [13:30:36.294] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:36.294] - Launch lazy future ... [13:30:36.295] Packages needed by the future expression (n = 0): [13:30:36.295] Packages needed by future strategies (n = 0): [13:30:36.295] { [13:30:36.295] { [13:30:36.295] { [13:30:36.295] ...future.startTime <- base::Sys.time() [13:30:36.295] { [13:30:36.295] { [13:30:36.295] { [13:30:36.295] base::local({ [13:30:36.295] has_future <- base::requireNamespace("future", [13:30:36.295] quietly = TRUE) [13:30:36.295] if (has_future) { [13:30:36.295] ns <- base::getNamespace("future") [13:30:36.295] version <- ns[[".package"]][["version"]] [13:30:36.295] if (is.null(version)) [13:30:36.295] version <- utils::packageVersion("future") [13:30:36.295] } [13:30:36.295] else { [13:30:36.295] version <- NULL [13:30:36.295] } [13:30:36.295] if (!has_future || version < "1.8.0") { [13:30:36.295] info <- base::c(r_version = base::gsub("R version ", [13:30:36.295] "", base::R.version$version.string), [13:30:36.295] platform = base::sprintf("%s (%s-bit)", [13:30:36.295] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:36.295] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:36.295] "release", "version")], collapse = " "), [13:30:36.295] hostname = base::Sys.info()[["nodename"]]) [13:30:36.295] info <- base::sprintf("%s: %s", base::names(info), [13:30:36.295] info) [13:30:36.295] info <- base::paste(info, collapse = "; ") [13:30:36.295] if (!has_future) { [13:30:36.295] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:36.295] info) [13:30:36.295] } [13:30:36.295] else { [13:30:36.295] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:36.295] info, version) [13:30:36.295] } [13:30:36.295] base::stop(msg) [13:30:36.295] } [13:30:36.295] }) [13:30:36.295] } [13:30:36.295] ...future.strategy.old <- future::plan("list") [13:30:36.295] options(future.plan = NULL) [13:30:36.295] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.295] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:36.295] } [13:30:36.295] ...future.workdir <- getwd() [13:30:36.295] } [13:30:36.295] ...future.oldOptions <- base::as.list(base::.Options) [13:30:36.295] ...future.oldEnvVars <- base::Sys.getenv() [13:30:36.295] } [13:30:36.295] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:36.295] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:36.295] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:36.295] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:36.295] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:36.295] future.stdout.windows.reencode = NULL, width = 80L) [13:30:36.295] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:36.295] base::names(...future.oldOptions)) [13:30:36.295] } [13:30:36.295] if (FALSE) { [13:30:36.295] } [13:30:36.295] else { [13:30:36.295] if (TRUE) { [13:30:36.295] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:36.295] open = "w") [13:30:36.295] } [13:30:36.295] else { [13:30:36.295] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:36.295] windows = "NUL", "/dev/null"), open = "w") [13:30:36.295] } [13:30:36.295] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:36.295] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:36.295] base::sink(type = "output", split = FALSE) [13:30:36.295] base::close(...future.stdout) [13:30:36.295] }, add = TRUE) [13:30:36.295] } [13:30:36.295] ...future.frame <- base::sys.nframe() [13:30:36.295] ...future.conditions <- base::list() [13:30:36.295] ...future.rng <- base::globalenv()$.Random.seed [13:30:36.295] if (FALSE) { [13:30:36.295] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:36.295] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:36.295] } [13:30:36.295] ...future.result <- base::tryCatch({ [13:30:36.295] base::withCallingHandlers({ [13:30:36.295] ...future.value <- base::withVisible(base::local(2 * [13:30:36.295] a)) [13:30:36.295] future::FutureResult(value = ...future.value$value, [13:30:36.295] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.295] ...future.rng), globalenv = if (FALSE) [13:30:36.295] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:36.295] ...future.globalenv.names)) [13:30:36.295] else NULL, started = ...future.startTime, version = "1.8") [13:30:36.295] }, condition = base::local({ [13:30:36.295] c <- base::c [13:30:36.295] inherits <- base::inherits [13:30:36.295] invokeRestart <- base::invokeRestart [13:30:36.295] length <- base::length [13:30:36.295] list <- base::list [13:30:36.295] seq.int <- base::seq.int [13:30:36.295] signalCondition <- base::signalCondition [13:30:36.295] sys.calls <- base::sys.calls [13:30:36.295] `[[` <- base::`[[` [13:30:36.295] `+` <- base::`+` [13:30:36.295] `<<-` <- base::`<<-` [13:30:36.295] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:36.295] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:36.295] 3L)] [13:30:36.295] } [13:30:36.295] function(cond) { [13:30:36.295] is_error <- inherits(cond, "error") [13:30:36.295] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:36.295] NULL) [13:30:36.295] if (is_error) { [13:30:36.295] sessionInformation <- function() { [13:30:36.295] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:36.295] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:36.295] search = base::search(), system = base::Sys.info()) [13:30:36.295] } [13:30:36.295] ...future.conditions[[length(...future.conditions) + [13:30:36.295] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:36.295] cond$call), session = sessionInformation(), [13:30:36.295] timestamp = base::Sys.time(), signaled = 0L) [13:30:36.295] signalCondition(cond) [13:30:36.295] } [13:30:36.295] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:36.295] signal <- FALSE && inherits(cond, character(0)) [13:30:36.295] ...future.conditions[[length(...future.conditions) + [13:30:36.295] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:36.295] if (FALSE && !signal) { [13:30:36.295] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.295] { [13:30:36.295] inherits <- base::inherits [13:30:36.295] invokeRestart <- base::invokeRestart [13:30:36.295] is.null <- base::is.null [13:30:36.295] muffled <- FALSE [13:30:36.295] if (inherits(cond, "message")) { [13:30:36.295] muffled <- grepl(pattern, "muffleMessage") [13:30:36.295] if (muffled) [13:30:36.295] invokeRestart("muffleMessage") [13:30:36.295] } [13:30:36.295] else if (inherits(cond, "warning")) { [13:30:36.295] muffled <- grepl(pattern, "muffleWarning") [13:30:36.295] if (muffled) [13:30:36.295] invokeRestart("muffleWarning") [13:30:36.295] } [13:30:36.295] else if (inherits(cond, "condition")) { [13:30:36.295] if (!is.null(pattern)) { [13:30:36.295] computeRestarts <- base::computeRestarts [13:30:36.295] grepl <- base::grepl [13:30:36.295] restarts <- computeRestarts(cond) [13:30:36.295] for (restart in restarts) { [13:30:36.295] name <- restart$name [13:30:36.295] if (is.null(name)) [13:30:36.295] next [13:30:36.295] if (!grepl(pattern, name)) [13:30:36.295] next [13:30:36.295] invokeRestart(restart) [13:30:36.295] muffled <- TRUE [13:30:36.295] break [13:30:36.295] } [13:30:36.295] } [13:30:36.295] } [13:30:36.295] invisible(muffled) [13:30:36.295] } [13:30:36.295] muffleCondition(cond, pattern = "^muffle") [13:30:36.295] } [13:30:36.295] } [13:30:36.295] else { [13:30:36.295] if (TRUE) { [13:30:36.295] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.295] { [13:30:36.295] inherits <- base::inherits [13:30:36.295] invokeRestart <- base::invokeRestart [13:30:36.295] is.null <- base::is.null [13:30:36.295] muffled <- FALSE [13:30:36.295] if (inherits(cond, "message")) { [13:30:36.295] muffled <- grepl(pattern, "muffleMessage") [13:30:36.295] if (muffled) [13:30:36.295] invokeRestart("muffleMessage") [13:30:36.295] } [13:30:36.295] else if (inherits(cond, "warning")) { [13:30:36.295] muffled <- grepl(pattern, "muffleWarning") [13:30:36.295] if (muffled) [13:30:36.295] invokeRestart("muffleWarning") [13:30:36.295] } [13:30:36.295] else if (inherits(cond, "condition")) { [13:30:36.295] if (!is.null(pattern)) { [13:30:36.295] computeRestarts <- base::computeRestarts [13:30:36.295] grepl <- base::grepl [13:30:36.295] restarts <- computeRestarts(cond) [13:30:36.295] for (restart in restarts) { [13:30:36.295] name <- restart$name [13:30:36.295] if (is.null(name)) [13:30:36.295] next [13:30:36.295] if (!grepl(pattern, name)) [13:30:36.295] next [13:30:36.295] invokeRestart(restart) [13:30:36.295] muffled <- TRUE [13:30:36.295] break [13:30:36.295] } [13:30:36.295] } [13:30:36.295] } [13:30:36.295] invisible(muffled) [13:30:36.295] } [13:30:36.295] muffleCondition(cond, pattern = "^muffle") [13:30:36.295] } [13:30:36.295] } [13:30:36.295] } [13:30:36.295] })) [13:30:36.295] }, error = function(ex) { [13:30:36.295] base::structure(base::list(value = NULL, visible = NULL, [13:30:36.295] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.295] ...future.rng), started = ...future.startTime, [13:30:36.295] finished = Sys.time(), session_uuid = NA_character_, [13:30:36.295] version = "1.8"), class = "FutureResult") [13:30:36.295] }, finally = { [13:30:36.295] if (!identical(...future.workdir, getwd())) [13:30:36.295] setwd(...future.workdir) [13:30:36.295] { [13:30:36.295] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:36.295] ...future.oldOptions$nwarnings <- NULL [13:30:36.295] } [13:30:36.295] base::options(...future.oldOptions) [13:30:36.295] if (.Platform$OS.type == "windows") { [13:30:36.295] old_names <- names(...future.oldEnvVars) [13:30:36.295] envs <- base::Sys.getenv() [13:30:36.295] names <- names(envs) [13:30:36.295] common <- intersect(names, old_names) [13:30:36.295] added <- setdiff(names, old_names) [13:30:36.295] removed <- setdiff(old_names, names) [13:30:36.295] changed <- common[...future.oldEnvVars[common] != [13:30:36.295] envs[common]] [13:30:36.295] NAMES <- toupper(changed) [13:30:36.295] args <- list() [13:30:36.295] for (kk in seq_along(NAMES)) { [13:30:36.295] name <- changed[[kk]] [13:30:36.295] NAME <- NAMES[[kk]] [13:30:36.295] if (name != NAME && is.element(NAME, old_names)) [13:30:36.295] next [13:30:36.295] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.295] } [13:30:36.295] NAMES <- toupper(added) [13:30:36.295] for (kk in seq_along(NAMES)) { [13:30:36.295] name <- added[[kk]] [13:30:36.295] NAME <- NAMES[[kk]] [13:30:36.295] if (name != NAME && is.element(NAME, old_names)) [13:30:36.295] next [13:30:36.295] args[[name]] <- "" [13:30:36.295] } [13:30:36.295] NAMES <- toupper(removed) [13:30:36.295] for (kk in seq_along(NAMES)) { [13:30:36.295] name <- removed[[kk]] [13:30:36.295] NAME <- NAMES[[kk]] [13:30:36.295] if (name != NAME && is.element(NAME, old_names)) [13:30:36.295] next [13:30:36.295] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.295] } [13:30:36.295] if (length(args) > 0) [13:30:36.295] base::do.call(base::Sys.setenv, args = args) [13:30:36.295] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:36.295] } [13:30:36.295] else { [13:30:36.295] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:36.295] } [13:30:36.295] { [13:30:36.295] if (base::length(...future.futureOptionsAdded) > [13:30:36.295] 0L) { [13:30:36.295] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:36.295] base::names(opts) <- ...future.futureOptionsAdded [13:30:36.295] base::options(opts) [13:30:36.295] } [13:30:36.295] { [13:30:36.295] NULL [13:30:36.295] options(future.plan = NULL) [13:30:36.295] if (is.na(NA_character_)) [13:30:36.295] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.295] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:36.295] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:36.295] .init = FALSE) [13:30:36.295] } [13:30:36.295] } [13:30:36.295] } [13:30:36.295] }) [13:30:36.295] if (TRUE) { [13:30:36.295] base::sink(type = "output", split = FALSE) [13:30:36.295] if (TRUE) { [13:30:36.295] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:36.295] } [13:30:36.295] else { [13:30:36.295] ...future.result["stdout"] <- base::list(NULL) [13:30:36.295] } [13:30:36.295] base::close(...future.stdout) [13:30:36.295] ...future.stdout <- NULL [13:30:36.295] } [13:30:36.295] ...future.result$conditions <- ...future.conditions [13:30:36.295] ...future.result$finished <- base::Sys.time() [13:30:36.295] ...future.result [13:30:36.295] } [13:30:36.299] - Launch lazy future ... done [13:30:36.299] run() for 'MiraiFuture' ... done [13:30:36.301] getGlobalsAndPackages() ... [13:30:36.302] Searching for globals... [13:30:36.303] - globals found: [3] '{', '*', 'a' [13:30:36.303] Searching for globals ... DONE [13:30:36.303] Resolving globals: FALSE [13:30:36.303] The total size of the 1 globals is 56 bytes (56 bytes) [13:30:36.304] 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:30:36.304] - globals: [1] 'a' [13:30:36.304] [13:30:36.304] getGlobalsAndPackages() ... DONE [13:30:36.305] run() for 'Future' ... [13:30:36.305] - state: 'created' [13:30:36.305] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:30:36.307] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:30:36.308] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:30:36.308] - Field: 'label' [13:30:36.308] - Field: 'local' [13:30:36.308] - Field: 'owner' [13:30:36.308] - Field: 'envir' [13:30:36.308] - Field: 'packages' [13:30:36.309] - Field: 'gc' [13:30:36.309] - Field: 'conditions' [13:30:36.309] - Field: 'expr' [13:30:36.309] - Field: 'uuid' [13:30:36.309] - Field: 'seed' [13:30:36.309] - Field: 'version' [13:30:36.310] - Field: 'result' [13:30:36.310] - Field: 'asynchronous' [13:30:36.310] - Field: 'calls' [13:30:36.310] - Field: 'globals' [13:30:36.310] - Field: 'stdout' [13:30:36.310] - Field: 'earlySignal' [13:30:36.311] - Field: 'lazy' [13:30:36.311] - Field: 'state' [13:30:36.311] - Field: '.cluster' [13:30:36.311] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:30:36.311] - Launch lazy future ... [13:30:36.311] Packages needed by the future expression (n = 0): [13:30:36.312] Packages needed by future strategies (n = 0): [13:30:36.312] { [13:30:36.312] { [13:30:36.312] { [13:30:36.312] ...future.startTime <- base::Sys.time() [13:30:36.312] { [13:30:36.312] { [13:30:36.312] { [13:30:36.312] base::local({ [13:30:36.312] has_future <- base::requireNamespace("future", [13:30:36.312] quietly = TRUE) [13:30:36.312] if (has_future) { [13:30:36.312] ns <- base::getNamespace("future") [13:30:36.312] version <- ns[[".package"]][["version"]] [13:30:36.312] if (is.null(version)) [13:30:36.312] version <- utils::packageVersion("future") [13:30:36.312] } [13:30:36.312] else { [13:30:36.312] version <- NULL [13:30:36.312] } [13:30:36.312] if (!has_future || version < "1.8.0") { [13:30:36.312] info <- base::c(r_version = base::gsub("R version ", [13:30:36.312] "", base::R.version$version.string), [13:30:36.312] platform = base::sprintf("%s (%s-bit)", [13:30:36.312] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:30:36.312] os = base::paste(base::Sys.info()[base::c("sysname", [13:30:36.312] "release", "version")], collapse = " "), [13:30:36.312] hostname = base::Sys.info()[["nodename"]]) [13:30:36.312] info <- base::sprintf("%s: %s", base::names(info), [13:30:36.312] info) [13:30:36.312] info <- base::paste(info, collapse = "; ") [13:30:36.312] if (!has_future) { [13:30:36.312] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:30:36.312] info) [13:30:36.312] } [13:30:36.312] else { [13:30:36.312] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:30:36.312] info, version) [13:30:36.312] } [13:30:36.312] base::stop(msg) [13:30:36.312] } [13:30:36.312] }) [13:30:36.312] } [13:30:36.312] ...future.strategy.old <- future::plan("list") [13:30:36.312] options(future.plan = NULL) [13:30:36.312] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.312] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:30:36.312] } [13:30:36.312] ...future.workdir <- getwd() [13:30:36.312] } [13:30:36.312] ...future.oldOptions <- base::as.list(base::.Options) [13:30:36.312] ...future.oldEnvVars <- base::Sys.getenv() [13:30:36.312] } [13:30:36.312] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:30:36.312] future.globals.maxSize = NULL, future.globals.method = NULL, [13:30:36.312] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:30:36.312] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:30:36.312] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:30:36.312] future.stdout.windows.reencode = NULL, width = 80L) [13:30:36.312] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:30:36.312] base::names(...future.oldOptions)) [13:30:36.312] } [13:30:36.312] if (FALSE) { [13:30:36.312] } [13:30:36.312] else { [13:30:36.312] if (TRUE) { [13:30:36.312] ...future.stdout <- base::rawConnection(base::raw(0L), [13:30:36.312] open = "w") [13:30:36.312] } [13:30:36.312] else { [13:30:36.312] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:30:36.312] windows = "NUL", "/dev/null"), open = "w") [13:30:36.312] } [13:30:36.312] base::sink(...future.stdout, type = "output", split = FALSE) [13:30:36.312] base::on.exit(if (!base::is.null(...future.stdout)) { [13:30:36.312] base::sink(type = "output", split = FALSE) [13:30:36.312] base::close(...future.stdout) [13:30:36.312] }, add = TRUE) [13:30:36.312] } [13:30:36.312] ...future.frame <- base::sys.nframe() [13:30:36.312] ...future.conditions <- base::list() [13:30:36.312] ...future.rng <- base::globalenv()$.Random.seed [13:30:36.312] if (FALSE) { [13:30:36.312] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:30:36.312] "...future.value", "...future.globalenv.names", ".Random.seed") [13:30:36.312] } [13:30:36.312] ...future.result <- base::tryCatch({ [13:30:36.312] base::withCallingHandlers({ [13:30:36.312] ...future.value <- base::withVisible(base::local({ [13:30:36.312] 2 * a [13:30:36.312] })) [13:30:36.312] future::FutureResult(value = ...future.value$value, [13:30:36.312] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.312] ...future.rng), globalenv = if (FALSE) [13:30:36.312] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:30:36.312] ...future.globalenv.names)) [13:30:36.312] else NULL, started = ...future.startTime, version = "1.8") [13:30:36.312] }, condition = base::local({ [13:30:36.312] c <- base::c [13:30:36.312] inherits <- base::inherits [13:30:36.312] invokeRestart <- base::invokeRestart [13:30:36.312] length <- base::length [13:30:36.312] list <- base::list [13:30:36.312] seq.int <- base::seq.int [13:30:36.312] signalCondition <- base::signalCondition [13:30:36.312] sys.calls <- base::sys.calls [13:30:36.312] `[[` <- base::`[[` [13:30:36.312] `+` <- base::`+` [13:30:36.312] `<<-` <- base::`<<-` [13:30:36.312] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:30:36.312] calls[seq.int(from = from + 12L, to = length(calls) - [13:30:36.312] 3L)] [13:30:36.312] } [13:30:36.312] function(cond) { [13:30:36.312] is_error <- inherits(cond, "error") [13:30:36.312] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:30:36.312] NULL) [13:30:36.312] if (is_error) { [13:30:36.312] sessionInformation <- function() { [13:30:36.312] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:30:36.312] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:30:36.312] search = base::search(), system = base::Sys.info()) [13:30:36.312] } [13:30:36.312] ...future.conditions[[length(...future.conditions) + [13:30:36.312] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:30:36.312] cond$call), session = sessionInformation(), [13:30:36.312] timestamp = base::Sys.time(), signaled = 0L) [13:30:36.312] signalCondition(cond) [13:30:36.312] } [13:30:36.312] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:30:36.312] signal <- FALSE && inherits(cond, character(0)) [13:30:36.312] ...future.conditions[[length(...future.conditions) + [13:30:36.312] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:30:36.312] if (FALSE && !signal) { [13:30:36.312] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.312] { [13:30:36.312] inherits <- base::inherits [13:30:36.312] invokeRestart <- base::invokeRestart [13:30:36.312] is.null <- base::is.null [13:30:36.312] muffled <- FALSE [13:30:36.312] if (inherits(cond, "message")) { [13:30:36.312] muffled <- grepl(pattern, "muffleMessage") [13:30:36.312] if (muffled) [13:30:36.312] invokeRestart("muffleMessage") [13:30:36.312] } [13:30:36.312] else if (inherits(cond, "warning")) { [13:30:36.312] muffled <- grepl(pattern, "muffleWarning") [13:30:36.312] if (muffled) [13:30:36.312] invokeRestart("muffleWarning") [13:30:36.312] } [13:30:36.312] else if (inherits(cond, "condition")) { [13:30:36.312] if (!is.null(pattern)) { [13:30:36.312] computeRestarts <- base::computeRestarts [13:30:36.312] grepl <- base::grepl [13:30:36.312] restarts <- computeRestarts(cond) [13:30:36.312] for (restart in restarts) { [13:30:36.312] name <- restart$name [13:30:36.312] if (is.null(name)) [13:30:36.312] next [13:30:36.312] if (!grepl(pattern, name)) [13:30:36.312] next [13:30:36.312] invokeRestart(restart) [13:30:36.312] muffled <- TRUE [13:30:36.312] break [13:30:36.312] } [13:30:36.312] } [13:30:36.312] } [13:30:36.312] invisible(muffled) [13:30:36.312] } [13:30:36.312] muffleCondition(cond, pattern = "^muffle") [13:30:36.312] } [13:30:36.312] } [13:30:36.312] else { [13:30:36.312] if (TRUE) { [13:30:36.312] muffleCondition <- function (cond, pattern = "^muffle") [13:30:36.312] { [13:30:36.312] inherits <- base::inherits [13:30:36.312] invokeRestart <- base::invokeRestart [13:30:36.312] is.null <- base::is.null [13:30:36.312] muffled <- FALSE [13:30:36.312] if (inherits(cond, "message")) { [13:30:36.312] muffled <- grepl(pattern, "muffleMessage") [13:30:36.312] if (muffled) [13:30:36.312] invokeRestart("muffleMessage") [13:30:36.312] } [13:30:36.312] else if (inherits(cond, "warning")) { [13:30:36.312] muffled <- grepl(pattern, "muffleWarning") [13:30:36.312] if (muffled) [13:30:36.312] invokeRestart("muffleWarning") [13:30:36.312] } [13:30:36.312] else if (inherits(cond, "condition")) { [13:30:36.312] if (!is.null(pattern)) { [13:30:36.312] computeRestarts <- base::computeRestarts [13:30:36.312] grepl <- base::grepl [13:30:36.312] restarts <- computeRestarts(cond) [13:30:36.312] for (restart in restarts) { [13:30:36.312] name <- restart$name [13:30:36.312] if (is.null(name)) [13:30:36.312] next [13:30:36.312] if (!grepl(pattern, name)) [13:30:36.312] next [13:30:36.312] invokeRestart(restart) [13:30:36.312] muffled <- TRUE [13:30:36.312] break [13:30:36.312] } [13:30:36.312] } [13:30:36.312] } [13:30:36.312] invisible(muffled) [13:30:36.312] } [13:30:36.312] muffleCondition(cond, pattern = "^muffle") [13:30:36.312] } [13:30:36.312] } [13:30:36.312] } [13:30:36.312] })) [13:30:36.312] }, error = function(ex) { [13:30:36.312] base::structure(base::list(value = NULL, visible = NULL, [13:30:36.312] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:30:36.312] ...future.rng), started = ...future.startTime, [13:30:36.312] finished = Sys.time(), session_uuid = NA_character_, [13:30:36.312] version = "1.8"), class = "FutureResult") [13:30:36.312] }, finally = { [13:30:36.312] if (!identical(...future.workdir, getwd())) [13:30:36.312] setwd(...future.workdir) [13:30:36.312] { [13:30:36.312] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:30:36.312] ...future.oldOptions$nwarnings <- NULL [13:30:36.312] } [13:30:36.312] base::options(...future.oldOptions) [13:30:36.312] if (.Platform$OS.type == "windows") { [13:30:36.312] old_names <- names(...future.oldEnvVars) [13:30:36.312] envs <- base::Sys.getenv() [13:30:36.312] names <- names(envs) [13:30:36.312] common <- intersect(names, old_names) [13:30:36.312] added <- setdiff(names, old_names) [13:30:36.312] removed <- setdiff(old_names, names) [13:30:36.312] changed <- common[...future.oldEnvVars[common] != [13:30:36.312] envs[common]] [13:30:36.312] NAMES <- toupper(changed) [13:30:36.312] args <- list() [13:30:36.312] for (kk in seq_along(NAMES)) { [13:30:36.312] name <- changed[[kk]] [13:30:36.312] NAME <- NAMES[[kk]] [13:30:36.312] if (name != NAME && is.element(NAME, old_names)) [13:30:36.312] next [13:30:36.312] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.312] } [13:30:36.312] NAMES <- toupper(added) [13:30:36.312] for (kk in seq_along(NAMES)) { [13:30:36.312] name <- added[[kk]] [13:30:36.312] NAME <- NAMES[[kk]] [13:30:36.312] if (name != NAME && is.element(NAME, old_names)) [13:30:36.312] next [13:30:36.312] args[[name]] <- "" [13:30:36.312] } [13:30:36.312] NAMES <- toupper(removed) [13:30:36.312] for (kk in seq_along(NAMES)) { [13:30:36.312] name <- removed[[kk]] [13:30:36.312] NAME <- NAMES[[kk]] [13:30:36.312] if (name != NAME && is.element(NAME, old_names)) [13:30:36.312] next [13:30:36.312] args[[name]] <- ...future.oldEnvVars[[name]] [13:30:36.312] } [13:30:36.312] if (length(args) > 0) [13:30:36.312] base::do.call(base::Sys.setenv, args = args) [13:30:36.312] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:30:36.312] } [13:30:36.312] else { [13:30:36.312] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:30:36.312] } [13:30:36.312] { [13:30:36.312] if (base::length(...future.futureOptionsAdded) > [13:30:36.312] 0L) { [13:30:36.312] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:30:36.312] base::names(opts) <- ...future.futureOptionsAdded [13:30:36.312] base::options(opts) [13:30:36.312] } [13:30:36.312] { [13:30:36.312] NULL [13:30:36.312] options(future.plan = NULL) [13:30:36.312] if (is.na(NA_character_)) [13:30:36.312] Sys.unsetenv("R_FUTURE_PLAN") [13:30:36.312] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:30:36.312] future::plan(...future.strategy.old, .cleanup = FALSE, [13:30:36.312] .init = FALSE) [13:30:36.312] } [13:30:36.312] } [13:30:36.312] } [13:30:36.312] }) [13:30:36.312] if (TRUE) { [13:30:36.312] base::sink(type = "output", split = FALSE) [13:30:36.312] if (TRUE) { [13:30:36.312] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:30:36.312] } [13:30:36.312] else { [13:30:36.312] ...future.result["stdout"] <- base::list(NULL) [13:30:36.312] } [13:30:36.312] base::close(...future.stdout) [13:30:36.312] ...future.stdout <- NULL [13:30:36.312] } [13:30:36.312] ...future.result$conditions <- ...future.conditions [13:30:36.312] ...future.result$finished <- base::Sys.time() [13:30:36.312] ...future.result [13:30:36.312] } [13:30:36.316] - Launch lazy future ... done [13:30:36.316] run() for 'MiraiFuture' ... done [13:30:36.318] - plan('mirai_multisession') ... DONE> > message("*** Futures - lazy ... DONE") *** Futures - lazy ... DONE > > source("incl/end.R") > > proc.time() user system elapsed 0.39 0.09 0.92