R Under development (unstable) (2024-05-14 r86553 ucrt) -- "Unsuffered Consequences" 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 [10:55:43.362] plan(): Setting new future strategy stack: [10:55:43.363] List of future strategies: [10:55:43.363] 1. mirai_multisession: [10:55:43.363] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [10:55:43.363] - tweaked: FALSE [10:55:43.363] - call: future::plan(future.mirai::mirai_multisession) [10:55:43.376] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [10:55:43.376] < mirai | $data > [10:55:43.381] getGlobalsAndPackages() ... [10:55:43.382] Not searching for globals [10:55:43.382] - globals: [0] [10:55:43.382] getGlobalsAndPackages() ... DONE [10:55:43.383] getGlobalsAndPackages() ... [10:55:43.383] [10:55:43.383] - globals: [0] [10:55:43.383] getGlobalsAndPackages() ... DONE [10:55:43.665] Packages needed by the future expression (n = 0): [10:55:43.665] Packages needed by future strategies (n = 0): [10:55:43.667] { [10:55:43.667] { [10:55:43.667] { [10:55:43.667] ...future.startTime <- base::Sys.time() [10:55:43.667] { [10:55:43.667] { [10:55:43.667] { [10:55:43.667] base::local({ [10:55:43.667] has_future <- base::requireNamespace("future", [10:55:43.667] quietly = TRUE) [10:55:43.667] if (has_future) { [10:55:43.667] ns <- base::getNamespace("future") [10:55:43.667] version <- ns[[".package"]][["version"]] [10:55:43.667] if (is.null(version)) [10:55:43.667] version <- utils::packageVersion("future") [10:55:43.667] } [10:55:43.667] else { [10:55:43.667] version <- NULL [10:55:43.667] } [10:55:43.667] if (!has_future || version < "1.8.0") { [10:55:43.667] info <- base::c(r_version = base::gsub("R version ", [10:55:43.667] "", base::R.version$version.string), [10:55:43.667] platform = base::sprintf("%s (%s-bit)", [10:55:43.667] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:55:43.667] os = base::paste(base::Sys.info()[base::c("sysname", [10:55:43.667] "release", "version")], collapse = " "), [10:55:43.667] hostname = base::Sys.info()[["nodename"]]) [10:55:43.667] info <- base::sprintf("%s: %s", base::names(info), [10:55:43.667] info) [10:55:43.667] info <- base::paste(info, collapse = "; ") [10:55:43.667] if (!has_future) { [10:55:43.667] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:55:43.667] info) [10:55:43.667] } [10:55:43.667] else { [10:55:43.667] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:55:43.667] info, version) [10:55:43.667] } [10:55:43.667] base::stop(msg) [10:55:43.667] } [10:55:43.667] }) [10:55:43.667] } [10:55:43.667] ...future.strategy.old <- future::plan("list") [10:55:43.667] options(future.plan = NULL) [10:55:43.667] Sys.unsetenv("R_FUTURE_PLAN") [10:55:43.667] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:55:43.667] } [10:55:43.667] ...future.workdir <- getwd() [10:55:43.667] } [10:55:43.667] ...future.oldOptions <- base::as.list(base::.Options) [10:55:43.667] ...future.oldEnvVars <- base::Sys.getenv() [10:55:43.667] } [10:55:43.667] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:55:43.667] future.globals.maxSize = NULL, future.globals.method = NULL, [10:55:43.667] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:55:43.667] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:55:43.667] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:55:43.667] future.stdout.windows.reencode = NULL, width = 80L) [10:55:43.667] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:55:43.667] base::names(...future.oldOptions)) [10:55:43.667] } [10:55:43.667] if (FALSE) { [10:55:43.667] } [10:55:43.667] else { [10:55:43.667] if (TRUE) { [10:55:43.667] ...future.stdout <- base::rawConnection(base::raw(0L), [10:55:43.667] open = "w") [10:55:43.667] } [10:55:43.667] else { [10:55:43.667] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:55:43.667] windows = "NUL", "/dev/null"), open = "w") [10:55:43.667] } [10:55:43.667] base::sink(...future.stdout, type = "output", split = FALSE) [10:55:43.667] base::on.exit(if (!base::is.null(...future.stdout)) { [10:55:43.667] base::sink(type = "output", split = FALSE) [10:55:43.667] base::close(...future.stdout) [10:55:43.667] }, add = TRUE) [10:55:43.667] } [10:55:43.667] ...future.frame <- base::sys.nframe() [10:55:43.667] ...future.conditions <- base::list() [10:55:43.667] ...future.rng <- base::globalenv()$.Random.seed [10:55:43.667] if (FALSE) { [10:55:43.667] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:55:43.667] "...future.value", "...future.globalenv.names", ".Random.seed") [10:55:43.667] } [10:55:43.667] ...future.result <- base::tryCatch({ [10:55:43.667] base::withCallingHandlers({ [10:55:43.667] ...future.value <- base::withVisible(base::local(NA)) [10:55:43.667] future::FutureResult(value = ...future.value$value, [10:55:43.667] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:55:43.667] ...future.rng), globalenv = if (FALSE) [10:55:43.667] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:55:43.667] ...future.globalenv.names)) [10:55:43.667] else NULL, started = ...future.startTime, version = "1.8") [10:55:43.667] }, condition = base::local({ [10:55:43.667] c <- base::c [10:55:43.667] inherits <- base::inherits [10:55:43.667] invokeRestart <- base::invokeRestart [10:55:43.667] length <- base::length [10:55:43.667] list <- base::list [10:55:43.667] seq.int <- base::seq.int [10:55:43.667] signalCondition <- base::signalCondition [10:55:43.667] sys.calls <- base::sys.calls [10:55:43.667] `[[` <- base::`[[` [10:55:43.667] `+` <- base::`+` [10:55:43.667] `<<-` <- base::`<<-` [10:55:43.667] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:55:43.667] calls[seq.int(from = from + 12L, to = length(calls) - [10:55:43.667] 3L)] [10:55:43.667] } [10:55:43.667] function(cond) { [10:55:43.667] is_error <- inherits(cond, "error") [10:55:43.667] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:55:43.667] NULL) [10:55:43.667] if (is_error) { [10:55:43.667] sessionInformation <- function() { [10:55:43.667] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:55:43.667] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:55:43.667] search = base::search(), system = base::Sys.info()) [10:55:43.667] } [10:55:43.667] ...future.conditions[[length(...future.conditions) + [10:55:43.667] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:55:43.667] cond$call), session = sessionInformation(), [10:55:43.667] timestamp = base::Sys.time(), signaled = 0L) [10:55:43.667] signalCondition(cond) [10:55:43.667] } [10:55:43.667] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:55:43.667] signal <- FALSE && inherits(cond, character(0)) [10:55:43.667] ...future.conditions[[length(...future.conditions) + [10:55:43.667] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:55:43.667] if (FALSE && !signal) { [10:55:43.667] muffleCondition <- function (cond, pattern = "^muffle") [10:55:43.667] { [10:55:43.667] inherits <- base::inherits [10:55:43.667] invokeRestart <- base::invokeRestart [10:55:43.667] is.null <- base::is.null [10:55:43.667] muffled <- FALSE [10:55:43.667] if (inherits(cond, "message")) { [10:55:43.667] muffled <- grepl(pattern, "muffleMessage") [10:55:43.667] if (muffled) [10:55:43.667] invokeRestart("muffleMessage") [10:55:43.667] } [10:55:43.667] else if (inherits(cond, "warning")) { [10:55:43.667] muffled <- grepl(pattern, "muffleWarning") [10:55:43.667] if (muffled) [10:55:43.667] invokeRestart("muffleWarning") [10:55:43.667] } [10:55:43.667] else if (inherits(cond, "condition")) { [10:55:43.667] if (!is.null(pattern)) { [10:55:43.667] computeRestarts <- base::computeRestarts [10:55:43.667] grepl <- base::grepl [10:55:43.667] restarts <- computeRestarts(cond) [10:55:43.667] for (restart in restarts) { [10:55:43.667] name <- restart$name [10:55:43.667] if (is.null(name)) [10:55:43.667] next [10:55:43.667] if (!grepl(pattern, name)) [10:55:43.667] next [10:55:43.667] invokeRestart(restart) [10:55:43.667] muffled <- TRUE [10:55:43.667] break [10:55:43.667] } [10:55:43.667] } [10:55:43.667] } [10:55:43.667] invisible(muffled) [10:55:43.667] } [10:55:43.667] muffleCondition(cond, pattern = "^muffle") [10:55:43.667] } [10:55:43.667] } [10:55:43.667] else { [10:55:43.667] if (TRUE) { [10:55:43.667] muffleCondition <- function (cond, pattern = "^muffle") [10:55:43.667] { [10:55:43.667] inherits <- base::inherits [10:55:43.667] invokeRestart <- base::invokeRestart [10:55:43.667] is.null <- base::is.null [10:55:43.667] muffled <- FALSE [10:55:43.667] if (inherits(cond, "message")) { [10:55:43.667] muffled <- grepl(pattern, "muffleMessage") [10:55:43.667] if (muffled) [10:55:43.667] invokeRestart("muffleMessage") [10:55:43.667] } [10:55:43.667] else if (inherits(cond, "warning")) { [10:55:43.667] muffled <- grepl(pattern, "muffleWarning") [10:55:43.667] if (muffled) [10:55:43.667] invokeRestart("muffleWarning") [10:55:43.667] } [10:55:43.667] else if (inherits(cond, "condition")) { [10:55:43.667] if (!is.null(pattern)) { [10:55:43.667] computeRestarts <- base::computeRestarts [10:55:43.667] grepl <- base::grepl [10:55:43.667] restarts <- computeRestarts(cond) [10:55:43.667] for (restart in restarts) { [10:55:43.667] name <- restart$name [10:55:43.667] if (is.null(name)) [10:55:43.667] next [10:55:43.667] if (!grepl(pattern, name)) [10:55:43.667] next [10:55:43.667] invokeRestart(restart) [10:55:43.667] muffled <- TRUE [10:55:43.667] break [10:55:43.667] } [10:55:43.667] } [10:55:43.667] } [10:55:43.667] invisible(muffled) [10:55:43.667] } [10:55:43.667] muffleCondition(cond, pattern = "^muffle") [10:55:43.667] } [10:55:43.667] } [10:55:43.667] } [10:55:43.667] })) [10:55:43.667] }, error = function(ex) { [10:55:43.667] base::structure(base::list(value = NULL, visible = NULL, [10:55:43.667] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:55:43.667] ...future.rng), started = ...future.startTime, [10:55:43.667] finished = Sys.time(), session_uuid = NA_character_, [10:55:43.667] version = "1.8"), class = "FutureResult") [10:55:43.667] }, finally = { [10:55:43.667] if (!identical(...future.workdir, getwd())) [10:55:43.667] setwd(...future.workdir) [10:55:43.667] { [10:55:43.667] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:55:43.667] ...future.oldOptions$nwarnings <- NULL [10:55:43.667] } [10:55:43.667] base::options(...future.oldOptions) [10:55:43.667] if (.Platform$OS.type == "windows") { [10:55:43.667] old_names <- names(...future.oldEnvVars) [10:55:43.667] envs <- base::Sys.getenv() [10:55:43.667] names <- names(envs) [10:55:43.667] common <- intersect(names, old_names) [10:55:43.667] added <- setdiff(names, old_names) [10:55:43.667] removed <- setdiff(old_names, names) [10:55:43.667] changed <- common[...future.oldEnvVars[common] != [10:55:43.667] envs[common]] [10:55:43.667] NAMES <- toupper(changed) [10:55:43.667] args <- list() [10:55:43.667] for (kk in seq_along(NAMES)) { [10:55:43.667] name <- changed[[kk]] [10:55:43.667] NAME <- NAMES[[kk]] [10:55:43.667] if (name != NAME && is.element(NAME, old_names)) [10:55:43.667] next [10:55:43.667] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:43.667] } [10:55:43.667] NAMES <- toupper(added) [10:55:43.667] for (kk in seq_along(NAMES)) { [10:55:43.667] name <- added[[kk]] [10:55:43.667] NAME <- NAMES[[kk]] [10:55:43.667] if (name != NAME && is.element(NAME, old_names)) [10:55:43.667] next [10:55:43.667] args[[name]] <- "" [10:55:43.667] } [10:55:43.667] NAMES <- toupper(removed) [10:55:43.667] for (kk in seq_along(NAMES)) { [10:55:43.667] name <- removed[[kk]] [10:55:43.667] NAME <- NAMES[[kk]] [10:55:43.667] if (name != NAME && is.element(NAME, old_names)) [10:55:43.667] next [10:55:43.667] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:43.667] } [10:55:43.667] if (length(args) > 0) [10:55:43.667] base::do.call(base::Sys.setenv, args = args) [10:55:43.667] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:55:43.667] } [10:55:43.667] else { [10:55:43.667] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:55:43.667] } [10:55:43.667] { [10:55:43.667] if (base::length(...future.futureOptionsAdded) > [10:55:43.667] 0L) { [10:55:43.667] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:55:43.667] base::names(opts) <- ...future.futureOptionsAdded [10:55:43.667] base::options(opts) [10:55:43.667] } [10:55:43.667] { [10:55:43.667] NULL [10:55:43.667] options(future.plan = NULL) [10:55:43.667] if (is.na(NA_character_)) [10:55:43.667] Sys.unsetenv("R_FUTURE_PLAN") [10:55:43.667] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:55:43.667] future::plan(...future.strategy.old, .cleanup = FALSE, [10:55:43.667] .init = FALSE) [10:55:43.667] } [10:55:43.667] } [10:55:43.667] } [10:55:43.667] }) [10:55:43.667] if (TRUE) { [10:55:43.667] base::sink(type = "output", split = FALSE) [10:55:43.667] if (TRUE) { [10:55:43.667] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:55:43.667] } [10:55:43.667] else { [10:55:43.667] ...future.result["stdout"] <- base::list(NULL) [10:55:43.667] } [10:55:43.667] base::close(...future.stdout) [10:55:43.667] ...future.stdout <- NULL [10:55:43.667] } [10:55:43.667] ...future.result$conditions <- ...future.conditions [10:55:43.667] ...future.result$finished <- base::Sys.time() [10:55:43.667] ...future.result [10:55:43.667] } [10:55:43.784] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [10:55:43.785] 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 ...) [10:55:43.793] - plan('mirai_cluster') ...[10:55:43.794] plan(): Setting new future strategy stack: [10:55:43.794] List of future strategies: [10:55:43.794] 1. mirai_cluster: [10:55:43.794] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = "") [10:55:43.794] - tweaked: FALSE [10:55:43.794] - call: plan(strategy) [10:55:43.810] plan(): plan_init() of 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [10:55:43.810] < mirai | $data > [10:55:43.811] getGlobalsAndPackages() ... [10:55:43.811] Not searching for globals [10:55:43.811] - globals: [0] [10:55:43.811] getGlobalsAndPackages() ... DONE [10:55:43.811] getGlobalsAndPackages() ... [10:55:43.811] [10:55:43.812] - globals: [0] [10:55:43.812] getGlobalsAndPackages() ... DONE [10:55:43.812] Packages needed by the future expression (n = 0): [10:55:43.812] Packages needed by future strategies (n = 0): [10:55:43.813] { [10:55:43.813] { [10:55:43.813] { [10:55:43.813] ...future.startTime <- base::Sys.time() [10:55:43.813] { [10:55:43.813] { [10:55:43.813] { [10:55:43.813] base::local({ [10:55:43.813] has_future <- base::requireNamespace("future", [10:55:43.813] quietly = TRUE) [10:55:43.813] if (has_future) { [10:55:43.813] ns <- base::getNamespace("future") [10:55:43.813] version <- ns[[".package"]][["version"]] [10:55:43.813] if (is.null(version)) [10:55:43.813] version <- utils::packageVersion("future") [10:55:43.813] } [10:55:43.813] else { [10:55:43.813] version <- NULL [10:55:43.813] } [10:55:43.813] if (!has_future || version < "1.8.0") { [10:55:43.813] info <- base::c(r_version = base::gsub("R version ", [10:55:43.813] "", base::R.version$version.string), [10:55:43.813] platform = base::sprintf("%s (%s-bit)", [10:55:43.813] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:55:43.813] os = base::paste(base::Sys.info()[base::c("sysname", [10:55:43.813] "release", "version")], collapse = " "), [10:55:43.813] hostname = base::Sys.info()[["nodename"]]) [10:55:43.813] info <- base::sprintf("%s: %s", base::names(info), [10:55:43.813] info) [10:55:43.813] info <- base::paste(info, collapse = "; ") [10:55:43.813] if (!has_future) { [10:55:43.813] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:55:43.813] info) [10:55:43.813] } [10:55:43.813] else { [10:55:43.813] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:55:43.813] info, version) [10:55:43.813] } [10:55:43.813] base::stop(msg) [10:55:43.813] } [10:55:43.813] }) [10:55:43.813] } [10:55:43.813] ...future.strategy.old <- future::plan("list") [10:55:43.813] options(future.plan = NULL) [10:55:43.813] Sys.unsetenv("R_FUTURE_PLAN") [10:55:43.813] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:55:43.813] } [10:55:43.813] ...future.workdir <- getwd() [10:55:43.813] } [10:55:43.813] ...future.oldOptions <- base::as.list(base::.Options) [10:55:43.813] ...future.oldEnvVars <- base::Sys.getenv() [10:55:43.813] } [10:55:43.813] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:55:43.813] future.globals.maxSize = NULL, future.globals.method = NULL, [10:55:43.813] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:55:43.813] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:55:43.813] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:55:43.813] future.stdout.windows.reencode = NULL, width = 80L) [10:55:43.813] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:55:43.813] base::names(...future.oldOptions)) [10:55:43.813] } [10:55:43.813] if (FALSE) { [10:55:43.813] } [10:55:43.813] else { [10:55:43.813] if (TRUE) { [10:55:43.813] ...future.stdout <- base::rawConnection(base::raw(0L), [10:55:43.813] open = "w") [10:55:43.813] } [10:55:43.813] else { [10:55:43.813] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:55:43.813] windows = "NUL", "/dev/null"), open = "w") [10:55:43.813] } [10:55:43.813] base::sink(...future.stdout, type = "output", split = FALSE) [10:55:43.813] base::on.exit(if (!base::is.null(...future.stdout)) { [10:55:43.813] base::sink(type = "output", split = FALSE) [10:55:43.813] base::close(...future.stdout) [10:55:43.813] }, add = TRUE) [10:55:43.813] } [10:55:43.813] ...future.frame <- base::sys.nframe() [10:55:43.813] ...future.conditions <- base::list() [10:55:43.813] ...future.rng <- base::globalenv()$.Random.seed [10:55:43.813] if (FALSE) { [10:55:43.813] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:55:43.813] "...future.value", "...future.globalenv.names", ".Random.seed") [10:55:43.813] } [10:55:43.813] ...future.result <- base::tryCatch({ [10:55:43.813] base::withCallingHandlers({ [10:55:43.813] ...future.value <- base::withVisible(base::local(NA)) [10:55:43.813] future::FutureResult(value = ...future.value$value, [10:55:43.813] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:55:43.813] ...future.rng), globalenv = if (FALSE) [10:55:43.813] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:55:43.813] ...future.globalenv.names)) [10:55:43.813] else NULL, started = ...future.startTime, version = "1.8") [10:55:43.813] }, condition = base::local({ [10:55:43.813] c <- base::c [10:55:43.813] inherits <- base::inherits [10:55:43.813] invokeRestart <- base::invokeRestart [10:55:43.813] length <- base::length [10:55:43.813] list <- base::list [10:55:43.813] seq.int <- base::seq.int [10:55:43.813] signalCondition <- base::signalCondition [10:55:43.813] sys.calls <- base::sys.calls [10:55:43.813] `[[` <- base::`[[` [10:55:43.813] `+` <- base::`+` [10:55:43.813] `<<-` <- base::`<<-` [10:55:43.813] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:55:43.813] calls[seq.int(from = from + 12L, to = length(calls) - [10:55:43.813] 3L)] [10:55:43.813] } [10:55:43.813] function(cond) { [10:55:43.813] is_error <- inherits(cond, "error") [10:55:43.813] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:55:43.813] NULL) [10:55:43.813] if (is_error) { [10:55:43.813] sessionInformation <- function() { [10:55:43.813] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:55:43.813] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:55:43.813] search = base::search(), system = base::Sys.info()) [10:55:43.813] } [10:55:43.813] ...future.conditions[[length(...future.conditions) + [10:55:43.813] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:55:43.813] cond$call), session = sessionInformation(), [10:55:43.813] timestamp = base::Sys.time(), signaled = 0L) [10:55:43.813] signalCondition(cond) [10:55:43.813] } [10:55:43.813] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:55:43.813] signal <- FALSE && inherits(cond, character(0)) [10:55:43.813] ...future.conditions[[length(...future.conditions) + [10:55:43.813] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:55:43.813] if (FALSE && !signal) { [10:55:43.813] muffleCondition <- function (cond, pattern = "^muffle") [10:55:43.813] { [10:55:43.813] inherits <- base::inherits [10:55:43.813] invokeRestart <- base::invokeRestart [10:55:43.813] is.null <- base::is.null [10:55:43.813] muffled <- FALSE [10:55:43.813] if (inherits(cond, "message")) { [10:55:43.813] muffled <- grepl(pattern, "muffleMessage") [10:55:43.813] if (muffled) [10:55:43.813] invokeRestart("muffleMessage") [10:55:43.813] } [10:55:43.813] else if (inherits(cond, "warning")) { [10:55:43.813] muffled <- grepl(pattern, "muffleWarning") [10:55:43.813] if (muffled) [10:55:43.813] invokeRestart("muffleWarning") [10:55:43.813] } [10:55:43.813] else if (inherits(cond, "condition")) { [10:55:43.813] if (!is.null(pattern)) { [10:55:43.813] computeRestarts <- base::computeRestarts [10:55:43.813] grepl <- base::grepl [10:55:43.813] restarts <- computeRestarts(cond) [10:55:43.813] for (restart in restarts) { [10:55:43.813] name <- restart$name [10:55:43.813] if (is.null(name)) [10:55:43.813] next [10:55:43.813] if (!grepl(pattern, name)) [10:55:43.813] next [10:55:43.813] invokeRestart(restart) [10:55:43.813] muffled <- TRUE [10:55:43.813] break [10:55:43.813] } [10:55:43.813] } [10:55:43.813] } [10:55:43.813] invisible(muffled) [10:55:43.813] } [10:55:43.813] muffleCondition(cond, pattern = "^muffle") [10:55:43.813] } [10:55:43.813] } [10:55:43.813] else { [10:55:43.813] if (TRUE) { [10:55:43.813] muffleCondition <- function (cond, pattern = "^muffle") [10:55:43.813] { [10:55:43.813] inherits <- base::inherits [10:55:43.813] invokeRestart <- base::invokeRestart [10:55:43.813] is.null <- base::is.null [10:55:43.813] muffled <- FALSE [10:55:43.813] if (inherits(cond, "message")) { [10:55:43.813] muffled <- grepl(pattern, "muffleMessage") [10:55:43.813] if (muffled) [10:55:43.813] invokeRestart("muffleMessage") [10:55:43.813] } [10:55:43.813] else if (inherits(cond, "warning")) { [10:55:43.813] muffled <- grepl(pattern, "muffleWarning") [10:55:43.813] if (muffled) [10:55:43.813] invokeRestart("muffleWarning") [10:55:43.813] } [10:55:43.813] else if (inherits(cond, "condition")) { [10:55:43.813] if (!is.null(pattern)) { [10:55:43.813] computeRestarts <- base::computeRestarts [10:55:43.813] grepl <- base::grepl [10:55:43.813] restarts <- computeRestarts(cond) [10:55:43.813] for (restart in restarts) { [10:55:43.813] name <- restart$name [10:55:43.813] if (is.null(name)) [10:55:43.813] next [10:55:43.813] if (!grepl(pattern, name)) [10:55:43.813] next [10:55:43.813] invokeRestart(restart) [10:55:43.813] muffled <- TRUE [10:55:43.813] break [10:55:43.813] } [10:55:43.813] } [10:55:43.813] } [10:55:43.813] invisible(muffled) [10:55:43.813] } [10:55:43.813] muffleCondition(cond, pattern = "^muffle") [10:55:43.813] } [10:55:43.813] } [10:55:43.813] } [10:55:43.813] })) [10:55:43.813] }, error = function(ex) { [10:55:43.813] base::structure(base::list(value = NULL, visible = NULL, [10:55:43.813] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:55:43.813] ...future.rng), started = ...future.startTime, [10:55:43.813] finished = Sys.time(), session_uuid = NA_character_, [10:55:43.813] version = "1.8"), class = "FutureResult") [10:55:43.813] }, finally = { [10:55:43.813] if (!identical(...future.workdir, getwd())) [10:55:43.813] setwd(...future.workdir) [10:55:43.813] { [10:55:43.813] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:55:43.813] ...future.oldOptions$nwarnings <- NULL [10:55:43.813] } [10:55:43.813] base::options(...future.oldOptions) [10:55:43.813] if (.Platform$OS.type == "windows") { [10:55:43.813] old_names <- names(...future.oldEnvVars) [10:55:43.813] envs <- base::Sys.getenv() [10:55:43.813] names <- names(envs) [10:55:43.813] common <- intersect(names, old_names) [10:55:43.813] added <- setdiff(names, old_names) [10:55:43.813] removed <- setdiff(old_names, names) [10:55:43.813] changed <- common[...future.oldEnvVars[common] != [10:55:43.813] envs[common]] [10:55:43.813] NAMES <- toupper(changed) [10:55:43.813] args <- list() [10:55:43.813] for (kk in seq_along(NAMES)) { [10:55:43.813] name <- changed[[kk]] [10:55:43.813] NAME <- NAMES[[kk]] [10:55:43.813] if (name != NAME && is.element(NAME, old_names)) [10:55:43.813] next [10:55:43.813] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:43.813] } [10:55:43.813] NAMES <- toupper(added) [10:55:43.813] for (kk in seq_along(NAMES)) { [10:55:43.813] name <- added[[kk]] [10:55:43.813] NAME <- NAMES[[kk]] [10:55:43.813] if (name != NAME && is.element(NAME, old_names)) [10:55:43.813] next [10:55:43.813] args[[name]] <- "" [10:55:43.813] } [10:55:43.813] NAMES <- toupper(removed) [10:55:43.813] for (kk in seq_along(NAMES)) { [10:55:43.813] name <- removed[[kk]] [10:55:43.813] NAME <- NAMES[[kk]] [10:55:43.813] if (name != NAME && is.element(NAME, old_names)) [10:55:43.813] next [10:55:43.813] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:43.813] } [10:55:43.813] if (length(args) > 0) [10:55:43.813] base::do.call(base::Sys.setenv, args = args) [10:55:43.813] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:55:43.813] } [10:55:43.813] else { [10:55:43.813] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:55:43.813] } [10:55:43.813] { [10:55:43.813] if (base::length(...future.futureOptionsAdded) > [10:55:43.813] 0L) { [10:55:43.813] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:55:43.813] base::names(opts) <- ...future.futureOptionsAdded [10:55:43.813] base::options(opts) [10:55:43.813] } [10:55:43.813] { [10:55:43.813] NULL [10:55:43.813] options(future.plan = NULL) [10:55:43.813] if (is.na(NA_character_)) [10:55:43.813] Sys.unsetenv("R_FUTURE_PLAN") [10:55:43.813] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:55:43.813] future::plan(...future.strategy.old, .cleanup = FALSE, [10:55:43.813] .init = FALSE) [10:55:43.813] } [10:55:43.813] } [10:55:43.813] } [10:55:43.813] }) [10:55:43.813] if (TRUE) { [10:55:43.813] base::sink(type = "output", split = FALSE) [10:55:43.813] if (TRUE) { [10:55:43.813] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:55:43.813] } [10:55:43.813] else { [10:55:43.813] ...future.result["stdout"] <- base::list(NULL) [10:55:43.813] } [10:55:43.813] base::close(...future.stdout) [10:55:43.813] ...future.stdout <- NULL [10:55:43.813] } [10:55:43.813] ...future.result$conditions <- ...future.conditions [10:55:43.813] ...future.result$finished <- base::Sys.time() [10:55:43.813] ...future.result [10:55:43.813] } [10:55:43.986] plan(): plan_init() of 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [10:55:43.987] plan(): nbrOfWorkers() = 2 [10:55:43.987] getGlobalsAndPackages() ... [10:55:43.987] Searching for globals... [10:55:43.991] - globals found: [2] '*', 'a' [10:55:43.992] Searching for globals ... DONE [10:55:43.992] Resolving globals: FALSE [10:55:43.993] The total size of the 1 globals is 56 bytes (56 bytes) [10:55:43.994] 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') [10:55:43.994] - globals: [1] 'a' [10:55:43.994] [10:55:43.994] getGlobalsAndPackages() ... DONE [10:55:43.995] run() for 'Future' ... [10:55:43.995] - state: 'created' [10:55:43.995] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:55:43.996] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:55:43.996] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:55:43.996] - Field: 'label' [10:55:43.996] - Field: 'local' [10:55:43.997] - Field: 'owner' [10:55:43.997] - Field: 'envir' [10:55:43.997] - Field: 'packages' [10:55:43.997] - Field: 'gc' [10:55:43.997] - Field: 'conditions' [10:55:43.997] - Field: 'expr' [10:55:43.998] - Field: 'uuid' [10:55:43.998] - Field: 'seed' [10:55:43.998] - Field: 'version' [10:55:43.998] - Field: 'result' [10:55:43.998] - Field: 'asynchronous' [10:55:43.998] - Field: 'calls' [10:55:43.999] - Field: 'globals' [10:55:43.999] - Field: 'stdout' [10:55:43.999] - Field: 'earlySignal' [10:55:43.999] - Field: 'lazy' [10:55:43.999] - Field: 'state' [10:55:43.999] - Field: '.cluster' [10:55:44.000] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:55:44.000] - Launch lazy future ... [10:55:44.000] Packages needed by the future expression (n = 0): [10:55:44.000] Packages needed by future strategies (n = 0): [10:55:44.001] { [10:55:44.001] { [10:55:44.001] { [10:55:44.001] ...future.startTime <- base::Sys.time() [10:55:44.001] { [10:55:44.001] { [10:55:44.001] { [10:55:44.001] base::local({ [10:55:44.001] has_future <- base::requireNamespace("future", [10:55:44.001] quietly = TRUE) [10:55:44.001] if (has_future) { [10:55:44.001] ns <- base::getNamespace("future") [10:55:44.001] version <- ns[[".package"]][["version"]] [10:55:44.001] if (is.null(version)) [10:55:44.001] version <- utils::packageVersion("future") [10:55:44.001] } [10:55:44.001] else { [10:55:44.001] version <- NULL [10:55:44.001] } [10:55:44.001] if (!has_future || version < "1.8.0") { [10:55:44.001] info <- base::c(r_version = base::gsub("R version ", [10:55:44.001] "", base::R.version$version.string), [10:55:44.001] platform = base::sprintf("%s (%s-bit)", [10:55:44.001] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:55:44.001] os = base::paste(base::Sys.info()[base::c("sysname", [10:55:44.001] "release", "version")], collapse = " "), [10:55:44.001] hostname = base::Sys.info()[["nodename"]]) [10:55:44.001] info <- base::sprintf("%s: %s", base::names(info), [10:55:44.001] info) [10:55:44.001] info <- base::paste(info, collapse = "; ") [10:55:44.001] if (!has_future) { [10:55:44.001] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:55:44.001] info) [10:55:44.001] } [10:55:44.001] else { [10:55:44.001] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:55:44.001] info, version) [10:55:44.001] } [10:55:44.001] base::stop(msg) [10:55:44.001] } [10:55:44.001] }) [10:55:44.001] } [10:55:44.001] ...future.strategy.old <- future::plan("list") [10:55:44.001] options(future.plan = NULL) [10:55:44.001] Sys.unsetenv("R_FUTURE_PLAN") [10:55:44.001] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:55:44.001] } [10:55:44.001] ...future.workdir <- getwd() [10:55:44.001] } [10:55:44.001] ...future.oldOptions <- base::as.list(base::.Options) [10:55:44.001] ...future.oldEnvVars <- base::Sys.getenv() [10:55:44.001] } [10:55:44.001] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:55:44.001] future.globals.maxSize = NULL, future.globals.method = NULL, [10:55:44.001] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:55:44.001] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:55:44.001] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:55:44.001] future.stdout.windows.reencode = NULL, width = 80L) [10:55:44.001] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:55:44.001] base::names(...future.oldOptions)) [10:55:44.001] } [10:55:44.001] if (FALSE) { [10:55:44.001] } [10:55:44.001] else { [10:55:44.001] if (TRUE) { [10:55:44.001] ...future.stdout <- base::rawConnection(base::raw(0L), [10:55:44.001] open = "w") [10:55:44.001] } [10:55:44.001] else { [10:55:44.001] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:55:44.001] windows = "NUL", "/dev/null"), open = "w") [10:55:44.001] } [10:55:44.001] base::sink(...future.stdout, type = "output", split = FALSE) [10:55:44.001] base::on.exit(if (!base::is.null(...future.stdout)) { [10:55:44.001] base::sink(type = "output", split = FALSE) [10:55:44.001] base::close(...future.stdout) [10:55:44.001] }, add = TRUE) [10:55:44.001] } [10:55:44.001] ...future.frame <- base::sys.nframe() [10:55:44.001] ...future.conditions <- base::list() [10:55:44.001] ...future.rng <- base::globalenv()$.Random.seed [10:55:44.001] if (FALSE) { [10:55:44.001] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:55:44.001] "...future.value", "...future.globalenv.names", ".Random.seed") [10:55:44.001] } [10:55:44.001] ...future.result <- base::tryCatch({ [10:55:44.001] base::withCallingHandlers({ [10:55:44.001] ...future.value <- base::withVisible(base::local(2 * [10:55:44.001] a)) [10:55:44.001] future::FutureResult(value = ...future.value$value, [10:55:44.001] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:55:44.001] ...future.rng), globalenv = if (FALSE) [10:55:44.001] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:55:44.001] ...future.globalenv.names)) [10:55:44.001] else NULL, started = ...future.startTime, version = "1.8") [10:55:44.001] }, condition = base::local({ [10:55:44.001] c <- base::c [10:55:44.001] inherits <- base::inherits [10:55:44.001] invokeRestart <- base::invokeRestart [10:55:44.001] length <- base::length [10:55:44.001] list <- base::list [10:55:44.001] seq.int <- base::seq.int [10:55:44.001] signalCondition <- base::signalCondition [10:55:44.001] sys.calls <- base::sys.calls [10:55:44.001] `[[` <- base::`[[` [10:55:44.001] `+` <- base::`+` [10:55:44.001] `<<-` <- base::`<<-` [10:55:44.001] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:55:44.001] calls[seq.int(from = from + 12L, to = length(calls) - [10:55:44.001] 3L)] [10:55:44.001] } [10:55:44.001] function(cond) { [10:55:44.001] is_error <- inherits(cond, "error") [10:55:44.001] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:55:44.001] NULL) [10:55:44.001] if (is_error) { [10:55:44.001] sessionInformation <- function() { [10:55:44.001] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:55:44.001] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:55:44.001] search = base::search(), system = base::Sys.info()) [10:55:44.001] } [10:55:44.001] ...future.conditions[[length(...future.conditions) + [10:55:44.001] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:55:44.001] cond$call), session = sessionInformation(), [10:55:44.001] timestamp = base::Sys.time(), signaled = 0L) [10:55:44.001] signalCondition(cond) [10:55:44.001] } [10:55:44.001] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:55:44.001] signal <- FALSE && inherits(cond, character(0)) [10:55:44.001] ...future.conditions[[length(...future.conditions) + [10:55:44.001] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:55:44.001] if (FALSE && !signal) { [10:55:44.001] muffleCondition <- function (cond, pattern = "^muffle") [10:55:44.001] { [10:55:44.001] inherits <- base::inherits [10:55:44.001] invokeRestart <- base::invokeRestart [10:55:44.001] is.null <- base::is.null [10:55:44.001] muffled <- FALSE [10:55:44.001] if (inherits(cond, "message")) { [10:55:44.001] muffled <- grepl(pattern, "muffleMessage") [10:55:44.001] if (muffled) [10:55:44.001] invokeRestart("muffleMessage") [10:55:44.001] } [10:55:44.001] else if (inherits(cond, "warning")) { [10:55:44.001] muffled <- grepl(pattern, "muffleWarning") [10:55:44.001] if (muffled) [10:55:44.001] invokeRestart("muffleWarning") [10:55:44.001] } [10:55:44.001] else if (inherits(cond, "condition")) { [10:55:44.001] if (!is.null(pattern)) { [10:55:44.001] computeRestarts <- base::computeRestarts [10:55:44.001] grepl <- base::grepl [10:55:44.001] restarts <- computeRestarts(cond) [10:55:44.001] for (restart in restarts) { [10:55:44.001] name <- restart$name [10:55:44.001] if (is.null(name)) [10:55:44.001] next [10:55:44.001] if (!grepl(pattern, name)) [10:55:44.001] next [10:55:44.001] invokeRestart(restart) [10:55:44.001] muffled <- TRUE [10:55:44.001] break [10:55:44.001] } [10:55:44.001] } [10:55:44.001] } [10:55:44.001] invisible(muffled) [10:55:44.001] } [10:55:44.001] muffleCondition(cond, pattern = "^muffle") [10:55:44.001] } [10:55:44.001] } [10:55:44.001] else { [10:55:44.001] if (TRUE) { [10:55:44.001] muffleCondition <- function (cond, pattern = "^muffle") [10:55:44.001] { [10:55:44.001] inherits <- base::inherits [10:55:44.001] invokeRestart <- base::invokeRestart [10:55:44.001] is.null <- base::is.null [10:55:44.001] muffled <- FALSE [10:55:44.001] if (inherits(cond, "message")) { [10:55:44.001] muffled <- grepl(pattern, "muffleMessage") [10:55:44.001] if (muffled) [10:55:44.001] invokeRestart("muffleMessage") [10:55:44.001] } [10:55:44.001] else if (inherits(cond, "warning")) { [10:55:44.001] muffled <- grepl(pattern, "muffleWarning") [10:55:44.001] if (muffled) [10:55:44.001] invokeRestart("muffleWarning") [10:55:44.001] } [10:55:44.001] else if (inherits(cond, "condition")) { [10:55:44.001] if (!is.null(pattern)) { [10:55:44.001] computeRestarts <- base::computeRestarts [10:55:44.001] grepl <- base::grepl [10:55:44.001] restarts <- computeRestarts(cond) [10:55:44.001] for (restart in restarts) { [10:55:44.001] name <- restart$name [10:55:44.001] if (is.null(name)) [10:55:44.001] next [10:55:44.001] if (!grepl(pattern, name)) [10:55:44.001] next [10:55:44.001] invokeRestart(restart) [10:55:44.001] muffled <- TRUE [10:55:44.001] break [10:55:44.001] } [10:55:44.001] } [10:55:44.001] } [10:55:44.001] invisible(muffled) [10:55:44.001] } [10:55:44.001] muffleCondition(cond, pattern = "^muffle") [10:55:44.001] } [10:55:44.001] } [10:55:44.001] } [10:55:44.001] })) [10:55:44.001] }, error = function(ex) { [10:55:44.001] base::structure(base::list(value = NULL, visible = NULL, [10:55:44.001] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:55:44.001] ...future.rng), started = ...future.startTime, [10:55:44.001] finished = Sys.time(), session_uuid = NA_character_, [10:55:44.001] version = "1.8"), class = "FutureResult") [10:55:44.001] }, finally = { [10:55:44.001] if (!identical(...future.workdir, getwd())) [10:55:44.001] setwd(...future.workdir) [10:55:44.001] { [10:55:44.001] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:55:44.001] ...future.oldOptions$nwarnings <- NULL [10:55:44.001] } [10:55:44.001] base::options(...future.oldOptions) [10:55:44.001] if (.Platform$OS.type == "windows") { [10:55:44.001] old_names <- names(...future.oldEnvVars) [10:55:44.001] envs <- base::Sys.getenv() [10:55:44.001] names <- names(envs) [10:55:44.001] common <- intersect(names, old_names) [10:55:44.001] added <- setdiff(names, old_names) [10:55:44.001] removed <- setdiff(old_names, names) [10:55:44.001] changed <- common[...future.oldEnvVars[common] != [10:55:44.001] envs[common]] [10:55:44.001] NAMES <- toupper(changed) [10:55:44.001] args <- list() [10:55:44.001] for (kk in seq_along(NAMES)) { [10:55:44.001] name <- changed[[kk]] [10:55:44.001] NAME <- NAMES[[kk]] [10:55:44.001] if (name != NAME && is.element(NAME, old_names)) [10:55:44.001] next [10:55:44.001] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:44.001] } [10:55:44.001] NAMES <- toupper(added) [10:55:44.001] for (kk in seq_along(NAMES)) { [10:55:44.001] name <- added[[kk]] [10:55:44.001] NAME <- NAMES[[kk]] [10:55:44.001] if (name != NAME && is.element(NAME, old_names)) [10:55:44.001] next [10:55:44.001] args[[name]] <- "" [10:55:44.001] } [10:55:44.001] NAMES <- toupper(removed) [10:55:44.001] for (kk in seq_along(NAMES)) { [10:55:44.001] name <- removed[[kk]] [10:55:44.001] NAME <- NAMES[[kk]] [10:55:44.001] if (name != NAME && is.element(NAME, old_names)) [10:55:44.001] next [10:55:44.001] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:44.001] } [10:55:44.001] if (length(args) > 0) [10:55:44.001] base::do.call(base::Sys.setenv, args = args) [10:55:44.001] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:55:44.001] } [10:55:44.001] else { [10:55:44.001] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:55:44.001] } [10:55:44.001] { [10:55:44.001] if (base::length(...future.futureOptionsAdded) > [10:55:44.001] 0L) { [10:55:44.001] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:55:44.001] base::names(opts) <- ...future.futureOptionsAdded [10:55:44.001] base::options(opts) [10:55:44.001] } [10:55:44.001] { [10:55:44.001] NULL [10:55:44.001] options(future.plan = NULL) [10:55:44.001] if (is.na(NA_character_)) [10:55:44.001] Sys.unsetenv("R_FUTURE_PLAN") [10:55:44.001] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:55:44.001] future::plan(...future.strategy.old, .cleanup = FALSE, [10:55:44.001] .init = FALSE) [10:55:44.001] } [10:55:44.001] } [10:55:44.001] } [10:55:44.001] }) [10:55:44.001] if (TRUE) { [10:55:44.001] base::sink(type = "output", split = FALSE) [10:55:44.001] if (TRUE) { [10:55:44.001] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:55:44.001] } [10:55:44.001] else { [10:55:44.001] ...future.result["stdout"] <- base::list(NULL) [10:55:44.001] } [10:55:44.001] base::close(...future.stdout) [10:55:44.001] ...future.stdout <- NULL [10:55:44.001] } [10:55:44.001] ...future.result$conditions <- ...future.conditions [10:55:44.001] ...future.result$finished <- base::Sys.time() [10:55:44.001] ...future.result [10:55:44.001] } [10:55:44.005] - Launch lazy future ... done [10:55:44.005] run() for 'MiraiFuture' ... done [10:55:44.008] getGlobalsAndPackages() ... [10:55:44.009] Searching for globals... [10:55:44.012] - globals found: [3] '{', '*', 'a' [10:55:44.013] Searching for globals ... DONE [10:55:44.013] Resolving globals: FALSE [10:55:44.013] The total size of the 1 globals is 56 bytes (56 bytes) [10:55:44.014] 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') [10:55:44.014] - globals: [1] 'a' [10:55:44.014] [10:55:44.014] getGlobalsAndPackages() ... DONE [10:55:44.015] run() for 'Future' ... [10:55:44.015] - state: 'created' [10:55:44.015] - Future backend: 'FutureStrategy', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:55:44.015] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:55:44.016] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:55:44.016] - Field: 'label' [10:55:44.016] - Field: 'local' [10:55:44.016] - Field: 'owner' [10:55:44.016] - Field: 'envir' [10:55:44.017] - Field: 'packages' [10:55:44.017] - Field: 'gc' [10:55:44.017] - Field: 'conditions' [10:55:44.017] - Field: 'expr' [10:55:44.017] - Field: 'uuid' [10:55:44.017] - Field: 'seed' [10:55:44.018] - Field: 'version' [10:55:44.018] - Field: 'result' [10:55:44.018] - Field: 'asynchronous' [10:55:44.018] - Field: 'calls' [10:55:44.018] - Field: 'globals' [10:55:44.018] - Field: 'stdout' [10:55:44.019] - Field: 'earlySignal' [10:55:44.019] - Field: 'lazy' [10:55:44.019] - Field: 'state' [10:55:44.019] - Field: '.cluster' [10:55:44.019] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:55:44.020] - Launch lazy future ... [10:55:44.020] Packages needed by the future expression (n = 0): [10:55:44.020] Packages needed by future strategies (n = 0): [10:55:44.021] { [10:55:44.021] { [10:55:44.021] { [10:55:44.021] ...future.startTime <- base::Sys.time() [10:55:44.021] { [10:55:44.021] { [10:55:44.021] { [10:55:44.021] base::local({ [10:55:44.021] has_future <- base::requireNamespace("future", [10:55:44.021] quietly = TRUE) [10:55:44.021] if (has_future) { [10:55:44.021] ns <- base::getNamespace("future") [10:55:44.021] version <- ns[[".package"]][["version"]] [10:55:44.021] if (is.null(version)) [10:55:44.021] version <- utils::packageVersion("future") [10:55:44.021] } [10:55:44.021] else { [10:55:44.021] version <- NULL [10:55:44.021] } [10:55:44.021] if (!has_future || version < "1.8.0") { [10:55:44.021] info <- base::c(r_version = base::gsub("R version ", [10:55:44.021] "", base::R.version$version.string), [10:55:44.021] platform = base::sprintf("%s (%s-bit)", [10:55:44.021] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:55:44.021] os = base::paste(base::Sys.info()[base::c("sysname", [10:55:44.021] "release", "version")], collapse = " "), [10:55:44.021] hostname = base::Sys.info()[["nodename"]]) [10:55:44.021] info <- base::sprintf("%s: %s", base::names(info), [10:55:44.021] info) [10:55:44.021] info <- base::paste(info, collapse = "; ") [10:55:44.021] if (!has_future) { [10:55:44.021] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:55:44.021] info) [10:55:44.021] } [10:55:44.021] else { [10:55:44.021] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:55:44.021] info, version) [10:55:44.021] } [10:55:44.021] base::stop(msg) [10:55:44.021] } [10:55:44.021] }) [10:55:44.021] } [10:55:44.021] ...future.strategy.old <- future::plan("list") [10:55:44.021] options(future.plan = NULL) [10:55:44.021] Sys.unsetenv("R_FUTURE_PLAN") [10:55:44.021] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:55:44.021] } [10:55:44.021] ...future.workdir <- getwd() [10:55:44.021] } [10:55:44.021] ...future.oldOptions <- base::as.list(base::.Options) [10:55:44.021] ...future.oldEnvVars <- base::Sys.getenv() [10:55:44.021] } [10:55:44.021] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:55:44.021] future.globals.maxSize = NULL, future.globals.method = NULL, [10:55:44.021] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:55:44.021] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:55:44.021] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:55:44.021] future.stdout.windows.reencode = NULL, width = 80L) [10:55:44.021] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:55:44.021] base::names(...future.oldOptions)) [10:55:44.021] } [10:55:44.021] if (FALSE) { [10:55:44.021] } [10:55:44.021] else { [10:55:44.021] if (TRUE) { [10:55:44.021] ...future.stdout <- base::rawConnection(base::raw(0L), [10:55:44.021] open = "w") [10:55:44.021] } [10:55:44.021] else { [10:55:44.021] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:55:44.021] windows = "NUL", "/dev/null"), open = "w") [10:55:44.021] } [10:55:44.021] base::sink(...future.stdout, type = "output", split = FALSE) [10:55:44.021] base::on.exit(if (!base::is.null(...future.stdout)) { [10:55:44.021] base::sink(type = "output", split = FALSE) [10:55:44.021] base::close(...future.stdout) [10:55:44.021] }, add = TRUE) [10:55:44.021] } [10:55:44.021] ...future.frame <- base::sys.nframe() [10:55:44.021] ...future.conditions <- base::list() [10:55:44.021] ...future.rng <- base::globalenv()$.Random.seed [10:55:44.021] if (FALSE) { [10:55:44.021] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:55:44.021] "...future.value", "...future.globalenv.names", ".Random.seed") [10:55:44.021] } [10:55:44.021] ...future.result <- base::tryCatch({ [10:55:44.021] base::withCallingHandlers({ [10:55:44.021] ...future.value <- base::withVisible(base::local({ [10:55:44.021] 2 * a [10:55:44.021] })) [10:55:44.021] future::FutureResult(value = ...future.value$value, [10:55:44.021] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:55:44.021] ...future.rng), globalenv = if (FALSE) [10:55:44.021] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:55:44.021] ...future.globalenv.names)) [10:55:44.021] else NULL, started = ...future.startTime, version = "1.8") [10:55:44.021] }, condition = base::local({ [10:55:44.021] c <- base::c [10:55:44.021] inherits <- base::inherits [10:55:44.021] invokeRestart <- base::invokeRestart [10:55:44.021] length <- base::length [10:55:44.021] list <- base::list [10:55:44.021] seq.int <- base::seq.int [10:55:44.021] signalCondition <- base::signalCondition [10:55:44.021] sys.calls <- base::sys.calls [10:55:44.021] `[[` <- base::`[[` [10:55:44.021] `+` <- base::`+` [10:55:44.021] `<<-` <- base::`<<-` [10:55:44.021] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:55:44.021] calls[seq.int(from = from + 12L, to = length(calls) - [10:55:44.021] 3L)] [10:55:44.021] } [10:55:44.021] function(cond) { [10:55:44.021] is_error <- inherits(cond, "error") [10:55:44.021] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:55:44.021] NULL) [10:55:44.021] if (is_error) { [10:55:44.021] sessionInformation <- function() { [10:55:44.021] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:55:44.021] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:55:44.021] search = base::search(), system = base::Sys.info()) [10:55:44.021] } [10:55:44.021] ...future.conditions[[length(...future.conditions) + [10:55:44.021] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:55:44.021] cond$call), session = sessionInformation(), [10:55:44.021] timestamp = base::Sys.time(), signaled = 0L) [10:55:44.021] signalCondition(cond) [10:55:44.021] } [10:55:44.021] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:55:44.021] signal <- FALSE && inherits(cond, character(0)) [10:55:44.021] ...future.conditions[[length(...future.conditions) + [10:55:44.021] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:55:44.021] if (FALSE && !signal) { [10:55:44.021] muffleCondition <- function (cond, pattern = "^muffle") [10:55:44.021] { [10:55:44.021] inherits <- base::inherits [10:55:44.021] invokeRestart <- base::invokeRestart [10:55:44.021] is.null <- base::is.null [10:55:44.021] muffled <- FALSE [10:55:44.021] if (inherits(cond, "message")) { [10:55:44.021] muffled <- grepl(pattern, "muffleMessage") [10:55:44.021] if (muffled) [10:55:44.021] invokeRestart("muffleMessage") [10:55:44.021] } [10:55:44.021] else if (inherits(cond, "warning")) { [10:55:44.021] muffled <- grepl(pattern, "muffleWarning") [10:55:44.021] if (muffled) [10:55:44.021] invokeRestart("muffleWarning") [10:55:44.021] } [10:55:44.021] else if (inherits(cond, "condition")) { [10:55:44.021] if (!is.null(pattern)) { [10:55:44.021] computeRestarts <- base::computeRestarts [10:55:44.021] grepl <- base::grepl [10:55:44.021] restarts <- computeRestarts(cond) [10:55:44.021] for (restart in restarts) { [10:55:44.021] name <- restart$name [10:55:44.021] if (is.null(name)) [10:55:44.021] next [10:55:44.021] if (!grepl(pattern, name)) [10:55:44.021] next [10:55:44.021] invokeRestart(restart) [10:55:44.021] muffled <- TRUE [10:55:44.021] break [10:55:44.021] } [10:55:44.021] } [10:55:44.021] } [10:55:44.021] invisible(muffled) [10:55:44.021] } [10:55:44.021] muffleCondition(cond, pattern = "^muffle") [10:55:44.021] } [10:55:44.021] } [10:55:44.021] else { [10:55:44.021] if (TRUE) { [10:55:44.021] muffleCondition <- function (cond, pattern = "^muffle") [10:55:44.021] { [10:55:44.021] inherits <- base::inherits [10:55:44.021] invokeRestart <- base::invokeRestart [10:55:44.021] is.null <- base::is.null [10:55:44.021] muffled <- FALSE [10:55:44.021] if (inherits(cond, "message")) { [10:55:44.021] muffled <- grepl(pattern, "muffleMessage") [10:55:44.021] if (muffled) [10:55:44.021] invokeRestart("muffleMessage") [10:55:44.021] } [10:55:44.021] else if (inherits(cond, "warning")) { [10:55:44.021] muffled <- grepl(pattern, "muffleWarning") [10:55:44.021] if (muffled) [10:55:44.021] invokeRestart("muffleWarning") [10:55:44.021] } [10:55:44.021] else if (inherits(cond, "condition")) { [10:55:44.021] if (!is.null(pattern)) { [10:55:44.021] computeRestarts <- base::computeRestarts [10:55:44.021] grepl <- base::grepl [10:55:44.021] restarts <- computeRestarts(cond) [10:55:44.021] for (restart in restarts) { [10:55:44.021] name <- restart$name [10:55:44.021] if (is.null(name)) [10:55:44.021] next [10:55:44.021] if (!grepl(pattern, name)) [10:55:44.021] next [10:55:44.021] invokeRestart(restart) [10:55:44.021] muffled <- TRUE [10:55:44.021] break [10:55:44.021] } [10:55:44.021] } [10:55:44.021] } [10:55:44.021] invisible(muffled) [10:55:44.021] } [10:55:44.021] muffleCondition(cond, pattern = "^muffle") [10:55:44.021] } [10:55:44.021] } [10:55:44.021] } [10:55:44.021] })) [10:55:44.021] }, error = function(ex) { [10:55:44.021] base::structure(base::list(value = NULL, visible = NULL, [10:55:44.021] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:55:44.021] ...future.rng), started = ...future.startTime, [10:55:44.021] finished = Sys.time(), session_uuid = NA_character_, [10:55:44.021] version = "1.8"), class = "FutureResult") [10:55:44.021] }, finally = { [10:55:44.021] if (!identical(...future.workdir, getwd())) [10:55:44.021] setwd(...future.workdir) [10:55:44.021] { [10:55:44.021] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:55:44.021] ...future.oldOptions$nwarnings <- NULL [10:55:44.021] } [10:55:44.021] base::options(...future.oldOptions) [10:55:44.021] if (.Platform$OS.type == "windows") { [10:55:44.021] old_names <- names(...future.oldEnvVars) [10:55:44.021] envs <- base::Sys.getenv() [10:55:44.021] names <- names(envs) [10:55:44.021] common <- intersect(names, old_names) [10:55:44.021] added <- setdiff(names, old_names) [10:55:44.021] removed <- setdiff(old_names, names) [10:55:44.021] changed <- common[...future.oldEnvVars[common] != [10:55:44.021] envs[common]] [10:55:44.021] NAMES <- toupper(changed) [10:55:44.021] args <- list() [10:55:44.021] for (kk in seq_along(NAMES)) { [10:55:44.021] name <- changed[[kk]] [10:55:44.021] NAME <- NAMES[[kk]] [10:55:44.021] if (name != NAME && is.element(NAME, old_names)) [10:55:44.021] next [10:55:44.021] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:44.021] } [10:55:44.021] NAMES <- toupper(added) [10:55:44.021] for (kk in seq_along(NAMES)) { [10:55:44.021] name <- added[[kk]] [10:55:44.021] NAME <- NAMES[[kk]] [10:55:44.021] if (name != NAME && is.element(NAME, old_names)) [10:55:44.021] next [10:55:44.021] args[[name]] <- "" [10:55:44.021] } [10:55:44.021] NAMES <- toupper(removed) [10:55:44.021] for (kk in seq_along(NAMES)) { [10:55:44.021] name <- removed[[kk]] [10:55:44.021] NAME <- NAMES[[kk]] [10:55:44.021] if (name != NAME && is.element(NAME, old_names)) [10:55:44.021] next [10:55:44.021] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:44.021] } [10:55:44.021] if (length(args) > 0) [10:55:44.021] base::do.call(base::Sys.setenv, args = args) [10:55:44.021] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:55:44.021] } [10:55:44.021] else { [10:55:44.021] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:55:44.021] } [10:55:44.021] { [10:55:44.021] if (base::length(...future.futureOptionsAdded) > [10:55:44.021] 0L) { [10:55:44.021] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:55:44.021] base::names(opts) <- ...future.futureOptionsAdded [10:55:44.021] base::options(opts) [10:55:44.021] } [10:55:44.021] { [10:55:44.021] NULL [10:55:44.021] options(future.plan = NULL) [10:55:44.021] if (is.na(NA_character_)) [10:55:44.021] Sys.unsetenv("R_FUTURE_PLAN") [10:55:44.021] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:55:44.021] future::plan(...future.strategy.old, .cleanup = FALSE, [10:55:44.021] .init = FALSE) [10:55:44.021] } [10:55:44.021] } [10:55:44.021] } [10:55:44.021] }) [10:55:44.021] if (TRUE) { [10:55:44.021] base::sink(type = "output", split = FALSE) [10:55:44.021] if (TRUE) { [10:55:44.021] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:55:44.021] } [10:55:44.021] else { [10:55:44.021] ...future.result["stdout"] <- base::list(NULL) [10:55:44.021] } [10:55:44.021] base::close(...future.stdout) [10:55:44.021] ...future.stdout <- NULL [10:55:44.021] } [10:55:44.021] ...future.result$conditions <- ...future.conditions [10:55:44.021] ...future.result$finished <- base::Sys.time() [10:55:44.021] ...future.result [10:55:44.021] } [10:55:44.025] - Launch lazy future ... done [10:55:44.025] run() for 'MiraiFuture' ... done [10:55:44.029] - plan('mirai_cluster') ... DONE[10:55:44.030] - plan('mirai_multisession') ...[10:55:44.030] plan(): Setting new future strategy stack: [10:55:44.030] List of future strategies: [10:55:44.030] 1. mirai_multisession: [10:55:44.030] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [10:55:44.030] - tweaked: FALSE [10:55:44.030] - call: plan(strategy) [10:55:44.031] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [10:55:44.033] < mirai | $data > [10:55:44.036] getGlobalsAndPackages() ... [10:55:44.036] Not searching for globals [10:55:44.036] - globals: [0] [10:55:44.036] getGlobalsAndPackages() ... DONE [10:55:44.037] getGlobalsAndPackages() ... [10:55:44.037] [10:55:44.037] - globals: [0] [10:55:44.037] getGlobalsAndPackages() ... DONE [10:55:44.037] Packages needed by the future expression (n = 0): [10:55:44.038] Packages needed by future strategies (n = 0): [10:55:44.038] { [10:55:44.038] { [10:55:44.038] { [10:55:44.038] ...future.startTime <- base::Sys.time() [10:55:44.038] { [10:55:44.038] { [10:55:44.038] { [10:55:44.038] base::local({ [10:55:44.038] has_future <- base::requireNamespace("future", [10:55:44.038] quietly = TRUE) [10:55:44.038] if (has_future) { [10:55:44.038] ns <- base::getNamespace("future") [10:55:44.038] version <- ns[[".package"]][["version"]] [10:55:44.038] if (is.null(version)) [10:55:44.038] version <- utils::packageVersion("future") [10:55:44.038] } [10:55:44.038] else { [10:55:44.038] version <- NULL [10:55:44.038] } [10:55:44.038] if (!has_future || version < "1.8.0") { [10:55:44.038] info <- base::c(r_version = base::gsub("R version ", [10:55:44.038] "", base::R.version$version.string), [10:55:44.038] platform = base::sprintf("%s (%s-bit)", [10:55:44.038] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:55:44.038] os = base::paste(base::Sys.info()[base::c("sysname", [10:55:44.038] "release", "version")], collapse = " "), [10:55:44.038] hostname = base::Sys.info()[["nodename"]]) [10:55:44.038] info <- base::sprintf("%s: %s", base::names(info), [10:55:44.038] info) [10:55:44.038] info <- base::paste(info, collapse = "; ") [10:55:44.038] if (!has_future) { [10:55:44.038] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:55:44.038] info) [10:55:44.038] } [10:55:44.038] else { [10:55:44.038] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:55:44.038] info, version) [10:55:44.038] } [10:55:44.038] base::stop(msg) [10:55:44.038] } [10:55:44.038] }) [10:55:44.038] } [10:55:44.038] ...future.strategy.old <- future::plan("list") [10:55:44.038] options(future.plan = NULL) [10:55:44.038] Sys.unsetenv("R_FUTURE_PLAN") [10:55:44.038] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:55:44.038] } [10:55:44.038] ...future.workdir <- getwd() [10:55:44.038] } [10:55:44.038] ...future.oldOptions <- base::as.list(base::.Options) [10:55:44.038] ...future.oldEnvVars <- base::Sys.getenv() [10:55:44.038] } [10:55:44.038] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:55:44.038] future.globals.maxSize = NULL, future.globals.method = NULL, [10:55:44.038] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:55:44.038] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:55:44.038] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:55:44.038] future.stdout.windows.reencode = NULL, width = 80L) [10:55:44.038] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:55:44.038] base::names(...future.oldOptions)) [10:55:44.038] } [10:55:44.038] if (FALSE) { [10:55:44.038] } [10:55:44.038] else { [10:55:44.038] if (TRUE) { [10:55:44.038] ...future.stdout <- base::rawConnection(base::raw(0L), [10:55:44.038] open = "w") [10:55:44.038] } [10:55:44.038] else { [10:55:44.038] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:55:44.038] windows = "NUL", "/dev/null"), open = "w") [10:55:44.038] } [10:55:44.038] base::sink(...future.stdout, type = "output", split = FALSE) [10:55:44.038] base::on.exit(if (!base::is.null(...future.stdout)) { [10:55:44.038] base::sink(type = "output", split = FALSE) [10:55:44.038] base::close(...future.stdout) [10:55:44.038] }, add = TRUE) [10:55:44.038] } [10:55:44.038] ...future.frame <- base::sys.nframe() [10:55:44.038] ...future.conditions <- base::list() [10:55:44.038] ...future.rng <- base::globalenv()$.Random.seed [10:55:44.038] if (FALSE) { [10:55:44.038] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:55:44.038] "...future.value", "...future.globalenv.names", ".Random.seed") [10:55:44.038] } [10:55:44.038] ...future.result <- base::tryCatch({ [10:55:44.038] base::withCallingHandlers({ [10:55:44.038] ...future.value <- base::withVisible(base::local(NA)) [10:55:44.038] future::FutureResult(value = ...future.value$value, [10:55:44.038] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:55:44.038] ...future.rng), globalenv = if (FALSE) [10:55:44.038] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:55:44.038] ...future.globalenv.names)) [10:55:44.038] else NULL, started = ...future.startTime, version = "1.8") [10:55:44.038] }, condition = base::local({ [10:55:44.038] c <- base::c [10:55:44.038] inherits <- base::inherits [10:55:44.038] invokeRestart <- base::invokeRestart [10:55:44.038] length <- base::length [10:55:44.038] list <- base::list [10:55:44.038] seq.int <- base::seq.int [10:55:44.038] signalCondition <- base::signalCondition [10:55:44.038] sys.calls <- base::sys.calls [10:55:44.038] `[[` <- base::`[[` [10:55:44.038] `+` <- base::`+` [10:55:44.038] `<<-` <- base::`<<-` [10:55:44.038] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:55:44.038] calls[seq.int(from = from + 12L, to = length(calls) - [10:55:44.038] 3L)] [10:55:44.038] } [10:55:44.038] function(cond) { [10:55:44.038] is_error <- inherits(cond, "error") [10:55:44.038] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:55:44.038] NULL) [10:55:44.038] if (is_error) { [10:55:44.038] sessionInformation <- function() { [10:55:44.038] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:55:44.038] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:55:44.038] search = base::search(), system = base::Sys.info()) [10:55:44.038] } [10:55:44.038] ...future.conditions[[length(...future.conditions) + [10:55:44.038] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:55:44.038] cond$call), session = sessionInformation(), [10:55:44.038] timestamp = base::Sys.time(), signaled = 0L) [10:55:44.038] signalCondition(cond) [10:55:44.038] } [10:55:44.038] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:55:44.038] signal <- FALSE && inherits(cond, character(0)) [10:55:44.038] ...future.conditions[[length(...future.conditions) + [10:55:44.038] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:55:44.038] if (FALSE && !signal) { [10:55:44.038] muffleCondition <- function (cond, pattern = "^muffle") [10:55:44.038] { [10:55:44.038] inherits <- base::inherits [10:55:44.038] invokeRestart <- base::invokeRestart [10:55:44.038] is.null <- base::is.null [10:55:44.038] muffled <- FALSE [10:55:44.038] if (inherits(cond, "message")) { [10:55:44.038] muffled <- grepl(pattern, "muffleMessage") [10:55:44.038] if (muffled) [10:55:44.038] invokeRestart("muffleMessage") [10:55:44.038] } [10:55:44.038] else if (inherits(cond, "warning")) { [10:55:44.038] muffled <- grepl(pattern, "muffleWarning") [10:55:44.038] if (muffled) [10:55:44.038] invokeRestart("muffleWarning") [10:55:44.038] } [10:55:44.038] else if (inherits(cond, "condition")) { [10:55:44.038] if (!is.null(pattern)) { [10:55:44.038] computeRestarts <- base::computeRestarts [10:55:44.038] grepl <- base::grepl [10:55:44.038] restarts <- computeRestarts(cond) [10:55:44.038] for (restart in restarts) { [10:55:44.038] name <- restart$name [10:55:44.038] if (is.null(name)) [10:55:44.038] next [10:55:44.038] if (!grepl(pattern, name)) [10:55:44.038] next [10:55:44.038] invokeRestart(restart) [10:55:44.038] muffled <- TRUE [10:55:44.038] break [10:55:44.038] } [10:55:44.038] } [10:55:44.038] } [10:55:44.038] invisible(muffled) [10:55:44.038] } [10:55:44.038] muffleCondition(cond, pattern = "^muffle") [10:55:44.038] } [10:55:44.038] } [10:55:44.038] else { [10:55:44.038] if (TRUE) { [10:55:44.038] muffleCondition <- function (cond, pattern = "^muffle") [10:55:44.038] { [10:55:44.038] inherits <- base::inherits [10:55:44.038] invokeRestart <- base::invokeRestart [10:55:44.038] is.null <- base::is.null [10:55:44.038] muffled <- FALSE [10:55:44.038] if (inherits(cond, "message")) { [10:55:44.038] muffled <- grepl(pattern, "muffleMessage") [10:55:44.038] if (muffled) [10:55:44.038] invokeRestart("muffleMessage") [10:55:44.038] } [10:55:44.038] else if (inherits(cond, "warning")) { [10:55:44.038] muffled <- grepl(pattern, "muffleWarning") [10:55:44.038] if (muffled) [10:55:44.038] invokeRestart("muffleWarning") [10:55:44.038] } [10:55:44.038] else if (inherits(cond, "condition")) { [10:55:44.038] if (!is.null(pattern)) { [10:55:44.038] computeRestarts <- base::computeRestarts [10:55:44.038] grepl <- base::grepl [10:55:44.038] restarts <- computeRestarts(cond) [10:55:44.038] for (restart in restarts) { [10:55:44.038] name <- restart$name [10:55:44.038] if (is.null(name)) [10:55:44.038] next [10:55:44.038] if (!grepl(pattern, name)) [10:55:44.038] next [10:55:44.038] invokeRestart(restart) [10:55:44.038] muffled <- TRUE [10:55:44.038] break [10:55:44.038] } [10:55:44.038] } [10:55:44.038] } [10:55:44.038] invisible(muffled) [10:55:44.038] } [10:55:44.038] muffleCondition(cond, pattern = "^muffle") [10:55:44.038] } [10:55:44.038] } [10:55:44.038] } [10:55:44.038] })) [10:55:44.038] }, error = function(ex) { [10:55:44.038] base::structure(base::list(value = NULL, visible = NULL, [10:55:44.038] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:55:44.038] ...future.rng), started = ...future.startTime, [10:55:44.038] finished = Sys.time(), session_uuid = NA_character_, [10:55:44.038] version = "1.8"), class = "FutureResult") [10:55:44.038] }, finally = { [10:55:44.038] if (!identical(...future.workdir, getwd())) [10:55:44.038] setwd(...future.workdir) [10:55:44.038] { [10:55:44.038] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:55:44.038] ...future.oldOptions$nwarnings <- NULL [10:55:44.038] } [10:55:44.038] base::options(...future.oldOptions) [10:55:44.038] if (.Platform$OS.type == "windows") { [10:55:44.038] old_names <- names(...future.oldEnvVars) [10:55:44.038] envs <- base::Sys.getenv() [10:55:44.038] names <- names(envs) [10:55:44.038] common <- intersect(names, old_names) [10:55:44.038] added <- setdiff(names, old_names) [10:55:44.038] removed <- setdiff(old_names, names) [10:55:44.038] changed <- common[...future.oldEnvVars[common] != [10:55:44.038] envs[common]] [10:55:44.038] NAMES <- toupper(changed) [10:55:44.038] args <- list() [10:55:44.038] for (kk in seq_along(NAMES)) { [10:55:44.038] name <- changed[[kk]] [10:55:44.038] NAME <- NAMES[[kk]] [10:55:44.038] if (name != NAME && is.element(NAME, old_names)) [10:55:44.038] next [10:55:44.038] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:44.038] } [10:55:44.038] NAMES <- toupper(added) [10:55:44.038] for (kk in seq_along(NAMES)) { [10:55:44.038] name <- added[[kk]] [10:55:44.038] NAME <- NAMES[[kk]] [10:55:44.038] if (name != NAME && is.element(NAME, old_names)) [10:55:44.038] next [10:55:44.038] args[[name]] <- "" [10:55:44.038] } [10:55:44.038] NAMES <- toupper(removed) [10:55:44.038] for (kk in seq_along(NAMES)) { [10:55:44.038] name <- removed[[kk]] [10:55:44.038] NAME <- NAMES[[kk]] [10:55:44.038] if (name != NAME && is.element(NAME, old_names)) [10:55:44.038] next [10:55:44.038] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:44.038] } [10:55:44.038] if (length(args) > 0) [10:55:44.038] base::do.call(base::Sys.setenv, args = args) [10:55:44.038] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:55:44.038] } [10:55:44.038] else { [10:55:44.038] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:55:44.038] } [10:55:44.038] { [10:55:44.038] if (base::length(...future.futureOptionsAdded) > [10:55:44.038] 0L) { [10:55:44.038] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:55:44.038] base::names(opts) <- ...future.futureOptionsAdded [10:55:44.038] base::options(opts) [10:55:44.038] } [10:55:44.038] { [10:55:44.038] NULL [10:55:44.038] options(future.plan = NULL) [10:55:44.038] if (is.na(NA_character_)) [10:55:44.038] Sys.unsetenv("R_FUTURE_PLAN") [10:55:44.038] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:55:44.038] future::plan(...future.strategy.old, .cleanup = FALSE, [10:55:44.038] .init = FALSE) [10:55:44.038] } [10:55:44.038] } [10:55:44.038] } [10:55:44.038] }) [10:55:44.038] if (TRUE) { [10:55:44.038] base::sink(type = "output", split = FALSE) [10:55:44.038] if (TRUE) { [10:55:44.038] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:55:44.038] } [10:55:44.038] else { [10:55:44.038] ...future.result["stdout"] <- base::list(NULL) [10:55:44.038] } [10:55:44.038] base::close(...future.stdout) [10:55:44.038] ...future.stdout <- NULL [10:55:44.038] } [10:55:44.038] ...future.result$conditions <- ...future.conditions [10:55:44.038] ...future.result$finished <- base::Sys.time() [10:55:44.038] ...future.result [10:55:44.038] } [10:55:44.046] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [10:55:44.046] plan(): nbrOfWorkers() = 2 [10:55:44.046] getGlobalsAndPackages() ... [10:55:44.046] Searching for globals... [10:55:44.047] - globals found: [2] '*', 'a' [10:55:44.047] Searching for globals ... DONE [10:55:44.047] Resolving globals: FALSE [10:55:44.048] The total size of the 1 globals is 56 bytes (56 bytes) [10:55:44.048] 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') [10:55:44.048] - globals: [1] 'a' [10:55:44.049] [10:55:44.049] getGlobalsAndPackages() ... DONE [10:55:44.049] run() for 'Future' ... [10:55:44.049] - state: 'created' [10:55:44.049] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:55:44.052] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:55:44.052] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:55:44.052] - Field: 'label' [10:55:44.052] - Field: 'local' [10:55:44.053] - Field: 'owner' [10:55:44.053] - Field: 'envir' [10:55:44.053] - Field: 'packages' [10:55:44.053] - Field: 'gc' [10:55:44.053] - Field: 'conditions' [10:55:44.053] - Field: 'expr' [10:55:44.054] - Field: 'uuid' [10:55:44.054] - Field: 'seed' [10:55:44.054] - Field: 'version' [10:55:44.054] - Field: 'result' [10:55:44.054] - Field: 'asynchronous' [10:55:44.054] - Field: 'calls' [10:55:44.055] - Field: 'globals' [10:55:44.055] - Field: 'stdout' [10:55:44.055] - Field: 'earlySignal' [10:55:44.055] - Field: 'lazy' [10:55:44.055] - Field: 'state' [10:55:44.055] - Field: '.cluster' [10:55:44.056] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:55:44.056] - Launch lazy future ... [10:55:44.056] Packages needed by the future expression (n = 0): [10:55:44.056] Packages needed by future strategies (n = 0): [10:55:44.057] { [10:55:44.057] { [10:55:44.057] { [10:55:44.057] ...future.startTime <- base::Sys.time() [10:55:44.057] { [10:55:44.057] { [10:55:44.057] { [10:55:44.057] base::local({ [10:55:44.057] has_future <- base::requireNamespace("future", [10:55:44.057] quietly = TRUE) [10:55:44.057] if (has_future) { [10:55:44.057] ns <- base::getNamespace("future") [10:55:44.057] version <- ns[[".package"]][["version"]] [10:55:44.057] if (is.null(version)) [10:55:44.057] version <- utils::packageVersion("future") [10:55:44.057] } [10:55:44.057] else { [10:55:44.057] version <- NULL [10:55:44.057] } [10:55:44.057] if (!has_future || version < "1.8.0") { [10:55:44.057] info <- base::c(r_version = base::gsub("R version ", [10:55:44.057] "", base::R.version$version.string), [10:55:44.057] platform = base::sprintf("%s (%s-bit)", [10:55:44.057] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:55:44.057] os = base::paste(base::Sys.info()[base::c("sysname", [10:55:44.057] "release", "version")], collapse = " "), [10:55:44.057] hostname = base::Sys.info()[["nodename"]]) [10:55:44.057] info <- base::sprintf("%s: %s", base::names(info), [10:55:44.057] info) [10:55:44.057] info <- base::paste(info, collapse = "; ") [10:55:44.057] if (!has_future) { [10:55:44.057] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:55:44.057] info) [10:55:44.057] } [10:55:44.057] else { [10:55:44.057] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:55:44.057] info, version) [10:55:44.057] } [10:55:44.057] base::stop(msg) [10:55:44.057] } [10:55:44.057] }) [10:55:44.057] } [10:55:44.057] ...future.strategy.old <- future::plan("list") [10:55:44.057] options(future.plan = NULL) [10:55:44.057] Sys.unsetenv("R_FUTURE_PLAN") [10:55:44.057] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:55:44.057] } [10:55:44.057] ...future.workdir <- getwd() [10:55:44.057] } [10:55:44.057] ...future.oldOptions <- base::as.list(base::.Options) [10:55:44.057] ...future.oldEnvVars <- base::Sys.getenv() [10:55:44.057] } [10:55:44.057] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:55:44.057] future.globals.maxSize = NULL, future.globals.method = NULL, [10:55:44.057] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:55:44.057] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:55:44.057] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:55:44.057] future.stdout.windows.reencode = NULL, width = 80L) [10:55:44.057] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:55:44.057] base::names(...future.oldOptions)) [10:55:44.057] } [10:55:44.057] if (FALSE) { [10:55:44.057] } [10:55:44.057] else { [10:55:44.057] if (TRUE) { [10:55:44.057] ...future.stdout <- base::rawConnection(base::raw(0L), [10:55:44.057] open = "w") [10:55:44.057] } [10:55:44.057] else { [10:55:44.057] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:55:44.057] windows = "NUL", "/dev/null"), open = "w") [10:55:44.057] } [10:55:44.057] base::sink(...future.stdout, type = "output", split = FALSE) [10:55:44.057] base::on.exit(if (!base::is.null(...future.stdout)) { [10:55:44.057] base::sink(type = "output", split = FALSE) [10:55:44.057] base::close(...future.stdout) [10:55:44.057] }, add = TRUE) [10:55:44.057] } [10:55:44.057] ...future.frame <- base::sys.nframe() [10:55:44.057] ...future.conditions <- base::list() [10:55:44.057] ...future.rng <- base::globalenv()$.Random.seed [10:55:44.057] if (FALSE) { [10:55:44.057] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:55:44.057] "...future.value", "...future.globalenv.names", ".Random.seed") [10:55:44.057] } [10:55:44.057] ...future.result <- base::tryCatch({ [10:55:44.057] base::withCallingHandlers({ [10:55:44.057] ...future.value <- base::withVisible(base::local(2 * [10:55:44.057] a)) [10:55:44.057] future::FutureResult(value = ...future.value$value, [10:55:44.057] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:55:44.057] ...future.rng), globalenv = if (FALSE) [10:55:44.057] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:55:44.057] ...future.globalenv.names)) [10:55:44.057] else NULL, started = ...future.startTime, version = "1.8") [10:55:44.057] }, condition = base::local({ [10:55:44.057] c <- base::c [10:55:44.057] inherits <- base::inherits [10:55:44.057] invokeRestart <- base::invokeRestart [10:55:44.057] length <- base::length [10:55:44.057] list <- base::list [10:55:44.057] seq.int <- base::seq.int [10:55:44.057] signalCondition <- base::signalCondition [10:55:44.057] sys.calls <- base::sys.calls [10:55:44.057] `[[` <- base::`[[` [10:55:44.057] `+` <- base::`+` [10:55:44.057] `<<-` <- base::`<<-` [10:55:44.057] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:55:44.057] calls[seq.int(from = from + 12L, to = length(calls) - [10:55:44.057] 3L)] [10:55:44.057] } [10:55:44.057] function(cond) { [10:55:44.057] is_error <- inherits(cond, "error") [10:55:44.057] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:55:44.057] NULL) [10:55:44.057] if (is_error) { [10:55:44.057] sessionInformation <- function() { [10:55:44.057] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:55:44.057] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:55:44.057] search = base::search(), system = base::Sys.info()) [10:55:44.057] } [10:55:44.057] ...future.conditions[[length(...future.conditions) + [10:55:44.057] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:55:44.057] cond$call), session = sessionInformation(), [10:55:44.057] timestamp = base::Sys.time(), signaled = 0L) [10:55:44.057] signalCondition(cond) [10:55:44.057] } [10:55:44.057] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:55:44.057] signal <- FALSE && inherits(cond, character(0)) [10:55:44.057] ...future.conditions[[length(...future.conditions) + [10:55:44.057] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:55:44.057] if (FALSE && !signal) { [10:55:44.057] muffleCondition <- function (cond, pattern = "^muffle") [10:55:44.057] { [10:55:44.057] inherits <- base::inherits [10:55:44.057] invokeRestart <- base::invokeRestart [10:55:44.057] is.null <- base::is.null [10:55:44.057] muffled <- FALSE [10:55:44.057] if (inherits(cond, "message")) { [10:55:44.057] muffled <- grepl(pattern, "muffleMessage") [10:55:44.057] if (muffled) [10:55:44.057] invokeRestart("muffleMessage") [10:55:44.057] } [10:55:44.057] else if (inherits(cond, "warning")) { [10:55:44.057] muffled <- grepl(pattern, "muffleWarning") [10:55:44.057] if (muffled) [10:55:44.057] invokeRestart("muffleWarning") [10:55:44.057] } [10:55:44.057] else if (inherits(cond, "condition")) { [10:55:44.057] if (!is.null(pattern)) { [10:55:44.057] computeRestarts <- base::computeRestarts [10:55:44.057] grepl <- base::grepl [10:55:44.057] restarts <- computeRestarts(cond) [10:55:44.057] for (restart in restarts) { [10:55:44.057] name <- restart$name [10:55:44.057] if (is.null(name)) [10:55:44.057] next [10:55:44.057] if (!grepl(pattern, name)) [10:55:44.057] next [10:55:44.057] invokeRestart(restart) [10:55:44.057] muffled <- TRUE [10:55:44.057] break [10:55:44.057] } [10:55:44.057] } [10:55:44.057] } [10:55:44.057] invisible(muffled) [10:55:44.057] } [10:55:44.057] muffleCondition(cond, pattern = "^muffle") [10:55:44.057] } [10:55:44.057] } [10:55:44.057] else { [10:55:44.057] if (TRUE) { [10:55:44.057] muffleCondition <- function (cond, pattern = "^muffle") [10:55:44.057] { [10:55:44.057] inherits <- base::inherits [10:55:44.057] invokeRestart <- base::invokeRestart [10:55:44.057] is.null <- base::is.null [10:55:44.057] muffled <- FALSE [10:55:44.057] if (inherits(cond, "message")) { [10:55:44.057] muffled <- grepl(pattern, "muffleMessage") [10:55:44.057] if (muffled) [10:55:44.057] invokeRestart("muffleMessage") [10:55:44.057] } [10:55:44.057] else if (inherits(cond, "warning")) { [10:55:44.057] muffled <- grepl(pattern, "muffleWarning") [10:55:44.057] if (muffled) [10:55:44.057] invokeRestart("muffleWarning") [10:55:44.057] } [10:55:44.057] else if (inherits(cond, "condition")) { [10:55:44.057] if (!is.null(pattern)) { [10:55:44.057] computeRestarts <- base::computeRestarts [10:55:44.057] grepl <- base::grepl [10:55:44.057] restarts <- computeRestarts(cond) [10:55:44.057] for (restart in restarts) { [10:55:44.057] name <- restart$name [10:55:44.057] if (is.null(name)) [10:55:44.057] next [10:55:44.057] if (!grepl(pattern, name)) [10:55:44.057] next [10:55:44.057] invokeRestart(restart) [10:55:44.057] muffled <- TRUE [10:55:44.057] break [10:55:44.057] } [10:55:44.057] } [10:55:44.057] } [10:55:44.057] invisible(muffled) [10:55:44.057] } [10:55:44.057] muffleCondition(cond, pattern = "^muffle") [10:55:44.057] } [10:55:44.057] } [10:55:44.057] } [10:55:44.057] })) [10:55:44.057] }, error = function(ex) { [10:55:44.057] base::structure(base::list(value = NULL, visible = NULL, [10:55:44.057] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:55:44.057] ...future.rng), started = ...future.startTime, [10:55:44.057] finished = Sys.time(), session_uuid = NA_character_, [10:55:44.057] version = "1.8"), class = "FutureResult") [10:55:44.057] }, finally = { [10:55:44.057] if (!identical(...future.workdir, getwd())) [10:55:44.057] setwd(...future.workdir) [10:55:44.057] { [10:55:44.057] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:55:44.057] ...future.oldOptions$nwarnings <- NULL [10:55:44.057] } [10:55:44.057] base::options(...future.oldOptions) [10:55:44.057] if (.Platform$OS.type == "windows") { [10:55:44.057] old_names <- names(...future.oldEnvVars) [10:55:44.057] envs <- base::Sys.getenv() [10:55:44.057] names <- names(envs) [10:55:44.057] common <- intersect(names, old_names) [10:55:44.057] added <- setdiff(names, old_names) [10:55:44.057] removed <- setdiff(old_names, names) [10:55:44.057] changed <- common[...future.oldEnvVars[common] != [10:55:44.057] envs[common]] [10:55:44.057] NAMES <- toupper(changed) [10:55:44.057] args <- list() [10:55:44.057] for (kk in seq_along(NAMES)) { [10:55:44.057] name <- changed[[kk]] [10:55:44.057] NAME <- NAMES[[kk]] [10:55:44.057] if (name != NAME && is.element(NAME, old_names)) [10:55:44.057] next [10:55:44.057] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:44.057] } [10:55:44.057] NAMES <- toupper(added) [10:55:44.057] for (kk in seq_along(NAMES)) { [10:55:44.057] name <- added[[kk]] [10:55:44.057] NAME <- NAMES[[kk]] [10:55:44.057] if (name != NAME && is.element(NAME, old_names)) [10:55:44.057] next [10:55:44.057] args[[name]] <- "" [10:55:44.057] } [10:55:44.057] NAMES <- toupper(removed) [10:55:44.057] for (kk in seq_along(NAMES)) { [10:55:44.057] name <- removed[[kk]] [10:55:44.057] NAME <- NAMES[[kk]] [10:55:44.057] if (name != NAME && is.element(NAME, old_names)) [10:55:44.057] next [10:55:44.057] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:44.057] } [10:55:44.057] if (length(args) > 0) [10:55:44.057] base::do.call(base::Sys.setenv, args = args) [10:55:44.057] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:55:44.057] } [10:55:44.057] else { [10:55:44.057] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:55:44.057] } [10:55:44.057] { [10:55:44.057] if (base::length(...future.futureOptionsAdded) > [10:55:44.057] 0L) { [10:55:44.057] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:55:44.057] base::names(opts) <- ...future.futureOptionsAdded [10:55:44.057] base::options(opts) [10:55:44.057] } [10:55:44.057] { [10:55:44.057] NULL [10:55:44.057] options(future.plan = NULL) [10:55:44.057] if (is.na(NA_character_)) [10:55:44.057] Sys.unsetenv("R_FUTURE_PLAN") [10:55:44.057] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:55:44.057] future::plan(...future.strategy.old, .cleanup = FALSE, [10:55:44.057] .init = FALSE) [10:55:44.057] } [10:55:44.057] } [10:55:44.057] } [10:55:44.057] }) [10:55:44.057] if (TRUE) { [10:55:44.057] base::sink(type = "output", split = FALSE) [10:55:44.057] if (TRUE) { [10:55:44.057] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:55:44.057] } [10:55:44.057] else { [10:55:44.057] ...future.result["stdout"] <- base::list(NULL) [10:55:44.057] } [10:55:44.057] base::close(...future.stdout) [10:55:44.057] ...future.stdout <- NULL [10:55:44.057] } [10:55:44.057] ...future.result$conditions <- ...future.conditions [10:55:44.057] ...future.result$finished <- base::Sys.time() [10:55:44.057] ...future.result [10:55:44.057] } [10:55:44.061] - Launch lazy future ... done [10:55:44.061] run() for 'MiraiFuture' ... done [10:55:44.064] getGlobalsAndPackages() ... [10:55:44.064] Searching for globals... [10:55:44.065] - globals found: [3] '{', '*', 'a' [10:55:44.065] Searching for globals ... DONE [10:55:44.065] Resolving globals: FALSE [10:55:44.066] The total size of the 1 globals is 56 bytes (56 bytes) [10:55:44.066] 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') [10:55:44.067] - globals: [1] 'a' [10:55:44.067] [10:55:44.067] getGlobalsAndPackages() ... DONE [10:55:44.067] run() for 'Future' ... [10:55:44.067] - state: 'created' [10:55:44.068] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:55:44.070] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:55:44.070] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:55:44.070] - Field: 'label' [10:55:44.071] - Field: 'local' [10:55:44.071] - Field: 'owner' [10:55:44.071] - Field: 'envir' [10:55:44.071] - Field: 'packages' [10:55:44.071] - Field: 'gc' [10:55:44.071] - Field: 'conditions' [10:55:44.072] - Field: 'expr' [10:55:44.072] - Field: 'uuid' [10:55:44.072] - Field: 'seed' [10:55:44.072] - Field: 'version' [10:55:44.072] - Field: 'result' [10:55:44.072] - Field: 'asynchronous' [10:55:44.073] - Field: 'calls' [10:55:44.073] - Field: 'globals' [10:55:44.073] - Field: 'stdout' [10:55:44.073] - Field: 'earlySignal' [10:55:44.073] - Field: 'lazy' [10:55:44.073] - Field: 'state' [10:55:44.074] - Field: '.cluster' [10:55:44.074] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:55:44.074] - Launch lazy future ... [10:55:44.074] Packages needed by the future expression (n = 0): [10:55:44.074] Packages needed by future strategies (n = 0): [10:55:44.075] { [10:55:44.075] { [10:55:44.075] { [10:55:44.075] ...future.startTime <- base::Sys.time() [10:55:44.075] { [10:55:44.075] { [10:55:44.075] { [10:55:44.075] base::local({ [10:55:44.075] has_future <- base::requireNamespace("future", [10:55:44.075] quietly = TRUE) [10:55:44.075] if (has_future) { [10:55:44.075] ns <- base::getNamespace("future") [10:55:44.075] version <- ns[[".package"]][["version"]] [10:55:44.075] if (is.null(version)) [10:55:44.075] version <- utils::packageVersion("future") [10:55:44.075] } [10:55:44.075] else { [10:55:44.075] version <- NULL [10:55:44.075] } [10:55:44.075] if (!has_future || version < "1.8.0") { [10:55:44.075] info <- base::c(r_version = base::gsub("R version ", [10:55:44.075] "", base::R.version$version.string), [10:55:44.075] platform = base::sprintf("%s (%s-bit)", [10:55:44.075] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:55:44.075] os = base::paste(base::Sys.info()[base::c("sysname", [10:55:44.075] "release", "version")], collapse = " "), [10:55:44.075] hostname = base::Sys.info()[["nodename"]]) [10:55:44.075] info <- base::sprintf("%s: %s", base::names(info), [10:55:44.075] info) [10:55:44.075] info <- base::paste(info, collapse = "; ") [10:55:44.075] if (!has_future) { [10:55:44.075] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:55:44.075] info) [10:55:44.075] } [10:55:44.075] else { [10:55:44.075] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:55:44.075] info, version) [10:55:44.075] } [10:55:44.075] base::stop(msg) [10:55:44.075] } [10:55:44.075] }) [10:55:44.075] } [10:55:44.075] ...future.strategy.old <- future::plan("list") [10:55:44.075] options(future.plan = NULL) [10:55:44.075] Sys.unsetenv("R_FUTURE_PLAN") [10:55:44.075] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:55:44.075] } [10:55:44.075] ...future.workdir <- getwd() [10:55:44.075] } [10:55:44.075] ...future.oldOptions <- base::as.list(base::.Options) [10:55:44.075] ...future.oldEnvVars <- base::Sys.getenv() [10:55:44.075] } [10:55:44.075] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:55:44.075] future.globals.maxSize = NULL, future.globals.method = NULL, [10:55:44.075] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:55:44.075] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:55:44.075] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:55:44.075] future.stdout.windows.reencode = NULL, width = 80L) [10:55:44.075] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:55:44.075] base::names(...future.oldOptions)) [10:55:44.075] } [10:55:44.075] if (FALSE) { [10:55:44.075] } [10:55:44.075] else { [10:55:44.075] if (TRUE) { [10:55:44.075] ...future.stdout <- base::rawConnection(base::raw(0L), [10:55:44.075] open = "w") [10:55:44.075] } [10:55:44.075] else { [10:55:44.075] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:55:44.075] windows = "NUL", "/dev/null"), open = "w") [10:55:44.075] } [10:55:44.075] base::sink(...future.stdout, type = "output", split = FALSE) [10:55:44.075] base::on.exit(if (!base::is.null(...future.stdout)) { [10:55:44.075] base::sink(type = "output", split = FALSE) [10:55:44.075] base::close(...future.stdout) [10:55:44.075] }, add = TRUE) [10:55:44.075] } [10:55:44.075] ...future.frame <- base::sys.nframe() [10:55:44.075] ...future.conditions <- base::list() [10:55:44.075] ...future.rng <- base::globalenv()$.Random.seed [10:55:44.075] if (FALSE) { [10:55:44.075] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:55:44.075] "...future.value", "...future.globalenv.names", ".Random.seed") [10:55:44.075] } [10:55:44.075] ...future.result <- base::tryCatch({ [10:55:44.075] base::withCallingHandlers({ [10:55:44.075] ...future.value <- base::withVisible(base::local({ [10:55:44.075] 2 * a [10:55:44.075] })) [10:55:44.075] future::FutureResult(value = ...future.value$value, [10:55:44.075] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:55:44.075] ...future.rng), globalenv = if (FALSE) [10:55:44.075] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:55:44.075] ...future.globalenv.names)) [10:55:44.075] else NULL, started = ...future.startTime, version = "1.8") [10:55:44.075] }, condition = base::local({ [10:55:44.075] c <- base::c [10:55:44.075] inherits <- base::inherits [10:55:44.075] invokeRestart <- base::invokeRestart [10:55:44.075] length <- base::length [10:55:44.075] list <- base::list [10:55:44.075] seq.int <- base::seq.int [10:55:44.075] signalCondition <- base::signalCondition [10:55:44.075] sys.calls <- base::sys.calls [10:55:44.075] `[[` <- base::`[[` [10:55:44.075] `+` <- base::`+` [10:55:44.075] `<<-` <- base::`<<-` [10:55:44.075] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:55:44.075] calls[seq.int(from = from + 12L, to = length(calls) - [10:55:44.075] 3L)] [10:55:44.075] } [10:55:44.075] function(cond) { [10:55:44.075] is_error <- inherits(cond, "error") [10:55:44.075] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:55:44.075] NULL) [10:55:44.075] if (is_error) { [10:55:44.075] sessionInformation <- function() { [10:55:44.075] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:55:44.075] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:55:44.075] search = base::search(), system = base::Sys.info()) [10:55:44.075] } [10:55:44.075] ...future.conditions[[length(...future.conditions) + [10:55:44.075] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:55:44.075] cond$call), session = sessionInformation(), [10:55:44.075] timestamp = base::Sys.time(), signaled = 0L) [10:55:44.075] signalCondition(cond) [10:55:44.075] } [10:55:44.075] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:55:44.075] signal <- FALSE && inherits(cond, character(0)) [10:55:44.075] ...future.conditions[[length(...future.conditions) + [10:55:44.075] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:55:44.075] if (FALSE && !signal) { [10:55:44.075] muffleCondition <- function (cond, pattern = "^muffle") [10:55:44.075] { [10:55:44.075] inherits <- base::inherits [10:55:44.075] invokeRestart <- base::invokeRestart [10:55:44.075] is.null <- base::is.null [10:55:44.075] muffled <- FALSE [10:55:44.075] if (inherits(cond, "message")) { [10:55:44.075] muffled <- grepl(pattern, "muffleMessage") [10:55:44.075] if (muffled) [10:55:44.075] invokeRestart("muffleMessage") [10:55:44.075] } [10:55:44.075] else if (inherits(cond, "warning")) { [10:55:44.075] muffled <- grepl(pattern, "muffleWarning") [10:55:44.075] if (muffled) [10:55:44.075] invokeRestart("muffleWarning") [10:55:44.075] } [10:55:44.075] else if (inherits(cond, "condition")) { [10:55:44.075] if (!is.null(pattern)) { [10:55:44.075] computeRestarts <- base::computeRestarts [10:55:44.075] grepl <- base::grepl [10:55:44.075] restarts <- computeRestarts(cond) [10:55:44.075] for (restart in restarts) { [10:55:44.075] name <- restart$name [10:55:44.075] if (is.null(name)) [10:55:44.075] next [10:55:44.075] if (!grepl(pattern, name)) [10:55:44.075] next [10:55:44.075] invokeRestart(restart) [10:55:44.075] muffled <- TRUE [10:55:44.075] break [10:55:44.075] } [10:55:44.075] } [10:55:44.075] } [10:55:44.075] invisible(muffled) [10:55:44.075] } [10:55:44.075] muffleCondition(cond, pattern = "^muffle") [10:55:44.075] } [10:55:44.075] } [10:55:44.075] else { [10:55:44.075] if (TRUE) { [10:55:44.075] muffleCondition <- function (cond, pattern = "^muffle") [10:55:44.075] { [10:55:44.075] inherits <- base::inherits [10:55:44.075] invokeRestart <- base::invokeRestart [10:55:44.075] is.null <- base::is.null [10:55:44.075] muffled <- FALSE [10:55:44.075] if (inherits(cond, "message")) { [10:55:44.075] muffled <- grepl(pattern, "muffleMessage") [10:55:44.075] if (muffled) [10:55:44.075] invokeRestart("muffleMessage") [10:55:44.075] } [10:55:44.075] else if (inherits(cond, "warning")) { [10:55:44.075] muffled <- grepl(pattern, "muffleWarning") [10:55:44.075] if (muffled) [10:55:44.075] invokeRestart("muffleWarning") [10:55:44.075] } [10:55:44.075] else if (inherits(cond, "condition")) { [10:55:44.075] if (!is.null(pattern)) { [10:55:44.075] computeRestarts <- base::computeRestarts [10:55:44.075] grepl <- base::grepl [10:55:44.075] restarts <- computeRestarts(cond) [10:55:44.075] for (restart in restarts) { [10:55:44.075] name <- restart$name [10:55:44.075] if (is.null(name)) [10:55:44.075] next [10:55:44.075] if (!grepl(pattern, name)) [10:55:44.075] next [10:55:44.075] invokeRestart(restart) [10:55:44.075] muffled <- TRUE [10:55:44.075] break [10:55:44.075] } [10:55:44.075] } [10:55:44.075] } [10:55:44.075] invisible(muffled) [10:55:44.075] } [10:55:44.075] muffleCondition(cond, pattern = "^muffle") [10:55:44.075] } [10:55:44.075] } [10:55:44.075] } [10:55:44.075] })) [10:55:44.075] }, error = function(ex) { [10:55:44.075] base::structure(base::list(value = NULL, visible = NULL, [10:55:44.075] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:55:44.075] ...future.rng), started = ...future.startTime, [10:55:44.075] finished = Sys.time(), session_uuid = NA_character_, [10:55:44.075] version = "1.8"), class = "FutureResult") [10:55:44.075] }, finally = { [10:55:44.075] if (!identical(...future.workdir, getwd())) [10:55:44.075] setwd(...future.workdir) [10:55:44.075] { [10:55:44.075] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:55:44.075] ...future.oldOptions$nwarnings <- NULL [10:55:44.075] } [10:55:44.075] base::options(...future.oldOptions) [10:55:44.075] if (.Platform$OS.type == "windows") { [10:55:44.075] old_names <- names(...future.oldEnvVars) [10:55:44.075] envs <- base::Sys.getenv() [10:55:44.075] names <- names(envs) [10:55:44.075] common <- intersect(names, old_names) [10:55:44.075] added <- setdiff(names, old_names) [10:55:44.075] removed <- setdiff(old_names, names) [10:55:44.075] changed <- common[...future.oldEnvVars[common] != [10:55:44.075] envs[common]] [10:55:44.075] NAMES <- toupper(changed) [10:55:44.075] args <- list() [10:55:44.075] for (kk in seq_along(NAMES)) { [10:55:44.075] name <- changed[[kk]] [10:55:44.075] NAME <- NAMES[[kk]] [10:55:44.075] if (name != NAME && is.element(NAME, old_names)) [10:55:44.075] next [10:55:44.075] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:44.075] } [10:55:44.075] NAMES <- toupper(added) [10:55:44.075] for (kk in seq_along(NAMES)) { [10:55:44.075] name <- added[[kk]] [10:55:44.075] NAME <- NAMES[[kk]] [10:55:44.075] if (name != NAME && is.element(NAME, old_names)) [10:55:44.075] next [10:55:44.075] args[[name]] <- "" [10:55:44.075] } [10:55:44.075] NAMES <- toupper(removed) [10:55:44.075] for (kk in seq_along(NAMES)) { [10:55:44.075] name <- removed[[kk]] [10:55:44.075] NAME <- NAMES[[kk]] [10:55:44.075] if (name != NAME && is.element(NAME, old_names)) [10:55:44.075] next [10:55:44.075] args[[name]] <- ...future.oldEnvVars[[name]] [10:55:44.075] } [10:55:44.075] if (length(args) > 0) [10:55:44.075] base::do.call(base::Sys.setenv, args = args) [10:55:44.075] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:55:44.075] } [10:55:44.075] else { [10:55:44.075] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:55:44.075] } [10:55:44.075] { [10:55:44.075] if (base::length(...future.futureOptionsAdded) > [10:55:44.075] 0L) { [10:55:44.075] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:55:44.075] base::names(opts) <- ...future.futureOptionsAdded [10:55:44.075] base::options(opts) [10:55:44.075] } [10:55:44.075] { [10:55:44.075] NULL [10:55:44.075] options(future.plan = NULL) [10:55:44.075] if (is.na(NA_character_)) [10:55:44.075] Sys.unsetenv("R_FUTURE_PLAN") [10:55:44.075] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:55:44.075] future::plan(...future.strategy.old, .cleanup = FALSE, [10:55:44.075] .init = FALSE) [10:55:44.075] } [10:55:44.075] } [10:55:44.075] } [10:55:44.075] }) [10:55:44.075] if (TRUE) { [10:55:44.075] base::sink(type = "output", split = FALSE) [10:55:44.075] if (TRUE) { [10:55:44.075] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:55:44.075] } [10:55:44.075] else { [10:55:44.075] ...future.result["stdout"] <- base::list(NULL) [10:55:44.075] } [10:55:44.075] base::close(...future.stdout) [10:55:44.075] ...future.stdout <- NULL [10:55:44.075] } [10:55:44.075] ...future.result$conditions <- ...future.conditions [10:55:44.075] ...future.result$finished <- base::Sys.time() [10:55:44.075] ...future.result [10:55:44.075] } [10:55:44.079] - Launch lazy future ... done [10:55:44.079] run() for 'MiraiFuture' ... done [10:55:44.082] - plan('mirai_multisession') ... DONE> > message("*** Futures - lazy ... DONE") *** Futures - lazy ... DONE > > source("incl/end.R") > > proc.time() user system elapsed 0.40 0.12 1.06