R Under development (unstable) (2024-07-02 r86866 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. > ## This requires mirai (>= 0.13.2) > if (packageVersion("mirai") >= "0.13.2") { + + source("incl/start.R") + library("listenv") + + if (requireNamespace("future.apply", quietly = TRUE)) { + future_lapply <- future.apply::future_lapply + + strategies <- c("mirai_multisession") + + message("*** future_lapply() ...") + + message("- future_lapply(x, FUN = vector, ...) ...") + + x <- list(a = "integer", c = "character", c = "list") + str(list(x = x)) + + y0 <- lapply(x, FUN = vector, length = 2L) + str(list(y0 = y0)) + + for (strategy in strategies) { + mprintf("- plan('%s') ...", strategy) + plan(strategy) + stopifnot(nbrOfWorkers() < Inf) + + for (scheduling in list(FALSE, TRUE)) { + y <- future_lapply(x, FUN = vector, length = 2L, + future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y0)) + } + } + + + message("- future_lapply(x, FUN = base::vector, ...) ...") + + x <- list(a = "integer", c = "character", c = "list") + str(list(x = x)) + + y0 <- lapply(x, FUN = base::vector, length = 2L) + str(list(y0 = y0)) + + for (strategy in strategies) { + mprintf("- plan('%s') ...", strategy) + plan(strategy) + stopifnot(nbrOfWorkers() < Inf) + + for (scheduling in list(FALSE, TRUE)) { + y <- future_lapply(x, FUN = base::vector, length = 2L, + future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y0)) + } + } + + message("- future_lapply(x, FUN = future:::hpaste, ...) ...") + + x <- list(a = c("hello", b = 1:100)) + str(list(x = x)) + + y0 <- lapply(x, FUN = future:::hpaste, collapse = "; ", maxHead = 3L) + str(list(y0 = y0)) + + for (strategy in strategies) { + mprintf("- plan('%s') ...", strategy) + plan(strategy) + stopifnot(nbrOfWorkers() < Inf) + + for (scheduling in list(FALSE, TRUE)) { + y <- future_lapply(x, FUN = future:::hpaste, collapse = "; ", + maxHead = 3L, future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y0)) + } + } + + + message("- future_lapply(x, FUN = listenv::listenv, ...) ...") + + x <- list() + + y <- listenv() + y$A <- 3L + x$a <- y + + y <- listenv() + y$A <- 3L + y$B <- c("hello", b = 1:100) + x$b <- y + + print(x) + + y0 <- lapply(x, FUN = listenv::mapping) + str(list(y0 = y0)) + + for (strategy in strategies) { + mprintf("- plan('%s') ...", strategy) + plan(strategy) + stopifnot(nbrOfWorkers() < Inf) + + for (scheduling in list(FALSE, TRUE)) { + y <- future_lapply(x, FUN = listenv::mapping, future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y0)) + } + } + + + message("- future_lapply(x, FUN, ...) for large length(x) ...") + a <- 3.14 + x <- 1:1e6 + + y <- future_lapply(x, FUN = function(z) sqrt(z + a)) + y <- unlist(y, use.names = FALSE) + + stopifnot(all.equal(y, sqrt(x + a))) + + + message("- future_lapply() with global in non-attached package ...") + library("tools") + my_ext <- function(x) file_ext(x) + y_truth <- lapply("abc.txt", FUN = my_ext) + + for (strategy in strategies) { + plan(strategy) + y <- future_lapply("abc.txt", FUN = my_ext) + stopifnot(identical(y, y_truth)) + } + + message("*** future_lapply() ... DONE") + } + + source("incl/end.R") + + } Loading required package: future [13:31:19.964] plan(): Setting new future strategy stack: [13:31:19.965] List of future strategies: [13:31:19.965] 1. mirai_multisession: [13:31:19.965] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:19.965] - tweaked: FALSE [13:31:19.965] - call: future::plan(future.mirai::mirai_multisession) [13:31:19.977] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:19.977] < mirai [$data] > [13:31:19.982] getGlobalsAndPackages() ... [13:31:19.982] Not searching for globals [13:31:19.983] - globals: [0] [13:31:19.983] getGlobalsAndPackages() ... DONE [13:31:19.983] getGlobalsAndPackages() ... [13:31:19.983] [13:31:19.984] - globals: [0] [13:31:19.984] getGlobalsAndPackages() ... DONE [13:31:20.230] Packages needed by the future expression (n = 0): [13:31:20.230] Packages needed by future strategies (n = 0): [13:31:20.231] { [13:31:20.231] { [13:31:20.231] { [13:31:20.231] ...future.startTime <- base::Sys.time() [13:31:20.231] { [13:31:20.231] { [13:31:20.231] { [13:31:20.231] base::local({ [13:31:20.231] has_future <- base::requireNamespace("future", [13:31:20.231] quietly = TRUE) [13:31:20.231] if (has_future) { [13:31:20.231] ns <- base::getNamespace("future") [13:31:20.231] version <- ns[[".package"]][["version"]] [13:31:20.231] if (is.null(version)) [13:31:20.231] version <- utils::packageVersion("future") [13:31:20.231] } [13:31:20.231] else { [13:31:20.231] version <- NULL [13:31:20.231] } [13:31:20.231] if (!has_future || version < "1.8.0") { [13:31:20.231] info <- base::c(r_version = base::gsub("R version ", [13:31:20.231] "", base::R.version$version.string), [13:31:20.231] platform = base::sprintf("%s (%s-bit)", [13:31:20.231] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.231] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.231] "release", "version")], collapse = " "), [13:31:20.231] hostname = base::Sys.info()[["nodename"]]) [13:31:20.231] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.231] info) [13:31:20.231] info <- base::paste(info, collapse = "; ") [13:31:20.231] if (!has_future) { [13:31:20.231] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.231] info) [13:31:20.231] } [13:31:20.231] else { [13:31:20.231] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.231] info, version) [13:31:20.231] } [13:31:20.231] base::stop(msg) [13:31:20.231] } [13:31:20.231] }) [13:31:20.231] } [13:31:20.231] ...future.strategy.old <- future::plan("list") [13:31:20.231] options(future.plan = NULL) [13:31:20.231] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.231] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.231] } [13:31:20.231] ...future.workdir <- getwd() [13:31:20.231] } [13:31:20.231] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.231] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.231] } [13:31:20.231] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.231] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:20.231] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.231] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.231] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.231] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.231] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.231] base::names(...future.oldOptions)) [13:31:20.231] } [13:31:20.231] if (FALSE) { [13:31:20.231] } [13:31:20.231] else { [13:31:20.231] if (TRUE) { [13:31:20.231] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.231] open = "w") [13:31:20.231] } [13:31:20.231] else { [13:31:20.231] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.231] windows = "NUL", "/dev/null"), open = "w") [13:31:20.231] } [13:31:20.231] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.231] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.231] base::sink(type = "output", split = FALSE) [13:31:20.231] base::close(...future.stdout) [13:31:20.231] }, add = TRUE) [13:31:20.231] } [13:31:20.231] ...future.frame <- base::sys.nframe() [13:31:20.231] ...future.conditions <- base::list() [13:31:20.231] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.231] if (FALSE) { [13:31:20.231] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.231] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.231] } [13:31:20.231] ...future.result <- base::tryCatch({ [13:31:20.231] base::withCallingHandlers({ [13:31:20.231] ...future.value <- base::withVisible(base::local(NA)) [13:31:20.231] future::FutureResult(value = ...future.value$value, [13:31:20.231] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.231] ...future.rng), globalenv = if (FALSE) [13:31:20.231] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.231] ...future.globalenv.names)) [13:31:20.231] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.231] }, condition = base::local({ [13:31:20.231] c <- base::c [13:31:20.231] inherits <- base::inherits [13:31:20.231] invokeRestart <- base::invokeRestart [13:31:20.231] length <- base::length [13:31:20.231] list <- base::list [13:31:20.231] seq.int <- base::seq.int [13:31:20.231] signalCondition <- base::signalCondition [13:31:20.231] sys.calls <- base::sys.calls [13:31:20.231] `[[` <- base::`[[` [13:31:20.231] `+` <- base::`+` [13:31:20.231] `<<-` <- base::`<<-` [13:31:20.231] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.231] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.231] 3L)] [13:31:20.231] } [13:31:20.231] function(cond) { [13:31:20.231] is_error <- inherits(cond, "error") [13:31:20.231] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.231] NULL) [13:31:20.231] if (is_error) { [13:31:20.231] sessionInformation <- function() { [13:31:20.231] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.231] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.231] search = base::search(), system = base::Sys.info()) [13:31:20.231] } [13:31:20.231] ...future.conditions[[length(...future.conditions) + [13:31:20.231] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.231] cond$call), session = sessionInformation(), [13:31:20.231] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.231] signalCondition(cond) [13:31:20.231] } [13:31:20.231] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.231] signal <- FALSE && inherits(cond, character(0)) [13:31:20.231] ...future.conditions[[length(...future.conditions) + [13:31:20.231] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.231] if (FALSE && !signal) { [13:31:20.231] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.231] { [13:31:20.231] inherits <- base::inherits [13:31:20.231] invokeRestart <- base::invokeRestart [13:31:20.231] is.null <- base::is.null [13:31:20.231] muffled <- FALSE [13:31:20.231] if (inherits(cond, "message")) { [13:31:20.231] muffled <- grepl(pattern, "muffleMessage") [13:31:20.231] if (muffled) [13:31:20.231] invokeRestart("muffleMessage") [13:31:20.231] } [13:31:20.231] else if (inherits(cond, "warning")) { [13:31:20.231] muffled <- grepl(pattern, "muffleWarning") [13:31:20.231] if (muffled) [13:31:20.231] invokeRestart("muffleWarning") [13:31:20.231] } [13:31:20.231] else if (inherits(cond, "condition")) { [13:31:20.231] if (!is.null(pattern)) { [13:31:20.231] computeRestarts <- base::computeRestarts [13:31:20.231] grepl <- base::grepl [13:31:20.231] restarts <- computeRestarts(cond) [13:31:20.231] for (restart in restarts) { [13:31:20.231] name <- restart$name [13:31:20.231] if (is.null(name)) [13:31:20.231] next [13:31:20.231] if (!grepl(pattern, name)) [13:31:20.231] next [13:31:20.231] invokeRestart(restart) [13:31:20.231] muffled <- TRUE [13:31:20.231] break [13:31:20.231] } [13:31:20.231] } [13:31:20.231] } [13:31:20.231] invisible(muffled) [13:31:20.231] } [13:31:20.231] muffleCondition(cond, pattern = "^muffle") [13:31:20.231] } [13:31:20.231] } [13:31:20.231] else { [13:31:20.231] if (TRUE) { [13:31:20.231] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.231] { [13:31:20.231] inherits <- base::inherits [13:31:20.231] invokeRestart <- base::invokeRestart [13:31:20.231] is.null <- base::is.null [13:31:20.231] muffled <- FALSE [13:31:20.231] if (inherits(cond, "message")) { [13:31:20.231] muffled <- grepl(pattern, "muffleMessage") [13:31:20.231] if (muffled) [13:31:20.231] invokeRestart("muffleMessage") [13:31:20.231] } [13:31:20.231] else if (inherits(cond, "warning")) { [13:31:20.231] muffled <- grepl(pattern, "muffleWarning") [13:31:20.231] if (muffled) [13:31:20.231] invokeRestart("muffleWarning") [13:31:20.231] } [13:31:20.231] else if (inherits(cond, "condition")) { [13:31:20.231] if (!is.null(pattern)) { [13:31:20.231] computeRestarts <- base::computeRestarts [13:31:20.231] grepl <- base::grepl [13:31:20.231] restarts <- computeRestarts(cond) [13:31:20.231] for (restart in restarts) { [13:31:20.231] name <- restart$name [13:31:20.231] if (is.null(name)) [13:31:20.231] next [13:31:20.231] if (!grepl(pattern, name)) [13:31:20.231] next [13:31:20.231] invokeRestart(restart) [13:31:20.231] muffled <- TRUE [13:31:20.231] break [13:31:20.231] } [13:31:20.231] } [13:31:20.231] } [13:31:20.231] invisible(muffled) [13:31:20.231] } [13:31:20.231] muffleCondition(cond, pattern = "^muffle") [13:31:20.231] } [13:31:20.231] } [13:31:20.231] } [13:31:20.231] })) [13:31:20.231] }, error = function(ex) { [13:31:20.231] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.231] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.231] ...future.rng), started = ...future.startTime, [13:31:20.231] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.231] version = "1.8"), class = "FutureResult") [13:31:20.231] }, finally = { [13:31:20.231] if (!identical(...future.workdir, getwd())) [13:31:20.231] setwd(...future.workdir) [13:31:20.231] { [13:31:20.231] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.231] ...future.oldOptions$nwarnings <- NULL [13:31:20.231] } [13:31:20.231] base::options(...future.oldOptions) [13:31:20.231] if (.Platform$OS.type == "windows") { [13:31:20.231] old_names <- names(...future.oldEnvVars) [13:31:20.231] envs <- base::Sys.getenv() [13:31:20.231] names <- names(envs) [13:31:20.231] common <- intersect(names, old_names) [13:31:20.231] added <- setdiff(names, old_names) [13:31:20.231] removed <- setdiff(old_names, names) [13:31:20.231] changed <- common[...future.oldEnvVars[common] != [13:31:20.231] envs[common]] [13:31:20.231] NAMES <- toupper(changed) [13:31:20.231] args <- list() [13:31:20.231] for (kk in seq_along(NAMES)) { [13:31:20.231] name <- changed[[kk]] [13:31:20.231] NAME <- NAMES[[kk]] [13:31:20.231] if (name != NAME && is.element(NAME, old_names)) [13:31:20.231] next [13:31:20.231] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.231] } [13:31:20.231] NAMES <- toupper(added) [13:31:20.231] for (kk in seq_along(NAMES)) { [13:31:20.231] name <- added[[kk]] [13:31:20.231] NAME <- NAMES[[kk]] [13:31:20.231] if (name != NAME && is.element(NAME, old_names)) [13:31:20.231] next [13:31:20.231] args[[name]] <- "" [13:31:20.231] } [13:31:20.231] NAMES <- toupper(removed) [13:31:20.231] for (kk in seq_along(NAMES)) { [13:31:20.231] name <- removed[[kk]] [13:31:20.231] NAME <- NAMES[[kk]] [13:31:20.231] if (name != NAME && is.element(NAME, old_names)) [13:31:20.231] next [13:31:20.231] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.231] } [13:31:20.231] if (length(args) > 0) [13:31:20.231] base::do.call(base::Sys.setenv, args = args) [13:31:20.231] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.231] } [13:31:20.231] else { [13:31:20.231] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.231] } [13:31:20.231] { [13:31:20.231] if (base::length(...future.futureOptionsAdded) > [13:31:20.231] 0L) { [13:31:20.231] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.231] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.231] base::options(opts) [13:31:20.231] } [13:31:20.231] { [13:31:20.231] NULL [13:31:20.231] options(future.plan = NULL) [13:31:20.231] if (is.na(NA_character_)) [13:31:20.231] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.231] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.231] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.231] .init = FALSE) [13:31:20.231] } [13:31:20.231] } [13:31:20.231] } [13:31:20.231] }) [13:31:20.231] if (TRUE) { [13:31:20.231] base::sink(type = "output", split = FALSE) [13:31:20.231] if (TRUE) { [13:31:20.231] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.231] } [13:31:20.231] else { [13:31:20.231] ...future.result["stdout"] <- base::list(NULL) [13:31:20.231] } [13:31:20.231] base::close(...future.stdout) [13:31:20.231] ...future.stdout <- NULL [13:31:20.231] } [13:31:20.231] ...future.result$conditions <- ...future.conditions [13:31:20.231] ...future.result$finished <- base::Sys.time() [13:31:20.231] ...future.result [13:31:20.231] } [13:31:20.349] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:20.349] plan(): nbrOfWorkers() = 2 *** future_lapply() ... - future_lapply(x, FUN = vector, ...) ... List of 1 $ x:List of 3 ..$ a: chr "integer" ..$ c: chr "character" ..$ c: chr "list" List of 1 $ y0:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:31:20.374] - plan('mirai_multisession') ...[13:31:20.374] plan(): Setting new future strategy stack: [13:31:20.374] List of future strategies: [13:31:20.374] 1. mirai_multisession: [13:31:20.374] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:20.374] - tweaked: FALSE [13:31:20.374] - call: plan(strategy) [13:31:20.389] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:20.389] < mirai [$data] > [13:31:20.392] getGlobalsAndPackages() ... [13:31:20.392] Not searching for globals [13:31:20.392] - globals: [0] [13:31:20.392] getGlobalsAndPackages() ... DONE [13:31:20.392] getGlobalsAndPackages() ... [13:31:20.392] [13:31:20.393] - globals: [0] [13:31:20.393] getGlobalsAndPackages() ... DONE [13:31:20.393] Packages needed by the future expression (n = 0): [13:31:20.393] Packages needed by future strategies (n = 0): [13:31:20.394] { [13:31:20.394] { [13:31:20.394] { [13:31:20.394] ...future.startTime <- base::Sys.time() [13:31:20.394] { [13:31:20.394] { [13:31:20.394] { [13:31:20.394] base::local({ [13:31:20.394] has_future <- base::requireNamespace("future", [13:31:20.394] quietly = TRUE) [13:31:20.394] if (has_future) { [13:31:20.394] ns <- base::getNamespace("future") [13:31:20.394] version <- ns[[".package"]][["version"]] [13:31:20.394] if (is.null(version)) [13:31:20.394] version <- utils::packageVersion("future") [13:31:20.394] } [13:31:20.394] else { [13:31:20.394] version <- NULL [13:31:20.394] } [13:31:20.394] if (!has_future || version < "1.8.0") { [13:31:20.394] info <- base::c(r_version = base::gsub("R version ", [13:31:20.394] "", base::R.version$version.string), [13:31:20.394] platform = base::sprintf("%s (%s-bit)", [13:31:20.394] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.394] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.394] "release", "version")], collapse = " "), [13:31:20.394] hostname = base::Sys.info()[["nodename"]]) [13:31:20.394] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.394] info) [13:31:20.394] info <- base::paste(info, collapse = "; ") [13:31:20.394] if (!has_future) { [13:31:20.394] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.394] info) [13:31:20.394] } [13:31:20.394] else { [13:31:20.394] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.394] info, version) [13:31:20.394] } [13:31:20.394] base::stop(msg) [13:31:20.394] } [13:31:20.394] }) [13:31:20.394] } [13:31:20.394] ...future.strategy.old <- future::plan("list") [13:31:20.394] options(future.plan = NULL) [13:31:20.394] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.394] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.394] } [13:31:20.394] ...future.workdir <- getwd() [13:31:20.394] } [13:31:20.394] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.394] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.394] } [13:31:20.394] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.394] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:20.394] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.394] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.394] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.394] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.394] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.394] base::names(...future.oldOptions)) [13:31:20.394] } [13:31:20.394] if (FALSE) { [13:31:20.394] } [13:31:20.394] else { [13:31:20.394] if (TRUE) { [13:31:20.394] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.394] open = "w") [13:31:20.394] } [13:31:20.394] else { [13:31:20.394] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.394] windows = "NUL", "/dev/null"), open = "w") [13:31:20.394] } [13:31:20.394] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.394] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.394] base::sink(type = "output", split = FALSE) [13:31:20.394] base::close(...future.stdout) [13:31:20.394] }, add = TRUE) [13:31:20.394] } [13:31:20.394] ...future.frame <- base::sys.nframe() [13:31:20.394] ...future.conditions <- base::list() [13:31:20.394] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.394] if (FALSE) { [13:31:20.394] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.394] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.394] } [13:31:20.394] ...future.result <- base::tryCatch({ [13:31:20.394] base::withCallingHandlers({ [13:31:20.394] ...future.value <- base::withVisible(base::local(NA)) [13:31:20.394] future::FutureResult(value = ...future.value$value, [13:31:20.394] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.394] ...future.rng), globalenv = if (FALSE) [13:31:20.394] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.394] ...future.globalenv.names)) [13:31:20.394] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.394] }, condition = base::local({ [13:31:20.394] c <- base::c [13:31:20.394] inherits <- base::inherits [13:31:20.394] invokeRestart <- base::invokeRestart [13:31:20.394] length <- base::length [13:31:20.394] list <- base::list [13:31:20.394] seq.int <- base::seq.int [13:31:20.394] signalCondition <- base::signalCondition [13:31:20.394] sys.calls <- base::sys.calls [13:31:20.394] `[[` <- base::`[[` [13:31:20.394] `+` <- base::`+` [13:31:20.394] `<<-` <- base::`<<-` [13:31:20.394] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.394] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.394] 3L)] [13:31:20.394] } [13:31:20.394] function(cond) { [13:31:20.394] is_error <- inherits(cond, "error") [13:31:20.394] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.394] NULL) [13:31:20.394] if (is_error) { [13:31:20.394] sessionInformation <- function() { [13:31:20.394] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.394] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.394] search = base::search(), system = base::Sys.info()) [13:31:20.394] } [13:31:20.394] ...future.conditions[[length(...future.conditions) + [13:31:20.394] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.394] cond$call), session = sessionInformation(), [13:31:20.394] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.394] signalCondition(cond) [13:31:20.394] } [13:31:20.394] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.394] signal <- FALSE && inherits(cond, character(0)) [13:31:20.394] ...future.conditions[[length(...future.conditions) + [13:31:20.394] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.394] if (FALSE && !signal) { [13:31:20.394] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.394] { [13:31:20.394] inherits <- base::inherits [13:31:20.394] invokeRestart <- base::invokeRestart [13:31:20.394] is.null <- base::is.null [13:31:20.394] muffled <- FALSE [13:31:20.394] if (inherits(cond, "message")) { [13:31:20.394] muffled <- grepl(pattern, "muffleMessage") [13:31:20.394] if (muffled) [13:31:20.394] invokeRestart("muffleMessage") [13:31:20.394] } [13:31:20.394] else if (inherits(cond, "warning")) { [13:31:20.394] muffled <- grepl(pattern, "muffleWarning") [13:31:20.394] if (muffled) [13:31:20.394] invokeRestart("muffleWarning") [13:31:20.394] } [13:31:20.394] else if (inherits(cond, "condition")) { [13:31:20.394] if (!is.null(pattern)) { [13:31:20.394] computeRestarts <- base::computeRestarts [13:31:20.394] grepl <- base::grepl [13:31:20.394] restarts <- computeRestarts(cond) [13:31:20.394] for (restart in restarts) { [13:31:20.394] name <- restart$name [13:31:20.394] if (is.null(name)) [13:31:20.394] next [13:31:20.394] if (!grepl(pattern, name)) [13:31:20.394] next [13:31:20.394] invokeRestart(restart) [13:31:20.394] muffled <- TRUE [13:31:20.394] break [13:31:20.394] } [13:31:20.394] } [13:31:20.394] } [13:31:20.394] invisible(muffled) [13:31:20.394] } [13:31:20.394] muffleCondition(cond, pattern = "^muffle") [13:31:20.394] } [13:31:20.394] } [13:31:20.394] else { [13:31:20.394] if (TRUE) { [13:31:20.394] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.394] { [13:31:20.394] inherits <- base::inherits [13:31:20.394] invokeRestart <- base::invokeRestart [13:31:20.394] is.null <- base::is.null [13:31:20.394] muffled <- FALSE [13:31:20.394] if (inherits(cond, "message")) { [13:31:20.394] muffled <- grepl(pattern, "muffleMessage") [13:31:20.394] if (muffled) [13:31:20.394] invokeRestart("muffleMessage") [13:31:20.394] } [13:31:20.394] else if (inherits(cond, "warning")) { [13:31:20.394] muffled <- grepl(pattern, "muffleWarning") [13:31:20.394] if (muffled) [13:31:20.394] invokeRestart("muffleWarning") [13:31:20.394] } [13:31:20.394] else if (inherits(cond, "condition")) { [13:31:20.394] if (!is.null(pattern)) { [13:31:20.394] computeRestarts <- base::computeRestarts [13:31:20.394] grepl <- base::grepl [13:31:20.394] restarts <- computeRestarts(cond) [13:31:20.394] for (restart in restarts) { [13:31:20.394] name <- restart$name [13:31:20.394] if (is.null(name)) [13:31:20.394] next [13:31:20.394] if (!grepl(pattern, name)) [13:31:20.394] next [13:31:20.394] invokeRestart(restart) [13:31:20.394] muffled <- TRUE [13:31:20.394] break [13:31:20.394] } [13:31:20.394] } [13:31:20.394] } [13:31:20.394] invisible(muffled) [13:31:20.394] } [13:31:20.394] muffleCondition(cond, pattern = "^muffle") [13:31:20.394] } [13:31:20.394] } [13:31:20.394] } [13:31:20.394] })) [13:31:20.394] }, error = function(ex) { [13:31:20.394] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.394] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.394] ...future.rng), started = ...future.startTime, [13:31:20.394] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.394] version = "1.8"), class = "FutureResult") [13:31:20.394] }, finally = { [13:31:20.394] if (!identical(...future.workdir, getwd())) [13:31:20.394] setwd(...future.workdir) [13:31:20.394] { [13:31:20.394] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.394] ...future.oldOptions$nwarnings <- NULL [13:31:20.394] } [13:31:20.394] base::options(...future.oldOptions) [13:31:20.394] if (.Platform$OS.type == "windows") { [13:31:20.394] old_names <- names(...future.oldEnvVars) [13:31:20.394] envs <- base::Sys.getenv() [13:31:20.394] names <- names(envs) [13:31:20.394] common <- intersect(names, old_names) [13:31:20.394] added <- setdiff(names, old_names) [13:31:20.394] removed <- setdiff(old_names, names) [13:31:20.394] changed <- common[...future.oldEnvVars[common] != [13:31:20.394] envs[common]] [13:31:20.394] NAMES <- toupper(changed) [13:31:20.394] args <- list() [13:31:20.394] for (kk in seq_along(NAMES)) { [13:31:20.394] name <- changed[[kk]] [13:31:20.394] NAME <- NAMES[[kk]] [13:31:20.394] if (name != NAME && is.element(NAME, old_names)) [13:31:20.394] next [13:31:20.394] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.394] } [13:31:20.394] NAMES <- toupper(added) [13:31:20.394] for (kk in seq_along(NAMES)) { [13:31:20.394] name <- added[[kk]] [13:31:20.394] NAME <- NAMES[[kk]] [13:31:20.394] if (name != NAME && is.element(NAME, old_names)) [13:31:20.394] next [13:31:20.394] args[[name]] <- "" [13:31:20.394] } [13:31:20.394] NAMES <- toupper(removed) [13:31:20.394] for (kk in seq_along(NAMES)) { [13:31:20.394] name <- removed[[kk]] [13:31:20.394] NAME <- NAMES[[kk]] [13:31:20.394] if (name != NAME && is.element(NAME, old_names)) [13:31:20.394] next [13:31:20.394] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.394] } [13:31:20.394] if (length(args) > 0) [13:31:20.394] base::do.call(base::Sys.setenv, args = args) [13:31:20.394] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.394] } [13:31:20.394] else { [13:31:20.394] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.394] } [13:31:20.394] { [13:31:20.394] if (base::length(...future.futureOptionsAdded) > [13:31:20.394] 0L) { [13:31:20.394] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.394] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.394] base::options(opts) [13:31:20.394] } [13:31:20.394] { [13:31:20.394] NULL [13:31:20.394] options(future.plan = NULL) [13:31:20.394] if (is.na(NA_character_)) [13:31:20.394] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.394] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.394] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.394] .init = FALSE) [13:31:20.394] } [13:31:20.394] } [13:31:20.394] } [13:31:20.394] }) [13:31:20.394] if (TRUE) { [13:31:20.394] base::sink(type = "output", split = FALSE) [13:31:20.394] if (TRUE) { [13:31:20.394] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.394] } [13:31:20.394] else { [13:31:20.394] ...future.result["stdout"] <- base::list(NULL) [13:31:20.394] } [13:31:20.394] base::close(...future.stdout) [13:31:20.394] ...future.stdout <- NULL [13:31:20.394] } [13:31:20.394] ...future.result$conditions <- ...future.conditions [13:31:20.394] ...future.result$finished <- base::Sys.time() [13:31:20.394] ...future.result [13:31:20.394] } [13:31:20.510] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:20.511] plan(): nbrOfWorkers() = 2 [13:31:20.511] future_lapply() ... [13:31:20.517] Number of chunks: 3 [13:31:20.518] getGlobalsAndPackagesXApply() ... [13:31:20.518] - future.globals: TRUE [13:31:20.518] getGlobalsAndPackages() ... [13:31:20.518] Searching for globals... [13:31:20.521] - globals found: [2] 'FUN', '.Internal' [13:31:20.521] Searching for globals ... DONE [13:31:20.521] Resolving globals: FALSE [13:31:20.522] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:31:20.523] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:31:20.523] - globals: [1] 'FUN' [13:31:20.523] [13:31:20.523] getGlobalsAndPackages() ... DONE [13:31:20.524] - globals found/used: [n=1] 'FUN' [13:31:20.524] - needed namespaces: [n=0] [13:31:20.524] Finding globals ... DONE [13:31:20.524] - use_args: TRUE [13:31:20.524] - Getting '...' globals ... [13:31:20.528] resolve() on list ... [13:31:20.528] recursive: 0 [13:31:20.528] length: 1 [13:31:20.528] elements: '...' [13:31:20.529] length: 0 (resolved future 1) [13:31:20.529] resolve() on list ... DONE [13:31:20.529] - '...' content: [n=1] 'length' [13:31:20.529] List of 1 [13:31:20.529] $ ...:List of 1 [13:31:20.529] ..$ length: int 2 [13:31:20.529] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:20.529] - attr(*, "where")=List of 1 [13:31:20.529] ..$ ...: [13:31:20.529] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:20.529] - attr(*, "resolved")= logi TRUE [13:31:20.529] - attr(*, "total_size")= num NA [13:31:20.533] - Getting '...' globals ... DONE [13:31:20.533] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:20.533] List of 2 [13:31:20.533] $ ...future.FUN:function (mode = "logical", length = 0L) [13:31:20.533] $ ... :List of 1 [13:31:20.533] ..$ length: int 2 [13:31:20.533] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:20.533] - attr(*, "where")=List of 2 [13:31:20.533] ..$ ...future.FUN: [13:31:20.533] ..$ ... : [13:31:20.533] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:20.533] - attr(*, "resolved")= logi FALSE [13:31:20.533] - attr(*, "total_size")= num 2240 [13:31:20.537] Packages to be attached in all futures: [n=0] [13:31:20.537] getGlobalsAndPackagesXApply() ... DONE [13:31:20.538] Number of futures (= number of chunks): 3 [13:31:20.538] Launching 3 futures (chunks) ... [13:31:20.538] Chunk #1 of 3 ... [13:31:20.538] - Finding globals in 'X' for chunk #1 ... [13:31:20.539] getGlobalsAndPackages() ... [13:31:20.539] Searching for globals... [13:31:20.539] [13:31:20.539] Searching for globals ... DONE [13:31:20.539] - globals: [0] [13:31:20.540] getGlobalsAndPackages() ... DONE [13:31:20.540] + additional globals found: [n=0] [13:31:20.540] + additional namespaces needed: [n=0] [13:31:20.540] - Finding globals in 'X' for chunk #1 ... DONE [13:31:20.540] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:20.540] - seeds: [13:31:20.541] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.541] getGlobalsAndPackages() ... [13:31:20.541] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.541] Resolving globals: FALSE [13:31:20.541] Tweak future expression to call with '...' arguments ... [13:31:20.542] { [13:31:20.542] do.call(function(...) { [13:31:20.542] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.542] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.542] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.542] on.exit(options(oopts), add = TRUE) [13:31:20.542] } [13:31:20.542] { [13:31:20.542] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.542] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.542] ...future.FUN(...future.X_jj, ...) [13:31:20.542] }) [13:31:20.542] } [13:31:20.542] }, args = future.call.arguments) [13:31:20.542] } [13:31:20.542] Tweak future expression to call with '...' arguments ... DONE [13:31:20.542] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.543] [13:31:20.543] getGlobalsAndPackages() ... DONE [13:31:20.543] run() for 'Future' ... [13:31:20.544] - state: 'created' [13:31:20.544] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:20.546] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.546] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:20.547] - Field: 'label' [13:31:20.547] - Field: 'local' [13:31:20.547] - Field: 'owner' [13:31:20.547] - Field: 'envir' [13:31:20.547] - Field: 'packages' [13:31:20.548] - Field: 'gc' [13:31:20.548] - Field: 'conditions' [13:31:20.548] - Field: 'expr' [13:31:20.548] - Field: 'uuid' [13:31:20.548] - Field: 'seed' [13:31:20.548] - Field: 'version' [13:31:20.549] - Field: 'result' [13:31:20.549] - Field: 'asynchronous' [13:31:20.549] - Field: 'calls' [13:31:20.549] - Field: 'globals' [13:31:20.549] - Field: 'stdout' [13:31:20.549] - Field: 'earlySignal' [13:31:20.550] - Field: 'lazy' [13:31:20.550] - Field: 'state' [13:31:20.550] - Field: '.cluster' [13:31:20.550] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:20.550] - Launch lazy future ... [13:31:20.550] Packages needed by the future expression (n = 0): [13:31:20.551] Packages needed by future strategies (n = 0): [13:31:20.551] { [13:31:20.551] { [13:31:20.551] { [13:31:20.551] ...future.startTime <- base::Sys.time() [13:31:20.551] { [13:31:20.551] { [13:31:20.551] { [13:31:20.551] base::local({ [13:31:20.551] has_future <- base::requireNamespace("future", [13:31:20.551] quietly = TRUE) [13:31:20.551] if (has_future) { [13:31:20.551] ns <- base::getNamespace("future") [13:31:20.551] version <- ns[[".package"]][["version"]] [13:31:20.551] if (is.null(version)) [13:31:20.551] version <- utils::packageVersion("future") [13:31:20.551] } [13:31:20.551] else { [13:31:20.551] version <- NULL [13:31:20.551] } [13:31:20.551] if (!has_future || version < "1.8.0") { [13:31:20.551] info <- base::c(r_version = base::gsub("R version ", [13:31:20.551] "", base::R.version$version.string), [13:31:20.551] platform = base::sprintf("%s (%s-bit)", [13:31:20.551] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.551] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.551] "release", "version")], collapse = " "), [13:31:20.551] hostname = base::Sys.info()[["nodename"]]) [13:31:20.551] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.551] info) [13:31:20.551] info <- base::paste(info, collapse = "; ") [13:31:20.551] if (!has_future) { [13:31:20.551] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.551] info) [13:31:20.551] } [13:31:20.551] else { [13:31:20.551] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.551] info, version) [13:31:20.551] } [13:31:20.551] base::stop(msg) [13:31:20.551] } [13:31:20.551] }) [13:31:20.551] } [13:31:20.551] ...future.strategy.old <- future::plan("list") [13:31:20.551] options(future.plan = NULL) [13:31:20.551] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.551] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.551] } [13:31:20.551] ...future.workdir <- getwd() [13:31:20.551] } [13:31:20.551] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.551] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.551] } [13:31:20.551] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.551] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:20.551] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.551] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.551] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.551] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.551] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.551] base::names(...future.oldOptions)) [13:31:20.551] } [13:31:20.551] if (FALSE) { [13:31:20.551] } [13:31:20.551] else { [13:31:20.551] if (TRUE) { [13:31:20.551] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.551] open = "w") [13:31:20.551] } [13:31:20.551] else { [13:31:20.551] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.551] windows = "NUL", "/dev/null"), open = "w") [13:31:20.551] } [13:31:20.551] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.551] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.551] base::sink(type = "output", split = FALSE) [13:31:20.551] base::close(...future.stdout) [13:31:20.551] }, add = TRUE) [13:31:20.551] } [13:31:20.551] ...future.frame <- base::sys.nframe() [13:31:20.551] ...future.conditions <- base::list() [13:31:20.551] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.551] if (FALSE) { [13:31:20.551] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.551] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.551] } [13:31:20.551] ...future.result <- base::tryCatch({ [13:31:20.551] base::withCallingHandlers({ [13:31:20.551] ...future.value <- base::withVisible(base::local({ [13:31:20.551] do.call(function(...) { [13:31:20.551] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.551] if (!identical(...future.globals.maxSize.org, [13:31:20.551] ...future.globals.maxSize)) { [13:31:20.551] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.551] on.exit(options(oopts), add = TRUE) [13:31:20.551] } [13:31:20.551] { [13:31:20.551] lapply(seq_along(...future.elements_ii), [13:31:20.551] FUN = function(jj) { [13:31:20.551] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.551] ...future.FUN(...future.X_jj, ...) [13:31:20.551] }) [13:31:20.551] } [13:31:20.551] }, args = future.call.arguments) [13:31:20.551] })) [13:31:20.551] future::FutureResult(value = ...future.value$value, [13:31:20.551] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.551] ...future.rng), globalenv = if (FALSE) [13:31:20.551] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.551] ...future.globalenv.names)) [13:31:20.551] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.551] }, condition = base::local({ [13:31:20.551] c <- base::c [13:31:20.551] inherits <- base::inherits [13:31:20.551] invokeRestart <- base::invokeRestart [13:31:20.551] length <- base::length [13:31:20.551] list <- base::list [13:31:20.551] seq.int <- base::seq.int [13:31:20.551] signalCondition <- base::signalCondition [13:31:20.551] sys.calls <- base::sys.calls [13:31:20.551] `[[` <- base::`[[` [13:31:20.551] `+` <- base::`+` [13:31:20.551] `<<-` <- base::`<<-` [13:31:20.551] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.551] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.551] 3L)] [13:31:20.551] } [13:31:20.551] function(cond) { [13:31:20.551] is_error <- inherits(cond, "error") [13:31:20.551] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.551] NULL) [13:31:20.551] if (is_error) { [13:31:20.551] sessionInformation <- function() { [13:31:20.551] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.551] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.551] search = base::search(), system = base::Sys.info()) [13:31:20.551] } [13:31:20.551] ...future.conditions[[length(...future.conditions) + [13:31:20.551] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.551] cond$call), session = sessionInformation(), [13:31:20.551] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.551] signalCondition(cond) [13:31:20.551] } [13:31:20.551] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.551] signal <- FALSE && inherits(cond, character(0)) [13:31:20.551] ...future.conditions[[length(...future.conditions) + [13:31:20.551] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.551] if (FALSE && !signal) { [13:31:20.551] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.551] { [13:31:20.551] inherits <- base::inherits [13:31:20.551] invokeRestart <- base::invokeRestart [13:31:20.551] is.null <- base::is.null [13:31:20.551] muffled <- FALSE [13:31:20.551] if (inherits(cond, "message")) { [13:31:20.551] muffled <- grepl(pattern, "muffleMessage") [13:31:20.551] if (muffled) [13:31:20.551] invokeRestart("muffleMessage") [13:31:20.551] } [13:31:20.551] else if (inherits(cond, "warning")) { [13:31:20.551] muffled <- grepl(pattern, "muffleWarning") [13:31:20.551] if (muffled) [13:31:20.551] invokeRestart("muffleWarning") [13:31:20.551] } [13:31:20.551] else if (inherits(cond, "condition")) { [13:31:20.551] if (!is.null(pattern)) { [13:31:20.551] computeRestarts <- base::computeRestarts [13:31:20.551] grepl <- base::grepl [13:31:20.551] restarts <- computeRestarts(cond) [13:31:20.551] for (restart in restarts) { [13:31:20.551] name <- restart$name [13:31:20.551] if (is.null(name)) [13:31:20.551] next [13:31:20.551] if (!grepl(pattern, name)) [13:31:20.551] next [13:31:20.551] invokeRestart(restart) [13:31:20.551] muffled <- TRUE [13:31:20.551] break [13:31:20.551] } [13:31:20.551] } [13:31:20.551] } [13:31:20.551] invisible(muffled) [13:31:20.551] } [13:31:20.551] muffleCondition(cond, pattern = "^muffle") [13:31:20.551] } [13:31:20.551] } [13:31:20.551] else { [13:31:20.551] if (TRUE) { [13:31:20.551] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.551] { [13:31:20.551] inherits <- base::inherits [13:31:20.551] invokeRestart <- base::invokeRestart [13:31:20.551] is.null <- base::is.null [13:31:20.551] muffled <- FALSE [13:31:20.551] if (inherits(cond, "message")) { [13:31:20.551] muffled <- grepl(pattern, "muffleMessage") [13:31:20.551] if (muffled) [13:31:20.551] invokeRestart("muffleMessage") [13:31:20.551] } [13:31:20.551] else if (inherits(cond, "warning")) { [13:31:20.551] muffled <- grepl(pattern, "muffleWarning") [13:31:20.551] if (muffled) [13:31:20.551] invokeRestart("muffleWarning") [13:31:20.551] } [13:31:20.551] else if (inherits(cond, "condition")) { [13:31:20.551] if (!is.null(pattern)) { [13:31:20.551] computeRestarts <- base::computeRestarts [13:31:20.551] grepl <- base::grepl [13:31:20.551] restarts <- computeRestarts(cond) [13:31:20.551] for (restart in restarts) { [13:31:20.551] name <- restart$name [13:31:20.551] if (is.null(name)) [13:31:20.551] next [13:31:20.551] if (!grepl(pattern, name)) [13:31:20.551] next [13:31:20.551] invokeRestart(restart) [13:31:20.551] muffled <- TRUE [13:31:20.551] break [13:31:20.551] } [13:31:20.551] } [13:31:20.551] } [13:31:20.551] invisible(muffled) [13:31:20.551] } [13:31:20.551] muffleCondition(cond, pattern = "^muffle") [13:31:20.551] } [13:31:20.551] } [13:31:20.551] } [13:31:20.551] })) [13:31:20.551] }, error = function(ex) { [13:31:20.551] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.551] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.551] ...future.rng), started = ...future.startTime, [13:31:20.551] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.551] version = "1.8"), class = "FutureResult") [13:31:20.551] }, finally = { [13:31:20.551] if (!identical(...future.workdir, getwd())) [13:31:20.551] setwd(...future.workdir) [13:31:20.551] { [13:31:20.551] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.551] ...future.oldOptions$nwarnings <- NULL [13:31:20.551] } [13:31:20.551] base::options(...future.oldOptions) [13:31:20.551] if (.Platform$OS.type == "windows") { [13:31:20.551] old_names <- names(...future.oldEnvVars) [13:31:20.551] envs <- base::Sys.getenv() [13:31:20.551] names <- names(envs) [13:31:20.551] common <- intersect(names, old_names) [13:31:20.551] added <- setdiff(names, old_names) [13:31:20.551] removed <- setdiff(old_names, names) [13:31:20.551] changed <- common[...future.oldEnvVars[common] != [13:31:20.551] envs[common]] [13:31:20.551] NAMES <- toupper(changed) [13:31:20.551] args <- list() [13:31:20.551] for (kk in seq_along(NAMES)) { [13:31:20.551] name <- changed[[kk]] [13:31:20.551] NAME <- NAMES[[kk]] [13:31:20.551] if (name != NAME && is.element(NAME, old_names)) [13:31:20.551] next [13:31:20.551] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.551] } [13:31:20.551] NAMES <- toupper(added) [13:31:20.551] for (kk in seq_along(NAMES)) { [13:31:20.551] name <- added[[kk]] [13:31:20.551] NAME <- NAMES[[kk]] [13:31:20.551] if (name != NAME && is.element(NAME, old_names)) [13:31:20.551] next [13:31:20.551] args[[name]] <- "" [13:31:20.551] } [13:31:20.551] NAMES <- toupper(removed) [13:31:20.551] for (kk in seq_along(NAMES)) { [13:31:20.551] name <- removed[[kk]] [13:31:20.551] NAME <- NAMES[[kk]] [13:31:20.551] if (name != NAME && is.element(NAME, old_names)) [13:31:20.551] next [13:31:20.551] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.551] } [13:31:20.551] if (length(args) > 0) [13:31:20.551] base::do.call(base::Sys.setenv, args = args) [13:31:20.551] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.551] } [13:31:20.551] else { [13:31:20.551] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.551] } [13:31:20.551] { [13:31:20.551] if (base::length(...future.futureOptionsAdded) > [13:31:20.551] 0L) { [13:31:20.551] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.551] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.551] base::options(opts) [13:31:20.551] } [13:31:20.551] { [13:31:20.551] NULL [13:31:20.551] options(future.plan = NULL) [13:31:20.551] if (is.na(NA_character_)) [13:31:20.551] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.551] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.551] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.551] .init = FALSE) [13:31:20.551] } [13:31:20.551] } [13:31:20.551] } [13:31:20.551] }) [13:31:20.551] if (TRUE) { [13:31:20.551] base::sink(type = "output", split = FALSE) [13:31:20.551] if (TRUE) { [13:31:20.551] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.551] } [13:31:20.551] else { [13:31:20.551] ...future.result["stdout"] <- base::list(NULL) [13:31:20.551] } [13:31:20.551] base::close(...future.stdout) [13:31:20.551] ...future.stdout <- NULL [13:31:20.551] } [13:31:20.551] ...future.result$conditions <- ...future.conditions [13:31:20.551] ...future.result$finished <- base::Sys.time() [13:31:20.551] ...future.result [13:31:20.551] } [13:31:20.555] - Launch lazy future ... done [13:31:20.555] run() for 'MiraiFuture' ... done [13:31:20.556] Created future: [13:31:20.559] resolved() for 'MiraiFuture' ... [13:31:20.559] - state: 'running' [13:31:20.559] - run: TRUE [13:31:20.559] - result: 'NULL' [13:31:20.560] - resolved: FALSE [13:31:20.560] resolved() for 'MiraiFuture' ... done [13:31:20.556] MiraiFuture: [13:31:20.556] Label: 'future_lapply-1' [13:31:20.556] Expression: [13:31:20.556] { [13:31:20.556] do.call(function(...) { [13:31:20.556] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.556] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.556] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.556] on.exit(options(oopts), add = TRUE) [13:31:20.556] } [13:31:20.556] { [13:31:20.556] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.556] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.556] ...future.FUN(...future.X_jj, ...) [13:31:20.556] }) [13:31:20.556] } [13:31:20.556] }, args = future.call.arguments) [13:31:20.556] } [13:31:20.556] Lazy evaluation: FALSE [13:31:20.556] Asynchronous evaluation: TRUE [13:31:20.556] Local evaluation: TRUE [13:31:20.556] Environment: R_GlobalEnv [13:31:20.556] Capture standard output: TRUE [13:31:20.556] Capture condition classes: 'condition' (excluding 'nothing') [13:31:20.556] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:20.556] Packages: [13:31:20.556] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:20.556] Resolved: TRUE [13:31:20.556] Value: [13:31:20.556] Conditions captured: [13:31:20.556] Early signaling: FALSE [13:31:20.556] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:20.556] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.560] Chunk #1 of 3 ... DONE [13:31:20.560] Chunk #2 of 3 ... [13:31:20.561] - Finding globals in 'X' for chunk #2 ... [13:31:20.561] getGlobalsAndPackages() ... [13:31:20.561] Searching for globals... [13:31:20.561] [13:31:20.561] Searching for globals ... DONE [13:31:20.562] - globals: [0] [13:31:20.562] getGlobalsAndPackages() ... DONE [13:31:20.562] + additional globals found: [n=0] [13:31:20.562] + additional namespaces needed: [n=0] [13:31:20.562] - Finding globals in 'X' for chunk #2 ... DONE [13:31:20.562] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:20.562] - seeds: [13:31:20.563] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.563] getGlobalsAndPackages() ... [13:31:20.563] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.563] Resolving globals: FALSE [13:31:20.563] Tweak future expression to call with '...' arguments ... [13:31:20.563] { [13:31:20.563] do.call(function(...) { [13:31:20.563] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.563] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.563] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.563] on.exit(options(oopts), add = TRUE) [13:31:20.563] } [13:31:20.563] { [13:31:20.563] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.563] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.563] ...future.FUN(...future.X_jj, ...) [13:31:20.563] }) [13:31:20.563] } [13:31:20.563] }, args = future.call.arguments) [13:31:20.563] } [13:31:20.564] Tweak future expression to call with '...' arguments ... DONE [13:31:20.564] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.565] [13:31:20.565] getGlobalsAndPackages() ... DONE [13:31:20.565] run() for 'Future' ... [13:31:20.565] - state: 'created' [13:31:20.565] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:20.568] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.568] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:20.568] - Field: 'label' [13:31:20.568] - Field: 'local' [13:31:20.568] - Field: 'owner' [13:31:20.569] - Field: 'envir' [13:31:20.569] - Field: 'packages' [13:31:20.569] - Field: 'gc' [13:31:20.569] - Field: 'conditions' [13:31:20.569] - Field: 'expr' [13:31:20.569] - Field: 'uuid' [13:31:20.570] - Field: 'seed' [13:31:20.570] - Field: 'version' [13:31:20.570] - Field: 'result' [13:31:20.570] - Field: 'asynchronous' [13:31:20.570] - Field: 'calls' [13:31:20.570] - Field: 'globals' [13:31:20.571] - Field: 'stdout' [13:31:20.571] - Field: 'earlySignal' [13:31:20.571] - Field: 'lazy' [13:31:20.571] - Field: 'state' [13:31:20.571] - Field: '.cluster' [13:31:20.571] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:20.572] - Launch lazy future ... [13:31:20.572] Packages needed by the future expression (n = 0): [13:31:20.572] Packages needed by future strategies (n = 0): [13:31:20.572] { [13:31:20.572] { [13:31:20.572] { [13:31:20.572] ...future.startTime <- base::Sys.time() [13:31:20.572] { [13:31:20.572] { [13:31:20.572] { [13:31:20.572] base::local({ [13:31:20.572] has_future <- base::requireNamespace("future", [13:31:20.572] quietly = TRUE) [13:31:20.572] if (has_future) { [13:31:20.572] ns <- base::getNamespace("future") [13:31:20.572] version <- ns[[".package"]][["version"]] [13:31:20.572] if (is.null(version)) [13:31:20.572] version <- utils::packageVersion("future") [13:31:20.572] } [13:31:20.572] else { [13:31:20.572] version <- NULL [13:31:20.572] } [13:31:20.572] if (!has_future || version < "1.8.0") { [13:31:20.572] info <- base::c(r_version = base::gsub("R version ", [13:31:20.572] "", base::R.version$version.string), [13:31:20.572] platform = base::sprintf("%s (%s-bit)", [13:31:20.572] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.572] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.572] "release", "version")], collapse = " "), [13:31:20.572] hostname = base::Sys.info()[["nodename"]]) [13:31:20.572] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.572] info) [13:31:20.572] info <- base::paste(info, collapse = "; ") [13:31:20.572] if (!has_future) { [13:31:20.572] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.572] info) [13:31:20.572] } [13:31:20.572] else { [13:31:20.572] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.572] info, version) [13:31:20.572] } [13:31:20.572] base::stop(msg) [13:31:20.572] } [13:31:20.572] }) [13:31:20.572] } [13:31:20.572] ...future.strategy.old <- future::plan("list") [13:31:20.572] options(future.plan = NULL) [13:31:20.572] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.572] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.572] } [13:31:20.572] ...future.workdir <- getwd() [13:31:20.572] } [13:31:20.572] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.572] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.572] } [13:31:20.572] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.572] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:20.572] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.572] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.572] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.572] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.572] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.572] base::names(...future.oldOptions)) [13:31:20.572] } [13:31:20.572] if (FALSE) { [13:31:20.572] } [13:31:20.572] else { [13:31:20.572] if (TRUE) { [13:31:20.572] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.572] open = "w") [13:31:20.572] } [13:31:20.572] else { [13:31:20.572] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.572] windows = "NUL", "/dev/null"), open = "w") [13:31:20.572] } [13:31:20.572] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.572] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.572] base::sink(type = "output", split = FALSE) [13:31:20.572] base::close(...future.stdout) [13:31:20.572] }, add = TRUE) [13:31:20.572] } [13:31:20.572] ...future.frame <- base::sys.nframe() [13:31:20.572] ...future.conditions <- base::list() [13:31:20.572] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.572] if (FALSE) { [13:31:20.572] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.572] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.572] } [13:31:20.572] ...future.result <- base::tryCatch({ [13:31:20.572] base::withCallingHandlers({ [13:31:20.572] ...future.value <- base::withVisible(base::local({ [13:31:20.572] do.call(function(...) { [13:31:20.572] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.572] if (!identical(...future.globals.maxSize.org, [13:31:20.572] ...future.globals.maxSize)) { [13:31:20.572] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.572] on.exit(options(oopts), add = TRUE) [13:31:20.572] } [13:31:20.572] { [13:31:20.572] lapply(seq_along(...future.elements_ii), [13:31:20.572] FUN = function(jj) { [13:31:20.572] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.572] ...future.FUN(...future.X_jj, ...) [13:31:20.572] }) [13:31:20.572] } [13:31:20.572] }, args = future.call.arguments) [13:31:20.572] })) [13:31:20.572] future::FutureResult(value = ...future.value$value, [13:31:20.572] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.572] ...future.rng), globalenv = if (FALSE) [13:31:20.572] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.572] ...future.globalenv.names)) [13:31:20.572] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.572] }, condition = base::local({ [13:31:20.572] c <- base::c [13:31:20.572] inherits <- base::inherits [13:31:20.572] invokeRestart <- base::invokeRestart [13:31:20.572] length <- base::length [13:31:20.572] list <- base::list [13:31:20.572] seq.int <- base::seq.int [13:31:20.572] signalCondition <- base::signalCondition [13:31:20.572] sys.calls <- base::sys.calls [13:31:20.572] `[[` <- base::`[[` [13:31:20.572] `+` <- base::`+` [13:31:20.572] `<<-` <- base::`<<-` [13:31:20.572] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.572] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.572] 3L)] [13:31:20.572] } [13:31:20.572] function(cond) { [13:31:20.572] is_error <- inherits(cond, "error") [13:31:20.572] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.572] NULL) [13:31:20.572] if (is_error) { [13:31:20.572] sessionInformation <- function() { [13:31:20.572] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.572] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.572] search = base::search(), system = base::Sys.info()) [13:31:20.572] } [13:31:20.572] ...future.conditions[[length(...future.conditions) + [13:31:20.572] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.572] cond$call), session = sessionInformation(), [13:31:20.572] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.572] signalCondition(cond) [13:31:20.572] } [13:31:20.572] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.572] signal <- FALSE && inherits(cond, character(0)) [13:31:20.572] ...future.conditions[[length(...future.conditions) + [13:31:20.572] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.572] if (FALSE && !signal) { [13:31:20.572] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.572] { [13:31:20.572] inherits <- base::inherits [13:31:20.572] invokeRestart <- base::invokeRestart [13:31:20.572] is.null <- base::is.null [13:31:20.572] muffled <- FALSE [13:31:20.572] if (inherits(cond, "message")) { [13:31:20.572] muffled <- grepl(pattern, "muffleMessage") [13:31:20.572] if (muffled) [13:31:20.572] invokeRestart("muffleMessage") [13:31:20.572] } [13:31:20.572] else if (inherits(cond, "warning")) { [13:31:20.572] muffled <- grepl(pattern, "muffleWarning") [13:31:20.572] if (muffled) [13:31:20.572] invokeRestart("muffleWarning") [13:31:20.572] } [13:31:20.572] else if (inherits(cond, "condition")) { [13:31:20.572] if (!is.null(pattern)) { [13:31:20.572] computeRestarts <- base::computeRestarts [13:31:20.572] grepl <- base::grepl [13:31:20.572] restarts <- computeRestarts(cond) [13:31:20.572] for (restart in restarts) { [13:31:20.572] name <- restart$name [13:31:20.572] if (is.null(name)) [13:31:20.572] next [13:31:20.572] if (!grepl(pattern, name)) [13:31:20.572] next [13:31:20.572] invokeRestart(restart) [13:31:20.572] muffled <- TRUE [13:31:20.572] break [13:31:20.572] } [13:31:20.572] } [13:31:20.572] } [13:31:20.572] invisible(muffled) [13:31:20.572] } [13:31:20.572] muffleCondition(cond, pattern = "^muffle") [13:31:20.572] } [13:31:20.572] } [13:31:20.572] else { [13:31:20.572] if (TRUE) { [13:31:20.572] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.572] { [13:31:20.572] inherits <- base::inherits [13:31:20.572] invokeRestart <- base::invokeRestart [13:31:20.572] is.null <- base::is.null [13:31:20.572] muffled <- FALSE [13:31:20.572] if (inherits(cond, "message")) { [13:31:20.572] muffled <- grepl(pattern, "muffleMessage") [13:31:20.572] if (muffled) [13:31:20.572] invokeRestart("muffleMessage") [13:31:20.572] } [13:31:20.572] else if (inherits(cond, "warning")) { [13:31:20.572] muffled <- grepl(pattern, "muffleWarning") [13:31:20.572] if (muffled) [13:31:20.572] invokeRestart("muffleWarning") [13:31:20.572] } [13:31:20.572] else if (inherits(cond, "condition")) { [13:31:20.572] if (!is.null(pattern)) { [13:31:20.572] computeRestarts <- base::computeRestarts [13:31:20.572] grepl <- base::grepl [13:31:20.572] restarts <- computeRestarts(cond) [13:31:20.572] for (restart in restarts) { [13:31:20.572] name <- restart$name [13:31:20.572] if (is.null(name)) [13:31:20.572] next [13:31:20.572] if (!grepl(pattern, name)) [13:31:20.572] next [13:31:20.572] invokeRestart(restart) [13:31:20.572] muffled <- TRUE [13:31:20.572] break [13:31:20.572] } [13:31:20.572] } [13:31:20.572] } [13:31:20.572] invisible(muffled) [13:31:20.572] } [13:31:20.572] muffleCondition(cond, pattern = "^muffle") [13:31:20.572] } [13:31:20.572] } [13:31:20.572] } [13:31:20.572] })) [13:31:20.572] }, error = function(ex) { [13:31:20.572] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.572] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.572] ...future.rng), started = ...future.startTime, [13:31:20.572] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.572] version = "1.8"), class = "FutureResult") [13:31:20.572] }, finally = { [13:31:20.572] if (!identical(...future.workdir, getwd())) [13:31:20.572] setwd(...future.workdir) [13:31:20.572] { [13:31:20.572] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.572] ...future.oldOptions$nwarnings <- NULL [13:31:20.572] } [13:31:20.572] base::options(...future.oldOptions) [13:31:20.572] if (.Platform$OS.type == "windows") { [13:31:20.572] old_names <- names(...future.oldEnvVars) [13:31:20.572] envs <- base::Sys.getenv() [13:31:20.572] names <- names(envs) [13:31:20.572] common <- intersect(names, old_names) [13:31:20.572] added <- setdiff(names, old_names) [13:31:20.572] removed <- setdiff(old_names, names) [13:31:20.572] changed <- common[...future.oldEnvVars[common] != [13:31:20.572] envs[common]] [13:31:20.572] NAMES <- toupper(changed) [13:31:20.572] args <- list() [13:31:20.572] for (kk in seq_along(NAMES)) { [13:31:20.572] name <- changed[[kk]] [13:31:20.572] NAME <- NAMES[[kk]] [13:31:20.572] if (name != NAME && is.element(NAME, old_names)) [13:31:20.572] next [13:31:20.572] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.572] } [13:31:20.572] NAMES <- toupper(added) [13:31:20.572] for (kk in seq_along(NAMES)) { [13:31:20.572] name <- added[[kk]] [13:31:20.572] NAME <- NAMES[[kk]] [13:31:20.572] if (name != NAME && is.element(NAME, old_names)) [13:31:20.572] next [13:31:20.572] args[[name]] <- "" [13:31:20.572] } [13:31:20.572] NAMES <- toupper(removed) [13:31:20.572] for (kk in seq_along(NAMES)) { [13:31:20.572] name <- removed[[kk]] [13:31:20.572] NAME <- NAMES[[kk]] [13:31:20.572] if (name != NAME && is.element(NAME, old_names)) [13:31:20.572] next [13:31:20.572] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.572] } [13:31:20.572] if (length(args) > 0) [13:31:20.572] base::do.call(base::Sys.setenv, args = args) [13:31:20.572] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.572] } [13:31:20.572] else { [13:31:20.572] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.572] } [13:31:20.572] { [13:31:20.572] if (base::length(...future.futureOptionsAdded) > [13:31:20.572] 0L) { [13:31:20.572] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.572] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.572] base::options(opts) [13:31:20.572] } [13:31:20.572] { [13:31:20.572] NULL [13:31:20.572] options(future.plan = NULL) [13:31:20.572] if (is.na(NA_character_)) [13:31:20.572] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.572] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.572] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.572] .init = FALSE) [13:31:20.572] } [13:31:20.572] } [13:31:20.572] } [13:31:20.572] }) [13:31:20.572] if (TRUE) { [13:31:20.572] base::sink(type = "output", split = FALSE) [13:31:20.572] if (TRUE) { [13:31:20.572] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.572] } [13:31:20.572] else { [13:31:20.572] ...future.result["stdout"] <- base::list(NULL) [13:31:20.572] } [13:31:20.572] base::close(...future.stdout) [13:31:20.572] ...future.stdout <- NULL [13:31:20.572] } [13:31:20.572] ...future.result$conditions <- ...future.conditions [13:31:20.572] ...future.result$finished <- base::Sys.time() [13:31:20.572] ...future.result [13:31:20.572] } [13:31:20.577] - Launch lazy future ... done [13:31:20.577] run() for 'MiraiFuture' ... done [13:31:20.577] Created future: [13:31:20.578] resolved() for 'MiraiFuture' ... [13:31:20.578] - state: 'running' [13:31:20.578] - run: TRUE [13:31:20.579] - result: 'NULL' [13:31:20.579] - resolved: FALSE [13:31:20.579] resolved() for 'MiraiFuture' ... done [13:31:20.577] MiraiFuture: [13:31:20.577] Label: 'future_lapply-2' [13:31:20.577] Expression: [13:31:20.577] { [13:31:20.577] do.call(function(...) { [13:31:20.577] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.577] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.577] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.577] on.exit(options(oopts), add = TRUE) [13:31:20.577] } [13:31:20.577] { [13:31:20.577] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.577] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.577] ...future.FUN(...future.X_jj, ...) [13:31:20.577] }) [13:31:20.577] } [13:31:20.577] }, args = future.call.arguments) [13:31:20.577] } [13:31:20.577] Lazy evaluation: FALSE [13:31:20.577] Asynchronous evaluation: TRUE [13:31:20.577] Local evaluation: TRUE [13:31:20.577] Environment: R_GlobalEnv [13:31:20.577] Capture standard output: TRUE [13:31:20.577] Capture condition classes: 'condition' (excluding 'nothing') [13:31:20.577] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:20.577] Packages: [13:31:20.577] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:20.577] Resolved: TRUE [13:31:20.577] Value: [13:31:20.577] Conditions captured: [13:31:20.577] Early signaling: FALSE [13:31:20.577] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:20.577] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.579] Chunk #2 of 3 ... DONE [13:31:20.580] Chunk #3 of 3 ... [13:31:20.580] - Finding globals in 'X' for chunk #3 ... [13:31:20.580] getGlobalsAndPackages() ... [13:31:20.580] Searching for globals... [13:31:20.580] [13:31:20.581] Searching for globals ... DONE [13:31:20.581] - globals: [0] [13:31:20.581] getGlobalsAndPackages() ... DONE [13:31:20.581] + additional globals found: [n=0] [13:31:20.581] + additional namespaces needed: [n=0] [13:31:20.581] - Finding globals in 'X' for chunk #3 ... DONE [13:31:20.582] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:20.582] - seeds: [13:31:20.582] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.582] getGlobalsAndPackages() ... [13:31:20.582] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.582] Resolving globals: FALSE [13:31:20.583] Tweak future expression to call with '...' arguments ... [13:31:20.583] { [13:31:20.583] do.call(function(...) { [13:31:20.583] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.583] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.583] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.583] on.exit(options(oopts), add = TRUE) [13:31:20.583] } [13:31:20.583] { [13:31:20.583] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.583] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.583] ...future.FUN(...future.X_jj, ...) [13:31:20.583] }) [13:31:20.583] } [13:31:20.583] }, args = future.call.arguments) [13:31:20.583] } [13:31:20.583] Tweak future expression to call with '...' arguments ... DONE [13:31:20.584] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.584] [13:31:20.584] getGlobalsAndPackages() ... DONE [13:31:20.584] run() for 'Future' ... [13:31:20.584] - state: 'created' [13:31:20.585] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:20.587] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.587] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:20.587] - Field: 'label' [13:31:20.588] - Field: 'local' [13:31:20.588] - Field: 'owner' [13:31:20.589] - Field: 'envir' [13:31:20.589] - Field: 'packages' [13:31:20.589] - Field: 'gc' [13:31:20.589] - Field: 'conditions' [13:31:20.590] - Field: 'expr' [13:31:20.590] - Field: 'uuid' [13:31:20.590] - Field: 'seed' [13:31:20.590] - Field: 'version' [13:31:20.590] - Field: 'result' [13:31:20.590] - Field: 'asynchronous' [13:31:20.591] - Field: 'calls' [13:31:20.591] - Field: 'globals' [13:31:20.591] - Field: 'stdout' [13:31:20.591] - Field: 'earlySignal' [13:31:20.591] - Field: 'lazy' [13:31:20.591] - Field: 'state' [13:31:20.592] - Field: '.cluster' [13:31:20.592] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:20.592] - Launch lazy future ... [13:31:20.592] Packages needed by the future expression (n = 0): [13:31:20.592] Packages needed by future strategies (n = 0): [13:31:20.593] { [13:31:20.593] { [13:31:20.593] { [13:31:20.593] ...future.startTime <- base::Sys.time() [13:31:20.593] { [13:31:20.593] { [13:31:20.593] { [13:31:20.593] base::local({ [13:31:20.593] has_future <- base::requireNamespace("future", [13:31:20.593] quietly = TRUE) [13:31:20.593] if (has_future) { [13:31:20.593] ns <- base::getNamespace("future") [13:31:20.593] version <- ns[[".package"]][["version"]] [13:31:20.593] if (is.null(version)) [13:31:20.593] version <- utils::packageVersion("future") [13:31:20.593] } [13:31:20.593] else { [13:31:20.593] version <- NULL [13:31:20.593] } [13:31:20.593] if (!has_future || version < "1.8.0") { [13:31:20.593] info <- base::c(r_version = base::gsub("R version ", [13:31:20.593] "", base::R.version$version.string), [13:31:20.593] platform = base::sprintf("%s (%s-bit)", [13:31:20.593] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.593] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.593] "release", "version")], collapse = " "), [13:31:20.593] hostname = base::Sys.info()[["nodename"]]) [13:31:20.593] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.593] info) [13:31:20.593] info <- base::paste(info, collapse = "; ") [13:31:20.593] if (!has_future) { [13:31:20.593] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.593] info) [13:31:20.593] } [13:31:20.593] else { [13:31:20.593] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.593] info, version) [13:31:20.593] } [13:31:20.593] base::stop(msg) [13:31:20.593] } [13:31:20.593] }) [13:31:20.593] } [13:31:20.593] ...future.strategy.old <- future::plan("list") [13:31:20.593] options(future.plan = NULL) [13:31:20.593] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.593] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.593] } [13:31:20.593] ...future.workdir <- getwd() [13:31:20.593] } [13:31:20.593] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.593] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.593] } [13:31:20.593] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.593] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:20.593] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.593] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.593] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.593] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.593] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.593] base::names(...future.oldOptions)) [13:31:20.593] } [13:31:20.593] if (FALSE) { [13:31:20.593] } [13:31:20.593] else { [13:31:20.593] if (TRUE) { [13:31:20.593] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.593] open = "w") [13:31:20.593] } [13:31:20.593] else { [13:31:20.593] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.593] windows = "NUL", "/dev/null"), open = "w") [13:31:20.593] } [13:31:20.593] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.593] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.593] base::sink(type = "output", split = FALSE) [13:31:20.593] base::close(...future.stdout) [13:31:20.593] }, add = TRUE) [13:31:20.593] } [13:31:20.593] ...future.frame <- base::sys.nframe() [13:31:20.593] ...future.conditions <- base::list() [13:31:20.593] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.593] if (FALSE) { [13:31:20.593] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.593] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.593] } [13:31:20.593] ...future.result <- base::tryCatch({ [13:31:20.593] base::withCallingHandlers({ [13:31:20.593] ...future.value <- base::withVisible(base::local({ [13:31:20.593] do.call(function(...) { [13:31:20.593] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.593] if (!identical(...future.globals.maxSize.org, [13:31:20.593] ...future.globals.maxSize)) { [13:31:20.593] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.593] on.exit(options(oopts), add = TRUE) [13:31:20.593] } [13:31:20.593] { [13:31:20.593] lapply(seq_along(...future.elements_ii), [13:31:20.593] FUN = function(jj) { [13:31:20.593] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.593] ...future.FUN(...future.X_jj, ...) [13:31:20.593] }) [13:31:20.593] } [13:31:20.593] }, args = future.call.arguments) [13:31:20.593] })) [13:31:20.593] future::FutureResult(value = ...future.value$value, [13:31:20.593] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.593] ...future.rng), globalenv = if (FALSE) [13:31:20.593] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.593] ...future.globalenv.names)) [13:31:20.593] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.593] }, condition = base::local({ [13:31:20.593] c <- base::c [13:31:20.593] inherits <- base::inherits [13:31:20.593] invokeRestart <- base::invokeRestart [13:31:20.593] length <- base::length [13:31:20.593] list <- base::list [13:31:20.593] seq.int <- base::seq.int [13:31:20.593] signalCondition <- base::signalCondition [13:31:20.593] sys.calls <- base::sys.calls [13:31:20.593] `[[` <- base::`[[` [13:31:20.593] `+` <- base::`+` [13:31:20.593] `<<-` <- base::`<<-` [13:31:20.593] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.593] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.593] 3L)] [13:31:20.593] } [13:31:20.593] function(cond) { [13:31:20.593] is_error <- inherits(cond, "error") [13:31:20.593] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.593] NULL) [13:31:20.593] if (is_error) { [13:31:20.593] sessionInformation <- function() { [13:31:20.593] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.593] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.593] search = base::search(), system = base::Sys.info()) [13:31:20.593] } [13:31:20.593] ...future.conditions[[length(...future.conditions) + [13:31:20.593] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.593] cond$call), session = sessionInformation(), [13:31:20.593] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.593] signalCondition(cond) [13:31:20.593] } [13:31:20.593] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.593] signal <- FALSE && inherits(cond, character(0)) [13:31:20.593] ...future.conditions[[length(...future.conditions) + [13:31:20.593] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.593] if (FALSE && !signal) { [13:31:20.593] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.593] { [13:31:20.593] inherits <- base::inherits [13:31:20.593] invokeRestart <- base::invokeRestart [13:31:20.593] is.null <- base::is.null [13:31:20.593] muffled <- FALSE [13:31:20.593] if (inherits(cond, "message")) { [13:31:20.593] muffled <- grepl(pattern, "muffleMessage") [13:31:20.593] if (muffled) [13:31:20.593] invokeRestart("muffleMessage") [13:31:20.593] } [13:31:20.593] else if (inherits(cond, "warning")) { [13:31:20.593] muffled <- grepl(pattern, "muffleWarning") [13:31:20.593] if (muffled) [13:31:20.593] invokeRestart("muffleWarning") [13:31:20.593] } [13:31:20.593] else if (inherits(cond, "condition")) { [13:31:20.593] if (!is.null(pattern)) { [13:31:20.593] computeRestarts <- base::computeRestarts [13:31:20.593] grepl <- base::grepl [13:31:20.593] restarts <- computeRestarts(cond) [13:31:20.593] for (restart in restarts) { [13:31:20.593] name <- restart$name [13:31:20.593] if (is.null(name)) [13:31:20.593] next [13:31:20.593] if (!grepl(pattern, name)) [13:31:20.593] next [13:31:20.593] invokeRestart(restart) [13:31:20.593] muffled <- TRUE [13:31:20.593] break [13:31:20.593] } [13:31:20.593] } [13:31:20.593] } [13:31:20.593] invisible(muffled) [13:31:20.593] } [13:31:20.593] muffleCondition(cond, pattern = "^muffle") [13:31:20.593] } [13:31:20.593] } [13:31:20.593] else { [13:31:20.593] if (TRUE) { [13:31:20.593] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.593] { [13:31:20.593] inherits <- base::inherits [13:31:20.593] invokeRestart <- base::invokeRestart [13:31:20.593] is.null <- base::is.null [13:31:20.593] muffled <- FALSE [13:31:20.593] if (inherits(cond, "message")) { [13:31:20.593] muffled <- grepl(pattern, "muffleMessage") [13:31:20.593] if (muffled) [13:31:20.593] invokeRestart("muffleMessage") [13:31:20.593] } [13:31:20.593] else if (inherits(cond, "warning")) { [13:31:20.593] muffled <- grepl(pattern, "muffleWarning") [13:31:20.593] if (muffled) [13:31:20.593] invokeRestart("muffleWarning") [13:31:20.593] } [13:31:20.593] else if (inherits(cond, "condition")) { [13:31:20.593] if (!is.null(pattern)) { [13:31:20.593] computeRestarts <- base::computeRestarts [13:31:20.593] grepl <- base::grepl [13:31:20.593] restarts <- computeRestarts(cond) [13:31:20.593] for (restart in restarts) { [13:31:20.593] name <- restart$name [13:31:20.593] if (is.null(name)) [13:31:20.593] next [13:31:20.593] if (!grepl(pattern, name)) [13:31:20.593] next [13:31:20.593] invokeRestart(restart) [13:31:20.593] muffled <- TRUE [13:31:20.593] break [13:31:20.593] } [13:31:20.593] } [13:31:20.593] } [13:31:20.593] invisible(muffled) [13:31:20.593] } [13:31:20.593] muffleCondition(cond, pattern = "^muffle") [13:31:20.593] } [13:31:20.593] } [13:31:20.593] } [13:31:20.593] })) [13:31:20.593] }, error = function(ex) { [13:31:20.593] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.593] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.593] ...future.rng), started = ...future.startTime, [13:31:20.593] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.593] version = "1.8"), class = "FutureResult") [13:31:20.593] }, finally = { [13:31:20.593] if (!identical(...future.workdir, getwd())) [13:31:20.593] setwd(...future.workdir) [13:31:20.593] { [13:31:20.593] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.593] ...future.oldOptions$nwarnings <- NULL [13:31:20.593] } [13:31:20.593] base::options(...future.oldOptions) [13:31:20.593] if (.Platform$OS.type == "windows") { [13:31:20.593] old_names <- names(...future.oldEnvVars) [13:31:20.593] envs <- base::Sys.getenv() [13:31:20.593] names <- names(envs) [13:31:20.593] common <- intersect(names, old_names) [13:31:20.593] added <- setdiff(names, old_names) [13:31:20.593] removed <- setdiff(old_names, names) [13:31:20.593] changed <- common[...future.oldEnvVars[common] != [13:31:20.593] envs[common]] [13:31:20.593] NAMES <- toupper(changed) [13:31:20.593] args <- list() [13:31:20.593] for (kk in seq_along(NAMES)) { [13:31:20.593] name <- changed[[kk]] [13:31:20.593] NAME <- NAMES[[kk]] [13:31:20.593] if (name != NAME && is.element(NAME, old_names)) [13:31:20.593] next [13:31:20.593] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.593] } [13:31:20.593] NAMES <- toupper(added) [13:31:20.593] for (kk in seq_along(NAMES)) { [13:31:20.593] name <- added[[kk]] [13:31:20.593] NAME <- NAMES[[kk]] [13:31:20.593] if (name != NAME && is.element(NAME, old_names)) [13:31:20.593] next [13:31:20.593] args[[name]] <- "" [13:31:20.593] } [13:31:20.593] NAMES <- toupper(removed) [13:31:20.593] for (kk in seq_along(NAMES)) { [13:31:20.593] name <- removed[[kk]] [13:31:20.593] NAME <- NAMES[[kk]] [13:31:20.593] if (name != NAME && is.element(NAME, old_names)) [13:31:20.593] next [13:31:20.593] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.593] } [13:31:20.593] if (length(args) > 0) [13:31:20.593] base::do.call(base::Sys.setenv, args = args) [13:31:20.593] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.593] } [13:31:20.593] else { [13:31:20.593] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.593] } [13:31:20.593] { [13:31:20.593] if (base::length(...future.futureOptionsAdded) > [13:31:20.593] 0L) { [13:31:20.593] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.593] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.593] base::options(opts) [13:31:20.593] } [13:31:20.593] { [13:31:20.593] NULL [13:31:20.593] options(future.plan = NULL) [13:31:20.593] if (is.na(NA_character_)) [13:31:20.593] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.593] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.593] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.593] .init = FALSE) [13:31:20.593] } [13:31:20.593] } [13:31:20.593] } [13:31:20.593] }) [13:31:20.593] if (TRUE) { [13:31:20.593] base::sink(type = "output", split = FALSE) [13:31:20.593] if (TRUE) { [13:31:20.593] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.593] } [13:31:20.593] else { [13:31:20.593] ...future.result["stdout"] <- base::list(NULL) [13:31:20.593] } [13:31:20.593] base::close(...future.stdout) [13:31:20.593] ...future.stdout <- NULL [13:31:20.593] } [13:31:20.593] ...future.result$conditions <- ...future.conditions [13:31:20.593] ...future.result$finished <- base::Sys.time() [13:31:20.593] ...future.result [13:31:20.593] } [13:31:20.597] - Launch lazy future ... done [13:31:20.597] run() for 'MiraiFuture' ... done [13:31:20.597] Created future: [13:31:20.598] resolved() for 'MiraiFuture' ... [13:31:20.598] - state: 'running' [13:31:20.599] - run: TRUE [13:31:20.599] - result: 'NULL' [13:31:20.599] - resolved: FALSE [13:31:20.599] resolved() for 'MiraiFuture' ... done [13:31:20.597] MiraiFuture: [13:31:20.597] Label: 'future_lapply-3' [13:31:20.597] Expression: [13:31:20.597] { [13:31:20.597] do.call(function(...) { [13:31:20.597] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.597] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.597] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.597] on.exit(options(oopts), add = TRUE) [13:31:20.597] } [13:31:20.597] { [13:31:20.597] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.597] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.597] ...future.FUN(...future.X_jj, ...) [13:31:20.597] }) [13:31:20.597] } [13:31:20.597] }, args = future.call.arguments) [13:31:20.597] } [13:31:20.597] Lazy evaluation: FALSE [13:31:20.597] Asynchronous evaluation: TRUE [13:31:20.597] Local evaluation: TRUE [13:31:20.597] Environment: R_GlobalEnv [13:31:20.597] Capture standard output: TRUE [13:31:20.597] Capture condition classes: 'condition' (excluding 'nothing') [13:31:20.597] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:20.597] Packages: [13:31:20.597] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:20.597] Resolved: TRUE [13:31:20.597] Value: [13:31:20.597] Conditions captured: [13:31:20.597] Early signaling: FALSE [13:31:20.597] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:20.597] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.600] Chunk #3 of 3 ... DONE [13:31:20.600] Launching 3 futures (chunks) ... DONE [13:31:20.600] Resolving 3 futures (chunks) ... [13:31:20.600] resolve() on list ... [13:31:20.600] recursive: 0 [13:31:20.600] length: 3 [13:31:20.601] [13:31:20.601] resolved() for 'MiraiFuture' ... [13:31:20.601] - state: 'running' [13:31:20.601] - run: TRUE [13:31:20.601] - result: 'NULL' [13:31:20.601] - resolved: FALSE [13:31:20.602] resolved() for 'MiraiFuture' ... done [13:31:20.602] Future #1 [13:31:20.602] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:20.602] - nx: 3 [13:31:20.602] - relay: TRUE [13:31:20.603] - stdout: TRUE [13:31:20.603] - signal: TRUE [13:31:20.603] - resignal: FALSE [13:31:20.603] - force: TRUE [13:31:20.603] - relayed: [n=3] FALSE, FALSE, FALSE [13:31:20.603] - queued futures: [n=3] FALSE, FALSE, FALSE [13:31:20.603] - until=1 [13:31:20.604] - relaying element #1 [13:31:20.604] - relayed: [n=3] TRUE, FALSE, FALSE [13:31:20.604] - queued futures: [n=3] TRUE, FALSE, FALSE [13:31:20.604] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:20.605] length: 2 (resolved future 1) [13:31:20.605] resolved() for 'MiraiFuture' ... [13:31:20.605] - state: 'running' [13:31:20.605] - run: TRUE [13:31:20.605] - result: 'NULL' [13:31:20.605] - resolved: FALSE [13:31:20.606] resolved() for 'MiraiFuture' ... done [13:31:20.606] Future #2 [13:31:20.606] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:20.606] - nx: 3 [13:31:20.606] - relay: TRUE [13:31:20.607] - stdout: TRUE [13:31:20.607] - signal: TRUE [13:31:20.607] - resignal: FALSE [13:31:20.607] - force: TRUE [13:31:20.607] - relayed: [n=3] TRUE, FALSE, FALSE [13:31:20.607] - queued futures: [n=3] TRUE, FALSE, FALSE [13:31:20.607] - until=2 [13:31:20.608] - relaying element #2 [13:31:20.608] - relayed: [n=3] TRUE, TRUE, FALSE [13:31:20.608] - queued futures: [n=3] TRUE, TRUE, FALSE [13:31:20.608] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:20.608] length: 1 (resolved future 2) [13:31:20.609] resolved() for 'MiraiFuture' ... [13:31:20.609] - state: 'running' [13:31:20.609] - run: TRUE [13:31:20.609] - result: 'NULL' [13:31:20.609] - resolved: FALSE [13:31:20.609] resolved() for 'MiraiFuture' ... done [13:31:20.610] Future #3 [13:31:20.610] signalConditionsASAP(MiraiFuture, pos=3) ... [13:31:20.610] - nx: 3 [13:31:20.610] - relay: TRUE [13:31:20.610] - stdout: TRUE [13:31:20.610] - signal: TRUE [13:31:20.611] - resignal: FALSE [13:31:20.611] - force: TRUE [13:31:20.611] - relayed: [n=3] TRUE, TRUE, FALSE [13:31:20.611] - queued futures: [n=3] TRUE, TRUE, FALSE [13:31:20.611] - until=3 [13:31:20.611] - relaying element #3 [13:31:20.612] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:20.612] - queued futures: [n=3] TRUE, TRUE, TRUE [13:31:20.612] signalConditionsASAP(MiraiFuture, pos=3) ... done [13:31:20.612] length: 0 (resolved future 3) [13:31:20.612] Relaying remaining futures [13:31:20.612] signalConditionsASAP(NULL, pos=0) ... [13:31:20.613] - nx: 3 [13:31:20.613] - relay: TRUE [13:31:20.613] - stdout: TRUE [13:31:20.613] - signal: TRUE [13:31:20.613] - resignal: FALSE [13:31:20.613] - force: TRUE [13:31:20.613] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:20.614] - queued futures: [n=3] TRUE, TRUE, TRUE - flush all [13:31:20.614] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:20.614] - queued futures: [n=3] TRUE, TRUE, TRUE [13:31:20.614] signalConditionsASAP(NULL, pos=0) ... done [13:31:20.614] resolve() on list ... DONE [13:31:20.615] - Number of value chunks collected: 3 [13:31:20.615] Resolving 3 futures (chunks) ... DONE [13:31:20.615] Reducing values from 3 chunks ... [13:31:20.615] - Number of values collected after concatenation: 3 [13:31:20.615] - Number of values expected: 3 [13:31:20.615] Reducing values from 3 chunks ... DONE [13:31:20.616] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:31:20.641] future_lapply() ... [13:31:20.642] Number of chunks: 2 [13:31:20.642] getGlobalsAndPackagesXApply() ... [13:31:20.643] - future.globals: TRUE [13:31:20.643] getGlobalsAndPackages() ... [13:31:20.643] Searching for globals... [13:31:20.644] - globals found: [2] 'FUN', '.Internal' [13:31:20.644] Searching for globals ... DONE [13:31:20.645] Resolving globals: FALSE [13:31:20.645] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:31:20.646] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:31:20.646] - globals: [1] 'FUN' [13:31:20.646] [13:31:20.646] getGlobalsAndPackages() ... DONE [13:31:20.646] - globals found/used: [n=1] 'FUN' [13:31:20.646] - needed namespaces: [n=0] [13:31:20.647] Finding globals ... DONE [13:31:20.647] - use_args: TRUE [13:31:20.647] - Getting '...' globals ... [13:31:20.647] resolve() on list ... [13:31:20.647] recursive: 0 [13:31:20.648] length: 1 [13:31:20.648] elements: '...' [13:31:20.648] length: 0 (resolved future 1) [13:31:20.648] resolve() on list ... DONE [13:31:20.648] - '...' content: [n=1] 'length' [13:31:20.648] List of 1 [13:31:20.648] $ ...:List of 1 [13:31:20.648] ..$ length: int 2 [13:31:20.648] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:20.648] - attr(*, "where")=List of 1 [13:31:20.648] ..$ ...: [13:31:20.648] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:20.648] - attr(*, "resolved")= logi TRUE [13:31:20.648] - attr(*, "total_size")= num NA [13:31:20.652] - Getting '...' globals ... DONE [13:31:20.652] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:20.652] List of 2 [13:31:20.652] $ ...future.FUN:function (mode = "logical", length = 0L) [13:31:20.652] $ ... :List of 1 [13:31:20.652] ..$ length: int 2 [13:31:20.652] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:20.652] - attr(*, "where")=List of 2 [13:31:20.652] ..$ ...future.FUN: [13:31:20.652] ..$ ... : [13:31:20.652] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:20.652] - attr(*, "resolved")= logi FALSE [13:31:20.652] - attr(*, "total_size")= num 2240 [13:31:20.656] Packages to be attached in all futures: [n=0] [13:31:20.656] getGlobalsAndPackagesXApply() ... DONE [13:31:20.656] Number of futures (= number of chunks): 2 [13:31:20.657] Launching 2 futures (chunks) ... [13:31:20.657] Chunk #1 of 2 ... [13:31:20.657] - Finding globals in 'X' for chunk #1 ... [13:31:20.657] getGlobalsAndPackages() ... [13:31:20.657] Searching for globals... [13:31:20.658] [13:31:20.658] Searching for globals ... DONE [13:31:20.658] - globals: [0] [13:31:20.658] getGlobalsAndPackages() ... DONE [13:31:20.658] + additional globals found: [n=0] [13:31:20.658] + additional namespaces needed: [n=0] [13:31:20.658] - Finding globals in 'X' for chunk #1 ... DONE [13:31:20.659] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:20.659] - seeds: [13:31:20.659] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.659] getGlobalsAndPackages() ... [13:31:20.659] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.659] Resolving globals: FALSE [13:31:20.660] Tweak future expression to call with '...' arguments ... [13:31:20.660] { [13:31:20.660] do.call(function(...) { [13:31:20.660] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.660] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.660] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.660] on.exit(options(oopts), add = TRUE) [13:31:20.660] } [13:31:20.660] { [13:31:20.660] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.660] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.660] ...future.FUN(...future.X_jj, ...) [13:31:20.660] }) [13:31:20.660] } [13:31:20.660] }, args = future.call.arguments) [13:31:20.660] } [13:31:20.660] Tweak future expression to call with '...' arguments ... DONE [13:31:20.661] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.661] [13:31:20.661] getGlobalsAndPackages() ... DONE [13:31:20.661] run() for 'Future' ... [13:31:20.662] - state: 'created' [13:31:20.662] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:20.665] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.665] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:20.665] - Field: 'label' [13:31:20.666] - Field: 'local' [13:31:20.666] - Field: 'owner' [13:31:20.666] - Field: 'envir' [13:31:20.666] - Field: 'packages' [13:31:20.666] - Field: 'gc' [13:31:20.666] - Field: 'conditions' [13:31:20.667] - Field: 'expr' [13:31:20.667] - Field: 'uuid' [13:31:20.667] - Field: 'seed' [13:31:20.667] - Field: 'version' [13:31:20.667] - Field: 'result' [13:31:20.667] - Field: 'asynchronous' [13:31:20.668] - Field: 'calls' [13:31:20.668] - Field: 'globals' [13:31:20.668] - Field: 'stdout' [13:31:20.668] - Field: 'earlySignal' [13:31:20.668] - Field: 'lazy' [13:31:20.668] - Field: 'state' [13:31:20.669] - Field: '.cluster' [13:31:20.669] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:20.669] - Launch lazy future ... [13:31:20.669] Packages needed by the future expression (n = 0): [13:31:20.669] Packages needed by future strategies (n = 0): [13:31:20.670] { [13:31:20.670] { [13:31:20.670] { [13:31:20.670] ...future.startTime <- base::Sys.time() [13:31:20.670] { [13:31:20.670] { [13:31:20.670] { [13:31:20.670] base::local({ [13:31:20.670] has_future <- base::requireNamespace("future", [13:31:20.670] quietly = TRUE) [13:31:20.670] if (has_future) { [13:31:20.670] ns <- base::getNamespace("future") [13:31:20.670] version <- ns[[".package"]][["version"]] [13:31:20.670] if (is.null(version)) [13:31:20.670] version <- utils::packageVersion("future") [13:31:20.670] } [13:31:20.670] else { [13:31:20.670] version <- NULL [13:31:20.670] } [13:31:20.670] if (!has_future || version < "1.8.0") { [13:31:20.670] info <- base::c(r_version = base::gsub("R version ", [13:31:20.670] "", base::R.version$version.string), [13:31:20.670] platform = base::sprintf("%s (%s-bit)", [13:31:20.670] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.670] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.670] "release", "version")], collapse = " "), [13:31:20.670] hostname = base::Sys.info()[["nodename"]]) [13:31:20.670] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.670] info) [13:31:20.670] info <- base::paste(info, collapse = "; ") [13:31:20.670] if (!has_future) { [13:31:20.670] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.670] info) [13:31:20.670] } [13:31:20.670] else { [13:31:20.670] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.670] info, version) [13:31:20.670] } [13:31:20.670] base::stop(msg) [13:31:20.670] } [13:31:20.670] }) [13:31:20.670] } [13:31:20.670] ...future.strategy.old <- future::plan("list") [13:31:20.670] options(future.plan = NULL) [13:31:20.670] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.670] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.670] } [13:31:20.670] ...future.workdir <- getwd() [13:31:20.670] } [13:31:20.670] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.670] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.670] } [13:31:20.670] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.670] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:20.670] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.670] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.670] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.670] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.670] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.670] base::names(...future.oldOptions)) [13:31:20.670] } [13:31:20.670] if (FALSE) { [13:31:20.670] } [13:31:20.670] else { [13:31:20.670] if (TRUE) { [13:31:20.670] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.670] open = "w") [13:31:20.670] } [13:31:20.670] else { [13:31:20.670] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.670] windows = "NUL", "/dev/null"), open = "w") [13:31:20.670] } [13:31:20.670] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.670] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.670] base::sink(type = "output", split = FALSE) [13:31:20.670] base::close(...future.stdout) [13:31:20.670] }, add = TRUE) [13:31:20.670] } [13:31:20.670] ...future.frame <- base::sys.nframe() [13:31:20.670] ...future.conditions <- base::list() [13:31:20.670] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.670] if (FALSE) { [13:31:20.670] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.670] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.670] } [13:31:20.670] ...future.result <- base::tryCatch({ [13:31:20.670] base::withCallingHandlers({ [13:31:20.670] ...future.value <- base::withVisible(base::local({ [13:31:20.670] do.call(function(...) { [13:31:20.670] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.670] if (!identical(...future.globals.maxSize.org, [13:31:20.670] ...future.globals.maxSize)) { [13:31:20.670] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.670] on.exit(options(oopts), add = TRUE) [13:31:20.670] } [13:31:20.670] { [13:31:20.670] lapply(seq_along(...future.elements_ii), [13:31:20.670] FUN = function(jj) { [13:31:20.670] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.670] ...future.FUN(...future.X_jj, ...) [13:31:20.670] }) [13:31:20.670] } [13:31:20.670] }, args = future.call.arguments) [13:31:20.670] })) [13:31:20.670] future::FutureResult(value = ...future.value$value, [13:31:20.670] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.670] ...future.rng), globalenv = if (FALSE) [13:31:20.670] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.670] ...future.globalenv.names)) [13:31:20.670] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.670] }, condition = base::local({ [13:31:20.670] c <- base::c [13:31:20.670] inherits <- base::inherits [13:31:20.670] invokeRestart <- base::invokeRestart [13:31:20.670] length <- base::length [13:31:20.670] list <- base::list [13:31:20.670] seq.int <- base::seq.int [13:31:20.670] signalCondition <- base::signalCondition [13:31:20.670] sys.calls <- base::sys.calls [13:31:20.670] `[[` <- base::`[[` [13:31:20.670] `+` <- base::`+` [13:31:20.670] `<<-` <- base::`<<-` [13:31:20.670] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.670] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.670] 3L)] [13:31:20.670] } [13:31:20.670] function(cond) { [13:31:20.670] is_error <- inherits(cond, "error") [13:31:20.670] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.670] NULL) [13:31:20.670] if (is_error) { [13:31:20.670] sessionInformation <- function() { [13:31:20.670] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.670] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.670] search = base::search(), system = base::Sys.info()) [13:31:20.670] } [13:31:20.670] ...future.conditions[[length(...future.conditions) + [13:31:20.670] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.670] cond$call), session = sessionInformation(), [13:31:20.670] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.670] signalCondition(cond) [13:31:20.670] } [13:31:20.670] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.670] signal <- FALSE && inherits(cond, character(0)) [13:31:20.670] ...future.conditions[[length(...future.conditions) + [13:31:20.670] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.670] if (FALSE && !signal) { [13:31:20.670] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.670] { [13:31:20.670] inherits <- base::inherits [13:31:20.670] invokeRestart <- base::invokeRestart [13:31:20.670] is.null <- base::is.null [13:31:20.670] muffled <- FALSE [13:31:20.670] if (inherits(cond, "message")) { [13:31:20.670] muffled <- grepl(pattern, "muffleMessage") [13:31:20.670] if (muffled) [13:31:20.670] invokeRestart("muffleMessage") [13:31:20.670] } [13:31:20.670] else if (inherits(cond, "warning")) { [13:31:20.670] muffled <- grepl(pattern, "muffleWarning") [13:31:20.670] if (muffled) [13:31:20.670] invokeRestart("muffleWarning") [13:31:20.670] } [13:31:20.670] else if (inherits(cond, "condition")) { [13:31:20.670] if (!is.null(pattern)) { [13:31:20.670] computeRestarts <- base::computeRestarts [13:31:20.670] grepl <- base::grepl [13:31:20.670] restarts <- computeRestarts(cond) [13:31:20.670] for (restart in restarts) { [13:31:20.670] name <- restart$name [13:31:20.670] if (is.null(name)) [13:31:20.670] next [13:31:20.670] if (!grepl(pattern, name)) [13:31:20.670] next [13:31:20.670] invokeRestart(restart) [13:31:20.670] muffled <- TRUE [13:31:20.670] break [13:31:20.670] } [13:31:20.670] } [13:31:20.670] } [13:31:20.670] invisible(muffled) [13:31:20.670] } [13:31:20.670] muffleCondition(cond, pattern = "^muffle") [13:31:20.670] } [13:31:20.670] } [13:31:20.670] else { [13:31:20.670] if (TRUE) { [13:31:20.670] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.670] { [13:31:20.670] inherits <- base::inherits [13:31:20.670] invokeRestart <- base::invokeRestart [13:31:20.670] is.null <- base::is.null [13:31:20.670] muffled <- FALSE [13:31:20.670] if (inherits(cond, "message")) { [13:31:20.670] muffled <- grepl(pattern, "muffleMessage") [13:31:20.670] if (muffled) [13:31:20.670] invokeRestart("muffleMessage") [13:31:20.670] } [13:31:20.670] else if (inherits(cond, "warning")) { [13:31:20.670] muffled <- grepl(pattern, "muffleWarning") [13:31:20.670] if (muffled) [13:31:20.670] invokeRestart("muffleWarning") [13:31:20.670] } [13:31:20.670] else if (inherits(cond, "condition")) { [13:31:20.670] if (!is.null(pattern)) { [13:31:20.670] computeRestarts <- base::computeRestarts [13:31:20.670] grepl <- base::grepl [13:31:20.670] restarts <- computeRestarts(cond) [13:31:20.670] for (restart in restarts) { [13:31:20.670] name <- restart$name [13:31:20.670] if (is.null(name)) [13:31:20.670] next [13:31:20.670] if (!grepl(pattern, name)) [13:31:20.670] next [13:31:20.670] invokeRestart(restart) [13:31:20.670] muffled <- TRUE [13:31:20.670] break [13:31:20.670] } [13:31:20.670] } [13:31:20.670] } [13:31:20.670] invisible(muffled) [13:31:20.670] } [13:31:20.670] muffleCondition(cond, pattern = "^muffle") [13:31:20.670] } [13:31:20.670] } [13:31:20.670] } [13:31:20.670] })) [13:31:20.670] }, error = function(ex) { [13:31:20.670] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.670] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.670] ...future.rng), started = ...future.startTime, [13:31:20.670] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.670] version = "1.8"), class = "FutureResult") [13:31:20.670] }, finally = { [13:31:20.670] if (!identical(...future.workdir, getwd())) [13:31:20.670] setwd(...future.workdir) [13:31:20.670] { [13:31:20.670] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.670] ...future.oldOptions$nwarnings <- NULL [13:31:20.670] } [13:31:20.670] base::options(...future.oldOptions) [13:31:20.670] if (.Platform$OS.type == "windows") { [13:31:20.670] old_names <- names(...future.oldEnvVars) [13:31:20.670] envs <- base::Sys.getenv() [13:31:20.670] names <- names(envs) [13:31:20.670] common <- intersect(names, old_names) [13:31:20.670] added <- setdiff(names, old_names) [13:31:20.670] removed <- setdiff(old_names, names) [13:31:20.670] changed <- common[...future.oldEnvVars[common] != [13:31:20.670] envs[common]] [13:31:20.670] NAMES <- toupper(changed) [13:31:20.670] args <- list() [13:31:20.670] for (kk in seq_along(NAMES)) { [13:31:20.670] name <- changed[[kk]] [13:31:20.670] NAME <- NAMES[[kk]] [13:31:20.670] if (name != NAME && is.element(NAME, old_names)) [13:31:20.670] next [13:31:20.670] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.670] } [13:31:20.670] NAMES <- toupper(added) [13:31:20.670] for (kk in seq_along(NAMES)) { [13:31:20.670] name <- added[[kk]] [13:31:20.670] NAME <- NAMES[[kk]] [13:31:20.670] if (name != NAME && is.element(NAME, old_names)) [13:31:20.670] next [13:31:20.670] args[[name]] <- "" [13:31:20.670] } [13:31:20.670] NAMES <- toupper(removed) [13:31:20.670] for (kk in seq_along(NAMES)) { [13:31:20.670] name <- removed[[kk]] [13:31:20.670] NAME <- NAMES[[kk]] [13:31:20.670] if (name != NAME && is.element(NAME, old_names)) [13:31:20.670] next [13:31:20.670] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.670] } [13:31:20.670] if (length(args) > 0) [13:31:20.670] base::do.call(base::Sys.setenv, args = args) [13:31:20.670] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.670] } [13:31:20.670] else { [13:31:20.670] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.670] } [13:31:20.670] { [13:31:20.670] if (base::length(...future.futureOptionsAdded) > [13:31:20.670] 0L) { [13:31:20.670] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.670] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.670] base::options(opts) [13:31:20.670] } [13:31:20.670] { [13:31:20.670] NULL [13:31:20.670] options(future.plan = NULL) [13:31:20.670] if (is.na(NA_character_)) [13:31:20.670] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.670] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.670] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.670] .init = FALSE) [13:31:20.670] } [13:31:20.670] } [13:31:20.670] } [13:31:20.670] }) [13:31:20.670] if (TRUE) { [13:31:20.670] base::sink(type = "output", split = FALSE) [13:31:20.670] if (TRUE) { [13:31:20.670] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.670] } [13:31:20.670] else { [13:31:20.670] ...future.result["stdout"] <- base::list(NULL) [13:31:20.670] } [13:31:20.670] base::close(...future.stdout) [13:31:20.670] ...future.stdout <- NULL [13:31:20.670] } [13:31:20.670] ...future.result$conditions <- ...future.conditions [13:31:20.670] ...future.result$finished <- base::Sys.time() [13:31:20.670] ...future.result [13:31:20.670] } [13:31:20.674] - Launch lazy future ... done [13:31:20.674] run() for 'MiraiFuture' ... done [13:31:20.674] Created future: [13:31:20.675] resolved() for 'MiraiFuture' ... [13:31:20.676] - state: 'running' [13:31:20.676] - run: TRUE [13:31:20.676] - result: 'NULL' [13:31:20.676] - resolved: FALSE [13:31:20.676] resolved() for 'MiraiFuture' ... done [13:31:20.674] MiraiFuture: [13:31:20.674] Label: 'future_lapply-1' [13:31:20.674] Expression: [13:31:20.674] { [13:31:20.674] do.call(function(...) { [13:31:20.674] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.674] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.674] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.674] on.exit(options(oopts), add = TRUE) [13:31:20.674] } [13:31:20.674] { [13:31:20.674] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.674] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.674] ...future.FUN(...future.X_jj, ...) [13:31:20.674] }) [13:31:20.674] } [13:31:20.674] }, args = future.call.arguments) [13:31:20.674] } [13:31:20.674] Lazy evaluation: FALSE [13:31:20.674] Asynchronous evaluation: TRUE [13:31:20.674] Local evaluation: TRUE [13:31:20.674] Environment: R_GlobalEnv [13:31:20.674] Capture standard output: TRUE [13:31:20.674] Capture condition classes: 'condition' (excluding 'nothing') [13:31:20.674] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:20.674] Packages: [13:31:20.674] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:20.674] Resolved: TRUE [13:31:20.674] Value: [13:31:20.674] Conditions captured: [13:31:20.674] Early signaling: FALSE [13:31:20.674] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:20.674] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.677] Chunk #1 of 2 ... DONE [13:31:20.677] Chunk #2 of 2 ... [13:31:20.677] - Finding globals in 'X' for chunk #2 ... [13:31:20.677] getGlobalsAndPackages() ... [13:31:20.677] Searching for globals... [13:31:20.678] [13:31:20.678] Searching for globals ... DONE [13:31:20.678] - globals: [0] [13:31:20.678] getGlobalsAndPackages() ... DONE [13:31:20.678] + additional globals found: [n=0] [13:31:20.679] + additional namespaces needed: [n=0] [13:31:20.679] - Finding globals in 'X' for chunk #2 ... DONE [13:31:20.679] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:20.679] - seeds: [13:31:20.679] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.679] getGlobalsAndPackages() ... [13:31:20.679] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.680] Resolving globals: FALSE [13:31:20.680] Tweak future expression to call with '...' arguments ... [13:31:20.680] { [13:31:20.680] do.call(function(...) { [13:31:20.680] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.680] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.680] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.680] on.exit(options(oopts), add = TRUE) [13:31:20.680] } [13:31:20.680] { [13:31:20.680] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.680] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.680] ...future.FUN(...future.X_jj, ...) [13:31:20.680] }) [13:31:20.680] } [13:31:20.680] }, args = future.call.arguments) [13:31:20.680] } [13:31:20.680] Tweak future expression to call with '...' arguments ... DONE [13:31:20.681] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.681] [13:31:20.681] getGlobalsAndPackages() ... DONE [13:31:20.682] run() for 'Future' ... [13:31:20.682] - state: 'created' [13:31:20.682] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:20.684] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.684] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:20.685] - Field: 'label' [13:31:20.685] - Field: 'local' [13:31:20.685] - Field: 'owner' [13:31:20.685] - Field: 'envir' [13:31:20.685] - Field: 'packages' [13:31:20.685] - Field: 'gc' [13:31:20.686] - Field: 'conditions' [13:31:20.686] - Field: 'expr' [13:31:20.686] - Field: 'uuid' [13:31:20.686] - Field: 'seed' [13:31:20.686] - Field: 'version' [13:31:20.686] - Field: 'result' [13:31:20.687] - Field: 'asynchronous' [13:31:20.687] - Field: 'calls' [13:31:20.687] - Field: 'globals' [13:31:20.687] - Field: 'stdout' [13:31:20.687] - Field: 'earlySignal' [13:31:20.687] - Field: 'lazy' [13:31:20.688] - Field: 'state' [13:31:20.688] - Field: '.cluster' [13:31:20.688] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:20.688] - Launch lazy future ... [13:31:20.688] Packages needed by the future expression (n = 0): [13:31:20.688] Packages needed by future strategies (n = 0): [13:31:20.689] { [13:31:20.689] { [13:31:20.689] { [13:31:20.689] ...future.startTime <- base::Sys.time() [13:31:20.689] { [13:31:20.689] { [13:31:20.689] { [13:31:20.689] base::local({ [13:31:20.689] has_future <- base::requireNamespace("future", [13:31:20.689] quietly = TRUE) [13:31:20.689] if (has_future) { [13:31:20.689] ns <- base::getNamespace("future") [13:31:20.689] version <- ns[[".package"]][["version"]] [13:31:20.689] if (is.null(version)) [13:31:20.689] version <- utils::packageVersion("future") [13:31:20.689] } [13:31:20.689] else { [13:31:20.689] version <- NULL [13:31:20.689] } [13:31:20.689] if (!has_future || version < "1.8.0") { [13:31:20.689] info <- base::c(r_version = base::gsub("R version ", [13:31:20.689] "", base::R.version$version.string), [13:31:20.689] platform = base::sprintf("%s (%s-bit)", [13:31:20.689] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.689] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.689] "release", "version")], collapse = " "), [13:31:20.689] hostname = base::Sys.info()[["nodename"]]) [13:31:20.689] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.689] info) [13:31:20.689] info <- base::paste(info, collapse = "; ") [13:31:20.689] if (!has_future) { [13:31:20.689] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.689] info) [13:31:20.689] } [13:31:20.689] else { [13:31:20.689] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.689] info, version) [13:31:20.689] } [13:31:20.689] base::stop(msg) [13:31:20.689] } [13:31:20.689] }) [13:31:20.689] } [13:31:20.689] ...future.strategy.old <- future::plan("list") [13:31:20.689] options(future.plan = NULL) [13:31:20.689] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.689] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.689] } [13:31:20.689] ...future.workdir <- getwd() [13:31:20.689] } [13:31:20.689] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.689] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.689] } [13:31:20.689] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.689] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:20.689] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.689] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.689] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.689] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.689] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.689] base::names(...future.oldOptions)) [13:31:20.689] } [13:31:20.689] if (FALSE) { [13:31:20.689] } [13:31:20.689] else { [13:31:20.689] if (TRUE) { [13:31:20.689] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.689] open = "w") [13:31:20.689] } [13:31:20.689] else { [13:31:20.689] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.689] windows = "NUL", "/dev/null"), open = "w") [13:31:20.689] } [13:31:20.689] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.689] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.689] base::sink(type = "output", split = FALSE) [13:31:20.689] base::close(...future.stdout) [13:31:20.689] }, add = TRUE) [13:31:20.689] } [13:31:20.689] ...future.frame <- base::sys.nframe() [13:31:20.689] ...future.conditions <- base::list() [13:31:20.689] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.689] if (FALSE) { [13:31:20.689] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.689] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.689] } [13:31:20.689] ...future.result <- base::tryCatch({ [13:31:20.689] base::withCallingHandlers({ [13:31:20.689] ...future.value <- base::withVisible(base::local({ [13:31:20.689] do.call(function(...) { [13:31:20.689] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.689] if (!identical(...future.globals.maxSize.org, [13:31:20.689] ...future.globals.maxSize)) { [13:31:20.689] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.689] on.exit(options(oopts), add = TRUE) [13:31:20.689] } [13:31:20.689] { [13:31:20.689] lapply(seq_along(...future.elements_ii), [13:31:20.689] FUN = function(jj) { [13:31:20.689] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.689] ...future.FUN(...future.X_jj, ...) [13:31:20.689] }) [13:31:20.689] } [13:31:20.689] }, args = future.call.arguments) [13:31:20.689] })) [13:31:20.689] future::FutureResult(value = ...future.value$value, [13:31:20.689] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.689] ...future.rng), globalenv = if (FALSE) [13:31:20.689] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.689] ...future.globalenv.names)) [13:31:20.689] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.689] }, condition = base::local({ [13:31:20.689] c <- base::c [13:31:20.689] inherits <- base::inherits [13:31:20.689] invokeRestart <- base::invokeRestart [13:31:20.689] length <- base::length [13:31:20.689] list <- base::list [13:31:20.689] seq.int <- base::seq.int [13:31:20.689] signalCondition <- base::signalCondition [13:31:20.689] sys.calls <- base::sys.calls [13:31:20.689] `[[` <- base::`[[` [13:31:20.689] `+` <- base::`+` [13:31:20.689] `<<-` <- base::`<<-` [13:31:20.689] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.689] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.689] 3L)] [13:31:20.689] } [13:31:20.689] function(cond) { [13:31:20.689] is_error <- inherits(cond, "error") [13:31:20.689] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.689] NULL) [13:31:20.689] if (is_error) { [13:31:20.689] sessionInformation <- function() { [13:31:20.689] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.689] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.689] search = base::search(), system = base::Sys.info()) [13:31:20.689] } [13:31:20.689] ...future.conditions[[length(...future.conditions) + [13:31:20.689] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.689] cond$call), session = sessionInformation(), [13:31:20.689] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.689] signalCondition(cond) [13:31:20.689] } [13:31:20.689] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.689] signal <- FALSE && inherits(cond, character(0)) [13:31:20.689] ...future.conditions[[length(...future.conditions) + [13:31:20.689] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.689] if (FALSE && !signal) { [13:31:20.689] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.689] { [13:31:20.689] inherits <- base::inherits [13:31:20.689] invokeRestart <- base::invokeRestart [13:31:20.689] is.null <- base::is.null [13:31:20.689] muffled <- FALSE [13:31:20.689] if (inherits(cond, "message")) { [13:31:20.689] muffled <- grepl(pattern, "muffleMessage") [13:31:20.689] if (muffled) [13:31:20.689] invokeRestart("muffleMessage") [13:31:20.689] } [13:31:20.689] else if (inherits(cond, "warning")) { [13:31:20.689] muffled <- grepl(pattern, "muffleWarning") [13:31:20.689] if (muffled) [13:31:20.689] invokeRestart("muffleWarning") [13:31:20.689] } [13:31:20.689] else if (inherits(cond, "condition")) { [13:31:20.689] if (!is.null(pattern)) { [13:31:20.689] computeRestarts <- base::computeRestarts [13:31:20.689] grepl <- base::grepl [13:31:20.689] restarts <- computeRestarts(cond) [13:31:20.689] for (restart in restarts) { [13:31:20.689] name <- restart$name [13:31:20.689] if (is.null(name)) [13:31:20.689] next [13:31:20.689] if (!grepl(pattern, name)) [13:31:20.689] next [13:31:20.689] invokeRestart(restart) [13:31:20.689] muffled <- TRUE [13:31:20.689] break [13:31:20.689] } [13:31:20.689] } [13:31:20.689] } [13:31:20.689] invisible(muffled) [13:31:20.689] } [13:31:20.689] muffleCondition(cond, pattern = "^muffle") [13:31:20.689] } [13:31:20.689] } [13:31:20.689] else { [13:31:20.689] if (TRUE) { [13:31:20.689] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.689] { [13:31:20.689] inherits <- base::inherits [13:31:20.689] invokeRestart <- base::invokeRestart [13:31:20.689] is.null <- base::is.null [13:31:20.689] muffled <- FALSE [13:31:20.689] if (inherits(cond, "message")) { [13:31:20.689] muffled <- grepl(pattern, "muffleMessage") [13:31:20.689] if (muffled) [13:31:20.689] invokeRestart("muffleMessage") [13:31:20.689] } [13:31:20.689] else if (inherits(cond, "warning")) { [13:31:20.689] muffled <- grepl(pattern, "muffleWarning") [13:31:20.689] if (muffled) [13:31:20.689] invokeRestart("muffleWarning") [13:31:20.689] } [13:31:20.689] else if (inherits(cond, "condition")) { [13:31:20.689] if (!is.null(pattern)) { [13:31:20.689] computeRestarts <- base::computeRestarts [13:31:20.689] grepl <- base::grepl [13:31:20.689] restarts <- computeRestarts(cond) [13:31:20.689] for (restart in restarts) { [13:31:20.689] name <- restart$name [13:31:20.689] if (is.null(name)) [13:31:20.689] next [13:31:20.689] if (!grepl(pattern, name)) [13:31:20.689] next [13:31:20.689] invokeRestart(restart) [13:31:20.689] muffled <- TRUE [13:31:20.689] break [13:31:20.689] } [13:31:20.689] } [13:31:20.689] } [13:31:20.689] invisible(muffled) [13:31:20.689] } [13:31:20.689] muffleCondition(cond, pattern = "^muffle") [13:31:20.689] } [13:31:20.689] } [13:31:20.689] } [13:31:20.689] })) [13:31:20.689] }, error = function(ex) { [13:31:20.689] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.689] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.689] ...future.rng), started = ...future.startTime, [13:31:20.689] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.689] version = "1.8"), class = "FutureResult") [13:31:20.689] }, finally = { [13:31:20.689] if (!identical(...future.workdir, getwd())) [13:31:20.689] setwd(...future.workdir) [13:31:20.689] { [13:31:20.689] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.689] ...future.oldOptions$nwarnings <- NULL [13:31:20.689] } [13:31:20.689] base::options(...future.oldOptions) [13:31:20.689] if (.Platform$OS.type == "windows") { [13:31:20.689] old_names <- names(...future.oldEnvVars) [13:31:20.689] envs <- base::Sys.getenv() [13:31:20.689] names <- names(envs) [13:31:20.689] common <- intersect(names, old_names) [13:31:20.689] added <- setdiff(names, old_names) [13:31:20.689] removed <- setdiff(old_names, names) [13:31:20.689] changed <- common[...future.oldEnvVars[common] != [13:31:20.689] envs[common]] [13:31:20.689] NAMES <- toupper(changed) [13:31:20.689] args <- list() [13:31:20.689] for (kk in seq_along(NAMES)) { [13:31:20.689] name <- changed[[kk]] [13:31:20.689] NAME <- NAMES[[kk]] [13:31:20.689] if (name != NAME && is.element(NAME, old_names)) [13:31:20.689] next [13:31:20.689] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.689] } [13:31:20.689] NAMES <- toupper(added) [13:31:20.689] for (kk in seq_along(NAMES)) { [13:31:20.689] name <- added[[kk]] [13:31:20.689] NAME <- NAMES[[kk]] [13:31:20.689] if (name != NAME && is.element(NAME, old_names)) [13:31:20.689] next [13:31:20.689] args[[name]] <- "" [13:31:20.689] } [13:31:20.689] NAMES <- toupper(removed) [13:31:20.689] for (kk in seq_along(NAMES)) { [13:31:20.689] name <- removed[[kk]] [13:31:20.689] NAME <- NAMES[[kk]] [13:31:20.689] if (name != NAME && is.element(NAME, old_names)) [13:31:20.689] next [13:31:20.689] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.689] } [13:31:20.689] if (length(args) > 0) [13:31:20.689] base::do.call(base::Sys.setenv, args = args) [13:31:20.689] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.689] } [13:31:20.689] else { [13:31:20.689] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.689] } [13:31:20.689] { [13:31:20.689] if (base::length(...future.futureOptionsAdded) > [13:31:20.689] 0L) { [13:31:20.689] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.689] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.689] base::options(opts) [13:31:20.689] } [13:31:20.689] { [13:31:20.689] NULL [13:31:20.689] options(future.plan = NULL) [13:31:20.689] if (is.na(NA_character_)) [13:31:20.689] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.689] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.689] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.689] .init = FALSE) [13:31:20.689] } [13:31:20.689] } [13:31:20.689] } [13:31:20.689] }) [13:31:20.689] if (TRUE) { [13:31:20.689] base::sink(type = "output", split = FALSE) [13:31:20.689] if (TRUE) { [13:31:20.689] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.689] } [13:31:20.689] else { [13:31:20.689] ...future.result["stdout"] <- base::list(NULL) [13:31:20.689] } [13:31:20.689] base::close(...future.stdout) [13:31:20.689] ...future.stdout <- NULL [13:31:20.689] } [13:31:20.689] ...future.result$conditions <- ...future.conditions [13:31:20.689] ...future.result$finished <- base::Sys.time() [13:31:20.689] ...future.result [13:31:20.689] } [13:31:20.693] - Launch lazy future ... done [13:31:20.693] run() for 'MiraiFuture' ... done [13:31:20.693] Created future: [13:31:20.695] resolved() for 'MiraiFuture' ... [13:31:20.695] - state: 'running' [13:31:20.695] - run: TRUE [13:31:20.695] - result: 'NULL' [13:31:20.695] - resolved: FALSE [13:31:20.695] resolved() for 'MiraiFuture' ... done [13:31:20.694] MiraiFuture: [13:31:20.694] Label: 'future_lapply-2' [13:31:20.694] Expression: [13:31:20.694] { [13:31:20.694] do.call(function(...) { [13:31:20.694] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.694] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.694] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.694] on.exit(options(oopts), add = TRUE) [13:31:20.694] } [13:31:20.694] { [13:31:20.694] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.694] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.694] ...future.FUN(...future.X_jj, ...) [13:31:20.694] }) [13:31:20.694] } [13:31:20.694] }, args = future.call.arguments) [13:31:20.694] } [13:31:20.694] Lazy evaluation: FALSE [13:31:20.694] Asynchronous evaluation: TRUE [13:31:20.694] Local evaluation: TRUE [13:31:20.694] Environment: R_GlobalEnv [13:31:20.694] Capture standard output: TRUE [13:31:20.694] Capture condition classes: 'condition' (excluding 'nothing') [13:31:20.694] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:20.694] Packages: [13:31:20.694] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:20.694] Resolved: TRUE [13:31:20.694] Value: [13:31:20.694] Conditions captured: [13:31:20.694] Early signaling: FALSE [13:31:20.694] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:20.694] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.696] Chunk #2 of 2 ... DONE [13:31:20.696] Launching 2 futures (chunks) ... DONE [13:31:20.696] Resolving 2 futures (chunks) ... [13:31:20.696] resolve() on list ... [13:31:20.697] recursive: 0 [13:31:20.697] length: 2 [13:31:20.697] [13:31:20.697] resolved() for 'MiraiFuture' ... [13:31:20.697] - state: 'running' [13:31:20.697] - run: TRUE [13:31:20.698] - result: 'NULL' [13:31:20.698] - resolved: FALSE [13:31:20.698] resolved() for 'MiraiFuture' ... done [13:31:20.699] Future #1 [13:31:20.699] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:20.699] - nx: 2 [13:31:20.700] - relay: TRUE [13:31:20.700] - stdout: TRUE [13:31:20.700] - signal: TRUE [13:31:20.700] - resignal: FALSE [13:31:20.700] - force: TRUE [13:31:20.700] - relayed: [n=2] FALSE, FALSE [13:31:20.700] - queued futures: [n=2] FALSE, FALSE [13:31:20.701] - until=1 [13:31:20.701] - relaying element #1 [13:31:20.701] - relayed: [n=2] TRUE, FALSE [13:31:20.701] - queued futures: [n=2] TRUE, FALSE [13:31:20.701] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:20.702] length: 1 (resolved future 1) [13:31:20.702] resolved() for 'MiraiFuture' ... [13:31:20.702] - state: 'running' [13:31:20.702] - run: TRUE [13:31:20.702] - result: 'NULL' [13:31:20.702] - resolved: FALSE [13:31:20.703] resolved() for 'MiraiFuture' ... done [13:31:20.703] Future #2 [13:31:20.703] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:20.703] - nx: 2 [13:31:20.703] - relay: TRUE [13:31:20.704] - stdout: TRUE [13:31:20.704] - signal: TRUE [13:31:20.704] - resignal: FALSE [13:31:20.704] - force: TRUE [13:31:20.704] - relayed: [n=2] TRUE, FALSE [13:31:20.704] - queued futures: [n=2] TRUE, FALSE [13:31:20.704] - until=2 [13:31:20.705] - relaying element #2 [13:31:20.705] - relayed: [n=2] TRUE, TRUE [13:31:20.705] - queued futures: [n=2] TRUE, TRUE [13:31:20.705] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:20.705] length: 0 (resolved future 2) [13:31:20.706] Relaying remaining futures [13:31:20.706] signalConditionsASAP(NULL, pos=0) ... [13:31:20.706] - nx: 2 [13:31:20.706] - relay: TRUE [13:31:20.706] - stdout: TRUE [13:31:20.706] - signal: TRUE [13:31:20.706] - resignal: FALSE [13:31:20.707] - force: TRUE [13:31:20.707] - relayed: [n=2] TRUE, TRUE [13:31:20.707] - queued futures: [n=2] TRUE, TRUE - flush all [13:31:20.707] - relayed: [n=2] TRUE, TRUE [13:31:20.707] - queued futures: [n=2] TRUE, TRUE [13:31:20.707] signalConditionsASAP(NULL, pos=0) ... done [13:31:20.708] resolve() on list ... DONE [13:31:20.708] - Number of value chunks collected: 2 [13:31:20.708] Resolving 2 futures (chunks) ... DONE [13:31:20.708] Reducing values from 2 chunks ... [13:31:20.708] - Number of values collected after concatenation: 3 [13:31:20.708] - Number of values expected: 3 [13:31:20.709] Reducing values from 2 chunks ... DONE [13:31:20.709] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... List of 1 $ x:List of 3 ..$ a: chr "integer" ..$ c: chr "character" ..$ c: chr "list" List of 1 $ y0:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:31:20.720] - plan('mirai_multisession') ...[13:31:20.720] plan(): Setting new future strategy stack: [13:31:20.721] List of future strategies: [13:31:20.721] 1. mirai_multisession: [13:31:20.721] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:20.721] - tweaked: FALSE [13:31:20.721] - call: plan(strategy) [13:31:20.721] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:20.721] < mirai [$data] > [13:31:20.724] getGlobalsAndPackages() ... [13:31:20.724] Not searching for globals [13:31:20.724] - globals: [0] [13:31:20.724] getGlobalsAndPackages() ... DONE [13:31:20.724] getGlobalsAndPackages() ... [13:31:20.724] [13:31:20.725] - globals: [0] [13:31:20.725] getGlobalsAndPackages() ... DONE [13:31:20.725] Packages needed by the future expression (n = 0): [13:31:20.725] Packages needed by future strategies (n = 0): [13:31:20.726] { [13:31:20.726] { [13:31:20.726] { [13:31:20.726] ...future.startTime <- base::Sys.time() [13:31:20.726] { [13:31:20.726] { [13:31:20.726] { [13:31:20.726] base::local({ [13:31:20.726] has_future <- base::requireNamespace("future", [13:31:20.726] quietly = TRUE) [13:31:20.726] if (has_future) { [13:31:20.726] ns <- base::getNamespace("future") [13:31:20.726] version <- ns[[".package"]][["version"]] [13:31:20.726] if (is.null(version)) [13:31:20.726] version <- utils::packageVersion("future") [13:31:20.726] } [13:31:20.726] else { [13:31:20.726] version <- NULL [13:31:20.726] } [13:31:20.726] if (!has_future || version < "1.8.0") { [13:31:20.726] info <- base::c(r_version = base::gsub("R version ", [13:31:20.726] "", base::R.version$version.string), [13:31:20.726] platform = base::sprintf("%s (%s-bit)", [13:31:20.726] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.726] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.726] "release", "version")], collapse = " "), [13:31:20.726] hostname = base::Sys.info()[["nodename"]]) [13:31:20.726] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.726] info) [13:31:20.726] info <- base::paste(info, collapse = "; ") [13:31:20.726] if (!has_future) { [13:31:20.726] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.726] info) [13:31:20.726] } [13:31:20.726] else { [13:31:20.726] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.726] info, version) [13:31:20.726] } [13:31:20.726] base::stop(msg) [13:31:20.726] } [13:31:20.726] }) [13:31:20.726] } [13:31:20.726] ...future.strategy.old <- future::plan("list") [13:31:20.726] options(future.plan = NULL) [13:31:20.726] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.726] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.726] } [13:31:20.726] ...future.workdir <- getwd() [13:31:20.726] } [13:31:20.726] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.726] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.726] } [13:31:20.726] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.726] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:20.726] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.726] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.726] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.726] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.726] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.726] base::names(...future.oldOptions)) [13:31:20.726] } [13:31:20.726] if (FALSE) { [13:31:20.726] } [13:31:20.726] else { [13:31:20.726] if (TRUE) { [13:31:20.726] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.726] open = "w") [13:31:20.726] } [13:31:20.726] else { [13:31:20.726] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.726] windows = "NUL", "/dev/null"), open = "w") [13:31:20.726] } [13:31:20.726] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.726] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.726] base::sink(type = "output", split = FALSE) [13:31:20.726] base::close(...future.stdout) [13:31:20.726] }, add = TRUE) [13:31:20.726] } [13:31:20.726] ...future.frame <- base::sys.nframe() [13:31:20.726] ...future.conditions <- base::list() [13:31:20.726] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.726] if (FALSE) { [13:31:20.726] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.726] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.726] } [13:31:20.726] ...future.result <- base::tryCatch({ [13:31:20.726] base::withCallingHandlers({ [13:31:20.726] ...future.value <- base::withVisible(base::local(NA)) [13:31:20.726] future::FutureResult(value = ...future.value$value, [13:31:20.726] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.726] ...future.rng), globalenv = if (FALSE) [13:31:20.726] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.726] ...future.globalenv.names)) [13:31:20.726] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.726] }, condition = base::local({ [13:31:20.726] c <- base::c [13:31:20.726] inherits <- base::inherits [13:31:20.726] invokeRestart <- base::invokeRestart [13:31:20.726] length <- base::length [13:31:20.726] list <- base::list [13:31:20.726] seq.int <- base::seq.int [13:31:20.726] signalCondition <- base::signalCondition [13:31:20.726] sys.calls <- base::sys.calls [13:31:20.726] `[[` <- base::`[[` [13:31:20.726] `+` <- base::`+` [13:31:20.726] `<<-` <- base::`<<-` [13:31:20.726] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.726] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.726] 3L)] [13:31:20.726] } [13:31:20.726] function(cond) { [13:31:20.726] is_error <- inherits(cond, "error") [13:31:20.726] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.726] NULL) [13:31:20.726] if (is_error) { [13:31:20.726] sessionInformation <- function() { [13:31:20.726] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.726] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.726] search = base::search(), system = base::Sys.info()) [13:31:20.726] } [13:31:20.726] ...future.conditions[[length(...future.conditions) + [13:31:20.726] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.726] cond$call), session = sessionInformation(), [13:31:20.726] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.726] signalCondition(cond) [13:31:20.726] } [13:31:20.726] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.726] signal <- FALSE && inherits(cond, character(0)) [13:31:20.726] ...future.conditions[[length(...future.conditions) + [13:31:20.726] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.726] if (FALSE && !signal) { [13:31:20.726] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.726] { [13:31:20.726] inherits <- base::inherits [13:31:20.726] invokeRestart <- base::invokeRestart [13:31:20.726] is.null <- base::is.null [13:31:20.726] muffled <- FALSE [13:31:20.726] if (inherits(cond, "message")) { [13:31:20.726] muffled <- grepl(pattern, "muffleMessage") [13:31:20.726] if (muffled) [13:31:20.726] invokeRestart("muffleMessage") [13:31:20.726] } [13:31:20.726] else if (inherits(cond, "warning")) { [13:31:20.726] muffled <- grepl(pattern, "muffleWarning") [13:31:20.726] if (muffled) [13:31:20.726] invokeRestart("muffleWarning") [13:31:20.726] } [13:31:20.726] else if (inherits(cond, "condition")) { [13:31:20.726] if (!is.null(pattern)) { [13:31:20.726] computeRestarts <- base::computeRestarts [13:31:20.726] grepl <- base::grepl [13:31:20.726] restarts <- computeRestarts(cond) [13:31:20.726] for (restart in restarts) { [13:31:20.726] name <- restart$name [13:31:20.726] if (is.null(name)) [13:31:20.726] next [13:31:20.726] if (!grepl(pattern, name)) [13:31:20.726] next [13:31:20.726] invokeRestart(restart) [13:31:20.726] muffled <- TRUE [13:31:20.726] break [13:31:20.726] } [13:31:20.726] } [13:31:20.726] } [13:31:20.726] invisible(muffled) [13:31:20.726] } [13:31:20.726] muffleCondition(cond, pattern = "^muffle") [13:31:20.726] } [13:31:20.726] } [13:31:20.726] else { [13:31:20.726] if (TRUE) { [13:31:20.726] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.726] { [13:31:20.726] inherits <- base::inherits [13:31:20.726] invokeRestart <- base::invokeRestart [13:31:20.726] is.null <- base::is.null [13:31:20.726] muffled <- FALSE [13:31:20.726] if (inherits(cond, "message")) { [13:31:20.726] muffled <- grepl(pattern, "muffleMessage") [13:31:20.726] if (muffled) [13:31:20.726] invokeRestart("muffleMessage") [13:31:20.726] } [13:31:20.726] else if (inherits(cond, "warning")) { [13:31:20.726] muffled <- grepl(pattern, "muffleWarning") [13:31:20.726] if (muffled) [13:31:20.726] invokeRestart("muffleWarning") [13:31:20.726] } [13:31:20.726] else if (inherits(cond, "condition")) { [13:31:20.726] if (!is.null(pattern)) { [13:31:20.726] computeRestarts <- base::computeRestarts [13:31:20.726] grepl <- base::grepl [13:31:20.726] restarts <- computeRestarts(cond) [13:31:20.726] for (restart in restarts) { [13:31:20.726] name <- restart$name [13:31:20.726] if (is.null(name)) [13:31:20.726] next [13:31:20.726] if (!grepl(pattern, name)) [13:31:20.726] next [13:31:20.726] invokeRestart(restart) [13:31:20.726] muffled <- TRUE [13:31:20.726] break [13:31:20.726] } [13:31:20.726] } [13:31:20.726] } [13:31:20.726] invisible(muffled) [13:31:20.726] } [13:31:20.726] muffleCondition(cond, pattern = "^muffle") [13:31:20.726] } [13:31:20.726] } [13:31:20.726] } [13:31:20.726] })) [13:31:20.726] }, error = function(ex) { [13:31:20.726] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.726] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.726] ...future.rng), started = ...future.startTime, [13:31:20.726] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.726] version = "1.8"), class = "FutureResult") [13:31:20.726] }, finally = { [13:31:20.726] if (!identical(...future.workdir, getwd())) [13:31:20.726] setwd(...future.workdir) [13:31:20.726] { [13:31:20.726] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.726] ...future.oldOptions$nwarnings <- NULL [13:31:20.726] } [13:31:20.726] base::options(...future.oldOptions) [13:31:20.726] if (.Platform$OS.type == "windows") { [13:31:20.726] old_names <- names(...future.oldEnvVars) [13:31:20.726] envs <- base::Sys.getenv() [13:31:20.726] names <- names(envs) [13:31:20.726] common <- intersect(names, old_names) [13:31:20.726] added <- setdiff(names, old_names) [13:31:20.726] removed <- setdiff(old_names, names) [13:31:20.726] changed <- common[...future.oldEnvVars[common] != [13:31:20.726] envs[common]] [13:31:20.726] NAMES <- toupper(changed) [13:31:20.726] args <- list() [13:31:20.726] for (kk in seq_along(NAMES)) { [13:31:20.726] name <- changed[[kk]] [13:31:20.726] NAME <- NAMES[[kk]] [13:31:20.726] if (name != NAME && is.element(NAME, old_names)) [13:31:20.726] next [13:31:20.726] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.726] } [13:31:20.726] NAMES <- toupper(added) [13:31:20.726] for (kk in seq_along(NAMES)) { [13:31:20.726] name <- added[[kk]] [13:31:20.726] NAME <- NAMES[[kk]] [13:31:20.726] if (name != NAME && is.element(NAME, old_names)) [13:31:20.726] next [13:31:20.726] args[[name]] <- "" [13:31:20.726] } [13:31:20.726] NAMES <- toupper(removed) [13:31:20.726] for (kk in seq_along(NAMES)) { [13:31:20.726] name <- removed[[kk]] [13:31:20.726] NAME <- NAMES[[kk]] [13:31:20.726] if (name != NAME && is.element(NAME, old_names)) [13:31:20.726] next [13:31:20.726] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.726] } [13:31:20.726] if (length(args) > 0) [13:31:20.726] base::do.call(base::Sys.setenv, args = args) [13:31:20.726] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.726] } [13:31:20.726] else { [13:31:20.726] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.726] } [13:31:20.726] { [13:31:20.726] if (base::length(...future.futureOptionsAdded) > [13:31:20.726] 0L) { [13:31:20.726] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.726] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.726] base::options(opts) [13:31:20.726] } [13:31:20.726] { [13:31:20.726] NULL [13:31:20.726] options(future.plan = NULL) [13:31:20.726] if (is.na(NA_character_)) [13:31:20.726] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.726] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.726] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.726] .init = FALSE) [13:31:20.726] } [13:31:20.726] } [13:31:20.726] } [13:31:20.726] }) [13:31:20.726] if (TRUE) { [13:31:20.726] base::sink(type = "output", split = FALSE) [13:31:20.726] if (TRUE) { [13:31:20.726] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.726] } [13:31:20.726] else { [13:31:20.726] ...future.result["stdout"] <- base::list(NULL) [13:31:20.726] } [13:31:20.726] base::close(...future.stdout) [13:31:20.726] ...future.stdout <- NULL [13:31:20.726] } [13:31:20.726] ...future.result$conditions <- ...future.conditions [13:31:20.726] ...future.result$finished <- base::Sys.time() [13:31:20.726] ...future.result [13:31:20.726] } [13:31:20.732] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:20.732] plan(): nbrOfWorkers() = 2 [13:31:20.732] future_lapply() ... [13:31:20.733] Number of chunks: 3 [13:31:20.734] getGlobalsAndPackagesXApply() ... [13:31:20.734] - future.globals: TRUE [13:31:20.734] getGlobalsAndPackages() ... [13:31:20.734] Searching for globals... [13:31:20.735] - globals found: [2] 'FUN', '.Internal' [13:31:20.736] Searching for globals ... DONE [13:31:20.736] Resolving globals: FALSE [13:31:20.736] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:31:20.737] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:31:20.737] - globals: [1] 'FUN' [13:31:20.737] [13:31:20.737] getGlobalsAndPackages() ... DONE [13:31:20.737] - globals found/used: [n=1] 'FUN' [13:31:20.737] - needed namespaces: [n=0] [13:31:20.738] Finding globals ... DONE [13:31:20.738] - use_args: TRUE [13:31:20.738] - Getting '...' globals ... [13:31:20.738] resolve() on list ... [13:31:20.738] recursive: 0 [13:31:20.739] length: 1 [13:31:20.739] elements: '...' [13:31:20.739] length: 0 (resolved future 1) [13:31:20.739] resolve() on list ... DONE [13:31:20.739] - '...' content: [n=1] 'length' [13:31:20.739] List of 1 [13:31:20.739] $ ...:List of 1 [13:31:20.739] ..$ length: int 2 [13:31:20.739] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:20.739] - attr(*, "where")=List of 1 [13:31:20.739] ..$ ...: [13:31:20.739] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:20.739] - attr(*, "resolved")= logi TRUE [13:31:20.739] - attr(*, "total_size")= num NA [13:31:20.743] - Getting '...' globals ... DONE [13:31:20.743] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:20.743] List of 2 [13:31:20.743] $ ...future.FUN:function (mode = "logical", length = 0L) [13:31:20.743] $ ... :List of 1 [13:31:20.743] ..$ length: int 2 [13:31:20.743] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:20.743] - attr(*, "where")=List of 2 [13:31:20.743] ..$ ...future.FUN: [13:31:20.743] ..$ ... : [13:31:20.743] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:20.743] - attr(*, "resolved")= logi FALSE [13:31:20.743] - attr(*, "total_size")= num 2240 [13:31:20.748] Packages to be attached in all futures: [n=0] [13:31:20.748] getGlobalsAndPackagesXApply() ... DONE [13:31:20.749] Number of futures (= number of chunks): 3 [13:31:20.749] Launching 3 futures (chunks) ... [13:31:20.749] Chunk #1 of 3 ... [13:31:20.749] - Finding globals in 'X' for chunk #1 ... [13:31:20.750] getGlobalsAndPackages() ... [13:31:20.750] Searching for globals... [13:31:20.750] [13:31:20.750] Searching for globals ... DONE [13:31:20.750] - globals: [0] [13:31:20.751] getGlobalsAndPackages() ... DONE [13:31:20.751] + additional globals found: [n=0] [13:31:20.751] + additional namespaces needed: [n=0] [13:31:20.751] - Finding globals in 'X' for chunk #1 ... DONE [13:31:20.751] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:20.751] - seeds: [13:31:20.752] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.752] getGlobalsAndPackages() ... [13:31:20.752] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.752] Resolving globals: FALSE [13:31:20.752] Tweak future expression to call with '...' arguments ... [13:31:20.753] { [13:31:20.753] do.call(function(...) { [13:31:20.753] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.753] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.753] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.753] on.exit(options(oopts), add = TRUE) [13:31:20.753] } [13:31:20.753] { [13:31:20.753] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.753] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.753] ...future.FUN(...future.X_jj, ...) [13:31:20.753] }) [13:31:20.753] } [13:31:20.753] }, args = future.call.arguments) [13:31:20.753] } [13:31:20.753] Tweak future expression to call with '...' arguments ... DONE [13:31:20.754] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.754] [13:31:20.754] getGlobalsAndPackages() ... DONE [13:31:20.754] run() for 'Future' ... [13:31:20.754] - state: 'created' [13:31:20.755] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:20.757] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.757] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:20.757] - Field: 'label' [13:31:20.758] - Field: 'local' [13:31:20.758] - Field: 'owner' [13:31:20.758] - Field: 'envir' [13:31:20.758] - Field: 'packages' [13:31:20.758] - Field: 'gc' [13:31:20.759] - Field: 'conditions' [13:31:20.759] - Field: 'expr' [13:31:20.759] - Field: 'uuid' [13:31:20.759] - Field: 'seed' [13:31:20.759] - Field: 'version' [13:31:20.760] - Field: 'result' [13:31:20.760] - Field: 'asynchronous' [13:31:20.760] - Field: 'calls' [13:31:20.760] - Field: 'globals' [13:31:20.760] - Field: 'stdout' [13:31:20.760] - Field: 'earlySignal' [13:31:20.761] - Field: 'lazy' [13:31:20.761] - Field: 'state' [13:31:20.761] - Field: '.cluster' [13:31:20.761] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:20.761] - Launch lazy future ... [13:31:20.762] Packages needed by the future expression (n = 0): [13:31:20.762] Packages needed by future strategies (n = 0): [13:31:20.762] { [13:31:20.762] { [13:31:20.762] { [13:31:20.762] ...future.startTime <- base::Sys.time() [13:31:20.762] { [13:31:20.762] { [13:31:20.762] { [13:31:20.762] base::local({ [13:31:20.762] has_future <- base::requireNamespace("future", [13:31:20.762] quietly = TRUE) [13:31:20.762] if (has_future) { [13:31:20.762] ns <- base::getNamespace("future") [13:31:20.762] version <- ns[[".package"]][["version"]] [13:31:20.762] if (is.null(version)) [13:31:20.762] version <- utils::packageVersion("future") [13:31:20.762] } [13:31:20.762] else { [13:31:20.762] version <- NULL [13:31:20.762] } [13:31:20.762] if (!has_future || version < "1.8.0") { [13:31:20.762] info <- base::c(r_version = base::gsub("R version ", [13:31:20.762] "", base::R.version$version.string), [13:31:20.762] platform = base::sprintf("%s (%s-bit)", [13:31:20.762] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.762] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.762] "release", "version")], collapse = " "), [13:31:20.762] hostname = base::Sys.info()[["nodename"]]) [13:31:20.762] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.762] info) [13:31:20.762] info <- base::paste(info, collapse = "; ") [13:31:20.762] if (!has_future) { [13:31:20.762] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.762] info) [13:31:20.762] } [13:31:20.762] else { [13:31:20.762] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.762] info, version) [13:31:20.762] } [13:31:20.762] base::stop(msg) [13:31:20.762] } [13:31:20.762] }) [13:31:20.762] } [13:31:20.762] ...future.strategy.old <- future::plan("list") [13:31:20.762] options(future.plan = NULL) [13:31:20.762] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.762] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.762] } [13:31:20.762] ...future.workdir <- getwd() [13:31:20.762] } [13:31:20.762] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.762] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.762] } [13:31:20.762] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.762] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:20.762] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.762] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.762] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.762] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.762] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.762] base::names(...future.oldOptions)) [13:31:20.762] } [13:31:20.762] if (FALSE) { [13:31:20.762] } [13:31:20.762] else { [13:31:20.762] if (TRUE) { [13:31:20.762] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.762] open = "w") [13:31:20.762] } [13:31:20.762] else { [13:31:20.762] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.762] windows = "NUL", "/dev/null"), open = "w") [13:31:20.762] } [13:31:20.762] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.762] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.762] base::sink(type = "output", split = FALSE) [13:31:20.762] base::close(...future.stdout) [13:31:20.762] }, add = TRUE) [13:31:20.762] } [13:31:20.762] ...future.frame <- base::sys.nframe() [13:31:20.762] ...future.conditions <- base::list() [13:31:20.762] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.762] if (FALSE) { [13:31:20.762] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.762] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.762] } [13:31:20.762] ...future.result <- base::tryCatch({ [13:31:20.762] base::withCallingHandlers({ [13:31:20.762] ...future.value <- base::withVisible(base::local({ [13:31:20.762] do.call(function(...) { [13:31:20.762] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.762] if (!identical(...future.globals.maxSize.org, [13:31:20.762] ...future.globals.maxSize)) { [13:31:20.762] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.762] on.exit(options(oopts), add = TRUE) [13:31:20.762] } [13:31:20.762] { [13:31:20.762] lapply(seq_along(...future.elements_ii), [13:31:20.762] FUN = function(jj) { [13:31:20.762] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.762] ...future.FUN(...future.X_jj, ...) [13:31:20.762] }) [13:31:20.762] } [13:31:20.762] }, args = future.call.arguments) [13:31:20.762] })) [13:31:20.762] future::FutureResult(value = ...future.value$value, [13:31:20.762] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.762] ...future.rng), globalenv = if (FALSE) [13:31:20.762] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.762] ...future.globalenv.names)) [13:31:20.762] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.762] }, condition = base::local({ [13:31:20.762] c <- base::c [13:31:20.762] inherits <- base::inherits [13:31:20.762] invokeRestart <- base::invokeRestart [13:31:20.762] length <- base::length [13:31:20.762] list <- base::list [13:31:20.762] seq.int <- base::seq.int [13:31:20.762] signalCondition <- base::signalCondition [13:31:20.762] sys.calls <- base::sys.calls [13:31:20.762] `[[` <- base::`[[` [13:31:20.762] `+` <- base::`+` [13:31:20.762] `<<-` <- base::`<<-` [13:31:20.762] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.762] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.762] 3L)] [13:31:20.762] } [13:31:20.762] function(cond) { [13:31:20.762] is_error <- inherits(cond, "error") [13:31:20.762] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.762] NULL) [13:31:20.762] if (is_error) { [13:31:20.762] sessionInformation <- function() { [13:31:20.762] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.762] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.762] search = base::search(), system = base::Sys.info()) [13:31:20.762] } [13:31:20.762] ...future.conditions[[length(...future.conditions) + [13:31:20.762] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.762] cond$call), session = sessionInformation(), [13:31:20.762] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.762] signalCondition(cond) [13:31:20.762] } [13:31:20.762] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.762] signal <- FALSE && inherits(cond, character(0)) [13:31:20.762] ...future.conditions[[length(...future.conditions) + [13:31:20.762] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.762] if (FALSE && !signal) { [13:31:20.762] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.762] { [13:31:20.762] inherits <- base::inherits [13:31:20.762] invokeRestart <- base::invokeRestart [13:31:20.762] is.null <- base::is.null [13:31:20.762] muffled <- FALSE [13:31:20.762] if (inherits(cond, "message")) { [13:31:20.762] muffled <- grepl(pattern, "muffleMessage") [13:31:20.762] if (muffled) [13:31:20.762] invokeRestart("muffleMessage") [13:31:20.762] } [13:31:20.762] else if (inherits(cond, "warning")) { [13:31:20.762] muffled <- grepl(pattern, "muffleWarning") [13:31:20.762] if (muffled) [13:31:20.762] invokeRestart("muffleWarning") [13:31:20.762] } [13:31:20.762] else if (inherits(cond, "condition")) { [13:31:20.762] if (!is.null(pattern)) { [13:31:20.762] computeRestarts <- base::computeRestarts [13:31:20.762] grepl <- base::grepl [13:31:20.762] restarts <- computeRestarts(cond) [13:31:20.762] for (restart in restarts) { [13:31:20.762] name <- restart$name [13:31:20.762] if (is.null(name)) [13:31:20.762] next [13:31:20.762] if (!grepl(pattern, name)) [13:31:20.762] next [13:31:20.762] invokeRestart(restart) [13:31:20.762] muffled <- TRUE [13:31:20.762] break [13:31:20.762] } [13:31:20.762] } [13:31:20.762] } [13:31:20.762] invisible(muffled) [13:31:20.762] } [13:31:20.762] muffleCondition(cond, pattern = "^muffle") [13:31:20.762] } [13:31:20.762] } [13:31:20.762] else { [13:31:20.762] if (TRUE) { [13:31:20.762] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.762] { [13:31:20.762] inherits <- base::inherits [13:31:20.762] invokeRestart <- base::invokeRestart [13:31:20.762] is.null <- base::is.null [13:31:20.762] muffled <- FALSE [13:31:20.762] if (inherits(cond, "message")) { [13:31:20.762] muffled <- grepl(pattern, "muffleMessage") [13:31:20.762] if (muffled) [13:31:20.762] invokeRestart("muffleMessage") [13:31:20.762] } [13:31:20.762] else if (inherits(cond, "warning")) { [13:31:20.762] muffled <- grepl(pattern, "muffleWarning") [13:31:20.762] if (muffled) [13:31:20.762] invokeRestart("muffleWarning") [13:31:20.762] } [13:31:20.762] else if (inherits(cond, "condition")) { [13:31:20.762] if (!is.null(pattern)) { [13:31:20.762] computeRestarts <- base::computeRestarts [13:31:20.762] grepl <- base::grepl [13:31:20.762] restarts <- computeRestarts(cond) [13:31:20.762] for (restart in restarts) { [13:31:20.762] name <- restart$name [13:31:20.762] if (is.null(name)) [13:31:20.762] next [13:31:20.762] if (!grepl(pattern, name)) [13:31:20.762] next [13:31:20.762] invokeRestart(restart) [13:31:20.762] muffled <- TRUE [13:31:20.762] break [13:31:20.762] } [13:31:20.762] } [13:31:20.762] } [13:31:20.762] invisible(muffled) [13:31:20.762] } [13:31:20.762] muffleCondition(cond, pattern = "^muffle") [13:31:20.762] } [13:31:20.762] } [13:31:20.762] } [13:31:20.762] })) [13:31:20.762] }, error = function(ex) { [13:31:20.762] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.762] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.762] ...future.rng), started = ...future.startTime, [13:31:20.762] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.762] version = "1.8"), class = "FutureResult") [13:31:20.762] }, finally = { [13:31:20.762] if (!identical(...future.workdir, getwd())) [13:31:20.762] setwd(...future.workdir) [13:31:20.762] { [13:31:20.762] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.762] ...future.oldOptions$nwarnings <- NULL [13:31:20.762] } [13:31:20.762] base::options(...future.oldOptions) [13:31:20.762] if (.Platform$OS.type == "windows") { [13:31:20.762] old_names <- names(...future.oldEnvVars) [13:31:20.762] envs <- base::Sys.getenv() [13:31:20.762] names <- names(envs) [13:31:20.762] common <- intersect(names, old_names) [13:31:20.762] added <- setdiff(names, old_names) [13:31:20.762] removed <- setdiff(old_names, names) [13:31:20.762] changed <- common[...future.oldEnvVars[common] != [13:31:20.762] envs[common]] [13:31:20.762] NAMES <- toupper(changed) [13:31:20.762] args <- list() [13:31:20.762] for (kk in seq_along(NAMES)) { [13:31:20.762] name <- changed[[kk]] [13:31:20.762] NAME <- NAMES[[kk]] [13:31:20.762] if (name != NAME && is.element(NAME, old_names)) [13:31:20.762] next [13:31:20.762] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.762] } [13:31:20.762] NAMES <- toupper(added) [13:31:20.762] for (kk in seq_along(NAMES)) { [13:31:20.762] name <- added[[kk]] [13:31:20.762] NAME <- NAMES[[kk]] [13:31:20.762] if (name != NAME && is.element(NAME, old_names)) [13:31:20.762] next [13:31:20.762] args[[name]] <- "" [13:31:20.762] } [13:31:20.762] NAMES <- toupper(removed) [13:31:20.762] for (kk in seq_along(NAMES)) { [13:31:20.762] name <- removed[[kk]] [13:31:20.762] NAME <- NAMES[[kk]] [13:31:20.762] if (name != NAME && is.element(NAME, old_names)) [13:31:20.762] next [13:31:20.762] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.762] } [13:31:20.762] if (length(args) > 0) [13:31:20.762] base::do.call(base::Sys.setenv, args = args) [13:31:20.762] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.762] } [13:31:20.762] else { [13:31:20.762] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.762] } [13:31:20.762] { [13:31:20.762] if (base::length(...future.futureOptionsAdded) > [13:31:20.762] 0L) { [13:31:20.762] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.762] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.762] base::options(opts) [13:31:20.762] } [13:31:20.762] { [13:31:20.762] NULL [13:31:20.762] options(future.plan = NULL) [13:31:20.762] if (is.na(NA_character_)) [13:31:20.762] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.762] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.762] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.762] .init = FALSE) [13:31:20.762] } [13:31:20.762] } [13:31:20.762] } [13:31:20.762] }) [13:31:20.762] if (TRUE) { [13:31:20.762] base::sink(type = "output", split = FALSE) [13:31:20.762] if (TRUE) { [13:31:20.762] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.762] } [13:31:20.762] else { [13:31:20.762] ...future.result["stdout"] <- base::list(NULL) [13:31:20.762] } [13:31:20.762] base::close(...future.stdout) [13:31:20.762] ...future.stdout <- NULL [13:31:20.762] } [13:31:20.762] ...future.result$conditions <- ...future.conditions [13:31:20.762] ...future.result$finished <- base::Sys.time() [13:31:20.762] ...future.result [13:31:20.762] } [13:31:20.767] - Launch lazy future ... done [13:31:20.767] run() for 'MiraiFuture' ... done [13:31:20.767] Created future: [13:31:20.768] resolved() for 'MiraiFuture' ... [13:31:20.768] - state: 'running' [13:31:20.769] - run: TRUE [13:31:20.769] - result: 'NULL' [13:31:20.769] - resolved: FALSE [13:31:20.769] resolved() for 'MiraiFuture' ... done [13:31:20.767] MiraiFuture: [13:31:20.767] Label: 'future_lapply-1' [13:31:20.767] Expression: [13:31:20.767] { [13:31:20.767] do.call(function(...) { [13:31:20.767] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.767] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.767] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.767] on.exit(options(oopts), add = TRUE) [13:31:20.767] } [13:31:20.767] { [13:31:20.767] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.767] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.767] ...future.FUN(...future.X_jj, ...) [13:31:20.767] }) [13:31:20.767] } [13:31:20.767] }, args = future.call.arguments) [13:31:20.767] } [13:31:20.767] Lazy evaluation: FALSE [13:31:20.767] Asynchronous evaluation: TRUE [13:31:20.767] Local evaluation: TRUE [13:31:20.767] Environment: R_GlobalEnv [13:31:20.767] Capture standard output: TRUE [13:31:20.767] Capture condition classes: 'condition' (excluding 'nothing') [13:31:20.767] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:20.767] Packages: [13:31:20.767] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:20.767] Resolved: TRUE [13:31:20.767] Value: [13:31:20.767] Conditions captured: [13:31:20.767] Early signaling: FALSE [13:31:20.767] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:20.767] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.770] Chunk #1 of 3 ... DONE [13:31:20.770] Chunk #2 of 3 ... [13:31:20.770] - Finding globals in 'X' for chunk #2 ... [13:31:20.770] getGlobalsAndPackages() ... [13:31:20.770] Searching for globals... [13:31:20.771] [13:31:20.771] Searching for globals ... DONE [13:31:20.771] - globals: [0] [13:31:20.771] getGlobalsAndPackages() ... DONE [13:31:20.771] + additional globals found: [n=0] [13:31:20.771] + additional namespaces needed: [n=0] [13:31:20.772] - Finding globals in 'X' for chunk #2 ... DONE [13:31:20.772] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:20.772] - seeds: [13:31:20.772] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.772] getGlobalsAndPackages() ... [13:31:20.772] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.773] Resolving globals: FALSE [13:31:20.773] Tweak future expression to call with '...' arguments ... [13:31:20.773] { [13:31:20.773] do.call(function(...) { [13:31:20.773] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.773] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.773] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.773] on.exit(options(oopts), add = TRUE) [13:31:20.773] } [13:31:20.773] { [13:31:20.773] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.773] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.773] ...future.FUN(...future.X_jj, ...) [13:31:20.773] }) [13:31:20.773] } [13:31:20.773] }, args = future.call.arguments) [13:31:20.773] } [13:31:20.773] Tweak future expression to call with '...' arguments ... DONE [13:31:20.774] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.774] [13:31:20.774] getGlobalsAndPackages() ... DONE [13:31:20.774] run() for 'Future' ... [13:31:20.775] - state: 'created' [13:31:20.775] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:20.777] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.777] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:20.778] - Field: 'label' [13:31:20.778] - Field: 'local' [13:31:20.778] - Field: 'owner' [13:31:20.778] - Field: 'envir' [13:31:20.778] - Field: 'packages' [13:31:20.778] - Field: 'gc' [13:31:20.779] - Field: 'conditions' [13:31:20.779] - Field: 'expr' [13:31:20.779] - Field: 'uuid' [13:31:20.779] - Field: 'seed' [13:31:20.779] - Field: 'version' [13:31:20.779] - Field: 'result' [13:31:20.780] - Field: 'asynchronous' [13:31:20.781] - Field: 'calls' [13:31:20.781] - Field: 'globals' [13:31:20.781] - Field: 'stdout' [13:31:20.781] - Field: 'earlySignal' [13:31:20.781] - Field: 'lazy' [13:31:20.781] - Field: 'state' [13:31:20.782] - Field: '.cluster' [13:31:20.782] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:20.782] - Launch lazy future ... [13:31:20.782] Packages needed by the future expression (n = 0): [13:31:20.782] Packages needed by future strategies (n = 0): [13:31:20.783] { [13:31:20.783] { [13:31:20.783] { [13:31:20.783] ...future.startTime <- base::Sys.time() [13:31:20.783] { [13:31:20.783] { [13:31:20.783] { [13:31:20.783] base::local({ [13:31:20.783] has_future <- base::requireNamespace("future", [13:31:20.783] quietly = TRUE) [13:31:20.783] if (has_future) { [13:31:20.783] ns <- base::getNamespace("future") [13:31:20.783] version <- ns[[".package"]][["version"]] [13:31:20.783] if (is.null(version)) [13:31:20.783] version <- utils::packageVersion("future") [13:31:20.783] } [13:31:20.783] else { [13:31:20.783] version <- NULL [13:31:20.783] } [13:31:20.783] if (!has_future || version < "1.8.0") { [13:31:20.783] info <- base::c(r_version = base::gsub("R version ", [13:31:20.783] "", base::R.version$version.string), [13:31:20.783] platform = base::sprintf("%s (%s-bit)", [13:31:20.783] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.783] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.783] "release", "version")], collapse = " "), [13:31:20.783] hostname = base::Sys.info()[["nodename"]]) [13:31:20.783] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.783] info) [13:31:20.783] info <- base::paste(info, collapse = "; ") [13:31:20.783] if (!has_future) { [13:31:20.783] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.783] info) [13:31:20.783] } [13:31:20.783] else { [13:31:20.783] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.783] info, version) [13:31:20.783] } [13:31:20.783] base::stop(msg) [13:31:20.783] } [13:31:20.783] }) [13:31:20.783] } [13:31:20.783] ...future.strategy.old <- future::plan("list") [13:31:20.783] options(future.plan = NULL) [13:31:20.783] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.783] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.783] } [13:31:20.783] ...future.workdir <- getwd() [13:31:20.783] } [13:31:20.783] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.783] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.783] } [13:31:20.783] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.783] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:20.783] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.783] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.783] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.783] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.783] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.783] base::names(...future.oldOptions)) [13:31:20.783] } [13:31:20.783] if (FALSE) { [13:31:20.783] } [13:31:20.783] else { [13:31:20.783] if (TRUE) { [13:31:20.783] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.783] open = "w") [13:31:20.783] } [13:31:20.783] else { [13:31:20.783] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.783] windows = "NUL", "/dev/null"), open = "w") [13:31:20.783] } [13:31:20.783] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.783] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.783] base::sink(type = "output", split = FALSE) [13:31:20.783] base::close(...future.stdout) [13:31:20.783] }, add = TRUE) [13:31:20.783] } [13:31:20.783] ...future.frame <- base::sys.nframe() [13:31:20.783] ...future.conditions <- base::list() [13:31:20.783] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.783] if (FALSE) { [13:31:20.783] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.783] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.783] } [13:31:20.783] ...future.result <- base::tryCatch({ [13:31:20.783] base::withCallingHandlers({ [13:31:20.783] ...future.value <- base::withVisible(base::local({ [13:31:20.783] do.call(function(...) { [13:31:20.783] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.783] if (!identical(...future.globals.maxSize.org, [13:31:20.783] ...future.globals.maxSize)) { [13:31:20.783] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.783] on.exit(options(oopts), add = TRUE) [13:31:20.783] } [13:31:20.783] { [13:31:20.783] lapply(seq_along(...future.elements_ii), [13:31:20.783] FUN = function(jj) { [13:31:20.783] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.783] ...future.FUN(...future.X_jj, ...) [13:31:20.783] }) [13:31:20.783] } [13:31:20.783] }, args = future.call.arguments) [13:31:20.783] })) [13:31:20.783] future::FutureResult(value = ...future.value$value, [13:31:20.783] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.783] ...future.rng), globalenv = if (FALSE) [13:31:20.783] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.783] ...future.globalenv.names)) [13:31:20.783] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.783] }, condition = base::local({ [13:31:20.783] c <- base::c [13:31:20.783] inherits <- base::inherits [13:31:20.783] invokeRestart <- base::invokeRestart [13:31:20.783] length <- base::length [13:31:20.783] list <- base::list [13:31:20.783] seq.int <- base::seq.int [13:31:20.783] signalCondition <- base::signalCondition [13:31:20.783] sys.calls <- base::sys.calls [13:31:20.783] `[[` <- base::`[[` [13:31:20.783] `+` <- base::`+` [13:31:20.783] `<<-` <- base::`<<-` [13:31:20.783] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.783] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.783] 3L)] [13:31:20.783] } [13:31:20.783] function(cond) { [13:31:20.783] is_error <- inherits(cond, "error") [13:31:20.783] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.783] NULL) [13:31:20.783] if (is_error) { [13:31:20.783] sessionInformation <- function() { [13:31:20.783] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.783] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.783] search = base::search(), system = base::Sys.info()) [13:31:20.783] } [13:31:20.783] ...future.conditions[[length(...future.conditions) + [13:31:20.783] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.783] cond$call), session = sessionInformation(), [13:31:20.783] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.783] signalCondition(cond) [13:31:20.783] } [13:31:20.783] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.783] signal <- FALSE && inherits(cond, character(0)) [13:31:20.783] ...future.conditions[[length(...future.conditions) + [13:31:20.783] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.783] if (FALSE && !signal) { [13:31:20.783] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.783] { [13:31:20.783] inherits <- base::inherits [13:31:20.783] invokeRestart <- base::invokeRestart [13:31:20.783] is.null <- base::is.null [13:31:20.783] muffled <- FALSE [13:31:20.783] if (inherits(cond, "message")) { [13:31:20.783] muffled <- grepl(pattern, "muffleMessage") [13:31:20.783] if (muffled) [13:31:20.783] invokeRestart("muffleMessage") [13:31:20.783] } [13:31:20.783] else if (inherits(cond, "warning")) { [13:31:20.783] muffled <- grepl(pattern, "muffleWarning") [13:31:20.783] if (muffled) [13:31:20.783] invokeRestart("muffleWarning") [13:31:20.783] } [13:31:20.783] else if (inherits(cond, "condition")) { [13:31:20.783] if (!is.null(pattern)) { [13:31:20.783] computeRestarts <- base::computeRestarts [13:31:20.783] grepl <- base::grepl [13:31:20.783] restarts <- computeRestarts(cond) [13:31:20.783] for (restart in restarts) { [13:31:20.783] name <- restart$name [13:31:20.783] if (is.null(name)) [13:31:20.783] next [13:31:20.783] if (!grepl(pattern, name)) [13:31:20.783] next [13:31:20.783] invokeRestart(restart) [13:31:20.783] muffled <- TRUE [13:31:20.783] break [13:31:20.783] } [13:31:20.783] } [13:31:20.783] } [13:31:20.783] invisible(muffled) [13:31:20.783] } [13:31:20.783] muffleCondition(cond, pattern = "^muffle") [13:31:20.783] } [13:31:20.783] } [13:31:20.783] else { [13:31:20.783] if (TRUE) { [13:31:20.783] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.783] { [13:31:20.783] inherits <- base::inherits [13:31:20.783] invokeRestart <- base::invokeRestart [13:31:20.783] is.null <- base::is.null [13:31:20.783] muffled <- FALSE [13:31:20.783] if (inherits(cond, "message")) { [13:31:20.783] muffled <- grepl(pattern, "muffleMessage") [13:31:20.783] if (muffled) [13:31:20.783] invokeRestart("muffleMessage") [13:31:20.783] } [13:31:20.783] else if (inherits(cond, "warning")) { [13:31:20.783] muffled <- grepl(pattern, "muffleWarning") [13:31:20.783] if (muffled) [13:31:20.783] invokeRestart("muffleWarning") [13:31:20.783] } [13:31:20.783] else if (inherits(cond, "condition")) { [13:31:20.783] if (!is.null(pattern)) { [13:31:20.783] computeRestarts <- base::computeRestarts [13:31:20.783] grepl <- base::grepl [13:31:20.783] restarts <- computeRestarts(cond) [13:31:20.783] for (restart in restarts) { [13:31:20.783] name <- restart$name [13:31:20.783] if (is.null(name)) [13:31:20.783] next [13:31:20.783] if (!grepl(pattern, name)) [13:31:20.783] next [13:31:20.783] invokeRestart(restart) [13:31:20.783] muffled <- TRUE [13:31:20.783] break [13:31:20.783] } [13:31:20.783] } [13:31:20.783] } [13:31:20.783] invisible(muffled) [13:31:20.783] } [13:31:20.783] muffleCondition(cond, pattern = "^muffle") [13:31:20.783] } [13:31:20.783] } [13:31:20.783] } [13:31:20.783] })) [13:31:20.783] }, error = function(ex) { [13:31:20.783] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.783] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.783] ...future.rng), started = ...future.startTime, [13:31:20.783] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.783] version = "1.8"), class = "FutureResult") [13:31:20.783] }, finally = { [13:31:20.783] if (!identical(...future.workdir, getwd())) [13:31:20.783] setwd(...future.workdir) [13:31:20.783] { [13:31:20.783] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.783] ...future.oldOptions$nwarnings <- NULL [13:31:20.783] } [13:31:20.783] base::options(...future.oldOptions) [13:31:20.783] if (.Platform$OS.type == "windows") { [13:31:20.783] old_names <- names(...future.oldEnvVars) [13:31:20.783] envs <- base::Sys.getenv() [13:31:20.783] names <- names(envs) [13:31:20.783] common <- intersect(names, old_names) [13:31:20.783] added <- setdiff(names, old_names) [13:31:20.783] removed <- setdiff(old_names, names) [13:31:20.783] changed <- common[...future.oldEnvVars[common] != [13:31:20.783] envs[common]] [13:31:20.783] NAMES <- toupper(changed) [13:31:20.783] args <- list() [13:31:20.783] for (kk in seq_along(NAMES)) { [13:31:20.783] name <- changed[[kk]] [13:31:20.783] NAME <- NAMES[[kk]] [13:31:20.783] if (name != NAME && is.element(NAME, old_names)) [13:31:20.783] next [13:31:20.783] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.783] } [13:31:20.783] NAMES <- toupper(added) [13:31:20.783] for (kk in seq_along(NAMES)) { [13:31:20.783] name <- added[[kk]] [13:31:20.783] NAME <- NAMES[[kk]] [13:31:20.783] if (name != NAME && is.element(NAME, old_names)) [13:31:20.783] next [13:31:20.783] args[[name]] <- "" [13:31:20.783] } [13:31:20.783] NAMES <- toupper(removed) [13:31:20.783] for (kk in seq_along(NAMES)) { [13:31:20.783] name <- removed[[kk]] [13:31:20.783] NAME <- NAMES[[kk]] [13:31:20.783] if (name != NAME && is.element(NAME, old_names)) [13:31:20.783] next [13:31:20.783] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.783] } [13:31:20.783] if (length(args) > 0) [13:31:20.783] base::do.call(base::Sys.setenv, args = args) [13:31:20.783] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.783] } [13:31:20.783] else { [13:31:20.783] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.783] } [13:31:20.783] { [13:31:20.783] if (base::length(...future.futureOptionsAdded) > [13:31:20.783] 0L) { [13:31:20.783] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.783] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.783] base::options(opts) [13:31:20.783] } [13:31:20.783] { [13:31:20.783] NULL [13:31:20.783] options(future.plan = NULL) [13:31:20.783] if (is.na(NA_character_)) [13:31:20.783] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.783] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.783] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.783] .init = FALSE) [13:31:20.783] } [13:31:20.783] } [13:31:20.783] } [13:31:20.783] }) [13:31:20.783] if (TRUE) { [13:31:20.783] base::sink(type = "output", split = FALSE) [13:31:20.783] if (TRUE) { [13:31:20.783] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.783] } [13:31:20.783] else { [13:31:20.783] ...future.result["stdout"] <- base::list(NULL) [13:31:20.783] } [13:31:20.783] base::close(...future.stdout) [13:31:20.783] ...future.stdout <- NULL [13:31:20.783] } [13:31:20.783] ...future.result$conditions <- ...future.conditions [13:31:20.783] ...future.result$finished <- base::Sys.time() [13:31:20.783] ...future.result [13:31:20.783] } [13:31:20.787] - Launch lazy future ... done [13:31:20.787] run() for 'MiraiFuture' ... done [13:31:20.787] Created future: [13:31:20.788] resolved() for 'MiraiFuture' ... [13:31:20.788] - state: 'running' [13:31:20.789] - run: TRUE [13:31:20.789] - result: 'NULL' [13:31:20.789] - resolved: FALSE [13:31:20.789] resolved() for 'MiraiFuture' ... done [13:31:20.787] MiraiFuture: [13:31:20.787] Label: 'future_lapply-2' [13:31:20.787] Expression: [13:31:20.787] { [13:31:20.787] do.call(function(...) { [13:31:20.787] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.787] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.787] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.787] on.exit(options(oopts), add = TRUE) [13:31:20.787] } [13:31:20.787] { [13:31:20.787] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.787] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.787] ...future.FUN(...future.X_jj, ...) [13:31:20.787] }) [13:31:20.787] } [13:31:20.787] }, args = future.call.arguments) [13:31:20.787] } [13:31:20.787] Lazy evaluation: FALSE [13:31:20.787] Asynchronous evaluation: TRUE [13:31:20.787] Local evaluation: TRUE [13:31:20.787] Environment: R_GlobalEnv [13:31:20.787] Capture standard output: TRUE [13:31:20.787] Capture condition classes: 'condition' (excluding 'nothing') [13:31:20.787] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:20.787] Packages: [13:31:20.787] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:20.787] Resolved: TRUE [13:31:20.787] Value: [13:31:20.787] Conditions captured: [13:31:20.787] Early signaling: FALSE [13:31:20.787] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:20.787] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.790] Chunk #2 of 3 ... DONE [13:31:20.790] Chunk #3 of 3 ... [13:31:20.790] - Finding globals in 'X' for chunk #3 ... [13:31:20.790] getGlobalsAndPackages() ... [13:31:20.790] Searching for globals... [13:31:20.791] [13:31:20.791] Searching for globals ... DONE [13:31:20.791] - globals: [0] [13:31:20.791] getGlobalsAndPackages() ... DONE [13:31:20.791] + additional globals found: [n=0] [13:31:20.791] + additional namespaces needed: [n=0] [13:31:20.792] - Finding globals in 'X' for chunk #3 ... DONE [13:31:20.792] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:20.792] - seeds: [13:31:20.792] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.792] getGlobalsAndPackages() ... [13:31:20.792] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.793] Resolving globals: FALSE [13:31:20.793] Tweak future expression to call with '...' arguments ... [13:31:20.793] { [13:31:20.793] do.call(function(...) { [13:31:20.793] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.793] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.793] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.793] on.exit(options(oopts), add = TRUE) [13:31:20.793] } [13:31:20.793] { [13:31:20.793] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.793] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.793] ...future.FUN(...future.X_jj, ...) [13:31:20.793] }) [13:31:20.793] } [13:31:20.793] }, args = future.call.arguments) [13:31:20.793] } [13:31:20.793] Tweak future expression to call with '...' arguments ... DONE [13:31:20.794] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.794] [13:31:20.794] getGlobalsAndPackages() ... DONE [13:31:20.794] run() for 'Future' ... [13:31:20.795] - state: 'created' [13:31:20.795] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:20.797] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.797] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:20.797] - Field: 'label' [13:31:20.798] - Field: 'local' [13:31:20.798] - Field: 'owner' [13:31:20.798] - Field: 'envir' [13:31:20.798] - Field: 'packages' [13:31:20.798] - Field: 'gc' [13:31:20.798] - Field: 'conditions' [13:31:20.799] - Field: 'expr' [13:31:20.799] - Field: 'uuid' [13:31:20.799] - Field: 'seed' [13:31:20.799] - Field: 'version' [13:31:20.799] - Field: 'result' [13:31:20.799] - Field: 'asynchronous' [13:31:20.800] - Field: 'calls' [13:31:20.800] - Field: 'globals' [13:31:20.800] - Field: 'stdout' [13:31:20.800] - Field: 'earlySignal' [13:31:20.800] - Field: 'lazy' [13:31:20.800] - Field: 'state' [13:31:20.801] - Field: '.cluster' [13:31:20.801] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:20.801] - Launch lazy future ... [13:31:20.801] Packages needed by the future expression (n = 0): [13:31:20.801] Packages needed by future strategies (n = 0): [13:31:20.802] { [13:31:20.802] { [13:31:20.802] { [13:31:20.802] ...future.startTime <- base::Sys.time() [13:31:20.802] { [13:31:20.802] { [13:31:20.802] { [13:31:20.802] base::local({ [13:31:20.802] has_future <- base::requireNamespace("future", [13:31:20.802] quietly = TRUE) [13:31:20.802] if (has_future) { [13:31:20.802] ns <- base::getNamespace("future") [13:31:20.802] version <- ns[[".package"]][["version"]] [13:31:20.802] if (is.null(version)) [13:31:20.802] version <- utils::packageVersion("future") [13:31:20.802] } [13:31:20.802] else { [13:31:20.802] version <- NULL [13:31:20.802] } [13:31:20.802] if (!has_future || version < "1.8.0") { [13:31:20.802] info <- base::c(r_version = base::gsub("R version ", [13:31:20.802] "", base::R.version$version.string), [13:31:20.802] platform = base::sprintf("%s (%s-bit)", [13:31:20.802] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.802] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.802] "release", "version")], collapse = " "), [13:31:20.802] hostname = base::Sys.info()[["nodename"]]) [13:31:20.802] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.802] info) [13:31:20.802] info <- base::paste(info, collapse = "; ") [13:31:20.802] if (!has_future) { [13:31:20.802] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.802] info) [13:31:20.802] } [13:31:20.802] else { [13:31:20.802] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.802] info, version) [13:31:20.802] } [13:31:20.802] base::stop(msg) [13:31:20.802] } [13:31:20.802] }) [13:31:20.802] } [13:31:20.802] ...future.strategy.old <- future::plan("list") [13:31:20.802] options(future.plan = NULL) [13:31:20.802] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.802] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.802] } [13:31:20.802] ...future.workdir <- getwd() [13:31:20.802] } [13:31:20.802] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.802] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.802] } [13:31:20.802] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.802] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:20.802] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.802] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.802] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.802] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.802] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.802] base::names(...future.oldOptions)) [13:31:20.802] } [13:31:20.802] if (FALSE) { [13:31:20.802] } [13:31:20.802] else { [13:31:20.802] if (TRUE) { [13:31:20.802] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.802] open = "w") [13:31:20.802] } [13:31:20.802] else { [13:31:20.802] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.802] windows = "NUL", "/dev/null"), open = "w") [13:31:20.802] } [13:31:20.802] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.802] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.802] base::sink(type = "output", split = FALSE) [13:31:20.802] base::close(...future.stdout) [13:31:20.802] }, add = TRUE) [13:31:20.802] } [13:31:20.802] ...future.frame <- base::sys.nframe() [13:31:20.802] ...future.conditions <- base::list() [13:31:20.802] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.802] if (FALSE) { [13:31:20.802] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.802] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.802] } [13:31:20.802] ...future.result <- base::tryCatch({ [13:31:20.802] base::withCallingHandlers({ [13:31:20.802] ...future.value <- base::withVisible(base::local({ [13:31:20.802] do.call(function(...) { [13:31:20.802] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.802] if (!identical(...future.globals.maxSize.org, [13:31:20.802] ...future.globals.maxSize)) { [13:31:20.802] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.802] on.exit(options(oopts), add = TRUE) [13:31:20.802] } [13:31:20.802] { [13:31:20.802] lapply(seq_along(...future.elements_ii), [13:31:20.802] FUN = function(jj) { [13:31:20.802] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.802] ...future.FUN(...future.X_jj, ...) [13:31:20.802] }) [13:31:20.802] } [13:31:20.802] }, args = future.call.arguments) [13:31:20.802] })) [13:31:20.802] future::FutureResult(value = ...future.value$value, [13:31:20.802] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.802] ...future.rng), globalenv = if (FALSE) [13:31:20.802] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.802] ...future.globalenv.names)) [13:31:20.802] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.802] }, condition = base::local({ [13:31:20.802] c <- base::c [13:31:20.802] inherits <- base::inherits [13:31:20.802] invokeRestart <- base::invokeRestart [13:31:20.802] length <- base::length [13:31:20.802] list <- base::list [13:31:20.802] seq.int <- base::seq.int [13:31:20.802] signalCondition <- base::signalCondition [13:31:20.802] sys.calls <- base::sys.calls [13:31:20.802] `[[` <- base::`[[` [13:31:20.802] `+` <- base::`+` [13:31:20.802] `<<-` <- base::`<<-` [13:31:20.802] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.802] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.802] 3L)] [13:31:20.802] } [13:31:20.802] function(cond) { [13:31:20.802] is_error <- inherits(cond, "error") [13:31:20.802] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.802] NULL) [13:31:20.802] if (is_error) { [13:31:20.802] sessionInformation <- function() { [13:31:20.802] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.802] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.802] search = base::search(), system = base::Sys.info()) [13:31:20.802] } [13:31:20.802] ...future.conditions[[length(...future.conditions) + [13:31:20.802] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.802] cond$call), session = sessionInformation(), [13:31:20.802] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.802] signalCondition(cond) [13:31:20.802] } [13:31:20.802] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.802] signal <- FALSE && inherits(cond, character(0)) [13:31:20.802] ...future.conditions[[length(...future.conditions) + [13:31:20.802] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.802] if (FALSE && !signal) { [13:31:20.802] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.802] { [13:31:20.802] inherits <- base::inherits [13:31:20.802] invokeRestart <- base::invokeRestart [13:31:20.802] is.null <- base::is.null [13:31:20.802] muffled <- FALSE [13:31:20.802] if (inherits(cond, "message")) { [13:31:20.802] muffled <- grepl(pattern, "muffleMessage") [13:31:20.802] if (muffled) [13:31:20.802] invokeRestart("muffleMessage") [13:31:20.802] } [13:31:20.802] else if (inherits(cond, "warning")) { [13:31:20.802] muffled <- grepl(pattern, "muffleWarning") [13:31:20.802] if (muffled) [13:31:20.802] invokeRestart("muffleWarning") [13:31:20.802] } [13:31:20.802] else if (inherits(cond, "condition")) { [13:31:20.802] if (!is.null(pattern)) { [13:31:20.802] computeRestarts <- base::computeRestarts [13:31:20.802] grepl <- base::grepl [13:31:20.802] restarts <- computeRestarts(cond) [13:31:20.802] for (restart in restarts) { [13:31:20.802] name <- restart$name [13:31:20.802] if (is.null(name)) [13:31:20.802] next [13:31:20.802] if (!grepl(pattern, name)) [13:31:20.802] next [13:31:20.802] invokeRestart(restart) [13:31:20.802] muffled <- TRUE [13:31:20.802] break [13:31:20.802] } [13:31:20.802] } [13:31:20.802] } [13:31:20.802] invisible(muffled) [13:31:20.802] } [13:31:20.802] muffleCondition(cond, pattern = "^muffle") [13:31:20.802] } [13:31:20.802] } [13:31:20.802] else { [13:31:20.802] if (TRUE) { [13:31:20.802] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.802] { [13:31:20.802] inherits <- base::inherits [13:31:20.802] invokeRestart <- base::invokeRestart [13:31:20.802] is.null <- base::is.null [13:31:20.802] muffled <- FALSE [13:31:20.802] if (inherits(cond, "message")) { [13:31:20.802] muffled <- grepl(pattern, "muffleMessage") [13:31:20.802] if (muffled) [13:31:20.802] invokeRestart("muffleMessage") [13:31:20.802] } [13:31:20.802] else if (inherits(cond, "warning")) { [13:31:20.802] muffled <- grepl(pattern, "muffleWarning") [13:31:20.802] if (muffled) [13:31:20.802] invokeRestart("muffleWarning") [13:31:20.802] } [13:31:20.802] else if (inherits(cond, "condition")) { [13:31:20.802] if (!is.null(pattern)) { [13:31:20.802] computeRestarts <- base::computeRestarts [13:31:20.802] grepl <- base::grepl [13:31:20.802] restarts <- computeRestarts(cond) [13:31:20.802] for (restart in restarts) { [13:31:20.802] name <- restart$name [13:31:20.802] if (is.null(name)) [13:31:20.802] next [13:31:20.802] if (!grepl(pattern, name)) [13:31:20.802] next [13:31:20.802] invokeRestart(restart) [13:31:20.802] muffled <- TRUE [13:31:20.802] break [13:31:20.802] } [13:31:20.802] } [13:31:20.802] } [13:31:20.802] invisible(muffled) [13:31:20.802] } [13:31:20.802] muffleCondition(cond, pattern = "^muffle") [13:31:20.802] } [13:31:20.802] } [13:31:20.802] } [13:31:20.802] })) [13:31:20.802] }, error = function(ex) { [13:31:20.802] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.802] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.802] ...future.rng), started = ...future.startTime, [13:31:20.802] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.802] version = "1.8"), class = "FutureResult") [13:31:20.802] }, finally = { [13:31:20.802] if (!identical(...future.workdir, getwd())) [13:31:20.802] setwd(...future.workdir) [13:31:20.802] { [13:31:20.802] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.802] ...future.oldOptions$nwarnings <- NULL [13:31:20.802] } [13:31:20.802] base::options(...future.oldOptions) [13:31:20.802] if (.Platform$OS.type == "windows") { [13:31:20.802] old_names <- names(...future.oldEnvVars) [13:31:20.802] envs <- base::Sys.getenv() [13:31:20.802] names <- names(envs) [13:31:20.802] common <- intersect(names, old_names) [13:31:20.802] added <- setdiff(names, old_names) [13:31:20.802] removed <- setdiff(old_names, names) [13:31:20.802] changed <- common[...future.oldEnvVars[common] != [13:31:20.802] envs[common]] [13:31:20.802] NAMES <- toupper(changed) [13:31:20.802] args <- list() [13:31:20.802] for (kk in seq_along(NAMES)) { [13:31:20.802] name <- changed[[kk]] [13:31:20.802] NAME <- NAMES[[kk]] [13:31:20.802] if (name != NAME && is.element(NAME, old_names)) [13:31:20.802] next [13:31:20.802] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.802] } [13:31:20.802] NAMES <- toupper(added) [13:31:20.802] for (kk in seq_along(NAMES)) { [13:31:20.802] name <- added[[kk]] [13:31:20.802] NAME <- NAMES[[kk]] [13:31:20.802] if (name != NAME && is.element(NAME, old_names)) [13:31:20.802] next [13:31:20.802] args[[name]] <- "" [13:31:20.802] } [13:31:20.802] NAMES <- toupper(removed) [13:31:20.802] for (kk in seq_along(NAMES)) { [13:31:20.802] name <- removed[[kk]] [13:31:20.802] NAME <- NAMES[[kk]] [13:31:20.802] if (name != NAME && is.element(NAME, old_names)) [13:31:20.802] next [13:31:20.802] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.802] } [13:31:20.802] if (length(args) > 0) [13:31:20.802] base::do.call(base::Sys.setenv, args = args) [13:31:20.802] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.802] } [13:31:20.802] else { [13:31:20.802] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.802] } [13:31:20.802] { [13:31:20.802] if (base::length(...future.futureOptionsAdded) > [13:31:20.802] 0L) { [13:31:20.802] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.802] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.802] base::options(opts) [13:31:20.802] } [13:31:20.802] { [13:31:20.802] NULL [13:31:20.802] options(future.plan = NULL) [13:31:20.802] if (is.na(NA_character_)) [13:31:20.802] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.802] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.802] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.802] .init = FALSE) [13:31:20.802] } [13:31:20.802] } [13:31:20.802] } [13:31:20.802] }) [13:31:20.802] if (TRUE) { [13:31:20.802] base::sink(type = "output", split = FALSE) [13:31:20.802] if (TRUE) { [13:31:20.802] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.802] } [13:31:20.802] else { [13:31:20.802] ...future.result["stdout"] <- base::list(NULL) [13:31:20.802] } [13:31:20.802] base::close(...future.stdout) [13:31:20.802] ...future.stdout <- NULL [13:31:20.802] } [13:31:20.802] ...future.result$conditions <- ...future.conditions [13:31:20.802] ...future.result$finished <- base::Sys.time() [13:31:20.802] ...future.result [13:31:20.802] } [13:31:20.806] - Launch lazy future ... done [13:31:20.806] run() for 'MiraiFuture' ... done [13:31:20.806] Created future: [13:31:20.807] resolved() for 'MiraiFuture' ... [13:31:20.808] - state: 'running' [13:31:20.808] - run: TRUE [13:31:20.808] - result: 'NULL' [13:31:20.808] - resolved: FALSE [13:31:20.808] resolved() for 'MiraiFuture' ... done [13:31:20.806] MiraiFuture: [13:31:20.806] Label: 'future_lapply-3' [13:31:20.806] Expression: [13:31:20.806] { [13:31:20.806] do.call(function(...) { [13:31:20.806] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.806] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.806] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.806] on.exit(options(oopts), add = TRUE) [13:31:20.806] } [13:31:20.806] { [13:31:20.806] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.806] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.806] ...future.FUN(...future.X_jj, ...) [13:31:20.806] }) [13:31:20.806] } [13:31:20.806] }, args = future.call.arguments) [13:31:20.806] } [13:31:20.806] Lazy evaluation: FALSE [13:31:20.806] Asynchronous evaluation: TRUE [13:31:20.806] Local evaluation: TRUE [13:31:20.806] Environment: R_GlobalEnv [13:31:20.806] Capture standard output: TRUE [13:31:20.806] Capture condition classes: 'condition' (excluding 'nothing') [13:31:20.806] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:20.806] Packages: [13:31:20.806] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:20.806] Resolved: TRUE [13:31:20.806] Value: [13:31:20.806] Conditions captured: [13:31:20.806] Early signaling: FALSE [13:31:20.806] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:20.806] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.809] Chunk #3 of 3 ... DONE [13:31:20.809] Launching 3 futures (chunks) ... DONE [13:31:20.809] Resolving 3 futures (chunks) ... [13:31:20.809] resolve() on list ... [13:31:20.809] recursive: 0 [13:31:20.810] length: 3 [13:31:20.810] [13:31:20.810] resolved() for 'MiraiFuture' ... [13:31:20.810] - state: 'running' [13:31:20.810] - run: TRUE [13:31:20.810] - result: 'NULL' [13:31:20.811] - resolved: FALSE [13:31:20.811] resolved() for 'MiraiFuture' ... done [13:31:20.811] Future #1 [13:31:20.811] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:20.811] - nx: 3 [13:31:20.812] - relay: TRUE [13:31:20.812] - stdout: TRUE [13:31:20.812] - signal: TRUE [13:31:20.812] - resignal: FALSE [13:31:20.812] - force: TRUE [13:31:20.812] - relayed: [n=3] FALSE, FALSE, FALSE [13:31:20.812] - queued futures: [n=3] FALSE, FALSE, FALSE [13:31:20.813] - until=1 [13:31:20.813] - relaying element #1 [13:31:20.814] - relayed: [n=3] TRUE, FALSE, FALSE [13:31:20.814] - queued futures: [n=3] TRUE, FALSE, FALSE [13:31:20.814] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:20.814] length: 2 (resolved future 1) [13:31:20.815] resolved() for 'MiraiFuture' ... [13:31:20.815] - state: 'running' [13:31:20.815] - run: TRUE [13:31:20.815] - result: 'NULL' [13:31:20.815] - resolved: FALSE [13:31:20.816] resolved() for 'MiraiFuture' ... done [13:31:20.816] Future #2 [13:31:20.816] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:20.816] - nx: 3 [13:31:20.816] - relay: TRUE [13:31:20.816] - stdout: TRUE [13:31:20.817] - signal: TRUE [13:31:20.817] - resignal: FALSE [13:31:20.817] - force: TRUE [13:31:20.817] - relayed: [n=3] TRUE, FALSE, FALSE [13:31:20.817] - queued futures: [n=3] TRUE, FALSE, FALSE [13:31:20.817] - until=2 [13:31:20.817] - relaying element #2 [13:31:20.818] - relayed: [n=3] TRUE, TRUE, FALSE [13:31:20.818] - queued futures: [n=3] TRUE, TRUE, FALSE [13:31:20.818] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:20.818] length: 1 (resolved future 2) [13:31:20.818] resolved() for 'MiraiFuture' ... [13:31:20.819] - state: 'running' [13:31:20.819] - run: TRUE [13:31:20.819] - result: 'NULL' [13:31:20.819] - resolved: FALSE [13:31:20.819] resolved() for 'MiraiFuture' ... done [13:31:20.819] Future #3 [13:31:20.820] signalConditionsASAP(MiraiFuture, pos=3) ... [13:31:20.820] - nx: 3 [13:31:20.820] - relay: TRUE [13:31:20.820] - stdout: TRUE [13:31:20.820] - signal: TRUE [13:31:20.820] - resignal: FALSE [13:31:20.821] - force: TRUE [13:31:20.821] - relayed: [n=3] TRUE, TRUE, FALSE [13:31:20.821] - queued futures: [n=3] TRUE, TRUE, FALSE [13:31:20.821] - until=3 [13:31:20.821] - relaying element #3 [13:31:20.821] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:20.822] - queued futures: [n=3] TRUE, TRUE, TRUE [13:31:20.822] signalConditionsASAP(MiraiFuture, pos=3) ... done [13:31:20.822] length: 0 (resolved future 3) [13:31:20.822] Relaying remaining futures [13:31:20.822] signalConditionsASAP(NULL, pos=0) ... [13:31:20.822] - nx: 3 [13:31:20.823] - relay: TRUE [13:31:20.823] - stdout: TRUE [13:31:20.823] - signal: TRUE [13:31:20.823] - resignal: FALSE [13:31:20.823] - force: TRUE [13:31:20.823] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:20.823] - queued futures: [n=3] TRUE, TRUE, TRUE - flush all [13:31:20.824] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:20.824] - queued futures: [n=3] TRUE, TRUE, TRUE [13:31:20.824] signalConditionsASAP(NULL, pos=0) ... done [13:31:20.824] resolve() on list ... DONE [13:31:20.824] - Number of value chunks collected: 3 [13:31:20.825] Resolving 3 futures (chunks) ... DONE [13:31:20.825] Reducing values from 3 chunks ... [13:31:20.825] - Number of values collected after concatenation: 3 [13:31:20.825] - Number of values expected: 3 [13:31:20.825] Reducing values from 3 chunks ... DONE [13:31:20.825] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:31:20.828] future_lapply() ... [13:31:20.828] Number of chunks: 2 [13:31:20.829] getGlobalsAndPackagesXApply() ... [13:31:20.829] - future.globals: TRUE [13:31:20.829] getGlobalsAndPackages() ... [13:31:20.829] Searching for globals... [13:31:20.830] - globals found: [2] 'FUN', '.Internal' [13:31:20.831] Searching for globals ... DONE [13:31:20.831] Resolving globals: FALSE [13:31:20.831] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:31:20.832] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:31:20.832] - globals: [1] 'FUN' [13:31:20.832] [13:31:20.832] getGlobalsAndPackages() ... DONE [13:31:20.832] - globals found/used: [n=1] 'FUN' [13:31:20.833] - needed namespaces: [n=0] [13:31:20.833] Finding globals ... DONE [13:31:20.833] - use_args: TRUE [13:31:20.833] - Getting '...' globals ... [13:31:20.833] resolve() on list ... [13:31:20.834] recursive: 0 [13:31:20.834] length: 1 [13:31:20.834] elements: '...' [13:31:20.834] length: 0 (resolved future 1) [13:31:20.834] resolve() on list ... DONE [13:31:20.834] - '...' content: [n=1] 'length' [13:31:20.835] List of 1 [13:31:20.835] $ ...:List of 1 [13:31:20.835] ..$ length: int 2 [13:31:20.835] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:20.835] - attr(*, "where")=List of 1 [13:31:20.835] ..$ ...: [13:31:20.835] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:20.835] - attr(*, "resolved")= logi TRUE [13:31:20.835] - attr(*, "total_size")= num NA [13:31:20.839] - Getting '...' globals ... DONE [13:31:20.839] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:20.839] List of 2 [13:31:20.839] $ ...future.FUN:function (mode = "logical", length = 0L) [13:31:20.839] $ ... :List of 1 [13:31:20.839] ..$ length: int 2 [13:31:20.839] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:20.839] - attr(*, "where")=List of 2 [13:31:20.839] ..$ ...future.FUN: [13:31:20.839] ..$ ... : [13:31:20.839] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:20.839] - attr(*, "resolved")= logi FALSE [13:31:20.839] - attr(*, "total_size")= num 2240 [13:31:20.843] Packages to be attached in all futures: [n=0] [13:31:20.843] getGlobalsAndPackagesXApply() ... DONE [13:31:20.844] Number of futures (= number of chunks): 2 [13:31:20.844] Launching 2 futures (chunks) ... [13:31:20.844] Chunk #1 of 2 ... [13:31:20.844] - Finding globals in 'X' for chunk #1 ... [13:31:20.844] getGlobalsAndPackages() ... [13:31:20.844] Searching for globals... [13:31:20.845] [13:31:20.845] Searching for globals ... DONE [13:31:20.845] - globals: [0] [13:31:20.845] getGlobalsAndPackages() ... DONE [13:31:20.845] + additional globals found: [n=0] [13:31:20.845] + additional namespaces needed: [n=0] [13:31:20.846] - Finding globals in 'X' for chunk #1 ... DONE [13:31:20.846] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:20.846] - seeds: [13:31:20.846] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.846] getGlobalsAndPackages() ... [13:31:20.846] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.847] Resolving globals: FALSE [13:31:20.847] Tweak future expression to call with '...' arguments ... [13:31:20.847] { [13:31:20.847] do.call(function(...) { [13:31:20.847] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.847] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.847] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.847] on.exit(options(oopts), add = TRUE) [13:31:20.847] } [13:31:20.847] { [13:31:20.847] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.847] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.847] ...future.FUN(...future.X_jj, ...) [13:31:20.847] }) [13:31:20.847] } [13:31:20.847] }, args = future.call.arguments) [13:31:20.847] } [13:31:20.848] Tweak future expression to call with '...' arguments ... DONE [13:31:20.848] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.848] [13:31:20.848] getGlobalsAndPackages() ... DONE [13:31:20.849] run() for 'Future' ... [13:31:20.849] - state: 'created' [13:31:20.849] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:20.851] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.851] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:20.852] - Field: 'label' [13:31:20.852] - Field: 'local' [13:31:20.852] - Field: 'owner' [13:31:20.852] - Field: 'envir' [13:31:20.852] - Field: 'packages' [13:31:20.852] - Field: 'gc' [13:31:20.853] - Field: 'conditions' [13:31:20.853] - Field: 'expr' [13:31:20.853] - Field: 'uuid' [13:31:20.853] - Field: 'seed' [13:31:20.853] - Field: 'version' [13:31:20.853] - Field: 'result' [13:31:20.854] - Field: 'asynchronous' [13:31:20.854] - Field: 'calls' [13:31:20.854] - Field: 'globals' [13:31:20.854] - Field: 'stdout' [13:31:20.854] - Field: 'earlySignal' [13:31:20.854] - Field: 'lazy' [13:31:20.855] - Field: 'state' [13:31:20.855] - Field: '.cluster' [13:31:20.855] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:20.855] - Launch lazy future ... [13:31:20.855] Packages needed by the future expression (n = 0): [13:31:20.856] Packages needed by future strategies (n = 0): [13:31:20.856] { [13:31:20.856] { [13:31:20.856] { [13:31:20.856] ...future.startTime <- base::Sys.time() [13:31:20.856] { [13:31:20.856] { [13:31:20.856] { [13:31:20.856] base::local({ [13:31:20.856] has_future <- base::requireNamespace("future", [13:31:20.856] quietly = TRUE) [13:31:20.856] if (has_future) { [13:31:20.856] ns <- base::getNamespace("future") [13:31:20.856] version <- ns[[".package"]][["version"]] [13:31:20.856] if (is.null(version)) [13:31:20.856] version <- utils::packageVersion("future") [13:31:20.856] } [13:31:20.856] else { [13:31:20.856] version <- NULL [13:31:20.856] } [13:31:20.856] if (!has_future || version < "1.8.0") { [13:31:20.856] info <- base::c(r_version = base::gsub("R version ", [13:31:20.856] "", base::R.version$version.string), [13:31:20.856] platform = base::sprintf("%s (%s-bit)", [13:31:20.856] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.856] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.856] "release", "version")], collapse = " "), [13:31:20.856] hostname = base::Sys.info()[["nodename"]]) [13:31:20.856] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.856] info) [13:31:20.856] info <- base::paste(info, collapse = "; ") [13:31:20.856] if (!has_future) { [13:31:20.856] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.856] info) [13:31:20.856] } [13:31:20.856] else { [13:31:20.856] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.856] info, version) [13:31:20.856] } [13:31:20.856] base::stop(msg) [13:31:20.856] } [13:31:20.856] }) [13:31:20.856] } [13:31:20.856] ...future.strategy.old <- future::plan("list") [13:31:20.856] options(future.plan = NULL) [13:31:20.856] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.856] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.856] } [13:31:20.856] ...future.workdir <- getwd() [13:31:20.856] } [13:31:20.856] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.856] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.856] } [13:31:20.856] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.856] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:20.856] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.856] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.856] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.856] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.856] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.856] base::names(...future.oldOptions)) [13:31:20.856] } [13:31:20.856] if (FALSE) { [13:31:20.856] } [13:31:20.856] else { [13:31:20.856] if (TRUE) { [13:31:20.856] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.856] open = "w") [13:31:20.856] } [13:31:20.856] else { [13:31:20.856] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.856] windows = "NUL", "/dev/null"), open = "w") [13:31:20.856] } [13:31:20.856] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.856] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.856] base::sink(type = "output", split = FALSE) [13:31:20.856] base::close(...future.stdout) [13:31:20.856] }, add = TRUE) [13:31:20.856] } [13:31:20.856] ...future.frame <- base::sys.nframe() [13:31:20.856] ...future.conditions <- base::list() [13:31:20.856] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.856] if (FALSE) { [13:31:20.856] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.856] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.856] } [13:31:20.856] ...future.result <- base::tryCatch({ [13:31:20.856] base::withCallingHandlers({ [13:31:20.856] ...future.value <- base::withVisible(base::local({ [13:31:20.856] do.call(function(...) { [13:31:20.856] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.856] if (!identical(...future.globals.maxSize.org, [13:31:20.856] ...future.globals.maxSize)) { [13:31:20.856] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.856] on.exit(options(oopts), add = TRUE) [13:31:20.856] } [13:31:20.856] { [13:31:20.856] lapply(seq_along(...future.elements_ii), [13:31:20.856] FUN = function(jj) { [13:31:20.856] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.856] ...future.FUN(...future.X_jj, ...) [13:31:20.856] }) [13:31:20.856] } [13:31:20.856] }, args = future.call.arguments) [13:31:20.856] })) [13:31:20.856] future::FutureResult(value = ...future.value$value, [13:31:20.856] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.856] ...future.rng), globalenv = if (FALSE) [13:31:20.856] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.856] ...future.globalenv.names)) [13:31:20.856] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.856] }, condition = base::local({ [13:31:20.856] c <- base::c [13:31:20.856] inherits <- base::inherits [13:31:20.856] invokeRestart <- base::invokeRestart [13:31:20.856] length <- base::length [13:31:20.856] list <- base::list [13:31:20.856] seq.int <- base::seq.int [13:31:20.856] signalCondition <- base::signalCondition [13:31:20.856] sys.calls <- base::sys.calls [13:31:20.856] `[[` <- base::`[[` [13:31:20.856] `+` <- base::`+` [13:31:20.856] `<<-` <- base::`<<-` [13:31:20.856] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.856] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.856] 3L)] [13:31:20.856] } [13:31:20.856] function(cond) { [13:31:20.856] is_error <- inherits(cond, "error") [13:31:20.856] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.856] NULL) [13:31:20.856] if (is_error) { [13:31:20.856] sessionInformation <- function() { [13:31:20.856] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.856] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.856] search = base::search(), system = base::Sys.info()) [13:31:20.856] } [13:31:20.856] ...future.conditions[[length(...future.conditions) + [13:31:20.856] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.856] cond$call), session = sessionInformation(), [13:31:20.856] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.856] signalCondition(cond) [13:31:20.856] } [13:31:20.856] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.856] signal <- FALSE && inherits(cond, character(0)) [13:31:20.856] ...future.conditions[[length(...future.conditions) + [13:31:20.856] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.856] if (FALSE && !signal) { [13:31:20.856] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.856] { [13:31:20.856] inherits <- base::inherits [13:31:20.856] invokeRestart <- base::invokeRestart [13:31:20.856] is.null <- base::is.null [13:31:20.856] muffled <- FALSE [13:31:20.856] if (inherits(cond, "message")) { [13:31:20.856] muffled <- grepl(pattern, "muffleMessage") [13:31:20.856] if (muffled) [13:31:20.856] invokeRestart("muffleMessage") [13:31:20.856] } [13:31:20.856] else if (inherits(cond, "warning")) { [13:31:20.856] muffled <- grepl(pattern, "muffleWarning") [13:31:20.856] if (muffled) [13:31:20.856] invokeRestart("muffleWarning") [13:31:20.856] } [13:31:20.856] else if (inherits(cond, "condition")) { [13:31:20.856] if (!is.null(pattern)) { [13:31:20.856] computeRestarts <- base::computeRestarts [13:31:20.856] grepl <- base::grepl [13:31:20.856] restarts <- computeRestarts(cond) [13:31:20.856] for (restart in restarts) { [13:31:20.856] name <- restart$name [13:31:20.856] if (is.null(name)) [13:31:20.856] next [13:31:20.856] if (!grepl(pattern, name)) [13:31:20.856] next [13:31:20.856] invokeRestart(restart) [13:31:20.856] muffled <- TRUE [13:31:20.856] break [13:31:20.856] } [13:31:20.856] } [13:31:20.856] } [13:31:20.856] invisible(muffled) [13:31:20.856] } [13:31:20.856] muffleCondition(cond, pattern = "^muffle") [13:31:20.856] } [13:31:20.856] } [13:31:20.856] else { [13:31:20.856] if (TRUE) { [13:31:20.856] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.856] { [13:31:20.856] inherits <- base::inherits [13:31:20.856] invokeRestart <- base::invokeRestart [13:31:20.856] is.null <- base::is.null [13:31:20.856] muffled <- FALSE [13:31:20.856] if (inherits(cond, "message")) { [13:31:20.856] muffled <- grepl(pattern, "muffleMessage") [13:31:20.856] if (muffled) [13:31:20.856] invokeRestart("muffleMessage") [13:31:20.856] } [13:31:20.856] else if (inherits(cond, "warning")) { [13:31:20.856] muffled <- grepl(pattern, "muffleWarning") [13:31:20.856] if (muffled) [13:31:20.856] invokeRestart("muffleWarning") [13:31:20.856] } [13:31:20.856] else if (inherits(cond, "condition")) { [13:31:20.856] if (!is.null(pattern)) { [13:31:20.856] computeRestarts <- base::computeRestarts [13:31:20.856] grepl <- base::grepl [13:31:20.856] restarts <- computeRestarts(cond) [13:31:20.856] for (restart in restarts) { [13:31:20.856] name <- restart$name [13:31:20.856] if (is.null(name)) [13:31:20.856] next [13:31:20.856] if (!grepl(pattern, name)) [13:31:20.856] next [13:31:20.856] invokeRestart(restart) [13:31:20.856] muffled <- TRUE [13:31:20.856] break [13:31:20.856] } [13:31:20.856] } [13:31:20.856] } [13:31:20.856] invisible(muffled) [13:31:20.856] } [13:31:20.856] muffleCondition(cond, pattern = "^muffle") [13:31:20.856] } [13:31:20.856] } [13:31:20.856] } [13:31:20.856] })) [13:31:20.856] }, error = function(ex) { [13:31:20.856] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.856] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.856] ...future.rng), started = ...future.startTime, [13:31:20.856] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.856] version = "1.8"), class = "FutureResult") [13:31:20.856] }, finally = { [13:31:20.856] if (!identical(...future.workdir, getwd())) [13:31:20.856] setwd(...future.workdir) [13:31:20.856] { [13:31:20.856] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.856] ...future.oldOptions$nwarnings <- NULL [13:31:20.856] } [13:31:20.856] base::options(...future.oldOptions) [13:31:20.856] if (.Platform$OS.type == "windows") { [13:31:20.856] old_names <- names(...future.oldEnvVars) [13:31:20.856] envs <- base::Sys.getenv() [13:31:20.856] names <- names(envs) [13:31:20.856] common <- intersect(names, old_names) [13:31:20.856] added <- setdiff(names, old_names) [13:31:20.856] removed <- setdiff(old_names, names) [13:31:20.856] changed <- common[...future.oldEnvVars[common] != [13:31:20.856] envs[common]] [13:31:20.856] NAMES <- toupper(changed) [13:31:20.856] args <- list() [13:31:20.856] for (kk in seq_along(NAMES)) { [13:31:20.856] name <- changed[[kk]] [13:31:20.856] NAME <- NAMES[[kk]] [13:31:20.856] if (name != NAME && is.element(NAME, old_names)) [13:31:20.856] next [13:31:20.856] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.856] } [13:31:20.856] NAMES <- toupper(added) [13:31:20.856] for (kk in seq_along(NAMES)) { [13:31:20.856] name <- added[[kk]] [13:31:20.856] NAME <- NAMES[[kk]] [13:31:20.856] if (name != NAME && is.element(NAME, old_names)) [13:31:20.856] next [13:31:20.856] args[[name]] <- "" [13:31:20.856] } [13:31:20.856] NAMES <- toupper(removed) [13:31:20.856] for (kk in seq_along(NAMES)) { [13:31:20.856] name <- removed[[kk]] [13:31:20.856] NAME <- NAMES[[kk]] [13:31:20.856] if (name != NAME && is.element(NAME, old_names)) [13:31:20.856] next [13:31:20.856] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.856] } [13:31:20.856] if (length(args) > 0) [13:31:20.856] base::do.call(base::Sys.setenv, args = args) [13:31:20.856] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.856] } [13:31:20.856] else { [13:31:20.856] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.856] } [13:31:20.856] { [13:31:20.856] if (base::length(...future.futureOptionsAdded) > [13:31:20.856] 0L) { [13:31:20.856] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.856] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.856] base::options(opts) [13:31:20.856] } [13:31:20.856] { [13:31:20.856] NULL [13:31:20.856] options(future.plan = NULL) [13:31:20.856] if (is.na(NA_character_)) [13:31:20.856] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.856] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.856] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.856] .init = FALSE) [13:31:20.856] } [13:31:20.856] } [13:31:20.856] } [13:31:20.856] }) [13:31:20.856] if (TRUE) { [13:31:20.856] base::sink(type = "output", split = FALSE) [13:31:20.856] if (TRUE) { [13:31:20.856] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.856] } [13:31:20.856] else { [13:31:20.856] ...future.result["stdout"] <- base::list(NULL) [13:31:20.856] } [13:31:20.856] base::close(...future.stdout) [13:31:20.856] ...future.stdout <- NULL [13:31:20.856] } [13:31:20.856] ...future.result$conditions <- ...future.conditions [13:31:20.856] ...future.result$finished <- base::Sys.time() [13:31:20.856] ...future.result [13:31:20.856] } [13:31:20.860] - Launch lazy future ... done [13:31:20.860] run() for 'MiraiFuture' ... done [13:31:20.860] Created future: [13:31:20.861] resolved() for 'MiraiFuture' ... [13:31:20.862] - state: 'running' [13:31:20.862] - run: TRUE [13:31:20.862] - result: 'NULL' [13:31:20.862] - resolved: FALSE [13:31:20.862] resolved() for 'MiraiFuture' ... done [13:31:20.861] MiraiFuture: [13:31:20.861] Label: 'future_lapply-1' [13:31:20.861] Expression: [13:31:20.861] { [13:31:20.861] do.call(function(...) { [13:31:20.861] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.861] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.861] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.861] on.exit(options(oopts), add = TRUE) [13:31:20.861] } [13:31:20.861] { [13:31:20.861] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.861] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.861] ...future.FUN(...future.X_jj, ...) [13:31:20.861] }) [13:31:20.861] } [13:31:20.861] }, args = future.call.arguments) [13:31:20.861] } [13:31:20.861] Lazy evaluation: FALSE [13:31:20.861] Asynchronous evaluation: TRUE [13:31:20.861] Local evaluation: TRUE [13:31:20.861] Environment: R_GlobalEnv [13:31:20.861] Capture standard output: TRUE [13:31:20.861] Capture condition classes: 'condition' (excluding 'nothing') [13:31:20.861] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:20.861] Packages: [13:31:20.861] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:20.861] Resolved: TRUE [13:31:20.861] Value: [13:31:20.861] Conditions captured: [13:31:20.861] Early signaling: FALSE [13:31:20.861] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:20.861] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.863] Chunk #1 of 2 ... DONE [13:31:20.863] Chunk #2 of 2 ... [13:31:20.863] - Finding globals in 'X' for chunk #2 ... [13:31:20.863] getGlobalsAndPackages() ... [13:31:20.864] Searching for globals... [13:31:20.864] [13:31:20.864] Searching for globals ... DONE [13:31:20.864] - globals: [0] [13:31:20.864] getGlobalsAndPackages() ... DONE [13:31:20.864] + additional globals found: [n=0] [13:31:20.865] + additional namespaces needed: [n=0] [13:31:20.865] - Finding globals in 'X' for chunk #2 ... DONE [13:31:20.865] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:20.866] - seeds: [13:31:20.866] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.866] getGlobalsAndPackages() ... [13:31:20.866] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.867] Resolving globals: FALSE [13:31:20.867] Tweak future expression to call with '...' arguments ... [13:31:20.867] { [13:31:20.867] do.call(function(...) { [13:31:20.867] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.867] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.867] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.867] on.exit(options(oopts), add = TRUE) [13:31:20.867] } [13:31:20.867] { [13:31:20.867] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.867] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.867] ...future.FUN(...future.X_jj, ...) [13:31:20.867] }) [13:31:20.867] } [13:31:20.867] }, args = future.call.arguments) [13:31:20.867] } [13:31:20.867] Tweak future expression to call with '...' arguments ... DONE [13:31:20.868] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.868] [13:31:20.868] getGlobalsAndPackages() ... DONE [13:31:20.869] run() for 'Future' ... [13:31:20.869] - state: 'created' [13:31:20.869] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:20.871] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.872] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:20.872] - Field: 'label' [13:31:20.872] - Field: 'local' [13:31:20.872] - Field: 'owner' [13:31:20.872] - Field: 'envir' [13:31:20.872] - Field: 'packages' [13:31:20.873] - Field: 'gc' [13:31:20.873] - Field: 'conditions' [13:31:20.873] - Field: 'expr' [13:31:20.873] - Field: 'uuid' [13:31:20.873] - Field: 'seed' [13:31:20.873] - Field: 'version' [13:31:20.874] - Field: 'result' [13:31:20.874] - Field: 'asynchronous' [13:31:20.874] - Field: 'calls' [13:31:20.874] - Field: 'globals' [13:31:20.874] - Field: 'stdout' [13:31:20.874] - Field: 'earlySignal' [13:31:20.875] - Field: 'lazy' [13:31:20.875] - Field: 'state' [13:31:20.875] - Field: '.cluster' [13:31:20.875] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:20.875] - Launch lazy future ... [13:31:20.875] Packages needed by the future expression (n = 0): [13:31:20.876] Packages needed by future strategies (n = 0): [13:31:20.876] { [13:31:20.876] { [13:31:20.876] { [13:31:20.876] ...future.startTime <- base::Sys.time() [13:31:20.876] { [13:31:20.876] { [13:31:20.876] { [13:31:20.876] base::local({ [13:31:20.876] has_future <- base::requireNamespace("future", [13:31:20.876] quietly = TRUE) [13:31:20.876] if (has_future) { [13:31:20.876] ns <- base::getNamespace("future") [13:31:20.876] version <- ns[[".package"]][["version"]] [13:31:20.876] if (is.null(version)) [13:31:20.876] version <- utils::packageVersion("future") [13:31:20.876] } [13:31:20.876] else { [13:31:20.876] version <- NULL [13:31:20.876] } [13:31:20.876] if (!has_future || version < "1.8.0") { [13:31:20.876] info <- base::c(r_version = base::gsub("R version ", [13:31:20.876] "", base::R.version$version.string), [13:31:20.876] platform = base::sprintf("%s (%s-bit)", [13:31:20.876] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.876] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.876] "release", "version")], collapse = " "), [13:31:20.876] hostname = base::Sys.info()[["nodename"]]) [13:31:20.876] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.876] info) [13:31:20.876] info <- base::paste(info, collapse = "; ") [13:31:20.876] if (!has_future) { [13:31:20.876] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.876] info) [13:31:20.876] } [13:31:20.876] else { [13:31:20.876] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.876] info, version) [13:31:20.876] } [13:31:20.876] base::stop(msg) [13:31:20.876] } [13:31:20.876] }) [13:31:20.876] } [13:31:20.876] ...future.strategy.old <- future::plan("list") [13:31:20.876] options(future.plan = NULL) [13:31:20.876] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.876] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.876] } [13:31:20.876] ...future.workdir <- getwd() [13:31:20.876] } [13:31:20.876] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.876] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.876] } [13:31:20.876] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.876] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:20.876] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.876] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.876] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.876] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.876] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.876] base::names(...future.oldOptions)) [13:31:20.876] } [13:31:20.876] if (FALSE) { [13:31:20.876] } [13:31:20.876] else { [13:31:20.876] if (TRUE) { [13:31:20.876] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.876] open = "w") [13:31:20.876] } [13:31:20.876] else { [13:31:20.876] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.876] windows = "NUL", "/dev/null"), open = "w") [13:31:20.876] } [13:31:20.876] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.876] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.876] base::sink(type = "output", split = FALSE) [13:31:20.876] base::close(...future.stdout) [13:31:20.876] }, add = TRUE) [13:31:20.876] } [13:31:20.876] ...future.frame <- base::sys.nframe() [13:31:20.876] ...future.conditions <- base::list() [13:31:20.876] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.876] if (FALSE) { [13:31:20.876] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.876] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.876] } [13:31:20.876] ...future.result <- base::tryCatch({ [13:31:20.876] base::withCallingHandlers({ [13:31:20.876] ...future.value <- base::withVisible(base::local({ [13:31:20.876] do.call(function(...) { [13:31:20.876] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.876] if (!identical(...future.globals.maxSize.org, [13:31:20.876] ...future.globals.maxSize)) { [13:31:20.876] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.876] on.exit(options(oopts), add = TRUE) [13:31:20.876] } [13:31:20.876] { [13:31:20.876] lapply(seq_along(...future.elements_ii), [13:31:20.876] FUN = function(jj) { [13:31:20.876] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.876] ...future.FUN(...future.X_jj, ...) [13:31:20.876] }) [13:31:20.876] } [13:31:20.876] }, args = future.call.arguments) [13:31:20.876] })) [13:31:20.876] future::FutureResult(value = ...future.value$value, [13:31:20.876] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.876] ...future.rng), globalenv = if (FALSE) [13:31:20.876] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.876] ...future.globalenv.names)) [13:31:20.876] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.876] }, condition = base::local({ [13:31:20.876] c <- base::c [13:31:20.876] inherits <- base::inherits [13:31:20.876] invokeRestart <- base::invokeRestart [13:31:20.876] length <- base::length [13:31:20.876] list <- base::list [13:31:20.876] seq.int <- base::seq.int [13:31:20.876] signalCondition <- base::signalCondition [13:31:20.876] sys.calls <- base::sys.calls [13:31:20.876] `[[` <- base::`[[` [13:31:20.876] `+` <- base::`+` [13:31:20.876] `<<-` <- base::`<<-` [13:31:20.876] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.876] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.876] 3L)] [13:31:20.876] } [13:31:20.876] function(cond) { [13:31:20.876] is_error <- inherits(cond, "error") [13:31:20.876] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.876] NULL) [13:31:20.876] if (is_error) { [13:31:20.876] sessionInformation <- function() { [13:31:20.876] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.876] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.876] search = base::search(), system = base::Sys.info()) [13:31:20.876] } [13:31:20.876] ...future.conditions[[length(...future.conditions) + [13:31:20.876] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.876] cond$call), session = sessionInformation(), [13:31:20.876] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.876] signalCondition(cond) [13:31:20.876] } [13:31:20.876] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.876] signal <- FALSE && inherits(cond, character(0)) [13:31:20.876] ...future.conditions[[length(...future.conditions) + [13:31:20.876] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.876] if (FALSE && !signal) { [13:31:20.876] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.876] { [13:31:20.876] inherits <- base::inherits [13:31:20.876] invokeRestart <- base::invokeRestart [13:31:20.876] is.null <- base::is.null [13:31:20.876] muffled <- FALSE [13:31:20.876] if (inherits(cond, "message")) { [13:31:20.876] muffled <- grepl(pattern, "muffleMessage") [13:31:20.876] if (muffled) [13:31:20.876] invokeRestart("muffleMessage") [13:31:20.876] } [13:31:20.876] else if (inherits(cond, "warning")) { [13:31:20.876] muffled <- grepl(pattern, "muffleWarning") [13:31:20.876] if (muffled) [13:31:20.876] invokeRestart("muffleWarning") [13:31:20.876] } [13:31:20.876] else if (inherits(cond, "condition")) { [13:31:20.876] if (!is.null(pattern)) { [13:31:20.876] computeRestarts <- base::computeRestarts [13:31:20.876] grepl <- base::grepl [13:31:20.876] restarts <- computeRestarts(cond) [13:31:20.876] for (restart in restarts) { [13:31:20.876] name <- restart$name [13:31:20.876] if (is.null(name)) [13:31:20.876] next [13:31:20.876] if (!grepl(pattern, name)) [13:31:20.876] next [13:31:20.876] invokeRestart(restart) [13:31:20.876] muffled <- TRUE [13:31:20.876] break [13:31:20.876] } [13:31:20.876] } [13:31:20.876] } [13:31:20.876] invisible(muffled) [13:31:20.876] } [13:31:20.876] muffleCondition(cond, pattern = "^muffle") [13:31:20.876] } [13:31:20.876] } [13:31:20.876] else { [13:31:20.876] if (TRUE) { [13:31:20.876] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.876] { [13:31:20.876] inherits <- base::inherits [13:31:20.876] invokeRestart <- base::invokeRestart [13:31:20.876] is.null <- base::is.null [13:31:20.876] muffled <- FALSE [13:31:20.876] if (inherits(cond, "message")) { [13:31:20.876] muffled <- grepl(pattern, "muffleMessage") [13:31:20.876] if (muffled) [13:31:20.876] invokeRestart("muffleMessage") [13:31:20.876] } [13:31:20.876] else if (inherits(cond, "warning")) { [13:31:20.876] muffled <- grepl(pattern, "muffleWarning") [13:31:20.876] if (muffled) [13:31:20.876] invokeRestart("muffleWarning") [13:31:20.876] } [13:31:20.876] else if (inherits(cond, "condition")) { [13:31:20.876] if (!is.null(pattern)) { [13:31:20.876] computeRestarts <- base::computeRestarts [13:31:20.876] grepl <- base::grepl [13:31:20.876] restarts <- computeRestarts(cond) [13:31:20.876] for (restart in restarts) { [13:31:20.876] name <- restart$name [13:31:20.876] if (is.null(name)) [13:31:20.876] next [13:31:20.876] if (!grepl(pattern, name)) [13:31:20.876] next [13:31:20.876] invokeRestart(restart) [13:31:20.876] muffled <- TRUE [13:31:20.876] break [13:31:20.876] } [13:31:20.876] } [13:31:20.876] } [13:31:20.876] invisible(muffled) [13:31:20.876] } [13:31:20.876] muffleCondition(cond, pattern = "^muffle") [13:31:20.876] } [13:31:20.876] } [13:31:20.876] } [13:31:20.876] })) [13:31:20.876] }, error = function(ex) { [13:31:20.876] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.876] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.876] ...future.rng), started = ...future.startTime, [13:31:20.876] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.876] version = "1.8"), class = "FutureResult") [13:31:20.876] }, finally = { [13:31:20.876] if (!identical(...future.workdir, getwd())) [13:31:20.876] setwd(...future.workdir) [13:31:20.876] { [13:31:20.876] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.876] ...future.oldOptions$nwarnings <- NULL [13:31:20.876] } [13:31:20.876] base::options(...future.oldOptions) [13:31:20.876] if (.Platform$OS.type == "windows") { [13:31:20.876] old_names <- names(...future.oldEnvVars) [13:31:20.876] envs <- base::Sys.getenv() [13:31:20.876] names <- names(envs) [13:31:20.876] common <- intersect(names, old_names) [13:31:20.876] added <- setdiff(names, old_names) [13:31:20.876] removed <- setdiff(old_names, names) [13:31:20.876] changed <- common[...future.oldEnvVars[common] != [13:31:20.876] envs[common]] [13:31:20.876] NAMES <- toupper(changed) [13:31:20.876] args <- list() [13:31:20.876] for (kk in seq_along(NAMES)) { [13:31:20.876] name <- changed[[kk]] [13:31:20.876] NAME <- NAMES[[kk]] [13:31:20.876] if (name != NAME && is.element(NAME, old_names)) [13:31:20.876] next [13:31:20.876] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.876] } [13:31:20.876] NAMES <- toupper(added) [13:31:20.876] for (kk in seq_along(NAMES)) { [13:31:20.876] name <- added[[kk]] [13:31:20.876] NAME <- NAMES[[kk]] [13:31:20.876] if (name != NAME && is.element(NAME, old_names)) [13:31:20.876] next [13:31:20.876] args[[name]] <- "" [13:31:20.876] } [13:31:20.876] NAMES <- toupper(removed) [13:31:20.876] for (kk in seq_along(NAMES)) { [13:31:20.876] name <- removed[[kk]] [13:31:20.876] NAME <- NAMES[[kk]] [13:31:20.876] if (name != NAME && is.element(NAME, old_names)) [13:31:20.876] next [13:31:20.876] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.876] } [13:31:20.876] if (length(args) > 0) [13:31:20.876] base::do.call(base::Sys.setenv, args = args) [13:31:20.876] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.876] } [13:31:20.876] else { [13:31:20.876] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.876] } [13:31:20.876] { [13:31:20.876] if (base::length(...future.futureOptionsAdded) > [13:31:20.876] 0L) { [13:31:20.876] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.876] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.876] base::options(opts) [13:31:20.876] } [13:31:20.876] { [13:31:20.876] NULL [13:31:20.876] options(future.plan = NULL) [13:31:20.876] if (is.na(NA_character_)) [13:31:20.876] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.876] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.876] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.876] .init = FALSE) [13:31:20.876] } [13:31:20.876] } [13:31:20.876] } [13:31:20.876] }) [13:31:20.876] if (TRUE) { [13:31:20.876] base::sink(type = "output", split = FALSE) [13:31:20.876] if (TRUE) { [13:31:20.876] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.876] } [13:31:20.876] else { [13:31:20.876] ...future.result["stdout"] <- base::list(NULL) [13:31:20.876] } [13:31:20.876] base::close(...future.stdout) [13:31:20.876] ...future.stdout <- NULL [13:31:20.876] } [13:31:20.876] ...future.result$conditions <- ...future.conditions [13:31:20.876] ...future.result$finished <- base::Sys.time() [13:31:20.876] ...future.result [13:31:20.876] } [13:31:20.880] - Launch lazy future ... done [13:31:20.880] run() for 'MiraiFuture' ... done [13:31:20.881] Created future: [13:31:20.882] resolved() for 'MiraiFuture' ... [13:31:20.882] - state: 'running' [13:31:20.882] - run: TRUE [13:31:20.882] - result: 'NULL' [13:31:20.882] - resolved: FALSE [13:31:20.883] resolved() for 'MiraiFuture' ... done [13:31:20.881] MiraiFuture: [13:31:20.881] Label: 'future_lapply-2' [13:31:20.881] Expression: [13:31:20.881] { [13:31:20.881] do.call(function(...) { [13:31:20.881] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.881] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.881] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.881] on.exit(options(oopts), add = TRUE) [13:31:20.881] } [13:31:20.881] { [13:31:20.881] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.881] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.881] ...future.FUN(...future.X_jj, ...) [13:31:20.881] }) [13:31:20.881] } [13:31:20.881] }, args = future.call.arguments) [13:31:20.881] } [13:31:20.881] Lazy evaluation: FALSE [13:31:20.881] Asynchronous evaluation: TRUE [13:31:20.881] Local evaluation: TRUE [13:31:20.881] Environment: R_GlobalEnv [13:31:20.881] Capture standard output: TRUE [13:31:20.881] Capture condition classes: 'condition' (excluding 'nothing') [13:31:20.881] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:20.881] Packages: [13:31:20.881] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:20.881] Resolved: TRUE [13:31:20.881] Value: [13:31:20.881] Conditions captured: [13:31:20.881] Early signaling: FALSE [13:31:20.881] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:20.881] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.883] Chunk #2 of 2 ... DONE [13:31:20.883] Launching 2 futures (chunks) ... DONE [13:31:20.883] Resolving 2 futures (chunks) ... [13:31:20.884] resolve() on list ... [13:31:20.884] recursive: 0 [13:31:20.884] length: 2 [13:31:20.884] [13:31:20.884] resolved() for 'MiraiFuture' ... [13:31:20.884] - state: 'running' [13:31:20.885] - run: TRUE [13:31:20.885] - result: 'NULL' [13:31:20.885] - resolved: FALSE [13:31:20.885] resolved() for 'MiraiFuture' ... done [13:31:20.885] Future #1 [13:31:20.885] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:20.886] - nx: 2 [13:31:20.886] - relay: TRUE [13:31:20.886] - stdout: TRUE [13:31:20.886] - signal: TRUE [13:31:20.886] - resignal: FALSE [13:31:20.886] - force: TRUE [13:31:20.887] - relayed: [n=2] FALSE, FALSE [13:31:20.887] - queued futures: [n=2] FALSE, FALSE [13:31:20.887] - until=1 [13:31:20.887] - relaying element #1 [13:31:20.887] - relayed: [n=2] TRUE, FALSE [13:31:20.887] - queued futures: [n=2] TRUE, FALSE [13:31:20.888] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:20.888] length: 1 (resolved future 1) [13:31:20.888] resolved() for 'MiraiFuture' ... [13:31:20.888] - state: 'running' [13:31:20.888] - run: TRUE [13:31:20.888] - result: 'NULL' [13:31:20.889] - resolved: FALSE [13:31:20.889] resolved() for 'MiraiFuture' ... done [13:31:20.889] Future #2 [13:31:20.889] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:20.889] - nx: 2 [13:31:20.890] - relay: TRUE [13:31:20.890] - stdout: TRUE [13:31:20.890] - signal: TRUE [13:31:20.890] - resignal: FALSE [13:31:20.890] - force: TRUE [13:31:20.890] - relayed: [n=2] TRUE, FALSE [13:31:20.890] - queued futures: [n=2] TRUE, FALSE [13:31:20.891] - until=2 [13:31:20.891] - relaying element #2 [13:31:20.891] - relayed: [n=2] TRUE, TRUE [13:31:20.891] - queued futures: [n=2] TRUE, TRUE [13:31:20.891] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:20.891] length: 0 (resolved future 2) [13:31:20.892] Relaying remaining futures [13:31:20.892] signalConditionsASAP(NULL, pos=0) ... [13:31:20.892] - nx: 2 [13:31:20.892] - relay: TRUE [13:31:20.892] - stdout: TRUE [13:31:20.892] - signal: TRUE [13:31:20.893] - resignal: FALSE [13:31:20.893] - force: TRUE [13:31:20.893] - relayed: [n=2] TRUE, TRUE [13:31:20.893] - queued futures: [n=2] TRUE, TRUE - flush all [13:31:20.893] - relayed: [n=2] TRUE, TRUE [13:31:20.893] - queued futures: [n=2] TRUE, TRUE [13:31:20.894] signalConditionsASAP(NULL, pos=0) ... done [13:31:20.894] resolve() on list ... DONE [13:31:20.894] - Number of value chunks collected: 2 [13:31:20.894] Resolving 2 futures (chunks) ... DONE [13:31:20.894] Reducing values from 2 chunks ... [13:31:20.894] - Number of values collected after concatenation: 3 [13:31:20.895] - Number of values expected: 3 [13:31:20.895] Reducing values from 2 chunks ... DONE [13:31:20.895] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... List of 1 $ x:List of 1 ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... List of 1 $ y0:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" [13:31:20.906] - plan('mirai_multisession') ...[13:31:20.906] plan(): Setting new future strategy stack: [13:31:20.906] List of future strategies: [13:31:20.906] 1. mirai_multisession: [13:31:20.906] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:20.906] - tweaked: FALSE [13:31:20.906] - call: plan(strategy) [13:31:20.907] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:20.907] < mirai [$data] > [13:31:20.909] getGlobalsAndPackages() ... [13:31:20.909] Not searching for globals [13:31:20.909] - globals: [0] [13:31:20.909] getGlobalsAndPackages() ... DONE [13:31:20.910] getGlobalsAndPackages() ... [13:31:20.910] [13:31:20.910] - globals: [0] [13:31:20.910] getGlobalsAndPackages() ... DONE [13:31:20.910] Packages needed by the future expression (n = 0): [13:31:20.911] Packages needed by future strategies (n = 0): [13:31:20.911] { [13:31:20.911] { [13:31:20.911] { [13:31:20.911] ...future.startTime <- base::Sys.time() [13:31:20.911] { [13:31:20.911] { [13:31:20.911] { [13:31:20.911] base::local({ [13:31:20.911] has_future <- base::requireNamespace("future", [13:31:20.911] quietly = TRUE) [13:31:20.911] if (has_future) { [13:31:20.911] ns <- base::getNamespace("future") [13:31:20.911] version <- ns[[".package"]][["version"]] [13:31:20.911] if (is.null(version)) [13:31:20.911] version <- utils::packageVersion("future") [13:31:20.911] } [13:31:20.911] else { [13:31:20.911] version <- NULL [13:31:20.911] } [13:31:20.911] if (!has_future || version < "1.8.0") { [13:31:20.911] info <- base::c(r_version = base::gsub("R version ", [13:31:20.911] "", base::R.version$version.string), [13:31:20.911] platform = base::sprintf("%s (%s-bit)", [13:31:20.911] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.911] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.911] "release", "version")], collapse = " "), [13:31:20.911] hostname = base::Sys.info()[["nodename"]]) [13:31:20.911] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.911] info) [13:31:20.911] info <- base::paste(info, collapse = "; ") [13:31:20.911] if (!has_future) { [13:31:20.911] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.911] info) [13:31:20.911] } [13:31:20.911] else { [13:31:20.911] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.911] info, version) [13:31:20.911] } [13:31:20.911] base::stop(msg) [13:31:20.911] } [13:31:20.911] }) [13:31:20.911] } [13:31:20.911] ...future.strategy.old <- future::plan("list") [13:31:20.911] options(future.plan = NULL) [13:31:20.911] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.911] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.911] } [13:31:20.911] ...future.workdir <- getwd() [13:31:20.911] } [13:31:20.911] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.911] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.911] } [13:31:20.911] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.911] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:20.911] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.911] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.911] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.911] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.911] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.911] base::names(...future.oldOptions)) [13:31:20.911] } [13:31:20.911] if (FALSE) { [13:31:20.911] } [13:31:20.911] else { [13:31:20.911] if (TRUE) { [13:31:20.911] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.911] open = "w") [13:31:20.911] } [13:31:20.911] else { [13:31:20.911] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.911] windows = "NUL", "/dev/null"), open = "w") [13:31:20.911] } [13:31:20.911] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.911] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.911] base::sink(type = "output", split = FALSE) [13:31:20.911] base::close(...future.stdout) [13:31:20.911] }, add = TRUE) [13:31:20.911] } [13:31:20.911] ...future.frame <- base::sys.nframe() [13:31:20.911] ...future.conditions <- base::list() [13:31:20.911] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.911] if (FALSE) { [13:31:20.911] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.911] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.911] } [13:31:20.911] ...future.result <- base::tryCatch({ [13:31:20.911] base::withCallingHandlers({ [13:31:20.911] ...future.value <- base::withVisible(base::local(NA)) [13:31:20.911] future::FutureResult(value = ...future.value$value, [13:31:20.911] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.911] ...future.rng), globalenv = if (FALSE) [13:31:20.911] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.911] ...future.globalenv.names)) [13:31:20.911] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.911] }, condition = base::local({ [13:31:20.911] c <- base::c [13:31:20.911] inherits <- base::inherits [13:31:20.911] invokeRestart <- base::invokeRestart [13:31:20.911] length <- base::length [13:31:20.911] list <- base::list [13:31:20.911] seq.int <- base::seq.int [13:31:20.911] signalCondition <- base::signalCondition [13:31:20.911] sys.calls <- base::sys.calls [13:31:20.911] `[[` <- base::`[[` [13:31:20.911] `+` <- base::`+` [13:31:20.911] `<<-` <- base::`<<-` [13:31:20.911] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.911] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.911] 3L)] [13:31:20.911] } [13:31:20.911] function(cond) { [13:31:20.911] is_error <- inherits(cond, "error") [13:31:20.911] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.911] NULL) [13:31:20.911] if (is_error) { [13:31:20.911] sessionInformation <- function() { [13:31:20.911] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.911] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.911] search = base::search(), system = base::Sys.info()) [13:31:20.911] } [13:31:20.911] ...future.conditions[[length(...future.conditions) + [13:31:20.911] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.911] cond$call), session = sessionInformation(), [13:31:20.911] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.911] signalCondition(cond) [13:31:20.911] } [13:31:20.911] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.911] signal <- FALSE && inherits(cond, character(0)) [13:31:20.911] ...future.conditions[[length(...future.conditions) + [13:31:20.911] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.911] if (FALSE && !signal) { [13:31:20.911] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.911] { [13:31:20.911] inherits <- base::inherits [13:31:20.911] invokeRestart <- base::invokeRestart [13:31:20.911] is.null <- base::is.null [13:31:20.911] muffled <- FALSE [13:31:20.911] if (inherits(cond, "message")) { [13:31:20.911] muffled <- grepl(pattern, "muffleMessage") [13:31:20.911] if (muffled) [13:31:20.911] invokeRestart("muffleMessage") [13:31:20.911] } [13:31:20.911] else if (inherits(cond, "warning")) { [13:31:20.911] muffled <- grepl(pattern, "muffleWarning") [13:31:20.911] if (muffled) [13:31:20.911] invokeRestart("muffleWarning") [13:31:20.911] } [13:31:20.911] else if (inherits(cond, "condition")) { [13:31:20.911] if (!is.null(pattern)) { [13:31:20.911] computeRestarts <- base::computeRestarts [13:31:20.911] grepl <- base::grepl [13:31:20.911] restarts <- computeRestarts(cond) [13:31:20.911] for (restart in restarts) { [13:31:20.911] name <- restart$name [13:31:20.911] if (is.null(name)) [13:31:20.911] next [13:31:20.911] if (!grepl(pattern, name)) [13:31:20.911] next [13:31:20.911] invokeRestart(restart) [13:31:20.911] muffled <- TRUE [13:31:20.911] break [13:31:20.911] } [13:31:20.911] } [13:31:20.911] } [13:31:20.911] invisible(muffled) [13:31:20.911] } [13:31:20.911] muffleCondition(cond, pattern = "^muffle") [13:31:20.911] } [13:31:20.911] } [13:31:20.911] else { [13:31:20.911] if (TRUE) { [13:31:20.911] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.911] { [13:31:20.911] inherits <- base::inherits [13:31:20.911] invokeRestart <- base::invokeRestart [13:31:20.911] is.null <- base::is.null [13:31:20.911] muffled <- FALSE [13:31:20.911] if (inherits(cond, "message")) { [13:31:20.911] muffled <- grepl(pattern, "muffleMessage") [13:31:20.911] if (muffled) [13:31:20.911] invokeRestart("muffleMessage") [13:31:20.911] } [13:31:20.911] else if (inherits(cond, "warning")) { [13:31:20.911] muffled <- grepl(pattern, "muffleWarning") [13:31:20.911] if (muffled) [13:31:20.911] invokeRestart("muffleWarning") [13:31:20.911] } [13:31:20.911] else if (inherits(cond, "condition")) { [13:31:20.911] if (!is.null(pattern)) { [13:31:20.911] computeRestarts <- base::computeRestarts [13:31:20.911] grepl <- base::grepl [13:31:20.911] restarts <- computeRestarts(cond) [13:31:20.911] for (restart in restarts) { [13:31:20.911] name <- restart$name [13:31:20.911] if (is.null(name)) [13:31:20.911] next [13:31:20.911] if (!grepl(pattern, name)) [13:31:20.911] next [13:31:20.911] invokeRestart(restart) [13:31:20.911] muffled <- TRUE [13:31:20.911] break [13:31:20.911] } [13:31:20.911] } [13:31:20.911] } [13:31:20.911] invisible(muffled) [13:31:20.911] } [13:31:20.911] muffleCondition(cond, pattern = "^muffle") [13:31:20.911] } [13:31:20.911] } [13:31:20.911] } [13:31:20.911] })) [13:31:20.911] }, error = function(ex) { [13:31:20.911] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.911] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.911] ...future.rng), started = ...future.startTime, [13:31:20.911] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.911] version = "1.8"), class = "FutureResult") [13:31:20.911] }, finally = { [13:31:20.911] if (!identical(...future.workdir, getwd())) [13:31:20.911] setwd(...future.workdir) [13:31:20.911] { [13:31:20.911] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.911] ...future.oldOptions$nwarnings <- NULL [13:31:20.911] } [13:31:20.911] base::options(...future.oldOptions) [13:31:20.911] if (.Platform$OS.type == "windows") { [13:31:20.911] old_names <- names(...future.oldEnvVars) [13:31:20.911] envs <- base::Sys.getenv() [13:31:20.911] names <- names(envs) [13:31:20.911] common <- intersect(names, old_names) [13:31:20.911] added <- setdiff(names, old_names) [13:31:20.911] removed <- setdiff(old_names, names) [13:31:20.911] changed <- common[...future.oldEnvVars[common] != [13:31:20.911] envs[common]] [13:31:20.911] NAMES <- toupper(changed) [13:31:20.911] args <- list() [13:31:20.911] for (kk in seq_along(NAMES)) { [13:31:20.911] name <- changed[[kk]] [13:31:20.911] NAME <- NAMES[[kk]] [13:31:20.911] if (name != NAME && is.element(NAME, old_names)) [13:31:20.911] next [13:31:20.911] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.911] } [13:31:20.911] NAMES <- toupper(added) [13:31:20.911] for (kk in seq_along(NAMES)) { [13:31:20.911] name <- added[[kk]] [13:31:20.911] NAME <- NAMES[[kk]] [13:31:20.911] if (name != NAME && is.element(NAME, old_names)) [13:31:20.911] next [13:31:20.911] args[[name]] <- "" [13:31:20.911] } [13:31:20.911] NAMES <- toupper(removed) [13:31:20.911] for (kk in seq_along(NAMES)) { [13:31:20.911] name <- removed[[kk]] [13:31:20.911] NAME <- NAMES[[kk]] [13:31:20.911] if (name != NAME && is.element(NAME, old_names)) [13:31:20.911] next [13:31:20.911] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.911] } [13:31:20.911] if (length(args) > 0) [13:31:20.911] base::do.call(base::Sys.setenv, args = args) [13:31:20.911] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.911] } [13:31:20.911] else { [13:31:20.911] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.911] } [13:31:20.911] { [13:31:20.911] if (base::length(...future.futureOptionsAdded) > [13:31:20.911] 0L) { [13:31:20.911] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.911] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.911] base::options(opts) [13:31:20.911] } [13:31:20.911] { [13:31:20.911] NULL [13:31:20.911] options(future.plan = NULL) [13:31:20.911] if (is.na(NA_character_)) [13:31:20.911] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.911] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.911] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.911] .init = FALSE) [13:31:20.911] } [13:31:20.911] } [13:31:20.911] } [13:31:20.911] }) [13:31:20.911] if (TRUE) { [13:31:20.911] base::sink(type = "output", split = FALSE) [13:31:20.911] if (TRUE) { [13:31:20.911] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.911] } [13:31:20.911] else { [13:31:20.911] ...future.result["stdout"] <- base::list(NULL) [13:31:20.911] } [13:31:20.911] base::close(...future.stdout) [13:31:20.911] ...future.stdout <- NULL [13:31:20.911] } [13:31:20.911] ...future.result$conditions <- ...future.conditions [13:31:20.911] ...future.result$finished <- base::Sys.time() [13:31:20.911] ...future.result [13:31:20.911] } [13:31:20.917] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:20.917] plan(): nbrOfWorkers() = 2 [13:31:20.918] future_lapply() ... [13:31:20.929] Number of chunks: 1 [13:31:20.930] getGlobalsAndPackagesXApply() ... [13:31:20.930] - future.globals: TRUE [13:31:20.930] getGlobalsAndPackages() ... [13:31:20.930] Searching for globals... [13:31:20.941] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:31:20.941] Searching for globals ... DONE [13:31:20.941] Resolving globals: FALSE [13:31:20.942] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:31:20.942] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [13:31:20.943] - globals: [1] 'FUN' [13:31:20.943] - packages: [1] 'future' [13:31:20.943] getGlobalsAndPackages() ... DONE [13:31:20.943] - globals found/used: [n=1] 'FUN' [13:31:20.943] - needed namespaces: [n=1] 'future' [13:31:20.943] Finding globals ... DONE [13:31:20.944] - use_args: TRUE [13:31:20.944] - Getting '...' globals ... [13:31:20.944] resolve() on list ... [13:31:20.944] recursive: 0 [13:31:20.945] length: 1 [13:31:20.945] elements: '...' [13:31:20.945] length: 0 (resolved future 1) [13:31:20.945] resolve() on list ... DONE [13:31:20.945] - '...' content: [n=2] 'collapse', 'maxHead' [13:31:20.945] List of 1 [13:31:20.945] $ ...:List of 2 [13:31:20.945] ..$ collapse: chr "; " [13:31:20.945] ..$ maxHead : int 3 [13:31:20.945] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:20.945] - attr(*, "where")=List of 1 [13:31:20.945] ..$ ...: [13:31:20.945] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:20.945] - attr(*, "resolved")= logi TRUE [13:31:20.945] - attr(*, "total_size")= num NA [13:31:20.952] - Getting '...' globals ... DONE [13:31:20.952] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:20.952] List of 2 [13:31:20.952] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:31:20.952] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:31:20.952] $ ... :List of 2 [13:31:20.952] ..$ collapse: chr "; " [13:31:20.952] ..$ maxHead : int 3 [13:31:20.952] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:20.952] - attr(*, "where")=List of 2 [13:31:20.952] ..$ ...future.FUN: [13:31:20.952] ..$ ... : [13:31:20.952] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:20.952] - attr(*, "resolved")= logi FALSE [13:31:20.952] - attr(*, "total_size")= num 71456 [13:31:20.958] Packages to be attached in all futures: [n=1] 'future' [13:31:20.959] getGlobalsAndPackagesXApply() ... DONE [13:31:20.959] Number of futures (= number of chunks): 1 [13:31:20.959] Launching 1 futures (chunks) ... [13:31:20.960] Chunk #1 of 1 ... [13:31:20.960] - Finding globals in 'X' for chunk #1 ... [13:31:20.960] getGlobalsAndPackages() ... [13:31:20.960] Searching for globals... [13:31:20.961] [13:31:20.961] Searching for globals ... DONE [13:31:20.961] - globals: [0] [13:31:20.962] getGlobalsAndPackages() ... DONE [13:31:20.962] + additional globals found: [n=0] [13:31:20.962] + additional namespaces needed: [n=0] [13:31:20.962] - Finding globals in 'X' for chunk #1 ... DONE [13:31:20.962] - seeds: [13:31:20.963] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.963] getGlobalsAndPackages() ... [13:31:20.963] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.963] Resolving globals: FALSE [13:31:20.964] Tweak future expression to call with '...' arguments ... [13:31:20.964] { [13:31:20.964] do.call(function(...) { [13:31:20.964] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.964] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.964] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.964] on.exit(options(oopts), add = TRUE) [13:31:20.964] } [13:31:20.964] { [13:31:20.964] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.964] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.964] ...future.FUN(...future.X_jj, ...) [13:31:20.964] }) [13:31:20.964] } [13:31:20.964] }, args = future.call.arguments) [13:31:20.964] } [13:31:20.964] Tweak future expression to call with '...' arguments ... DONE [13:31:20.965] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.965] - packages: [1] 'future' [13:31:20.966] getGlobalsAndPackages() ... DONE [13:31:20.966] run() for 'Future' ... [13:31:20.967] - state: 'created' [13:31:20.967] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:21.046] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.046] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:21.046] - Field: 'label' [13:31:21.046] - Field: 'local' [13:31:21.046] - Field: 'owner' [13:31:21.047] - Field: 'envir' [13:31:21.047] - Field: 'packages' [13:31:21.047] - Field: 'gc' [13:31:21.047] - Field: 'conditions' [13:31:21.047] - Field: 'expr' [13:31:21.048] - Field: 'uuid' [13:31:21.048] - Field: 'seed' [13:31:21.048] - Field: 'version' [13:31:21.048] - Field: 'result' [13:31:21.048] - Field: 'asynchronous' [13:31:21.048] - Field: 'calls' [13:31:21.049] - Field: 'globals' [13:31:21.049] - Field: 'stdout' [13:31:21.049] - Field: 'earlySignal' [13:31:21.049] - Field: 'lazy' [13:31:21.049] - Field: 'state' [13:31:21.049] - Field: '.cluster' [13:31:21.050] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:21.050] - Launch lazy future ... [13:31:21.050] Packages needed by the future expression (n = 1): 'future' [13:31:21.050] Packages needed by future strategies (n = 0): [13:31:21.051] { [13:31:21.051] { [13:31:21.051] { [13:31:21.051] ...future.startTime <- base::Sys.time() [13:31:21.051] { [13:31:21.051] { [13:31:21.051] { [13:31:21.051] { [13:31:21.051] base::local({ [13:31:21.051] has_future <- base::requireNamespace("future", [13:31:21.051] quietly = TRUE) [13:31:21.051] if (has_future) { [13:31:21.051] ns <- base::getNamespace("future") [13:31:21.051] version <- ns[[".package"]][["version"]] [13:31:21.051] if (is.null(version)) [13:31:21.051] version <- utils::packageVersion("future") [13:31:21.051] } [13:31:21.051] else { [13:31:21.051] version <- NULL [13:31:21.051] } [13:31:21.051] if (!has_future || version < "1.8.0") { [13:31:21.051] info <- base::c(r_version = base::gsub("R version ", [13:31:21.051] "", base::R.version$version.string), [13:31:21.051] platform = base::sprintf("%s (%s-bit)", [13:31:21.051] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:21.051] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:21.051] "release", "version")], collapse = " "), [13:31:21.051] hostname = base::Sys.info()[["nodename"]]) [13:31:21.051] info <- base::sprintf("%s: %s", base::names(info), [13:31:21.051] info) [13:31:21.051] info <- base::paste(info, collapse = "; ") [13:31:21.051] if (!has_future) { [13:31:21.051] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:21.051] info) [13:31:21.051] } [13:31:21.051] else { [13:31:21.051] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:21.051] info, version) [13:31:21.051] } [13:31:21.051] base::stop(msg) [13:31:21.051] } [13:31:21.051] }) [13:31:21.051] } [13:31:21.051] base::local({ [13:31:21.051] for (pkg in "future") { [13:31:21.051] base::loadNamespace(pkg) [13:31:21.051] base::library(pkg, character.only = TRUE) [13:31:21.051] } [13:31:21.051] }) [13:31:21.051] } [13:31:21.051] ...future.strategy.old <- future::plan("list") [13:31:21.051] options(future.plan = NULL) [13:31:21.051] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.051] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:21.051] } [13:31:21.051] ...future.workdir <- getwd() [13:31:21.051] } [13:31:21.051] ...future.oldOptions <- base::as.list(base::.Options) [13:31:21.051] ...future.oldEnvVars <- base::Sys.getenv() [13:31:21.051] } [13:31:21.051] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:21.051] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:21.051] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:21.051] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:21.051] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:21.051] future.stdout.windows.reencode = NULL, width = 80L) [13:31:21.051] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:21.051] base::names(...future.oldOptions)) [13:31:21.051] } [13:31:21.051] if (FALSE) { [13:31:21.051] } [13:31:21.051] else { [13:31:21.051] if (TRUE) { [13:31:21.051] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:21.051] open = "w") [13:31:21.051] } [13:31:21.051] else { [13:31:21.051] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:21.051] windows = "NUL", "/dev/null"), open = "w") [13:31:21.051] } [13:31:21.051] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:21.051] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:21.051] base::sink(type = "output", split = FALSE) [13:31:21.051] base::close(...future.stdout) [13:31:21.051] }, add = TRUE) [13:31:21.051] } [13:31:21.051] ...future.frame <- base::sys.nframe() [13:31:21.051] ...future.conditions <- base::list() [13:31:21.051] ...future.rng <- base::globalenv()$.Random.seed [13:31:21.051] if (FALSE) { [13:31:21.051] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:21.051] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:21.051] } [13:31:21.051] ...future.result <- base::tryCatch({ [13:31:21.051] base::withCallingHandlers({ [13:31:21.051] ...future.value <- base::withVisible(base::local({ [13:31:21.051] do.call(function(...) { [13:31:21.051] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.051] if (!identical(...future.globals.maxSize.org, [13:31:21.051] ...future.globals.maxSize)) { [13:31:21.051] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.051] on.exit(options(oopts), add = TRUE) [13:31:21.051] } [13:31:21.051] { [13:31:21.051] lapply(seq_along(...future.elements_ii), [13:31:21.051] FUN = function(jj) { [13:31:21.051] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.051] ...future.FUN(...future.X_jj, ...) [13:31:21.051] }) [13:31:21.051] } [13:31:21.051] }, args = future.call.arguments) [13:31:21.051] })) [13:31:21.051] future::FutureResult(value = ...future.value$value, [13:31:21.051] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.051] ...future.rng), globalenv = if (FALSE) [13:31:21.051] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:21.051] ...future.globalenv.names)) [13:31:21.051] else NULL, started = ...future.startTime, version = "1.8") [13:31:21.051] }, condition = base::local({ [13:31:21.051] c <- base::c [13:31:21.051] inherits <- base::inherits [13:31:21.051] invokeRestart <- base::invokeRestart [13:31:21.051] length <- base::length [13:31:21.051] list <- base::list [13:31:21.051] seq.int <- base::seq.int [13:31:21.051] signalCondition <- base::signalCondition [13:31:21.051] sys.calls <- base::sys.calls [13:31:21.051] `[[` <- base::`[[` [13:31:21.051] `+` <- base::`+` [13:31:21.051] `<<-` <- base::`<<-` [13:31:21.051] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:21.051] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:21.051] 3L)] [13:31:21.051] } [13:31:21.051] function(cond) { [13:31:21.051] is_error <- inherits(cond, "error") [13:31:21.051] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:21.051] NULL) [13:31:21.051] if (is_error) { [13:31:21.051] sessionInformation <- function() { [13:31:21.051] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:21.051] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:21.051] search = base::search(), system = base::Sys.info()) [13:31:21.051] } [13:31:21.051] ...future.conditions[[length(...future.conditions) + [13:31:21.051] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:21.051] cond$call), session = sessionInformation(), [13:31:21.051] timestamp = base::Sys.time(), signaled = 0L) [13:31:21.051] signalCondition(cond) [13:31:21.051] } [13:31:21.051] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:21.051] signal <- FALSE && inherits(cond, character(0)) [13:31:21.051] ...future.conditions[[length(...future.conditions) + [13:31:21.051] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:21.051] if (FALSE && !signal) { [13:31:21.051] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.051] { [13:31:21.051] inherits <- base::inherits [13:31:21.051] invokeRestart <- base::invokeRestart [13:31:21.051] is.null <- base::is.null [13:31:21.051] muffled <- FALSE [13:31:21.051] if (inherits(cond, "message")) { [13:31:21.051] muffled <- grepl(pattern, "muffleMessage") [13:31:21.051] if (muffled) [13:31:21.051] invokeRestart("muffleMessage") [13:31:21.051] } [13:31:21.051] else if (inherits(cond, "warning")) { [13:31:21.051] muffled <- grepl(pattern, "muffleWarning") [13:31:21.051] if (muffled) [13:31:21.051] invokeRestart("muffleWarning") [13:31:21.051] } [13:31:21.051] else if (inherits(cond, "condition")) { [13:31:21.051] if (!is.null(pattern)) { [13:31:21.051] computeRestarts <- base::computeRestarts [13:31:21.051] grepl <- base::grepl [13:31:21.051] restarts <- computeRestarts(cond) [13:31:21.051] for (restart in restarts) { [13:31:21.051] name <- restart$name [13:31:21.051] if (is.null(name)) [13:31:21.051] next [13:31:21.051] if (!grepl(pattern, name)) [13:31:21.051] next [13:31:21.051] invokeRestart(restart) [13:31:21.051] muffled <- TRUE [13:31:21.051] break [13:31:21.051] } [13:31:21.051] } [13:31:21.051] } [13:31:21.051] invisible(muffled) [13:31:21.051] } [13:31:21.051] muffleCondition(cond, pattern = "^muffle") [13:31:21.051] } [13:31:21.051] } [13:31:21.051] else { [13:31:21.051] if (TRUE) { [13:31:21.051] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.051] { [13:31:21.051] inherits <- base::inherits [13:31:21.051] invokeRestart <- base::invokeRestart [13:31:21.051] is.null <- base::is.null [13:31:21.051] muffled <- FALSE [13:31:21.051] if (inherits(cond, "message")) { [13:31:21.051] muffled <- grepl(pattern, "muffleMessage") [13:31:21.051] if (muffled) [13:31:21.051] invokeRestart("muffleMessage") [13:31:21.051] } [13:31:21.051] else if (inherits(cond, "warning")) { [13:31:21.051] muffled <- grepl(pattern, "muffleWarning") [13:31:21.051] if (muffled) [13:31:21.051] invokeRestart("muffleWarning") [13:31:21.051] } [13:31:21.051] else if (inherits(cond, "condition")) { [13:31:21.051] if (!is.null(pattern)) { [13:31:21.051] computeRestarts <- base::computeRestarts [13:31:21.051] grepl <- base::grepl [13:31:21.051] restarts <- computeRestarts(cond) [13:31:21.051] for (restart in restarts) { [13:31:21.051] name <- restart$name [13:31:21.051] if (is.null(name)) [13:31:21.051] next [13:31:21.051] if (!grepl(pattern, name)) [13:31:21.051] next [13:31:21.051] invokeRestart(restart) [13:31:21.051] muffled <- TRUE [13:31:21.051] break [13:31:21.051] } [13:31:21.051] } [13:31:21.051] } [13:31:21.051] invisible(muffled) [13:31:21.051] } [13:31:21.051] muffleCondition(cond, pattern = "^muffle") [13:31:21.051] } [13:31:21.051] } [13:31:21.051] } [13:31:21.051] })) [13:31:21.051] }, error = function(ex) { [13:31:21.051] base::structure(base::list(value = NULL, visible = NULL, [13:31:21.051] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.051] ...future.rng), started = ...future.startTime, [13:31:21.051] finished = Sys.time(), session_uuid = NA_character_, [13:31:21.051] version = "1.8"), class = "FutureResult") [13:31:21.051] }, finally = { [13:31:21.051] if (!identical(...future.workdir, getwd())) [13:31:21.051] setwd(...future.workdir) [13:31:21.051] { [13:31:21.051] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:21.051] ...future.oldOptions$nwarnings <- NULL [13:31:21.051] } [13:31:21.051] base::options(...future.oldOptions) [13:31:21.051] if (.Platform$OS.type == "windows") { [13:31:21.051] old_names <- names(...future.oldEnvVars) [13:31:21.051] envs <- base::Sys.getenv() [13:31:21.051] names <- names(envs) [13:31:21.051] common <- intersect(names, old_names) [13:31:21.051] added <- setdiff(names, old_names) [13:31:21.051] removed <- setdiff(old_names, names) [13:31:21.051] changed <- common[...future.oldEnvVars[common] != [13:31:21.051] envs[common]] [13:31:21.051] NAMES <- toupper(changed) [13:31:21.051] args <- list() [13:31:21.051] for (kk in seq_along(NAMES)) { [13:31:21.051] name <- changed[[kk]] [13:31:21.051] NAME <- NAMES[[kk]] [13:31:21.051] if (name != NAME && is.element(NAME, old_names)) [13:31:21.051] next [13:31:21.051] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.051] } [13:31:21.051] NAMES <- toupper(added) [13:31:21.051] for (kk in seq_along(NAMES)) { [13:31:21.051] name <- added[[kk]] [13:31:21.051] NAME <- NAMES[[kk]] [13:31:21.051] if (name != NAME && is.element(NAME, old_names)) [13:31:21.051] next [13:31:21.051] args[[name]] <- "" [13:31:21.051] } [13:31:21.051] NAMES <- toupper(removed) [13:31:21.051] for (kk in seq_along(NAMES)) { [13:31:21.051] name <- removed[[kk]] [13:31:21.051] NAME <- NAMES[[kk]] [13:31:21.051] if (name != NAME && is.element(NAME, old_names)) [13:31:21.051] next [13:31:21.051] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.051] } [13:31:21.051] if (length(args) > 0) [13:31:21.051] base::do.call(base::Sys.setenv, args = args) [13:31:21.051] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:21.051] } [13:31:21.051] else { [13:31:21.051] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:21.051] } [13:31:21.051] { [13:31:21.051] if (base::length(...future.futureOptionsAdded) > [13:31:21.051] 0L) { [13:31:21.051] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:21.051] base::names(opts) <- ...future.futureOptionsAdded [13:31:21.051] base::options(opts) [13:31:21.051] } [13:31:21.051] { [13:31:21.051] NULL [13:31:21.051] options(future.plan = NULL) [13:31:21.051] if (is.na(NA_character_)) [13:31:21.051] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.051] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:21.051] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:21.051] .init = FALSE) [13:31:21.051] } [13:31:21.051] } [13:31:21.051] } [13:31:21.051] }) [13:31:21.051] if (TRUE) { [13:31:21.051] base::sink(type = "output", split = FALSE) [13:31:21.051] if (TRUE) { [13:31:21.051] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:21.051] } [13:31:21.051] else { [13:31:21.051] ...future.result["stdout"] <- base::list(NULL) [13:31:21.051] } [13:31:21.051] base::close(...future.stdout) [13:31:21.051] ...future.stdout <- NULL [13:31:21.051] } [13:31:21.051] ...future.result$conditions <- ...future.conditions [13:31:21.051] ...future.result$finished <- base::Sys.time() [13:31:21.051] ...future.result [13:31:21.051] } [13:31:21.055] - Launch lazy future ... done [13:31:21.055] run() for 'MiraiFuture' ... done [13:31:21.056] Created future: [13:31:21.057] resolved() for 'MiraiFuture' ... [13:31:21.057] - state: 'running' [13:31:21.057] - run: TRUE [13:31:21.058] - result: 'NULL' [13:31:21.058] - resolved: FALSE [13:31:21.058] resolved() for 'MiraiFuture' ... done [13:31:21.056] MiraiFuture: [13:31:21.056] Label: 'future_lapply-1' [13:31:21.056] Expression: [13:31:21.056] { [13:31:21.056] do.call(function(...) { [13:31:21.056] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.056] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:21.056] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.056] on.exit(options(oopts), add = TRUE) [13:31:21.056] } [13:31:21.056] { [13:31:21.056] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:21.056] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.056] ...future.FUN(...future.X_jj, ...) [13:31:21.056] }) [13:31:21.056] } [13:31:21.056] }, args = future.call.arguments) [13:31:21.056] } [13:31:21.056] Lazy evaluation: FALSE [13:31:21.056] Asynchronous evaluation: TRUE [13:31:21.056] Local evaluation: TRUE [13:31:21.056] Environment: R_GlobalEnv [13:31:21.056] Capture standard output: TRUE [13:31:21.056] Capture condition classes: 'condition' (excluding 'nothing') [13:31:21.056] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:21.056] Packages: 1 packages ('future') [13:31:21.056] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:21.056] Resolved: FALSE [13:31:21.056] Value: [13:31:21.056] Conditions captured: [13:31:21.056] Early signaling: FALSE [13:31:21.056] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:21.056] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.058] Chunk #1 of 1 ... DONE [13:31:21.059] Launching 1 futures (chunks) ... DONE [13:31:21.059] Resolving 1 futures (chunks) ... [13:31:21.059] resolve() on list ... [13:31:21.059] recursive: 0 [13:31:21.059] length: 1 [13:31:21.059] [13:31:21.060] resolved() for 'MiraiFuture' ... [13:31:21.060] - state: 'running' [13:31:21.060] - run: TRUE [13:31:21.060] - result: 'NULL' [13:31:21.060] - resolved: FALSE [13:31:21.061] resolved() for 'MiraiFuture' ... done [13:31:21.080] resolved() for 'MiraiFuture' ... [13:31:21.080] - state: 'running' [13:31:21.080] - run: TRUE [13:31:21.080] - result: 'NULL' [13:31:21.080] - resolved: FALSE [13:31:21.081] resolved() for 'MiraiFuture' ... done [13:31:21.081] Future #1 [13:31:21.081] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:21.081] - nx: 1 [13:31:21.082] - relay: TRUE [13:31:21.082] - stdout: TRUE [13:31:21.082] - signal: TRUE [13:31:21.082] - resignal: FALSE [13:31:21.082] - force: TRUE [13:31:21.082] - relayed: [n=1] FALSE [13:31:21.083] - queued futures: [n=1] FALSE [13:31:21.083] - until=1 [13:31:21.083] - relaying element #1 [13:31:21.083] - relayed: [n=1] TRUE [13:31:21.083] - queued futures: [n=1] TRUE [13:31:21.084] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:21.084] length: 0 (resolved future 1) [13:31:21.084] Relaying remaining futures [13:31:21.084] signalConditionsASAP(NULL, pos=0) ... [13:31:21.084] - nx: 1 [13:31:21.084] - relay: TRUE [13:31:21.085] - stdout: TRUE [13:31:21.085] - signal: TRUE [13:31:21.085] - resignal: FALSE [13:31:21.085] - force: TRUE [13:31:21.085] - relayed: [n=1] TRUE [13:31:21.085] - queued futures: [n=1] TRUE - flush all [13:31:21.086] - relayed: [n=1] TRUE [13:31:21.086] - queued futures: [n=1] TRUE [13:31:21.086] signalConditionsASAP(NULL, pos=0) ... done [13:31:21.086] resolve() on list ... DONE [13:31:21.086] - Number of value chunks collected: 1 [13:31:21.087] Resolving 1 futures (chunks) ... DONE [13:31:21.087] Reducing values from 1 chunks ... [13:31:21.087] - Number of values collected after concatenation: 1 [13:31:21.087] - Number of values expected: 1 [13:31:21.087] Reducing values from 1 chunks ... DONE [13:31:21.088] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" [13:31:21.089] future_lapply() ... [13:31:21.100] Number of chunks: 1 [13:31:21.100] getGlobalsAndPackagesXApply() ... [13:31:21.100] - future.globals: TRUE [13:31:21.100] getGlobalsAndPackages() ... [13:31:21.101] Searching for globals... [13:31:21.113] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:31:21.113] Searching for globals ... DONE [13:31:21.113] Resolving globals: FALSE [13:31:21.114] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:31:21.115] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [13:31:21.115] - globals: [1] 'FUN' [13:31:21.115] - packages: [1] 'future' [13:31:21.116] getGlobalsAndPackages() ... DONE [13:31:21.116] - globals found/used: [n=1] 'FUN' [13:31:21.116] - needed namespaces: [n=1] 'future' [13:31:21.116] Finding globals ... DONE [13:31:21.116] - use_args: TRUE [13:31:21.117] - Getting '...' globals ... [13:31:21.117] resolve() on list ... [13:31:21.117] recursive: 0 [13:31:21.118] length: 1 [13:31:21.118] elements: '...' [13:31:21.118] length: 0 (resolved future 1) [13:31:21.118] resolve() on list ... DONE [13:31:21.118] - '...' content: [n=2] 'collapse', 'maxHead' [13:31:21.119] List of 1 [13:31:21.119] $ ...:List of 2 [13:31:21.119] ..$ collapse: chr "; " [13:31:21.119] ..$ maxHead : int 3 [13:31:21.119] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:21.119] - attr(*, "where")=List of 1 [13:31:21.119] ..$ ...: [13:31:21.119] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:21.119] - attr(*, "resolved")= logi TRUE [13:31:21.119] - attr(*, "total_size")= num NA [13:31:21.123] - Getting '...' globals ... DONE [13:31:21.124] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:21.124] List of 2 [13:31:21.124] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:31:21.124] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:31:21.124] $ ... :List of 2 [13:31:21.124] ..$ collapse: chr "; " [13:31:21.124] ..$ maxHead : int 3 [13:31:21.124] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:21.124] - attr(*, "where")=List of 2 [13:31:21.124] ..$ ...future.FUN: [13:31:21.124] ..$ ... : [13:31:21.124] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:21.124] - attr(*, "resolved")= logi FALSE [13:31:21.124] - attr(*, "total_size")= num 71456 [13:31:21.129] Packages to be attached in all futures: [n=1] 'future' [13:31:21.129] getGlobalsAndPackagesXApply() ... DONE [13:31:21.129] Number of futures (= number of chunks): 1 [13:31:21.130] Launching 1 futures (chunks) ... [13:31:21.130] Chunk #1 of 1 ... [13:31:21.130] - Finding globals in 'X' for chunk #1 ... [13:31:21.130] getGlobalsAndPackages() ... [13:31:21.130] Searching for globals... [13:31:21.131] [13:31:21.131] Searching for globals ... DONE [13:31:21.131] - globals: [0] [13:31:21.131] getGlobalsAndPackages() ... DONE [13:31:21.132] + additional globals found: [n=0] [13:31:21.132] + additional namespaces needed: [n=0] [13:31:21.132] - Finding globals in 'X' for chunk #1 ... DONE [13:31:21.132] - seeds: [13:31:21.132] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.132] getGlobalsAndPackages() ... [13:31:21.133] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.133] Resolving globals: FALSE [13:31:21.133] Tweak future expression to call with '...' arguments ... [13:31:21.133] { [13:31:21.133] do.call(function(...) { [13:31:21.133] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.133] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:21.133] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.133] on.exit(options(oopts), add = TRUE) [13:31:21.133] } [13:31:21.133] { [13:31:21.133] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:21.133] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.133] ...future.FUN(...future.X_jj, ...) [13:31:21.133] }) [13:31:21.133] } [13:31:21.133] }, args = future.call.arguments) [13:31:21.133] } [13:31:21.134] Tweak future expression to call with '...' arguments ... DONE [13:31:21.134] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.135] - packages: [1] 'future' [13:31:21.135] getGlobalsAndPackages() ... DONE [13:31:21.135] run() for 'Future' ... [13:31:21.135] - state: 'created' [13:31:21.136] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:21.139] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.139] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:21.139] - Field: 'label' [13:31:21.139] - Field: 'local' [13:31:21.139] - Field: 'owner' [13:31:21.140] - Field: 'envir' [13:31:21.140] - Field: 'packages' [13:31:21.140] - Field: 'gc' [13:31:21.140] - Field: 'conditions' [13:31:21.140] - Field: 'expr' [13:31:21.141] - Field: 'uuid' [13:31:21.141] - Field: 'seed' [13:31:21.141] - Field: 'version' [13:31:21.141] - Field: 'result' [13:31:21.141] - Field: 'asynchronous' [13:31:21.142] - Field: 'calls' [13:31:21.142] - Field: 'globals' [13:31:21.142] - Field: 'stdout' [13:31:21.142] - Field: 'earlySignal' [13:31:21.143] - Field: 'lazy' [13:31:21.143] - Field: 'state' [13:31:21.143] - Field: '.cluster' [13:31:21.143] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:21.143] - Launch lazy future ... [13:31:21.144] Packages needed by the future expression (n = 1): 'future' [13:31:21.144] Packages needed by future strategies (n = 0): [13:31:21.145] { [13:31:21.145] { [13:31:21.145] { [13:31:21.145] ...future.startTime <- base::Sys.time() [13:31:21.145] { [13:31:21.145] { [13:31:21.145] { [13:31:21.145] { [13:31:21.145] base::local({ [13:31:21.145] has_future <- base::requireNamespace("future", [13:31:21.145] quietly = TRUE) [13:31:21.145] if (has_future) { [13:31:21.145] ns <- base::getNamespace("future") [13:31:21.145] version <- ns[[".package"]][["version"]] [13:31:21.145] if (is.null(version)) [13:31:21.145] version <- utils::packageVersion("future") [13:31:21.145] } [13:31:21.145] else { [13:31:21.145] version <- NULL [13:31:21.145] } [13:31:21.145] if (!has_future || version < "1.8.0") { [13:31:21.145] info <- base::c(r_version = base::gsub("R version ", [13:31:21.145] "", base::R.version$version.string), [13:31:21.145] platform = base::sprintf("%s (%s-bit)", [13:31:21.145] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:21.145] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:21.145] "release", "version")], collapse = " "), [13:31:21.145] hostname = base::Sys.info()[["nodename"]]) [13:31:21.145] info <- base::sprintf("%s: %s", base::names(info), [13:31:21.145] info) [13:31:21.145] info <- base::paste(info, collapse = "; ") [13:31:21.145] if (!has_future) { [13:31:21.145] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:21.145] info) [13:31:21.145] } [13:31:21.145] else { [13:31:21.145] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:21.145] info, version) [13:31:21.145] } [13:31:21.145] base::stop(msg) [13:31:21.145] } [13:31:21.145] }) [13:31:21.145] } [13:31:21.145] base::local({ [13:31:21.145] for (pkg in "future") { [13:31:21.145] base::loadNamespace(pkg) [13:31:21.145] base::library(pkg, character.only = TRUE) [13:31:21.145] } [13:31:21.145] }) [13:31:21.145] } [13:31:21.145] ...future.strategy.old <- future::plan("list") [13:31:21.145] options(future.plan = NULL) [13:31:21.145] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.145] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:21.145] } [13:31:21.145] ...future.workdir <- getwd() [13:31:21.145] } [13:31:21.145] ...future.oldOptions <- base::as.list(base::.Options) [13:31:21.145] ...future.oldEnvVars <- base::Sys.getenv() [13:31:21.145] } [13:31:21.145] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:21.145] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:21.145] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:21.145] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:21.145] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:21.145] future.stdout.windows.reencode = NULL, width = 80L) [13:31:21.145] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:21.145] base::names(...future.oldOptions)) [13:31:21.145] } [13:31:21.145] if (FALSE) { [13:31:21.145] } [13:31:21.145] else { [13:31:21.145] if (TRUE) { [13:31:21.145] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:21.145] open = "w") [13:31:21.145] } [13:31:21.145] else { [13:31:21.145] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:21.145] windows = "NUL", "/dev/null"), open = "w") [13:31:21.145] } [13:31:21.145] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:21.145] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:21.145] base::sink(type = "output", split = FALSE) [13:31:21.145] base::close(...future.stdout) [13:31:21.145] }, add = TRUE) [13:31:21.145] } [13:31:21.145] ...future.frame <- base::sys.nframe() [13:31:21.145] ...future.conditions <- base::list() [13:31:21.145] ...future.rng <- base::globalenv()$.Random.seed [13:31:21.145] if (FALSE) { [13:31:21.145] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:21.145] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:21.145] } [13:31:21.145] ...future.result <- base::tryCatch({ [13:31:21.145] base::withCallingHandlers({ [13:31:21.145] ...future.value <- base::withVisible(base::local({ [13:31:21.145] do.call(function(...) { [13:31:21.145] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.145] if (!identical(...future.globals.maxSize.org, [13:31:21.145] ...future.globals.maxSize)) { [13:31:21.145] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.145] on.exit(options(oopts), add = TRUE) [13:31:21.145] } [13:31:21.145] { [13:31:21.145] lapply(seq_along(...future.elements_ii), [13:31:21.145] FUN = function(jj) { [13:31:21.145] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.145] ...future.FUN(...future.X_jj, ...) [13:31:21.145] }) [13:31:21.145] } [13:31:21.145] }, args = future.call.arguments) [13:31:21.145] })) [13:31:21.145] future::FutureResult(value = ...future.value$value, [13:31:21.145] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.145] ...future.rng), globalenv = if (FALSE) [13:31:21.145] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:21.145] ...future.globalenv.names)) [13:31:21.145] else NULL, started = ...future.startTime, version = "1.8") [13:31:21.145] }, condition = base::local({ [13:31:21.145] c <- base::c [13:31:21.145] inherits <- base::inherits [13:31:21.145] invokeRestart <- base::invokeRestart [13:31:21.145] length <- base::length [13:31:21.145] list <- base::list [13:31:21.145] seq.int <- base::seq.int [13:31:21.145] signalCondition <- base::signalCondition [13:31:21.145] sys.calls <- base::sys.calls [13:31:21.145] `[[` <- base::`[[` [13:31:21.145] `+` <- base::`+` [13:31:21.145] `<<-` <- base::`<<-` [13:31:21.145] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:21.145] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:21.145] 3L)] [13:31:21.145] } [13:31:21.145] function(cond) { [13:31:21.145] is_error <- inherits(cond, "error") [13:31:21.145] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:21.145] NULL) [13:31:21.145] if (is_error) { [13:31:21.145] sessionInformation <- function() { [13:31:21.145] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:21.145] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:21.145] search = base::search(), system = base::Sys.info()) [13:31:21.145] } [13:31:21.145] ...future.conditions[[length(...future.conditions) + [13:31:21.145] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:21.145] cond$call), session = sessionInformation(), [13:31:21.145] timestamp = base::Sys.time(), signaled = 0L) [13:31:21.145] signalCondition(cond) [13:31:21.145] } [13:31:21.145] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:21.145] signal <- FALSE && inherits(cond, character(0)) [13:31:21.145] ...future.conditions[[length(...future.conditions) + [13:31:21.145] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:21.145] if (FALSE && !signal) { [13:31:21.145] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.145] { [13:31:21.145] inherits <- base::inherits [13:31:21.145] invokeRestart <- base::invokeRestart [13:31:21.145] is.null <- base::is.null [13:31:21.145] muffled <- FALSE [13:31:21.145] if (inherits(cond, "message")) { [13:31:21.145] muffled <- grepl(pattern, "muffleMessage") [13:31:21.145] if (muffled) [13:31:21.145] invokeRestart("muffleMessage") [13:31:21.145] } [13:31:21.145] else if (inherits(cond, "warning")) { [13:31:21.145] muffled <- grepl(pattern, "muffleWarning") [13:31:21.145] if (muffled) [13:31:21.145] invokeRestart("muffleWarning") [13:31:21.145] } [13:31:21.145] else if (inherits(cond, "condition")) { [13:31:21.145] if (!is.null(pattern)) { [13:31:21.145] computeRestarts <- base::computeRestarts [13:31:21.145] grepl <- base::grepl [13:31:21.145] restarts <- computeRestarts(cond) [13:31:21.145] for (restart in restarts) { [13:31:21.145] name <- restart$name [13:31:21.145] if (is.null(name)) [13:31:21.145] next [13:31:21.145] if (!grepl(pattern, name)) [13:31:21.145] next [13:31:21.145] invokeRestart(restart) [13:31:21.145] muffled <- TRUE [13:31:21.145] break [13:31:21.145] } [13:31:21.145] } [13:31:21.145] } [13:31:21.145] invisible(muffled) [13:31:21.145] } [13:31:21.145] muffleCondition(cond, pattern = "^muffle") [13:31:21.145] } [13:31:21.145] } [13:31:21.145] else { [13:31:21.145] if (TRUE) { [13:31:21.145] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.145] { [13:31:21.145] inherits <- base::inherits [13:31:21.145] invokeRestart <- base::invokeRestart [13:31:21.145] is.null <- base::is.null [13:31:21.145] muffled <- FALSE [13:31:21.145] if (inherits(cond, "message")) { [13:31:21.145] muffled <- grepl(pattern, "muffleMessage") [13:31:21.145] if (muffled) [13:31:21.145] invokeRestart("muffleMessage") [13:31:21.145] } [13:31:21.145] else if (inherits(cond, "warning")) { [13:31:21.145] muffled <- grepl(pattern, "muffleWarning") [13:31:21.145] if (muffled) [13:31:21.145] invokeRestart("muffleWarning") [13:31:21.145] } [13:31:21.145] else if (inherits(cond, "condition")) { [13:31:21.145] if (!is.null(pattern)) { [13:31:21.145] computeRestarts <- base::computeRestarts [13:31:21.145] grepl <- base::grepl [13:31:21.145] restarts <- computeRestarts(cond) [13:31:21.145] for (restart in restarts) { [13:31:21.145] name <- restart$name [13:31:21.145] if (is.null(name)) [13:31:21.145] next [13:31:21.145] if (!grepl(pattern, name)) [13:31:21.145] next [13:31:21.145] invokeRestart(restart) [13:31:21.145] muffled <- TRUE [13:31:21.145] break [13:31:21.145] } [13:31:21.145] } [13:31:21.145] } [13:31:21.145] invisible(muffled) [13:31:21.145] } [13:31:21.145] muffleCondition(cond, pattern = "^muffle") [13:31:21.145] } [13:31:21.145] } [13:31:21.145] } [13:31:21.145] })) [13:31:21.145] }, error = function(ex) { [13:31:21.145] base::structure(base::list(value = NULL, visible = NULL, [13:31:21.145] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.145] ...future.rng), started = ...future.startTime, [13:31:21.145] finished = Sys.time(), session_uuid = NA_character_, [13:31:21.145] version = "1.8"), class = "FutureResult") [13:31:21.145] }, finally = { [13:31:21.145] if (!identical(...future.workdir, getwd())) [13:31:21.145] setwd(...future.workdir) [13:31:21.145] { [13:31:21.145] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:21.145] ...future.oldOptions$nwarnings <- NULL [13:31:21.145] } [13:31:21.145] base::options(...future.oldOptions) [13:31:21.145] if (.Platform$OS.type == "windows") { [13:31:21.145] old_names <- names(...future.oldEnvVars) [13:31:21.145] envs <- base::Sys.getenv() [13:31:21.145] names <- names(envs) [13:31:21.145] common <- intersect(names, old_names) [13:31:21.145] added <- setdiff(names, old_names) [13:31:21.145] removed <- setdiff(old_names, names) [13:31:21.145] changed <- common[...future.oldEnvVars[common] != [13:31:21.145] envs[common]] [13:31:21.145] NAMES <- toupper(changed) [13:31:21.145] args <- list() [13:31:21.145] for (kk in seq_along(NAMES)) { [13:31:21.145] name <- changed[[kk]] [13:31:21.145] NAME <- NAMES[[kk]] [13:31:21.145] if (name != NAME && is.element(NAME, old_names)) [13:31:21.145] next [13:31:21.145] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.145] } [13:31:21.145] NAMES <- toupper(added) [13:31:21.145] for (kk in seq_along(NAMES)) { [13:31:21.145] name <- added[[kk]] [13:31:21.145] NAME <- NAMES[[kk]] [13:31:21.145] if (name != NAME && is.element(NAME, old_names)) [13:31:21.145] next [13:31:21.145] args[[name]] <- "" [13:31:21.145] } [13:31:21.145] NAMES <- toupper(removed) [13:31:21.145] for (kk in seq_along(NAMES)) { [13:31:21.145] name <- removed[[kk]] [13:31:21.145] NAME <- NAMES[[kk]] [13:31:21.145] if (name != NAME && is.element(NAME, old_names)) [13:31:21.145] next [13:31:21.145] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.145] } [13:31:21.145] if (length(args) > 0) [13:31:21.145] base::do.call(base::Sys.setenv, args = args) [13:31:21.145] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:21.145] } [13:31:21.145] else { [13:31:21.145] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:21.145] } [13:31:21.145] { [13:31:21.145] if (base::length(...future.futureOptionsAdded) > [13:31:21.145] 0L) { [13:31:21.145] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:21.145] base::names(opts) <- ...future.futureOptionsAdded [13:31:21.145] base::options(opts) [13:31:21.145] } [13:31:21.145] { [13:31:21.145] NULL [13:31:21.145] options(future.plan = NULL) [13:31:21.145] if (is.na(NA_character_)) [13:31:21.145] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.145] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:21.145] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:21.145] .init = FALSE) [13:31:21.145] } [13:31:21.145] } [13:31:21.145] } [13:31:21.145] }) [13:31:21.145] if (TRUE) { [13:31:21.145] base::sink(type = "output", split = FALSE) [13:31:21.145] if (TRUE) { [13:31:21.145] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:21.145] } [13:31:21.145] else { [13:31:21.145] ...future.result["stdout"] <- base::list(NULL) [13:31:21.145] } [13:31:21.145] base::close(...future.stdout) [13:31:21.145] ...future.stdout <- NULL [13:31:21.145] } [13:31:21.145] ...future.result$conditions <- ...future.conditions [13:31:21.145] ...future.result$finished <- base::Sys.time() [13:31:21.145] ...future.result [13:31:21.145] } [13:31:21.149] - Launch lazy future ... done [13:31:21.150] run() for 'MiraiFuture' ... done [13:31:21.150] Created future: [13:31:21.152] resolved() for 'MiraiFuture' ... [13:31:21.152] - state: 'running' [13:31:21.152] - run: TRUE [13:31:21.152] - result: 'NULL' [13:31:21.152] - resolved: FALSE [13:31:21.153] resolved() for 'MiraiFuture' ... done [13:31:21.150] MiraiFuture: [13:31:21.150] Label: 'future_lapply-1' [13:31:21.150] Expression: [13:31:21.150] { [13:31:21.150] do.call(function(...) { [13:31:21.150] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.150] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:21.150] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.150] on.exit(options(oopts), add = TRUE) [13:31:21.150] } [13:31:21.150] { [13:31:21.150] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:21.150] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.150] ...future.FUN(...future.X_jj, ...) [13:31:21.150] }) [13:31:21.150] } [13:31:21.150] }, args = future.call.arguments) [13:31:21.150] } [13:31:21.150] Lazy evaluation: FALSE [13:31:21.150] Asynchronous evaluation: TRUE [13:31:21.150] Local evaluation: TRUE [13:31:21.150] Environment: R_GlobalEnv [13:31:21.150] Capture standard output: TRUE [13:31:21.150] Capture condition classes: 'condition' (excluding 'nothing') [13:31:21.150] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:21.150] Packages: 1 packages ('future') [13:31:21.150] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:21.150] Resolved: FALSE [13:31:21.150] Value: [13:31:21.150] Conditions captured: [13:31:21.150] Early signaling: FALSE [13:31:21.150] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:21.150] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.153] Chunk #1 of 1 ... DONE [13:31:21.153] Launching 1 futures (chunks) ... DONE [13:31:21.154] Resolving 1 futures (chunks) ... [13:31:21.154] resolve() on list ... [13:31:21.154] recursive: 0 [13:31:21.154] length: 1 [13:31:21.154] [13:31:21.155] resolved() for 'MiraiFuture' ... [13:31:21.155] - state: 'running' [13:31:21.155] - run: TRUE [13:31:21.155] - result: 'NULL' [13:31:21.155] - resolved: FALSE [13:31:21.156] resolved() for 'MiraiFuture' ... done [13:31:21.173] resolved() for 'MiraiFuture' ... [13:31:21.174] - state: 'running' [13:31:21.174] - run: TRUE [13:31:21.174] - result: 'NULL' [13:31:21.174] - resolved: FALSE [13:31:21.174] resolved() for 'MiraiFuture' ... done [13:31:21.175] Future #1 [13:31:21.175] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:21.175] - nx: 1 [13:31:21.175] - relay: TRUE [13:31:21.175] - stdout: TRUE [13:31:21.176] - signal: TRUE [13:31:21.176] - resignal: FALSE [13:31:21.176] - force: TRUE [13:31:21.176] - relayed: [n=1] FALSE [13:31:21.176] - queued futures: [n=1] FALSE [13:31:21.177] - until=1 [13:31:21.177] - relaying element #1 [13:31:21.177] - relayed: [n=1] TRUE [13:31:21.177] - queued futures: [n=1] TRUE [13:31:21.177] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:21.178] length: 0 (resolved future 1) [13:31:21.178] Relaying remaining futures [13:31:21.178] signalConditionsASAP(NULL, pos=0) ... [13:31:21.178] - nx: 1 [13:31:21.178] - relay: TRUE [13:31:21.179] - stdout: TRUE [13:31:21.179] - signal: TRUE [13:31:21.179] - resignal: FALSE [13:31:21.179] - force: TRUE [13:31:21.179] - relayed: [n=1] TRUE [13:31:21.179] - queued futures: [n=1] TRUE - flush all [13:31:21.180] - relayed: [n=1] TRUE [13:31:21.180] - queued futures: [n=1] TRUE [13:31:21.180] signalConditionsASAP(NULL, pos=0) ... done [13:31:21.180] resolve() on list ... DONE [13:31:21.180] - Number of value chunks collected: 1 [13:31:21.181] Resolving 1 futures (chunks) ... DONE [13:31:21.181] Reducing values from 1 chunks ... [13:31:21.181] - Number of values collected after concatenation: 1 [13:31:21.181] - Number of values expected: 1 [13:31:21.181] Reducing values from 1 chunks ... DONE [13:31:21.181] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... $a A 'listenv' vector with 1 element ('A'). $b A 'listenv' vector with 2 elements ('A', 'B'). List of 1 $ y0:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" [13:31:21.194] - plan('mirai_multisession') ...[13:31:21.194] plan(): Setting new future strategy stack: [13:31:21.194] List of future strategies: [13:31:21.194] 1. mirai_multisession: [13:31:21.194] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:21.194] - tweaked: FALSE [13:31:21.194] - call: plan(strategy) [13:31:21.195] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:21.195] < mirai [$data] > [13:31:21.198] getGlobalsAndPackages() ... [13:31:21.198] Not searching for globals [13:31:21.199] - globals: [0] [13:31:21.199] getGlobalsAndPackages() ... DONE [13:31:21.199] getGlobalsAndPackages() ... [13:31:21.199] [13:31:21.199] - globals: [0] [13:31:21.200] getGlobalsAndPackages() ... DONE [13:31:21.200] Packages needed by the future expression (n = 0): [13:31:21.200] Packages needed by future strategies (n = 0): [13:31:21.201] { [13:31:21.201] { [13:31:21.201] { [13:31:21.201] ...future.startTime <- base::Sys.time() [13:31:21.201] { [13:31:21.201] { [13:31:21.201] { [13:31:21.201] base::local({ [13:31:21.201] has_future <- base::requireNamespace("future", [13:31:21.201] quietly = TRUE) [13:31:21.201] if (has_future) { [13:31:21.201] ns <- base::getNamespace("future") [13:31:21.201] version <- ns[[".package"]][["version"]] [13:31:21.201] if (is.null(version)) [13:31:21.201] version <- utils::packageVersion("future") [13:31:21.201] } [13:31:21.201] else { [13:31:21.201] version <- NULL [13:31:21.201] } [13:31:21.201] if (!has_future || version < "1.8.0") { [13:31:21.201] info <- base::c(r_version = base::gsub("R version ", [13:31:21.201] "", base::R.version$version.string), [13:31:21.201] platform = base::sprintf("%s (%s-bit)", [13:31:21.201] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:21.201] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:21.201] "release", "version")], collapse = " "), [13:31:21.201] hostname = base::Sys.info()[["nodename"]]) [13:31:21.201] info <- base::sprintf("%s: %s", base::names(info), [13:31:21.201] info) [13:31:21.201] info <- base::paste(info, collapse = "; ") [13:31:21.201] if (!has_future) { [13:31:21.201] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:21.201] info) [13:31:21.201] } [13:31:21.201] else { [13:31:21.201] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:21.201] info, version) [13:31:21.201] } [13:31:21.201] base::stop(msg) [13:31:21.201] } [13:31:21.201] }) [13:31:21.201] } [13:31:21.201] ...future.strategy.old <- future::plan("list") [13:31:21.201] options(future.plan = NULL) [13:31:21.201] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.201] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:21.201] } [13:31:21.201] ...future.workdir <- getwd() [13:31:21.201] } [13:31:21.201] ...future.oldOptions <- base::as.list(base::.Options) [13:31:21.201] ...future.oldEnvVars <- base::Sys.getenv() [13:31:21.201] } [13:31:21.201] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:21.201] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:21.201] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:21.201] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:21.201] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:21.201] future.stdout.windows.reencode = NULL, width = 80L) [13:31:21.201] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:21.201] base::names(...future.oldOptions)) [13:31:21.201] } [13:31:21.201] if (FALSE) { [13:31:21.201] } [13:31:21.201] else { [13:31:21.201] if (TRUE) { [13:31:21.201] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:21.201] open = "w") [13:31:21.201] } [13:31:21.201] else { [13:31:21.201] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:21.201] windows = "NUL", "/dev/null"), open = "w") [13:31:21.201] } [13:31:21.201] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:21.201] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:21.201] base::sink(type = "output", split = FALSE) [13:31:21.201] base::close(...future.stdout) [13:31:21.201] }, add = TRUE) [13:31:21.201] } [13:31:21.201] ...future.frame <- base::sys.nframe() [13:31:21.201] ...future.conditions <- base::list() [13:31:21.201] ...future.rng <- base::globalenv()$.Random.seed [13:31:21.201] if (FALSE) { [13:31:21.201] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:21.201] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:21.201] } [13:31:21.201] ...future.result <- base::tryCatch({ [13:31:21.201] base::withCallingHandlers({ [13:31:21.201] ...future.value <- base::withVisible(base::local(NA)) [13:31:21.201] future::FutureResult(value = ...future.value$value, [13:31:21.201] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.201] ...future.rng), globalenv = if (FALSE) [13:31:21.201] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:21.201] ...future.globalenv.names)) [13:31:21.201] else NULL, started = ...future.startTime, version = "1.8") [13:31:21.201] }, condition = base::local({ [13:31:21.201] c <- base::c [13:31:21.201] inherits <- base::inherits [13:31:21.201] invokeRestart <- base::invokeRestart [13:31:21.201] length <- base::length [13:31:21.201] list <- base::list [13:31:21.201] seq.int <- base::seq.int [13:31:21.201] signalCondition <- base::signalCondition [13:31:21.201] sys.calls <- base::sys.calls [13:31:21.201] `[[` <- base::`[[` [13:31:21.201] `+` <- base::`+` [13:31:21.201] `<<-` <- base::`<<-` [13:31:21.201] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:21.201] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:21.201] 3L)] [13:31:21.201] } [13:31:21.201] function(cond) { [13:31:21.201] is_error <- inherits(cond, "error") [13:31:21.201] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:21.201] NULL) [13:31:21.201] if (is_error) { [13:31:21.201] sessionInformation <- function() { [13:31:21.201] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:21.201] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:21.201] search = base::search(), system = base::Sys.info()) [13:31:21.201] } [13:31:21.201] ...future.conditions[[length(...future.conditions) + [13:31:21.201] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:21.201] cond$call), session = sessionInformation(), [13:31:21.201] timestamp = base::Sys.time(), signaled = 0L) [13:31:21.201] signalCondition(cond) [13:31:21.201] } [13:31:21.201] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:21.201] signal <- FALSE && inherits(cond, character(0)) [13:31:21.201] ...future.conditions[[length(...future.conditions) + [13:31:21.201] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:21.201] if (FALSE && !signal) { [13:31:21.201] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.201] { [13:31:21.201] inherits <- base::inherits [13:31:21.201] invokeRestart <- base::invokeRestart [13:31:21.201] is.null <- base::is.null [13:31:21.201] muffled <- FALSE [13:31:21.201] if (inherits(cond, "message")) { [13:31:21.201] muffled <- grepl(pattern, "muffleMessage") [13:31:21.201] if (muffled) [13:31:21.201] invokeRestart("muffleMessage") [13:31:21.201] } [13:31:21.201] else if (inherits(cond, "warning")) { [13:31:21.201] muffled <- grepl(pattern, "muffleWarning") [13:31:21.201] if (muffled) [13:31:21.201] invokeRestart("muffleWarning") [13:31:21.201] } [13:31:21.201] else if (inherits(cond, "condition")) { [13:31:21.201] if (!is.null(pattern)) { [13:31:21.201] computeRestarts <- base::computeRestarts [13:31:21.201] grepl <- base::grepl [13:31:21.201] restarts <- computeRestarts(cond) [13:31:21.201] for (restart in restarts) { [13:31:21.201] name <- restart$name [13:31:21.201] if (is.null(name)) [13:31:21.201] next [13:31:21.201] if (!grepl(pattern, name)) [13:31:21.201] next [13:31:21.201] invokeRestart(restart) [13:31:21.201] muffled <- TRUE [13:31:21.201] break [13:31:21.201] } [13:31:21.201] } [13:31:21.201] } [13:31:21.201] invisible(muffled) [13:31:21.201] } [13:31:21.201] muffleCondition(cond, pattern = "^muffle") [13:31:21.201] } [13:31:21.201] } [13:31:21.201] else { [13:31:21.201] if (TRUE) { [13:31:21.201] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.201] { [13:31:21.201] inherits <- base::inherits [13:31:21.201] invokeRestart <- base::invokeRestart [13:31:21.201] is.null <- base::is.null [13:31:21.201] muffled <- FALSE [13:31:21.201] if (inherits(cond, "message")) { [13:31:21.201] muffled <- grepl(pattern, "muffleMessage") [13:31:21.201] if (muffled) [13:31:21.201] invokeRestart("muffleMessage") [13:31:21.201] } [13:31:21.201] else if (inherits(cond, "warning")) { [13:31:21.201] muffled <- grepl(pattern, "muffleWarning") [13:31:21.201] if (muffled) [13:31:21.201] invokeRestart("muffleWarning") [13:31:21.201] } [13:31:21.201] else if (inherits(cond, "condition")) { [13:31:21.201] if (!is.null(pattern)) { [13:31:21.201] computeRestarts <- base::computeRestarts [13:31:21.201] grepl <- base::grepl [13:31:21.201] restarts <- computeRestarts(cond) [13:31:21.201] for (restart in restarts) { [13:31:21.201] name <- restart$name [13:31:21.201] if (is.null(name)) [13:31:21.201] next [13:31:21.201] if (!grepl(pattern, name)) [13:31:21.201] next [13:31:21.201] invokeRestart(restart) [13:31:21.201] muffled <- TRUE [13:31:21.201] break [13:31:21.201] } [13:31:21.201] } [13:31:21.201] } [13:31:21.201] invisible(muffled) [13:31:21.201] } [13:31:21.201] muffleCondition(cond, pattern = "^muffle") [13:31:21.201] } [13:31:21.201] } [13:31:21.201] } [13:31:21.201] })) [13:31:21.201] }, error = function(ex) { [13:31:21.201] base::structure(base::list(value = NULL, visible = NULL, [13:31:21.201] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.201] ...future.rng), started = ...future.startTime, [13:31:21.201] finished = Sys.time(), session_uuid = NA_character_, [13:31:21.201] version = "1.8"), class = "FutureResult") [13:31:21.201] }, finally = { [13:31:21.201] if (!identical(...future.workdir, getwd())) [13:31:21.201] setwd(...future.workdir) [13:31:21.201] { [13:31:21.201] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:21.201] ...future.oldOptions$nwarnings <- NULL [13:31:21.201] } [13:31:21.201] base::options(...future.oldOptions) [13:31:21.201] if (.Platform$OS.type == "windows") { [13:31:21.201] old_names <- names(...future.oldEnvVars) [13:31:21.201] envs <- base::Sys.getenv() [13:31:21.201] names <- names(envs) [13:31:21.201] common <- intersect(names, old_names) [13:31:21.201] added <- setdiff(names, old_names) [13:31:21.201] removed <- setdiff(old_names, names) [13:31:21.201] changed <- common[...future.oldEnvVars[common] != [13:31:21.201] envs[common]] [13:31:21.201] NAMES <- toupper(changed) [13:31:21.201] args <- list() [13:31:21.201] for (kk in seq_along(NAMES)) { [13:31:21.201] name <- changed[[kk]] [13:31:21.201] NAME <- NAMES[[kk]] [13:31:21.201] if (name != NAME && is.element(NAME, old_names)) [13:31:21.201] next [13:31:21.201] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.201] } [13:31:21.201] NAMES <- toupper(added) [13:31:21.201] for (kk in seq_along(NAMES)) { [13:31:21.201] name <- added[[kk]] [13:31:21.201] NAME <- NAMES[[kk]] [13:31:21.201] if (name != NAME && is.element(NAME, old_names)) [13:31:21.201] next [13:31:21.201] args[[name]] <- "" [13:31:21.201] } [13:31:21.201] NAMES <- toupper(removed) [13:31:21.201] for (kk in seq_along(NAMES)) { [13:31:21.201] name <- removed[[kk]] [13:31:21.201] NAME <- NAMES[[kk]] [13:31:21.201] if (name != NAME && is.element(NAME, old_names)) [13:31:21.201] next [13:31:21.201] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.201] } [13:31:21.201] if (length(args) > 0) [13:31:21.201] base::do.call(base::Sys.setenv, args = args) [13:31:21.201] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:21.201] } [13:31:21.201] else { [13:31:21.201] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:21.201] } [13:31:21.201] { [13:31:21.201] if (base::length(...future.futureOptionsAdded) > [13:31:21.201] 0L) { [13:31:21.201] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:21.201] base::names(opts) <- ...future.futureOptionsAdded [13:31:21.201] base::options(opts) [13:31:21.201] } [13:31:21.201] { [13:31:21.201] NULL [13:31:21.201] options(future.plan = NULL) [13:31:21.201] if (is.na(NA_character_)) [13:31:21.201] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.201] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:21.201] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:21.201] .init = FALSE) [13:31:21.201] } [13:31:21.201] } [13:31:21.201] } [13:31:21.201] }) [13:31:21.201] if (TRUE) { [13:31:21.201] base::sink(type = "output", split = FALSE) [13:31:21.201] if (TRUE) { [13:31:21.201] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:21.201] } [13:31:21.201] else { [13:31:21.201] ...future.result["stdout"] <- base::list(NULL) [13:31:21.201] } [13:31:21.201] base::close(...future.stdout) [13:31:21.201] ...future.stdout <- NULL [13:31:21.201] } [13:31:21.201] ...future.result$conditions <- ...future.conditions [13:31:21.201] ...future.result$finished <- base::Sys.time() [13:31:21.201] ...future.result [13:31:21.201] } [13:31:21.228] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:21.228] plan(): nbrOfWorkers() = 2 [13:31:21.228] future_lapply() ... [13:31:21.230] Number of chunks: 2 [13:31:21.230] getGlobalsAndPackagesXApply() ... [13:31:21.230] - future.globals: TRUE [13:31:21.231] getGlobalsAndPackages() ... [13:31:21.231] Searching for globals... [13:31:21.233] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:31:21.233] Searching for globals ... DONE [13:31:21.233] Resolving globals: FALSE [13:31:21.234] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:31:21.235] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [13:31:21.235] - globals: [1] 'FUN' [13:31:21.235] - packages: [1] 'listenv' [13:31:21.235] getGlobalsAndPackages() ... DONE [13:31:21.235] - globals found/used: [n=1] 'FUN' [13:31:21.236] - needed namespaces: [n=1] 'listenv' [13:31:21.236] Finding globals ... DONE [13:31:21.236] - use_args: TRUE [13:31:21.236] - Getting '...' globals ... [13:31:21.237] resolve() on list ... [13:31:21.237] recursive: 0 [13:31:21.237] length: 1 [13:31:21.237] elements: '...' [13:31:21.238] length: 0 (resolved future 1) [13:31:21.238] resolve() on list ... DONE [13:31:21.238] - '...' content: [n=0] [13:31:21.238] List of 1 [13:31:21.238] $ ...: list() [13:31:21.238] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:21.238] - attr(*, "where")=List of 1 [13:31:21.238] ..$ ...: [13:31:21.238] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:21.238] - attr(*, "resolved")= logi TRUE [13:31:21.238] - attr(*, "total_size")= num NA [13:31:21.242] - Getting '...' globals ... DONE [13:31:21.242] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:21.243] List of 2 [13:31:21.243] $ ...future.FUN:function (x, ...) [13:31:21.243] $ ... : list() [13:31:21.243] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:21.243] - attr(*, "where")=List of 2 [13:31:21.243] ..$ ...future.FUN: [13:31:21.243] ..$ ... : [13:31:21.243] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:21.243] - attr(*, "resolved")= logi FALSE [13:31:21.243] - attr(*, "total_size")= num 4968 [13:31:21.252] Packages to be attached in all futures: [n=1] 'listenv' [13:31:21.252] getGlobalsAndPackagesXApply() ... DONE [13:31:21.252] Number of futures (= number of chunks): 2 [13:31:21.253] Launching 2 futures (chunks) ... [13:31:21.253] Chunk #1 of 2 ... [13:31:21.253] - Finding globals in 'X' for chunk #1 ... [13:31:21.253] getGlobalsAndPackages() ... [13:31:21.254] Searching for globals... [13:31:21.255] [13:31:21.255] Searching for globals ... DONE [13:31:21.255] - globals: [0] [13:31:21.255] getGlobalsAndPackages() ... DONE [13:31:21.255] + additional globals found: [n=0] [13:31:21.256] + additional namespaces needed: [n=0] [13:31:21.256] - Finding globals in 'X' for chunk #1 ... DONE [13:31:21.256] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:21.256] - seeds: [13:31:21.256] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.257] getGlobalsAndPackages() ... [13:31:21.257] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.257] Resolving globals: FALSE [13:31:21.257] Tweak future expression to call with '...' arguments ... [13:31:21.258] { [13:31:21.258] do.call(function(...) { [13:31:21.258] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.258] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:21.258] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.258] on.exit(options(oopts), add = TRUE) [13:31:21.258] } [13:31:21.258] { [13:31:21.258] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:21.258] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.258] ...future.FUN(...future.X_jj, ...) [13:31:21.258] }) [13:31:21.258] } [13:31:21.258] }, args = future.call.arguments) [13:31:21.258] } [13:31:21.258] Tweak future expression to call with '...' arguments ... DONE [13:31:21.259] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.259] - packages: [1] 'listenv' [13:31:21.259] getGlobalsAndPackages() ... DONE [13:31:21.260] run() for 'Future' ... [13:31:21.260] - state: 'created' [13:31:21.261] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:21.264] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.264] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:21.264] - Field: 'label' [13:31:21.265] - Field: 'local' [13:31:21.265] - Field: 'owner' [13:31:21.265] - Field: 'envir' [13:31:21.265] - Field: 'packages' [13:31:21.265] - Field: 'gc' [13:31:21.266] - Field: 'conditions' [13:31:21.266] - Field: 'expr' [13:31:21.266] - Field: 'uuid' [13:31:21.266] - Field: 'seed' [13:31:21.267] - Field: 'version' [13:31:21.267] - Field: 'result' [13:31:21.267] - Field: 'asynchronous' [13:31:21.267] - Field: 'calls' [13:31:21.267] - Field: 'globals' [13:31:21.268] - Field: 'stdout' [13:31:21.268] - Field: 'earlySignal' [13:31:21.268] - Field: 'lazy' [13:31:21.268] - Field: 'state' [13:31:21.268] - Field: '.cluster' [13:31:21.269] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:21.269] - Launch lazy future ... [13:31:21.269] Packages needed by the future expression (n = 1): 'listenv' [13:31:21.269] Packages needed by future strategies (n = 0): [13:31:21.270] { [13:31:21.270] { [13:31:21.270] { [13:31:21.270] ...future.startTime <- base::Sys.time() [13:31:21.270] { [13:31:21.270] { [13:31:21.270] { [13:31:21.270] { [13:31:21.270] base::local({ [13:31:21.270] has_future <- base::requireNamespace("future", [13:31:21.270] quietly = TRUE) [13:31:21.270] if (has_future) { [13:31:21.270] ns <- base::getNamespace("future") [13:31:21.270] version <- ns[[".package"]][["version"]] [13:31:21.270] if (is.null(version)) [13:31:21.270] version <- utils::packageVersion("future") [13:31:21.270] } [13:31:21.270] else { [13:31:21.270] version <- NULL [13:31:21.270] } [13:31:21.270] if (!has_future || version < "1.8.0") { [13:31:21.270] info <- base::c(r_version = base::gsub("R version ", [13:31:21.270] "", base::R.version$version.string), [13:31:21.270] platform = base::sprintf("%s (%s-bit)", [13:31:21.270] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:21.270] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:21.270] "release", "version")], collapse = " "), [13:31:21.270] hostname = base::Sys.info()[["nodename"]]) [13:31:21.270] info <- base::sprintf("%s: %s", base::names(info), [13:31:21.270] info) [13:31:21.270] info <- base::paste(info, collapse = "; ") [13:31:21.270] if (!has_future) { [13:31:21.270] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:21.270] info) [13:31:21.270] } [13:31:21.270] else { [13:31:21.270] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:21.270] info, version) [13:31:21.270] } [13:31:21.270] base::stop(msg) [13:31:21.270] } [13:31:21.270] }) [13:31:21.270] } [13:31:21.270] base::local({ [13:31:21.270] for (pkg in "listenv") { [13:31:21.270] base::loadNamespace(pkg) [13:31:21.270] base::library(pkg, character.only = TRUE) [13:31:21.270] } [13:31:21.270] }) [13:31:21.270] } [13:31:21.270] ...future.strategy.old <- future::plan("list") [13:31:21.270] options(future.plan = NULL) [13:31:21.270] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.270] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:21.270] } [13:31:21.270] ...future.workdir <- getwd() [13:31:21.270] } [13:31:21.270] ...future.oldOptions <- base::as.list(base::.Options) [13:31:21.270] ...future.oldEnvVars <- base::Sys.getenv() [13:31:21.270] } [13:31:21.270] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:21.270] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:21.270] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:21.270] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:21.270] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:21.270] future.stdout.windows.reencode = NULL, width = 80L) [13:31:21.270] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:21.270] base::names(...future.oldOptions)) [13:31:21.270] } [13:31:21.270] if (FALSE) { [13:31:21.270] } [13:31:21.270] else { [13:31:21.270] if (TRUE) { [13:31:21.270] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:21.270] open = "w") [13:31:21.270] } [13:31:21.270] else { [13:31:21.270] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:21.270] windows = "NUL", "/dev/null"), open = "w") [13:31:21.270] } [13:31:21.270] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:21.270] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:21.270] base::sink(type = "output", split = FALSE) [13:31:21.270] base::close(...future.stdout) [13:31:21.270] }, add = TRUE) [13:31:21.270] } [13:31:21.270] ...future.frame <- base::sys.nframe() [13:31:21.270] ...future.conditions <- base::list() [13:31:21.270] ...future.rng <- base::globalenv()$.Random.seed [13:31:21.270] if (FALSE) { [13:31:21.270] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:21.270] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:21.270] } [13:31:21.270] ...future.result <- base::tryCatch({ [13:31:21.270] base::withCallingHandlers({ [13:31:21.270] ...future.value <- base::withVisible(base::local({ [13:31:21.270] do.call(function(...) { [13:31:21.270] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.270] if (!identical(...future.globals.maxSize.org, [13:31:21.270] ...future.globals.maxSize)) { [13:31:21.270] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.270] on.exit(options(oopts), add = TRUE) [13:31:21.270] } [13:31:21.270] { [13:31:21.270] lapply(seq_along(...future.elements_ii), [13:31:21.270] FUN = function(jj) { [13:31:21.270] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.270] ...future.FUN(...future.X_jj, ...) [13:31:21.270] }) [13:31:21.270] } [13:31:21.270] }, args = future.call.arguments) [13:31:21.270] })) [13:31:21.270] future::FutureResult(value = ...future.value$value, [13:31:21.270] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.270] ...future.rng), globalenv = if (FALSE) [13:31:21.270] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:21.270] ...future.globalenv.names)) [13:31:21.270] else NULL, started = ...future.startTime, version = "1.8") [13:31:21.270] }, condition = base::local({ [13:31:21.270] c <- base::c [13:31:21.270] inherits <- base::inherits [13:31:21.270] invokeRestart <- base::invokeRestart [13:31:21.270] length <- base::length [13:31:21.270] list <- base::list [13:31:21.270] seq.int <- base::seq.int [13:31:21.270] signalCondition <- base::signalCondition [13:31:21.270] sys.calls <- base::sys.calls [13:31:21.270] `[[` <- base::`[[` [13:31:21.270] `+` <- base::`+` [13:31:21.270] `<<-` <- base::`<<-` [13:31:21.270] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:21.270] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:21.270] 3L)] [13:31:21.270] } [13:31:21.270] function(cond) { [13:31:21.270] is_error <- inherits(cond, "error") [13:31:21.270] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:21.270] NULL) [13:31:21.270] if (is_error) { [13:31:21.270] sessionInformation <- function() { [13:31:21.270] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:21.270] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:21.270] search = base::search(), system = base::Sys.info()) [13:31:21.270] } [13:31:21.270] ...future.conditions[[length(...future.conditions) + [13:31:21.270] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:21.270] cond$call), session = sessionInformation(), [13:31:21.270] timestamp = base::Sys.time(), signaled = 0L) [13:31:21.270] signalCondition(cond) [13:31:21.270] } [13:31:21.270] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:21.270] signal <- FALSE && inherits(cond, character(0)) [13:31:21.270] ...future.conditions[[length(...future.conditions) + [13:31:21.270] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:21.270] if (FALSE && !signal) { [13:31:21.270] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.270] { [13:31:21.270] inherits <- base::inherits [13:31:21.270] invokeRestart <- base::invokeRestart [13:31:21.270] is.null <- base::is.null [13:31:21.270] muffled <- FALSE [13:31:21.270] if (inherits(cond, "message")) { [13:31:21.270] muffled <- grepl(pattern, "muffleMessage") [13:31:21.270] if (muffled) [13:31:21.270] invokeRestart("muffleMessage") [13:31:21.270] } [13:31:21.270] else if (inherits(cond, "warning")) { [13:31:21.270] muffled <- grepl(pattern, "muffleWarning") [13:31:21.270] if (muffled) [13:31:21.270] invokeRestart("muffleWarning") [13:31:21.270] } [13:31:21.270] else if (inherits(cond, "condition")) { [13:31:21.270] if (!is.null(pattern)) { [13:31:21.270] computeRestarts <- base::computeRestarts [13:31:21.270] grepl <- base::grepl [13:31:21.270] restarts <- computeRestarts(cond) [13:31:21.270] for (restart in restarts) { [13:31:21.270] name <- restart$name [13:31:21.270] if (is.null(name)) [13:31:21.270] next [13:31:21.270] if (!grepl(pattern, name)) [13:31:21.270] next [13:31:21.270] invokeRestart(restart) [13:31:21.270] muffled <- TRUE [13:31:21.270] break [13:31:21.270] } [13:31:21.270] } [13:31:21.270] } [13:31:21.270] invisible(muffled) [13:31:21.270] } [13:31:21.270] muffleCondition(cond, pattern = "^muffle") [13:31:21.270] } [13:31:21.270] } [13:31:21.270] else { [13:31:21.270] if (TRUE) { [13:31:21.270] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.270] { [13:31:21.270] inherits <- base::inherits [13:31:21.270] invokeRestart <- base::invokeRestart [13:31:21.270] is.null <- base::is.null [13:31:21.270] muffled <- FALSE [13:31:21.270] if (inherits(cond, "message")) { [13:31:21.270] muffled <- grepl(pattern, "muffleMessage") [13:31:21.270] if (muffled) [13:31:21.270] invokeRestart("muffleMessage") [13:31:21.270] } [13:31:21.270] else if (inherits(cond, "warning")) { [13:31:21.270] muffled <- grepl(pattern, "muffleWarning") [13:31:21.270] if (muffled) [13:31:21.270] invokeRestart("muffleWarning") [13:31:21.270] } [13:31:21.270] else if (inherits(cond, "condition")) { [13:31:21.270] if (!is.null(pattern)) { [13:31:21.270] computeRestarts <- base::computeRestarts [13:31:21.270] grepl <- base::grepl [13:31:21.270] restarts <- computeRestarts(cond) [13:31:21.270] for (restart in restarts) { [13:31:21.270] name <- restart$name [13:31:21.270] if (is.null(name)) [13:31:21.270] next [13:31:21.270] if (!grepl(pattern, name)) [13:31:21.270] next [13:31:21.270] invokeRestart(restart) [13:31:21.270] muffled <- TRUE [13:31:21.270] break [13:31:21.270] } [13:31:21.270] } [13:31:21.270] } [13:31:21.270] invisible(muffled) [13:31:21.270] } [13:31:21.270] muffleCondition(cond, pattern = "^muffle") [13:31:21.270] } [13:31:21.270] } [13:31:21.270] } [13:31:21.270] })) [13:31:21.270] }, error = function(ex) { [13:31:21.270] base::structure(base::list(value = NULL, visible = NULL, [13:31:21.270] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.270] ...future.rng), started = ...future.startTime, [13:31:21.270] finished = Sys.time(), session_uuid = NA_character_, [13:31:21.270] version = "1.8"), class = "FutureResult") [13:31:21.270] }, finally = { [13:31:21.270] if (!identical(...future.workdir, getwd())) [13:31:21.270] setwd(...future.workdir) [13:31:21.270] { [13:31:21.270] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:21.270] ...future.oldOptions$nwarnings <- NULL [13:31:21.270] } [13:31:21.270] base::options(...future.oldOptions) [13:31:21.270] if (.Platform$OS.type == "windows") { [13:31:21.270] old_names <- names(...future.oldEnvVars) [13:31:21.270] envs <- base::Sys.getenv() [13:31:21.270] names <- names(envs) [13:31:21.270] common <- intersect(names, old_names) [13:31:21.270] added <- setdiff(names, old_names) [13:31:21.270] removed <- setdiff(old_names, names) [13:31:21.270] changed <- common[...future.oldEnvVars[common] != [13:31:21.270] envs[common]] [13:31:21.270] NAMES <- toupper(changed) [13:31:21.270] args <- list() [13:31:21.270] for (kk in seq_along(NAMES)) { [13:31:21.270] name <- changed[[kk]] [13:31:21.270] NAME <- NAMES[[kk]] [13:31:21.270] if (name != NAME && is.element(NAME, old_names)) [13:31:21.270] next [13:31:21.270] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.270] } [13:31:21.270] NAMES <- toupper(added) [13:31:21.270] for (kk in seq_along(NAMES)) { [13:31:21.270] name <- added[[kk]] [13:31:21.270] NAME <- NAMES[[kk]] [13:31:21.270] if (name != NAME && is.element(NAME, old_names)) [13:31:21.270] next [13:31:21.270] args[[name]] <- "" [13:31:21.270] } [13:31:21.270] NAMES <- toupper(removed) [13:31:21.270] for (kk in seq_along(NAMES)) { [13:31:21.270] name <- removed[[kk]] [13:31:21.270] NAME <- NAMES[[kk]] [13:31:21.270] if (name != NAME && is.element(NAME, old_names)) [13:31:21.270] next [13:31:21.270] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.270] } [13:31:21.270] if (length(args) > 0) [13:31:21.270] base::do.call(base::Sys.setenv, args = args) [13:31:21.270] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:21.270] } [13:31:21.270] else { [13:31:21.270] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:21.270] } [13:31:21.270] { [13:31:21.270] if (base::length(...future.futureOptionsAdded) > [13:31:21.270] 0L) { [13:31:21.270] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:21.270] base::names(opts) <- ...future.futureOptionsAdded [13:31:21.270] base::options(opts) [13:31:21.270] } [13:31:21.270] { [13:31:21.270] NULL [13:31:21.270] options(future.plan = NULL) [13:31:21.270] if (is.na(NA_character_)) [13:31:21.270] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.270] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:21.270] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:21.270] .init = FALSE) [13:31:21.270] } [13:31:21.270] } [13:31:21.270] } [13:31:21.270] }) [13:31:21.270] if (TRUE) { [13:31:21.270] base::sink(type = "output", split = FALSE) [13:31:21.270] if (TRUE) { [13:31:21.270] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:21.270] } [13:31:21.270] else { [13:31:21.270] ...future.result["stdout"] <- base::list(NULL) [13:31:21.270] } [13:31:21.270] base::close(...future.stdout) [13:31:21.270] ...future.stdout <- NULL [13:31:21.270] } [13:31:21.270] ...future.result$conditions <- ...future.conditions [13:31:21.270] ...future.result$finished <- base::Sys.time() [13:31:21.270] ...future.result [13:31:21.270] } [13:31:21.275] - Launch lazy future ... done [13:31:21.275] run() for 'MiraiFuture' ... done [13:31:21.276] Created future: [13:31:21.277] resolved() for 'MiraiFuture' ... [13:31:21.278] - state: 'running' [13:31:21.278] - run: TRUE [13:31:21.278] - result: 'NULL' [13:31:21.278] - resolved: FALSE [13:31:21.278] resolved() for 'MiraiFuture' ... done [13:31:21.276] MiraiFuture: [13:31:21.276] Label: 'future_lapply-1' [13:31:21.276] Expression: [13:31:21.276] { [13:31:21.276] do.call(function(...) { [13:31:21.276] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.276] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:21.276] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.276] on.exit(options(oopts), add = TRUE) [13:31:21.276] } [13:31:21.276] { [13:31:21.276] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:21.276] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.276] ...future.FUN(...future.X_jj, ...) [13:31:21.276] }) [13:31:21.276] } [13:31:21.276] }, args = future.call.arguments) [13:31:21.276] } [13:31:21.276] Lazy evaluation: FALSE [13:31:21.276] Asynchronous evaluation: TRUE [13:31:21.276] Local evaluation: TRUE [13:31:21.276] Environment: R_GlobalEnv [13:31:21.276] Capture standard output: TRUE [13:31:21.276] Capture condition classes: 'condition' (excluding 'nothing') [13:31:21.276] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:21.276] Packages: 1 packages ('listenv') [13:31:21.276] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:21.276] Resolved: FALSE [13:31:21.276] Value: [13:31:21.276] Conditions captured: [13:31:21.276] Early signaling: FALSE [13:31:21.276] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:21.276] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.279] Chunk #1 of 2 ... DONE [13:31:21.279] Chunk #2 of 2 ... [13:31:21.279] - Finding globals in 'X' for chunk #2 ... [13:31:21.280] getGlobalsAndPackages() ... [13:31:21.280] Searching for globals... [13:31:21.280] [13:31:21.280] Searching for globals ... DONE [13:31:21.281] - globals: [0] [13:31:21.281] getGlobalsAndPackages() ... DONE [13:31:21.281] + additional globals found: [n=0] [13:31:21.281] + additional namespaces needed: [n=0] [13:31:21.281] - Finding globals in 'X' for chunk #2 ... DONE [13:31:21.282] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:21.282] - seeds: [13:31:21.282] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.282] getGlobalsAndPackages() ... [13:31:21.282] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.283] Resolving globals: FALSE [13:31:21.283] Tweak future expression to call with '...' arguments ... [13:31:21.283] { [13:31:21.283] do.call(function(...) { [13:31:21.283] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.283] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:21.283] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.283] on.exit(options(oopts), add = TRUE) [13:31:21.283] } [13:31:21.283] { [13:31:21.283] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:21.283] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.283] ...future.FUN(...future.X_jj, ...) [13:31:21.283] }) [13:31:21.283] } [13:31:21.283] }, args = future.call.arguments) [13:31:21.283] } [13:31:21.284] Tweak future expression to call with '...' arguments ... DONE [13:31:21.284] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.285] - packages: [1] 'listenv' [13:31:21.285] getGlobalsAndPackages() ... DONE [13:31:21.285] run() for 'Future' ... [13:31:21.286] - state: 'created' [13:31:21.286] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:21.289] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.289] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:21.289] - Field: 'label' [13:31:21.289] - Field: 'local' [13:31:21.290] - Field: 'owner' [13:31:21.290] - Field: 'envir' [13:31:21.290] - Field: 'packages' [13:31:21.290] - Field: 'gc' [13:31:21.290] - Field: 'conditions' [13:31:21.291] - Field: 'expr' [13:31:21.291] - Field: 'uuid' [13:31:21.291] - Field: 'seed' [13:31:21.291] - Field: 'version' [13:31:21.291] - Field: 'result' [13:31:21.291] - Field: 'asynchronous' [13:31:21.292] - Field: 'calls' [13:31:21.292] - Field: 'globals' [13:31:21.292] - Field: 'stdout' [13:31:21.292] - Field: 'earlySignal' [13:31:21.292] - Field: 'lazy' [13:31:21.293] - Field: 'state' [13:31:21.293] - Field: '.cluster' [13:31:21.293] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:21.293] - Launch lazy future ... [13:31:21.293] Packages needed by the future expression (n = 1): 'listenv' [13:31:21.294] Packages needed by future strategies (n = 0): [13:31:21.295] { [13:31:21.295] { [13:31:21.295] { [13:31:21.295] ...future.startTime <- base::Sys.time() [13:31:21.295] { [13:31:21.295] { [13:31:21.295] { [13:31:21.295] { [13:31:21.295] base::local({ [13:31:21.295] has_future <- base::requireNamespace("future", [13:31:21.295] quietly = TRUE) [13:31:21.295] if (has_future) { [13:31:21.295] ns <- base::getNamespace("future") [13:31:21.295] version <- ns[[".package"]][["version"]] [13:31:21.295] if (is.null(version)) [13:31:21.295] version <- utils::packageVersion("future") [13:31:21.295] } [13:31:21.295] else { [13:31:21.295] version <- NULL [13:31:21.295] } [13:31:21.295] if (!has_future || version < "1.8.0") { [13:31:21.295] info <- base::c(r_version = base::gsub("R version ", [13:31:21.295] "", base::R.version$version.string), [13:31:21.295] platform = base::sprintf("%s (%s-bit)", [13:31:21.295] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:21.295] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:21.295] "release", "version")], collapse = " "), [13:31:21.295] hostname = base::Sys.info()[["nodename"]]) [13:31:21.295] info <- base::sprintf("%s: %s", base::names(info), [13:31:21.295] info) [13:31:21.295] info <- base::paste(info, collapse = "; ") [13:31:21.295] if (!has_future) { [13:31:21.295] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:21.295] info) [13:31:21.295] } [13:31:21.295] else { [13:31:21.295] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:21.295] info, version) [13:31:21.295] } [13:31:21.295] base::stop(msg) [13:31:21.295] } [13:31:21.295] }) [13:31:21.295] } [13:31:21.295] base::local({ [13:31:21.295] for (pkg in "listenv") { [13:31:21.295] base::loadNamespace(pkg) [13:31:21.295] base::library(pkg, character.only = TRUE) [13:31:21.295] } [13:31:21.295] }) [13:31:21.295] } [13:31:21.295] ...future.strategy.old <- future::plan("list") [13:31:21.295] options(future.plan = NULL) [13:31:21.295] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.295] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:21.295] } [13:31:21.295] ...future.workdir <- getwd() [13:31:21.295] } [13:31:21.295] ...future.oldOptions <- base::as.list(base::.Options) [13:31:21.295] ...future.oldEnvVars <- base::Sys.getenv() [13:31:21.295] } [13:31:21.295] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:21.295] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:21.295] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:21.295] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:21.295] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:21.295] future.stdout.windows.reencode = NULL, width = 80L) [13:31:21.295] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:21.295] base::names(...future.oldOptions)) [13:31:21.295] } [13:31:21.295] if (FALSE) { [13:31:21.295] } [13:31:21.295] else { [13:31:21.295] if (TRUE) { [13:31:21.295] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:21.295] open = "w") [13:31:21.295] } [13:31:21.295] else { [13:31:21.295] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:21.295] windows = "NUL", "/dev/null"), open = "w") [13:31:21.295] } [13:31:21.295] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:21.295] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:21.295] base::sink(type = "output", split = FALSE) [13:31:21.295] base::close(...future.stdout) [13:31:21.295] }, add = TRUE) [13:31:21.295] } [13:31:21.295] ...future.frame <- base::sys.nframe() [13:31:21.295] ...future.conditions <- base::list() [13:31:21.295] ...future.rng <- base::globalenv()$.Random.seed [13:31:21.295] if (FALSE) { [13:31:21.295] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:21.295] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:21.295] } [13:31:21.295] ...future.result <- base::tryCatch({ [13:31:21.295] base::withCallingHandlers({ [13:31:21.295] ...future.value <- base::withVisible(base::local({ [13:31:21.295] do.call(function(...) { [13:31:21.295] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.295] if (!identical(...future.globals.maxSize.org, [13:31:21.295] ...future.globals.maxSize)) { [13:31:21.295] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.295] on.exit(options(oopts), add = TRUE) [13:31:21.295] } [13:31:21.295] { [13:31:21.295] lapply(seq_along(...future.elements_ii), [13:31:21.295] FUN = function(jj) { [13:31:21.295] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.295] ...future.FUN(...future.X_jj, ...) [13:31:21.295] }) [13:31:21.295] } [13:31:21.295] }, args = future.call.arguments) [13:31:21.295] })) [13:31:21.295] future::FutureResult(value = ...future.value$value, [13:31:21.295] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.295] ...future.rng), globalenv = if (FALSE) [13:31:21.295] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:21.295] ...future.globalenv.names)) [13:31:21.295] else NULL, started = ...future.startTime, version = "1.8") [13:31:21.295] }, condition = base::local({ [13:31:21.295] c <- base::c [13:31:21.295] inherits <- base::inherits [13:31:21.295] invokeRestart <- base::invokeRestart [13:31:21.295] length <- base::length [13:31:21.295] list <- base::list [13:31:21.295] seq.int <- base::seq.int [13:31:21.295] signalCondition <- base::signalCondition [13:31:21.295] sys.calls <- base::sys.calls [13:31:21.295] `[[` <- base::`[[` [13:31:21.295] `+` <- base::`+` [13:31:21.295] `<<-` <- base::`<<-` [13:31:21.295] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:21.295] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:21.295] 3L)] [13:31:21.295] } [13:31:21.295] function(cond) { [13:31:21.295] is_error <- inherits(cond, "error") [13:31:21.295] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:21.295] NULL) [13:31:21.295] if (is_error) { [13:31:21.295] sessionInformation <- function() { [13:31:21.295] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:21.295] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:21.295] search = base::search(), system = base::Sys.info()) [13:31:21.295] } [13:31:21.295] ...future.conditions[[length(...future.conditions) + [13:31:21.295] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:21.295] cond$call), session = sessionInformation(), [13:31:21.295] timestamp = base::Sys.time(), signaled = 0L) [13:31:21.295] signalCondition(cond) [13:31:21.295] } [13:31:21.295] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:21.295] signal <- FALSE && inherits(cond, character(0)) [13:31:21.295] ...future.conditions[[length(...future.conditions) + [13:31:21.295] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:21.295] if (FALSE && !signal) { [13:31:21.295] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.295] { [13:31:21.295] inherits <- base::inherits [13:31:21.295] invokeRestart <- base::invokeRestart [13:31:21.295] is.null <- base::is.null [13:31:21.295] muffled <- FALSE [13:31:21.295] if (inherits(cond, "message")) { [13:31:21.295] muffled <- grepl(pattern, "muffleMessage") [13:31:21.295] if (muffled) [13:31:21.295] invokeRestart("muffleMessage") [13:31:21.295] } [13:31:21.295] else if (inherits(cond, "warning")) { [13:31:21.295] muffled <- grepl(pattern, "muffleWarning") [13:31:21.295] if (muffled) [13:31:21.295] invokeRestart("muffleWarning") [13:31:21.295] } [13:31:21.295] else if (inherits(cond, "condition")) { [13:31:21.295] if (!is.null(pattern)) { [13:31:21.295] computeRestarts <- base::computeRestarts [13:31:21.295] grepl <- base::grepl [13:31:21.295] restarts <- computeRestarts(cond) [13:31:21.295] for (restart in restarts) { [13:31:21.295] name <- restart$name [13:31:21.295] if (is.null(name)) [13:31:21.295] next [13:31:21.295] if (!grepl(pattern, name)) [13:31:21.295] next [13:31:21.295] invokeRestart(restart) [13:31:21.295] muffled <- TRUE [13:31:21.295] break [13:31:21.295] } [13:31:21.295] } [13:31:21.295] } [13:31:21.295] invisible(muffled) [13:31:21.295] } [13:31:21.295] muffleCondition(cond, pattern = "^muffle") [13:31:21.295] } [13:31:21.295] } [13:31:21.295] else { [13:31:21.295] if (TRUE) { [13:31:21.295] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.295] { [13:31:21.295] inherits <- base::inherits [13:31:21.295] invokeRestart <- base::invokeRestart [13:31:21.295] is.null <- base::is.null [13:31:21.295] muffled <- FALSE [13:31:21.295] if (inherits(cond, "message")) { [13:31:21.295] muffled <- grepl(pattern, "muffleMessage") [13:31:21.295] if (muffled) [13:31:21.295] invokeRestart("muffleMessage") [13:31:21.295] } [13:31:21.295] else if (inherits(cond, "warning")) { [13:31:21.295] muffled <- grepl(pattern, "muffleWarning") [13:31:21.295] if (muffled) [13:31:21.295] invokeRestart("muffleWarning") [13:31:21.295] } [13:31:21.295] else if (inherits(cond, "condition")) { [13:31:21.295] if (!is.null(pattern)) { [13:31:21.295] computeRestarts <- base::computeRestarts [13:31:21.295] grepl <- base::grepl [13:31:21.295] restarts <- computeRestarts(cond) [13:31:21.295] for (restart in restarts) { [13:31:21.295] name <- restart$name [13:31:21.295] if (is.null(name)) [13:31:21.295] next [13:31:21.295] if (!grepl(pattern, name)) [13:31:21.295] next [13:31:21.295] invokeRestart(restart) [13:31:21.295] muffled <- TRUE [13:31:21.295] break [13:31:21.295] } [13:31:21.295] } [13:31:21.295] } [13:31:21.295] invisible(muffled) [13:31:21.295] } [13:31:21.295] muffleCondition(cond, pattern = "^muffle") [13:31:21.295] } [13:31:21.295] } [13:31:21.295] } [13:31:21.295] })) [13:31:21.295] }, error = function(ex) { [13:31:21.295] base::structure(base::list(value = NULL, visible = NULL, [13:31:21.295] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.295] ...future.rng), started = ...future.startTime, [13:31:21.295] finished = Sys.time(), session_uuid = NA_character_, [13:31:21.295] version = "1.8"), class = "FutureResult") [13:31:21.295] }, finally = { [13:31:21.295] if (!identical(...future.workdir, getwd())) [13:31:21.295] setwd(...future.workdir) [13:31:21.295] { [13:31:21.295] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:21.295] ...future.oldOptions$nwarnings <- NULL [13:31:21.295] } [13:31:21.295] base::options(...future.oldOptions) [13:31:21.295] if (.Platform$OS.type == "windows") { [13:31:21.295] old_names <- names(...future.oldEnvVars) [13:31:21.295] envs <- base::Sys.getenv() [13:31:21.295] names <- names(envs) [13:31:21.295] common <- intersect(names, old_names) [13:31:21.295] added <- setdiff(names, old_names) [13:31:21.295] removed <- setdiff(old_names, names) [13:31:21.295] changed <- common[...future.oldEnvVars[common] != [13:31:21.295] envs[common]] [13:31:21.295] NAMES <- toupper(changed) [13:31:21.295] args <- list() [13:31:21.295] for (kk in seq_along(NAMES)) { [13:31:21.295] name <- changed[[kk]] [13:31:21.295] NAME <- NAMES[[kk]] [13:31:21.295] if (name != NAME && is.element(NAME, old_names)) [13:31:21.295] next [13:31:21.295] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.295] } [13:31:21.295] NAMES <- toupper(added) [13:31:21.295] for (kk in seq_along(NAMES)) { [13:31:21.295] name <- added[[kk]] [13:31:21.295] NAME <- NAMES[[kk]] [13:31:21.295] if (name != NAME && is.element(NAME, old_names)) [13:31:21.295] next [13:31:21.295] args[[name]] <- "" [13:31:21.295] } [13:31:21.295] NAMES <- toupper(removed) [13:31:21.295] for (kk in seq_along(NAMES)) { [13:31:21.295] name <- removed[[kk]] [13:31:21.295] NAME <- NAMES[[kk]] [13:31:21.295] if (name != NAME && is.element(NAME, old_names)) [13:31:21.295] next [13:31:21.295] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.295] } [13:31:21.295] if (length(args) > 0) [13:31:21.295] base::do.call(base::Sys.setenv, args = args) [13:31:21.295] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:21.295] } [13:31:21.295] else { [13:31:21.295] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:21.295] } [13:31:21.295] { [13:31:21.295] if (base::length(...future.futureOptionsAdded) > [13:31:21.295] 0L) { [13:31:21.295] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:21.295] base::names(opts) <- ...future.futureOptionsAdded [13:31:21.295] base::options(opts) [13:31:21.295] } [13:31:21.295] { [13:31:21.295] NULL [13:31:21.295] options(future.plan = NULL) [13:31:21.295] if (is.na(NA_character_)) [13:31:21.295] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.295] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:21.295] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:21.295] .init = FALSE) [13:31:21.295] } [13:31:21.295] } [13:31:21.295] } [13:31:21.295] }) [13:31:21.295] if (TRUE) { [13:31:21.295] base::sink(type = "output", split = FALSE) [13:31:21.295] if (TRUE) { [13:31:21.295] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:21.295] } [13:31:21.295] else { [13:31:21.295] ...future.result["stdout"] <- base::list(NULL) [13:31:21.295] } [13:31:21.295] base::close(...future.stdout) [13:31:21.295] ...future.stdout <- NULL [13:31:21.295] } [13:31:21.295] ...future.result$conditions <- ...future.conditions [13:31:21.295] ...future.result$finished <- base::Sys.time() [13:31:21.295] ...future.result [13:31:21.295] } [13:31:21.299] - Launch lazy future ... done [13:31:21.299] run() for 'MiraiFuture' ... done [13:31:21.300] Created future: [13:31:21.301] resolved() for 'MiraiFuture' ... [13:31:21.301] - state: 'running' [13:31:21.302] - run: TRUE [13:31:21.302] - result: 'NULL' [13:31:21.302] - resolved: FALSE [13:31:21.302] resolved() for 'MiraiFuture' ... done [13:31:21.300] MiraiFuture: [13:31:21.300] Label: 'future_lapply-2' [13:31:21.300] Expression: [13:31:21.300] { [13:31:21.300] do.call(function(...) { [13:31:21.300] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.300] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:21.300] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.300] on.exit(options(oopts), add = TRUE) [13:31:21.300] } [13:31:21.300] { [13:31:21.300] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:21.300] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.300] ...future.FUN(...future.X_jj, ...) [13:31:21.300] }) [13:31:21.300] } [13:31:21.300] }, args = future.call.arguments) [13:31:21.300] } [13:31:21.300] Lazy evaluation: FALSE [13:31:21.300] Asynchronous evaluation: TRUE [13:31:21.300] Local evaluation: TRUE [13:31:21.300] Environment: R_GlobalEnv [13:31:21.300] Capture standard output: TRUE [13:31:21.300] Capture condition classes: 'condition' (excluding 'nothing') [13:31:21.300] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:21.300] Packages: 1 packages ('listenv') [13:31:21.300] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:21.300] Resolved: FALSE [13:31:21.300] Value: [13:31:21.300] Conditions captured: [13:31:21.300] Early signaling: FALSE [13:31:21.300] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:21.300] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.303] Chunk #2 of 2 ... DONE [13:31:21.303] Launching 2 futures (chunks) ... DONE [13:31:21.303] Resolving 2 futures (chunks) ... [13:31:21.303] resolve() on list ... [13:31:21.303] recursive: 0 [13:31:21.304] length: 2 [13:31:21.304] [13:31:21.304] resolved() for 'MiraiFuture' ... [13:31:21.304] - state: 'running' [13:31:21.304] - run: TRUE [13:31:21.304] - result: 'NULL' [13:31:21.305] - resolved: FALSE [13:31:21.305] resolved() for 'MiraiFuture' ... done [13:31:21.305] Future #1 [13:31:21.305] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:21.306] - nx: 2 [13:31:21.306] - relay: TRUE [13:31:21.306] - stdout: TRUE [13:31:21.306] - signal: TRUE [13:31:21.306] - resignal: FALSE [13:31:21.306] - force: TRUE [13:31:21.306] - relayed: [n=2] FALSE, FALSE [13:31:21.307] - queued futures: [n=2] FALSE, FALSE [13:31:21.307] - until=1 [13:31:21.307] - relaying element #1 [13:31:21.307] - relayed: [n=2] TRUE, FALSE [13:31:21.308] - queued futures: [n=2] TRUE, FALSE [13:31:21.308] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:21.308] length: 1 (resolved future 1) [13:31:21.308] resolved() for 'MiraiFuture' ... [13:31:21.308] - state: 'running' [13:31:21.308] - run: TRUE [13:31:21.309] - result: 'NULL' [13:31:21.309] - resolved: FALSE [13:31:21.309] resolved() for 'MiraiFuture' ... done [13:31:21.309] Future #2 [13:31:21.309] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:21.310] - nx: 2 [13:31:21.310] - relay: TRUE [13:31:21.310] - stdout: TRUE [13:31:21.310] - signal: TRUE [13:31:21.310] - resignal: FALSE [13:31:21.310] - force: TRUE [13:31:21.311] - relayed: [n=2] TRUE, FALSE [13:31:21.311] - queued futures: [n=2] TRUE, FALSE [13:31:21.311] - until=2 [13:31:21.311] - relaying element #2 [13:31:21.311] - relayed: [n=2] TRUE, TRUE [13:31:21.311] - queued futures: [n=2] TRUE, TRUE [13:31:21.312] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:21.312] length: 0 (resolved future 2) [13:31:21.312] Relaying remaining futures [13:31:21.312] signalConditionsASAP(NULL, pos=0) ... [13:31:21.312] - nx: 2 [13:31:21.312] - relay: TRUE [13:31:21.313] - stdout: TRUE [13:31:21.313] - signal: TRUE [13:31:21.313] - resignal: FALSE [13:31:21.313] - force: TRUE [13:31:21.313] - relayed: [n=2] TRUE, TRUE [13:31:21.313] - queued futures: [n=2] TRUE, TRUE - flush all [13:31:21.314] - relayed: [n=2] TRUE, TRUE [13:31:21.314] - queued futures: [n=2] TRUE, TRUE [13:31:21.314] signalConditionsASAP(NULL, pos=0) ... done [13:31:21.314] resolve() on list ... DONE [13:31:21.314] - Number of value chunks collected: 2 [13:31:21.315] Resolving 2 futures (chunks) ... DONE [13:31:21.315] Reducing values from 2 chunks ... [13:31:21.315] - Number of values collected after concatenation: 2 [13:31:21.315] - Number of values expected: 2 [13:31:21.315] Reducing values from 2 chunks ... DONE [13:31:21.315] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" [13:31:21.318] future_lapply() ... [13:31:21.319] Number of chunks: 2 [13:31:21.319] getGlobalsAndPackagesXApply() ... [13:31:21.320] - future.globals: TRUE [13:31:21.320] getGlobalsAndPackages() ... [13:31:21.320] Searching for globals... [13:31:21.322] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:31:21.322] Searching for globals ... DONE [13:31:21.322] Resolving globals: FALSE [13:31:21.323] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:31:21.323] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [13:31:21.324] - globals: [1] 'FUN' [13:31:21.324] - packages: [1] 'listenv' [13:31:21.324] getGlobalsAndPackages() ... DONE [13:31:21.324] - globals found/used: [n=1] 'FUN' [13:31:21.324] - needed namespaces: [n=1] 'listenv' [13:31:21.325] Finding globals ... DONE [13:31:21.325] - use_args: TRUE [13:31:21.325] - Getting '...' globals ... [13:31:21.325] resolve() on list ... [13:31:21.325] recursive: 0 [13:31:21.326] length: 1 [13:31:21.326] elements: '...' [13:31:21.326] length: 0 (resolved future 1) [13:31:21.326] resolve() on list ... DONE [13:31:21.326] - '...' content: [n=0] [13:31:21.327] List of 1 [13:31:21.327] $ ...: list() [13:31:21.327] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:21.327] - attr(*, "where")=List of 1 [13:31:21.327] ..$ ...: [13:31:21.327] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:21.327] - attr(*, "resolved")= logi TRUE [13:31:21.327] - attr(*, "total_size")= num NA [13:31:21.330] - Getting '...' globals ... DONE [13:31:21.330] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:21.330] List of 2 [13:31:21.330] $ ...future.FUN:function (x, ...) [13:31:21.330] $ ... : list() [13:31:21.330] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:21.330] - attr(*, "where")=List of 2 [13:31:21.330] ..$ ...future.FUN: [13:31:21.330] ..$ ... : [13:31:21.330] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:21.330] - attr(*, "resolved")= logi FALSE [13:31:21.330] - attr(*, "total_size")= num 4968 [13:31:21.334] Packages to be attached in all futures: [n=1] 'listenv' [13:31:21.334] getGlobalsAndPackagesXApply() ... DONE [13:31:21.334] Number of futures (= number of chunks): 2 [13:31:21.334] Launching 2 futures (chunks) ... [13:31:21.335] Chunk #1 of 2 ... [13:31:21.335] - Finding globals in 'X' for chunk #1 ... [13:31:21.335] getGlobalsAndPackages() ... [13:31:21.335] Searching for globals... [13:31:21.336] [13:31:21.336] Searching for globals ... DONE [13:31:21.336] - globals: [0] [13:31:21.336] getGlobalsAndPackages() ... DONE [13:31:21.336] + additional globals found: [n=0] [13:31:21.336] + additional namespaces needed: [n=0] [13:31:21.337] - Finding globals in 'X' for chunk #1 ... DONE [13:31:21.337] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:21.337] - seeds: [13:31:21.337] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.337] getGlobalsAndPackages() ... [13:31:21.337] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.338] Resolving globals: FALSE [13:31:21.338] Tweak future expression to call with '...' arguments ... [13:31:21.338] { [13:31:21.338] do.call(function(...) { [13:31:21.338] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.338] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:21.338] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.338] on.exit(options(oopts), add = TRUE) [13:31:21.338] } [13:31:21.338] { [13:31:21.338] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:21.338] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.338] ...future.FUN(...future.X_jj, ...) [13:31:21.338] }) [13:31:21.338] } [13:31:21.338] }, args = future.call.arguments) [13:31:21.338] } [13:31:21.338] Tweak future expression to call with '...' arguments ... DONE [13:31:21.339] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.339] - packages: [1] 'listenv' [13:31:21.339] getGlobalsAndPackages() ... DONE [13:31:21.340] run() for 'Future' ... [13:31:21.340] - state: 'created' [13:31:21.340] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:21.343] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.343] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:21.343] - Field: 'label' [13:31:21.344] - Field: 'local' [13:31:21.344] - Field: 'owner' [13:31:21.344] - Field: 'envir' [13:31:21.344] - Field: 'packages' [13:31:21.344] - Field: 'gc' [13:31:21.345] - Field: 'conditions' [13:31:21.345] - Field: 'expr' [13:31:21.345] - Field: 'uuid' [13:31:21.345] - Field: 'seed' [13:31:21.345] - Field: 'version' [13:31:21.345] - Field: 'result' [13:31:21.346] - Field: 'asynchronous' [13:31:21.346] - Field: 'calls' [13:31:21.346] - Field: 'globals' [13:31:21.346] - Field: 'stdout' [13:31:21.346] - Field: 'earlySignal' [13:31:21.347] - Field: 'lazy' [13:31:21.347] - Field: 'state' [13:31:21.347] - Field: '.cluster' [13:31:21.347] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:21.347] - Launch lazy future ... [13:31:21.347] Packages needed by the future expression (n = 1): 'listenv' [13:31:21.348] Packages needed by future strategies (n = 0): [13:31:21.348] { [13:31:21.348] { [13:31:21.348] { [13:31:21.348] ...future.startTime <- base::Sys.time() [13:31:21.348] { [13:31:21.348] { [13:31:21.348] { [13:31:21.348] { [13:31:21.348] base::local({ [13:31:21.348] has_future <- base::requireNamespace("future", [13:31:21.348] quietly = TRUE) [13:31:21.348] if (has_future) { [13:31:21.348] ns <- base::getNamespace("future") [13:31:21.348] version <- ns[[".package"]][["version"]] [13:31:21.348] if (is.null(version)) [13:31:21.348] version <- utils::packageVersion("future") [13:31:21.348] } [13:31:21.348] else { [13:31:21.348] version <- NULL [13:31:21.348] } [13:31:21.348] if (!has_future || version < "1.8.0") { [13:31:21.348] info <- base::c(r_version = base::gsub("R version ", [13:31:21.348] "", base::R.version$version.string), [13:31:21.348] platform = base::sprintf("%s (%s-bit)", [13:31:21.348] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:21.348] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:21.348] "release", "version")], collapse = " "), [13:31:21.348] hostname = base::Sys.info()[["nodename"]]) [13:31:21.348] info <- base::sprintf("%s: %s", base::names(info), [13:31:21.348] info) [13:31:21.348] info <- base::paste(info, collapse = "; ") [13:31:21.348] if (!has_future) { [13:31:21.348] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:21.348] info) [13:31:21.348] } [13:31:21.348] else { [13:31:21.348] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:21.348] info, version) [13:31:21.348] } [13:31:21.348] base::stop(msg) [13:31:21.348] } [13:31:21.348] }) [13:31:21.348] } [13:31:21.348] base::local({ [13:31:21.348] for (pkg in "listenv") { [13:31:21.348] base::loadNamespace(pkg) [13:31:21.348] base::library(pkg, character.only = TRUE) [13:31:21.348] } [13:31:21.348] }) [13:31:21.348] } [13:31:21.348] ...future.strategy.old <- future::plan("list") [13:31:21.348] options(future.plan = NULL) [13:31:21.348] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.348] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:21.348] } [13:31:21.348] ...future.workdir <- getwd() [13:31:21.348] } [13:31:21.348] ...future.oldOptions <- base::as.list(base::.Options) [13:31:21.348] ...future.oldEnvVars <- base::Sys.getenv() [13:31:21.348] } [13:31:21.348] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:21.348] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:21.348] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:21.348] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:21.348] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:21.348] future.stdout.windows.reencode = NULL, width = 80L) [13:31:21.348] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:21.348] base::names(...future.oldOptions)) [13:31:21.348] } [13:31:21.348] if (FALSE) { [13:31:21.348] } [13:31:21.348] else { [13:31:21.348] if (TRUE) { [13:31:21.348] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:21.348] open = "w") [13:31:21.348] } [13:31:21.348] else { [13:31:21.348] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:21.348] windows = "NUL", "/dev/null"), open = "w") [13:31:21.348] } [13:31:21.348] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:21.348] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:21.348] base::sink(type = "output", split = FALSE) [13:31:21.348] base::close(...future.stdout) [13:31:21.348] }, add = TRUE) [13:31:21.348] } [13:31:21.348] ...future.frame <- base::sys.nframe() [13:31:21.348] ...future.conditions <- base::list() [13:31:21.348] ...future.rng <- base::globalenv()$.Random.seed [13:31:21.348] if (FALSE) { [13:31:21.348] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:21.348] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:21.348] } [13:31:21.348] ...future.result <- base::tryCatch({ [13:31:21.348] base::withCallingHandlers({ [13:31:21.348] ...future.value <- base::withVisible(base::local({ [13:31:21.348] do.call(function(...) { [13:31:21.348] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.348] if (!identical(...future.globals.maxSize.org, [13:31:21.348] ...future.globals.maxSize)) { [13:31:21.348] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.348] on.exit(options(oopts), add = TRUE) [13:31:21.348] } [13:31:21.348] { [13:31:21.348] lapply(seq_along(...future.elements_ii), [13:31:21.348] FUN = function(jj) { [13:31:21.348] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.348] ...future.FUN(...future.X_jj, ...) [13:31:21.348] }) [13:31:21.348] } [13:31:21.348] }, args = future.call.arguments) [13:31:21.348] })) [13:31:21.348] future::FutureResult(value = ...future.value$value, [13:31:21.348] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.348] ...future.rng), globalenv = if (FALSE) [13:31:21.348] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:21.348] ...future.globalenv.names)) [13:31:21.348] else NULL, started = ...future.startTime, version = "1.8") [13:31:21.348] }, condition = base::local({ [13:31:21.348] c <- base::c [13:31:21.348] inherits <- base::inherits [13:31:21.348] invokeRestart <- base::invokeRestart [13:31:21.348] length <- base::length [13:31:21.348] list <- base::list [13:31:21.348] seq.int <- base::seq.int [13:31:21.348] signalCondition <- base::signalCondition [13:31:21.348] sys.calls <- base::sys.calls [13:31:21.348] `[[` <- base::`[[` [13:31:21.348] `+` <- base::`+` [13:31:21.348] `<<-` <- base::`<<-` [13:31:21.348] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:21.348] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:21.348] 3L)] [13:31:21.348] } [13:31:21.348] function(cond) { [13:31:21.348] is_error <- inherits(cond, "error") [13:31:21.348] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:21.348] NULL) [13:31:21.348] if (is_error) { [13:31:21.348] sessionInformation <- function() { [13:31:21.348] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:21.348] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:21.348] search = base::search(), system = base::Sys.info()) [13:31:21.348] } [13:31:21.348] ...future.conditions[[length(...future.conditions) + [13:31:21.348] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:21.348] cond$call), session = sessionInformation(), [13:31:21.348] timestamp = base::Sys.time(), signaled = 0L) [13:31:21.348] signalCondition(cond) [13:31:21.348] } [13:31:21.348] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:21.348] signal <- FALSE && inherits(cond, character(0)) [13:31:21.348] ...future.conditions[[length(...future.conditions) + [13:31:21.348] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:21.348] if (FALSE && !signal) { [13:31:21.348] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.348] { [13:31:21.348] inherits <- base::inherits [13:31:21.348] invokeRestart <- base::invokeRestart [13:31:21.348] is.null <- base::is.null [13:31:21.348] muffled <- FALSE [13:31:21.348] if (inherits(cond, "message")) { [13:31:21.348] muffled <- grepl(pattern, "muffleMessage") [13:31:21.348] if (muffled) [13:31:21.348] invokeRestart("muffleMessage") [13:31:21.348] } [13:31:21.348] else if (inherits(cond, "warning")) { [13:31:21.348] muffled <- grepl(pattern, "muffleWarning") [13:31:21.348] if (muffled) [13:31:21.348] invokeRestart("muffleWarning") [13:31:21.348] } [13:31:21.348] else if (inherits(cond, "condition")) { [13:31:21.348] if (!is.null(pattern)) { [13:31:21.348] computeRestarts <- base::computeRestarts [13:31:21.348] grepl <- base::grepl [13:31:21.348] restarts <- computeRestarts(cond) [13:31:21.348] for (restart in restarts) { [13:31:21.348] name <- restart$name [13:31:21.348] if (is.null(name)) [13:31:21.348] next [13:31:21.348] if (!grepl(pattern, name)) [13:31:21.348] next [13:31:21.348] invokeRestart(restart) [13:31:21.348] muffled <- TRUE [13:31:21.348] break [13:31:21.348] } [13:31:21.348] } [13:31:21.348] } [13:31:21.348] invisible(muffled) [13:31:21.348] } [13:31:21.348] muffleCondition(cond, pattern = "^muffle") [13:31:21.348] } [13:31:21.348] } [13:31:21.348] else { [13:31:21.348] if (TRUE) { [13:31:21.348] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.348] { [13:31:21.348] inherits <- base::inherits [13:31:21.348] invokeRestart <- base::invokeRestart [13:31:21.348] is.null <- base::is.null [13:31:21.348] muffled <- FALSE [13:31:21.348] if (inherits(cond, "message")) { [13:31:21.348] muffled <- grepl(pattern, "muffleMessage") [13:31:21.348] if (muffled) [13:31:21.348] invokeRestart("muffleMessage") [13:31:21.348] } [13:31:21.348] else if (inherits(cond, "warning")) { [13:31:21.348] muffled <- grepl(pattern, "muffleWarning") [13:31:21.348] if (muffled) [13:31:21.348] invokeRestart("muffleWarning") [13:31:21.348] } [13:31:21.348] else if (inherits(cond, "condition")) { [13:31:21.348] if (!is.null(pattern)) { [13:31:21.348] computeRestarts <- base::computeRestarts [13:31:21.348] grepl <- base::grepl [13:31:21.348] restarts <- computeRestarts(cond) [13:31:21.348] for (restart in restarts) { [13:31:21.348] name <- restart$name [13:31:21.348] if (is.null(name)) [13:31:21.348] next [13:31:21.348] if (!grepl(pattern, name)) [13:31:21.348] next [13:31:21.348] invokeRestart(restart) [13:31:21.348] muffled <- TRUE [13:31:21.348] break [13:31:21.348] } [13:31:21.348] } [13:31:21.348] } [13:31:21.348] invisible(muffled) [13:31:21.348] } [13:31:21.348] muffleCondition(cond, pattern = "^muffle") [13:31:21.348] } [13:31:21.348] } [13:31:21.348] } [13:31:21.348] })) [13:31:21.348] }, error = function(ex) { [13:31:21.348] base::structure(base::list(value = NULL, visible = NULL, [13:31:21.348] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.348] ...future.rng), started = ...future.startTime, [13:31:21.348] finished = Sys.time(), session_uuid = NA_character_, [13:31:21.348] version = "1.8"), class = "FutureResult") [13:31:21.348] }, finally = { [13:31:21.348] if (!identical(...future.workdir, getwd())) [13:31:21.348] setwd(...future.workdir) [13:31:21.348] { [13:31:21.348] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:21.348] ...future.oldOptions$nwarnings <- NULL [13:31:21.348] } [13:31:21.348] base::options(...future.oldOptions) [13:31:21.348] if (.Platform$OS.type == "windows") { [13:31:21.348] old_names <- names(...future.oldEnvVars) [13:31:21.348] envs <- base::Sys.getenv() [13:31:21.348] names <- names(envs) [13:31:21.348] common <- intersect(names, old_names) [13:31:21.348] added <- setdiff(names, old_names) [13:31:21.348] removed <- setdiff(old_names, names) [13:31:21.348] changed <- common[...future.oldEnvVars[common] != [13:31:21.348] envs[common]] [13:31:21.348] NAMES <- toupper(changed) [13:31:21.348] args <- list() [13:31:21.348] for (kk in seq_along(NAMES)) { [13:31:21.348] name <- changed[[kk]] [13:31:21.348] NAME <- NAMES[[kk]] [13:31:21.348] if (name != NAME && is.element(NAME, old_names)) [13:31:21.348] next [13:31:21.348] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.348] } [13:31:21.348] NAMES <- toupper(added) [13:31:21.348] for (kk in seq_along(NAMES)) { [13:31:21.348] name <- added[[kk]] [13:31:21.348] NAME <- NAMES[[kk]] [13:31:21.348] if (name != NAME && is.element(NAME, old_names)) [13:31:21.348] next [13:31:21.348] args[[name]] <- "" [13:31:21.348] } [13:31:21.348] NAMES <- toupper(removed) [13:31:21.348] for (kk in seq_along(NAMES)) { [13:31:21.348] name <- removed[[kk]] [13:31:21.348] NAME <- NAMES[[kk]] [13:31:21.348] if (name != NAME && is.element(NAME, old_names)) [13:31:21.348] next [13:31:21.348] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.348] } [13:31:21.348] if (length(args) > 0) [13:31:21.348] base::do.call(base::Sys.setenv, args = args) [13:31:21.348] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:21.348] } [13:31:21.348] else { [13:31:21.348] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:21.348] } [13:31:21.348] { [13:31:21.348] if (base::length(...future.futureOptionsAdded) > [13:31:21.348] 0L) { [13:31:21.348] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:21.348] base::names(opts) <- ...future.futureOptionsAdded [13:31:21.348] base::options(opts) [13:31:21.348] } [13:31:21.348] { [13:31:21.348] NULL [13:31:21.348] options(future.plan = NULL) [13:31:21.348] if (is.na(NA_character_)) [13:31:21.348] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.348] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:21.348] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:21.348] .init = FALSE) [13:31:21.348] } [13:31:21.348] } [13:31:21.348] } [13:31:21.348] }) [13:31:21.348] if (TRUE) { [13:31:21.348] base::sink(type = "output", split = FALSE) [13:31:21.348] if (TRUE) { [13:31:21.348] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:21.348] } [13:31:21.348] else { [13:31:21.348] ...future.result["stdout"] <- base::list(NULL) [13:31:21.348] } [13:31:21.348] base::close(...future.stdout) [13:31:21.348] ...future.stdout <- NULL [13:31:21.348] } [13:31:21.348] ...future.result$conditions <- ...future.conditions [13:31:21.348] ...future.result$finished <- base::Sys.time() [13:31:21.348] ...future.result [13:31:21.348] } [13:31:21.353] - Launch lazy future ... done [13:31:21.353] run() for 'MiraiFuture' ... done [13:31:21.353] Created future: [13:31:21.355] resolved() for 'MiraiFuture' ... [13:31:21.355] - state: 'running' [13:31:21.355] - run: TRUE [13:31:21.355] - result: 'NULL' [13:31:21.355] - resolved: FALSE [13:31:21.356] resolved() for 'MiraiFuture' ... done [13:31:21.353] MiraiFuture: [13:31:21.353] Label: 'future_lapply-1' [13:31:21.353] Expression: [13:31:21.353] { [13:31:21.353] do.call(function(...) { [13:31:21.353] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.353] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:21.353] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.353] on.exit(options(oopts), add = TRUE) [13:31:21.353] } [13:31:21.353] { [13:31:21.353] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:21.353] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.353] ...future.FUN(...future.X_jj, ...) [13:31:21.353] }) [13:31:21.353] } [13:31:21.353] }, args = future.call.arguments) [13:31:21.353] } [13:31:21.353] Lazy evaluation: FALSE [13:31:21.353] Asynchronous evaluation: TRUE [13:31:21.353] Local evaluation: TRUE [13:31:21.353] Environment: R_GlobalEnv [13:31:21.353] Capture standard output: TRUE [13:31:21.353] Capture condition classes: 'condition' (excluding 'nothing') [13:31:21.353] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:21.353] Packages: 1 packages ('listenv') [13:31:21.353] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:21.353] Resolved: FALSE [13:31:21.353] Value: [13:31:21.353] Conditions captured: [13:31:21.353] Early signaling: FALSE [13:31:21.353] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:21.353] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.356] Chunk #1 of 2 ... DONE [13:31:21.356] Chunk #2 of 2 ... [13:31:21.356] - Finding globals in 'X' for chunk #2 ... [13:31:21.357] getGlobalsAndPackages() ... [13:31:21.357] Searching for globals... [13:31:21.357] [13:31:21.357] Searching for globals ... DONE [13:31:21.358] - globals: [0] [13:31:21.358] getGlobalsAndPackages() ... DONE [13:31:21.358] + additional globals found: [n=0] [13:31:21.358] + additional namespaces needed: [n=0] [13:31:21.358] - Finding globals in 'X' for chunk #2 ... DONE [13:31:21.358] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:21.359] - seeds: [13:31:21.359] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.359] getGlobalsAndPackages() ... [13:31:21.359] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.359] Resolving globals: FALSE [13:31:21.359] Tweak future expression to call with '...' arguments ... [13:31:21.360] { [13:31:21.360] do.call(function(...) { [13:31:21.360] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.360] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:21.360] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.360] on.exit(options(oopts), add = TRUE) [13:31:21.360] } [13:31:21.360] { [13:31:21.360] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:21.360] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.360] ...future.FUN(...future.X_jj, ...) [13:31:21.360] }) [13:31:21.360] } [13:31:21.360] }, args = future.call.arguments) [13:31:21.360] } [13:31:21.360] Tweak future expression to call with '...' arguments ... DONE [13:31:21.361] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:21.361] - packages: [1] 'listenv' [13:31:21.361] getGlobalsAndPackages() ... DONE [13:31:21.361] run() for 'Future' ... [13:31:21.362] - state: 'created' [13:31:21.362] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:21.364] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.365] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:21.365] - Field: 'label' [13:31:21.365] - Field: 'local' [13:31:21.365] - Field: 'owner' [13:31:21.365] - Field: 'envir' [13:31:21.366] - Field: 'packages' [13:31:21.366] - Field: 'gc' [13:31:21.366] - Field: 'conditions' [13:31:21.366] - Field: 'expr' [13:31:21.366] - Field: 'uuid' [13:31:21.367] - Field: 'seed' [13:31:21.367] - Field: 'version' [13:31:21.367] - Field: 'result' [13:31:21.367] - Field: 'asynchronous' [13:31:21.367] - Field: 'calls' [13:31:21.367] - Field: 'globals' [13:31:21.368] - Field: 'stdout' [13:31:21.368] - Field: 'earlySignal' [13:31:21.368] - Field: 'lazy' [13:31:21.368] - Field: 'state' [13:31:21.368] - Field: '.cluster' [13:31:21.368] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:21.369] - Launch lazy future ... [13:31:21.369] Packages needed by the future expression (n = 1): 'listenv' [13:31:21.369] Packages needed by future strategies (n = 0): [13:31:21.370] { [13:31:21.370] { [13:31:21.370] { [13:31:21.370] ...future.startTime <- base::Sys.time() [13:31:21.370] { [13:31:21.370] { [13:31:21.370] { [13:31:21.370] { [13:31:21.370] base::local({ [13:31:21.370] has_future <- base::requireNamespace("future", [13:31:21.370] quietly = TRUE) [13:31:21.370] if (has_future) { [13:31:21.370] ns <- base::getNamespace("future") [13:31:21.370] version <- ns[[".package"]][["version"]] [13:31:21.370] if (is.null(version)) [13:31:21.370] version <- utils::packageVersion("future") [13:31:21.370] } [13:31:21.370] else { [13:31:21.370] version <- NULL [13:31:21.370] } [13:31:21.370] if (!has_future || version < "1.8.0") { [13:31:21.370] info <- base::c(r_version = base::gsub("R version ", [13:31:21.370] "", base::R.version$version.string), [13:31:21.370] platform = base::sprintf("%s (%s-bit)", [13:31:21.370] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:21.370] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:21.370] "release", "version")], collapse = " "), [13:31:21.370] hostname = base::Sys.info()[["nodename"]]) [13:31:21.370] info <- base::sprintf("%s: %s", base::names(info), [13:31:21.370] info) [13:31:21.370] info <- base::paste(info, collapse = "; ") [13:31:21.370] if (!has_future) { [13:31:21.370] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:21.370] info) [13:31:21.370] } [13:31:21.370] else { [13:31:21.370] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:21.370] info, version) [13:31:21.370] } [13:31:21.370] base::stop(msg) [13:31:21.370] } [13:31:21.370] }) [13:31:21.370] } [13:31:21.370] base::local({ [13:31:21.370] for (pkg in "listenv") { [13:31:21.370] base::loadNamespace(pkg) [13:31:21.370] base::library(pkg, character.only = TRUE) [13:31:21.370] } [13:31:21.370] }) [13:31:21.370] } [13:31:21.370] ...future.strategy.old <- future::plan("list") [13:31:21.370] options(future.plan = NULL) [13:31:21.370] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.370] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:21.370] } [13:31:21.370] ...future.workdir <- getwd() [13:31:21.370] } [13:31:21.370] ...future.oldOptions <- base::as.list(base::.Options) [13:31:21.370] ...future.oldEnvVars <- base::Sys.getenv() [13:31:21.370] } [13:31:21.370] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:21.370] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:21.370] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:21.370] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:21.370] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:21.370] future.stdout.windows.reencode = NULL, width = 80L) [13:31:21.370] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:21.370] base::names(...future.oldOptions)) [13:31:21.370] } [13:31:21.370] if (FALSE) { [13:31:21.370] } [13:31:21.370] else { [13:31:21.370] if (TRUE) { [13:31:21.370] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:21.370] open = "w") [13:31:21.370] } [13:31:21.370] else { [13:31:21.370] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:21.370] windows = "NUL", "/dev/null"), open = "w") [13:31:21.370] } [13:31:21.370] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:21.370] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:21.370] base::sink(type = "output", split = FALSE) [13:31:21.370] base::close(...future.stdout) [13:31:21.370] }, add = TRUE) [13:31:21.370] } [13:31:21.370] ...future.frame <- base::sys.nframe() [13:31:21.370] ...future.conditions <- base::list() [13:31:21.370] ...future.rng <- base::globalenv()$.Random.seed [13:31:21.370] if (FALSE) { [13:31:21.370] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:21.370] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:21.370] } [13:31:21.370] ...future.result <- base::tryCatch({ [13:31:21.370] base::withCallingHandlers({ [13:31:21.370] ...future.value <- base::withVisible(base::local({ [13:31:21.370] do.call(function(...) { [13:31:21.370] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.370] if (!identical(...future.globals.maxSize.org, [13:31:21.370] ...future.globals.maxSize)) { [13:31:21.370] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.370] on.exit(options(oopts), add = TRUE) [13:31:21.370] } [13:31:21.370] { [13:31:21.370] lapply(seq_along(...future.elements_ii), [13:31:21.370] FUN = function(jj) { [13:31:21.370] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.370] ...future.FUN(...future.X_jj, ...) [13:31:21.370] }) [13:31:21.370] } [13:31:21.370] }, args = future.call.arguments) [13:31:21.370] })) [13:31:21.370] future::FutureResult(value = ...future.value$value, [13:31:21.370] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.370] ...future.rng), globalenv = if (FALSE) [13:31:21.370] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:21.370] ...future.globalenv.names)) [13:31:21.370] else NULL, started = ...future.startTime, version = "1.8") [13:31:21.370] }, condition = base::local({ [13:31:21.370] c <- base::c [13:31:21.370] inherits <- base::inherits [13:31:21.370] invokeRestart <- base::invokeRestart [13:31:21.370] length <- base::length [13:31:21.370] list <- base::list [13:31:21.370] seq.int <- base::seq.int [13:31:21.370] signalCondition <- base::signalCondition [13:31:21.370] sys.calls <- base::sys.calls [13:31:21.370] `[[` <- base::`[[` [13:31:21.370] `+` <- base::`+` [13:31:21.370] `<<-` <- base::`<<-` [13:31:21.370] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:21.370] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:21.370] 3L)] [13:31:21.370] } [13:31:21.370] function(cond) { [13:31:21.370] is_error <- inherits(cond, "error") [13:31:21.370] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:21.370] NULL) [13:31:21.370] if (is_error) { [13:31:21.370] sessionInformation <- function() { [13:31:21.370] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:21.370] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:21.370] search = base::search(), system = base::Sys.info()) [13:31:21.370] } [13:31:21.370] ...future.conditions[[length(...future.conditions) + [13:31:21.370] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:21.370] cond$call), session = sessionInformation(), [13:31:21.370] timestamp = base::Sys.time(), signaled = 0L) [13:31:21.370] signalCondition(cond) [13:31:21.370] } [13:31:21.370] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:21.370] signal <- FALSE && inherits(cond, character(0)) [13:31:21.370] ...future.conditions[[length(...future.conditions) + [13:31:21.370] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:21.370] if (FALSE && !signal) { [13:31:21.370] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.370] { [13:31:21.370] inherits <- base::inherits [13:31:21.370] invokeRestart <- base::invokeRestart [13:31:21.370] is.null <- base::is.null [13:31:21.370] muffled <- FALSE [13:31:21.370] if (inherits(cond, "message")) { [13:31:21.370] muffled <- grepl(pattern, "muffleMessage") [13:31:21.370] if (muffled) [13:31:21.370] invokeRestart("muffleMessage") [13:31:21.370] } [13:31:21.370] else if (inherits(cond, "warning")) { [13:31:21.370] muffled <- grepl(pattern, "muffleWarning") [13:31:21.370] if (muffled) [13:31:21.370] invokeRestart("muffleWarning") [13:31:21.370] } [13:31:21.370] else if (inherits(cond, "condition")) { [13:31:21.370] if (!is.null(pattern)) { [13:31:21.370] computeRestarts <- base::computeRestarts [13:31:21.370] grepl <- base::grepl [13:31:21.370] restarts <- computeRestarts(cond) [13:31:21.370] for (restart in restarts) { [13:31:21.370] name <- restart$name [13:31:21.370] if (is.null(name)) [13:31:21.370] next [13:31:21.370] if (!grepl(pattern, name)) [13:31:21.370] next [13:31:21.370] invokeRestart(restart) [13:31:21.370] muffled <- TRUE [13:31:21.370] break [13:31:21.370] } [13:31:21.370] } [13:31:21.370] } [13:31:21.370] invisible(muffled) [13:31:21.370] } [13:31:21.370] muffleCondition(cond, pattern = "^muffle") [13:31:21.370] } [13:31:21.370] } [13:31:21.370] else { [13:31:21.370] if (TRUE) { [13:31:21.370] muffleCondition <- function (cond, pattern = "^muffle") [13:31:21.370] { [13:31:21.370] inherits <- base::inherits [13:31:21.370] invokeRestart <- base::invokeRestart [13:31:21.370] is.null <- base::is.null [13:31:21.370] muffled <- FALSE [13:31:21.370] if (inherits(cond, "message")) { [13:31:21.370] muffled <- grepl(pattern, "muffleMessage") [13:31:21.370] if (muffled) [13:31:21.370] invokeRestart("muffleMessage") [13:31:21.370] } [13:31:21.370] else if (inherits(cond, "warning")) { [13:31:21.370] muffled <- grepl(pattern, "muffleWarning") [13:31:21.370] if (muffled) [13:31:21.370] invokeRestart("muffleWarning") [13:31:21.370] } [13:31:21.370] else if (inherits(cond, "condition")) { [13:31:21.370] if (!is.null(pattern)) { [13:31:21.370] computeRestarts <- base::computeRestarts [13:31:21.370] grepl <- base::grepl [13:31:21.370] restarts <- computeRestarts(cond) [13:31:21.370] for (restart in restarts) { [13:31:21.370] name <- restart$name [13:31:21.370] if (is.null(name)) [13:31:21.370] next [13:31:21.370] if (!grepl(pattern, name)) [13:31:21.370] next [13:31:21.370] invokeRestart(restart) [13:31:21.370] muffled <- TRUE [13:31:21.370] break [13:31:21.370] } [13:31:21.370] } [13:31:21.370] } [13:31:21.370] invisible(muffled) [13:31:21.370] } [13:31:21.370] muffleCondition(cond, pattern = "^muffle") [13:31:21.370] } [13:31:21.370] } [13:31:21.370] } [13:31:21.370] })) [13:31:21.370] }, error = function(ex) { [13:31:21.370] base::structure(base::list(value = NULL, visible = NULL, [13:31:21.370] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:21.370] ...future.rng), started = ...future.startTime, [13:31:21.370] finished = Sys.time(), session_uuid = NA_character_, [13:31:21.370] version = "1.8"), class = "FutureResult") [13:31:21.370] }, finally = { [13:31:21.370] if (!identical(...future.workdir, getwd())) [13:31:21.370] setwd(...future.workdir) [13:31:21.370] { [13:31:21.370] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:21.370] ...future.oldOptions$nwarnings <- NULL [13:31:21.370] } [13:31:21.370] base::options(...future.oldOptions) [13:31:21.370] if (.Platform$OS.type == "windows") { [13:31:21.370] old_names <- names(...future.oldEnvVars) [13:31:21.370] envs <- base::Sys.getenv() [13:31:21.370] names <- names(envs) [13:31:21.370] common <- intersect(names, old_names) [13:31:21.370] added <- setdiff(names, old_names) [13:31:21.370] removed <- setdiff(old_names, names) [13:31:21.370] changed <- common[...future.oldEnvVars[common] != [13:31:21.370] envs[common]] [13:31:21.370] NAMES <- toupper(changed) [13:31:21.370] args <- list() [13:31:21.370] for (kk in seq_along(NAMES)) { [13:31:21.370] name <- changed[[kk]] [13:31:21.370] NAME <- NAMES[[kk]] [13:31:21.370] if (name != NAME && is.element(NAME, old_names)) [13:31:21.370] next [13:31:21.370] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.370] } [13:31:21.370] NAMES <- toupper(added) [13:31:21.370] for (kk in seq_along(NAMES)) { [13:31:21.370] name <- added[[kk]] [13:31:21.370] NAME <- NAMES[[kk]] [13:31:21.370] if (name != NAME && is.element(NAME, old_names)) [13:31:21.370] next [13:31:21.370] args[[name]] <- "" [13:31:21.370] } [13:31:21.370] NAMES <- toupper(removed) [13:31:21.370] for (kk in seq_along(NAMES)) { [13:31:21.370] name <- removed[[kk]] [13:31:21.370] NAME <- NAMES[[kk]] [13:31:21.370] if (name != NAME && is.element(NAME, old_names)) [13:31:21.370] next [13:31:21.370] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:21.370] } [13:31:21.370] if (length(args) > 0) [13:31:21.370] base::do.call(base::Sys.setenv, args = args) [13:31:21.370] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:21.370] } [13:31:21.370] else { [13:31:21.370] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:21.370] } [13:31:21.370] { [13:31:21.370] if (base::length(...future.futureOptionsAdded) > [13:31:21.370] 0L) { [13:31:21.370] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:21.370] base::names(opts) <- ...future.futureOptionsAdded [13:31:21.370] base::options(opts) [13:31:21.370] } [13:31:21.370] { [13:31:21.370] NULL [13:31:21.370] options(future.plan = NULL) [13:31:21.370] if (is.na(NA_character_)) [13:31:21.370] Sys.unsetenv("R_FUTURE_PLAN") [13:31:21.370] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:21.370] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:21.370] .init = FALSE) [13:31:21.370] } [13:31:21.370] } [13:31:21.370] } [13:31:21.370] }) [13:31:21.370] if (TRUE) { [13:31:21.370] base::sink(type = "output", split = FALSE) [13:31:21.370] if (TRUE) { [13:31:21.370] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:21.370] } [13:31:21.370] else { [13:31:21.370] ...future.result["stdout"] <- base::list(NULL) [13:31:21.370] } [13:31:21.370] base::close(...future.stdout) [13:31:21.370] ...future.stdout <- NULL [13:31:21.370] } [13:31:21.370] ...future.result$conditions <- ...future.conditions [13:31:21.370] ...future.result$finished <- base::Sys.time() [13:31:21.370] ...future.result [13:31:21.370] } [13:31:21.374] - Launch lazy future ... done [13:31:21.374] run() for 'MiraiFuture' ... done [13:31:21.375] Created future: [13:31:21.376] resolved() for 'MiraiFuture' ... [13:31:21.376] - state: 'running' [13:31:21.376] - run: TRUE [13:31:21.377] - result: 'NULL' [13:31:21.377] - resolved: FALSE [13:31:21.377] resolved() for 'MiraiFuture' ... done [13:31:21.375] MiraiFuture: [13:31:21.375] Label: 'future_lapply-2' [13:31:21.375] Expression: [13:31:21.375] { [13:31:21.375] do.call(function(...) { [13:31:21.375] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:21.375] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:21.375] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:21.375] on.exit(options(oopts), add = TRUE) [13:31:21.375] } [13:31:21.375] { [13:31:21.375] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:21.375] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:21.375] ...future.FUN(...future.X_jj, ...) [13:31:21.375] }) [13:31:21.375] } [13:31:21.375] }, args = future.call.arguments) [13:31:21.375] } [13:31:21.375] Lazy evaluation: FALSE [13:31:21.375] Asynchronous evaluation: TRUE [13:31:21.375] Local evaluation: TRUE [13:31:21.375] Environment: R_GlobalEnv [13:31:21.375] Capture standard output: TRUE [13:31:21.375] Capture condition classes: 'condition' (excluding 'nothing') [13:31:21.375] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:21.375] Packages: 1 packages ('listenv') [13:31:21.375] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:21.375] Resolved: FALSE [13:31:21.375] Value: [13:31:21.375] Conditions captured: [13:31:21.375] Early signaling: FALSE [13:31:21.375] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:21.375] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:21.377] Chunk #2 of 2 ... DONE [13:31:21.378] Launching 2 futures (chunks) ... DONE [13:31:21.378] Resolving 2 futures (chunks) ... [13:31:21.378] resolve() on list ... [13:31:21.378] recursive: 0 [13:31:21.378] length: 2 [13:31:21.378] [13:31:21.379] resolved() for 'MiraiFuture' ... [13:31:21.379] - state: 'running' [13:31:21.379] - run: TRUE [13:31:21.379] - result: 'NULL' [13:31:21.379] - resolved: FALSE [13:31:21.379] resolved() for 'MiraiFuture' ... done [13:31:21.380] Future #1 [13:31:21.380] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:21.380] - nx: 2 [13:31:21.380] - relay: TRUE [13:31:21.380] - stdout: TRUE [13:31:21.381] - signal: TRUE [13:31:21.381] - resignal: FALSE [13:31:21.381] - force: TRUE [13:31:21.381] - relayed: [n=2] FALSE, FALSE [13:31:21.381] - queued futures: [n=2] FALSE, FALSE [13:31:21.381] - until=1 [13:31:21.382] - relaying element #1 [13:31:21.382] - relayed: [n=2] TRUE, FALSE [13:31:21.382] - queued futures: [n=2] TRUE, FALSE [13:31:21.382] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:21.382] length: 1 (resolved future 1) [13:31:21.383] resolved() for 'MiraiFuture' ... [13:31:21.383] - state: 'running' [13:31:21.383] - run: TRUE [13:31:21.383] - result: 'NULL' [13:31:21.383] - resolved: FALSE [13:31:21.383] resolved() for 'MiraiFuture' ... done [13:31:21.384] Future #2 [13:31:21.384] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:21.384] - nx: 2 [13:31:21.384] - relay: TRUE [13:31:21.384] - stdout: TRUE [13:31:21.385] - signal: TRUE [13:31:21.385] - resignal: FALSE [13:31:21.385] - force: TRUE [13:31:21.385] - relayed: [n=2] TRUE, FALSE [13:31:21.385] - queued futures: [n=2] TRUE, FALSE [13:31:21.385] - until=2 [13:31:21.385] - relaying element #2 [13:31:21.386] - relayed: [n=2] TRUE, TRUE [13:31:21.386] - queued futures: [n=2] TRUE, TRUE [13:31:21.386] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:21.386] length: 0 (resolved future 2) [13:31:21.386] Relaying remaining futures [13:31:21.387] signalConditionsASAP(NULL, pos=0) ... [13:31:21.387] - nx: 2 [13:31:21.387] - relay: TRUE [13:31:21.387] - stdout: TRUE [13:31:21.387] - signal: TRUE [13:31:21.387] - resignal: FALSE [13:31:21.388] - force: TRUE [13:31:21.388] - relayed: [n=2] TRUE, TRUE [13:31:21.388] - queued futures: [n=2] TRUE, TRUE - flush all [13:31:21.388] - relayed: [n=2] TRUE, TRUE [13:31:21.388] - queued futures: [n=2] TRUE, TRUE [13:31:21.388] signalConditionsASAP(NULL, pos=0) ... done [13:31:21.389] resolve() on list ... DONE [13:31:21.389] - Number of value chunks collected: 2 [13:31:21.389] Resolving 2 futures (chunks) ... DONE [13:31:21.389] Reducing values from 2 chunks ... [13:31:21.389] - Number of values collected after concatenation: 2 [13:31:21.389] - Number of values expected: 2 [13:31:21.390] Reducing values from 2 chunks ... DONE [13:31:21.390] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN, ...) for large length(x) ... [13:31:21.392] future_lapply() ... [13:31:21.445] Number of chunks: 2 [13:31:21.446] getGlobalsAndPackagesXApply() ... [13:31:21.446] - future.globals: TRUE [13:31:21.446] getGlobalsAndPackages() ... [13:31:21.446] Searching for globals... [13:31:21.449] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [13:31:21.449] Searching for globals ... DONE [13:31:21.449] Resolving globals: FALSE [13:31:21.450] The total size of the 2 globals is 784 bytes (784 bytes) [13:31:21.450] The total size of the 2 globals exported for future expression ('FUN()') is 784 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'FUN' (728 bytes of class 'function') and 'a' (56 bytes of class 'numeric') [13:31:21.451] - globals: [2] 'FUN', 'a' [13:31:21.451] [13:31:21.451] getGlobalsAndPackages() ... DONE [13:31:21.451] - globals found/used: [n=2] 'FUN', 'a' [13:31:21.451] - needed namespaces: [n=0] [13:31:21.452] Finding globals ... DONE [13:31:21.452] - use_args: TRUE [13:31:21.452] - Getting '...' globals ... [13:31:21.460] resolve() on list ... [13:31:21.460] recursive: 0 [13:31:21.461] length: 1 [13:31:21.461] elements: '...' [13:31:21.461] length: 0 (resolved future 1) [13:31:21.461] resolve() on list ... DONE [13:31:21.461] - '...' content: [n=0] [13:31:21.461] List of 1 [13:31:21.461] $ ...: list() [13:31:21.461] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:21.461] - attr(*, "where")=List of 1 [13:31:21.461] ..$ ...: [13:31:21.461] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:21.461] - attr(*, "resolved")= logi TRUE [13:31:21.461] - attr(*, "total_size")= num NA [13:31:21.465] - Getting '...' globals ... DONE [13:31:21.466] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [13:31:21.466] List of 3 [13:31:21.466] $ ...future.FUN:function (z) [13:31:21.466] $ a : num 3.14 [13:31:21.466] $ ... : list() [13:31:21.466] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:21.466] - attr(*, "where")=List of 3 [13:31:21.466] ..$ ...future.FUN: [13:31:21.466] ..$ a : [13:31:21.466] ..$ ... : [13:31:21.466] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:21.466] - attr(*, "resolved")= logi FALSE [13:31:21.466] - attr(*, "total_size")= num 784 [13:31:21.471] Packages to be attached in all futures: [n=0] [13:31:21.471] getGlobalsAndPackagesXApply() ... DONE [13:31:21.472] Number of futures (= number of chunks): 2 [13:31:21.472] Launching 2 futures (chunks) ... [13:31:21.472] Chunk #1 of 2 ... [13:31:21.573] - Finding globals in 'X' for chunk #1 ... [13:31:21.574] getGlobalsAndPackages() ... [13:31:21.574] Searching for globals... [13:31:22.081] [13:31:22.081] Searching for globals ... DONE [13:31:22.081] - globals: [0] [13:31:22.081] getGlobalsAndPackages() ... DONE [13:31:22.082] + additional globals found: [n=0] [13:31:22.082] + additional namespaces needed: [n=0] [13:31:22.082] - Finding globals in 'X' for chunk #1 ... DONE [13:31:22.082] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:22.082] - seeds: [13:31:22.083] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:22.083] getGlobalsAndPackages() ... [13:31:22.083] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:22.083] Resolving globals: FALSE [13:31:22.083] Tweak future expression to call with '...' arguments ... [13:31:22.084] { [13:31:22.084] do.call(function(...) { [13:31:22.084] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:22.084] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:22.084] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:22.084] on.exit(options(oopts), add = TRUE) [13:31:22.084] } [13:31:22.084] { [13:31:22.084] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:22.084] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:22.084] ...future.FUN(...future.X_jj, ...) [13:31:22.084] }) [13:31:22.084] } [13:31:22.084] }, args = future.call.arguments) [13:31:22.084] } [13:31:22.084] Tweak future expression to call with '...' arguments ... DONE [13:31:22.085] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:22.085] [13:31:22.085] getGlobalsAndPackages() ... DONE [13:31:22.086] run() for 'Future' ... [13:31:22.086] - state: 'created' [13:31:22.086] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:22.089] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:22.089] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:22.090] - Field: 'label' [13:31:22.090] - Field: 'local' [13:31:22.090] - Field: 'owner' [13:31:22.090] - Field: 'envir' [13:31:22.090] - Field: 'packages' [13:31:22.091] - Field: 'gc' [13:31:22.091] - Field: 'conditions' [13:31:22.091] - Field: 'expr' [13:31:22.091] - Field: 'uuid' [13:31:22.091] - Field: 'seed' [13:31:22.091] - Field: 'version' [13:31:22.092] - Field: 'result' [13:31:22.092] - Field: 'asynchronous' [13:31:22.092] - Field: 'calls' [13:31:22.092] - Field: 'globals' [13:31:22.092] - Field: 'stdout' [13:31:22.092] - Field: 'earlySignal' [13:31:22.093] - Field: 'lazy' [13:31:22.093] - Field: 'state' [13:31:22.093] - Field: '.cluster' [13:31:22.093] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:22.093] - Launch lazy future ... [13:31:22.094] Packages needed by the future expression (n = 0): [13:31:22.094] Packages needed by future strategies (n = 0): [13:31:22.094] { [13:31:22.094] { [13:31:22.094] { [13:31:22.094] ...future.startTime <- base::Sys.time() [13:31:22.094] { [13:31:22.094] { [13:31:22.094] { [13:31:22.094] base::local({ [13:31:22.094] has_future <- base::requireNamespace("future", [13:31:22.094] quietly = TRUE) [13:31:22.094] if (has_future) { [13:31:22.094] ns <- base::getNamespace("future") [13:31:22.094] version <- ns[[".package"]][["version"]] [13:31:22.094] if (is.null(version)) [13:31:22.094] version <- utils::packageVersion("future") [13:31:22.094] } [13:31:22.094] else { [13:31:22.094] version <- NULL [13:31:22.094] } [13:31:22.094] if (!has_future || version < "1.8.0") { [13:31:22.094] info <- base::c(r_version = base::gsub("R version ", [13:31:22.094] "", base::R.version$version.string), [13:31:22.094] platform = base::sprintf("%s (%s-bit)", [13:31:22.094] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:22.094] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:22.094] "release", "version")], collapse = " "), [13:31:22.094] hostname = base::Sys.info()[["nodename"]]) [13:31:22.094] info <- base::sprintf("%s: %s", base::names(info), [13:31:22.094] info) [13:31:22.094] info <- base::paste(info, collapse = "; ") [13:31:22.094] if (!has_future) { [13:31:22.094] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:22.094] info) [13:31:22.094] } [13:31:22.094] else { [13:31:22.094] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:22.094] info, version) [13:31:22.094] } [13:31:22.094] base::stop(msg) [13:31:22.094] } [13:31:22.094] }) [13:31:22.094] } [13:31:22.094] ...future.strategy.old <- future::plan("list") [13:31:22.094] options(future.plan = NULL) [13:31:22.094] Sys.unsetenv("R_FUTURE_PLAN") [13:31:22.094] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:22.094] } [13:31:22.094] ...future.workdir <- getwd() [13:31:22.094] } [13:31:22.094] ...future.oldOptions <- base::as.list(base::.Options) [13:31:22.094] ...future.oldEnvVars <- base::Sys.getenv() [13:31:22.094] } [13:31:22.094] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:22.094] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:22.094] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:22.094] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:22.094] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:22.094] future.stdout.windows.reencode = NULL, width = 80L) [13:31:22.094] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:22.094] base::names(...future.oldOptions)) [13:31:22.094] } [13:31:22.094] if (FALSE) { [13:31:22.094] } [13:31:22.094] else { [13:31:22.094] if (TRUE) { [13:31:22.094] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:22.094] open = "w") [13:31:22.094] } [13:31:22.094] else { [13:31:22.094] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:22.094] windows = "NUL", "/dev/null"), open = "w") [13:31:22.094] } [13:31:22.094] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:22.094] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:22.094] base::sink(type = "output", split = FALSE) [13:31:22.094] base::close(...future.stdout) [13:31:22.094] }, add = TRUE) [13:31:22.094] } [13:31:22.094] ...future.frame <- base::sys.nframe() [13:31:22.094] ...future.conditions <- base::list() [13:31:22.094] ...future.rng <- base::globalenv()$.Random.seed [13:31:22.094] if (FALSE) { [13:31:22.094] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:22.094] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:22.094] } [13:31:22.094] ...future.result <- base::tryCatch({ [13:31:22.094] base::withCallingHandlers({ [13:31:22.094] ...future.value <- base::withVisible(base::local({ [13:31:22.094] do.call(function(...) { [13:31:22.094] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:22.094] if (!identical(...future.globals.maxSize.org, [13:31:22.094] ...future.globals.maxSize)) { [13:31:22.094] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:22.094] on.exit(options(oopts), add = TRUE) [13:31:22.094] } [13:31:22.094] { [13:31:22.094] lapply(seq_along(...future.elements_ii), [13:31:22.094] FUN = function(jj) { [13:31:22.094] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:22.094] ...future.FUN(...future.X_jj, ...) [13:31:22.094] }) [13:31:22.094] } [13:31:22.094] }, args = future.call.arguments) [13:31:22.094] })) [13:31:22.094] future::FutureResult(value = ...future.value$value, [13:31:22.094] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:22.094] ...future.rng), globalenv = if (FALSE) [13:31:22.094] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:22.094] ...future.globalenv.names)) [13:31:22.094] else NULL, started = ...future.startTime, version = "1.8") [13:31:22.094] }, condition = base::local({ [13:31:22.094] c <- base::c [13:31:22.094] inherits <- base::inherits [13:31:22.094] invokeRestart <- base::invokeRestart [13:31:22.094] length <- base::length [13:31:22.094] list <- base::list [13:31:22.094] seq.int <- base::seq.int [13:31:22.094] signalCondition <- base::signalCondition [13:31:22.094] sys.calls <- base::sys.calls [13:31:22.094] `[[` <- base::`[[` [13:31:22.094] `+` <- base::`+` [13:31:22.094] `<<-` <- base::`<<-` [13:31:22.094] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:22.094] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:22.094] 3L)] [13:31:22.094] } [13:31:22.094] function(cond) { [13:31:22.094] is_error <- inherits(cond, "error") [13:31:22.094] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:22.094] NULL) [13:31:22.094] if (is_error) { [13:31:22.094] sessionInformation <- function() { [13:31:22.094] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:22.094] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:22.094] search = base::search(), system = base::Sys.info()) [13:31:22.094] } [13:31:22.094] ...future.conditions[[length(...future.conditions) + [13:31:22.094] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:22.094] cond$call), session = sessionInformation(), [13:31:22.094] timestamp = base::Sys.time(), signaled = 0L) [13:31:22.094] signalCondition(cond) [13:31:22.094] } [13:31:22.094] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:22.094] signal <- FALSE && inherits(cond, character(0)) [13:31:22.094] ...future.conditions[[length(...future.conditions) + [13:31:22.094] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:22.094] if (FALSE && !signal) { [13:31:22.094] muffleCondition <- function (cond, pattern = "^muffle") [13:31:22.094] { [13:31:22.094] inherits <- base::inherits [13:31:22.094] invokeRestart <- base::invokeRestart [13:31:22.094] is.null <- base::is.null [13:31:22.094] muffled <- FALSE [13:31:22.094] if (inherits(cond, "message")) { [13:31:22.094] muffled <- grepl(pattern, "muffleMessage") [13:31:22.094] if (muffled) [13:31:22.094] invokeRestart("muffleMessage") [13:31:22.094] } [13:31:22.094] else if (inherits(cond, "warning")) { [13:31:22.094] muffled <- grepl(pattern, "muffleWarning") [13:31:22.094] if (muffled) [13:31:22.094] invokeRestart("muffleWarning") [13:31:22.094] } [13:31:22.094] else if (inherits(cond, "condition")) { [13:31:22.094] if (!is.null(pattern)) { [13:31:22.094] computeRestarts <- base::computeRestarts [13:31:22.094] grepl <- base::grepl [13:31:22.094] restarts <- computeRestarts(cond) [13:31:22.094] for (restart in restarts) { [13:31:22.094] name <- restart$name [13:31:22.094] if (is.null(name)) [13:31:22.094] next [13:31:22.094] if (!grepl(pattern, name)) [13:31:22.094] next [13:31:22.094] invokeRestart(restart) [13:31:22.094] muffled <- TRUE [13:31:22.094] break [13:31:22.094] } [13:31:22.094] } [13:31:22.094] } [13:31:22.094] invisible(muffled) [13:31:22.094] } [13:31:22.094] muffleCondition(cond, pattern = "^muffle") [13:31:22.094] } [13:31:22.094] } [13:31:22.094] else { [13:31:22.094] if (TRUE) { [13:31:22.094] muffleCondition <- function (cond, pattern = "^muffle") [13:31:22.094] { [13:31:22.094] inherits <- base::inherits [13:31:22.094] invokeRestart <- base::invokeRestart [13:31:22.094] is.null <- base::is.null [13:31:22.094] muffled <- FALSE [13:31:22.094] if (inherits(cond, "message")) { [13:31:22.094] muffled <- grepl(pattern, "muffleMessage") [13:31:22.094] if (muffled) [13:31:22.094] invokeRestart("muffleMessage") [13:31:22.094] } [13:31:22.094] else if (inherits(cond, "warning")) { [13:31:22.094] muffled <- grepl(pattern, "muffleWarning") [13:31:22.094] if (muffled) [13:31:22.094] invokeRestart("muffleWarning") [13:31:22.094] } [13:31:22.094] else if (inherits(cond, "condition")) { [13:31:22.094] if (!is.null(pattern)) { [13:31:22.094] computeRestarts <- base::computeRestarts [13:31:22.094] grepl <- base::grepl [13:31:22.094] restarts <- computeRestarts(cond) [13:31:22.094] for (restart in restarts) { [13:31:22.094] name <- restart$name [13:31:22.094] if (is.null(name)) [13:31:22.094] next [13:31:22.094] if (!grepl(pattern, name)) [13:31:22.094] next [13:31:22.094] invokeRestart(restart) [13:31:22.094] muffled <- TRUE [13:31:22.094] break [13:31:22.094] } [13:31:22.094] } [13:31:22.094] } [13:31:22.094] invisible(muffled) [13:31:22.094] } [13:31:22.094] muffleCondition(cond, pattern = "^muffle") [13:31:22.094] } [13:31:22.094] } [13:31:22.094] } [13:31:22.094] })) [13:31:22.094] }, error = function(ex) { [13:31:22.094] base::structure(base::list(value = NULL, visible = NULL, [13:31:22.094] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:22.094] ...future.rng), started = ...future.startTime, [13:31:22.094] finished = Sys.time(), session_uuid = NA_character_, [13:31:22.094] version = "1.8"), class = "FutureResult") [13:31:22.094] }, finally = { [13:31:22.094] if (!identical(...future.workdir, getwd())) [13:31:22.094] setwd(...future.workdir) [13:31:22.094] { [13:31:22.094] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:22.094] ...future.oldOptions$nwarnings <- NULL [13:31:22.094] } [13:31:22.094] base::options(...future.oldOptions) [13:31:22.094] if (.Platform$OS.type == "windows") { [13:31:22.094] old_names <- names(...future.oldEnvVars) [13:31:22.094] envs <- base::Sys.getenv() [13:31:22.094] names <- names(envs) [13:31:22.094] common <- intersect(names, old_names) [13:31:22.094] added <- setdiff(names, old_names) [13:31:22.094] removed <- setdiff(old_names, names) [13:31:22.094] changed <- common[...future.oldEnvVars[common] != [13:31:22.094] envs[common]] [13:31:22.094] NAMES <- toupper(changed) [13:31:22.094] args <- list() [13:31:22.094] for (kk in seq_along(NAMES)) { [13:31:22.094] name <- changed[[kk]] [13:31:22.094] NAME <- NAMES[[kk]] [13:31:22.094] if (name != NAME && is.element(NAME, old_names)) [13:31:22.094] next [13:31:22.094] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:22.094] } [13:31:22.094] NAMES <- toupper(added) [13:31:22.094] for (kk in seq_along(NAMES)) { [13:31:22.094] name <- added[[kk]] [13:31:22.094] NAME <- NAMES[[kk]] [13:31:22.094] if (name != NAME && is.element(NAME, old_names)) [13:31:22.094] next [13:31:22.094] args[[name]] <- "" [13:31:22.094] } [13:31:22.094] NAMES <- toupper(removed) [13:31:22.094] for (kk in seq_along(NAMES)) { [13:31:22.094] name <- removed[[kk]] [13:31:22.094] NAME <- NAMES[[kk]] [13:31:22.094] if (name != NAME && is.element(NAME, old_names)) [13:31:22.094] next [13:31:22.094] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:22.094] } [13:31:22.094] if (length(args) > 0) [13:31:22.094] base::do.call(base::Sys.setenv, args = args) [13:31:22.094] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:22.094] } [13:31:22.094] else { [13:31:22.094] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:22.094] } [13:31:22.094] { [13:31:22.094] if (base::length(...future.futureOptionsAdded) > [13:31:22.094] 0L) { [13:31:22.094] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:22.094] base::names(opts) <- ...future.futureOptionsAdded [13:31:22.094] base::options(opts) [13:31:22.094] } [13:31:22.094] { [13:31:22.094] NULL [13:31:22.094] options(future.plan = NULL) [13:31:22.094] if (is.na(NA_character_)) [13:31:22.094] Sys.unsetenv("R_FUTURE_PLAN") [13:31:22.094] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:22.094] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:22.094] .init = FALSE) [13:31:22.094] } [13:31:22.094] } [13:31:22.094] } [13:31:22.094] }) [13:31:22.094] if (TRUE) { [13:31:22.094] base::sink(type = "output", split = FALSE) [13:31:22.094] if (TRUE) { [13:31:22.094] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:22.094] } [13:31:22.094] else { [13:31:22.094] ...future.result["stdout"] <- base::list(NULL) [13:31:22.094] } [13:31:22.094] base::close(...future.stdout) [13:31:22.094] ...future.stdout <- NULL [13:31:22.094] } [13:31:22.094] ...future.result$conditions <- ...future.conditions [13:31:22.094] ...future.result$finished <- base::Sys.time() [13:31:22.094] ...future.result [13:31:22.094] } [13:31:22.131] - Launch lazy future ... done [13:31:22.132] run() for 'MiraiFuture' ... done [13:31:22.132] Created future: [13:31:24.263] resolved() for 'MiraiFuture' ... [13:31:24.263] - state: 'running' [13:31:24.264] - run: TRUE [13:31:24.264] - result: 'NULL' [13:31:24.264] - resolved: FALSE [13:31:24.264] resolved() for 'MiraiFuture' ... done [13:31:22.132] MiraiFuture: [13:31:22.132] Label: 'future_lapply-1' [13:31:22.132] Expression: [13:31:22.132] { [13:31:22.132] do.call(function(...) { [13:31:22.132] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:22.132] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:22.132] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:22.132] on.exit(options(oopts), add = TRUE) [13:31:22.132] } [13:31:22.132] { [13:31:22.132] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:22.132] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:22.132] ...future.FUN(...future.X_jj, ...) [13:31:22.132] }) [13:31:22.132] } [13:31:22.132] }, args = future.call.arguments) [13:31:22.132] } [13:31:22.132] Lazy evaluation: FALSE [13:31:22.132] Asynchronous evaluation: TRUE [13:31:22.132] Local evaluation: TRUE [13:31:22.132] Environment: R_GlobalEnv [13:31:22.132] Capture standard output: TRUE [13:31:22.132] Capture condition classes: 'condition' (excluding 'nothing') [13:31:22.132] Globals: 6 objects totaling 26.70 MiB (function '...future.FUN' of 728 bytes, numeric 'a' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 26.70 MiB, NULL '...future.seeds_ii' of 0 bytes, ...) [13:31:22.132] Packages: [13:31:22.132] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:22.132] Resolved: TRUE [13:31:22.132] Value: [13:31:22.132] Conditions captured: [13:31:22.132] Early signaling: FALSE [13:31:22.132] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:22.132] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:24.289] Chunk #1 of 2 ... DONE [13:31:24.290] Chunk #2 of 2 ... [13:31:24.396] - Finding globals in 'X' for chunk #2 ... [13:31:24.397] getGlobalsAndPackages() ... [13:31:24.397] Searching for globals... [13:31:24.743] [13:31:24.744] Searching for globals ... DONE [13:31:24.744] - globals: [0] [13:31:24.744] getGlobalsAndPackages() ... DONE [13:31:24.744] + additional globals found: [n=0] [13:31:24.744] + additional namespaces needed: [n=0] [13:31:24.744] - Finding globals in 'X' for chunk #2 ... DONE [13:31:24.744] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:24.744] - seeds: [13:31:24.745] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:24.745] getGlobalsAndPackages() ... [13:31:24.745] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:24.745] Resolving globals: FALSE [13:31:24.745] Tweak future expression to call with '...' arguments ... [13:31:24.745] { [13:31:24.745] do.call(function(...) { [13:31:24.745] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:24.745] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:24.745] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:24.745] on.exit(options(oopts), add = TRUE) [13:31:24.745] } [13:31:24.745] { [13:31:24.745] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:24.745] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:24.745] ...future.FUN(...future.X_jj, ...) [13:31:24.745] }) [13:31:24.745] } [13:31:24.745] }, args = future.call.arguments) [13:31:24.745] } [13:31:24.746] Tweak future expression to call with '...' arguments ... DONE [13:31:24.746] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:24.746] [13:31:24.746] getGlobalsAndPackages() ... DONE [13:31:24.747] run() for 'Future' ... [13:31:24.747] - state: 'created' [13:31:24.747] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:24.749] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:24.749] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:24.749] - Field: 'label' [13:31:24.749] - Field: 'local' [13:31:24.750] - Field: 'owner' [13:31:24.750] - Field: 'envir' [13:31:24.750] - Field: 'packages' [13:31:24.750] - Field: 'gc' [13:31:24.750] - Field: 'conditions' [13:31:24.750] - Field: 'expr' [13:31:24.750] - Field: 'uuid' [13:31:24.750] - Field: 'seed' [13:31:24.751] - Field: 'version' [13:31:24.751] - Field: 'result' [13:31:24.751] - Field: 'asynchronous' [13:31:24.751] - Field: 'calls' [13:31:24.751] - Field: 'globals' [13:31:24.751] - Field: 'stdout' [13:31:24.751] - Field: 'earlySignal' [13:31:24.751] - Field: 'lazy' [13:31:24.752] - Field: 'state' [13:31:24.752] - Field: '.cluster' [13:31:24.752] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:24.752] - Launch lazy future ... [13:31:24.752] Packages needed by the future expression (n = 0): [13:31:24.752] Packages needed by future strategies (n = 0): [13:31:24.753] { [13:31:24.753] { [13:31:24.753] { [13:31:24.753] ...future.startTime <- base::Sys.time() [13:31:24.753] { [13:31:24.753] { [13:31:24.753] { [13:31:24.753] base::local({ [13:31:24.753] has_future <- base::requireNamespace("future", [13:31:24.753] quietly = TRUE) [13:31:24.753] if (has_future) { [13:31:24.753] ns <- base::getNamespace("future") [13:31:24.753] version <- ns[[".package"]][["version"]] [13:31:24.753] if (is.null(version)) [13:31:24.753] version <- utils::packageVersion("future") [13:31:24.753] } [13:31:24.753] else { [13:31:24.753] version <- NULL [13:31:24.753] } [13:31:24.753] if (!has_future || version < "1.8.0") { [13:31:24.753] info <- base::c(r_version = base::gsub("R version ", [13:31:24.753] "", base::R.version$version.string), [13:31:24.753] platform = base::sprintf("%s (%s-bit)", [13:31:24.753] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:24.753] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:24.753] "release", "version")], collapse = " "), [13:31:24.753] hostname = base::Sys.info()[["nodename"]]) [13:31:24.753] info <- base::sprintf("%s: %s", base::names(info), [13:31:24.753] info) [13:31:24.753] info <- base::paste(info, collapse = "; ") [13:31:24.753] if (!has_future) { [13:31:24.753] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:24.753] info) [13:31:24.753] } [13:31:24.753] else { [13:31:24.753] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:24.753] info, version) [13:31:24.753] } [13:31:24.753] base::stop(msg) [13:31:24.753] } [13:31:24.753] }) [13:31:24.753] } [13:31:24.753] ...future.strategy.old <- future::plan("list") [13:31:24.753] options(future.plan = NULL) [13:31:24.753] Sys.unsetenv("R_FUTURE_PLAN") [13:31:24.753] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:24.753] } [13:31:24.753] ...future.workdir <- getwd() [13:31:24.753] } [13:31:24.753] ...future.oldOptions <- base::as.list(base::.Options) [13:31:24.753] ...future.oldEnvVars <- base::Sys.getenv() [13:31:24.753] } [13:31:24.753] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:24.753] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:24.753] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:24.753] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:24.753] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:24.753] future.stdout.windows.reencode = NULL, width = 80L) [13:31:24.753] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:24.753] base::names(...future.oldOptions)) [13:31:24.753] } [13:31:24.753] if (FALSE) { [13:31:24.753] } [13:31:24.753] else { [13:31:24.753] if (TRUE) { [13:31:24.753] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:24.753] open = "w") [13:31:24.753] } [13:31:24.753] else { [13:31:24.753] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:24.753] windows = "NUL", "/dev/null"), open = "w") [13:31:24.753] } [13:31:24.753] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:24.753] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:24.753] base::sink(type = "output", split = FALSE) [13:31:24.753] base::close(...future.stdout) [13:31:24.753] }, add = TRUE) [13:31:24.753] } [13:31:24.753] ...future.frame <- base::sys.nframe() [13:31:24.753] ...future.conditions <- base::list() [13:31:24.753] ...future.rng <- base::globalenv()$.Random.seed [13:31:24.753] if (FALSE) { [13:31:24.753] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:24.753] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:24.753] } [13:31:24.753] ...future.result <- base::tryCatch({ [13:31:24.753] base::withCallingHandlers({ [13:31:24.753] ...future.value <- base::withVisible(base::local({ [13:31:24.753] do.call(function(...) { [13:31:24.753] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:24.753] if (!identical(...future.globals.maxSize.org, [13:31:24.753] ...future.globals.maxSize)) { [13:31:24.753] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:24.753] on.exit(options(oopts), add = TRUE) [13:31:24.753] } [13:31:24.753] { [13:31:24.753] lapply(seq_along(...future.elements_ii), [13:31:24.753] FUN = function(jj) { [13:31:24.753] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:24.753] ...future.FUN(...future.X_jj, ...) [13:31:24.753] }) [13:31:24.753] } [13:31:24.753] }, args = future.call.arguments) [13:31:24.753] })) [13:31:24.753] future::FutureResult(value = ...future.value$value, [13:31:24.753] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:24.753] ...future.rng), globalenv = if (FALSE) [13:31:24.753] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:24.753] ...future.globalenv.names)) [13:31:24.753] else NULL, started = ...future.startTime, version = "1.8") [13:31:24.753] }, condition = base::local({ [13:31:24.753] c <- base::c [13:31:24.753] inherits <- base::inherits [13:31:24.753] invokeRestart <- base::invokeRestart [13:31:24.753] length <- base::length [13:31:24.753] list <- base::list [13:31:24.753] seq.int <- base::seq.int [13:31:24.753] signalCondition <- base::signalCondition [13:31:24.753] sys.calls <- base::sys.calls [13:31:24.753] `[[` <- base::`[[` [13:31:24.753] `+` <- base::`+` [13:31:24.753] `<<-` <- base::`<<-` [13:31:24.753] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:24.753] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:24.753] 3L)] [13:31:24.753] } [13:31:24.753] function(cond) { [13:31:24.753] is_error <- inherits(cond, "error") [13:31:24.753] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:24.753] NULL) [13:31:24.753] if (is_error) { [13:31:24.753] sessionInformation <- function() { [13:31:24.753] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:24.753] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:24.753] search = base::search(), system = base::Sys.info()) [13:31:24.753] } [13:31:24.753] ...future.conditions[[length(...future.conditions) + [13:31:24.753] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:24.753] cond$call), session = sessionInformation(), [13:31:24.753] timestamp = base::Sys.time(), signaled = 0L) [13:31:24.753] signalCondition(cond) [13:31:24.753] } [13:31:24.753] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:24.753] signal <- FALSE && inherits(cond, character(0)) [13:31:24.753] ...future.conditions[[length(...future.conditions) + [13:31:24.753] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:24.753] if (FALSE && !signal) { [13:31:24.753] muffleCondition <- function (cond, pattern = "^muffle") [13:31:24.753] { [13:31:24.753] inherits <- base::inherits [13:31:24.753] invokeRestart <- base::invokeRestart [13:31:24.753] is.null <- base::is.null [13:31:24.753] muffled <- FALSE [13:31:24.753] if (inherits(cond, "message")) { [13:31:24.753] muffled <- grepl(pattern, "muffleMessage") [13:31:24.753] if (muffled) [13:31:24.753] invokeRestart("muffleMessage") [13:31:24.753] } [13:31:24.753] else if (inherits(cond, "warning")) { [13:31:24.753] muffled <- grepl(pattern, "muffleWarning") [13:31:24.753] if (muffled) [13:31:24.753] invokeRestart("muffleWarning") [13:31:24.753] } [13:31:24.753] else if (inherits(cond, "condition")) { [13:31:24.753] if (!is.null(pattern)) { [13:31:24.753] computeRestarts <- base::computeRestarts [13:31:24.753] grepl <- base::grepl [13:31:24.753] restarts <- computeRestarts(cond) [13:31:24.753] for (restart in restarts) { [13:31:24.753] name <- restart$name [13:31:24.753] if (is.null(name)) [13:31:24.753] next [13:31:24.753] if (!grepl(pattern, name)) [13:31:24.753] next [13:31:24.753] invokeRestart(restart) [13:31:24.753] muffled <- TRUE [13:31:24.753] break [13:31:24.753] } [13:31:24.753] } [13:31:24.753] } [13:31:24.753] invisible(muffled) [13:31:24.753] } [13:31:24.753] muffleCondition(cond, pattern = "^muffle") [13:31:24.753] } [13:31:24.753] } [13:31:24.753] else { [13:31:24.753] if (TRUE) { [13:31:24.753] muffleCondition <- function (cond, pattern = "^muffle") [13:31:24.753] { [13:31:24.753] inherits <- base::inherits [13:31:24.753] invokeRestart <- base::invokeRestart [13:31:24.753] is.null <- base::is.null [13:31:24.753] muffled <- FALSE [13:31:24.753] if (inherits(cond, "message")) { [13:31:24.753] muffled <- grepl(pattern, "muffleMessage") [13:31:24.753] if (muffled) [13:31:24.753] invokeRestart("muffleMessage") [13:31:24.753] } [13:31:24.753] else if (inherits(cond, "warning")) { [13:31:24.753] muffled <- grepl(pattern, "muffleWarning") [13:31:24.753] if (muffled) [13:31:24.753] invokeRestart("muffleWarning") [13:31:24.753] } [13:31:24.753] else if (inherits(cond, "condition")) { [13:31:24.753] if (!is.null(pattern)) { [13:31:24.753] computeRestarts <- base::computeRestarts [13:31:24.753] grepl <- base::grepl [13:31:24.753] restarts <- computeRestarts(cond) [13:31:24.753] for (restart in restarts) { [13:31:24.753] name <- restart$name [13:31:24.753] if (is.null(name)) [13:31:24.753] next [13:31:24.753] if (!grepl(pattern, name)) [13:31:24.753] next [13:31:24.753] invokeRestart(restart) [13:31:24.753] muffled <- TRUE [13:31:24.753] break [13:31:24.753] } [13:31:24.753] } [13:31:24.753] } [13:31:24.753] invisible(muffled) [13:31:24.753] } [13:31:24.753] muffleCondition(cond, pattern = "^muffle") [13:31:24.753] } [13:31:24.753] } [13:31:24.753] } [13:31:24.753] })) [13:31:24.753] }, error = function(ex) { [13:31:24.753] base::structure(base::list(value = NULL, visible = NULL, [13:31:24.753] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:24.753] ...future.rng), started = ...future.startTime, [13:31:24.753] finished = Sys.time(), session_uuid = NA_character_, [13:31:24.753] version = "1.8"), class = "FutureResult") [13:31:24.753] }, finally = { [13:31:24.753] if (!identical(...future.workdir, getwd())) [13:31:24.753] setwd(...future.workdir) [13:31:24.753] { [13:31:24.753] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:24.753] ...future.oldOptions$nwarnings <- NULL [13:31:24.753] } [13:31:24.753] base::options(...future.oldOptions) [13:31:24.753] if (.Platform$OS.type == "windows") { [13:31:24.753] old_names <- names(...future.oldEnvVars) [13:31:24.753] envs <- base::Sys.getenv() [13:31:24.753] names <- names(envs) [13:31:24.753] common <- intersect(names, old_names) [13:31:24.753] added <- setdiff(names, old_names) [13:31:24.753] removed <- setdiff(old_names, names) [13:31:24.753] changed <- common[...future.oldEnvVars[common] != [13:31:24.753] envs[common]] [13:31:24.753] NAMES <- toupper(changed) [13:31:24.753] args <- list() [13:31:24.753] for (kk in seq_along(NAMES)) { [13:31:24.753] name <- changed[[kk]] [13:31:24.753] NAME <- NAMES[[kk]] [13:31:24.753] if (name != NAME && is.element(NAME, old_names)) [13:31:24.753] next [13:31:24.753] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:24.753] } [13:31:24.753] NAMES <- toupper(added) [13:31:24.753] for (kk in seq_along(NAMES)) { [13:31:24.753] name <- added[[kk]] [13:31:24.753] NAME <- NAMES[[kk]] [13:31:24.753] if (name != NAME && is.element(NAME, old_names)) [13:31:24.753] next [13:31:24.753] args[[name]] <- "" [13:31:24.753] } [13:31:24.753] NAMES <- toupper(removed) [13:31:24.753] for (kk in seq_along(NAMES)) { [13:31:24.753] name <- removed[[kk]] [13:31:24.753] NAME <- NAMES[[kk]] [13:31:24.753] if (name != NAME && is.element(NAME, old_names)) [13:31:24.753] next [13:31:24.753] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:24.753] } [13:31:24.753] if (length(args) > 0) [13:31:24.753] base::do.call(base::Sys.setenv, args = args) [13:31:24.753] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:24.753] } [13:31:24.753] else { [13:31:24.753] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:24.753] } [13:31:24.753] { [13:31:24.753] if (base::length(...future.futureOptionsAdded) > [13:31:24.753] 0L) { [13:31:24.753] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:24.753] base::names(opts) <- ...future.futureOptionsAdded [13:31:24.753] base::options(opts) [13:31:24.753] } [13:31:24.753] { [13:31:24.753] NULL [13:31:24.753] options(future.plan = NULL) [13:31:24.753] if (is.na(NA_character_)) [13:31:24.753] Sys.unsetenv("R_FUTURE_PLAN") [13:31:24.753] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:24.753] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:24.753] .init = FALSE) [13:31:24.753] } [13:31:24.753] } [13:31:24.753] } [13:31:24.753] }) [13:31:24.753] if (TRUE) { [13:31:24.753] base::sink(type = "output", split = FALSE) [13:31:24.753] if (TRUE) { [13:31:24.753] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:24.753] } [13:31:24.753] else { [13:31:24.753] ...future.result["stdout"] <- base::list(NULL) [13:31:24.753] } [13:31:24.753] base::close(...future.stdout) [13:31:24.753] ...future.stdout <- NULL [13:31:24.753] } [13:31:24.753] ...future.result$conditions <- ...future.conditions [13:31:24.753] ...future.result$finished <- base::Sys.time() [13:31:24.753] ...future.result [13:31:24.753] } [13:31:24.778] - Launch lazy future ... done [13:31:24.778] run() for 'MiraiFuture' ... done [13:31:24.778] Created future: [13:31:26.780] resolved() for 'MiraiFuture' ... [13:31:26.781] - state: 'running' [13:31:26.781] - run: TRUE [13:31:26.781] - result: 'NULL' [13:31:26.781] - resolved: FALSE [13:31:26.781] resolved() for 'MiraiFuture' ... done [13:31:24.779] MiraiFuture: [13:31:24.779] Label: 'future_lapply-2' [13:31:24.779] Expression: [13:31:24.779] { [13:31:24.779] do.call(function(...) { [13:31:24.779] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:24.779] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:24.779] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:24.779] on.exit(options(oopts), add = TRUE) [13:31:24.779] } [13:31:24.779] { [13:31:24.779] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:24.779] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:24.779] ...future.FUN(...future.X_jj, ...) [13:31:24.779] }) [13:31:24.779] } [13:31:24.779] }, args = future.call.arguments) [13:31:24.779] } [13:31:24.779] Lazy evaluation: FALSE [13:31:24.779] Asynchronous evaluation: TRUE [13:31:24.779] Local evaluation: TRUE [13:31:24.779] Environment: R_GlobalEnv [13:31:24.779] Capture standard output: TRUE [13:31:24.779] Capture condition classes: 'condition' (excluding 'nothing') [13:31:24.779] Globals: 6 objects totaling 26.70 MiB (function '...future.FUN' of 728 bytes, numeric 'a' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 26.70 MiB, NULL '...future.seeds_ii' of 0 bytes, ...) [13:31:24.779] Packages: [13:31:24.779] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:24.779] Resolved: TRUE [13:31:24.779] Value: [13:31:24.779] Conditions captured: [13:31:24.779] Early signaling: FALSE [13:31:24.779] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:24.779] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:26.802] Chunk #2 of 2 ... DONE [13:31:26.802] Launching 2 futures (chunks) ... DONE [13:31:26.802] Resolving 2 futures (chunks) ... [13:31:26.802] resolve() on list ... [13:31:26.802] recursive: 0 [13:31:26.803] length: 2 [13:31:26.803] [13:31:26.803] resolved() for 'MiraiFuture' ... [13:31:26.803] - state: 'running' [13:31:26.803] - run: TRUE [13:31:26.803] - result: 'NULL' [13:31:26.803] - resolved: FALSE [13:31:26.804] resolved() for 'MiraiFuture' ... done [13:31:26.804] Future #1 [13:31:26.804] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:26.804] - nx: 2 [13:31:26.804] - relay: TRUE [13:31:26.804] - stdout: TRUE [13:31:26.804] - signal: TRUE [13:31:26.804] - resignal: FALSE [13:31:26.805] - force: TRUE [13:31:26.805] - relayed: [n=2] FALSE, FALSE [13:31:26.805] - queued futures: [n=2] FALSE, FALSE [13:31:26.805] - until=1 [13:31:26.805] - relaying element #1 [13:31:26.805] - relayed: [n=2] TRUE, FALSE [13:31:26.805] - queued futures: [n=2] TRUE, FALSE [13:31:26.805] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:26.806] length: 1 (resolved future 1) [13:31:26.806] resolved() for 'MiraiFuture' ... [13:31:26.806] - state: 'running' [13:31:26.806] - run: TRUE [13:31:26.806] - result: 'NULL' [13:31:26.806] - resolved: FALSE [13:31:26.806] resolved() for 'MiraiFuture' ... done [13:31:26.806] Future #2 [13:31:26.807] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:26.807] - nx: 2 [13:31:26.807] - relay: TRUE [13:31:26.807] - stdout: TRUE [13:31:26.807] - signal: TRUE [13:31:26.807] - resignal: FALSE [13:31:26.807] - force: TRUE [13:31:26.807] - relayed: [n=2] TRUE, FALSE [13:31:26.807] - queued futures: [n=2] TRUE, FALSE [13:31:26.808] - until=2 [13:31:26.808] - relaying element #2 [13:31:26.808] - relayed: [n=2] TRUE, TRUE [13:31:26.808] - queued futures: [n=2] TRUE, TRUE [13:31:26.808] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:26.808] length: 0 (resolved future 2) [13:31:26.808] Relaying remaining futures [13:31:26.808] signalConditionsASAP(NULL, pos=0) ... [13:31:26.809] - nx: 2 [13:31:26.809] - relay: TRUE [13:31:26.809] - stdout: TRUE [13:31:26.809] - signal: TRUE [13:31:26.809] - resignal: FALSE [13:31:26.809] - force: TRUE [13:31:26.809] - relayed: [n=2] TRUE, TRUE [13:31:26.809] - queued futures: [n=2] TRUE, TRUE - flush all [13:31:26.809] - relayed: [n=2] TRUE, TRUE [13:31:26.810] - queued futures: [n=2] TRUE, TRUE [13:31:26.810] signalConditionsASAP(NULL, pos=0) ... done [13:31:26.810] resolve() on list ... DONE [13:31:26.818] - Number of value chunks collected: 2 [13:31:26.818] Resolving 2 futures (chunks) ... DONE [13:31:26.818] Reducing values from 2 chunks ... [13:31:26.827] - Number of values collected after concatenation: 1000000 [13:31:26.827] - Number of values expected: 1000000 [13:31:26.827] Reducing values from 2 chunks ... DONE [13:31:26.837] future_lapply() ... DONE - future_lapply() with global in non-attached package ... [13:31:27.023] plan(): Setting new future strategy stack: [13:31:27.023] List of future strategies: [13:31:27.023] 1. mirai_multisession: [13:31:27.023] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:27.023] - tweaked: FALSE [13:31:27.023] - call: plan(strategy) [13:31:27.023] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:27.023] < mirai [$data] > [13:31:27.025] getGlobalsAndPackages() ... [13:31:27.025] Not searching for globals [13:31:27.025] - globals: [0] [13:31:27.025] getGlobalsAndPackages() ... DONE [13:31:27.026] getGlobalsAndPackages() ... [13:31:27.026] [13:31:27.026] - globals: [0] [13:31:27.026] getGlobalsAndPackages() ... DONE [13:31:27.026] Packages needed by the future expression (n = 0): [13:31:27.026] Packages needed by future strategies (n = 0): [13:31:27.027] { [13:31:27.027] { [13:31:27.027] { [13:31:27.027] ...future.startTime <- base::Sys.time() [13:31:27.027] { [13:31:27.027] { [13:31:27.027] { [13:31:27.027] base::local({ [13:31:27.027] has_future <- base::requireNamespace("future", [13:31:27.027] quietly = TRUE) [13:31:27.027] if (has_future) { [13:31:27.027] ns <- base::getNamespace("future") [13:31:27.027] version <- ns[[".package"]][["version"]] [13:31:27.027] if (is.null(version)) [13:31:27.027] version <- utils::packageVersion("future") [13:31:27.027] } [13:31:27.027] else { [13:31:27.027] version <- NULL [13:31:27.027] } [13:31:27.027] if (!has_future || version < "1.8.0") { [13:31:27.027] info <- base::c(r_version = base::gsub("R version ", [13:31:27.027] "", base::R.version$version.string), [13:31:27.027] platform = base::sprintf("%s (%s-bit)", [13:31:27.027] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:27.027] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:27.027] "release", "version")], collapse = " "), [13:31:27.027] hostname = base::Sys.info()[["nodename"]]) [13:31:27.027] info <- base::sprintf("%s: %s", base::names(info), [13:31:27.027] info) [13:31:27.027] info <- base::paste(info, collapse = "; ") [13:31:27.027] if (!has_future) { [13:31:27.027] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:27.027] info) [13:31:27.027] } [13:31:27.027] else { [13:31:27.027] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:27.027] info, version) [13:31:27.027] } [13:31:27.027] base::stop(msg) [13:31:27.027] } [13:31:27.027] }) [13:31:27.027] } [13:31:27.027] ...future.strategy.old <- future::plan("list") [13:31:27.027] options(future.plan = NULL) [13:31:27.027] Sys.unsetenv("R_FUTURE_PLAN") [13:31:27.027] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:27.027] } [13:31:27.027] ...future.workdir <- getwd() [13:31:27.027] } [13:31:27.027] ...future.oldOptions <- base::as.list(base::.Options) [13:31:27.027] ...future.oldEnvVars <- base::Sys.getenv() [13:31:27.027] } [13:31:27.027] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:27.027] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:27.027] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:27.027] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:27.027] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:27.027] future.stdout.windows.reencode = NULL, width = 80L) [13:31:27.027] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:27.027] base::names(...future.oldOptions)) [13:31:27.027] } [13:31:27.027] if (FALSE) { [13:31:27.027] } [13:31:27.027] else { [13:31:27.027] if (TRUE) { [13:31:27.027] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:27.027] open = "w") [13:31:27.027] } [13:31:27.027] else { [13:31:27.027] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:27.027] windows = "NUL", "/dev/null"), open = "w") [13:31:27.027] } [13:31:27.027] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:27.027] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:27.027] base::sink(type = "output", split = FALSE) [13:31:27.027] base::close(...future.stdout) [13:31:27.027] }, add = TRUE) [13:31:27.027] } [13:31:27.027] ...future.frame <- base::sys.nframe() [13:31:27.027] ...future.conditions <- base::list() [13:31:27.027] ...future.rng <- base::globalenv()$.Random.seed [13:31:27.027] if (FALSE) { [13:31:27.027] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:27.027] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:27.027] } [13:31:27.027] ...future.result <- base::tryCatch({ [13:31:27.027] base::withCallingHandlers({ [13:31:27.027] ...future.value <- base::withVisible(base::local(NA)) [13:31:27.027] future::FutureResult(value = ...future.value$value, [13:31:27.027] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:27.027] ...future.rng), globalenv = if (FALSE) [13:31:27.027] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:27.027] ...future.globalenv.names)) [13:31:27.027] else NULL, started = ...future.startTime, version = "1.8") [13:31:27.027] }, condition = base::local({ [13:31:27.027] c <- base::c [13:31:27.027] inherits <- base::inherits [13:31:27.027] invokeRestart <- base::invokeRestart [13:31:27.027] length <- base::length [13:31:27.027] list <- base::list [13:31:27.027] seq.int <- base::seq.int [13:31:27.027] signalCondition <- base::signalCondition [13:31:27.027] sys.calls <- base::sys.calls [13:31:27.027] `[[` <- base::`[[` [13:31:27.027] `+` <- base::`+` [13:31:27.027] `<<-` <- base::`<<-` [13:31:27.027] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:27.027] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:27.027] 3L)] [13:31:27.027] } [13:31:27.027] function(cond) { [13:31:27.027] is_error <- inherits(cond, "error") [13:31:27.027] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:27.027] NULL) [13:31:27.027] if (is_error) { [13:31:27.027] sessionInformation <- function() { [13:31:27.027] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:27.027] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:27.027] search = base::search(), system = base::Sys.info()) [13:31:27.027] } [13:31:27.027] ...future.conditions[[length(...future.conditions) + [13:31:27.027] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:27.027] cond$call), session = sessionInformation(), [13:31:27.027] timestamp = base::Sys.time(), signaled = 0L) [13:31:27.027] signalCondition(cond) [13:31:27.027] } [13:31:27.027] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:27.027] signal <- FALSE && inherits(cond, character(0)) [13:31:27.027] ...future.conditions[[length(...future.conditions) + [13:31:27.027] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:27.027] if (FALSE && !signal) { [13:31:27.027] muffleCondition <- function (cond, pattern = "^muffle") [13:31:27.027] { [13:31:27.027] inherits <- base::inherits [13:31:27.027] invokeRestart <- base::invokeRestart [13:31:27.027] is.null <- base::is.null [13:31:27.027] muffled <- FALSE [13:31:27.027] if (inherits(cond, "message")) { [13:31:27.027] muffled <- grepl(pattern, "muffleMessage") [13:31:27.027] if (muffled) [13:31:27.027] invokeRestart("muffleMessage") [13:31:27.027] } [13:31:27.027] else if (inherits(cond, "warning")) { [13:31:27.027] muffled <- grepl(pattern, "muffleWarning") [13:31:27.027] if (muffled) [13:31:27.027] invokeRestart("muffleWarning") [13:31:27.027] } [13:31:27.027] else if (inherits(cond, "condition")) { [13:31:27.027] if (!is.null(pattern)) { [13:31:27.027] computeRestarts <- base::computeRestarts [13:31:27.027] grepl <- base::grepl [13:31:27.027] restarts <- computeRestarts(cond) [13:31:27.027] for (restart in restarts) { [13:31:27.027] name <- restart$name [13:31:27.027] if (is.null(name)) [13:31:27.027] next [13:31:27.027] if (!grepl(pattern, name)) [13:31:27.027] next [13:31:27.027] invokeRestart(restart) [13:31:27.027] muffled <- TRUE [13:31:27.027] break [13:31:27.027] } [13:31:27.027] } [13:31:27.027] } [13:31:27.027] invisible(muffled) [13:31:27.027] } [13:31:27.027] muffleCondition(cond, pattern = "^muffle") [13:31:27.027] } [13:31:27.027] } [13:31:27.027] else { [13:31:27.027] if (TRUE) { [13:31:27.027] muffleCondition <- function (cond, pattern = "^muffle") [13:31:27.027] { [13:31:27.027] inherits <- base::inherits [13:31:27.027] invokeRestart <- base::invokeRestart [13:31:27.027] is.null <- base::is.null [13:31:27.027] muffled <- FALSE [13:31:27.027] if (inherits(cond, "message")) { [13:31:27.027] muffled <- grepl(pattern, "muffleMessage") [13:31:27.027] if (muffled) [13:31:27.027] invokeRestart("muffleMessage") [13:31:27.027] } [13:31:27.027] else if (inherits(cond, "warning")) { [13:31:27.027] muffled <- grepl(pattern, "muffleWarning") [13:31:27.027] if (muffled) [13:31:27.027] invokeRestart("muffleWarning") [13:31:27.027] } [13:31:27.027] else if (inherits(cond, "condition")) { [13:31:27.027] if (!is.null(pattern)) { [13:31:27.027] computeRestarts <- base::computeRestarts [13:31:27.027] grepl <- base::grepl [13:31:27.027] restarts <- computeRestarts(cond) [13:31:27.027] for (restart in restarts) { [13:31:27.027] name <- restart$name [13:31:27.027] if (is.null(name)) [13:31:27.027] next [13:31:27.027] if (!grepl(pattern, name)) [13:31:27.027] next [13:31:27.027] invokeRestart(restart) [13:31:27.027] muffled <- TRUE [13:31:27.027] break [13:31:27.027] } [13:31:27.027] } [13:31:27.027] } [13:31:27.027] invisible(muffled) [13:31:27.027] } [13:31:27.027] muffleCondition(cond, pattern = "^muffle") [13:31:27.027] } [13:31:27.027] } [13:31:27.027] } [13:31:27.027] })) [13:31:27.027] }, error = function(ex) { [13:31:27.027] base::structure(base::list(value = NULL, visible = NULL, [13:31:27.027] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:27.027] ...future.rng), started = ...future.startTime, [13:31:27.027] finished = Sys.time(), session_uuid = NA_character_, [13:31:27.027] version = "1.8"), class = "FutureResult") [13:31:27.027] }, finally = { [13:31:27.027] if (!identical(...future.workdir, getwd())) [13:31:27.027] setwd(...future.workdir) [13:31:27.027] { [13:31:27.027] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:27.027] ...future.oldOptions$nwarnings <- NULL [13:31:27.027] } [13:31:27.027] base::options(...future.oldOptions) [13:31:27.027] if (.Platform$OS.type == "windows") { [13:31:27.027] old_names <- names(...future.oldEnvVars) [13:31:27.027] envs <- base::Sys.getenv() [13:31:27.027] names <- names(envs) [13:31:27.027] common <- intersect(names, old_names) [13:31:27.027] added <- setdiff(names, old_names) [13:31:27.027] removed <- setdiff(old_names, names) [13:31:27.027] changed <- common[...future.oldEnvVars[common] != [13:31:27.027] envs[common]] [13:31:27.027] NAMES <- toupper(changed) [13:31:27.027] args <- list() [13:31:27.027] for (kk in seq_along(NAMES)) { [13:31:27.027] name <- changed[[kk]] [13:31:27.027] NAME <- NAMES[[kk]] [13:31:27.027] if (name != NAME && is.element(NAME, old_names)) [13:31:27.027] next [13:31:27.027] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:27.027] } [13:31:27.027] NAMES <- toupper(added) [13:31:27.027] for (kk in seq_along(NAMES)) { [13:31:27.027] name <- added[[kk]] [13:31:27.027] NAME <- NAMES[[kk]] [13:31:27.027] if (name != NAME && is.element(NAME, old_names)) [13:31:27.027] next [13:31:27.027] args[[name]] <- "" [13:31:27.027] } [13:31:27.027] NAMES <- toupper(removed) [13:31:27.027] for (kk in seq_along(NAMES)) { [13:31:27.027] name <- removed[[kk]] [13:31:27.027] NAME <- NAMES[[kk]] [13:31:27.027] if (name != NAME && is.element(NAME, old_names)) [13:31:27.027] next [13:31:27.027] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:27.027] } [13:31:27.027] if (length(args) > 0) [13:31:27.027] base::do.call(base::Sys.setenv, args = args) [13:31:27.027] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:27.027] } [13:31:27.027] else { [13:31:27.027] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:27.027] } [13:31:27.027] { [13:31:27.027] if (base::length(...future.futureOptionsAdded) > [13:31:27.027] 0L) { [13:31:27.027] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:27.027] base::names(opts) <- ...future.futureOptionsAdded [13:31:27.027] base::options(opts) [13:31:27.027] } [13:31:27.027] { [13:31:27.027] NULL [13:31:27.027] options(future.plan = NULL) [13:31:27.027] if (is.na(NA_character_)) [13:31:27.027] Sys.unsetenv("R_FUTURE_PLAN") [13:31:27.027] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:27.027] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:27.027] .init = FALSE) [13:31:27.027] } [13:31:27.027] } [13:31:27.027] } [13:31:27.027] }) [13:31:27.027] if (TRUE) { [13:31:27.027] base::sink(type = "output", split = FALSE) [13:31:27.027] if (TRUE) { [13:31:27.027] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:27.027] } [13:31:27.027] else { [13:31:27.027] ...future.result["stdout"] <- base::list(NULL) [13:31:27.027] } [13:31:27.027] base::close(...future.stdout) [13:31:27.027] ...future.stdout <- NULL [13:31:27.027] } [13:31:27.027] ...future.result$conditions <- ...future.conditions [13:31:27.027] ...future.result$finished <- base::Sys.time() [13:31:27.027] ...future.result [13:31:27.027] } [13:31:27.032] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:27.033] plan(): nbrOfWorkers() = 2 [13:31:27.033] future_lapply() ... [13:31:27.034] Number of chunks: 1 [13:31:27.034] getGlobalsAndPackagesXApply() ... [13:31:27.034] - future.globals: TRUE [13:31:27.034] getGlobalsAndPackages() ... [13:31:27.034] Searching for globals... [13:31:27.035] - globals found: [2] 'FUN', 'file_ext' [13:31:27.035] Searching for globals ... DONE [13:31:27.036] Resolving globals: FALSE [13:31:27.036] The total size of the 1 globals is 448 bytes (448 bytes) [13:31:27.036] The total size of the 1 globals exported for future expression ('FUN()') is 448 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (448 bytes of class 'function') [13:31:27.036] - globals: [1] 'FUN' [13:31:27.037] - packages: [1] 'tools' [13:31:27.037] getGlobalsAndPackages() ... DONE [13:31:27.037] - globals found/used: [n=1] 'FUN' [13:31:27.037] - needed namespaces: [n=1] 'tools' [13:31:27.037] Finding globals ... DONE [13:31:27.037] - use_args: TRUE [13:31:27.037] - Getting '...' globals ... [13:31:27.038] resolve() on list ... [13:31:27.038] recursive: 0 [13:31:27.038] length: 1 [13:31:27.038] elements: '...' [13:31:27.038] length: 0 (resolved future 1) [13:31:27.038] resolve() on list ... DONE [13:31:27.038] - '...' content: [n=0] [13:31:27.038] List of 1 [13:31:27.038] $ ...: list() [13:31:27.038] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:27.038] - attr(*, "where")=List of 1 [13:31:27.038] ..$ ...: [13:31:27.038] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:27.038] - attr(*, "resolved")= logi TRUE [13:31:27.038] - attr(*, "total_size")= num NA [13:31:27.041] - Getting '...' globals ... DONE [13:31:27.041] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:27.041] List of 2 [13:31:27.041] $ ...future.FUN:function (x) [13:31:27.041] $ ... : list() [13:31:27.041] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:27.041] - attr(*, "where")=List of 2 [13:31:27.041] ..$ ...future.FUN: [13:31:27.041] ..$ ... : [13:31:27.041] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:27.041] - attr(*, "resolved")= logi FALSE [13:31:27.041] - attr(*, "total_size")= num 448 [13:31:27.043] Packages to be attached in all futures: [n=1] 'tools' [13:31:27.043] getGlobalsAndPackagesXApply() ... DONE [13:31:27.044] Number of futures (= number of chunks): 1 [13:31:27.044] Launching 1 futures (chunks) ... [13:31:27.044] Chunk #1 of 1 ... [13:31:27.044] - Finding globals in 'X' for chunk #1 ... [13:31:27.044] getGlobalsAndPackages() ... [13:31:27.044] Searching for globals... [13:31:27.044] [13:31:27.045] Searching for globals ... DONE [13:31:27.045] - globals: [0] [13:31:27.045] getGlobalsAndPackages() ... DONE [13:31:27.045] + additional globals found: [n=0] [13:31:27.045] + additional namespaces needed: [n=0] [13:31:27.045] - Finding globals in 'X' for chunk #1 ... DONE [13:31:27.045] - seeds: [13:31:27.045] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:27.045] getGlobalsAndPackages() ... [13:31:27.046] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:27.046] Resolving globals: FALSE [13:31:27.046] Tweak future expression to call with '...' arguments ... [13:31:27.046] { [13:31:27.046] do.call(function(...) { [13:31:27.046] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:27.046] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:27.046] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:27.046] on.exit(options(oopts), add = TRUE) [13:31:27.046] } [13:31:27.046] { [13:31:27.046] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:27.046] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:27.046] ...future.FUN(...future.X_jj, ...) [13:31:27.046] }) [13:31:27.046] } [13:31:27.046] }, args = future.call.arguments) [13:31:27.046] } [13:31:27.046] Tweak future expression to call with '...' arguments ... DONE [13:31:27.047] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:27.047] [13:31:27.047] getGlobalsAndPackages() ... DONE [13:31:27.047] run() for 'Future' ... [13:31:27.047] - state: 'created' [13:31:27.047] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:27.049] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:27.049] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:27.049] - Field: 'label' [13:31:27.050] - Field: 'local' [13:31:27.050] - Field: 'owner' [13:31:27.050] - Field: 'envir' [13:31:27.050] - Field: 'packages' [13:31:27.050] - Field: 'gc' [13:31:27.050] - Field: 'conditions' [13:31:27.050] - Field: 'expr' [13:31:27.050] - Field: 'uuid' [13:31:27.051] - Field: 'seed' [13:31:27.051] - Field: 'version' [13:31:27.051] - Field: 'result' [13:31:27.051] - Field: 'asynchronous' [13:31:27.051] - Field: 'calls' [13:31:27.051] - Field: 'globals' [13:31:27.051] - Field: 'stdout' [13:31:27.051] - Field: 'earlySignal' [13:31:27.052] - Field: 'lazy' [13:31:27.052] - Field: 'state' [13:31:27.052] - Field: '.cluster' [13:31:27.052] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:27.052] - Launch lazy future ... [13:31:27.052] Packages needed by the future expression (n = 1): 'tools' [13:31:27.052] Packages needed by future strategies (n = 0): [13:31:27.053] { [13:31:27.053] { [13:31:27.053] { [13:31:27.053] ...future.startTime <- base::Sys.time() [13:31:27.053] { [13:31:27.053] { [13:31:27.053] { [13:31:27.053] { [13:31:27.053] base::local({ [13:31:27.053] has_future <- base::requireNamespace("future", [13:31:27.053] quietly = TRUE) [13:31:27.053] if (has_future) { [13:31:27.053] ns <- base::getNamespace("future") [13:31:27.053] version <- ns[[".package"]][["version"]] [13:31:27.053] if (is.null(version)) [13:31:27.053] version <- utils::packageVersion("future") [13:31:27.053] } [13:31:27.053] else { [13:31:27.053] version <- NULL [13:31:27.053] } [13:31:27.053] if (!has_future || version < "1.8.0") { [13:31:27.053] info <- base::c(r_version = base::gsub("R version ", [13:31:27.053] "", base::R.version$version.string), [13:31:27.053] platform = base::sprintf("%s (%s-bit)", [13:31:27.053] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:27.053] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:27.053] "release", "version")], collapse = " "), [13:31:27.053] hostname = base::Sys.info()[["nodename"]]) [13:31:27.053] info <- base::sprintf("%s: %s", base::names(info), [13:31:27.053] info) [13:31:27.053] info <- base::paste(info, collapse = "; ") [13:31:27.053] if (!has_future) { [13:31:27.053] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:27.053] info) [13:31:27.053] } [13:31:27.053] else { [13:31:27.053] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:27.053] info, version) [13:31:27.053] } [13:31:27.053] base::stop(msg) [13:31:27.053] } [13:31:27.053] }) [13:31:27.053] } [13:31:27.053] base::local({ [13:31:27.053] for (pkg in "tools") { [13:31:27.053] base::loadNamespace(pkg) [13:31:27.053] base::library(pkg, character.only = TRUE) [13:31:27.053] } [13:31:27.053] }) [13:31:27.053] } [13:31:27.053] ...future.strategy.old <- future::plan("list") [13:31:27.053] options(future.plan = NULL) [13:31:27.053] Sys.unsetenv("R_FUTURE_PLAN") [13:31:27.053] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:27.053] } [13:31:27.053] ...future.workdir <- getwd() [13:31:27.053] } [13:31:27.053] ...future.oldOptions <- base::as.list(base::.Options) [13:31:27.053] ...future.oldEnvVars <- base::Sys.getenv() [13:31:27.053] } [13:31:27.053] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:27.053] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:27.053] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:27.053] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:27.053] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:27.053] future.stdout.windows.reencode = NULL, width = 80L) [13:31:27.053] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:27.053] base::names(...future.oldOptions)) [13:31:27.053] } [13:31:27.053] if (FALSE) { [13:31:27.053] } [13:31:27.053] else { [13:31:27.053] if (TRUE) { [13:31:27.053] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:27.053] open = "w") [13:31:27.053] } [13:31:27.053] else { [13:31:27.053] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:27.053] windows = "NUL", "/dev/null"), open = "w") [13:31:27.053] } [13:31:27.053] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:27.053] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:27.053] base::sink(type = "output", split = FALSE) [13:31:27.053] base::close(...future.stdout) [13:31:27.053] }, add = TRUE) [13:31:27.053] } [13:31:27.053] ...future.frame <- base::sys.nframe() [13:31:27.053] ...future.conditions <- base::list() [13:31:27.053] ...future.rng <- base::globalenv()$.Random.seed [13:31:27.053] if (FALSE) { [13:31:27.053] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:27.053] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:27.053] } [13:31:27.053] ...future.result <- base::tryCatch({ [13:31:27.053] base::withCallingHandlers({ [13:31:27.053] ...future.value <- base::withVisible(base::local({ [13:31:27.053] do.call(function(...) { [13:31:27.053] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:27.053] if (!identical(...future.globals.maxSize.org, [13:31:27.053] ...future.globals.maxSize)) { [13:31:27.053] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:27.053] on.exit(options(oopts), add = TRUE) [13:31:27.053] } [13:31:27.053] { [13:31:27.053] lapply(seq_along(...future.elements_ii), [13:31:27.053] FUN = function(jj) { [13:31:27.053] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:27.053] ...future.FUN(...future.X_jj, ...) [13:31:27.053] }) [13:31:27.053] } [13:31:27.053] }, args = future.call.arguments) [13:31:27.053] })) [13:31:27.053] future::FutureResult(value = ...future.value$value, [13:31:27.053] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:27.053] ...future.rng), globalenv = if (FALSE) [13:31:27.053] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:27.053] ...future.globalenv.names)) [13:31:27.053] else NULL, started = ...future.startTime, version = "1.8") [13:31:27.053] }, condition = base::local({ [13:31:27.053] c <- base::c [13:31:27.053] inherits <- base::inherits [13:31:27.053] invokeRestart <- base::invokeRestart [13:31:27.053] length <- base::length [13:31:27.053] list <- base::list [13:31:27.053] seq.int <- base::seq.int [13:31:27.053] signalCondition <- base::signalCondition [13:31:27.053] sys.calls <- base::sys.calls [13:31:27.053] `[[` <- base::`[[` [13:31:27.053] `+` <- base::`+` [13:31:27.053] `<<-` <- base::`<<-` [13:31:27.053] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:27.053] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:27.053] 3L)] [13:31:27.053] } [13:31:27.053] function(cond) { [13:31:27.053] is_error <- inherits(cond, "error") [13:31:27.053] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:27.053] NULL) [13:31:27.053] if (is_error) { [13:31:27.053] sessionInformation <- function() { [13:31:27.053] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:27.053] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:27.053] search = base::search(), system = base::Sys.info()) [13:31:27.053] } [13:31:27.053] ...future.conditions[[length(...future.conditions) + [13:31:27.053] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:27.053] cond$call), session = sessionInformation(), [13:31:27.053] timestamp = base::Sys.time(), signaled = 0L) [13:31:27.053] signalCondition(cond) [13:31:27.053] } [13:31:27.053] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:27.053] signal <- FALSE && inherits(cond, character(0)) [13:31:27.053] ...future.conditions[[length(...future.conditions) + [13:31:27.053] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:27.053] if (FALSE && !signal) { [13:31:27.053] muffleCondition <- function (cond, pattern = "^muffle") [13:31:27.053] { [13:31:27.053] inherits <- base::inherits [13:31:27.053] invokeRestart <- base::invokeRestart [13:31:27.053] is.null <- base::is.null [13:31:27.053] muffled <- FALSE [13:31:27.053] if (inherits(cond, "message")) { [13:31:27.053] muffled <- grepl(pattern, "muffleMessage") [13:31:27.053] if (muffled) [13:31:27.053] invokeRestart("muffleMessage") [13:31:27.053] } [13:31:27.053] else if (inherits(cond, "warning")) { [13:31:27.053] muffled <- grepl(pattern, "muffleWarning") [13:31:27.053] if (muffled) [13:31:27.053] invokeRestart("muffleWarning") [13:31:27.053] } [13:31:27.053] else if (inherits(cond, "condition")) { [13:31:27.053] if (!is.null(pattern)) { [13:31:27.053] computeRestarts <- base::computeRestarts [13:31:27.053] grepl <- base::grepl [13:31:27.053] restarts <- computeRestarts(cond) [13:31:27.053] for (restart in restarts) { [13:31:27.053] name <- restart$name [13:31:27.053] if (is.null(name)) [13:31:27.053] next [13:31:27.053] if (!grepl(pattern, name)) [13:31:27.053] next [13:31:27.053] invokeRestart(restart) [13:31:27.053] muffled <- TRUE [13:31:27.053] break [13:31:27.053] } [13:31:27.053] } [13:31:27.053] } [13:31:27.053] invisible(muffled) [13:31:27.053] } [13:31:27.053] muffleCondition(cond, pattern = "^muffle") [13:31:27.053] } [13:31:27.053] } [13:31:27.053] else { [13:31:27.053] if (TRUE) { [13:31:27.053] muffleCondition <- function (cond, pattern = "^muffle") [13:31:27.053] { [13:31:27.053] inherits <- base::inherits [13:31:27.053] invokeRestart <- base::invokeRestart [13:31:27.053] is.null <- base::is.null [13:31:27.053] muffled <- FALSE [13:31:27.053] if (inherits(cond, "message")) { [13:31:27.053] muffled <- grepl(pattern, "muffleMessage") [13:31:27.053] if (muffled) [13:31:27.053] invokeRestart("muffleMessage") [13:31:27.053] } [13:31:27.053] else if (inherits(cond, "warning")) { [13:31:27.053] muffled <- grepl(pattern, "muffleWarning") [13:31:27.053] if (muffled) [13:31:27.053] invokeRestart("muffleWarning") [13:31:27.053] } [13:31:27.053] else if (inherits(cond, "condition")) { [13:31:27.053] if (!is.null(pattern)) { [13:31:27.053] computeRestarts <- base::computeRestarts [13:31:27.053] grepl <- base::grepl [13:31:27.053] restarts <- computeRestarts(cond) [13:31:27.053] for (restart in restarts) { [13:31:27.053] name <- restart$name [13:31:27.053] if (is.null(name)) [13:31:27.053] next [13:31:27.053] if (!grepl(pattern, name)) [13:31:27.053] next [13:31:27.053] invokeRestart(restart) [13:31:27.053] muffled <- TRUE [13:31:27.053] break [13:31:27.053] } [13:31:27.053] } [13:31:27.053] } [13:31:27.053] invisible(muffled) [13:31:27.053] } [13:31:27.053] muffleCondition(cond, pattern = "^muffle") [13:31:27.053] } [13:31:27.053] } [13:31:27.053] } [13:31:27.053] })) [13:31:27.053] }, error = function(ex) { [13:31:27.053] base::structure(base::list(value = NULL, visible = NULL, [13:31:27.053] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:27.053] ...future.rng), started = ...future.startTime, [13:31:27.053] finished = Sys.time(), session_uuid = NA_character_, [13:31:27.053] version = "1.8"), class = "FutureResult") [13:31:27.053] }, finally = { [13:31:27.053] if (!identical(...future.workdir, getwd())) [13:31:27.053] setwd(...future.workdir) [13:31:27.053] { [13:31:27.053] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:27.053] ...future.oldOptions$nwarnings <- NULL [13:31:27.053] } [13:31:27.053] base::options(...future.oldOptions) [13:31:27.053] if (.Platform$OS.type == "windows") { [13:31:27.053] old_names <- names(...future.oldEnvVars) [13:31:27.053] envs <- base::Sys.getenv() [13:31:27.053] names <- names(envs) [13:31:27.053] common <- intersect(names, old_names) [13:31:27.053] added <- setdiff(names, old_names) [13:31:27.053] removed <- setdiff(old_names, names) [13:31:27.053] changed <- common[...future.oldEnvVars[common] != [13:31:27.053] envs[common]] [13:31:27.053] NAMES <- toupper(changed) [13:31:27.053] args <- list() [13:31:27.053] for (kk in seq_along(NAMES)) { [13:31:27.053] name <- changed[[kk]] [13:31:27.053] NAME <- NAMES[[kk]] [13:31:27.053] if (name != NAME && is.element(NAME, old_names)) [13:31:27.053] next [13:31:27.053] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:27.053] } [13:31:27.053] NAMES <- toupper(added) [13:31:27.053] for (kk in seq_along(NAMES)) { [13:31:27.053] name <- added[[kk]] [13:31:27.053] NAME <- NAMES[[kk]] [13:31:27.053] if (name != NAME && is.element(NAME, old_names)) [13:31:27.053] next [13:31:27.053] args[[name]] <- "" [13:31:27.053] } [13:31:27.053] NAMES <- toupper(removed) [13:31:27.053] for (kk in seq_along(NAMES)) { [13:31:27.053] name <- removed[[kk]] [13:31:27.053] NAME <- NAMES[[kk]] [13:31:27.053] if (name != NAME && is.element(NAME, old_names)) [13:31:27.053] next [13:31:27.053] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:27.053] } [13:31:27.053] if (length(args) > 0) [13:31:27.053] base::do.call(base::Sys.setenv, args = args) [13:31:27.053] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:27.053] } [13:31:27.053] else { [13:31:27.053] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:27.053] } [13:31:27.053] { [13:31:27.053] if (base::length(...future.futureOptionsAdded) > [13:31:27.053] 0L) { [13:31:27.053] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:27.053] base::names(opts) <- ...future.futureOptionsAdded [13:31:27.053] base::options(opts) [13:31:27.053] } [13:31:27.053] { [13:31:27.053] NULL [13:31:27.053] options(future.plan = NULL) [13:31:27.053] if (is.na(NA_character_)) [13:31:27.053] Sys.unsetenv("R_FUTURE_PLAN") [13:31:27.053] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:27.053] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:27.053] .init = FALSE) [13:31:27.053] } [13:31:27.053] } [13:31:27.053] } [13:31:27.053] }) [13:31:27.053] if (TRUE) { [13:31:27.053] base::sink(type = "output", split = FALSE) [13:31:27.053] if (TRUE) { [13:31:27.053] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:27.053] } [13:31:27.053] else { [13:31:27.053] ...future.result["stdout"] <- base::list(NULL) [13:31:27.053] } [13:31:27.053] base::close(...future.stdout) [13:31:27.053] ...future.stdout <- NULL [13:31:27.053] } [13:31:27.053] ...future.result$conditions <- ...future.conditions [13:31:27.053] ...future.result$finished <- base::Sys.time() [13:31:27.053] ...future.result [13:31:27.053] } [13:31:27.056] - Launch lazy future ... done [13:31:27.056] run() for 'MiraiFuture' ... done [13:31:27.056] Created future: [13:31:27.057] resolved() for 'MiraiFuture' ... [13:31:27.057] - state: 'running' [13:31:27.057] - run: TRUE [13:31:27.057] - result: 'NULL' [13:31:27.057] - resolved: FALSE [13:31:27.058] resolved() for 'MiraiFuture' ... done [13:31:27.056] MiraiFuture: [13:31:27.056] Label: 'future_lapply-1' [13:31:27.056] Expression: [13:31:27.056] { [13:31:27.056] do.call(function(...) { [13:31:27.056] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:27.056] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:27.056] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:27.056] on.exit(options(oopts), add = TRUE) [13:31:27.056] } [13:31:27.056] { [13:31:27.056] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:27.056] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:27.056] ...future.FUN(...future.X_jj, ...) [13:31:27.056] }) [13:31:27.056] } [13:31:27.056] }, args = future.call.arguments) [13:31:27.056] } [13:31:27.056] Lazy evaluation: FALSE [13:31:27.056] Asynchronous evaluation: TRUE [13:31:27.056] Local evaluation: TRUE [13:31:27.056] Environment: R_GlobalEnv [13:31:27.056] Capture standard output: TRUE [13:31:27.056] Capture condition classes: 'condition' (excluding 'nothing') [13:31:27.056] Globals: 5 objects totaling 560 bytes (function '...future.FUN' of 448 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:27.056] Packages: 1 packages ('tools') [13:31:27.056] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:27.056] Resolved: FALSE [13:31:27.056] Value: [13:31:27.056] Conditions captured: [13:31:27.056] Early signaling: FALSE [13:31:27.056] Owner process: 6cb55c16-b860-caa2-e7a9-e9696cd0296e [13:31:27.056] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:27.058] Chunk #1 of 1 ... DONE [13:31:27.058] Launching 1 futures (chunks) ... DONE [13:31:27.058] Resolving 1 futures (chunks) ... [13:31:27.058] resolve() on list ... [13:31:27.058] recursive: 0 [13:31:27.059] length: 1 [13:31:27.059] [13:31:27.059] resolved() for 'MiraiFuture' ... [13:31:27.059] - state: 'running' [13:31:27.059] - run: TRUE [13:31:27.059] - result: 'NULL' [13:31:27.059] - resolved: FALSE [13:31:27.059] resolved() for 'MiraiFuture' ... done [13:31:27.080] resolved() for 'MiraiFuture' ... [13:31:27.080] - state: 'running' [13:31:27.080] - run: TRUE [13:31:27.081] - result: 'NULL' [13:31:27.081] - resolved: FALSE [13:31:27.081] resolved() for 'MiraiFuture' ... done [13:31:27.081] Future #1 [13:31:27.081] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:27.082] - nx: 1 [13:31:27.082] - relay: TRUE [13:31:27.082] - stdout: TRUE [13:31:27.082] - signal: TRUE [13:31:27.082] - resignal: FALSE [13:31:27.082] - force: TRUE [13:31:27.082] - relayed: [n=1] FALSE [13:31:27.082] - queued futures: [n=1] FALSE [13:31:27.082] - until=1 [13:31:27.083] - relaying element #1 [13:31:27.083] - relayed: [n=1] TRUE [13:31:27.083] - queued futures: [n=1] TRUE [13:31:27.083] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:27.083] length: 0 (resolved future 1) [13:31:27.083] Relaying remaining futures [13:31:27.083] signalConditionsASAP(NULL, pos=0) ... [13:31:27.084] - nx: 1 [13:31:27.084] - relay: TRUE [13:31:27.084] - stdout: TRUE [13:31:27.084] - signal: TRUE [13:31:27.084] - resignal: FALSE [13:31:27.084] - force: TRUE [13:31:27.084] - relayed: [n=1] TRUE [13:31:27.084] - queued futures: [n=1] TRUE - flush all [13:31:27.085] - relayed: [n=1] TRUE [13:31:27.085] - queued futures: [n=1] TRUE [13:31:27.085] signalConditionsASAP(NULL, pos=0) ... done [13:31:27.085] resolve() on list ... DONE [13:31:27.085] - Number of value chunks collected: 1 [13:31:27.085] Resolving 1 futures (chunks) ... DONE [13:31:27.085] Reducing values from 1 chunks ... [13:31:27.085] - Number of values collected after concatenation: 1 [13:31:27.086] - Number of values expected: 1 [13:31:27.086] Reducing values from 1 chunks ... DONE [13:31:27.086] future_lapply() ... DONE *** future_lapply() ... DONE > > proc.time() user system elapsed 6.64 0.25 7.42