R Under development (unstable) (2024-05-14 r86553 ucrt) -- "Unsuffered Consequences" Copyright (C) 2024 The R Foundation for Statistical Computing Platform: x86_64-w64-mingw32/x64 R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details. R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications. Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R. > ## 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 [10:56:26.283] plan(): Setting new future strategy stack: [10:56:26.284] List of future strategies: [10:56:26.284] 1. mirai_multisession: [10:56:26.284] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [10:56:26.284] - tweaked: FALSE [10:56:26.284] - call: future::plan(future.mirai::mirai_multisession) [10:56:26.296] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [10:56:26.297] < mirai | $data > [10:56:26.302] getGlobalsAndPackages() ... [10:56:26.302] Not searching for globals [10:56:26.302] - globals: [0] [10:56:26.302] getGlobalsAndPackages() ... DONE [10:56:26.303] getGlobalsAndPackages() ... [10:56:26.303] [10:56:26.303] - globals: [0] [10:56:26.303] getGlobalsAndPackages() ... DONE [10:56:26.582] Packages needed by the future expression (n = 0): [10:56:26.583] Packages needed by future strategies (n = 0): [10:56:26.584] { [10:56:26.584] { [10:56:26.584] { [10:56:26.584] ...future.startTime <- base::Sys.time() [10:56:26.584] { [10:56:26.584] { [10:56:26.584] { [10:56:26.584] base::local({ [10:56:26.584] has_future <- base::requireNamespace("future", [10:56:26.584] quietly = TRUE) [10:56:26.584] if (has_future) { [10:56:26.584] ns <- base::getNamespace("future") [10:56:26.584] version <- ns[[".package"]][["version"]] [10:56:26.584] if (is.null(version)) [10:56:26.584] version <- utils::packageVersion("future") [10:56:26.584] } [10:56:26.584] else { [10:56:26.584] version <- NULL [10:56:26.584] } [10:56:26.584] if (!has_future || version < "1.8.0") { [10:56:26.584] info <- base::c(r_version = base::gsub("R version ", [10:56:26.584] "", base::R.version$version.string), [10:56:26.584] platform = base::sprintf("%s (%s-bit)", [10:56:26.584] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:26.584] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:26.584] "release", "version")], collapse = " "), [10:56:26.584] hostname = base::Sys.info()[["nodename"]]) [10:56:26.584] info <- base::sprintf("%s: %s", base::names(info), [10:56:26.584] info) [10:56:26.584] info <- base::paste(info, collapse = "; ") [10:56:26.584] if (!has_future) { [10:56:26.584] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:26.584] info) [10:56:26.584] } [10:56:26.584] else { [10:56:26.584] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:26.584] info, version) [10:56:26.584] } [10:56:26.584] base::stop(msg) [10:56:26.584] } [10:56:26.584] }) [10:56:26.584] } [10:56:26.584] ...future.strategy.old <- future::plan("list") [10:56:26.584] options(future.plan = NULL) [10:56:26.584] Sys.unsetenv("R_FUTURE_PLAN") [10:56:26.584] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:26.584] } [10:56:26.584] ...future.workdir <- getwd() [10:56:26.584] } [10:56:26.584] ...future.oldOptions <- base::as.list(base::.Options) [10:56:26.584] ...future.oldEnvVars <- base::Sys.getenv() [10:56:26.584] } [10:56:26.584] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:26.584] future.globals.maxSize = NULL, future.globals.method = NULL, [10:56:26.584] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:26.584] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:26.584] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:26.584] future.stdout.windows.reencode = NULL, width = 80L) [10:56:26.584] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:26.584] base::names(...future.oldOptions)) [10:56:26.584] } [10:56:26.584] if (FALSE) { [10:56:26.584] } [10:56:26.584] else { [10:56:26.584] if (TRUE) { [10:56:26.584] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:26.584] open = "w") [10:56:26.584] } [10:56:26.584] else { [10:56:26.584] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:26.584] windows = "NUL", "/dev/null"), open = "w") [10:56:26.584] } [10:56:26.584] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:26.584] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:26.584] base::sink(type = "output", split = FALSE) [10:56:26.584] base::close(...future.stdout) [10:56:26.584] }, add = TRUE) [10:56:26.584] } [10:56:26.584] ...future.frame <- base::sys.nframe() [10:56:26.584] ...future.conditions <- base::list() [10:56:26.584] ...future.rng <- base::globalenv()$.Random.seed [10:56:26.584] if (FALSE) { [10:56:26.584] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:26.584] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:26.584] } [10:56:26.584] ...future.result <- base::tryCatch({ [10:56:26.584] base::withCallingHandlers({ [10:56:26.584] ...future.value <- base::withVisible(base::local(NA)) [10:56:26.584] future::FutureResult(value = ...future.value$value, [10:56:26.584] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:26.584] ...future.rng), globalenv = if (FALSE) [10:56:26.584] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:26.584] ...future.globalenv.names)) [10:56:26.584] else NULL, started = ...future.startTime, version = "1.8") [10:56:26.584] }, condition = base::local({ [10:56:26.584] c <- base::c [10:56:26.584] inherits <- base::inherits [10:56:26.584] invokeRestart <- base::invokeRestart [10:56:26.584] length <- base::length [10:56:26.584] list <- base::list [10:56:26.584] seq.int <- base::seq.int [10:56:26.584] signalCondition <- base::signalCondition [10:56:26.584] sys.calls <- base::sys.calls [10:56:26.584] `[[` <- base::`[[` [10:56:26.584] `+` <- base::`+` [10:56:26.584] `<<-` <- base::`<<-` [10:56:26.584] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:26.584] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:26.584] 3L)] [10:56:26.584] } [10:56:26.584] function(cond) { [10:56:26.584] is_error <- inherits(cond, "error") [10:56:26.584] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:26.584] NULL) [10:56:26.584] if (is_error) { [10:56:26.584] sessionInformation <- function() { [10:56:26.584] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:26.584] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:26.584] search = base::search(), system = base::Sys.info()) [10:56:26.584] } [10:56:26.584] ...future.conditions[[length(...future.conditions) + [10:56:26.584] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:26.584] cond$call), session = sessionInformation(), [10:56:26.584] timestamp = base::Sys.time(), signaled = 0L) [10:56:26.584] signalCondition(cond) [10:56:26.584] } [10:56:26.584] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:26.584] signal <- FALSE && inherits(cond, character(0)) [10:56:26.584] ...future.conditions[[length(...future.conditions) + [10:56:26.584] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:26.584] if (FALSE && !signal) { [10:56:26.584] muffleCondition <- function (cond, pattern = "^muffle") [10:56:26.584] { [10:56:26.584] inherits <- base::inherits [10:56:26.584] invokeRestart <- base::invokeRestart [10:56:26.584] is.null <- base::is.null [10:56:26.584] muffled <- FALSE [10:56:26.584] if (inherits(cond, "message")) { [10:56:26.584] muffled <- grepl(pattern, "muffleMessage") [10:56:26.584] if (muffled) [10:56:26.584] invokeRestart("muffleMessage") [10:56:26.584] } [10:56:26.584] else if (inherits(cond, "warning")) { [10:56:26.584] muffled <- grepl(pattern, "muffleWarning") [10:56:26.584] if (muffled) [10:56:26.584] invokeRestart("muffleWarning") [10:56:26.584] } [10:56:26.584] else if (inherits(cond, "condition")) { [10:56:26.584] if (!is.null(pattern)) { [10:56:26.584] computeRestarts <- base::computeRestarts [10:56:26.584] grepl <- base::grepl [10:56:26.584] restarts <- computeRestarts(cond) [10:56:26.584] for (restart in restarts) { [10:56:26.584] name <- restart$name [10:56:26.584] if (is.null(name)) [10:56:26.584] next [10:56:26.584] if (!grepl(pattern, name)) [10:56:26.584] next [10:56:26.584] invokeRestart(restart) [10:56:26.584] muffled <- TRUE [10:56:26.584] break [10:56:26.584] } [10:56:26.584] } [10:56:26.584] } [10:56:26.584] invisible(muffled) [10:56:26.584] } [10:56:26.584] muffleCondition(cond, pattern = "^muffle") [10:56:26.584] } [10:56:26.584] } [10:56:26.584] else { [10:56:26.584] if (TRUE) { [10:56:26.584] muffleCondition <- function (cond, pattern = "^muffle") [10:56:26.584] { [10:56:26.584] inherits <- base::inherits [10:56:26.584] invokeRestart <- base::invokeRestart [10:56:26.584] is.null <- base::is.null [10:56:26.584] muffled <- FALSE [10:56:26.584] if (inherits(cond, "message")) { [10:56:26.584] muffled <- grepl(pattern, "muffleMessage") [10:56:26.584] if (muffled) [10:56:26.584] invokeRestart("muffleMessage") [10:56:26.584] } [10:56:26.584] else if (inherits(cond, "warning")) { [10:56:26.584] muffled <- grepl(pattern, "muffleWarning") [10:56:26.584] if (muffled) [10:56:26.584] invokeRestart("muffleWarning") [10:56:26.584] } [10:56:26.584] else if (inherits(cond, "condition")) { [10:56:26.584] if (!is.null(pattern)) { [10:56:26.584] computeRestarts <- base::computeRestarts [10:56:26.584] grepl <- base::grepl [10:56:26.584] restarts <- computeRestarts(cond) [10:56:26.584] for (restart in restarts) { [10:56:26.584] name <- restart$name [10:56:26.584] if (is.null(name)) [10:56:26.584] next [10:56:26.584] if (!grepl(pattern, name)) [10:56:26.584] next [10:56:26.584] invokeRestart(restart) [10:56:26.584] muffled <- TRUE [10:56:26.584] break [10:56:26.584] } [10:56:26.584] } [10:56:26.584] } [10:56:26.584] invisible(muffled) [10:56:26.584] } [10:56:26.584] muffleCondition(cond, pattern = "^muffle") [10:56:26.584] } [10:56:26.584] } [10:56:26.584] } [10:56:26.584] })) [10:56:26.584] }, error = function(ex) { [10:56:26.584] base::structure(base::list(value = NULL, visible = NULL, [10:56:26.584] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:26.584] ...future.rng), started = ...future.startTime, [10:56:26.584] finished = Sys.time(), session_uuid = NA_character_, [10:56:26.584] version = "1.8"), class = "FutureResult") [10:56:26.584] }, finally = { [10:56:26.584] if (!identical(...future.workdir, getwd())) [10:56:26.584] setwd(...future.workdir) [10:56:26.584] { [10:56:26.584] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:26.584] ...future.oldOptions$nwarnings <- NULL [10:56:26.584] } [10:56:26.584] base::options(...future.oldOptions) [10:56:26.584] if (.Platform$OS.type == "windows") { [10:56:26.584] old_names <- names(...future.oldEnvVars) [10:56:26.584] envs <- base::Sys.getenv() [10:56:26.584] names <- names(envs) [10:56:26.584] common <- intersect(names, old_names) [10:56:26.584] added <- setdiff(names, old_names) [10:56:26.584] removed <- setdiff(old_names, names) [10:56:26.584] changed <- common[...future.oldEnvVars[common] != [10:56:26.584] envs[common]] [10:56:26.584] NAMES <- toupper(changed) [10:56:26.584] args <- list() [10:56:26.584] for (kk in seq_along(NAMES)) { [10:56:26.584] name <- changed[[kk]] [10:56:26.584] NAME <- NAMES[[kk]] [10:56:26.584] if (name != NAME && is.element(NAME, old_names)) [10:56:26.584] next [10:56:26.584] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:26.584] } [10:56:26.584] NAMES <- toupper(added) [10:56:26.584] for (kk in seq_along(NAMES)) { [10:56:26.584] name <- added[[kk]] [10:56:26.584] NAME <- NAMES[[kk]] [10:56:26.584] if (name != NAME && is.element(NAME, old_names)) [10:56:26.584] next [10:56:26.584] args[[name]] <- "" [10:56:26.584] } [10:56:26.584] NAMES <- toupper(removed) [10:56:26.584] for (kk in seq_along(NAMES)) { [10:56:26.584] name <- removed[[kk]] [10:56:26.584] NAME <- NAMES[[kk]] [10:56:26.584] if (name != NAME && is.element(NAME, old_names)) [10:56:26.584] next [10:56:26.584] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:26.584] } [10:56:26.584] if (length(args) > 0) [10:56:26.584] base::do.call(base::Sys.setenv, args = args) [10:56:26.584] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:26.584] } [10:56:26.584] else { [10:56:26.584] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:26.584] } [10:56:26.584] { [10:56:26.584] if (base::length(...future.futureOptionsAdded) > [10:56:26.584] 0L) { [10:56:26.584] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:26.584] base::names(opts) <- ...future.futureOptionsAdded [10:56:26.584] base::options(opts) [10:56:26.584] } [10:56:26.584] { [10:56:26.584] NULL [10:56:26.584] options(future.plan = NULL) [10:56:26.584] if (is.na(NA_character_)) [10:56:26.584] Sys.unsetenv("R_FUTURE_PLAN") [10:56:26.584] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:26.584] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:26.584] .init = FALSE) [10:56:26.584] } [10:56:26.584] } [10:56:26.584] } [10:56:26.584] }) [10:56:26.584] if (TRUE) { [10:56:26.584] base::sink(type = "output", split = FALSE) [10:56:26.584] if (TRUE) { [10:56:26.584] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:26.584] } [10:56:26.584] else { [10:56:26.584] ...future.result["stdout"] <- base::list(NULL) [10:56:26.584] } [10:56:26.584] base::close(...future.stdout) [10:56:26.584] ...future.stdout <- NULL [10:56:26.584] } [10:56:26.584] ...future.result$conditions <- ...future.conditions [10:56:26.584] ...future.result$finished <- base::Sys.time() [10:56:26.584] ...future.result [10:56:26.584] } [10:56:26.703] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [10:56:26.703] 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 [10:56:26.731] - plan('mirai_multisession') ...[10:56:26.731] plan(): Setting new future strategy stack: [10:56:26.731] List of future strategies: [10:56:26.731] 1. mirai_multisession: [10:56:26.731] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [10:56:26.731] - tweaked: FALSE [10:56:26.731] - call: plan(strategy) [10:56:26.747] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [10:56:26.747] < mirai | $data > [10:56:26.749] getGlobalsAndPackages() ... [10:56:26.749] Not searching for globals [10:56:26.749] - globals: [0] [10:56:26.750] getGlobalsAndPackages() ... DONE [10:56:26.750] getGlobalsAndPackages() ... [10:56:26.750] [10:56:26.750] - globals: [0] [10:56:26.750] getGlobalsAndPackages() ... DONE [10:56:26.751] Packages needed by the future expression (n = 0): [10:56:26.751] Packages needed by future strategies (n = 0): [10:56:26.751] { [10:56:26.751] { [10:56:26.751] { [10:56:26.751] ...future.startTime <- base::Sys.time() [10:56:26.751] { [10:56:26.751] { [10:56:26.751] { [10:56:26.751] base::local({ [10:56:26.751] has_future <- base::requireNamespace("future", [10:56:26.751] quietly = TRUE) [10:56:26.751] if (has_future) { [10:56:26.751] ns <- base::getNamespace("future") [10:56:26.751] version <- ns[[".package"]][["version"]] [10:56:26.751] if (is.null(version)) [10:56:26.751] version <- utils::packageVersion("future") [10:56:26.751] } [10:56:26.751] else { [10:56:26.751] version <- NULL [10:56:26.751] } [10:56:26.751] if (!has_future || version < "1.8.0") { [10:56:26.751] info <- base::c(r_version = base::gsub("R version ", [10:56:26.751] "", base::R.version$version.string), [10:56:26.751] platform = base::sprintf("%s (%s-bit)", [10:56:26.751] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:26.751] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:26.751] "release", "version")], collapse = " "), [10:56:26.751] hostname = base::Sys.info()[["nodename"]]) [10:56:26.751] info <- base::sprintf("%s: %s", base::names(info), [10:56:26.751] info) [10:56:26.751] info <- base::paste(info, collapse = "; ") [10:56:26.751] if (!has_future) { [10:56:26.751] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:26.751] info) [10:56:26.751] } [10:56:26.751] else { [10:56:26.751] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:26.751] info, version) [10:56:26.751] } [10:56:26.751] base::stop(msg) [10:56:26.751] } [10:56:26.751] }) [10:56:26.751] } [10:56:26.751] ...future.strategy.old <- future::plan("list") [10:56:26.751] options(future.plan = NULL) [10:56:26.751] Sys.unsetenv("R_FUTURE_PLAN") [10:56:26.751] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:26.751] } [10:56:26.751] ...future.workdir <- getwd() [10:56:26.751] } [10:56:26.751] ...future.oldOptions <- base::as.list(base::.Options) [10:56:26.751] ...future.oldEnvVars <- base::Sys.getenv() [10:56:26.751] } [10:56:26.751] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:26.751] future.globals.maxSize = NULL, future.globals.method = NULL, [10:56:26.751] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:26.751] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:26.751] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:26.751] future.stdout.windows.reencode = NULL, width = 80L) [10:56:26.751] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:26.751] base::names(...future.oldOptions)) [10:56:26.751] } [10:56:26.751] if (FALSE) { [10:56:26.751] } [10:56:26.751] else { [10:56:26.751] if (TRUE) { [10:56:26.751] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:26.751] open = "w") [10:56:26.751] } [10:56:26.751] else { [10:56:26.751] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:26.751] windows = "NUL", "/dev/null"), open = "w") [10:56:26.751] } [10:56:26.751] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:26.751] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:26.751] base::sink(type = "output", split = FALSE) [10:56:26.751] base::close(...future.stdout) [10:56:26.751] }, add = TRUE) [10:56:26.751] } [10:56:26.751] ...future.frame <- base::sys.nframe() [10:56:26.751] ...future.conditions <- base::list() [10:56:26.751] ...future.rng <- base::globalenv()$.Random.seed [10:56:26.751] if (FALSE) { [10:56:26.751] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:26.751] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:26.751] } [10:56:26.751] ...future.result <- base::tryCatch({ [10:56:26.751] base::withCallingHandlers({ [10:56:26.751] ...future.value <- base::withVisible(base::local(NA)) [10:56:26.751] future::FutureResult(value = ...future.value$value, [10:56:26.751] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:26.751] ...future.rng), globalenv = if (FALSE) [10:56:26.751] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:26.751] ...future.globalenv.names)) [10:56:26.751] else NULL, started = ...future.startTime, version = "1.8") [10:56:26.751] }, condition = base::local({ [10:56:26.751] c <- base::c [10:56:26.751] inherits <- base::inherits [10:56:26.751] invokeRestart <- base::invokeRestart [10:56:26.751] length <- base::length [10:56:26.751] list <- base::list [10:56:26.751] seq.int <- base::seq.int [10:56:26.751] signalCondition <- base::signalCondition [10:56:26.751] sys.calls <- base::sys.calls [10:56:26.751] `[[` <- base::`[[` [10:56:26.751] `+` <- base::`+` [10:56:26.751] `<<-` <- base::`<<-` [10:56:26.751] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:26.751] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:26.751] 3L)] [10:56:26.751] } [10:56:26.751] function(cond) { [10:56:26.751] is_error <- inherits(cond, "error") [10:56:26.751] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:26.751] NULL) [10:56:26.751] if (is_error) { [10:56:26.751] sessionInformation <- function() { [10:56:26.751] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:26.751] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:26.751] search = base::search(), system = base::Sys.info()) [10:56:26.751] } [10:56:26.751] ...future.conditions[[length(...future.conditions) + [10:56:26.751] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:26.751] cond$call), session = sessionInformation(), [10:56:26.751] timestamp = base::Sys.time(), signaled = 0L) [10:56:26.751] signalCondition(cond) [10:56:26.751] } [10:56:26.751] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:26.751] signal <- FALSE && inherits(cond, character(0)) [10:56:26.751] ...future.conditions[[length(...future.conditions) + [10:56:26.751] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:26.751] if (FALSE && !signal) { [10:56:26.751] muffleCondition <- function (cond, pattern = "^muffle") [10:56:26.751] { [10:56:26.751] inherits <- base::inherits [10:56:26.751] invokeRestart <- base::invokeRestart [10:56:26.751] is.null <- base::is.null [10:56:26.751] muffled <- FALSE [10:56:26.751] if (inherits(cond, "message")) { [10:56:26.751] muffled <- grepl(pattern, "muffleMessage") [10:56:26.751] if (muffled) [10:56:26.751] invokeRestart("muffleMessage") [10:56:26.751] } [10:56:26.751] else if (inherits(cond, "warning")) { [10:56:26.751] muffled <- grepl(pattern, "muffleWarning") [10:56:26.751] if (muffled) [10:56:26.751] invokeRestart("muffleWarning") [10:56:26.751] } [10:56:26.751] else if (inherits(cond, "condition")) { [10:56:26.751] if (!is.null(pattern)) { [10:56:26.751] computeRestarts <- base::computeRestarts [10:56:26.751] grepl <- base::grepl [10:56:26.751] restarts <- computeRestarts(cond) [10:56:26.751] for (restart in restarts) { [10:56:26.751] name <- restart$name [10:56:26.751] if (is.null(name)) [10:56:26.751] next [10:56:26.751] if (!grepl(pattern, name)) [10:56:26.751] next [10:56:26.751] invokeRestart(restart) [10:56:26.751] muffled <- TRUE [10:56:26.751] break [10:56:26.751] } [10:56:26.751] } [10:56:26.751] } [10:56:26.751] invisible(muffled) [10:56:26.751] } [10:56:26.751] muffleCondition(cond, pattern = "^muffle") [10:56:26.751] } [10:56:26.751] } [10:56:26.751] else { [10:56:26.751] if (TRUE) { [10:56:26.751] muffleCondition <- function (cond, pattern = "^muffle") [10:56:26.751] { [10:56:26.751] inherits <- base::inherits [10:56:26.751] invokeRestart <- base::invokeRestart [10:56:26.751] is.null <- base::is.null [10:56:26.751] muffled <- FALSE [10:56:26.751] if (inherits(cond, "message")) { [10:56:26.751] muffled <- grepl(pattern, "muffleMessage") [10:56:26.751] if (muffled) [10:56:26.751] invokeRestart("muffleMessage") [10:56:26.751] } [10:56:26.751] else if (inherits(cond, "warning")) { [10:56:26.751] muffled <- grepl(pattern, "muffleWarning") [10:56:26.751] if (muffled) [10:56:26.751] invokeRestart("muffleWarning") [10:56:26.751] } [10:56:26.751] else if (inherits(cond, "condition")) { [10:56:26.751] if (!is.null(pattern)) { [10:56:26.751] computeRestarts <- base::computeRestarts [10:56:26.751] grepl <- base::grepl [10:56:26.751] restarts <- computeRestarts(cond) [10:56:26.751] for (restart in restarts) { [10:56:26.751] name <- restart$name [10:56:26.751] if (is.null(name)) [10:56:26.751] next [10:56:26.751] if (!grepl(pattern, name)) [10:56:26.751] next [10:56:26.751] invokeRestart(restart) [10:56:26.751] muffled <- TRUE [10:56:26.751] break [10:56:26.751] } [10:56:26.751] } [10:56:26.751] } [10:56:26.751] invisible(muffled) [10:56:26.751] } [10:56:26.751] muffleCondition(cond, pattern = "^muffle") [10:56:26.751] } [10:56:26.751] } [10:56:26.751] } [10:56:26.751] })) [10:56:26.751] }, error = function(ex) { [10:56:26.751] base::structure(base::list(value = NULL, visible = NULL, [10:56:26.751] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:26.751] ...future.rng), started = ...future.startTime, [10:56:26.751] finished = Sys.time(), session_uuid = NA_character_, [10:56:26.751] version = "1.8"), class = "FutureResult") [10:56:26.751] }, finally = { [10:56:26.751] if (!identical(...future.workdir, getwd())) [10:56:26.751] setwd(...future.workdir) [10:56:26.751] { [10:56:26.751] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:26.751] ...future.oldOptions$nwarnings <- NULL [10:56:26.751] } [10:56:26.751] base::options(...future.oldOptions) [10:56:26.751] if (.Platform$OS.type == "windows") { [10:56:26.751] old_names <- names(...future.oldEnvVars) [10:56:26.751] envs <- base::Sys.getenv() [10:56:26.751] names <- names(envs) [10:56:26.751] common <- intersect(names, old_names) [10:56:26.751] added <- setdiff(names, old_names) [10:56:26.751] removed <- setdiff(old_names, names) [10:56:26.751] changed <- common[...future.oldEnvVars[common] != [10:56:26.751] envs[common]] [10:56:26.751] NAMES <- toupper(changed) [10:56:26.751] args <- list() [10:56:26.751] for (kk in seq_along(NAMES)) { [10:56:26.751] name <- changed[[kk]] [10:56:26.751] NAME <- NAMES[[kk]] [10:56:26.751] if (name != NAME && is.element(NAME, old_names)) [10:56:26.751] next [10:56:26.751] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:26.751] } [10:56:26.751] NAMES <- toupper(added) [10:56:26.751] for (kk in seq_along(NAMES)) { [10:56:26.751] name <- added[[kk]] [10:56:26.751] NAME <- NAMES[[kk]] [10:56:26.751] if (name != NAME && is.element(NAME, old_names)) [10:56:26.751] next [10:56:26.751] args[[name]] <- "" [10:56:26.751] } [10:56:26.751] NAMES <- toupper(removed) [10:56:26.751] for (kk in seq_along(NAMES)) { [10:56:26.751] name <- removed[[kk]] [10:56:26.751] NAME <- NAMES[[kk]] [10:56:26.751] if (name != NAME && is.element(NAME, old_names)) [10:56:26.751] next [10:56:26.751] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:26.751] } [10:56:26.751] if (length(args) > 0) [10:56:26.751] base::do.call(base::Sys.setenv, args = args) [10:56:26.751] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:26.751] } [10:56:26.751] else { [10:56:26.751] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:26.751] } [10:56:26.751] { [10:56:26.751] if (base::length(...future.futureOptionsAdded) > [10:56:26.751] 0L) { [10:56:26.751] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:26.751] base::names(opts) <- ...future.futureOptionsAdded [10:56:26.751] base::options(opts) [10:56:26.751] } [10:56:26.751] { [10:56:26.751] NULL [10:56:26.751] options(future.plan = NULL) [10:56:26.751] if (is.na(NA_character_)) [10:56:26.751] Sys.unsetenv("R_FUTURE_PLAN") [10:56:26.751] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:26.751] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:26.751] .init = FALSE) [10:56:26.751] } [10:56:26.751] } [10:56:26.751] } [10:56:26.751] }) [10:56:26.751] if (TRUE) { [10:56:26.751] base::sink(type = "output", split = FALSE) [10:56:26.751] if (TRUE) { [10:56:26.751] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:26.751] } [10:56:26.751] else { [10:56:26.751] ...future.result["stdout"] <- base::list(NULL) [10:56:26.751] } [10:56:26.751] base::close(...future.stdout) [10:56:26.751] ...future.stdout <- NULL [10:56:26.751] } [10:56:26.751] ...future.result$conditions <- ...future.conditions [10:56:26.751] ...future.result$finished <- base::Sys.time() [10:56:26.751] ...future.result [10:56:26.751] } [10:56:26.864] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [10:56:26.865] plan(): nbrOfWorkers() = 2 [10:56:26.865] future_lapply() ... [10:56:26.872] Number of chunks: 3 [10:56:26.873] getGlobalsAndPackagesXApply() ... [10:56:26.873] - future.globals: TRUE [10:56:26.873] getGlobalsAndPackages() ... [10:56:26.873] Searching for globals... [10:56:26.876] - globals found: [2] 'FUN', '.Internal' [10:56:26.876] Searching for globals ... DONE [10:56:26.876] Resolving globals: FALSE [10:56:26.878] The total size of the 1 globals is 2.13 KiB (2184 bytes) [10:56:26.878] 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') [10:56:26.878] - globals: [1] 'FUN' [10:56:26.879] [10:56:26.879] getGlobalsAndPackages() ... DONE [10:56:26.879] - globals found/used: [n=1] 'FUN' [10:56:26.879] - needed namespaces: [n=0] [10:56:26.879] Finding globals ... DONE [10:56:26.879] - use_args: TRUE [10:56:26.880] - Getting '...' globals ... [10:56:26.881] resolve() on list ... [10:56:26.881] recursive: 0 [10:56:26.881] length: 1 [10:56:26.881] elements: '...' [10:56:26.885] length: 0 (resolved future 1) [10:56:26.885] resolve() on list ... DONE [10:56:26.885] - '...' content: [n=1] 'length' [10:56:26.885] List of 1 [10:56:26.885] $ ...:List of 1 [10:56:26.885] ..$ length: int 2 [10:56:26.885] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:26.885] - attr(*, "where")=List of 1 [10:56:26.885] ..$ ...: [10:56:26.885] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:26.885] - attr(*, "resolved")= logi TRUE [10:56:26.885] - attr(*, "total_size")= num NA [10:56:26.889] - Getting '...' globals ... DONE [10:56:26.890] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [10:56:26.890] List of 2 [10:56:26.890] $ ...future.FUN:function (mode = "logical", length = 0L) [10:56:26.890] $ ... :List of 1 [10:56:26.890] ..$ length: int 2 [10:56:26.890] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:26.890] - attr(*, "where")=List of 2 [10:56:26.890] ..$ ...future.FUN: [10:56:26.890] ..$ ... : [10:56:26.890] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:26.890] - attr(*, "resolved")= logi FALSE [10:56:26.890] - attr(*, "total_size")= num 2240 [10:56:26.894] Packages to be attached in all futures: [n=0] [10:56:26.894] getGlobalsAndPackagesXApply() ... DONE [10:56:26.894] Number of futures (= number of chunks): 3 [10:56:26.894] Launching 3 futures (chunks) ... [10:56:26.895] Chunk #1 of 3 ... [10:56:26.895] - Finding globals in 'X' for chunk #1 ... [10:56:26.895] getGlobalsAndPackages() ... [10:56:26.895] Searching for globals... [10:56:26.896] [10:56:26.896] Searching for globals ... DONE [10:56:26.896] - globals: [0] [10:56:26.896] getGlobalsAndPackages() ... DONE [10:56:26.896] + additional globals found: [n=0] [10:56:26.896] + additional namespaces needed: [n=0] [10:56:26.897] - Finding globals in 'X' for chunk #1 ... DONE [10:56:26.897] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [10:56:26.897] - seeds: [10:56:26.897] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:26.897] getGlobalsAndPackages() ... [10:56:26.898] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:26.898] Resolving globals: FALSE [10:56:26.898] Tweak future expression to call with '...' arguments ... [10:56:26.898] { [10:56:26.898] do.call(function(...) { [10:56:26.898] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:26.898] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:26.898] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:26.898] on.exit(options(oopts), add = TRUE) [10:56:26.898] } [10:56:26.898] { [10:56:26.898] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:26.898] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:26.898] ...future.FUN(...future.X_jj, ...) [10:56:26.898] }) [10:56:26.898] } [10:56:26.898] }, args = future.call.arguments) [10:56:26.898] } [10:56:26.899] Tweak future expression to call with '...' arguments ... DONE [10:56:26.899] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:26.899] [10:56:26.900] getGlobalsAndPackages() ... DONE [10:56:26.900] run() for 'Future' ... [10:56:26.901] - state: 'created' [10:56:26.901] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:26.906] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:26.906] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:26.906] - Field: 'label' [10:56:26.907] - Field: 'local' [10:56:26.907] - Field: 'owner' [10:56:26.907] - Field: 'envir' [10:56:26.908] - Field: 'packages' [10:56:26.908] - Field: 'gc' [10:56:26.908] - Field: 'conditions' [10:56:26.908] - Field: 'expr' [10:56:26.909] - Field: 'uuid' [10:56:26.909] - Field: 'seed' [10:56:26.909] - Field: 'version' [10:56:26.910] - Field: 'result' [10:56:26.910] - Field: 'asynchronous' [10:56:26.910] - Field: 'calls' [10:56:26.911] - Field: 'globals' [10:56:26.911] - Field: 'stdout' [10:56:26.911] - Field: 'earlySignal' [10:56:26.912] - Field: 'lazy' [10:56:26.912] - Field: 'state' [10:56:26.912] - Field: '.cluster' [10:56:26.913] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:26.913] - Launch lazy future ... [10:56:26.913] Packages needed by the future expression (n = 0): [10:56:26.914] Packages needed by future strategies (n = 0): [10:56:26.915] { [10:56:26.915] { [10:56:26.915] { [10:56:26.915] ...future.startTime <- base::Sys.time() [10:56:26.915] { [10:56:26.915] { [10:56:26.915] { [10:56:26.915] base::local({ [10:56:26.915] has_future <- base::requireNamespace("future", [10:56:26.915] quietly = TRUE) [10:56:26.915] if (has_future) { [10:56:26.915] ns <- base::getNamespace("future") [10:56:26.915] version <- ns[[".package"]][["version"]] [10:56:26.915] if (is.null(version)) [10:56:26.915] version <- utils::packageVersion("future") [10:56:26.915] } [10:56:26.915] else { [10:56:26.915] version <- NULL [10:56:26.915] } [10:56:26.915] if (!has_future || version < "1.8.0") { [10:56:26.915] info <- base::c(r_version = base::gsub("R version ", [10:56:26.915] "", base::R.version$version.string), [10:56:26.915] platform = base::sprintf("%s (%s-bit)", [10:56:26.915] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:26.915] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:26.915] "release", "version")], collapse = " "), [10:56:26.915] hostname = base::Sys.info()[["nodename"]]) [10:56:26.915] info <- base::sprintf("%s: %s", base::names(info), [10:56:26.915] info) [10:56:26.915] info <- base::paste(info, collapse = "; ") [10:56:26.915] if (!has_future) { [10:56:26.915] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:26.915] info) [10:56:26.915] } [10:56:26.915] else { [10:56:26.915] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:26.915] info, version) [10:56:26.915] } [10:56:26.915] base::stop(msg) [10:56:26.915] } [10:56:26.915] }) [10:56:26.915] } [10:56:26.915] ...future.strategy.old <- future::plan("list") [10:56:26.915] options(future.plan = NULL) [10:56:26.915] Sys.unsetenv("R_FUTURE_PLAN") [10:56:26.915] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:26.915] } [10:56:26.915] ...future.workdir <- getwd() [10:56:26.915] } [10:56:26.915] ...future.oldOptions <- base::as.list(base::.Options) [10:56:26.915] ...future.oldEnvVars <- base::Sys.getenv() [10:56:26.915] } [10:56:26.915] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:26.915] future.globals.maxSize = 1572864000, future.globals.method = NULL, [10:56:26.915] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:26.915] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:26.915] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:26.915] future.stdout.windows.reencode = NULL, width = 80L) [10:56:26.915] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:26.915] base::names(...future.oldOptions)) [10:56:26.915] } [10:56:26.915] if (FALSE) { [10:56:26.915] } [10:56:26.915] else { [10:56:26.915] if (TRUE) { [10:56:26.915] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:26.915] open = "w") [10:56:26.915] } [10:56:26.915] else { [10:56:26.915] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:26.915] windows = "NUL", "/dev/null"), open = "w") [10:56:26.915] } [10:56:26.915] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:26.915] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:26.915] base::sink(type = "output", split = FALSE) [10:56:26.915] base::close(...future.stdout) [10:56:26.915] }, add = TRUE) [10:56:26.915] } [10:56:26.915] ...future.frame <- base::sys.nframe() [10:56:26.915] ...future.conditions <- base::list() [10:56:26.915] ...future.rng <- base::globalenv()$.Random.seed [10:56:26.915] if (FALSE) { [10:56:26.915] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:26.915] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:26.915] } [10:56:26.915] ...future.result <- base::tryCatch({ [10:56:26.915] base::withCallingHandlers({ [10:56:26.915] ...future.value <- base::withVisible(base::local({ [10:56:26.915] do.call(function(...) { [10:56:26.915] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:26.915] if (!identical(...future.globals.maxSize.org, [10:56:26.915] ...future.globals.maxSize)) { [10:56:26.915] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:26.915] on.exit(options(oopts), add = TRUE) [10:56:26.915] } [10:56:26.915] { [10:56:26.915] lapply(seq_along(...future.elements_ii), [10:56:26.915] FUN = function(jj) { [10:56:26.915] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:26.915] ...future.FUN(...future.X_jj, ...) [10:56:26.915] }) [10:56:26.915] } [10:56:26.915] }, args = future.call.arguments) [10:56:26.915] })) [10:56:26.915] future::FutureResult(value = ...future.value$value, [10:56:26.915] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:26.915] ...future.rng), globalenv = if (FALSE) [10:56:26.915] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:26.915] ...future.globalenv.names)) [10:56:26.915] else NULL, started = ...future.startTime, version = "1.8") [10:56:26.915] }, condition = base::local({ [10:56:26.915] c <- base::c [10:56:26.915] inherits <- base::inherits [10:56:26.915] invokeRestart <- base::invokeRestart [10:56:26.915] length <- base::length [10:56:26.915] list <- base::list [10:56:26.915] seq.int <- base::seq.int [10:56:26.915] signalCondition <- base::signalCondition [10:56:26.915] sys.calls <- base::sys.calls [10:56:26.915] `[[` <- base::`[[` [10:56:26.915] `+` <- base::`+` [10:56:26.915] `<<-` <- base::`<<-` [10:56:26.915] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:26.915] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:26.915] 3L)] [10:56:26.915] } [10:56:26.915] function(cond) { [10:56:26.915] is_error <- inherits(cond, "error") [10:56:26.915] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:26.915] NULL) [10:56:26.915] if (is_error) { [10:56:26.915] sessionInformation <- function() { [10:56:26.915] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:26.915] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:26.915] search = base::search(), system = base::Sys.info()) [10:56:26.915] } [10:56:26.915] ...future.conditions[[length(...future.conditions) + [10:56:26.915] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:26.915] cond$call), session = sessionInformation(), [10:56:26.915] timestamp = base::Sys.time(), signaled = 0L) [10:56:26.915] signalCondition(cond) [10:56:26.915] } [10:56:26.915] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:26.915] signal <- FALSE && inherits(cond, character(0)) [10:56:26.915] ...future.conditions[[length(...future.conditions) + [10:56:26.915] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:26.915] if (FALSE && !signal) { [10:56:26.915] muffleCondition <- function (cond, pattern = "^muffle") [10:56:26.915] { [10:56:26.915] inherits <- base::inherits [10:56:26.915] invokeRestart <- base::invokeRestart [10:56:26.915] is.null <- base::is.null [10:56:26.915] muffled <- FALSE [10:56:26.915] if (inherits(cond, "message")) { [10:56:26.915] muffled <- grepl(pattern, "muffleMessage") [10:56:26.915] if (muffled) [10:56:26.915] invokeRestart("muffleMessage") [10:56:26.915] } [10:56:26.915] else if (inherits(cond, "warning")) { [10:56:26.915] muffled <- grepl(pattern, "muffleWarning") [10:56:26.915] if (muffled) [10:56:26.915] invokeRestart("muffleWarning") [10:56:26.915] } [10:56:26.915] else if (inherits(cond, "condition")) { [10:56:26.915] if (!is.null(pattern)) { [10:56:26.915] computeRestarts <- base::computeRestarts [10:56:26.915] grepl <- base::grepl [10:56:26.915] restarts <- computeRestarts(cond) [10:56:26.915] for (restart in restarts) { [10:56:26.915] name <- restart$name [10:56:26.915] if (is.null(name)) [10:56:26.915] next [10:56:26.915] if (!grepl(pattern, name)) [10:56:26.915] next [10:56:26.915] invokeRestart(restart) [10:56:26.915] muffled <- TRUE [10:56:26.915] break [10:56:26.915] } [10:56:26.915] } [10:56:26.915] } [10:56:26.915] invisible(muffled) [10:56:26.915] } [10:56:26.915] muffleCondition(cond, pattern = "^muffle") [10:56:26.915] } [10:56:26.915] } [10:56:26.915] else { [10:56:26.915] if (TRUE) { [10:56:26.915] muffleCondition <- function (cond, pattern = "^muffle") [10:56:26.915] { [10:56:26.915] inherits <- base::inherits [10:56:26.915] invokeRestart <- base::invokeRestart [10:56:26.915] is.null <- base::is.null [10:56:26.915] muffled <- FALSE [10:56:26.915] if (inherits(cond, "message")) { [10:56:26.915] muffled <- grepl(pattern, "muffleMessage") [10:56:26.915] if (muffled) [10:56:26.915] invokeRestart("muffleMessage") [10:56:26.915] } [10:56:26.915] else if (inherits(cond, "warning")) { [10:56:26.915] muffled <- grepl(pattern, "muffleWarning") [10:56:26.915] if (muffled) [10:56:26.915] invokeRestart("muffleWarning") [10:56:26.915] } [10:56:26.915] else if (inherits(cond, "condition")) { [10:56:26.915] if (!is.null(pattern)) { [10:56:26.915] computeRestarts <- base::computeRestarts [10:56:26.915] grepl <- base::grepl [10:56:26.915] restarts <- computeRestarts(cond) [10:56:26.915] for (restart in restarts) { [10:56:26.915] name <- restart$name [10:56:26.915] if (is.null(name)) [10:56:26.915] next [10:56:26.915] if (!grepl(pattern, name)) [10:56:26.915] next [10:56:26.915] invokeRestart(restart) [10:56:26.915] muffled <- TRUE [10:56:26.915] break [10:56:26.915] } [10:56:26.915] } [10:56:26.915] } [10:56:26.915] invisible(muffled) [10:56:26.915] } [10:56:26.915] muffleCondition(cond, pattern = "^muffle") [10:56:26.915] } [10:56:26.915] } [10:56:26.915] } [10:56:26.915] })) [10:56:26.915] }, error = function(ex) { [10:56:26.915] base::structure(base::list(value = NULL, visible = NULL, [10:56:26.915] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:26.915] ...future.rng), started = ...future.startTime, [10:56:26.915] finished = Sys.time(), session_uuid = NA_character_, [10:56:26.915] version = "1.8"), class = "FutureResult") [10:56:26.915] }, finally = { [10:56:26.915] if (!identical(...future.workdir, getwd())) [10:56:26.915] setwd(...future.workdir) [10:56:26.915] { [10:56:26.915] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:26.915] ...future.oldOptions$nwarnings <- NULL [10:56:26.915] } [10:56:26.915] base::options(...future.oldOptions) [10:56:26.915] if (.Platform$OS.type == "windows") { [10:56:26.915] old_names <- names(...future.oldEnvVars) [10:56:26.915] envs <- base::Sys.getenv() [10:56:26.915] names <- names(envs) [10:56:26.915] common <- intersect(names, old_names) [10:56:26.915] added <- setdiff(names, old_names) [10:56:26.915] removed <- setdiff(old_names, names) [10:56:26.915] changed <- common[...future.oldEnvVars[common] != [10:56:26.915] envs[common]] [10:56:26.915] NAMES <- toupper(changed) [10:56:26.915] args <- list() [10:56:26.915] for (kk in seq_along(NAMES)) { [10:56:26.915] name <- changed[[kk]] [10:56:26.915] NAME <- NAMES[[kk]] [10:56:26.915] if (name != NAME && is.element(NAME, old_names)) [10:56:26.915] next [10:56:26.915] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:26.915] } [10:56:26.915] NAMES <- toupper(added) [10:56:26.915] for (kk in seq_along(NAMES)) { [10:56:26.915] name <- added[[kk]] [10:56:26.915] NAME <- NAMES[[kk]] [10:56:26.915] if (name != NAME && is.element(NAME, old_names)) [10:56:26.915] next [10:56:26.915] args[[name]] <- "" [10:56:26.915] } [10:56:26.915] NAMES <- toupper(removed) [10:56:26.915] for (kk in seq_along(NAMES)) { [10:56:26.915] name <- removed[[kk]] [10:56:26.915] NAME <- NAMES[[kk]] [10:56:26.915] if (name != NAME && is.element(NAME, old_names)) [10:56:26.915] next [10:56:26.915] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:26.915] } [10:56:26.915] if (length(args) > 0) [10:56:26.915] base::do.call(base::Sys.setenv, args = args) [10:56:26.915] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:26.915] } [10:56:26.915] else { [10:56:26.915] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:26.915] } [10:56:26.915] { [10:56:26.915] if (base::length(...future.futureOptionsAdded) > [10:56:26.915] 0L) { [10:56:26.915] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:26.915] base::names(opts) <- ...future.futureOptionsAdded [10:56:26.915] base::options(opts) [10:56:26.915] } [10:56:26.915] { [10:56:26.915] NULL [10:56:26.915] options(future.plan = NULL) [10:56:26.915] if (is.na(NA_character_)) [10:56:26.915] Sys.unsetenv("R_FUTURE_PLAN") [10:56:26.915] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:26.915] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:26.915] .init = FALSE) [10:56:26.915] } [10:56:26.915] } [10:56:26.915] } [10:56:26.915] }) [10:56:26.915] if (TRUE) { [10:56:26.915] base::sink(type = "output", split = FALSE) [10:56:26.915] if (TRUE) { [10:56:26.915] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:26.915] } [10:56:26.915] else { [10:56:26.915] ...future.result["stdout"] <- base::list(NULL) [10:56:26.915] } [10:56:26.915] base::close(...future.stdout) [10:56:26.915] ...future.stdout <- NULL [10:56:26.915] } [10:56:26.915] ...future.result$conditions <- ...future.conditions [10:56:26.915] ...future.result$finished <- base::Sys.time() [10:56:26.915] ...future.result [10:56:26.915] } [10:56:26.921] - Launch lazy future ... done [10:56:26.921] run() for 'MiraiFuture' ... done [10:56:26.921] Created future: [10:56:26.926] resolved() for 'MiraiFuture' ... [10:56:26.926] - state: 'running' [10:56:26.927] - run: TRUE [10:56:26.927] - result: 'NULL' [10:56:26.927] - resolved: FALSE [10:56:26.927] resolved() for 'MiraiFuture' ... done [10:56:26.921] MiraiFuture: [10:56:26.921] Label: 'future_lapply-1' [10:56:26.921] Expression: [10:56:26.921] { [10:56:26.921] do.call(function(...) { [10:56:26.921] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:26.921] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:26.921] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:26.921] on.exit(options(oopts), add = TRUE) [10:56:26.921] } [10:56:26.921] { [10:56:26.921] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:26.921] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:26.921] ...future.FUN(...future.X_jj, ...) [10:56:26.921] }) [10:56:26.921] } [10:56:26.921] }, args = future.call.arguments) [10:56:26.921] } [10:56:26.921] Lazy evaluation: FALSE [10:56:26.921] Asynchronous evaluation: TRUE [10:56:26.921] Local evaluation: TRUE [10:56:26.921] Environment: R_GlobalEnv [10:56:26.921] Capture standard output: TRUE [10:56:26.921] Capture condition classes: 'condition' (excluding 'nothing') [10:56:26.921] 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) [10:56:26.921] Packages: [10:56:26.921] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:26.921] Resolved: TRUE [10:56:26.921] Value: [10:56:26.921] Conditions captured: [10:56:26.921] Early signaling: FALSE [10:56:26.921] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:26.921] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:26.928] Chunk #1 of 3 ... DONE [10:56:26.929] Chunk #2 of 3 ... [10:56:26.929] - Finding globals in 'X' for chunk #2 ... [10:56:26.929] getGlobalsAndPackages() ... [10:56:26.929] Searching for globals... [10:56:26.930] [10:56:26.930] Searching for globals ... DONE [10:56:26.930] - globals: [0] [10:56:26.930] getGlobalsAndPackages() ... DONE [10:56:26.931] + additional globals found: [n=0] [10:56:26.931] + additional namespaces needed: [n=0] [10:56:26.931] - Finding globals in 'X' for chunk #2 ... DONE [10:56:26.931] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [10:56:26.931] - seeds: [10:56:26.932] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:26.932] getGlobalsAndPackages() ... [10:56:26.932] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:26.933] Resolving globals: FALSE [10:56:26.933] Tweak future expression to call with '...' arguments ... [10:56:26.933] { [10:56:26.933] do.call(function(...) { [10:56:26.933] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:26.933] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:26.933] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:26.933] on.exit(options(oopts), add = TRUE) [10:56:26.933] } [10:56:26.933] { [10:56:26.933] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:26.933] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:26.933] ...future.FUN(...future.X_jj, ...) [10:56:26.933] }) [10:56:26.933] } [10:56:26.933] }, args = future.call.arguments) [10:56:26.933] } [10:56:26.934] Tweak future expression to call with '...' arguments ... DONE [10:56:26.934] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:26.935] [10:56:26.935] getGlobalsAndPackages() ... DONE [10:56:26.936] run() for 'Future' ... [10:56:26.936] - state: 'created' [10:56:26.936] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:26.940] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:26.941] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:26.941] - Field: 'label' [10:56:26.941] - Field: 'local' [10:56:26.942] - Field: 'owner' [10:56:26.942] - Field: 'envir' [10:56:26.942] - Field: 'packages' [10:56:26.943] - Field: 'gc' [10:56:26.943] - Field: 'conditions' [10:56:26.943] - Field: 'expr' [10:56:26.944] - Field: 'uuid' [10:56:26.944] - Field: 'seed' [10:56:26.944] - Field: 'version' [10:56:26.945] - Field: 'result' [10:56:26.945] - Field: 'asynchronous' [10:56:26.945] - Field: 'calls' [10:56:26.946] - Field: 'globals' [10:56:26.946] - Field: 'stdout' [10:56:26.946] - Field: 'earlySignal' [10:56:26.946] - Field: 'lazy' [10:56:26.947] - Field: 'state' [10:56:26.947] - Field: '.cluster' [10:56:26.947] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:26.947] - Launch lazy future ... [10:56:26.948] Packages needed by the future expression (n = 0): [10:56:26.948] Packages needed by future strategies (n = 0): [10:56:26.949] { [10:56:26.949] { [10:56:26.949] { [10:56:26.949] ...future.startTime <- base::Sys.time() [10:56:26.949] { [10:56:26.949] { [10:56:26.949] { [10:56:26.949] base::local({ [10:56:26.949] has_future <- base::requireNamespace("future", [10:56:26.949] quietly = TRUE) [10:56:26.949] if (has_future) { [10:56:26.949] ns <- base::getNamespace("future") [10:56:26.949] version <- ns[[".package"]][["version"]] [10:56:26.949] if (is.null(version)) [10:56:26.949] version <- utils::packageVersion("future") [10:56:26.949] } [10:56:26.949] else { [10:56:26.949] version <- NULL [10:56:26.949] } [10:56:26.949] if (!has_future || version < "1.8.0") { [10:56:26.949] info <- base::c(r_version = base::gsub("R version ", [10:56:26.949] "", base::R.version$version.string), [10:56:26.949] platform = base::sprintf("%s (%s-bit)", [10:56:26.949] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:26.949] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:26.949] "release", "version")], collapse = " "), [10:56:26.949] hostname = base::Sys.info()[["nodename"]]) [10:56:26.949] info <- base::sprintf("%s: %s", base::names(info), [10:56:26.949] info) [10:56:26.949] info <- base::paste(info, collapse = "; ") [10:56:26.949] if (!has_future) { [10:56:26.949] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:26.949] info) [10:56:26.949] } [10:56:26.949] else { [10:56:26.949] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:26.949] info, version) [10:56:26.949] } [10:56:26.949] base::stop(msg) [10:56:26.949] } [10:56:26.949] }) [10:56:26.949] } [10:56:26.949] ...future.strategy.old <- future::plan("list") [10:56:26.949] options(future.plan = NULL) [10:56:26.949] Sys.unsetenv("R_FUTURE_PLAN") [10:56:26.949] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:26.949] } [10:56:26.949] ...future.workdir <- getwd() [10:56:26.949] } [10:56:26.949] ...future.oldOptions <- base::as.list(base::.Options) [10:56:26.949] ...future.oldEnvVars <- base::Sys.getenv() [10:56:26.949] } [10:56:26.949] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:26.949] future.globals.maxSize = 1572864000, future.globals.method = NULL, [10:56:26.949] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:26.949] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:26.949] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:26.949] future.stdout.windows.reencode = NULL, width = 80L) [10:56:26.949] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:26.949] base::names(...future.oldOptions)) [10:56:26.949] } [10:56:26.949] if (FALSE) { [10:56:26.949] } [10:56:26.949] else { [10:56:26.949] if (TRUE) { [10:56:26.949] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:26.949] open = "w") [10:56:26.949] } [10:56:26.949] else { [10:56:26.949] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:26.949] windows = "NUL", "/dev/null"), open = "w") [10:56:26.949] } [10:56:26.949] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:26.949] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:26.949] base::sink(type = "output", split = FALSE) [10:56:26.949] base::close(...future.stdout) [10:56:26.949] }, add = TRUE) [10:56:26.949] } [10:56:26.949] ...future.frame <- base::sys.nframe() [10:56:26.949] ...future.conditions <- base::list() [10:56:26.949] ...future.rng <- base::globalenv()$.Random.seed [10:56:26.949] if (FALSE) { [10:56:26.949] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:26.949] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:26.949] } [10:56:26.949] ...future.result <- base::tryCatch({ [10:56:26.949] base::withCallingHandlers({ [10:56:26.949] ...future.value <- base::withVisible(base::local({ [10:56:26.949] do.call(function(...) { [10:56:26.949] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:26.949] if (!identical(...future.globals.maxSize.org, [10:56:26.949] ...future.globals.maxSize)) { [10:56:26.949] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:26.949] on.exit(options(oopts), add = TRUE) [10:56:26.949] } [10:56:26.949] { [10:56:26.949] lapply(seq_along(...future.elements_ii), [10:56:26.949] FUN = function(jj) { [10:56:26.949] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:26.949] ...future.FUN(...future.X_jj, ...) [10:56:26.949] }) [10:56:26.949] } [10:56:26.949] }, args = future.call.arguments) [10:56:26.949] })) [10:56:26.949] future::FutureResult(value = ...future.value$value, [10:56:26.949] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:26.949] ...future.rng), globalenv = if (FALSE) [10:56:26.949] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:26.949] ...future.globalenv.names)) [10:56:26.949] else NULL, started = ...future.startTime, version = "1.8") [10:56:26.949] }, condition = base::local({ [10:56:26.949] c <- base::c [10:56:26.949] inherits <- base::inherits [10:56:26.949] invokeRestart <- base::invokeRestart [10:56:26.949] length <- base::length [10:56:26.949] list <- base::list [10:56:26.949] seq.int <- base::seq.int [10:56:26.949] signalCondition <- base::signalCondition [10:56:26.949] sys.calls <- base::sys.calls [10:56:26.949] `[[` <- base::`[[` [10:56:26.949] `+` <- base::`+` [10:56:26.949] `<<-` <- base::`<<-` [10:56:26.949] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:26.949] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:26.949] 3L)] [10:56:26.949] } [10:56:26.949] function(cond) { [10:56:26.949] is_error <- inherits(cond, "error") [10:56:26.949] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:26.949] NULL) [10:56:26.949] if (is_error) { [10:56:26.949] sessionInformation <- function() { [10:56:26.949] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:26.949] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:26.949] search = base::search(), system = base::Sys.info()) [10:56:26.949] } [10:56:26.949] ...future.conditions[[length(...future.conditions) + [10:56:26.949] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:26.949] cond$call), session = sessionInformation(), [10:56:26.949] timestamp = base::Sys.time(), signaled = 0L) [10:56:26.949] signalCondition(cond) [10:56:26.949] } [10:56:26.949] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:26.949] signal <- FALSE && inherits(cond, character(0)) [10:56:26.949] ...future.conditions[[length(...future.conditions) + [10:56:26.949] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:26.949] if (FALSE && !signal) { [10:56:26.949] muffleCondition <- function (cond, pattern = "^muffle") [10:56:26.949] { [10:56:26.949] inherits <- base::inherits [10:56:26.949] invokeRestart <- base::invokeRestart [10:56:26.949] is.null <- base::is.null [10:56:26.949] muffled <- FALSE [10:56:26.949] if (inherits(cond, "message")) { [10:56:26.949] muffled <- grepl(pattern, "muffleMessage") [10:56:26.949] if (muffled) [10:56:26.949] invokeRestart("muffleMessage") [10:56:26.949] } [10:56:26.949] else if (inherits(cond, "warning")) { [10:56:26.949] muffled <- grepl(pattern, "muffleWarning") [10:56:26.949] if (muffled) [10:56:26.949] invokeRestart("muffleWarning") [10:56:26.949] } [10:56:26.949] else if (inherits(cond, "condition")) { [10:56:26.949] if (!is.null(pattern)) { [10:56:26.949] computeRestarts <- base::computeRestarts [10:56:26.949] grepl <- base::grepl [10:56:26.949] restarts <- computeRestarts(cond) [10:56:26.949] for (restart in restarts) { [10:56:26.949] name <- restart$name [10:56:26.949] if (is.null(name)) [10:56:26.949] next [10:56:26.949] if (!grepl(pattern, name)) [10:56:26.949] next [10:56:26.949] invokeRestart(restart) [10:56:26.949] muffled <- TRUE [10:56:26.949] break [10:56:26.949] } [10:56:26.949] } [10:56:26.949] } [10:56:26.949] invisible(muffled) [10:56:26.949] } [10:56:26.949] muffleCondition(cond, pattern = "^muffle") [10:56:26.949] } [10:56:26.949] } [10:56:26.949] else { [10:56:26.949] if (TRUE) { [10:56:26.949] muffleCondition <- function (cond, pattern = "^muffle") [10:56:26.949] { [10:56:26.949] inherits <- base::inherits [10:56:26.949] invokeRestart <- base::invokeRestart [10:56:26.949] is.null <- base::is.null [10:56:26.949] muffled <- FALSE [10:56:26.949] if (inherits(cond, "message")) { [10:56:26.949] muffled <- grepl(pattern, "muffleMessage") [10:56:26.949] if (muffled) [10:56:26.949] invokeRestart("muffleMessage") [10:56:26.949] } [10:56:26.949] else if (inherits(cond, "warning")) { [10:56:26.949] muffled <- grepl(pattern, "muffleWarning") [10:56:26.949] if (muffled) [10:56:26.949] invokeRestart("muffleWarning") [10:56:26.949] } [10:56:26.949] else if (inherits(cond, "condition")) { [10:56:26.949] if (!is.null(pattern)) { [10:56:26.949] computeRestarts <- base::computeRestarts [10:56:26.949] grepl <- base::grepl [10:56:26.949] restarts <- computeRestarts(cond) [10:56:26.949] for (restart in restarts) { [10:56:26.949] name <- restart$name [10:56:26.949] if (is.null(name)) [10:56:26.949] next [10:56:26.949] if (!grepl(pattern, name)) [10:56:26.949] next [10:56:26.949] invokeRestart(restart) [10:56:26.949] muffled <- TRUE [10:56:26.949] break [10:56:26.949] } [10:56:26.949] } [10:56:26.949] } [10:56:26.949] invisible(muffled) [10:56:26.949] } [10:56:26.949] muffleCondition(cond, pattern = "^muffle") [10:56:26.949] } [10:56:26.949] } [10:56:26.949] } [10:56:26.949] })) [10:56:26.949] }, error = function(ex) { [10:56:26.949] base::structure(base::list(value = NULL, visible = NULL, [10:56:26.949] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:26.949] ...future.rng), started = ...future.startTime, [10:56:26.949] finished = Sys.time(), session_uuid = NA_character_, [10:56:26.949] version = "1.8"), class = "FutureResult") [10:56:26.949] }, finally = { [10:56:26.949] if (!identical(...future.workdir, getwd())) [10:56:26.949] setwd(...future.workdir) [10:56:26.949] { [10:56:26.949] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:26.949] ...future.oldOptions$nwarnings <- NULL [10:56:26.949] } [10:56:26.949] base::options(...future.oldOptions) [10:56:26.949] if (.Platform$OS.type == "windows") { [10:56:26.949] old_names <- names(...future.oldEnvVars) [10:56:26.949] envs <- base::Sys.getenv() [10:56:26.949] names <- names(envs) [10:56:26.949] common <- intersect(names, old_names) [10:56:26.949] added <- setdiff(names, old_names) [10:56:26.949] removed <- setdiff(old_names, names) [10:56:26.949] changed <- common[...future.oldEnvVars[common] != [10:56:26.949] envs[common]] [10:56:26.949] NAMES <- toupper(changed) [10:56:26.949] args <- list() [10:56:26.949] for (kk in seq_along(NAMES)) { [10:56:26.949] name <- changed[[kk]] [10:56:26.949] NAME <- NAMES[[kk]] [10:56:26.949] if (name != NAME && is.element(NAME, old_names)) [10:56:26.949] next [10:56:26.949] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:26.949] } [10:56:26.949] NAMES <- toupper(added) [10:56:26.949] for (kk in seq_along(NAMES)) { [10:56:26.949] name <- added[[kk]] [10:56:26.949] NAME <- NAMES[[kk]] [10:56:26.949] if (name != NAME && is.element(NAME, old_names)) [10:56:26.949] next [10:56:26.949] args[[name]] <- "" [10:56:26.949] } [10:56:26.949] NAMES <- toupper(removed) [10:56:26.949] for (kk in seq_along(NAMES)) { [10:56:26.949] name <- removed[[kk]] [10:56:26.949] NAME <- NAMES[[kk]] [10:56:26.949] if (name != NAME && is.element(NAME, old_names)) [10:56:26.949] next [10:56:26.949] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:26.949] } [10:56:26.949] if (length(args) > 0) [10:56:26.949] base::do.call(base::Sys.setenv, args = args) [10:56:26.949] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:26.949] } [10:56:26.949] else { [10:56:26.949] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:26.949] } [10:56:26.949] { [10:56:26.949] if (base::length(...future.futureOptionsAdded) > [10:56:26.949] 0L) { [10:56:26.949] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:26.949] base::names(opts) <- ...future.futureOptionsAdded [10:56:26.949] base::options(opts) [10:56:26.949] } [10:56:26.949] { [10:56:26.949] NULL [10:56:26.949] options(future.plan = NULL) [10:56:26.949] if (is.na(NA_character_)) [10:56:26.949] Sys.unsetenv("R_FUTURE_PLAN") [10:56:26.949] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:26.949] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:26.949] .init = FALSE) [10:56:26.949] } [10:56:26.949] } [10:56:26.949] } [10:56:26.949] }) [10:56:26.949] if (TRUE) { [10:56:26.949] base::sink(type = "output", split = FALSE) [10:56:26.949] if (TRUE) { [10:56:26.949] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:26.949] } [10:56:26.949] else { [10:56:26.949] ...future.result["stdout"] <- base::list(NULL) [10:56:26.949] } [10:56:26.949] base::close(...future.stdout) [10:56:26.949] ...future.stdout <- NULL [10:56:26.949] } [10:56:26.949] ...future.result$conditions <- ...future.conditions [10:56:26.949] ...future.result$finished <- base::Sys.time() [10:56:26.949] ...future.result [10:56:26.949] } [10:56:26.956] - Launch lazy future ... done [10:56:26.957] run() for 'MiraiFuture' ... done [10:56:26.957] Created future: [10:56:26.959] resolved() for 'MiraiFuture' ... [10:56:26.959] - state: 'running' [10:56:26.959] - run: TRUE [10:56:26.960] - result: 'NULL' [10:56:26.960] - resolved: FALSE [10:56:26.960] resolved() for 'MiraiFuture' ... done [10:56:26.957] MiraiFuture: [10:56:26.957] Label: 'future_lapply-2' [10:56:26.957] Expression: [10:56:26.957] { [10:56:26.957] do.call(function(...) { [10:56:26.957] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:26.957] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:26.957] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:26.957] on.exit(options(oopts), add = TRUE) [10:56:26.957] } [10:56:26.957] { [10:56:26.957] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:26.957] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:26.957] ...future.FUN(...future.X_jj, ...) [10:56:26.957] }) [10:56:26.957] } [10:56:26.957] }, args = future.call.arguments) [10:56:26.957] } [10:56:26.957] Lazy evaluation: FALSE [10:56:26.957] Asynchronous evaluation: TRUE [10:56:26.957] Local evaluation: TRUE [10:56:26.957] Environment: R_GlobalEnv [10:56:26.957] Capture standard output: TRUE [10:56:26.957] Capture condition classes: 'condition' (excluding 'nothing') [10:56:26.957] 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) [10:56:26.957] Packages: [10:56:26.957] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:26.957] Resolved: TRUE [10:56:26.957] Value: [10:56:26.957] Conditions captured: [10:56:26.957] Early signaling: FALSE [10:56:26.957] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:26.957] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:26.961] Chunk #2 of 3 ... DONE [10:56:26.961] Chunk #3 of 3 ... [10:56:26.961] - Finding globals in 'X' for chunk #3 ... [10:56:26.962] getGlobalsAndPackages() ... [10:56:26.962] Searching for globals... [10:56:26.962] [10:56:26.963] Searching for globals ... DONE [10:56:26.963] - globals: [0] [10:56:26.963] getGlobalsAndPackages() ... DONE [10:56:26.963] + additional globals found: [n=0] [10:56:26.963] + additional namespaces needed: [n=0] [10:56:26.964] - Finding globals in 'X' for chunk #3 ... DONE [10:56:26.964] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [10:56:26.964] - seeds: [10:56:26.964] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:26.965] getGlobalsAndPackages() ... [10:56:26.965] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:26.965] Resolving globals: FALSE [10:56:26.965] Tweak future expression to call with '...' arguments ... [10:56:26.966] { [10:56:26.966] do.call(function(...) { [10:56:26.966] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:26.966] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:26.966] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:26.966] on.exit(options(oopts), add = TRUE) [10:56:26.966] } [10:56:26.966] { [10:56:26.966] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:26.966] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:26.966] ...future.FUN(...future.X_jj, ...) [10:56:26.966] }) [10:56:26.966] } [10:56:26.966] }, args = future.call.arguments) [10:56:26.966] } [10:56:26.966] Tweak future expression to call with '...' arguments ... DONE [10:56:26.967] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:26.967] [10:56:26.967] getGlobalsAndPackages() ... DONE [10:56:26.967] run() for 'Future' ... [10:56:26.968] - state: 'created' [10:56:26.968] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:26.972] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:26.972] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:26.972] - Field: 'label' [10:56:26.972] - Field: 'local' [10:56:26.972] - Field: 'owner' [10:56:26.973] - Field: 'envir' [10:56:26.973] - Field: 'packages' [10:56:26.973] - Field: 'gc' [10:56:26.974] - Field: 'conditions' [10:56:26.974] - Field: 'expr' [10:56:26.974] - Field: 'uuid' [10:56:26.976] - Field: 'seed' [10:56:26.977] - Field: 'version' [10:56:26.977] - Field: 'result' [10:56:26.977] - Field: 'asynchronous' [10:56:26.977] - Field: 'calls' [10:56:26.978] - Field: 'globals' [10:56:26.978] - Field: 'stdout' [10:56:26.978] - Field: 'earlySignal' [10:56:26.978] - Field: 'lazy' [10:56:26.979] - Field: 'state' [10:56:26.979] - Field: '.cluster' [10:56:26.979] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:26.979] - Launch lazy future ... [10:56:26.980] Packages needed by the future expression (n = 0): [10:56:26.980] Packages needed by future strategies (n = 0): [10:56:26.981] { [10:56:26.981] { [10:56:26.981] { [10:56:26.981] ...future.startTime <- base::Sys.time() [10:56:26.981] { [10:56:26.981] { [10:56:26.981] { [10:56:26.981] base::local({ [10:56:26.981] has_future <- base::requireNamespace("future", [10:56:26.981] quietly = TRUE) [10:56:26.981] if (has_future) { [10:56:26.981] ns <- base::getNamespace("future") [10:56:26.981] version <- ns[[".package"]][["version"]] [10:56:26.981] if (is.null(version)) [10:56:26.981] version <- utils::packageVersion("future") [10:56:26.981] } [10:56:26.981] else { [10:56:26.981] version <- NULL [10:56:26.981] } [10:56:26.981] if (!has_future || version < "1.8.0") { [10:56:26.981] info <- base::c(r_version = base::gsub("R version ", [10:56:26.981] "", base::R.version$version.string), [10:56:26.981] platform = base::sprintf("%s (%s-bit)", [10:56:26.981] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:26.981] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:26.981] "release", "version")], collapse = " "), [10:56:26.981] hostname = base::Sys.info()[["nodename"]]) [10:56:26.981] info <- base::sprintf("%s: %s", base::names(info), [10:56:26.981] info) [10:56:26.981] info <- base::paste(info, collapse = "; ") [10:56:26.981] if (!has_future) { [10:56:26.981] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:26.981] info) [10:56:26.981] } [10:56:26.981] else { [10:56:26.981] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:26.981] info, version) [10:56:26.981] } [10:56:26.981] base::stop(msg) [10:56:26.981] } [10:56:26.981] }) [10:56:26.981] } [10:56:26.981] ...future.strategy.old <- future::plan("list") [10:56:26.981] options(future.plan = NULL) [10:56:26.981] Sys.unsetenv("R_FUTURE_PLAN") [10:56:26.981] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:26.981] } [10:56:26.981] ...future.workdir <- getwd() [10:56:26.981] } [10:56:26.981] ...future.oldOptions <- base::as.list(base::.Options) [10:56:26.981] ...future.oldEnvVars <- base::Sys.getenv() [10:56:26.981] } [10:56:26.981] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:26.981] future.globals.maxSize = 1572864000, future.globals.method = NULL, [10:56:26.981] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:26.981] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:26.981] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:26.981] future.stdout.windows.reencode = NULL, width = 80L) [10:56:26.981] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:26.981] base::names(...future.oldOptions)) [10:56:26.981] } [10:56:26.981] if (FALSE) { [10:56:26.981] } [10:56:26.981] else { [10:56:26.981] if (TRUE) { [10:56:26.981] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:26.981] open = "w") [10:56:26.981] } [10:56:26.981] else { [10:56:26.981] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:26.981] windows = "NUL", "/dev/null"), open = "w") [10:56:26.981] } [10:56:26.981] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:26.981] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:26.981] base::sink(type = "output", split = FALSE) [10:56:26.981] base::close(...future.stdout) [10:56:26.981] }, add = TRUE) [10:56:26.981] } [10:56:26.981] ...future.frame <- base::sys.nframe() [10:56:26.981] ...future.conditions <- base::list() [10:56:26.981] ...future.rng <- base::globalenv()$.Random.seed [10:56:26.981] if (FALSE) { [10:56:26.981] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:26.981] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:26.981] } [10:56:26.981] ...future.result <- base::tryCatch({ [10:56:26.981] base::withCallingHandlers({ [10:56:26.981] ...future.value <- base::withVisible(base::local({ [10:56:26.981] do.call(function(...) { [10:56:26.981] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:26.981] if (!identical(...future.globals.maxSize.org, [10:56:26.981] ...future.globals.maxSize)) { [10:56:26.981] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:26.981] on.exit(options(oopts), add = TRUE) [10:56:26.981] } [10:56:26.981] { [10:56:26.981] lapply(seq_along(...future.elements_ii), [10:56:26.981] FUN = function(jj) { [10:56:26.981] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:26.981] ...future.FUN(...future.X_jj, ...) [10:56:26.981] }) [10:56:26.981] } [10:56:26.981] }, args = future.call.arguments) [10:56:26.981] })) [10:56:26.981] future::FutureResult(value = ...future.value$value, [10:56:26.981] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:26.981] ...future.rng), globalenv = if (FALSE) [10:56:26.981] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:26.981] ...future.globalenv.names)) [10:56:26.981] else NULL, started = ...future.startTime, version = "1.8") [10:56:26.981] }, condition = base::local({ [10:56:26.981] c <- base::c [10:56:26.981] inherits <- base::inherits [10:56:26.981] invokeRestart <- base::invokeRestart [10:56:26.981] length <- base::length [10:56:26.981] list <- base::list [10:56:26.981] seq.int <- base::seq.int [10:56:26.981] signalCondition <- base::signalCondition [10:56:26.981] sys.calls <- base::sys.calls [10:56:26.981] `[[` <- base::`[[` [10:56:26.981] `+` <- base::`+` [10:56:26.981] `<<-` <- base::`<<-` [10:56:26.981] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:26.981] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:26.981] 3L)] [10:56:26.981] } [10:56:26.981] function(cond) { [10:56:26.981] is_error <- inherits(cond, "error") [10:56:26.981] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:26.981] NULL) [10:56:26.981] if (is_error) { [10:56:26.981] sessionInformation <- function() { [10:56:26.981] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:26.981] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:26.981] search = base::search(), system = base::Sys.info()) [10:56:26.981] } [10:56:26.981] ...future.conditions[[length(...future.conditions) + [10:56:26.981] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:26.981] cond$call), session = sessionInformation(), [10:56:26.981] timestamp = base::Sys.time(), signaled = 0L) [10:56:26.981] signalCondition(cond) [10:56:26.981] } [10:56:26.981] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:26.981] signal <- FALSE && inherits(cond, character(0)) [10:56:26.981] ...future.conditions[[length(...future.conditions) + [10:56:26.981] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:26.981] if (FALSE && !signal) { [10:56:26.981] muffleCondition <- function (cond, pattern = "^muffle") [10:56:26.981] { [10:56:26.981] inherits <- base::inherits [10:56:26.981] invokeRestart <- base::invokeRestart [10:56:26.981] is.null <- base::is.null [10:56:26.981] muffled <- FALSE [10:56:26.981] if (inherits(cond, "message")) { [10:56:26.981] muffled <- grepl(pattern, "muffleMessage") [10:56:26.981] if (muffled) [10:56:26.981] invokeRestart("muffleMessage") [10:56:26.981] } [10:56:26.981] else if (inherits(cond, "warning")) { [10:56:26.981] muffled <- grepl(pattern, "muffleWarning") [10:56:26.981] if (muffled) [10:56:26.981] invokeRestart("muffleWarning") [10:56:26.981] } [10:56:26.981] else if (inherits(cond, "condition")) { [10:56:26.981] if (!is.null(pattern)) { [10:56:26.981] computeRestarts <- base::computeRestarts [10:56:26.981] grepl <- base::grepl [10:56:26.981] restarts <- computeRestarts(cond) [10:56:26.981] for (restart in restarts) { [10:56:26.981] name <- restart$name [10:56:26.981] if (is.null(name)) [10:56:26.981] next [10:56:26.981] if (!grepl(pattern, name)) [10:56:26.981] next [10:56:26.981] invokeRestart(restart) [10:56:26.981] muffled <- TRUE [10:56:26.981] break [10:56:26.981] } [10:56:26.981] } [10:56:26.981] } [10:56:26.981] invisible(muffled) [10:56:26.981] } [10:56:26.981] muffleCondition(cond, pattern = "^muffle") [10:56:26.981] } [10:56:26.981] } [10:56:26.981] else { [10:56:26.981] if (TRUE) { [10:56:26.981] muffleCondition <- function (cond, pattern = "^muffle") [10:56:26.981] { [10:56:26.981] inherits <- base::inherits [10:56:26.981] invokeRestart <- base::invokeRestart [10:56:26.981] is.null <- base::is.null [10:56:26.981] muffled <- FALSE [10:56:26.981] if (inherits(cond, "message")) { [10:56:26.981] muffled <- grepl(pattern, "muffleMessage") [10:56:26.981] if (muffled) [10:56:26.981] invokeRestart("muffleMessage") [10:56:26.981] } [10:56:26.981] else if (inherits(cond, "warning")) { [10:56:26.981] muffled <- grepl(pattern, "muffleWarning") [10:56:26.981] if (muffled) [10:56:26.981] invokeRestart("muffleWarning") [10:56:26.981] } [10:56:26.981] else if (inherits(cond, "condition")) { [10:56:26.981] if (!is.null(pattern)) { [10:56:26.981] computeRestarts <- base::computeRestarts [10:56:26.981] grepl <- base::grepl [10:56:26.981] restarts <- computeRestarts(cond) [10:56:26.981] for (restart in restarts) { [10:56:26.981] name <- restart$name [10:56:26.981] if (is.null(name)) [10:56:26.981] next [10:56:26.981] if (!grepl(pattern, name)) [10:56:26.981] next [10:56:26.981] invokeRestart(restart) [10:56:26.981] muffled <- TRUE [10:56:26.981] break [10:56:26.981] } [10:56:26.981] } [10:56:26.981] } [10:56:26.981] invisible(muffled) [10:56:26.981] } [10:56:26.981] muffleCondition(cond, pattern = "^muffle") [10:56:26.981] } [10:56:26.981] } [10:56:26.981] } [10:56:26.981] })) [10:56:26.981] }, error = function(ex) { [10:56:26.981] base::structure(base::list(value = NULL, visible = NULL, [10:56:26.981] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:26.981] ...future.rng), started = ...future.startTime, [10:56:26.981] finished = Sys.time(), session_uuid = NA_character_, [10:56:26.981] version = "1.8"), class = "FutureResult") [10:56:26.981] }, finally = { [10:56:26.981] if (!identical(...future.workdir, getwd())) [10:56:26.981] setwd(...future.workdir) [10:56:26.981] { [10:56:26.981] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:26.981] ...future.oldOptions$nwarnings <- NULL [10:56:26.981] } [10:56:26.981] base::options(...future.oldOptions) [10:56:26.981] if (.Platform$OS.type == "windows") { [10:56:26.981] old_names <- names(...future.oldEnvVars) [10:56:26.981] envs <- base::Sys.getenv() [10:56:26.981] names <- names(envs) [10:56:26.981] common <- intersect(names, old_names) [10:56:26.981] added <- setdiff(names, old_names) [10:56:26.981] removed <- setdiff(old_names, names) [10:56:26.981] changed <- common[...future.oldEnvVars[common] != [10:56:26.981] envs[common]] [10:56:26.981] NAMES <- toupper(changed) [10:56:26.981] args <- list() [10:56:26.981] for (kk in seq_along(NAMES)) { [10:56:26.981] name <- changed[[kk]] [10:56:26.981] NAME <- NAMES[[kk]] [10:56:26.981] if (name != NAME && is.element(NAME, old_names)) [10:56:26.981] next [10:56:26.981] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:26.981] } [10:56:26.981] NAMES <- toupper(added) [10:56:26.981] for (kk in seq_along(NAMES)) { [10:56:26.981] name <- added[[kk]] [10:56:26.981] NAME <- NAMES[[kk]] [10:56:26.981] if (name != NAME && is.element(NAME, old_names)) [10:56:26.981] next [10:56:26.981] args[[name]] <- "" [10:56:26.981] } [10:56:26.981] NAMES <- toupper(removed) [10:56:26.981] for (kk in seq_along(NAMES)) { [10:56:26.981] name <- removed[[kk]] [10:56:26.981] NAME <- NAMES[[kk]] [10:56:26.981] if (name != NAME && is.element(NAME, old_names)) [10:56:26.981] next [10:56:26.981] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:26.981] } [10:56:26.981] if (length(args) > 0) [10:56:26.981] base::do.call(base::Sys.setenv, args = args) [10:56:26.981] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:26.981] } [10:56:26.981] else { [10:56:26.981] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:26.981] } [10:56:26.981] { [10:56:26.981] if (base::length(...future.futureOptionsAdded) > [10:56:26.981] 0L) { [10:56:26.981] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:26.981] base::names(opts) <- ...future.futureOptionsAdded [10:56:26.981] base::options(opts) [10:56:26.981] } [10:56:26.981] { [10:56:26.981] NULL [10:56:26.981] options(future.plan = NULL) [10:56:26.981] if (is.na(NA_character_)) [10:56:26.981] Sys.unsetenv("R_FUTURE_PLAN") [10:56:26.981] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:26.981] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:26.981] .init = FALSE) [10:56:26.981] } [10:56:26.981] } [10:56:26.981] } [10:56:26.981] }) [10:56:26.981] if (TRUE) { [10:56:26.981] base::sink(type = "output", split = FALSE) [10:56:26.981] if (TRUE) { [10:56:26.981] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:26.981] } [10:56:26.981] else { [10:56:26.981] ...future.result["stdout"] <- base::list(NULL) [10:56:26.981] } [10:56:26.981] base::close(...future.stdout) [10:56:26.981] ...future.stdout <- NULL [10:56:26.981] } [10:56:26.981] ...future.result$conditions <- ...future.conditions [10:56:26.981] ...future.result$finished <- base::Sys.time() [10:56:26.981] ...future.result [10:56:26.981] } [10:56:26.986] - Launch lazy future ... done [10:56:26.986] run() for 'MiraiFuture' ... done [10:56:26.986] Created future: [10:56:26.988] resolved() for 'MiraiFuture' ... [10:56:26.988] - state: 'running' [10:56:26.989] - run: TRUE [10:56:26.989] - result: 'NULL' [10:56:26.989] - resolved: FALSE [10:56:26.989] resolved() for 'MiraiFuture' ... done [10:56:26.987] MiraiFuture: [10:56:26.987] Label: 'future_lapply-3' [10:56:26.987] Expression: [10:56:26.987] { [10:56:26.987] do.call(function(...) { [10:56:26.987] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:26.987] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:26.987] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:26.987] on.exit(options(oopts), add = TRUE) [10:56:26.987] } [10:56:26.987] { [10:56:26.987] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:26.987] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:26.987] ...future.FUN(...future.X_jj, ...) [10:56:26.987] }) [10:56:26.987] } [10:56:26.987] }, args = future.call.arguments) [10:56:26.987] } [10:56:26.987] Lazy evaluation: FALSE [10:56:26.987] Asynchronous evaluation: TRUE [10:56:26.987] Local evaluation: TRUE [10:56:26.987] Environment: R_GlobalEnv [10:56:26.987] Capture standard output: TRUE [10:56:26.987] Capture condition classes: 'condition' (excluding 'nothing') [10:56:26.987] 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) [10:56:26.987] Packages: [10:56:26.987] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:26.987] Resolved: TRUE [10:56:26.987] Value: [10:56:26.987] Conditions captured: [10:56:26.987] Early signaling: FALSE [10:56:26.987] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:26.987] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:26.990] Chunk #3 of 3 ... DONE [10:56:26.990] Launching 3 futures (chunks) ... DONE [10:56:26.991] Resolving 3 futures (chunks) ... [10:56:26.991] resolve() on list ... [10:56:26.991] recursive: 0 [10:56:26.991] length: 3 [10:56:26.991] [10:56:26.992] resolved() for 'MiraiFuture' ... [10:56:26.992] - state: 'running' [10:56:26.992] - run: TRUE [10:56:26.993] - result: 'NULL' [10:56:26.993] - resolved: FALSE [10:56:26.993] resolved() for 'MiraiFuture' ... done [10:56:26.993] Future #1 [10:56:26.994] signalConditionsASAP(MiraiFuture, pos=1) ... [10:56:26.994] - nx: 3 [10:56:26.994] - relay: TRUE [10:56:26.994] - stdout: TRUE [10:56:26.994] - signal: TRUE [10:56:26.995] - resignal: FALSE [10:56:26.995] - force: TRUE [10:56:26.995] - relayed: [n=3] FALSE, FALSE, FALSE [10:56:26.995] - queued futures: [n=3] FALSE, FALSE, FALSE [10:56:26.995] - until=1 [10:56:26.995] - relaying element #1 [10:56:26.996] - relayed: [n=3] TRUE, FALSE, FALSE [10:56:26.996] - queued futures: [n=3] TRUE, FALSE, FALSE [10:56:26.996] signalConditionsASAP(MiraiFuture, pos=1) ... done [10:56:26.996] length: 2 (resolved future 1) [10:56:26.997] resolved() for 'MiraiFuture' ... [10:56:26.997] - state: 'running' [10:56:26.997] - run: TRUE [10:56:26.997] - result: 'NULL' [10:56:26.997] - resolved: FALSE [10:56:26.997] resolved() for 'MiraiFuture' ... done [10:56:26.998] Future #2 [10:56:26.998] signalConditionsASAP(MiraiFuture, pos=2) ... [10:56:26.998] - nx: 3 [10:56:26.998] - relay: TRUE [10:56:26.998] - stdout: TRUE [10:56:26.999] - signal: TRUE [10:56:26.999] - resignal: FALSE [10:56:26.999] - force: TRUE [10:56:26.999] - relayed: [n=3] TRUE, FALSE, FALSE [10:56:26.999] - queued futures: [n=3] TRUE, FALSE, FALSE [10:56:26.999] - until=2 [10:56:26.999] - relaying element #2 [10:56:27.000] - relayed: [n=3] TRUE, TRUE, FALSE [10:56:27.000] - queued futures: [n=3] TRUE, TRUE, FALSE [10:56:27.000] signalConditionsASAP(MiraiFuture, pos=2) ... done [10:56:27.000] length: 1 (resolved future 2) [10:56:27.000] resolved() for 'MiraiFuture' ... [10:56:27.001] - state: 'running' [10:56:27.001] - run: TRUE [10:56:27.001] - result: 'NULL' [10:56:27.001] - resolved: FALSE [10:56:27.001] resolved() for 'MiraiFuture' ... done [10:56:27.001] Future #3 [10:56:27.002] signalConditionsASAP(MiraiFuture, pos=3) ... [10:56:27.002] - nx: 3 [10:56:27.002] - relay: TRUE [10:56:27.002] - stdout: TRUE [10:56:27.002] - signal: TRUE [10:56:27.002] - resignal: FALSE [10:56:27.003] - force: TRUE [10:56:27.003] - relayed: [n=3] TRUE, TRUE, FALSE [10:56:27.003] - queued futures: [n=3] TRUE, TRUE, FALSE [10:56:27.003] - until=3 [10:56:27.003] - relaying element #3 [10:56:27.004] - relayed: [n=3] TRUE, TRUE, TRUE [10:56:27.004] - queued futures: [n=3] TRUE, TRUE, TRUE [10:56:27.004] signalConditionsASAP(MiraiFuture, pos=3) ... done [10:56:27.004] length: 0 (resolved future 3) [10:56:27.004] Relaying remaining futures [10:56:27.004] signalConditionsASAP(NULL, pos=0) ... [10:56:27.005] - nx: 3 [10:56:27.005] - relay: TRUE [10:56:27.005] - stdout: TRUE [10:56:27.005] - signal: TRUE [10:56:27.005] - resignal: FALSE [10:56:27.005] - force: TRUE [10:56:27.005] - relayed: [n=3] TRUE, TRUE, TRUE [10:56:27.006] - queued futures: [n=3] TRUE, TRUE, TRUE - flush all [10:56:27.006] - relayed: [n=3] TRUE, TRUE, TRUE [10:56:27.006] - queued futures: [n=3] TRUE, TRUE, TRUE [10:56:27.006] signalConditionsASAP(NULL, pos=0) ... done [10:56:27.006] resolve() on list ... DONE [10:56:27.007] - Number of value chunks collected: 3 [10:56:27.007] Resolving 3 futures (chunks) ... DONE [10:56:27.007] Reducing values from 3 chunks ... [10:56:27.007] - Number of values collected after concatenation: 3 [10:56:27.007] - Number of values expected: 3 [10:56:27.008] Reducing values from 3 chunks ... DONE [10:56:27.008] 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 [10:56:27.010] future_lapply() ... [10:56:27.038] Number of chunks: 2 [10:56:27.038] getGlobalsAndPackagesXApply() ... [10:56:27.038] - future.globals: TRUE [10:56:27.038] getGlobalsAndPackages() ... [10:56:27.038] Searching for globals... [10:56:27.040] - globals found: [2] 'FUN', '.Internal' [10:56:27.040] Searching for globals ... DONE [10:56:27.040] Resolving globals: FALSE [10:56:27.041] The total size of the 1 globals is 2.13 KiB (2184 bytes) [10:56:27.041] 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') [10:56:27.041] - globals: [1] 'FUN' [10:56:27.042] [10:56:27.042] getGlobalsAndPackages() ... DONE [10:56:27.042] - globals found/used: [n=1] 'FUN' [10:56:27.042] - needed namespaces: [n=0] [10:56:27.042] Finding globals ... DONE [10:56:27.042] - use_args: TRUE [10:56:27.043] - Getting '...' globals ... [10:56:27.043] resolve() on list ... [10:56:27.043] recursive: 0 [10:56:27.043] length: 1 [10:56:27.043] elements: '...' [10:56:27.044] length: 0 (resolved future 1) [10:56:27.044] resolve() on list ... DONE [10:56:27.044] - '...' content: [n=1] 'length' [10:56:27.044] List of 1 [10:56:27.044] $ ...:List of 1 [10:56:27.044] ..$ length: int 2 [10:56:27.044] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.044] - attr(*, "where")=List of 1 [10:56:27.044] ..$ ...: [10:56:27.044] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.044] - attr(*, "resolved")= logi TRUE [10:56:27.044] - attr(*, "total_size")= num NA [10:56:27.048] - Getting '...' globals ... DONE [10:56:27.048] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [10:56:27.048] List of 2 [10:56:27.048] $ ...future.FUN:function (mode = "logical", length = 0L) [10:56:27.048] $ ... :List of 1 [10:56:27.048] ..$ length: int 2 [10:56:27.048] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.048] - attr(*, "where")=List of 2 [10:56:27.048] ..$ ...future.FUN: [10:56:27.048] ..$ ... : [10:56:27.048] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.048] - attr(*, "resolved")= logi FALSE [10:56:27.048] - attr(*, "total_size")= num 2240 [10:56:27.052] Packages to be attached in all futures: [n=0] [10:56:27.052] getGlobalsAndPackagesXApply() ... DONE [10:56:27.052] Number of futures (= number of chunks): 2 [10:56:27.052] Launching 2 futures (chunks) ... [10:56:27.053] Chunk #1 of 2 ... [10:56:27.053] - Finding globals in 'X' for chunk #1 ... [10:56:27.053] getGlobalsAndPackages() ... [10:56:27.053] Searching for globals... [10:56:27.053] [10:56:27.054] Searching for globals ... DONE [10:56:27.054] - globals: [0] [10:56:27.054] getGlobalsAndPackages() ... DONE [10:56:27.054] + additional globals found: [n=0] [10:56:27.054] + additional namespaces needed: [n=0] [10:56:27.054] - Finding globals in 'X' for chunk #1 ... DONE [10:56:27.055] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [10:56:27.055] - seeds: [10:56:27.055] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.055] getGlobalsAndPackages() ... [10:56:27.055] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.055] Resolving globals: FALSE [10:56:27.056] Tweak future expression to call with '...' arguments ... [10:56:27.056] { [10:56:27.056] do.call(function(...) { [10:56:27.056] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.056] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.056] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.056] on.exit(options(oopts), add = TRUE) [10:56:27.056] } [10:56:27.056] { [10:56:27.056] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.056] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.056] ...future.FUN(...future.X_jj, ...) [10:56:27.056] }) [10:56:27.056] } [10:56:27.056] }, args = future.call.arguments) [10:56:27.056] } [10:56:27.056] Tweak future expression to call with '...' arguments ... DONE [10:56:27.057] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.057] [10:56:27.057] getGlobalsAndPackages() ... DONE [10:56:27.058] run() for 'Future' ... [10:56:27.058] - state: 'created' [10:56:27.058] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.060] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.061] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.061] - Field: 'label' [10:56:27.061] - Field: 'local' [10:56:27.061] - Field: 'owner' [10:56:27.061] - Field: 'envir' [10:56:27.062] - Field: 'packages' [10:56:27.062] - Field: 'gc' [10:56:27.063] - Field: 'conditions' [10:56:27.063] - Field: 'expr' [10:56:27.063] - Field: 'uuid' [10:56:27.063] - Field: 'seed' [10:56:27.063] - Field: 'version' [10:56:27.064] - Field: 'result' [10:56:27.064] - Field: 'asynchronous' [10:56:27.064] - Field: 'calls' [10:56:27.064] - Field: 'globals' [10:56:27.064] - Field: 'stdout' [10:56:27.064] - Field: 'earlySignal' [10:56:27.065] - Field: 'lazy' [10:56:27.065] - Field: 'state' [10:56:27.065] - Field: '.cluster' [10:56:27.065] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.065] - Launch lazy future ... [10:56:27.065] Packages needed by the future expression (n = 0): [10:56:27.066] Packages needed by future strategies (n = 0): [10:56:27.066] { [10:56:27.066] { [10:56:27.066] { [10:56:27.066] ...future.startTime <- base::Sys.time() [10:56:27.066] { [10:56:27.066] { [10:56:27.066] { [10:56:27.066] base::local({ [10:56:27.066] has_future <- base::requireNamespace("future", [10:56:27.066] quietly = TRUE) [10:56:27.066] if (has_future) { [10:56:27.066] ns <- base::getNamespace("future") [10:56:27.066] version <- ns[[".package"]][["version"]] [10:56:27.066] if (is.null(version)) [10:56:27.066] version <- utils::packageVersion("future") [10:56:27.066] } [10:56:27.066] else { [10:56:27.066] version <- NULL [10:56:27.066] } [10:56:27.066] if (!has_future || version < "1.8.0") { [10:56:27.066] info <- base::c(r_version = base::gsub("R version ", [10:56:27.066] "", base::R.version$version.string), [10:56:27.066] platform = base::sprintf("%s (%s-bit)", [10:56:27.066] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.066] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.066] "release", "version")], collapse = " "), [10:56:27.066] hostname = base::Sys.info()[["nodename"]]) [10:56:27.066] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.066] info) [10:56:27.066] info <- base::paste(info, collapse = "; ") [10:56:27.066] if (!has_future) { [10:56:27.066] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.066] info) [10:56:27.066] } [10:56:27.066] else { [10:56:27.066] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.066] info, version) [10:56:27.066] } [10:56:27.066] base::stop(msg) [10:56:27.066] } [10:56:27.066] }) [10:56:27.066] } [10:56:27.066] ...future.strategy.old <- future::plan("list") [10:56:27.066] options(future.plan = NULL) [10:56:27.066] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.066] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.066] } [10:56:27.066] ...future.workdir <- getwd() [10:56:27.066] } [10:56:27.066] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.066] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.066] } [10:56:27.066] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.066] future.globals.maxSize = 1048576000, future.globals.method = NULL, [10:56:27.066] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.066] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.066] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.066] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.066] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.066] base::names(...future.oldOptions)) [10:56:27.066] } [10:56:27.066] if (FALSE) { [10:56:27.066] } [10:56:27.066] else { [10:56:27.066] if (TRUE) { [10:56:27.066] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.066] open = "w") [10:56:27.066] } [10:56:27.066] else { [10:56:27.066] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.066] windows = "NUL", "/dev/null"), open = "w") [10:56:27.066] } [10:56:27.066] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.066] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.066] base::sink(type = "output", split = FALSE) [10:56:27.066] base::close(...future.stdout) [10:56:27.066] }, add = TRUE) [10:56:27.066] } [10:56:27.066] ...future.frame <- base::sys.nframe() [10:56:27.066] ...future.conditions <- base::list() [10:56:27.066] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.066] if (FALSE) { [10:56:27.066] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.066] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.066] } [10:56:27.066] ...future.result <- base::tryCatch({ [10:56:27.066] base::withCallingHandlers({ [10:56:27.066] ...future.value <- base::withVisible(base::local({ [10:56:27.066] do.call(function(...) { [10:56:27.066] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.066] if (!identical(...future.globals.maxSize.org, [10:56:27.066] ...future.globals.maxSize)) { [10:56:27.066] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.066] on.exit(options(oopts), add = TRUE) [10:56:27.066] } [10:56:27.066] { [10:56:27.066] lapply(seq_along(...future.elements_ii), [10:56:27.066] FUN = function(jj) { [10:56:27.066] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.066] ...future.FUN(...future.X_jj, ...) [10:56:27.066] }) [10:56:27.066] } [10:56:27.066] }, args = future.call.arguments) [10:56:27.066] })) [10:56:27.066] future::FutureResult(value = ...future.value$value, [10:56:27.066] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.066] ...future.rng), globalenv = if (FALSE) [10:56:27.066] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.066] ...future.globalenv.names)) [10:56:27.066] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.066] }, condition = base::local({ [10:56:27.066] c <- base::c [10:56:27.066] inherits <- base::inherits [10:56:27.066] invokeRestart <- base::invokeRestart [10:56:27.066] length <- base::length [10:56:27.066] list <- base::list [10:56:27.066] seq.int <- base::seq.int [10:56:27.066] signalCondition <- base::signalCondition [10:56:27.066] sys.calls <- base::sys.calls [10:56:27.066] `[[` <- base::`[[` [10:56:27.066] `+` <- base::`+` [10:56:27.066] `<<-` <- base::`<<-` [10:56:27.066] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.066] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.066] 3L)] [10:56:27.066] } [10:56:27.066] function(cond) { [10:56:27.066] is_error <- inherits(cond, "error") [10:56:27.066] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.066] NULL) [10:56:27.066] if (is_error) { [10:56:27.066] sessionInformation <- function() { [10:56:27.066] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.066] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.066] search = base::search(), system = base::Sys.info()) [10:56:27.066] } [10:56:27.066] ...future.conditions[[length(...future.conditions) + [10:56:27.066] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.066] cond$call), session = sessionInformation(), [10:56:27.066] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.066] signalCondition(cond) [10:56:27.066] } [10:56:27.066] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.066] signal <- FALSE && inherits(cond, character(0)) [10:56:27.066] ...future.conditions[[length(...future.conditions) + [10:56:27.066] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.066] if (FALSE && !signal) { [10:56:27.066] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.066] { [10:56:27.066] inherits <- base::inherits [10:56:27.066] invokeRestart <- base::invokeRestart [10:56:27.066] is.null <- base::is.null [10:56:27.066] muffled <- FALSE [10:56:27.066] if (inherits(cond, "message")) { [10:56:27.066] muffled <- grepl(pattern, "muffleMessage") [10:56:27.066] if (muffled) [10:56:27.066] invokeRestart("muffleMessage") [10:56:27.066] } [10:56:27.066] else if (inherits(cond, "warning")) { [10:56:27.066] muffled <- grepl(pattern, "muffleWarning") [10:56:27.066] if (muffled) [10:56:27.066] invokeRestart("muffleWarning") [10:56:27.066] } [10:56:27.066] else if (inherits(cond, "condition")) { [10:56:27.066] if (!is.null(pattern)) { [10:56:27.066] computeRestarts <- base::computeRestarts [10:56:27.066] grepl <- base::grepl [10:56:27.066] restarts <- computeRestarts(cond) [10:56:27.066] for (restart in restarts) { [10:56:27.066] name <- restart$name [10:56:27.066] if (is.null(name)) [10:56:27.066] next [10:56:27.066] if (!grepl(pattern, name)) [10:56:27.066] next [10:56:27.066] invokeRestart(restart) [10:56:27.066] muffled <- TRUE [10:56:27.066] break [10:56:27.066] } [10:56:27.066] } [10:56:27.066] } [10:56:27.066] invisible(muffled) [10:56:27.066] } [10:56:27.066] muffleCondition(cond, pattern = "^muffle") [10:56:27.066] } [10:56:27.066] } [10:56:27.066] else { [10:56:27.066] if (TRUE) { [10:56:27.066] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.066] { [10:56:27.066] inherits <- base::inherits [10:56:27.066] invokeRestart <- base::invokeRestart [10:56:27.066] is.null <- base::is.null [10:56:27.066] muffled <- FALSE [10:56:27.066] if (inherits(cond, "message")) { [10:56:27.066] muffled <- grepl(pattern, "muffleMessage") [10:56:27.066] if (muffled) [10:56:27.066] invokeRestart("muffleMessage") [10:56:27.066] } [10:56:27.066] else if (inherits(cond, "warning")) { [10:56:27.066] muffled <- grepl(pattern, "muffleWarning") [10:56:27.066] if (muffled) [10:56:27.066] invokeRestart("muffleWarning") [10:56:27.066] } [10:56:27.066] else if (inherits(cond, "condition")) { [10:56:27.066] if (!is.null(pattern)) { [10:56:27.066] computeRestarts <- base::computeRestarts [10:56:27.066] grepl <- base::grepl [10:56:27.066] restarts <- computeRestarts(cond) [10:56:27.066] for (restart in restarts) { [10:56:27.066] name <- restart$name [10:56:27.066] if (is.null(name)) [10:56:27.066] next [10:56:27.066] if (!grepl(pattern, name)) [10:56:27.066] next [10:56:27.066] invokeRestart(restart) [10:56:27.066] muffled <- TRUE [10:56:27.066] break [10:56:27.066] } [10:56:27.066] } [10:56:27.066] } [10:56:27.066] invisible(muffled) [10:56:27.066] } [10:56:27.066] muffleCondition(cond, pattern = "^muffle") [10:56:27.066] } [10:56:27.066] } [10:56:27.066] } [10:56:27.066] })) [10:56:27.066] }, error = function(ex) { [10:56:27.066] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.066] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.066] ...future.rng), started = ...future.startTime, [10:56:27.066] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.066] version = "1.8"), class = "FutureResult") [10:56:27.066] }, finally = { [10:56:27.066] if (!identical(...future.workdir, getwd())) [10:56:27.066] setwd(...future.workdir) [10:56:27.066] { [10:56:27.066] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.066] ...future.oldOptions$nwarnings <- NULL [10:56:27.066] } [10:56:27.066] base::options(...future.oldOptions) [10:56:27.066] if (.Platform$OS.type == "windows") { [10:56:27.066] old_names <- names(...future.oldEnvVars) [10:56:27.066] envs <- base::Sys.getenv() [10:56:27.066] names <- names(envs) [10:56:27.066] common <- intersect(names, old_names) [10:56:27.066] added <- setdiff(names, old_names) [10:56:27.066] removed <- setdiff(old_names, names) [10:56:27.066] changed <- common[...future.oldEnvVars[common] != [10:56:27.066] envs[common]] [10:56:27.066] NAMES <- toupper(changed) [10:56:27.066] args <- list() [10:56:27.066] for (kk in seq_along(NAMES)) { [10:56:27.066] name <- changed[[kk]] [10:56:27.066] NAME <- NAMES[[kk]] [10:56:27.066] if (name != NAME && is.element(NAME, old_names)) [10:56:27.066] next [10:56:27.066] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.066] } [10:56:27.066] NAMES <- toupper(added) [10:56:27.066] for (kk in seq_along(NAMES)) { [10:56:27.066] name <- added[[kk]] [10:56:27.066] NAME <- NAMES[[kk]] [10:56:27.066] if (name != NAME && is.element(NAME, old_names)) [10:56:27.066] next [10:56:27.066] args[[name]] <- "" [10:56:27.066] } [10:56:27.066] NAMES <- toupper(removed) [10:56:27.066] for (kk in seq_along(NAMES)) { [10:56:27.066] name <- removed[[kk]] [10:56:27.066] NAME <- NAMES[[kk]] [10:56:27.066] if (name != NAME && is.element(NAME, old_names)) [10:56:27.066] next [10:56:27.066] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.066] } [10:56:27.066] if (length(args) > 0) [10:56:27.066] base::do.call(base::Sys.setenv, args = args) [10:56:27.066] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.066] } [10:56:27.066] else { [10:56:27.066] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.066] } [10:56:27.066] { [10:56:27.066] if (base::length(...future.futureOptionsAdded) > [10:56:27.066] 0L) { [10:56:27.066] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.066] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.066] base::options(opts) [10:56:27.066] } [10:56:27.066] { [10:56:27.066] NULL [10:56:27.066] options(future.plan = NULL) [10:56:27.066] if (is.na(NA_character_)) [10:56:27.066] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.066] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.066] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.066] .init = FALSE) [10:56:27.066] } [10:56:27.066] } [10:56:27.066] } [10:56:27.066] }) [10:56:27.066] if (TRUE) { [10:56:27.066] base::sink(type = "output", split = FALSE) [10:56:27.066] if (TRUE) { [10:56:27.066] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.066] } [10:56:27.066] else { [10:56:27.066] ...future.result["stdout"] <- base::list(NULL) [10:56:27.066] } [10:56:27.066] base::close(...future.stdout) [10:56:27.066] ...future.stdout <- NULL [10:56:27.066] } [10:56:27.066] ...future.result$conditions <- ...future.conditions [10:56:27.066] ...future.result$finished <- base::Sys.time() [10:56:27.066] ...future.result [10:56:27.066] } [10:56:27.070] - Launch lazy future ... done [10:56:27.070] run() for 'MiraiFuture' ... done [10:56:27.071] Created future: [10:56:27.072] resolved() for 'MiraiFuture' ... [10:56:27.072] - state: 'running' [10:56:27.072] - run: TRUE [10:56:27.072] - result: 'NULL' [10:56:27.073] - resolved: FALSE [10:56:27.073] resolved() for 'MiraiFuture' ... done [10:56:27.071] MiraiFuture: [10:56:27.071] Label: 'future_lapply-1' [10:56:27.071] Expression: [10:56:27.071] { [10:56:27.071] do.call(function(...) { [10:56:27.071] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.071] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.071] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.071] on.exit(options(oopts), add = TRUE) [10:56:27.071] } [10:56:27.071] { [10:56:27.071] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.071] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.071] ...future.FUN(...future.X_jj, ...) [10:56:27.071] }) [10:56:27.071] } [10:56:27.071] }, args = future.call.arguments) [10:56:27.071] } [10:56:27.071] Lazy evaluation: FALSE [10:56:27.071] Asynchronous evaluation: TRUE [10:56:27.071] Local evaluation: TRUE [10:56:27.071] Environment: R_GlobalEnv [10:56:27.071] Capture standard output: TRUE [10:56:27.071] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.071] 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) [10:56:27.071] Packages: [10:56:27.071] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.071] Resolved: TRUE [10:56:27.071] Value: [10:56:27.071] Conditions captured: [10:56:27.071] Early signaling: FALSE [10:56:27.071] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.071] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.073] Chunk #1 of 2 ... DONE [10:56:27.074] Chunk #2 of 2 ... [10:56:27.074] - Finding globals in 'X' for chunk #2 ... [10:56:27.074] getGlobalsAndPackages() ... [10:56:27.074] Searching for globals... [10:56:27.074] [10:56:27.075] Searching for globals ... DONE [10:56:27.075] - globals: [0] [10:56:27.075] getGlobalsAndPackages() ... DONE [10:56:27.075] + additional globals found: [n=0] [10:56:27.075] + additional namespaces needed: [n=0] [10:56:27.075] - Finding globals in 'X' for chunk #2 ... DONE [10:56:27.075] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [10:56:27.076] - seeds: [10:56:27.076] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.076] getGlobalsAndPackages() ... [10:56:27.076] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.076] Resolving globals: FALSE [10:56:27.076] Tweak future expression to call with '...' arguments ... [10:56:27.077] { [10:56:27.077] do.call(function(...) { [10:56:27.077] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.077] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.077] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.077] on.exit(options(oopts), add = TRUE) [10:56:27.077] } [10:56:27.077] { [10:56:27.077] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.077] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.077] ...future.FUN(...future.X_jj, ...) [10:56:27.077] }) [10:56:27.077] } [10:56:27.077] }, args = future.call.arguments) [10:56:27.077] } [10:56:27.077] Tweak future expression to call with '...' arguments ... DONE [10:56:27.078] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.078] [10:56:27.078] getGlobalsAndPackages() ... DONE [10:56:27.078] run() for 'Future' ... [10:56:27.078] - state: 'created' [10:56:27.079] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.081] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.081] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.081] - Field: 'label' [10:56:27.082] - Field: 'local' [10:56:27.082] - Field: 'owner' [10:56:27.082] - Field: 'envir' [10:56:27.082] - Field: 'packages' [10:56:27.082] - Field: 'gc' [10:56:27.082] - Field: 'conditions' [10:56:27.083] - Field: 'expr' [10:56:27.083] - Field: 'uuid' [10:56:27.083] - Field: 'seed' [10:56:27.083] - Field: 'version' [10:56:27.083] - Field: 'result' [10:56:27.083] - Field: 'asynchronous' [10:56:27.084] - Field: 'calls' [10:56:27.084] - Field: 'globals' [10:56:27.084] - Field: 'stdout' [10:56:27.084] - Field: 'earlySignal' [10:56:27.084] - Field: 'lazy' [10:56:27.084] - Field: 'state' [10:56:27.085] - Field: '.cluster' [10:56:27.085] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.085] - Launch lazy future ... [10:56:27.085] Packages needed by the future expression (n = 0): [10:56:27.085] Packages needed by future strategies (n = 0): [10:56:27.086] { [10:56:27.086] { [10:56:27.086] { [10:56:27.086] ...future.startTime <- base::Sys.time() [10:56:27.086] { [10:56:27.086] { [10:56:27.086] { [10:56:27.086] base::local({ [10:56:27.086] has_future <- base::requireNamespace("future", [10:56:27.086] quietly = TRUE) [10:56:27.086] if (has_future) { [10:56:27.086] ns <- base::getNamespace("future") [10:56:27.086] version <- ns[[".package"]][["version"]] [10:56:27.086] if (is.null(version)) [10:56:27.086] version <- utils::packageVersion("future") [10:56:27.086] } [10:56:27.086] else { [10:56:27.086] version <- NULL [10:56:27.086] } [10:56:27.086] if (!has_future || version < "1.8.0") { [10:56:27.086] info <- base::c(r_version = base::gsub("R version ", [10:56:27.086] "", base::R.version$version.string), [10:56:27.086] platform = base::sprintf("%s (%s-bit)", [10:56:27.086] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.086] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.086] "release", "version")], collapse = " "), [10:56:27.086] hostname = base::Sys.info()[["nodename"]]) [10:56:27.086] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.086] info) [10:56:27.086] info <- base::paste(info, collapse = "; ") [10:56:27.086] if (!has_future) { [10:56:27.086] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.086] info) [10:56:27.086] } [10:56:27.086] else { [10:56:27.086] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.086] info, version) [10:56:27.086] } [10:56:27.086] base::stop(msg) [10:56:27.086] } [10:56:27.086] }) [10:56:27.086] } [10:56:27.086] ...future.strategy.old <- future::plan("list") [10:56:27.086] options(future.plan = NULL) [10:56:27.086] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.086] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.086] } [10:56:27.086] ...future.workdir <- getwd() [10:56:27.086] } [10:56:27.086] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.086] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.086] } [10:56:27.086] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.086] future.globals.maxSize = 1048576000, future.globals.method = NULL, [10:56:27.086] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.086] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.086] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.086] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.086] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.086] base::names(...future.oldOptions)) [10:56:27.086] } [10:56:27.086] if (FALSE) { [10:56:27.086] } [10:56:27.086] else { [10:56:27.086] if (TRUE) { [10:56:27.086] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.086] open = "w") [10:56:27.086] } [10:56:27.086] else { [10:56:27.086] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.086] windows = "NUL", "/dev/null"), open = "w") [10:56:27.086] } [10:56:27.086] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.086] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.086] base::sink(type = "output", split = FALSE) [10:56:27.086] base::close(...future.stdout) [10:56:27.086] }, add = TRUE) [10:56:27.086] } [10:56:27.086] ...future.frame <- base::sys.nframe() [10:56:27.086] ...future.conditions <- base::list() [10:56:27.086] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.086] if (FALSE) { [10:56:27.086] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.086] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.086] } [10:56:27.086] ...future.result <- base::tryCatch({ [10:56:27.086] base::withCallingHandlers({ [10:56:27.086] ...future.value <- base::withVisible(base::local({ [10:56:27.086] do.call(function(...) { [10:56:27.086] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.086] if (!identical(...future.globals.maxSize.org, [10:56:27.086] ...future.globals.maxSize)) { [10:56:27.086] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.086] on.exit(options(oopts), add = TRUE) [10:56:27.086] } [10:56:27.086] { [10:56:27.086] lapply(seq_along(...future.elements_ii), [10:56:27.086] FUN = function(jj) { [10:56:27.086] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.086] ...future.FUN(...future.X_jj, ...) [10:56:27.086] }) [10:56:27.086] } [10:56:27.086] }, args = future.call.arguments) [10:56:27.086] })) [10:56:27.086] future::FutureResult(value = ...future.value$value, [10:56:27.086] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.086] ...future.rng), globalenv = if (FALSE) [10:56:27.086] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.086] ...future.globalenv.names)) [10:56:27.086] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.086] }, condition = base::local({ [10:56:27.086] c <- base::c [10:56:27.086] inherits <- base::inherits [10:56:27.086] invokeRestart <- base::invokeRestart [10:56:27.086] length <- base::length [10:56:27.086] list <- base::list [10:56:27.086] seq.int <- base::seq.int [10:56:27.086] signalCondition <- base::signalCondition [10:56:27.086] sys.calls <- base::sys.calls [10:56:27.086] `[[` <- base::`[[` [10:56:27.086] `+` <- base::`+` [10:56:27.086] `<<-` <- base::`<<-` [10:56:27.086] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.086] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.086] 3L)] [10:56:27.086] } [10:56:27.086] function(cond) { [10:56:27.086] is_error <- inherits(cond, "error") [10:56:27.086] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.086] NULL) [10:56:27.086] if (is_error) { [10:56:27.086] sessionInformation <- function() { [10:56:27.086] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.086] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.086] search = base::search(), system = base::Sys.info()) [10:56:27.086] } [10:56:27.086] ...future.conditions[[length(...future.conditions) + [10:56:27.086] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.086] cond$call), session = sessionInformation(), [10:56:27.086] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.086] signalCondition(cond) [10:56:27.086] } [10:56:27.086] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.086] signal <- FALSE && inherits(cond, character(0)) [10:56:27.086] ...future.conditions[[length(...future.conditions) + [10:56:27.086] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.086] if (FALSE && !signal) { [10:56:27.086] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.086] { [10:56:27.086] inherits <- base::inherits [10:56:27.086] invokeRestart <- base::invokeRestart [10:56:27.086] is.null <- base::is.null [10:56:27.086] muffled <- FALSE [10:56:27.086] if (inherits(cond, "message")) { [10:56:27.086] muffled <- grepl(pattern, "muffleMessage") [10:56:27.086] if (muffled) [10:56:27.086] invokeRestart("muffleMessage") [10:56:27.086] } [10:56:27.086] else if (inherits(cond, "warning")) { [10:56:27.086] muffled <- grepl(pattern, "muffleWarning") [10:56:27.086] if (muffled) [10:56:27.086] invokeRestart("muffleWarning") [10:56:27.086] } [10:56:27.086] else if (inherits(cond, "condition")) { [10:56:27.086] if (!is.null(pattern)) { [10:56:27.086] computeRestarts <- base::computeRestarts [10:56:27.086] grepl <- base::grepl [10:56:27.086] restarts <- computeRestarts(cond) [10:56:27.086] for (restart in restarts) { [10:56:27.086] name <- restart$name [10:56:27.086] if (is.null(name)) [10:56:27.086] next [10:56:27.086] if (!grepl(pattern, name)) [10:56:27.086] next [10:56:27.086] invokeRestart(restart) [10:56:27.086] muffled <- TRUE [10:56:27.086] break [10:56:27.086] } [10:56:27.086] } [10:56:27.086] } [10:56:27.086] invisible(muffled) [10:56:27.086] } [10:56:27.086] muffleCondition(cond, pattern = "^muffle") [10:56:27.086] } [10:56:27.086] } [10:56:27.086] else { [10:56:27.086] if (TRUE) { [10:56:27.086] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.086] { [10:56:27.086] inherits <- base::inherits [10:56:27.086] invokeRestart <- base::invokeRestart [10:56:27.086] is.null <- base::is.null [10:56:27.086] muffled <- FALSE [10:56:27.086] if (inherits(cond, "message")) { [10:56:27.086] muffled <- grepl(pattern, "muffleMessage") [10:56:27.086] if (muffled) [10:56:27.086] invokeRestart("muffleMessage") [10:56:27.086] } [10:56:27.086] else if (inherits(cond, "warning")) { [10:56:27.086] muffled <- grepl(pattern, "muffleWarning") [10:56:27.086] if (muffled) [10:56:27.086] invokeRestart("muffleWarning") [10:56:27.086] } [10:56:27.086] else if (inherits(cond, "condition")) { [10:56:27.086] if (!is.null(pattern)) { [10:56:27.086] computeRestarts <- base::computeRestarts [10:56:27.086] grepl <- base::grepl [10:56:27.086] restarts <- computeRestarts(cond) [10:56:27.086] for (restart in restarts) { [10:56:27.086] name <- restart$name [10:56:27.086] if (is.null(name)) [10:56:27.086] next [10:56:27.086] if (!grepl(pattern, name)) [10:56:27.086] next [10:56:27.086] invokeRestart(restart) [10:56:27.086] muffled <- TRUE [10:56:27.086] break [10:56:27.086] } [10:56:27.086] } [10:56:27.086] } [10:56:27.086] invisible(muffled) [10:56:27.086] } [10:56:27.086] muffleCondition(cond, pattern = "^muffle") [10:56:27.086] } [10:56:27.086] } [10:56:27.086] } [10:56:27.086] })) [10:56:27.086] }, error = function(ex) { [10:56:27.086] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.086] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.086] ...future.rng), started = ...future.startTime, [10:56:27.086] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.086] version = "1.8"), class = "FutureResult") [10:56:27.086] }, finally = { [10:56:27.086] if (!identical(...future.workdir, getwd())) [10:56:27.086] setwd(...future.workdir) [10:56:27.086] { [10:56:27.086] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.086] ...future.oldOptions$nwarnings <- NULL [10:56:27.086] } [10:56:27.086] base::options(...future.oldOptions) [10:56:27.086] if (.Platform$OS.type == "windows") { [10:56:27.086] old_names <- names(...future.oldEnvVars) [10:56:27.086] envs <- base::Sys.getenv() [10:56:27.086] names <- names(envs) [10:56:27.086] common <- intersect(names, old_names) [10:56:27.086] added <- setdiff(names, old_names) [10:56:27.086] removed <- setdiff(old_names, names) [10:56:27.086] changed <- common[...future.oldEnvVars[common] != [10:56:27.086] envs[common]] [10:56:27.086] NAMES <- toupper(changed) [10:56:27.086] args <- list() [10:56:27.086] for (kk in seq_along(NAMES)) { [10:56:27.086] name <- changed[[kk]] [10:56:27.086] NAME <- NAMES[[kk]] [10:56:27.086] if (name != NAME && is.element(NAME, old_names)) [10:56:27.086] next [10:56:27.086] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.086] } [10:56:27.086] NAMES <- toupper(added) [10:56:27.086] for (kk in seq_along(NAMES)) { [10:56:27.086] name <- added[[kk]] [10:56:27.086] NAME <- NAMES[[kk]] [10:56:27.086] if (name != NAME && is.element(NAME, old_names)) [10:56:27.086] next [10:56:27.086] args[[name]] <- "" [10:56:27.086] } [10:56:27.086] NAMES <- toupper(removed) [10:56:27.086] for (kk in seq_along(NAMES)) { [10:56:27.086] name <- removed[[kk]] [10:56:27.086] NAME <- NAMES[[kk]] [10:56:27.086] if (name != NAME && is.element(NAME, old_names)) [10:56:27.086] next [10:56:27.086] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.086] } [10:56:27.086] if (length(args) > 0) [10:56:27.086] base::do.call(base::Sys.setenv, args = args) [10:56:27.086] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.086] } [10:56:27.086] else { [10:56:27.086] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.086] } [10:56:27.086] { [10:56:27.086] if (base::length(...future.futureOptionsAdded) > [10:56:27.086] 0L) { [10:56:27.086] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.086] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.086] base::options(opts) [10:56:27.086] } [10:56:27.086] { [10:56:27.086] NULL [10:56:27.086] options(future.plan = NULL) [10:56:27.086] if (is.na(NA_character_)) [10:56:27.086] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.086] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.086] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.086] .init = FALSE) [10:56:27.086] } [10:56:27.086] } [10:56:27.086] } [10:56:27.086] }) [10:56:27.086] if (TRUE) { [10:56:27.086] base::sink(type = "output", split = FALSE) [10:56:27.086] if (TRUE) { [10:56:27.086] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.086] } [10:56:27.086] else { [10:56:27.086] ...future.result["stdout"] <- base::list(NULL) [10:56:27.086] } [10:56:27.086] base::close(...future.stdout) [10:56:27.086] ...future.stdout <- NULL [10:56:27.086] } [10:56:27.086] ...future.result$conditions <- ...future.conditions [10:56:27.086] ...future.result$finished <- base::Sys.time() [10:56:27.086] ...future.result [10:56:27.086] } [10:56:27.090] - Launch lazy future ... done [10:56:27.090] run() for 'MiraiFuture' ... done [10:56:27.090] Created future: [10:56:27.092] resolved() for 'MiraiFuture' ... [10:56:27.092] - state: 'running' [10:56:27.092] - run: TRUE [10:56:27.092] - result: 'NULL' [10:56:27.092] - resolved: FALSE [10:56:27.093] resolved() for 'MiraiFuture' ... done [10:56:27.091] MiraiFuture: [10:56:27.091] Label: 'future_lapply-2' [10:56:27.091] Expression: [10:56:27.091] { [10:56:27.091] do.call(function(...) { [10:56:27.091] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.091] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.091] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.091] on.exit(options(oopts), add = TRUE) [10:56:27.091] } [10:56:27.091] { [10:56:27.091] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.091] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.091] ...future.FUN(...future.X_jj, ...) [10:56:27.091] }) [10:56:27.091] } [10:56:27.091] }, args = future.call.arguments) [10:56:27.091] } [10:56:27.091] Lazy evaluation: FALSE [10:56:27.091] Asynchronous evaluation: TRUE [10:56:27.091] Local evaluation: TRUE [10:56:27.091] Environment: R_GlobalEnv [10:56:27.091] Capture standard output: TRUE [10:56:27.091] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.091] 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) [10:56:27.091] Packages: [10:56:27.091] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.091] Resolved: TRUE [10:56:27.091] Value: [10:56:27.091] Conditions captured: [10:56:27.091] Early signaling: FALSE [10:56:27.091] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.091] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.093] Chunk #2 of 2 ... DONE [10:56:27.093] Launching 2 futures (chunks) ... DONE [10:56:27.093] Resolving 2 futures (chunks) ... [10:56:27.094] resolve() on list ... [10:56:27.094] recursive: 0 [10:56:27.094] length: 2 [10:56:27.094] [10:56:27.094] resolved() for 'MiraiFuture' ... [10:56:27.094] - state: 'running' [10:56:27.095] - run: TRUE [10:56:27.095] - result: 'NULL' [10:56:27.095] - resolved: FALSE [10:56:27.095] resolved() for 'MiraiFuture' ... done [10:56:27.095] Future #1 [10:56:27.095] signalConditionsASAP(MiraiFuture, pos=1) ... [10:56:27.096] - nx: 2 [10:56:27.096] - relay: TRUE [10:56:27.096] - stdout: TRUE [10:56:27.096] - signal: TRUE [10:56:27.096] - resignal: FALSE [10:56:27.096] - force: TRUE [10:56:27.097] - relayed: [n=2] FALSE, FALSE [10:56:27.097] - queued futures: [n=2] FALSE, FALSE [10:56:27.097] - until=1 [10:56:27.097] - relaying element #1 [10:56:27.098] - relayed: [n=2] TRUE, FALSE [10:56:27.098] - queued futures: [n=2] TRUE, FALSE [10:56:27.099] signalConditionsASAP(MiraiFuture, pos=1) ... done [10:56:27.099] length: 1 (resolved future 1) [10:56:27.099] resolved() for 'MiraiFuture' ... [10:56:27.099] - state: 'running' [10:56:27.099] - run: TRUE [10:56:27.099] - result: 'NULL' [10:56:27.100] - resolved: FALSE [10:56:27.100] resolved() for 'MiraiFuture' ... done [10:56:27.100] Future #2 [10:56:27.100] signalConditionsASAP(MiraiFuture, pos=2) ... [10:56:27.100] - nx: 2 [10:56:27.101] - relay: TRUE [10:56:27.101] - stdout: TRUE [10:56:27.101] - signal: TRUE [10:56:27.101] - resignal: FALSE [10:56:27.101] - force: TRUE [10:56:27.101] - relayed: [n=2] TRUE, FALSE [10:56:27.101] - queued futures: [n=2] TRUE, FALSE [10:56:27.102] - until=2 [10:56:27.102] - relaying element #2 [10:56:27.102] - relayed: [n=2] TRUE, TRUE [10:56:27.102] - queued futures: [n=2] TRUE, TRUE [10:56:27.102] signalConditionsASAP(MiraiFuture, pos=2) ... done [10:56:27.103] length: 0 (resolved future 2) [10:56:27.103] Relaying remaining futures [10:56:27.103] signalConditionsASAP(NULL, pos=0) ... [10:56:27.103] - nx: 2 [10:56:27.103] - relay: TRUE [10:56:27.103] - stdout: TRUE [10:56:27.104] - signal: TRUE [10:56:27.104] - resignal: FALSE [10:56:27.104] - force: TRUE [10:56:27.104] - relayed: [n=2] TRUE, TRUE [10:56:27.104] - queued futures: [n=2] TRUE, TRUE - flush all [10:56:27.104] - relayed: [n=2] TRUE, TRUE [10:56:27.105] - queued futures: [n=2] TRUE, TRUE [10:56:27.105] signalConditionsASAP(NULL, pos=0) ... done [10:56:27.105] resolve() on list ... DONE [10:56:27.105] - Number of value chunks collected: 2 [10:56:27.105] Resolving 2 futures (chunks) ... DONE [10:56:27.106] Reducing values from 2 chunks ... [10:56:27.106] - Number of values collected after concatenation: 3 [10:56:27.106] - Number of values expected: 3 [10:56:27.106] Reducing values from 2 chunks ... DONE [10:56:27.106] 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 [10:56:27.117] - plan('mirai_multisession') ...[10:56:27.118] plan(): Setting new future strategy stack: [10:56:27.118] List of future strategies: [10:56:27.118] 1. mirai_multisession: [10:56:27.118] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [10:56:27.118] - tweaked: FALSE [10:56:27.118] - call: plan(strategy) [10:56:27.118] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [10:56:27.119] < mirai | $data > [10:56:27.122] getGlobalsAndPackages() ... [10:56:27.122] Not searching for globals [10:56:27.122] - globals: [0] [10:56:27.122] getGlobalsAndPackages() ... DONE [10:56:27.122] getGlobalsAndPackages() ... [10:56:27.123] [10:56:27.123] - globals: [0] [10:56:27.123] getGlobalsAndPackages() ... DONE [10:56:27.123] Packages needed by the future expression (n = 0): [10:56:27.123] Packages needed by future strategies (n = 0): [10:56:27.124] { [10:56:27.124] { [10:56:27.124] { [10:56:27.124] ...future.startTime <- base::Sys.time() [10:56:27.124] { [10:56:27.124] { [10:56:27.124] { [10:56:27.124] base::local({ [10:56:27.124] has_future <- base::requireNamespace("future", [10:56:27.124] quietly = TRUE) [10:56:27.124] if (has_future) { [10:56:27.124] ns <- base::getNamespace("future") [10:56:27.124] version <- ns[[".package"]][["version"]] [10:56:27.124] if (is.null(version)) [10:56:27.124] version <- utils::packageVersion("future") [10:56:27.124] } [10:56:27.124] else { [10:56:27.124] version <- NULL [10:56:27.124] } [10:56:27.124] if (!has_future || version < "1.8.0") { [10:56:27.124] info <- base::c(r_version = base::gsub("R version ", [10:56:27.124] "", base::R.version$version.string), [10:56:27.124] platform = base::sprintf("%s (%s-bit)", [10:56:27.124] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.124] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.124] "release", "version")], collapse = " "), [10:56:27.124] hostname = base::Sys.info()[["nodename"]]) [10:56:27.124] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.124] info) [10:56:27.124] info <- base::paste(info, collapse = "; ") [10:56:27.124] if (!has_future) { [10:56:27.124] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.124] info) [10:56:27.124] } [10:56:27.124] else { [10:56:27.124] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.124] info, version) [10:56:27.124] } [10:56:27.124] base::stop(msg) [10:56:27.124] } [10:56:27.124] }) [10:56:27.124] } [10:56:27.124] ...future.strategy.old <- future::plan("list") [10:56:27.124] options(future.plan = NULL) [10:56:27.124] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.124] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.124] } [10:56:27.124] ...future.workdir <- getwd() [10:56:27.124] } [10:56:27.124] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.124] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.124] } [10:56:27.124] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.124] future.globals.maxSize = NULL, future.globals.method = NULL, [10:56:27.124] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.124] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.124] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.124] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.124] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.124] base::names(...future.oldOptions)) [10:56:27.124] } [10:56:27.124] if (FALSE) { [10:56:27.124] } [10:56:27.124] else { [10:56:27.124] if (TRUE) { [10:56:27.124] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.124] open = "w") [10:56:27.124] } [10:56:27.124] else { [10:56:27.124] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.124] windows = "NUL", "/dev/null"), open = "w") [10:56:27.124] } [10:56:27.124] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.124] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.124] base::sink(type = "output", split = FALSE) [10:56:27.124] base::close(...future.stdout) [10:56:27.124] }, add = TRUE) [10:56:27.124] } [10:56:27.124] ...future.frame <- base::sys.nframe() [10:56:27.124] ...future.conditions <- base::list() [10:56:27.124] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.124] if (FALSE) { [10:56:27.124] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.124] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.124] } [10:56:27.124] ...future.result <- base::tryCatch({ [10:56:27.124] base::withCallingHandlers({ [10:56:27.124] ...future.value <- base::withVisible(base::local(NA)) [10:56:27.124] future::FutureResult(value = ...future.value$value, [10:56:27.124] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.124] ...future.rng), globalenv = if (FALSE) [10:56:27.124] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.124] ...future.globalenv.names)) [10:56:27.124] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.124] }, condition = base::local({ [10:56:27.124] c <- base::c [10:56:27.124] inherits <- base::inherits [10:56:27.124] invokeRestart <- base::invokeRestart [10:56:27.124] length <- base::length [10:56:27.124] list <- base::list [10:56:27.124] seq.int <- base::seq.int [10:56:27.124] signalCondition <- base::signalCondition [10:56:27.124] sys.calls <- base::sys.calls [10:56:27.124] `[[` <- base::`[[` [10:56:27.124] `+` <- base::`+` [10:56:27.124] `<<-` <- base::`<<-` [10:56:27.124] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.124] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.124] 3L)] [10:56:27.124] } [10:56:27.124] function(cond) { [10:56:27.124] is_error <- inherits(cond, "error") [10:56:27.124] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.124] NULL) [10:56:27.124] if (is_error) { [10:56:27.124] sessionInformation <- function() { [10:56:27.124] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.124] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.124] search = base::search(), system = base::Sys.info()) [10:56:27.124] } [10:56:27.124] ...future.conditions[[length(...future.conditions) + [10:56:27.124] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.124] cond$call), session = sessionInformation(), [10:56:27.124] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.124] signalCondition(cond) [10:56:27.124] } [10:56:27.124] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.124] signal <- FALSE && inherits(cond, character(0)) [10:56:27.124] ...future.conditions[[length(...future.conditions) + [10:56:27.124] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.124] if (FALSE && !signal) { [10:56:27.124] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.124] { [10:56:27.124] inherits <- base::inherits [10:56:27.124] invokeRestart <- base::invokeRestart [10:56:27.124] is.null <- base::is.null [10:56:27.124] muffled <- FALSE [10:56:27.124] if (inherits(cond, "message")) { [10:56:27.124] muffled <- grepl(pattern, "muffleMessage") [10:56:27.124] if (muffled) [10:56:27.124] invokeRestart("muffleMessage") [10:56:27.124] } [10:56:27.124] else if (inherits(cond, "warning")) { [10:56:27.124] muffled <- grepl(pattern, "muffleWarning") [10:56:27.124] if (muffled) [10:56:27.124] invokeRestart("muffleWarning") [10:56:27.124] } [10:56:27.124] else if (inherits(cond, "condition")) { [10:56:27.124] if (!is.null(pattern)) { [10:56:27.124] computeRestarts <- base::computeRestarts [10:56:27.124] grepl <- base::grepl [10:56:27.124] restarts <- computeRestarts(cond) [10:56:27.124] for (restart in restarts) { [10:56:27.124] name <- restart$name [10:56:27.124] if (is.null(name)) [10:56:27.124] next [10:56:27.124] if (!grepl(pattern, name)) [10:56:27.124] next [10:56:27.124] invokeRestart(restart) [10:56:27.124] muffled <- TRUE [10:56:27.124] break [10:56:27.124] } [10:56:27.124] } [10:56:27.124] } [10:56:27.124] invisible(muffled) [10:56:27.124] } [10:56:27.124] muffleCondition(cond, pattern = "^muffle") [10:56:27.124] } [10:56:27.124] } [10:56:27.124] else { [10:56:27.124] if (TRUE) { [10:56:27.124] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.124] { [10:56:27.124] inherits <- base::inherits [10:56:27.124] invokeRestart <- base::invokeRestart [10:56:27.124] is.null <- base::is.null [10:56:27.124] muffled <- FALSE [10:56:27.124] if (inherits(cond, "message")) { [10:56:27.124] muffled <- grepl(pattern, "muffleMessage") [10:56:27.124] if (muffled) [10:56:27.124] invokeRestart("muffleMessage") [10:56:27.124] } [10:56:27.124] else if (inherits(cond, "warning")) { [10:56:27.124] muffled <- grepl(pattern, "muffleWarning") [10:56:27.124] if (muffled) [10:56:27.124] invokeRestart("muffleWarning") [10:56:27.124] } [10:56:27.124] else if (inherits(cond, "condition")) { [10:56:27.124] if (!is.null(pattern)) { [10:56:27.124] computeRestarts <- base::computeRestarts [10:56:27.124] grepl <- base::grepl [10:56:27.124] restarts <- computeRestarts(cond) [10:56:27.124] for (restart in restarts) { [10:56:27.124] name <- restart$name [10:56:27.124] if (is.null(name)) [10:56:27.124] next [10:56:27.124] if (!grepl(pattern, name)) [10:56:27.124] next [10:56:27.124] invokeRestart(restart) [10:56:27.124] muffled <- TRUE [10:56:27.124] break [10:56:27.124] } [10:56:27.124] } [10:56:27.124] } [10:56:27.124] invisible(muffled) [10:56:27.124] } [10:56:27.124] muffleCondition(cond, pattern = "^muffle") [10:56:27.124] } [10:56:27.124] } [10:56:27.124] } [10:56:27.124] })) [10:56:27.124] }, error = function(ex) { [10:56:27.124] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.124] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.124] ...future.rng), started = ...future.startTime, [10:56:27.124] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.124] version = "1.8"), class = "FutureResult") [10:56:27.124] }, finally = { [10:56:27.124] if (!identical(...future.workdir, getwd())) [10:56:27.124] setwd(...future.workdir) [10:56:27.124] { [10:56:27.124] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.124] ...future.oldOptions$nwarnings <- NULL [10:56:27.124] } [10:56:27.124] base::options(...future.oldOptions) [10:56:27.124] if (.Platform$OS.type == "windows") { [10:56:27.124] old_names <- names(...future.oldEnvVars) [10:56:27.124] envs <- base::Sys.getenv() [10:56:27.124] names <- names(envs) [10:56:27.124] common <- intersect(names, old_names) [10:56:27.124] added <- setdiff(names, old_names) [10:56:27.124] removed <- setdiff(old_names, names) [10:56:27.124] changed <- common[...future.oldEnvVars[common] != [10:56:27.124] envs[common]] [10:56:27.124] NAMES <- toupper(changed) [10:56:27.124] args <- list() [10:56:27.124] for (kk in seq_along(NAMES)) { [10:56:27.124] name <- changed[[kk]] [10:56:27.124] NAME <- NAMES[[kk]] [10:56:27.124] if (name != NAME && is.element(NAME, old_names)) [10:56:27.124] next [10:56:27.124] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.124] } [10:56:27.124] NAMES <- toupper(added) [10:56:27.124] for (kk in seq_along(NAMES)) { [10:56:27.124] name <- added[[kk]] [10:56:27.124] NAME <- NAMES[[kk]] [10:56:27.124] if (name != NAME && is.element(NAME, old_names)) [10:56:27.124] next [10:56:27.124] args[[name]] <- "" [10:56:27.124] } [10:56:27.124] NAMES <- toupper(removed) [10:56:27.124] for (kk in seq_along(NAMES)) { [10:56:27.124] name <- removed[[kk]] [10:56:27.124] NAME <- NAMES[[kk]] [10:56:27.124] if (name != NAME && is.element(NAME, old_names)) [10:56:27.124] next [10:56:27.124] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.124] } [10:56:27.124] if (length(args) > 0) [10:56:27.124] base::do.call(base::Sys.setenv, args = args) [10:56:27.124] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.124] } [10:56:27.124] else { [10:56:27.124] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.124] } [10:56:27.124] { [10:56:27.124] if (base::length(...future.futureOptionsAdded) > [10:56:27.124] 0L) { [10:56:27.124] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.124] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.124] base::options(opts) [10:56:27.124] } [10:56:27.124] { [10:56:27.124] NULL [10:56:27.124] options(future.plan = NULL) [10:56:27.124] if (is.na(NA_character_)) [10:56:27.124] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.124] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.124] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.124] .init = FALSE) [10:56:27.124] } [10:56:27.124] } [10:56:27.124] } [10:56:27.124] }) [10:56:27.124] if (TRUE) { [10:56:27.124] base::sink(type = "output", split = FALSE) [10:56:27.124] if (TRUE) { [10:56:27.124] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.124] } [10:56:27.124] else { [10:56:27.124] ...future.result["stdout"] <- base::list(NULL) [10:56:27.124] } [10:56:27.124] base::close(...future.stdout) [10:56:27.124] ...future.stdout <- NULL [10:56:27.124] } [10:56:27.124] ...future.result$conditions <- ...future.conditions [10:56:27.124] ...future.result$finished <- base::Sys.time() [10:56:27.124] ...future.result [10:56:27.124] } [10:56:27.130] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [10:56:27.130] plan(): nbrOfWorkers() = 2 [10:56:27.131] future_lapply() ... [10:56:27.132] Number of chunks: 3 [10:56:27.132] getGlobalsAndPackagesXApply() ... [10:56:27.132] - future.globals: TRUE [10:56:27.132] getGlobalsAndPackages() ... [10:56:27.132] Searching for globals... [10:56:27.134] - globals found: [2] 'FUN', '.Internal' [10:56:27.134] Searching for globals ... DONE [10:56:27.134] Resolving globals: FALSE [10:56:27.135] The total size of the 1 globals is 2.13 KiB (2184 bytes) [10:56:27.135] 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') [10:56:27.135] - globals: [1] 'FUN' [10:56:27.135] [10:56:27.136] getGlobalsAndPackages() ... DONE [10:56:27.136] - globals found/used: [n=1] 'FUN' [10:56:27.136] - needed namespaces: [n=0] [10:56:27.136] Finding globals ... DONE [10:56:27.136] - use_args: TRUE [10:56:27.136] - Getting '...' globals ... [10:56:27.137] resolve() on list ... [10:56:27.137] recursive: 0 [10:56:27.137] length: 1 [10:56:27.137] elements: '...' [10:56:27.138] length: 0 (resolved future 1) [10:56:27.138] resolve() on list ... DONE [10:56:27.138] - '...' content: [n=1] 'length' [10:56:27.138] List of 1 [10:56:27.138] $ ...:List of 1 [10:56:27.138] ..$ length: int 2 [10:56:27.138] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.138] - attr(*, "where")=List of 1 [10:56:27.138] ..$ ...: [10:56:27.138] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.138] - attr(*, "resolved")= logi TRUE [10:56:27.138] - attr(*, "total_size")= num NA [10:56:27.141] - Getting '...' globals ... DONE [10:56:27.142] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [10:56:27.142] List of 2 [10:56:27.142] $ ...future.FUN:function (mode = "logical", length = 0L) [10:56:27.142] $ ... :List of 1 [10:56:27.142] ..$ length: int 2 [10:56:27.142] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.142] - attr(*, "where")=List of 2 [10:56:27.142] ..$ ...future.FUN: [10:56:27.142] ..$ ... : [10:56:27.142] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.142] - attr(*, "resolved")= logi FALSE [10:56:27.142] - attr(*, "total_size")= num 2240 [10:56:27.146] Packages to be attached in all futures: [n=0] [10:56:27.146] getGlobalsAndPackagesXApply() ... DONE [10:56:27.146] Number of futures (= number of chunks): 3 [10:56:27.146] Launching 3 futures (chunks) ... [10:56:27.146] Chunk #1 of 3 ... [10:56:27.147] - Finding globals in 'X' for chunk #1 ... [10:56:27.147] getGlobalsAndPackages() ... [10:56:27.147] Searching for globals... [10:56:27.147] [10:56:27.147] Searching for globals ... DONE [10:56:27.148] - globals: [0] [10:56:27.148] getGlobalsAndPackages() ... DONE [10:56:27.148] + additional globals found: [n=0] [10:56:27.149] + additional namespaces needed: [n=0] [10:56:27.149] - Finding globals in 'X' for chunk #1 ... DONE [10:56:27.149] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [10:56:27.150] - seeds: [10:56:27.150] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.150] getGlobalsAndPackages() ... [10:56:27.150] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.150] Resolving globals: FALSE [10:56:27.151] Tweak future expression to call with '...' arguments ... [10:56:27.151] { [10:56:27.151] do.call(function(...) { [10:56:27.151] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.151] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.151] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.151] on.exit(options(oopts), add = TRUE) [10:56:27.151] } [10:56:27.151] { [10:56:27.151] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.151] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.151] ...future.FUN(...future.X_jj, ...) [10:56:27.151] }) [10:56:27.151] } [10:56:27.151] }, args = future.call.arguments) [10:56:27.151] } [10:56:27.151] Tweak future expression to call with '...' arguments ... DONE [10:56:27.152] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.152] [10:56:27.152] getGlobalsAndPackages() ... DONE [10:56:27.152] run() for 'Future' ... [10:56:27.152] - state: 'created' [10:56:27.153] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.155] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.155] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.155] - Field: 'label' [10:56:27.156] - Field: 'local' [10:56:27.156] - Field: 'owner' [10:56:27.156] - Field: 'envir' [10:56:27.156] - Field: 'packages' [10:56:27.156] - Field: 'gc' [10:56:27.156] - Field: 'conditions' [10:56:27.157] - Field: 'expr' [10:56:27.157] - Field: 'uuid' [10:56:27.157] - Field: 'seed' [10:56:27.157] - Field: 'version' [10:56:27.157] - Field: 'result' [10:56:27.157] - Field: 'asynchronous' [10:56:27.158] - Field: 'calls' [10:56:27.158] - Field: 'globals' [10:56:27.158] - Field: 'stdout' [10:56:27.158] - Field: 'earlySignal' [10:56:27.158] - Field: 'lazy' [10:56:27.158] - Field: 'state' [10:56:27.159] - Field: '.cluster' [10:56:27.159] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.159] - Launch lazy future ... [10:56:27.159] Packages needed by the future expression (n = 0): [10:56:27.159] Packages needed by future strategies (n = 0): [10:56:27.160] { [10:56:27.160] { [10:56:27.160] { [10:56:27.160] ...future.startTime <- base::Sys.time() [10:56:27.160] { [10:56:27.160] { [10:56:27.160] { [10:56:27.160] base::local({ [10:56:27.160] has_future <- base::requireNamespace("future", [10:56:27.160] quietly = TRUE) [10:56:27.160] if (has_future) { [10:56:27.160] ns <- base::getNamespace("future") [10:56:27.160] version <- ns[[".package"]][["version"]] [10:56:27.160] if (is.null(version)) [10:56:27.160] version <- utils::packageVersion("future") [10:56:27.160] } [10:56:27.160] else { [10:56:27.160] version <- NULL [10:56:27.160] } [10:56:27.160] if (!has_future || version < "1.8.0") { [10:56:27.160] info <- base::c(r_version = base::gsub("R version ", [10:56:27.160] "", base::R.version$version.string), [10:56:27.160] platform = base::sprintf("%s (%s-bit)", [10:56:27.160] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.160] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.160] "release", "version")], collapse = " "), [10:56:27.160] hostname = base::Sys.info()[["nodename"]]) [10:56:27.160] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.160] info) [10:56:27.160] info <- base::paste(info, collapse = "; ") [10:56:27.160] if (!has_future) { [10:56:27.160] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.160] info) [10:56:27.160] } [10:56:27.160] else { [10:56:27.160] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.160] info, version) [10:56:27.160] } [10:56:27.160] base::stop(msg) [10:56:27.160] } [10:56:27.160] }) [10:56:27.160] } [10:56:27.160] ...future.strategy.old <- future::plan("list") [10:56:27.160] options(future.plan = NULL) [10:56:27.160] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.160] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.160] } [10:56:27.160] ...future.workdir <- getwd() [10:56:27.160] } [10:56:27.160] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.160] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.160] } [10:56:27.160] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.160] future.globals.maxSize = 1572864000, future.globals.method = NULL, [10:56:27.160] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.160] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.160] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.160] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.160] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.160] base::names(...future.oldOptions)) [10:56:27.160] } [10:56:27.160] if (FALSE) { [10:56:27.160] } [10:56:27.160] else { [10:56:27.160] if (TRUE) { [10:56:27.160] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.160] open = "w") [10:56:27.160] } [10:56:27.160] else { [10:56:27.160] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.160] windows = "NUL", "/dev/null"), open = "w") [10:56:27.160] } [10:56:27.160] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.160] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.160] base::sink(type = "output", split = FALSE) [10:56:27.160] base::close(...future.stdout) [10:56:27.160] }, add = TRUE) [10:56:27.160] } [10:56:27.160] ...future.frame <- base::sys.nframe() [10:56:27.160] ...future.conditions <- base::list() [10:56:27.160] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.160] if (FALSE) { [10:56:27.160] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.160] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.160] } [10:56:27.160] ...future.result <- base::tryCatch({ [10:56:27.160] base::withCallingHandlers({ [10:56:27.160] ...future.value <- base::withVisible(base::local({ [10:56:27.160] do.call(function(...) { [10:56:27.160] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.160] if (!identical(...future.globals.maxSize.org, [10:56:27.160] ...future.globals.maxSize)) { [10:56:27.160] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.160] on.exit(options(oopts), add = TRUE) [10:56:27.160] } [10:56:27.160] { [10:56:27.160] lapply(seq_along(...future.elements_ii), [10:56:27.160] FUN = function(jj) { [10:56:27.160] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.160] ...future.FUN(...future.X_jj, ...) [10:56:27.160] }) [10:56:27.160] } [10:56:27.160] }, args = future.call.arguments) [10:56:27.160] })) [10:56:27.160] future::FutureResult(value = ...future.value$value, [10:56:27.160] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.160] ...future.rng), globalenv = if (FALSE) [10:56:27.160] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.160] ...future.globalenv.names)) [10:56:27.160] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.160] }, condition = base::local({ [10:56:27.160] c <- base::c [10:56:27.160] inherits <- base::inherits [10:56:27.160] invokeRestart <- base::invokeRestart [10:56:27.160] length <- base::length [10:56:27.160] list <- base::list [10:56:27.160] seq.int <- base::seq.int [10:56:27.160] signalCondition <- base::signalCondition [10:56:27.160] sys.calls <- base::sys.calls [10:56:27.160] `[[` <- base::`[[` [10:56:27.160] `+` <- base::`+` [10:56:27.160] `<<-` <- base::`<<-` [10:56:27.160] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.160] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.160] 3L)] [10:56:27.160] } [10:56:27.160] function(cond) { [10:56:27.160] is_error <- inherits(cond, "error") [10:56:27.160] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.160] NULL) [10:56:27.160] if (is_error) { [10:56:27.160] sessionInformation <- function() { [10:56:27.160] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.160] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.160] search = base::search(), system = base::Sys.info()) [10:56:27.160] } [10:56:27.160] ...future.conditions[[length(...future.conditions) + [10:56:27.160] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.160] cond$call), session = sessionInformation(), [10:56:27.160] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.160] signalCondition(cond) [10:56:27.160] } [10:56:27.160] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.160] signal <- FALSE && inherits(cond, character(0)) [10:56:27.160] ...future.conditions[[length(...future.conditions) + [10:56:27.160] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.160] if (FALSE && !signal) { [10:56:27.160] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.160] { [10:56:27.160] inherits <- base::inherits [10:56:27.160] invokeRestart <- base::invokeRestart [10:56:27.160] is.null <- base::is.null [10:56:27.160] muffled <- FALSE [10:56:27.160] if (inherits(cond, "message")) { [10:56:27.160] muffled <- grepl(pattern, "muffleMessage") [10:56:27.160] if (muffled) [10:56:27.160] invokeRestart("muffleMessage") [10:56:27.160] } [10:56:27.160] else if (inherits(cond, "warning")) { [10:56:27.160] muffled <- grepl(pattern, "muffleWarning") [10:56:27.160] if (muffled) [10:56:27.160] invokeRestart("muffleWarning") [10:56:27.160] } [10:56:27.160] else if (inherits(cond, "condition")) { [10:56:27.160] if (!is.null(pattern)) { [10:56:27.160] computeRestarts <- base::computeRestarts [10:56:27.160] grepl <- base::grepl [10:56:27.160] restarts <- computeRestarts(cond) [10:56:27.160] for (restart in restarts) { [10:56:27.160] name <- restart$name [10:56:27.160] if (is.null(name)) [10:56:27.160] next [10:56:27.160] if (!grepl(pattern, name)) [10:56:27.160] next [10:56:27.160] invokeRestart(restart) [10:56:27.160] muffled <- TRUE [10:56:27.160] break [10:56:27.160] } [10:56:27.160] } [10:56:27.160] } [10:56:27.160] invisible(muffled) [10:56:27.160] } [10:56:27.160] muffleCondition(cond, pattern = "^muffle") [10:56:27.160] } [10:56:27.160] } [10:56:27.160] else { [10:56:27.160] if (TRUE) { [10:56:27.160] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.160] { [10:56:27.160] inherits <- base::inherits [10:56:27.160] invokeRestart <- base::invokeRestart [10:56:27.160] is.null <- base::is.null [10:56:27.160] muffled <- FALSE [10:56:27.160] if (inherits(cond, "message")) { [10:56:27.160] muffled <- grepl(pattern, "muffleMessage") [10:56:27.160] if (muffled) [10:56:27.160] invokeRestart("muffleMessage") [10:56:27.160] } [10:56:27.160] else if (inherits(cond, "warning")) { [10:56:27.160] muffled <- grepl(pattern, "muffleWarning") [10:56:27.160] if (muffled) [10:56:27.160] invokeRestart("muffleWarning") [10:56:27.160] } [10:56:27.160] else if (inherits(cond, "condition")) { [10:56:27.160] if (!is.null(pattern)) { [10:56:27.160] computeRestarts <- base::computeRestarts [10:56:27.160] grepl <- base::grepl [10:56:27.160] restarts <- computeRestarts(cond) [10:56:27.160] for (restart in restarts) { [10:56:27.160] name <- restart$name [10:56:27.160] if (is.null(name)) [10:56:27.160] next [10:56:27.160] if (!grepl(pattern, name)) [10:56:27.160] next [10:56:27.160] invokeRestart(restart) [10:56:27.160] muffled <- TRUE [10:56:27.160] break [10:56:27.160] } [10:56:27.160] } [10:56:27.160] } [10:56:27.160] invisible(muffled) [10:56:27.160] } [10:56:27.160] muffleCondition(cond, pattern = "^muffle") [10:56:27.160] } [10:56:27.160] } [10:56:27.160] } [10:56:27.160] })) [10:56:27.160] }, error = function(ex) { [10:56:27.160] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.160] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.160] ...future.rng), started = ...future.startTime, [10:56:27.160] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.160] version = "1.8"), class = "FutureResult") [10:56:27.160] }, finally = { [10:56:27.160] if (!identical(...future.workdir, getwd())) [10:56:27.160] setwd(...future.workdir) [10:56:27.160] { [10:56:27.160] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.160] ...future.oldOptions$nwarnings <- NULL [10:56:27.160] } [10:56:27.160] base::options(...future.oldOptions) [10:56:27.160] if (.Platform$OS.type == "windows") { [10:56:27.160] old_names <- names(...future.oldEnvVars) [10:56:27.160] envs <- base::Sys.getenv() [10:56:27.160] names <- names(envs) [10:56:27.160] common <- intersect(names, old_names) [10:56:27.160] added <- setdiff(names, old_names) [10:56:27.160] removed <- setdiff(old_names, names) [10:56:27.160] changed <- common[...future.oldEnvVars[common] != [10:56:27.160] envs[common]] [10:56:27.160] NAMES <- toupper(changed) [10:56:27.160] args <- list() [10:56:27.160] for (kk in seq_along(NAMES)) { [10:56:27.160] name <- changed[[kk]] [10:56:27.160] NAME <- NAMES[[kk]] [10:56:27.160] if (name != NAME && is.element(NAME, old_names)) [10:56:27.160] next [10:56:27.160] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.160] } [10:56:27.160] NAMES <- toupper(added) [10:56:27.160] for (kk in seq_along(NAMES)) { [10:56:27.160] name <- added[[kk]] [10:56:27.160] NAME <- NAMES[[kk]] [10:56:27.160] if (name != NAME && is.element(NAME, old_names)) [10:56:27.160] next [10:56:27.160] args[[name]] <- "" [10:56:27.160] } [10:56:27.160] NAMES <- toupper(removed) [10:56:27.160] for (kk in seq_along(NAMES)) { [10:56:27.160] name <- removed[[kk]] [10:56:27.160] NAME <- NAMES[[kk]] [10:56:27.160] if (name != NAME && is.element(NAME, old_names)) [10:56:27.160] next [10:56:27.160] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.160] } [10:56:27.160] if (length(args) > 0) [10:56:27.160] base::do.call(base::Sys.setenv, args = args) [10:56:27.160] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.160] } [10:56:27.160] else { [10:56:27.160] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.160] } [10:56:27.160] { [10:56:27.160] if (base::length(...future.futureOptionsAdded) > [10:56:27.160] 0L) { [10:56:27.160] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.160] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.160] base::options(opts) [10:56:27.160] } [10:56:27.160] { [10:56:27.160] NULL [10:56:27.160] options(future.plan = NULL) [10:56:27.160] if (is.na(NA_character_)) [10:56:27.160] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.160] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.160] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.160] .init = FALSE) [10:56:27.160] } [10:56:27.160] } [10:56:27.160] } [10:56:27.160] }) [10:56:27.160] if (TRUE) { [10:56:27.160] base::sink(type = "output", split = FALSE) [10:56:27.160] if (TRUE) { [10:56:27.160] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.160] } [10:56:27.160] else { [10:56:27.160] ...future.result["stdout"] <- base::list(NULL) [10:56:27.160] } [10:56:27.160] base::close(...future.stdout) [10:56:27.160] ...future.stdout <- NULL [10:56:27.160] } [10:56:27.160] ...future.result$conditions <- ...future.conditions [10:56:27.160] ...future.result$finished <- base::Sys.time() [10:56:27.160] ...future.result [10:56:27.160] } [10:56:27.164] - Launch lazy future ... done [10:56:27.164] run() for 'MiraiFuture' ... done [10:56:27.164] Created future: [10:56:27.166] resolved() for 'MiraiFuture' ... [10:56:27.166] - state: 'running' [10:56:27.166] - run: TRUE [10:56:27.166] - result: 'NULL' [10:56:27.166] - resolved: FALSE [10:56:27.167] resolved() for 'MiraiFuture' ... done [10:56:27.165] MiraiFuture: [10:56:27.165] Label: 'future_lapply-1' [10:56:27.165] Expression: [10:56:27.165] { [10:56:27.165] do.call(function(...) { [10:56:27.165] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.165] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.165] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.165] on.exit(options(oopts), add = TRUE) [10:56:27.165] } [10:56:27.165] { [10:56:27.165] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.165] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.165] ...future.FUN(...future.X_jj, ...) [10:56:27.165] }) [10:56:27.165] } [10:56:27.165] }, args = future.call.arguments) [10:56:27.165] } [10:56:27.165] Lazy evaluation: FALSE [10:56:27.165] Asynchronous evaluation: TRUE [10:56:27.165] Local evaluation: TRUE [10:56:27.165] Environment: R_GlobalEnv [10:56:27.165] Capture standard output: TRUE [10:56:27.165] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.165] 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) [10:56:27.165] Packages: [10:56:27.165] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.165] Resolved: TRUE [10:56:27.165] Value: [10:56:27.165] Conditions captured: [10:56:27.165] Early signaling: FALSE [10:56:27.165] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.165] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.167] Chunk #1 of 3 ... DONE [10:56:27.167] Chunk #2 of 3 ... [10:56:27.167] - Finding globals in 'X' for chunk #2 ... [10:56:27.168] getGlobalsAndPackages() ... [10:56:27.168] Searching for globals... [10:56:27.168] [10:56:27.168] Searching for globals ... DONE [10:56:27.168] - globals: [0] [10:56:27.168] getGlobalsAndPackages() ... DONE [10:56:27.169] + additional globals found: [n=0] [10:56:27.169] + additional namespaces needed: [n=0] [10:56:27.169] - Finding globals in 'X' for chunk #2 ... DONE [10:56:27.169] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [10:56:27.169] - seeds: [10:56:27.169] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.170] getGlobalsAndPackages() ... [10:56:27.170] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.170] Resolving globals: FALSE [10:56:27.170] Tweak future expression to call with '...' arguments ... [10:56:27.170] { [10:56:27.170] do.call(function(...) { [10:56:27.170] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.170] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.170] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.170] on.exit(options(oopts), add = TRUE) [10:56:27.170] } [10:56:27.170] { [10:56:27.170] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.170] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.170] ...future.FUN(...future.X_jj, ...) [10:56:27.170] }) [10:56:27.170] } [10:56:27.170] }, args = future.call.arguments) [10:56:27.170] } [10:56:27.171] Tweak future expression to call with '...' arguments ... DONE [10:56:27.171] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.171] [10:56:27.172] getGlobalsAndPackages() ... DONE [10:56:27.172] run() for 'Future' ... [10:56:27.172] - state: 'created' [10:56:27.172] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.175] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.175] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.175] - Field: 'label' [10:56:27.175] - Field: 'local' [10:56:27.175] - Field: 'owner' [10:56:27.176] - Field: 'envir' [10:56:27.176] - Field: 'packages' [10:56:27.176] - Field: 'gc' [10:56:27.176] - Field: 'conditions' [10:56:27.176] - Field: 'expr' [10:56:27.176] - Field: 'uuid' [10:56:27.177] - Field: 'seed' [10:56:27.177] - Field: 'version' [10:56:27.177] - Field: 'result' [10:56:27.177] - Field: 'asynchronous' [10:56:27.177] - Field: 'calls' [10:56:27.177] - Field: 'globals' [10:56:27.178] - Field: 'stdout' [10:56:27.178] - Field: 'earlySignal' [10:56:27.178] - Field: 'lazy' [10:56:27.178] - Field: 'state' [10:56:27.178] - Field: '.cluster' [10:56:27.178] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.179] - Launch lazy future ... [10:56:27.179] Packages needed by the future expression (n = 0): [10:56:27.179] Packages needed by future strategies (n = 0): [10:56:27.180] { [10:56:27.180] { [10:56:27.180] { [10:56:27.180] ...future.startTime <- base::Sys.time() [10:56:27.180] { [10:56:27.180] { [10:56:27.180] { [10:56:27.180] base::local({ [10:56:27.180] has_future <- base::requireNamespace("future", [10:56:27.180] quietly = TRUE) [10:56:27.180] if (has_future) { [10:56:27.180] ns <- base::getNamespace("future") [10:56:27.180] version <- ns[[".package"]][["version"]] [10:56:27.180] if (is.null(version)) [10:56:27.180] version <- utils::packageVersion("future") [10:56:27.180] } [10:56:27.180] else { [10:56:27.180] version <- NULL [10:56:27.180] } [10:56:27.180] if (!has_future || version < "1.8.0") { [10:56:27.180] info <- base::c(r_version = base::gsub("R version ", [10:56:27.180] "", base::R.version$version.string), [10:56:27.180] platform = base::sprintf("%s (%s-bit)", [10:56:27.180] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.180] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.180] "release", "version")], collapse = " "), [10:56:27.180] hostname = base::Sys.info()[["nodename"]]) [10:56:27.180] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.180] info) [10:56:27.180] info <- base::paste(info, collapse = "; ") [10:56:27.180] if (!has_future) { [10:56:27.180] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.180] info) [10:56:27.180] } [10:56:27.180] else { [10:56:27.180] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.180] info, version) [10:56:27.180] } [10:56:27.180] base::stop(msg) [10:56:27.180] } [10:56:27.180] }) [10:56:27.180] } [10:56:27.180] ...future.strategy.old <- future::plan("list") [10:56:27.180] options(future.plan = NULL) [10:56:27.180] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.180] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.180] } [10:56:27.180] ...future.workdir <- getwd() [10:56:27.180] } [10:56:27.180] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.180] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.180] } [10:56:27.180] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.180] future.globals.maxSize = 1572864000, future.globals.method = NULL, [10:56:27.180] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.180] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.180] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.180] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.180] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.180] base::names(...future.oldOptions)) [10:56:27.180] } [10:56:27.180] if (FALSE) { [10:56:27.180] } [10:56:27.180] else { [10:56:27.180] if (TRUE) { [10:56:27.180] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.180] open = "w") [10:56:27.180] } [10:56:27.180] else { [10:56:27.180] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.180] windows = "NUL", "/dev/null"), open = "w") [10:56:27.180] } [10:56:27.180] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.180] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.180] base::sink(type = "output", split = FALSE) [10:56:27.180] base::close(...future.stdout) [10:56:27.180] }, add = TRUE) [10:56:27.180] } [10:56:27.180] ...future.frame <- base::sys.nframe() [10:56:27.180] ...future.conditions <- base::list() [10:56:27.180] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.180] if (FALSE) { [10:56:27.180] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.180] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.180] } [10:56:27.180] ...future.result <- base::tryCatch({ [10:56:27.180] base::withCallingHandlers({ [10:56:27.180] ...future.value <- base::withVisible(base::local({ [10:56:27.180] do.call(function(...) { [10:56:27.180] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.180] if (!identical(...future.globals.maxSize.org, [10:56:27.180] ...future.globals.maxSize)) { [10:56:27.180] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.180] on.exit(options(oopts), add = TRUE) [10:56:27.180] } [10:56:27.180] { [10:56:27.180] lapply(seq_along(...future.elements_ii), [10:56:27.180] FUN = function(jj) { [10:56:27.180] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.180] ...future.FUN(...future.X_jj, ...) [10:56:27.180] }) [10:56:27.180] } [10:56:27.180] }, args = future.call.arguments) [10:56:27.180] })) [10:56:27.180] future::FutureResult(value = ...future.value$value, [10:56:27.180] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.180] ...future.rng), globalenv = if (FALSE) [10:56:27.180] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.180] ...future.globalenv.names)) [10:56:27.180] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.180] }, condition = base::local({ [10:56:27.180] c <- base::c [10:56:27.180] inherits <- base::inherits [10:56:27.180] invokeRestart <- base::invokeRestart [10:56:27.180] length <- base::length [10:56:27.180] list <- base::list [10:56:27.180] seq.int <- base::seq.int [10:56:27.180] signalCondition <- base::signalCondition [10:56:27.180] sys.calls <- base::sys.calls [10:56:27.180] `[[` <- base::`[[` [10:56:27.180] `+` <- base::`+` [10:56:27.180] `<<-` <- base::`<<-` [10:56:27.180] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.180] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.180] 3L)] [10:56:27.180] } [10:56:27.180] function(cond) { [10:56:27.180] is_error <- inherits(cond, "error") [10:56:27.180] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.180] NULL) [10:56:27.180] if (is_error) { [10:56:27.180] sessionInformation <- function() { [10:56:27.180] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.180] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.180] search = base::search(), system = base::Sys.info()) [10:56:27.180] } [10:56:27.180] ...future.conditions[[length(...future.conditions) + [10:56:27.180] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.180] cond$call), session = sessionInformation(), [10:56:27.180] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.180] signalCondition(cond) [10:56:27.180] } [10:56:27.180] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.180] signal <- FALSE && inherits(cond, character(0)) [10:56:27.180] ...future.conditions[[length(...future.conditions) + [10:56:27.180] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.180] if (FALSE && !signal) { [10:56:27.180] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.180] { [10:56:27.180] inherits <- base::inherits [10:56:27.180] invokeRestart <- base::invokeRestart [10:56:27.180] is.null <- base::is.null [10:56:27.180] muffled <- FALSE [10:56:27.180] if (inherits(cond, "message")) { [10:56:27.180] muffled <- grepl(pattern, "muffleMessage") [10:56:27.180] if (muffled) [10:56:27.180] invokeRestart("muffleMessage") [10:56:27.180] } [10:56:27.180] else if (inherits(cond, "warning")) { [10:56:27.180] muffled <- grepl(pattern, "muffleWarning") [10:56:27.180] if (muffled) [10:56:27.180] invokeRestart("muffleWarning") [10:56:27.180] } [10:56:27.180] else if (inherits(cond, "condition")) { [10:56:27.180] if (!is.null(pattern)) { [10:56:27.180] computeRestarts <- base::computeRestarts [10:56:27.180] grepl <- base::grepl [10:56:27.180] restarts <- computeRestarts(cond) [10:56:27.180] for (restart in restarts) { [10:56:27.180] name <- restart$name [10:56:27.180] if (is.null(name)) [10:56:27.180] next [10:56:27.180] if (!grepl(pattern, name)) [10:56:27.180] next [10:56:27.180] invokeRestart(restart) [10:56:27.180] muffled <- TRUE [10:56:27.180] break [10:56:27.180] } [10:56:27.180] } [10:56:27.180] } [10:56:27.180] invisible(muffled) [10:56:27.180] } [10:56:27.180] muffleCondition(cond, pattern = "^muffle") [10:56:27.180] } [10:56:27.180] } [10:56:27.180] else { [10:56:27.180] if (TRUE) { [10:56:27.180] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.180] { [10:56:27.180] inherits <- base::inherits [10:56:27.180] invokeRestart <- base::invokeRestart [10:56:27.180] is.null <- base::is.null [10:56:27.180] muffled <- FALSE [10:56:27.180] if (inherits(cond, "message")) { [10:56:27.180] muffled <- grepl(pattern, "muffleMessage") [10:56:27.180] if (muffled) [10:56:27.180] invokeRestart("muffleMessage") [10:56:27.180] } [10:56:27.180] else if (inherits(cond, "warning")) { [10:56:27.180] muffled <- grepl(pattern, "muffleWarning") [10:56:27.180] if (muffled) [10:56:27.180] invokeRestart("muffleWarning") [10:56:27.180] } [10:56:27.180] else if (inherits(cond, "condition")) { [10:56:27.180] if (!is.null(pattern)) { [10:56:27.180] computeRestarts <- base::computeRestarts [10:56:27.180] grepl <- base::grepl [10:56:27.180] restarts <- computeRestarts(cond) [10:56:27.180] for (restart in restarts) { [10:56:27.180] name <- restart$name [10:56:27.180] if (is.null(name)) [10:56:27.180] next [10:56:27.180] if (!grepl(pattern, name)) [10:56:27.180] next [10:56:27.180] invokeRestart(restart) [10:56:27.180] muffled <- TRUE [10:56:27.180] break [10:56:27.180] } [10:56:27.180] } [10:56:27.180] } [10:56:27.180] invisible(muffled) [10:56:27.180] } [10:56:27.180] muffleCondition(cond, pattern = "^muffle") [10:56:27.180] } [10:56:27.180] } [10:56:27.180] } [10:56:27.180] })) [10:56:27.180] }, error = function(ex) { [10:56:27.180] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.180] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.180] ...future.rng), started = ...future.startTime, [10:56:27.180] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.180] version = "1.8"), class = "FutureResult") [10:56:27.180] }, finally = { [10:56:27.180] if (!identical(...future.workdir, getwd())) [10:56:27.180] setwd(...future.workdir) [10:56:27.180] { [10:56:27.180] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.180] ...future.oldOptions$nwarnings <- NULL [10:56:27.180] } [10:56:27.180] base::options(...future.oldOptions) [10:56:27.180] if (.Platform$OS.type == "windows") { [10:56:27.180] old_names <- names(...future.oldEnvVars) [10:56:27.180] envs <- base::Sys.getenv() [10:56:27.180] names <- names(envs) [10:56:27.180] common <- intersect(names, old_names) [10:56:27.180] added <- setdiff(names, old_names) [10:56:27.180] removed <- setdiff(old_names, names) [10:56:27.180] changed <- common[...future.oldEnvVars[common] != [10:56:27.180] envs[common]] [10:56:27.180] NAMES <- toupper(changed) [10:56:27.180] args <- list() [10:56:27.180] for (kk in seq_along(NAMES)) { [10:56:27.180] name <- changed[[kk]] [10:56:27.180] NAME <- NAMES[[kk]] [10:56:27.180] if (name != NAME && is.element(NAME, old_names)) [10:56:27.180] next [10:56:27.180] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.180] } [10:56:27.180] NAMES <- toupper(added) [10:56:27.180] for (kk in seq_along(NAMES)) { [10:56:27.180] name <- added[[kk]] [10:56:27.180] NAME <- NAMES[[kk]] [10:56:27.180] if (name != NAME && is.element(NAME, old_names)) [10:56:27.180] next [10:56:27.180] args[[name]] <- "" [10:56:27.180] } [10:56:27.180] NAMES <- toupper(removed) [10:56:27.180] for (kk in seq_along(NAMES)) { [10:56:27.180] name <- removed[[kk]] [10:56:27.180] NAME <- NAMES[[kk]] [10:56:27.180] if (name != NAME && is.element(NAME, old_names)) [10:56:27.180] next [10:56:27.180] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.180] } [10:56:27.180] if (length(args) > 0) [10:56:27.180] base::do.call(base::Sys.setenv, args = args) [10:56:27.180] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.180] } [10:56:27.180] else { [10:56:27.180] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.180] } [10:56:27.180] { [10:56:27.180] if (base::length(...future.futureOptionsAdded) > [10:56:27.180] 0L) { [10:56:27.180] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.180] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.180] base::options(opts) [10:56:27.180] } [10:56:27.180] { [10:56:27.180] NULL [10:56:27.180] options(future.plan = NULL) [10:56:27.180] if (is.na(NA_character_)) [10:56:27.180] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.180] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.180] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.180] .init = FALSE) [10:56:27.180] } [10:56:27.180] } [10:56:27.180] } [10:56:27.180] }) [10:56:27.180] if (TRUE) { [10:56:27.180] base::sink(type = "output", split = FALSE) [10:56:27.180] if (TRUE) { [10:56:27.180] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.180] } [10:56:27.180] else { [10:56:27.180] ...future.result["stdout"] <- base::list(NULL) [10:56:27.180] } [10:56:27.180] base::close(...future.stdout) [10:56:27.180] ...future.stdout <- NULL [10:56:27.180] } [10:56:27.180] ...future.result$conditions <- ...future.conditions [10:56:27.180] ...future.result$finished <- base::Sys.time() [10:56:27.180] ...future.result [10:56:27.180] } [10:56:27.184] - Launch lazy future ... done [10:56:27.184] run() for 'MiraiFuture' ... done [10:56:27.185] Created future: [10:56:27.187] resolved() for 'MiraiFuture' ... [10:56:27.187] - state: 'running' [10:56:27.187] - run: TRUE [10:56:27.187] - result: 'NULL' [10:56:27.187] - resolved: FALSE [10:56:27.188] resolved() for 'MiraiFuture' ... done [10:56:27.185] MiraiFuture: [10:56:27.185] Label: 'future_lapply-2' [10:56:27.185] Expression: [10:56:27.185] { [10:56:27.185] do.call(function(...) { [10:56:27.185] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.185] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.185] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.185] on.exit(options(oopts), add = TRUE) [10:56:27.185] } [10:56:27.185] { [10:56:27.185] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.185] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.185] ...future.FUN(...future.X_jj, ...) [10:56:27.185] }) [10:56:27.185] } [10:56:27.185] }, args = future.call.arguments) [10:56:27.185] } [10:56:27.185] Lazy evaluation: FALSE [10:56:27.185] Asynchronous evaluation: TRUE [10:56:27.185] Local evaluation: TRUE [10:56:27.185] Environment: R_GlobalEnv [10:56:27.185] Capture standard output: TRUE [10:56:27.185] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.185] 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) [10:56:27.185] Packages: [10:56:27.185] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.185] Resolved: TRUE [10:56:27.185] Value: [10:56:27.185] Conditions captured: [10:56:27.185] Early signaling: FALSE [10:56:27.185] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.185] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.188] Chunk #2 of 3 ... DONE [10:56:27.188] Chunk #3 of 3 ... [10:56:27.188] - Finding globals in 'X' for chunk #3 ... [10:56:27.189] getGlobalsAndPackages() ... [10:56:27.189] Searching for globals... [10:56:27.189] [10:56:27.189] Searching for globals ... DONE [10:56:27.189] - globals: [0] [10:56:27.189] getGlobalsAndPackages() ... DONE [10:56:27.190] + additional globals found: [n=0] [10:56:27.190] + additional namespaces needed: [n=0] [10:56:27.190] - Finding globals in 'X' for chunk #3 ... DONE [10:56:27.190] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [10:56:27.190] - seeds: [10:56:27.190] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.191] getGlobalsAndPackages() ... [10:56:27.191] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.191] Resolving globals: FALSE [10:56:27.191] Tweak future expression to call with '...' arguments ... [10:56:27.191] { [10:56:27.191] do.call(function(...) { [10:56:27.191] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.191] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.191] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.191] on.exit(options(oopts), add = TRUE) [10:56:27.191] } [10:56:27.191] { [10:56:27.191] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.191] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.191] ...future.FUN(...future.X_jj, ...) [10:56:27.191] }) [10:56:27.191] } [10:56:27.191] }, args = future.call.arguments) [10:56:27.191] } [10:56:27.192] Tweak future expression to call with '...' arguments ... DONE [10:56:27.192] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.192] [10:56:27.193] getGlobalsAndPackages() ... DONE [10:56:27.193] run() for 'Future' ... [10:56:27.193] - state: 'created' [10:56:27.193] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.196] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.196] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.196] - Field: 'label' [10:56:27.196] - Field: 'local' [10:56:27.196] - Field: 'owner' [10:56:27.197] - Field: 'envir' [10:56:27.197] - Field: 'packages' [10:56:27.197] - Field: 'gc' [10:56:27.197] - Field: 'conditions' [10:56:27.197] - Field: 'expr' [10:56:27.198] - Field: 'uuid' [10:56:27.198] - Field: 'seed' [10:56:27.198] - Field: 'version' [10:56:27.198] - Field: 'result' [10:56:27.198] - Field: 'asynchronous' [10:56:27.198] - Field: 'calls' [10:56:27.199] - Field: 'globals' [10:56:27.199] - Field: 'stdout' [10:56:27.199] - Field: 'earlySignal' [10:56:27.199] - Field: 'lazy' [10:56:27.199] - Field: 'state' [10:56:27.199] - Field: '.cluster' [10:56:27.200] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.200] - Launch lazy future ... [10:56:27.200] Packages needed by the future expression (n = 0): [10:56:27.200] Packages needed by future strategies (n = 0): [10:56:27.201] { [10:56:27.201] { [10:56:27.201] { [10:56:27.201] ...future.startTime <- base::Sys.time() [10:56:27.201] { [10:56:27.201] { [10:56:27.201] { [10:56:27.201] base::local({ [10:56:27.201] has_future <- base::requireNamespace("future", [10:56:27.201] quietly = TRUE) [10:56:27.201] if (has_future) { [10:56:27.201] ns <- base::getNamespace("future") [10:56:27.201] version <- ns[[".package"]][["version"]] [10:56:27.201] if (is.null(version)) [10:56:27.201] version <- utils::packageVersion("future") [10:56:27.201] } [10:56:27.201] else { [10:56:27.201] version <- NULL [10:56:27.201] } [10:56:27.201] if (!has_future || version < "1.8.0") { [10:56:27.201] info <- base::c(r_version = base::gsub("R version ", [10:56:27.201] "", base::R.version$version.string), [10:56:27.201] platform = base::sprintf("%s (%s-bit)", [10:56:27.201] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.201] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.201] "release", "version")], collapse = " "), [10:56:27.201] hostname = base::Sys.info()[["nodename"]]) [10:56:27.201] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.201] info) [10:56:27.201] info <- base::paste(info, collapse = "; ") [10:56:27.201] if (!has_future) { [10:56:27.201] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.201] info) [10:56:27.201] } [10:56:27.201] else { [10:56:27.201] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.201] info, version) [10:56:27.201] } [10:56:27.201] base::stop(msg) [10:56:27.201] } [10:56:27.201] }) [10:56:27.201] } [10:56:27.201] ...future.strategy.old <- future::plan("list") [10:56:27.201] options(future.plan = NULL) [10:56:27.201] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.201] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.201] } [10:56:27.201] ...future.workdir <- getwd() [10:56:27.201] } [10:56:27.201] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.201] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.201] } [10:56:27.201] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.201] future.globals.maxSize = 1572864000, future.globals.method = NULL, [10:56:27.201] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.201] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.201] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.201] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.201] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.201] base::names(...future.oldOptions)) [10:56:27.201] } [10:56:27.201] if (FALSE) { [10:56:27.201] } [10:56:27.201] else { [10:56:27.201] if (TRUE) { [10:56:27.201] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.201] open = "w") [10:56:27.201] } [10:56:27.201] else { [10:56:27.201] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.201] windows = "NUL", "/dev/null"), open = "w") [10:56:27.201] } [10:56:27.201] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.201] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.201] base::sink(type = "output", split = FALSE) [10:56:27.201] base::close(...future.stdout) [10:56:27.201] }, add = TRUE) [10:56:27.201] } [10:56:27.201] ...future.frame <- base::sys.nframe() [10:56:27.201] ...future.conditions <- base::list() [10:56:27.201] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.201] if (FALSE) { [10:56:27.201] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.201] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.201] } [10:56:27.201] ...future.result <- base::tryCatch({ [10:56:27.201] base::withCallingHandlers({ [10:56:27.201] ...future.value <- base::withVisible(base::local({ [10:56:27.201] do.call(function(...) { [10:56:27.201] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.201] if (!identical(...future.globals.maxSize.org, [10:56:27.201] ...future.globals.maxSize)) { [10:56:27.201] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.201] on.exit(options(oopts), add = TRUE) [10:56:27.201] } [10:56:27.201] { [10:56:27.201] lapply(seq_along(...future.elements_ii), [10:56:27.201] FUN = function(jj) { [10:56:27.201] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.201] ...future.FUN(...future.X_jj, ...) [10:56:27.201] }) [10:56:27.201] } [10:56:27.201] }, args = future.call.arguments) [10:56:27.201] })) [10:56:27.201] future::FutureResult(value = ...future.value$value, [10:56:27.201] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.201] ...future.rng), globalenv = if (FALSE) [10:56:27.201] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.201] ...future.globalenv.names)) [10:56:27.201] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.201] }, condition = base::local({ [10:56:27.201] c <- base::c [10:56:27.201] inherits <- base::inherits [10:56:27.201] invokeRestart <- base::invokeRestart [10:56:27.201] length <- base::length [10:56:27.201] list <- base::list [10:56:27.201] seq.int <- base::seq.int [10:56:27.201] signalCondition <- base::signalCondition [10:56:27.201] sys.calls <- base::sys.calls [10:56:27.201] `[[` <- base::`[[` [10:56:27.201] `+` <- base::`+` [10:56:27.201] `<<-` <- base::`<<-` [10:56:27.201] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.201] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.201] 3L)] [10:56:27.201] } [10:56:27.201] function(cond) { [10:56:27.201] is_error <- inherits(cond, "error") [10:56:27.201] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.201] NULL) [10:56:27.201] if (is_error) { [10:56:27.201] sessionInformation <- function() { [10:56:27.201] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.201] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.201] search = base::search(), system = base::Sys.info()) [10:56:27.201] } [10:56:27.201] ...future.conditions[[length(...future.conditions) + [10:56:27.201] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.201] cond$call), session = sessionInformation(), [10:56:27.201] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.201] signalCondition(cond) [10:56:27.201] } [10:56:27.201] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.201] signal <- FALSE && inherits(cond, character(0)) [10:56:27.201] ...future.conditions[[length(...future.conditions) + [10:56:27.201] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.201] if (FALSE && !signal) { [10:56:27.201] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.201] { [10:56:27.201] inherits <- base::inherits [10:56:27.201] invokeRestart <- base::invokeRestart [10:56:27.201] is.null <- base::is.null [10:56:27.201] muffled <- FALSE [10:56:27.201] if (inherits(cond, "message")) { [10:56:27.201] muffled <- grepl(pattern, "muffleMessage") [10:56:27.201] if (muffled) [10:56:27.201] invokeRestart("muffleMessage") [10:56:27.201] } [10:56:27.201] else if (inherits(cond, "warning")) { [10:56:27.201] muffled <- grepl(pattern, "muffleWarning") [10:56:27.201] if (muffled) [10:56:27.201] invokeRestart("muffleWarning") [10:56:27.201] } [10:56:27.201] else if (inherits(cond, "condition")) { [10:56:27.201] if (!is.null(pattern)) { [10:56:27.201] computeRestarts <- base::computeRestarts [10:56:27.201] grepl <- base::grepl [10:56:27.201] restarts <- computeRestarts(cond) [10:56:27.201] for (restart in restarts) { [10:56:27.201] name <- restart$name [10:56:27.201] if (is.null(name)) [10:56:27.201] next [10:56:27.201] if (!grepl(pattern, name)) [10:56:27.201] next [10:56:27.201] invokeRestart(restart) [10:56:27.201] muffled <- TRUE [10:56:27.201] break [10:56:27.201] } [10:56:27.201] } [10:56:27.201] } [10:56:27.201] invisible(muffled) [10:56:27.201] } [10:56:27.201] muffleCondition(cond, pattern = "^muffle") [10:56:27.201] } [10:56:27.201] } [10:56:27.201] else { [10:56:27.201] if (TRUE) { [10:56:27.201] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.201] { [10:56:27.201] inherits <- base::inherits [10:56:27.201] invokeRestart <- base::invokeRestart [10:56:27.201] is.null <- base::is.null [10:56:27.201] muffled <- FALSE [10:56:27.201] if (inherits(cond, "message")) { [10:56:27.201] muffled <- grepl(pattern, "muffleMessage") [10:56:27.201] if (muffled) [10:56:27.201] invokeRestart("muffleMessage") [10:56:27.201] } [10:56:27.201] else if (inherits(cond, "warning")) { [10:56:27.201] muffled <- grepl(pattern, "muffleWarning") [10:56:27.201] if (muffled) [10:56:27.201] invokeRestart("muffleWarning") [10:56:27.201] } [10:56:27.201] else if (inherits(cond, "condition")) { [10:56:27.201] if (!is.null(pattern)) { [10:56:27.201] computeRestarts <- base::computeRestarts [10:56:27.201] grepl <- base::grepl [10:56:27.201] restarts <- computeRestarts(cond) [10:56:27.201] for (restart in restarts) { [10:56:27.201] name <- restart$name [10:56:27.201] if (is.null(name)) [10:56:27.201] next [10:56:27.201] if (!grepl(pattern, name)) [10:56:27.201] next [10:56:27.201] invokeRestart(restart) [10:56:27.201] muffled <- TRUE [10:56:27.201] break [10:56:27.201] } [10:56:27.201] } [10:56:27.201] } [10:56:27.201] invisible(muffled) [10:56:27.201] } [10:56:27.201] muffleCondition(cond, pattern = "^muffle") [10:56:27.201] } [10:56:27.201] } [10:56:27.201] } [10:56:27.201] })) [10:56:27.201] }, error = function(ex) { [10:56:27.201] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.201] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.201] ...future.rng), started = ...future.startTime, [10:56:27.201] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.201] version = "1.8"), class = "FutureResult") [10:56:27.201] }, finally = { [10:56:27.201] if (!identical(...future.workdir, getwd())) [10:56:27.201] setwd(...future.workdir) [10:56:27.201] { [10:56:27.201] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.201] ...future.oldOptions$nwarnings <- NULL [10:56:27.201] } [10:56:27.201] base::options(...future.oldOptions) [10:56:27.201] if (.Platform$OS.type == "windows") { [10:56:27.201] old_names <- names(...future.oldEnvVars) [10:56:27.201] envs <- base::Sys.getenv() [10:56:27.201] names <- names(envs) [10:56:27.201] common <- intersect(names, old_names) [10:56:27.201] added <- setdiff(names, old_names) [10:56:27.201] removed <- setdiff(old_names, names) [10:56:27.201] changed <- common[...future.oldEnvVars[common] != [10:56:27.201] envs[common]] [10:56:27.201] NAMES <- toupper(changed) [10:56:27.201] args <- list() [10:56:27.201] for (kk in seq_along(NAMES)) { [10:56:27.201] name <- changed[[kk]] [10:56:27.201] NAME <- NAMES[[kk]] [10:56:27.201] if (name != NAME && is.element(NAME, old_names)) [10:56:27.201] next [10:56:27.201] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.201] } [10:56:27.201] NAMES <- toupper(added) [10:56:27.201] for (kk in seq_along(NAMES)) { [10:56:27.201] name <- added[[kk]] [10:56:27.201] NAME <- NAMES[[kk]] [10:56:27.201] if (name != NAME && is.element(NAME, old_names)) [10:56:27.201] next [10:56:27.201] args[[name]] <- "" [10:56:27.201] } [10:56:27.201] NAMES <- toupper(removed) [10:56:27.201] for (kk in seq_along(NAMES)) { [10:56:27.201] name <- removed[[kk]] [10:56:27.201] NAME <- NAMES[[kk]] [10:56:27.201] if (name != NAME && is.element(NAME, old_names)) [10:56:27.201] next [10:56:27.201] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.201] } [10:56:27.201] if (length(args) > 0) [10:56:27.201] base::do.call(base::Sys.setenv, args = args) [10:56:27.201] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.201] } [10:56:27.201] else { [10:56:27.201] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.201] } [10:56:27.201] { [10:56:27.201] if (base::length(...future.futureOptionsAdded) > [10:56:27.201] 0L) { [10:56:27.201] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.201] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.201] base::options(opts) [10:56:27.201] } [10:56:27.201] { [10:56:27.201] NULL [10:56:27.201] options(future.plan = NULL) [10:56:27.201] if (is.na(NA_character_)) [10:56:27.201] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.201] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.201] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.201] .init = FALSE) [10:56:27.201] } [10:56:27.201] } [10:56:27.201] } [10:56:27.201] }) [10:56:27.201] if (TRUE) { [10:56:27.201] base::sink(type = "output", split = FALSE) [10:56:27.201] if (TRUE) { [10:56:27.201] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.201] } [10:56:27.201] else { [10:56:27.201] ...future.result["stdout"] <- base::list(NULL) [10:56:27.201] } [10:56:27.201] base::close(...future.stdout) [10:56:27.201] ...future.stdout <- NULL [10:56:27.201] } [10:56:27.201] ...future.result$conditions <- ...future.conditions [10:56:27.201] ...future.result$finished <- base::Sys.time() [10:56:27.201] ...future.result [10:56:27.201] } [10:56:27.205] - Launch lazy future ... done [10:56:27.205] run() for 'MiraiFuture' ... done [10:56:27.205] Created future: [10:56:27.206] resolved() for 'MiraiFuture' ... [10:56:27.207] - state: 'running' [10:56:27.207] - run: TRUE [10:56:27.207] - result: 'NULL' [10:56:27.207] - resolved: FALSE [10:56:27.207] resolved() for 'MiraiFuture' ... done [10:56:27.205] MiraiFuture: [10:56:27.205] Label: 'future_lapply-3' [10:56:27.205] Expression: [10:56:27.205] { [10:56:27.205] do.call(function(...) { [10:56:27.205] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.205] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.205] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.205] on.exit(options(oopts), add = TRUE) [10:56:27.205] } [10:56:27.205] { [10:56:27.205] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.205] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.205] ...future.FUN(...future.X_jj, ...) [10:56:27.205] }) [10:56:27.205] } [10:56:27.205] }, args = future.call.arguments) [10:56:27.205] } [10:56:27.205] Lazy evaluation: FALSE [10:56:27.205] Asynchronous evaluation: TRUE [10:56:27.205] Local evaluation: TRUE [10:56:27.205] Environment: R_GlobalEnv [10:56:27.205] Capture standard output: TRUE [10:56:27.205] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.205] 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) [10:56:27.205] Packages: [10:56:27.205] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.205] Resolved: TRUE [10:56:27.205] Value: [10:56:27.205] Conditions captured: [10:56:27.205] Early signaling: FALSE [10:56:27.205] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.205] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.208] Chunk #3 of 3 ... DONE [10:56:27.208] Launching 3 futures (chunks) ... DONE [10:56:27.208] Resolving 3 futures (chunks) ... [10:56:27.208] resolve() on list ... [10:56:27.209] recursive: 0 [10:56:27.209] length: 3 [10:56:27.209] [10:56:27.209] resolved() for 'MiraiFuture' ... [10:56:27.209] - state: 'running' [10:56:27.209] - run: TRUE [10:56:27.210] - result: 'NULL' [10:56:27.210] - resolved: FALSE [10:56:27.210] resolved() for 'MiraiFuture' ... done [10:56:27.210] Future #1 [10:56:27.210] signalConditionsASAP(MiraiFuture, pos=1) ... [10:56:27.211] - nx: 3 [10:56:27.211] - relay: TRUE [10:56:27.211] - stdout: TRUE [10:56:27.211] - signal: TRUE [10:56:27.211] - resignal: FALSE [10:56:27.211] - force: TRUE [10:56:27.211] - relayed: [n=3] FALSE, FALSE, FALSE [10:56:27.212] - queued futures: [n=3] FALSE, FALSE, FALSE [10:56:27.212] - until=1 [10:56:27.212] - relaying element #1 [10:56:27.212] - relayed: [n=3] TRUE, FALSE, FALSE [10:56:27.212] - queued futures: [n=3] TRUE, FALSE, FALSE [10:56:27.213] signalConditionsASAP(MiraiFuture, pos=1) ... done [10:56:27.213] length: 2 (resolved future 1) [10:56:27.213] resolved() for 'MiraiFuture' ... [10:56:27.213] - state: 'running' [10:56:27.213] - run: TRUE [10:56:27.214] - result: 'NULL' [10:56:27.214] - resolved: FALSE [10:56:27.214] resolved() for 'MiraiFuture' ... done [10:56:27.214] Future #2 [10:56:27.214] signalConditionsASAP(MiraiFuture, pos=2) ... [10:56:27.214] - nx: 3 [10:56:27.215] - relay: TRUE [10:56:27.215] - stdout: TRUE [10:56:27.215] - signal: TRUE [10:56:27.215] - resignal: FALSE [10:56:27.215] - force: TRUE [10:56:27.215] - relayed: [n=3] TRUE, FALSE, FALSE [10:56:27.216] - queued futures: [n=3] TRUE, FALSE, FALSE [10:56:27.216] - until=2 [10:56:27.216] - relaying element #2 [10:56:27.216] - relayed: [n=3] TRUE, TRUE, FALSE [10:56:27.216] - queued futures: [n=3] TRUE, TRUE, FALSE [10:56:27.216] signalConditionsASAP(MiraiFuture, pos=2) ... done [10:56:27.218] length: 1 (resolved future 2) [10:56:27.218] resolved() for 'MiraiFuture' ... [10:56:27.218] - state: 'running' [10:56:27.218] - run: TRUE [10:56:27.218] - result: 'NULL' [10:56:27.219] - resolved: FALSE [10:56:27.219] resolved() for 'MiraiFuture' ... done [10:56:27.219] Future #3 [10:56:27.219] signalConditionsASAP(MiraiFuture, pos=3) ... [10:56:27.219] - nx: 3 [10:56:27.220] - relay: TRUE [10:56:27.220] - stdout: TRUE [10:56:27.220] - signal: TRUE [10:56:27.220] - resignal: FALSE [10:56:27.220] - force: TRUE [10:56:27.220] - relayed: [n=3] TRUE, TRUE, FALSE [10:56:27.220] - queued futures: [n=3] TRUE, TRUE, FALSE [10:56:27.221] - until=3 [10:56:27.221] - relaying element #3 [10:56:27.221] - relayed: [n=3] TRUE, TRUE, TRUE [10:56:27.221] - queued futures: [n=3] TRUE, TRUE, TRUE [10:56:27.221] signalConditionsASAP(MiraiFuture, pos=3) ... done [10:56:27.222] length: 0 (resolved future 3) [10:56:27.222] Relaying remaining futures [10:56:27.222] signalConditionsASAP(NULL, pos=0) ... [10:56:27.222] - nx: 3 [10:56:27.222] - relay: TRUE [10:56:27.222] - stdout: TRUE [10:56:27.222] - signal: TRUE [10:56:27.223] - resignal: FALSE [10:56:27.223] - force: TRUE [10:56:27.223] - relayed: [n=3] TRUE, TRUE, TRUE [10:56:27.223] - queued futures: [n=3] TRUE, TRUE, TRUE - flush all [10:56:27.223] - relayed: [n=3] TRUE, TRUE, TRUE [10:56:27.223] - queued futures: [n=3] TRUE, TRUE, TRUE [10:56:27.224] signalConditionsASAP(NULL, pos=0) ... done [10:56:27.224] resolve() on list ... DONE [10:56:27.224] - Number of value chunks collected: 3 [10:56:27.224] Resolving 3 futures (chunks) ... DONE [10:56:27.224] Reducing values from 3 chunks ... [10:56:27.225] - Number of values collected after concatenation: 3 [10:56:27.225] - Number of values expected: 3 [10:56:27.225] Reducing values from 3 chunks ... DONE [10:56:27.225] 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 [10:56:27.227] future_lapply() ... [10:56:27.228] Number of chunks: 2 [10:56:27.228] getGlobalsAndPackagesXApply() ... [10:56:27.229] - future.globals: TRUE [10:56:27.229] getGlobalsAndPackages() ... [10:56:27.229] Searching for globals... [10:56:27.230] - globals found: [2] 'FUN', '.Internal' [10:56:27.230] Searching for globals ... DONE [10:56:27.231] Resolving globals: FALSE [10:56:27.231] The total size of the 1 globals is 2.13 KiB (2184 bytes) [10:56:27.232] 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') [10:56:27.232] - globals: [1] 'FUN' [10:56:27.232] [10:56:27.232] getGlobalsAndPackages() ... DONE [10:56:27.232] - globals found/used: [n=1] 'FUN' [10:56:27.232] - needed namespaces: [n=0] [10:56:27.233] Finding globals ... DONE [10:56:27.233] - use_args: TRUE [10:56:27.233] - Getting '...' globals ... [10:56:27.233] resolve() on list ... [10:56:27.233] recursive: 0 [10:56:27.234] length: 1 [10:56:27.234] elements: '...' [10:56:27.234] length: 0 (resolved future 1) [10:56:27.234] resolve() on list ... DONE [10:56:27.234] - '...' content: [n=1] 'length' [10:56:27.234] List of 1 [10:56:27.234] $ ...:List of 1 [10:56:27.234] ..$ length: int 2 [10:56:27.234] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.234] - attr(*, "where")=List of 1 [10:56:27.234] ..$ ...: [10:56:27.234] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.234] - attr(*, "resolved")= logi TRUE [10:56:27.234] - attr(*, "total_size")= num NA [10:56:27.238] - Getting '...' globals ... DONE [10:56:27.238] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [10:56:27.238] List of 2 [10:56:27.238] $ ...future.FUN:function (mode = "logical", length = 0L) [10:56:27.238] $ ... :List of 1 [10:56:27.238] ..$ length: int 2 [10:56:27.238] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.238] - attr(*, "where")=List of 2 [10:56:27.238] ..$ ...future.FUN: [10:56:27.238] ..$ ... : [10:56:27.238] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.238] - attr(*, "resolved")= logi FALSE [10:56:27.238] - attr(*, "total_size")= num 2240 [10:56:27.243] Packages to be attached in all futures: [n=0] [10:56:27.243] getGlobalsAndPackagesXApply() ... DONE [10:56:27.243] Number of futures (= number of chunks): 2 [10:56:27.244] Launching 2 futures (chunks) ... [10:56:27.244] Chunk #1 of 2 ... [10:56:27.244] - Finding globals in 'X' for chunk #1 ... [10:56:27.244] getGlobalsAndPackages() ... [10:56:27.244] Searching for globals... [10:56:27.245] [10:56:27.245] Searching for globals ... DONE [10:56:27.245] - globals: [0] [10:56:27.245] getGlobalsAndPackages() ... DONE [10:56:27.245] + additional globals found: [n=0] [10:56:27.245] + additional namespaces needed: [n=0] [10:56:27.246] - Finding globals in 'X' for chunk #1 ... DONE [10:56:27.246] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [10:56:27.246] - seeds: [10:56:27.246] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.246] getGlobalsAndPackages() ... [10:56:27.246] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.247] Resolving globals: FALSE [10:56:27.247] Tweak future expression to call with '...' arguments ... [10:56:27.247] { [10:56:27.247] do.call(function(...) { [10:56:27.247] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.247] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.247] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.247] on.exit(options(oopts), add = TRUE) [10:56:27.247] } [10:56:27.247] { [10:56:27.247] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.247] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.247] ...future.FUN(...future.X_jj, ...) [10:56:27.247] }) [10:56:27.247] } [10:56:27.247] }, args = future.call.arguments) [10:56:27.247] } [10:56:27.247] Tweak future expression to call with '...' arguments ... DONE [10:56:27.248] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.248] [10:56:27.248] getGlobalsAndPackages() ... DONE [10:56:27.248] run() for 'Future' ... [10:56:27.249] - state: 'created' [10:56:27.249] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.251] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.251] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.252] - Field: 'label' [10:56:27.252] - Field: 'local' [10:56:27.252] - Field: 'owner' [10:56:27.252] - Field: 'envir' [10:56:27.252] - Field: 'packages' [10:56:27.252] - Field: 'gc' [10:56:27.253] - Field: 'conditions' [10:56:27.253] - Field: 'expr' [10:56:27.253] - Field: 'uuid' [10:56:27.253] - Field: 'seed' [10:56:27.253] - Field: 'version' [10:56:27.253] - Field: 'result' [10:56:27.254] - Field: 'asynchronous' [10:56:27.254] - Field: 'calls' [10:56:27.254] - Field: 'globals' [10:56:27.254] - Field: 'stdout' [10:56:27.254] - Field: 'earlySignal' [10:56:27.254] - Field: 'lazy' [10:56:27.255] - Field: 'state' [10:56:27.255] - Field: '.cluster' [10:56:27.255] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.255] - Launch lazy future ... [10:56:27.255] Packages needed by the future expression (n = 0): [10:56:27.255] Packages needed by future strategies (n = 0): [10:56:27.256] { [10:56:27.256] { [10:56:27.256] { [10:56:27.256] ...future.startTime <- base::Sys.time() [10:56:27.256] { [10:56:27.256] { [10:56:27.256] { [10:56:27.256] base::local({ [10:56:27.256] has_future <- base::requireNamespace("future", [10:56:27.256] quietly = TRUE) [10:56:27.256] if (has_future) { [10:56:27.256] ns <- base::getNamespace("future") [10:56:27.256] version <- ns[[".package"]][["version"]] [10:56:27.256] if (is.null(version)) [10:56:27.256] version <- utils::packageVersion("future") [10:56:27.256] } [10:56:27.256] else { [10:56:27.256] version <- NULL [10:56:27.256] } [10:56:27.256] if (!has_future || version < "1.8.0") { [10:56:27.256] info <- base::c(r_version = base::gsub("R version ", [10:56:27.256] "", base::R.version$version.string), [10:56:27.256] platform = base::sprintf("%s (%s-bit)", [10:56:27.256] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.256] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.256] "release", "version")], collapse = " "), [10:56:27.256] hostname = base::Sys.info()[["nodename"]]) [10:56:27.256] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.256] info) [10:56:27.256] info <- base::paste(info, collapse = "; ") [10:56:27.256] if (!has_future) { [10:56:27.256] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.256] info) [10:56:27.256] } [10:56:27.256] else { [10:56:27.256] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.256] info, version) [10:56:27.256] } [10:56:27.256] base::stop(msg) [10:56:27.256] } [10:56:27.256] }) [10:56:27.256] } [10:56:27.256] ...future.strategy.old <- future::plan("list") [10:56:27.256] options(future.plan = NULL) [10:56:27.256] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.256] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.256] } [10:56:27.256] ...future.workdir <- getwd() [10:56:27.256] } [10:56:27.256] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.256] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.256] } [10:56:27.256] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.256] future.globals.maxSize = 1048576000, future.globals.method = NULL, [10:56:27.256] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.256] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.256] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.256] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.256] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.256] base::names(...future.oldOptions)) [10:56:27.256] } [10:56:27.256] if (FALSE) { [10:56:27.256] } [10:56:27.256] else { [10:56:27.256] if (TRUE) { [10:56:27.256] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.256] open = "w") [10:56:27.256] } [10:56:27.256] else { [10:56:27.256] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.256] windows = "NUL", "/dev/null"), open = "w") [10:56:27.256] } [10:56:27.256] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.256] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.256] base::sink(type = "output", split = FALSE) [10:56:27.256] base::close(...future.stdout) [10:56:27.256] }, add = TRUE) [10:56:27.256] } [10:56:27.256] ...future.frame <- base::sys.nframe() [10:56:27.256] ...future.conditions <- base::list() [10:56:27.256] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.256] if (FALSE) { [10:56:27.256] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.256] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.256] } [10:56:27.256] ...future.result <- base::tryCatch({ [10:56:27.256] base::withCallingHandlers({ [10:56:27.256] ...future.value <- base::withVisible(base::local({ [10:56:27.256] do.call(function(...) { [10:56:27.256] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.256] if (!identical(...future.globals.maxSize.org, [10:56:27.256] ...future.globals.maxSize)) { [10:56:27.256] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.256] on.exit(options(oopts), add = TRUE) [10:56:27.256] } [10:56:27.256] { [10:56:27.256] lapply(seq_along(...future.elements_ii), [10:56:27.256] FUN = function(jj) { [10:56:27.256] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.256] ...future.FUN(...future.X_jj, ...) [10:56:27.256] }) [10:56:27.256] } [10:56:27.256] }, args = future.call.arguments) [10:56:27.256] })) [10:56:27.256] future::FutureResult(value = ...future.value$value, [10:56:27.256] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.256] ...future.rng), globalenv = if (FALSE) [10:56:27.256] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.256] ...future.globalenv.names)) [10:56:27.256] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.256] }, condition = base::local({ [10:56:27.256] c <- base::c [10:56:27.256] inherits <- base::inherits [10:56:27.256] invokeRestart <- base::invokeRestart [10:56:27.256] length <- base::length [10:56:27.256] list <- base::list [10:56:27.256] seq.int <- base::seq.int [10:56:27.256] signalCondition <- base::signalCondition [10:56:27.256] sys.calls <- base::sys.calls [10:56:27.256] `[[` <- base::`[[` [10:56:27.256] `+` <- base::`+` [10:56:27.256] `<<-` <- base::`<<-` [10:56:27.256] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.256] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.256] 3L)] [10:56:27.256] } [10:56:27.256] function(cond) { [10:56:27.256] is_error <- inherits(cond, "error") [10:56:27.256] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.256] NULL) [10:56:27.256] if (is_error) { [10:56:27.256] sessionInformation <- function() { [10:56:27.256] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.256] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.256] search = base::search(), system = base::Sys.info()) [10:56:27.256] } [10:56:27.256] ...future.conditions[[length(...future.conditions) + [10:56:27.256] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.256] cond$call), session = sessionInformation(), [10:56:27.256] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.256] signalCondition(cond) [10:56:27.256] } [10:56:27.256] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.256] signal <- FALSE && inherits(cond, character(0)) [10:56:27.256] ...future.conditions[[length(...future.conditions) + [10:56:27.256] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.256] if (FALSE && !signal) { [10:56:27.256] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.256] { [10:56:27.256] inherits <- base::inherits [10:56:27.256] invokeRestart <- base::invokeRestart [10:56:27.256] is.null <- base::is.null [10:56:27.256] muffled <- FALSE [10:56:27.256] if (inherits(cond, "message")) { [10:56:27.256] muffled <- grepl(pattern, "muffleMessage") [10:56:27.256] if (muffled) [10:56:27.256] invokeRestart("muffleMessage") [10:56:27.256] } [10:56:27.256] else if (inherits(cond, "warning")) { [10:56:27.256] muffled <- grepl(pattern, "muffleWarning") [10:56:27.256] if (muffled) [10:56:27.256] invokeRestart("muffleWarning") [10:56:27.256] } [10:56:27.256] else if (inherits(cond, "condition")) { [10:56:27.256] if (!is.null(pattern)) { [10:56:27.256] computeRestarts <- base::computeRestarts [10:56:27.256] grepl <- base::grepl [10:56:27.256] restarts <- computeRestarts(cond) [10:56:27.256] for (restart in restarts) { [10:56:27.256] name <- restart$name [10:56:27.256] if (is.null(name)) [10:56:27.256] next [10:56:27.256] if (!grepl(pattern, name)) [10:56:27.256] next [10:56:27.256] invokeRestart(restart) [10:56:27.256] muffled <- TRUE [10:56:27.256] break [10:56:27.256] } [10:56:27.256] } [10:56:27.256] } [10:56:27.256] invisible(muffled) [10:56:27.256] } [10:56:27.256] muffleCondition(cond, pattern = "^muffle") [10:56:27.256] } [10:56:27.256] } [10:56:27.256] else { [10:56:27.256] if (TRUE) { [10:56:27.256] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.256] { [10:56:27.256] inherits <- base::inherits [10:56:27.256] invokeRestart <- base::invokeRestart [10:56:27.256] is.null <- base::is.null [10:56:27.256] muffled <- FALSE [10:56:27.256] if (inherits(cond, "message")) { [10:56:27.256] muffled <- grepl(pattern, "muffleMessage") [10:56:27.256] if (muffled) [10:56:27.256] invokeRestart("muffleMessage") [10:56:27.256] } [10:56:27.256] else if (inherits(cond, "warning")) { [10:56:27.256] muffled <- grepl(pattern, "muffleWarning") [10:56:27.256] if (muffled) [10:56:27.256] invokeRestart("muffleWarning") [10:56:27.256] } [10:56:27.256] else if (inherits(cond, "condition")) { [10:56:27.256] if (!is.null(pattern)) { [10:56:27.256] computeRestarts <- base::computeRestarts [10:56:27.256] grepl <- base::grepl [10:56:27.256] restarts <- computeRestarts(cond) [10:56:27.256] for (restart in restarts) { [10:56:27.256] name <- restart$name [10:56:27.256] if (is.null(name)) [10:56:27.256] next [10:56:27.256] if (!grepl(pattern, name)) [10:56:27.256] next [10:56:27.256] invokeRestart(restart) [10:56:27.256] muffled <- TRUE [10:56:27.256] break [10:56:27.256] } [10:56:27.256] } [10:56:27.256] } [10:56:27.256] invisible(muffled) [10:56:27.256] } [10:56:27.256] muffleCondition(cond, pattern = "^muffle") [10:56:27.256] } [10:56:27.256] } [10:56:27.256] } [10:56:27.256] })) [10:56:27.256] }, error = function(ex) { [10:56:27.256] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.256] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.256] ...future.rng), started = ...future.startTime, [10:56:27.256] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.256] version = "1.8"), class = "FutureResult") [10:56:27.256] }, finally = { [10:56:27.256] if (!identical(...future.workdir, getwd())) [10:56:27.256] setwd(...future.workdir) [10:56:27.256] { [10:56:27.256] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.256] ...future.oldOptions$nwarnings <- NULL [10:56:27.256] } [10:56:27.256] base::options(...future.oldOptions) [10:56:27.256] if (.Platform$OS.type == "windows") { [10:56:27.256] old_names <- names(...future.oldEnvVars) [10:56:27.256] envs <- base::Sys.getenv() [10:56:27.256] names <- names(envs) [10:56:27.256] common <- intersect(names, old_names) [10:56:27.256] added <- setdiff(names, old_names) [10:56:27.256] removed <- setdiff(old_names, names) [10:56:27.256] changed <- common[...future.oldEnvVars[common] != [10:56:27.256] envs[common]] [10:56:27.256] NAMES <- toupper(changed) [10:56:27.256] args <- list() [10:56:27.256] for (kk in seq_along(NAMES)) { [10:56:27.256] name <- changed[[kk]] [10:56:27.256] NAME <- NAMES[[kk]] [10:56:27.256] if (name != NAME && is.element(NAME, old_names)) [10:56:27.256] next [10:56:27.256] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.256] } [10:56:27.256] NAMES <- toupper(added) [10:56:27.256] for (kk in seq_along(NAMES)) { [10:56:27.256] name <- added[[kk]] [10:56:27.256] NAME <- NAMES[[kk]] [10:56:27.256] if (name != NAME && is.element(NAME, old_names)) [10:56:27.256] next [10:56:27.256] args[[name]] <- "" [10:56:27.256] } [10:56:27.256] NAMES <- toupper(removed) [10:56:27.256] for (kk in seq_along(NAMES)) { [10:56:27.256] name <- removed[[kk]] [10:56:27.256] NAME <- NAMES[[kk]] [10:56:27.256] if (name != NAME && is.element(NAME, old_names)) [10:56:27.256] next [10:56:27.256] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.256] } [10:56:27.256] if (length(args) > 0) [10:56:27.256] base::do.call(base::Sys.setenv, args = args) [10:56:27.256] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.256] } [10:56:27.256] else { [10:56:27.256] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.256] } [10:56:27.256] { [10:56:27.256] if (base::length(...future.futureOptionsAdded) > [10:56:27.256] 0L) { [10:56:27.256] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.256] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.256] base::options(opts) [10:56:27.256] } [10:56:27.256] { [10:56:27.256] NULL [10:56:27.256] options(future.plan = NULL) [10:56:27.256] if (is.na(NA_character_)) [10:56:27.256] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.256] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.256] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.256] .init = FALSE) [10:56:27.256] } [10:56:27.256] } [10:56:27.256] } [10:56:27.256] }) [10:56:27.256] if (TRUE) { [10:56:27.256] base::sink(type = "output", split = FALSE) [10:56:27.256] if (TRUE) { [10:56:27.256] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.256] } [10:56:27.256] else { [10:56:27.256] ...future.result["stdout"] <- base::list(NULL) [10:56:27.256] } [10:56:27.256] base::close(...future.stdout) [10:56:27.256] ...future.stdout <- NULL [10:56:27.256] } [10:56:27.256] ...future.result$conditions <- ...future.conditions [10:56:27.256] ...future.result$finished <- base::Sys.time() [10:56:27.256] ...future.result [10:56:27.256] } [10:56:27.260] - Launch lazy future ... done [10:56:27.260] run() for 'MiraiFuture' ... done [10:56:27.260] Created future: [10:56:27.262] resolved() for 'MiraiFuture' ... [10:56:27.262] - state: 'running' [10:56:27.262] - run: TRUE [10:56:27.262] - result: 'NULL' [10:56:27.262] - resolved: FALSE [10:56:27.263] resolved() for 'MiraiFuture' ... done [10:56:27.261] MiraiFuture: [10:56:27.261] Label: 'future_lapply-1' [10:56:27.261] Expression: [10:56:27.261] { [10:56:27.261] do.call(function(...) { [10:56:27.261] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.261] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.261] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.261] on.exit(options(oopts), add = TRUE) [10:56:27.261] } [10:56:27.261] { [10:56:27.261] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.261] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.261] ...future.FUN(...future.X_jj, ...) [10:56:27.261] }) [10:56:27.261] } [10:56:27.261] }, args = future.call.arguments) [10:56:27.261] } [10:56:27.261] Lazy evaluation: FALSE [10:56:27.261] Asynchronous evaluation: TRUE [10:56:27.261] Local evaluation: TRUE [10:56:27.261] Environment: R_GlobalEnv [10:56:27.261] Capture standard output: TRUE [10:56:27.261] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.261] 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) [10:56:27.261] Packages: [10:56:27.261] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.261] Resolved: TRUE [10:56:27.261] Value: [10:56:27.261] Conditions captured: [10:56:27.261] Early signaling: FALSE [10:56:27.261] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.261] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.263] Chunk #1 of 2 ... DONE [10:56:27.263] Chunk #2 of 2 ... [10:56:27.263] - Finding globals in 'X' for chunk #2 ... [10:56:27.264] getGlobalsAndPackages() ... [10:56:27.264] Searching for globals... [10:56:27.264] [10:56:27.264] Searching for globals ... DONE [10:56:27.264] - globals: [0] [10:56:27.264] getGlobalsAndPackages() ... DONE [10:56:27.265] + additional globals found: [n=0] [10:56:27.265] + additional namespaces needed: [n=0] [10:56:27.265] - Finding globals in 'X' for chunk #2 ... DONE [10:56:27.265] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [10:56:27.265] - seeds: [10:56:27.265] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.266] getGlobalsAndPackages() ... [10:56:27.266] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.266] Resolving globals: FALSE [10:56:27.266] Tweak future expression to call with '...' arguments ... [10:56:27.266] { [10:56:27.266] do.call(function(...) { [10:56:27.266] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.266] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.266] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.266] on.exit(options(oopts), add = TRUE) [10:56:27.266] } [10:56:27.266] { [10:56:27.266] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.266] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.266] ...future.FUN(...future.X_jj, ...) [10:56:27.266] }) [10:56:27.266] } [10:56:27.266] }, args = future.call.arguments) [10:56:27.266] } [10:56:27.267] Tweak future expression to call with '...' arguments ... DONE [10:56:27.267] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.267] [10:56:27.268] getGlobalsAndPackages() ... DONE [10:56:27.268] run() for 'Future' ... [10:56:27.268] - state: 'created' [10:56:27.268] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.272] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.272] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.272] - Field: 'label' [10:56:27.272] - Field: 'local' [10:56:27.272] - Field: 'owner' [10:56:27.273] - Field: 'envir' [10:56:27.273] - Field: 'packages' [10:56:27.273] - Field: 'gc' [10:56:27.273] - Field: 'conditions' [10:56:27.273] - Field: 'expr' [10:56:27.273] - Field: 'uuid' [10:56:27.274] - Field: 'seed' [10:56:27.274] - Field: 'version' [10:56:27.274] - Field: 'result' [10:56:27.274] - Field: 'asynchronous' [10:56:27.274] - Field: 'calls' [10:56:27.275] - Field: 'globals' [10:56:27.275] - Field: 'stdout' [10:56:27.275] - Field: 'earlySignal' [10:56:27.275] - Field: 'lazy' [10:56:27.275] - Field: 'state' [10:56:27.275] - Field: '.cluster' [10:56:27.276] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.276] - Launch lazy future ... [10:56:27.276] Packages needed by the future expression (n = 0): [10:56:27.276] Packages needed by future strategies (n = 0): [10:56:27.277] { [10:56:27.277] { [10:56:27.277] { [10:56:27.277] ...future.startTime <- base::Sys.time() [10:56:27.277] { [10:56:27.277] { [10:56:27.277] { [10:56:27.277] base::local({ [10:56:27.277] has_future <- base::requireNamespace("future", [10:56:27.277] quietly = TRUE) [10:56:27.277] if (has_future) { [10:56:27.277] ns <- base::getNamespace("future") [10:56:27.277] version <- ns[[".package"]][["version"]] [10:56:27.277] if (is.null(version)) [10:56:27.277] version <- utils::packageVersion("future") [10:56:27.277] } [10:56:27.277] else { [10:56:27.277] version <- NULL [10:56:27.277] } [10:56:27.277] if (!has_future || version < "1.8.0") { [10:56:27.277] info <- base::c(r_version = base::gsub("R version ", [10:56:27.277] "", base::R.version$version.string), [10:56:27.277] platform = base::sprintf("%s (%s-bit)", [10:56:27.277] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.277] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.277] "release", "version")], collapse = " "), [10:56:27.277] hostname = base::Sys.info()[["nodename"]]) [10:56:27.277] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.277] info) [10:56:27.277] info <- base::paste(info, collapse = "; ") [10:56:27.277] if (!has_future) { [10:56:27.277] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.277] info) [10:56:27.277] } [10:56:27.277] else { [10:56:27.277] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.277] info, version) [10:56:27.277] } [10:56:27.277] base::stop(msg) [10:56:27.277] } [10:56:27.277] }) [10:56:27.277] } [10:56:27.277] ...future.strategy.old <- future::plan("list") [10:56:27.277] options(future.plan = NULL) [10:56:27.277] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.277] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.277] } [10:56:27.277] ...future.workdir <- getwd() [10:56:27.277] } [10:56:27.277] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.277] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.277] } [10:56:27.277] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.277] future.globals.maxSize = 1048576000, future.globals.method = NULL, [10:56:27.277] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.277] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.277] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.277] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.277] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.277] base::names(...future.oldOptions)) [10:56:27.277] } [10:56:27.277] if (FALSE) { [10:56:27.277] } [10:56:27.277] else { [10:56:27.277] if (TRUE) { [10:56:27.277] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.277] open = "w") [10:56:27.277] } [10:56:27.277] else { [10:56:27.277] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.277] windows = "NUL", "/dev/null"), open = "w") [10:56:27.277] } [10:56:27.277] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.277] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.277] base::sink(type = "output", split = FALSE) [10:56:27.277] base::close(...future.stdout) [10:56:27.277] }, add = TRUE) [10:56:27.277] } [10:56:27.277] ...future.frame <- base::sys.nframe() [10:56:27.277] ...future.conditions <- base::list() [10:56:27.277] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.277] if (FALSE) { [10:56:27.277] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.277] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.277] } [10:56:27.277] ...future.result <- base::tryCatch({ [10:56:27.277] base::withCallingHandlers({ [10:56:27.277] ...future.value <- base::withVisible(base::local({ [10:56:27.277] do.call(function(...) { [10:56:27.277] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.277] if (!identical(...future.globals.maxSize.org, [10:56:27.277] ...future.globals.maxSize)) { [10:56:27.277] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.277] on.exit(options(oopts), add = TRUE) [10:56:27.277] } [10:56:27.277] { [10:56:27.277] lapply(seq_along(...future.elements_ii), [10:56:27.277] FUN = function(jj) { [10:56:27.277] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.277] ...future.FUN(...future.X_jj, ...) [10:56:27.277] }) [10:56:27.277] } [10:56:27.277] }, args = future.call.arguments) [10:56:27.277] })) [10:56:27.277] future::FutureResult(value = ...future.value$value, [10:56:27.277] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.277] ...future.rng), globalenv = if (FALSE) [10:56:27.277] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.277] ...future.globalenv.names)) [10:56:27.277] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.277] }, condition = base::local({ [10:56:27.277] c <- base::c [10:56:27.277] inherits <- base::inherits [10:56:27.277] invokeRestart <- base::invokeRestart [10:56:27.277] length <- base::length [10:56:27.277] list <- base::list [10:56:27.277] seq.int <- base::seq.int [10:56:27.277] signalCondition <- base::signalCondition [10:56:27.277] sys.calls <- base::sys.calls [10:56:27.277] `[[` <- base::`[[` [10:56:27.277] `+` <- base::`+` [10:56:27.277] `<<-` <- base::`<<-` [10:56:27.277] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.277] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.277] 3L)] [10:56:27.277] } [10:56:27.277] function(cond) { [10:56:27.277] is_error <- inherits(cond, "error") [10:56:27.277] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.277] NULL) [10:56:27.277] if (is_error) { [10:56:27.277] sessionInformation <- function() { [10:56:27.277] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.277] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.277] search = base::search(), system = base::Sys.info()) [10:56:27.277] } [10:56:27.277] ...future.conditions[[length(...future.conditions) + [10:56:27.277] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.277] cond$call), session = sessionInformation(), [10:56:27.277] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.277] signalCondition(cond) [10:56:27.277] } [10:56:27.277] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.277] signal <- FALSE && inherits(cond, character(0)) [10:56:27.277] ...future.conditions[[length(...future.conditions) + [10:56:27.277] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.277] if (FALSE && !signal) { [10:56:27.277] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.277] { [10:56:27.277] inherits <- base::inherits [10:56:27.277] invokeRestart <- base::invokeRestart [10:56:27.277] is.null <- base::is.null [10:56:27.277] muffled <- FALSE [10:56:27.277] if (inherits(cond, "message")) { [10:56:27.277] muffled <- grepl(pattern, "muffleMessage") [10:56:27.277] if (muffled) [10:56:27.277] invokeRestart("muffleMessage") [10:56:27.277] } [10:56:27.277] else if (inherits(cond, "warning")) { [10:56:27.277] muffled <- grepl(pattern, "muffleWarning") [10:56:27.277] if (muffled) [10:56:27.277] invokeRestart("muffleWarning") [10:56:27.277] } [10:56:27.277] else if (inherits(cond, "condition")) { [10:56:27.277] if (!is.null(pattern)) { [10:56:27.277] computeRestarts <- base::computeRestarts [10:56:27.277] grepl <- base::grepl [10:56:27.277] restarts <- computeRestarts(cond) [10:56:27.277] for (restart in restarts) { [10:56:27.277] name <- restart$name [10:56:27.277] if (is.null(name)) [10:56:27.277] next [10:56:27.277] if (!grepl(pattern, name)) [10:56:27.277] next [10:56:27.277] invokeRestart(restart) [10:56:27.277] muffled <- TRUE [10:56:27.277] break [10:56:27.277] } [10:56:27.277] } [10:56:27.277] } [10:56:27.277] invisible(muffled) [10:56:27.277] } [10:56:27.277] muffleCondition(cond, pattern = "^muffle") [10:56:27.277] } [10:56:27.277] } [10:56:27.277] else { [10:56:27.277] if (TRUE) { [10:56:27.277] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.277] { [10:56:27.277] inherits <- base::inherits [10:56:27.277] invokeRestart <- base::invokeRestart [10:56:27.277] is.null <- base::is.null [10:56:27.277] muffled <- FALSE [10:56:27.277] if (inherits(cond, "message")) { [10:56:27.277] muffled <- grepl(pattern, "muffleMessage") [10:56:27.277] if (muffled) [10:56:27.277] invokeRestart("muffleMessage") [10:56:27.277] } [10:56:27.277] else if (inherits(cond, "warning")) { [10:56:27.277] muffled <- grepl(pattern, "muffleWarning") [10:56:27.277] if (muffled) [10:56:27.277] invokeRestart("muffleWarning") [10:56:27.277] } [10:56:27.277] else if (inherits(cond, "condition")) { [10:56:27.277] if (!is.null(pattern)) { [10:56:27.277] computeRestarts <- base::computeRestarts [10:56:27.277] grepl <- base::grepl [10:56:27.277] restarts <- computeRestarts(cond) [10:56:27.277] for (restart in restarts) { [10:56:27.277] name <- restart$name [10:56:27.277] if (is.null(name)) [10:56:27.277] next [10:56:27.277] if (!grepl(pattern, name)) [10:56:27.277] next [10:56:27.277] invokeRestart(restart) [10:56:27.277] muffled <- TRUE [10:56:27.277] break [10:56:27.277] } [10:56:27.277] } [10:56:27.277] } [10:56:27.277] invisible(muffled) [10:56:27.277] } [10:56:27.277] muffleCondition(cond, pattern = "^muffle") [10:56:27.277] } [10:56:27.277] } [10:56:27.277] } [10:56:27.277] })) [10:56:27.277] }, error = function(ex) { [10:56:27.277] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.277] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.277] ...future.rng), started = ...future.startTime, [10:56:27.277] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.277] version = "1.8"), class = "FutureResult") [10:56:27.277] }, finally = { [10:56:27.277] if (!identical(...future.workdir, getwd())) [10:56:27.277] setwd(...future.workdir) [10:56:27.277] { [10:56:27.277] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.277] ...future.oldOptions$nwarnings <- NULL [10:56:27.277] } [10:56:27.277] base::options(...future.oldOptions) [10:56:27.277] if (.Platform$OS.type == "windows") { [10:56:27.277] old_names <- names(...future.oldEnvVars) [10:56:27.277] envs <- base::Sys.getenv() [10:56:27.277] names <- names(envs) [10:56:27.277] common <- intersect(names, old_names) [10:56:27.277] added <- setdiff(names, old_names) [10:56:27.277] removed <- setdiff(old_names, names) [10:56:27.277] changed <- common[...future.oldEnvVars[common] != [10:56:27.277] envs[common]] [10:56:27.277] NAMES <- toupper(changed) [10:56:27.277] args <- list() [10:56:27.277] for (kk in seq_along(NAMES)) { [10:56:27.277] name <- changed[[kk]] [10:56:27.277] NAME <- NAMES[[kk]] [10:56:27.277] if (name != NAME && is.element(NAME, old_names)) [10:56:27.277] next [10:56:27.277] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.277] } [10:56:27.277] NAMES <- toupper(added) [10:56:27.277] for (kk in seq_along(NAMES)) { [10:56:27.277] name <- added[[kk]] [10:56:27.277] NAME <- NAMES[[kk]] [10:56:27.277] if (name != NAME && is.element(NAME, old_names)) [10:56:27.277] next [10:56:27.277] args[[name]] <- "" [10:56:27.277] } [10:56:27.277] NAMES <- toupper(removed) [10:56:27.277] for (kk in seq_along(NAMES)) { [10:56:27.277] name <- removed[[kk]] [10:56:27.277] NAME <- NAMES[[kk]] [10:56:27.277] if (name != NAME && is.element(NAME, old_names)) [10:56:27.277] next [10:56:27.277] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.277] } [10:56:27.277] if (length(args) > 0) [10:56:27.277] base::do.call(base::Sys.setenv, args = args) [10:56:27.277] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.277] } [10:56:27.277] else { [10:56:27.277] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.277] } [10:56:27.277] { [10:56:27.277] if (base::length(...future.futureOptionsAdded) > [10:56:27.277] 0L) { [10:56:27.277] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.277] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.277] base::options(opts) [10:56:27.277] } [10:56:27.277] { [10:56:27.277] NULL [10:56:27.277] options(future.plan = NULL) [10:56:27.277] if (is.na(NA_character_)) [10:56:27.277] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.277] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.277] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.277] .init = FALSE) [10:56:27.277] } [10:56:27.277] } [10:56:27.277] } [10:56:27.277] }) [10:56:27.277] if (TRUE) { [10:56:27.277] base::sink(type = "output", split = FALSE) [10:56:27.277] if (TRUE) { [10:56:27.277] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.277] } [10:56:27.277] else { [10:56:27.277] ...future.result["stdout"] <- base::list(NULL) [10:56:27.277] } [10:56:27.277] base::close(...future.stdout) [10:56:27.277] ...future.stdout <- NULL [10:56:27.277] } [10:56:27.277] ...future.result$conditions <- ...future.conditions [10:56:27.277] ...future.result$finished <- base::Sys.time() [10:56:27.277] ...future.result [10:56:27.277] } [10:56:27.281] - Launch lazy future ... done [10:56:27.281] run() for 'MiraiFuture' ... done [10:56:27.281] Created future: [10:56:27.282] resolved() for 'MiraiFuture' ... [10:56:27.283] - state: 'running' [10:56:27.283] - run: TRUE [10:56:27.283] - result: 'NULL' [10:56:27.283] - resolved: FALSE [10:56:27.283] resolved() for 'MiraiFuture' ... done [10:56:27.281] MiraiFuture: [10:56:27.281] Label: 'future_lapply-2' [10:56:27.281] Expression: [10:56:27.281] { [10:56:27.281] do.call(function(...) { [10:56:27.281] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.281] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.281] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.281] on.exit(options(oopts), add = TRUE) [10:56:27.281] } [10:56:27.281] { [10:56:27.281] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.281] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.281] ...future.FUN(...future.X_jj, ...) [10:56:27.281] }) [10:56:27.281] } [10:56:27.281] }, args = future.call.arguments) [10:56:27.281] } [10:56:27.281] Lazy evaluation: FALSE [10:56:27.281] Asynchronous evaluation: TRUE [10:56:27.281] Local evaluation: TRUE [10:56:27.281] Environment: R_GlobalEnv [10:56:27.281] Capture standard output: TRUE [10:56:27.281] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.281] 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) [10:56:27.281] Packages: [10:56:27.281] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.281] Resolved: TRUE [10:56:27.281] Value: [10:56:27.281] Conditions captured: [10:56:27.281] Early signaling: FALSE [10:56:27.281] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.281] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.284] Chunk #2 of 2 ... DONE [10:56:27.284] Launching 2 futures (chunks) ... DONE [10:56:27.284] Resolving 2 futures (chunks) ... [10:56:27.284] resolve() on list ... [10:56:27.285] recursive: 0 [10:56:27.285] length: 2 [10:56:27.285] [10:56:27.285] resolved() for 'MiraiFuture' ... [10:56:27.285] - state: 'running' [10:56:27.285] - run: TRUE [10:56:27.286] - result: 'NULL' [10:56:27.286] - resolved: FALSE [10:56:27.286] resolved() for 'MiraiFuture' ... done [10:56:27.286] Future #1 [10:56:27.286] signalConditionsASAP(MiraiFuture, pos=1) ... [10:56:27.287] - nx: 2 [10:56:27.287] - relay: TRUE [10:56:27.287] - stdout: TRUE [10:56:27.287] - signal: TRUE [10:56:27.287] - resignal: FALSE [10:56:27.287] - force: TRUE [10:56:27.288] - relayed: [n=2] FALSE, FALSE [10:56:27.288] - queued futures: [n=2] FALSE, FALSE [10:56:27.288] - until=1 [10:56:27.288] - relaying element #1 [10:56:27.288] - relayed: [n=2] TRUE, FALSE [10:56:27.288] - queued futures: [n=2] TRUE, FALSE [10:56:27.289] signalConditionsASAP(MiraiFuture, pos=1) ... done [10:56:27.289] length: 1 (resolved future 1) [10:56:27.289] resolved() for 'MiraiFuture' ... [10:56:27.290] - state: 'running' [10:56:27.290] - run: TRUE [10:56:27.290] - result: 'NULL' [10:56:27.291] - resolved: FALSE [10:56:27.291] resolved() for 'MiraiFuture' ... done [10:56:27.291] Future #2 [10:56:27.292] signalConditionsASAP(MiraiFuture, pos=2) ... [10:56:27.292] - nx: 2 [10:56:27.292] - relay: TRUE [10:56:27.292] - stdout: TRUE [10:56:27.292] - signal: TRUE [10:56:27.293] - resignal: FALSE [10:56:27.293] - force: TRUE [10:56:27.293] - relayed: [n=2] TRUE, FALSE [10:56:27.293] - queued futures: [n=2] TRUE, FALSE [10:56:27.294] - until=2 [10:56:27.294] - relaying element #2 [10:56:27.294] - relayed: [n=2] TRUE, TRUE [10:56:27.295] - queued futures: [n=2] TRUE, TRUE [10:56:27.295] signalConditionsASAP(MiraiFuture, pos=2) ... done [10:56:27.295] length: 0 (resolved future 2) [10:56:27.295] Relaying remaining futures [10:56:27.295] signalConditionsASAP(NULL, pos=0) ... [10:56:27.296] - nx: 2 [10:56:27.296] - relay: TRUE [10:56:27.296] - stdout: TRUE [10:56:27.296] - signal: TRUE [10:56:27.296] - resignal: FALSE [10:56:27.296] - force: TRUE [10:56:27.297] - relayed: [n=2] TRUE, TRUE [10:56:27.297] - queued futures: [n=2] TRUE, TRUE - flush all [10:56:27.297] - relayed: [n=2] TRUE, TRUE [10:56:27.298] - queued futures: [n=2] TRUE, TRUE [10:56:27.298] signalConditionsASAP(NULL, pos=0) ... done [10:56:27.298] resolve() on list ... DONE [10:56:27.299] - Number of value chunks collected: 2 [10:56:27.299] Resolving 2 futures (chunks) ... DONE [10:56:27.299] Reducing values from 2 chunks ... [10:56:27.299] - Number of values collected after concatenation: 3 [10:56:27.300] - Number of values expected: 3 [10:56:27.300] Reducing values from 2 chunks ... DONE [10:56:27.300] 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" [10:56:27.320] - plan('mirai_multisession') ...[10:56:27.321] plan(): Setting new future strategy stack: [10:56:27.321] List of future strategies: [10:56:27.321] 1. mirai_multisession: [10:56:27.321] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [10:56:27.321] - tweaked: FALSE [10:56:27.321] - call: plan(strategy) [10:56:27.322] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [10:56:27.323] < mirai | $data > [10:56:27.326] getGlobalsAndPackages() ... [10:56:27.327] Not searching for globals [10:56:27.327] - globals: [0] [10:56:27.327] getGlobalsAndPackages() ... DONE [10:56:27.327] getGlobalsAndPackages() ... [10:56:27.328] [10:56:27.328] - globals: [0] [10:56:27.328] getGlobalsAndPackages() ... DONE [10:56:27.329] Packages needed by the future expression (n = 0): [10:56:27.329] Packages needed by future strategies (n = 0): [10:56:27.330] { [10:56:27.330] { [10:56:27.330] { [10:56:27.330] ...future.startTime <- base::Sys.time() [10:56:27.330] { [10:56:27.330] { [10:56:27.330] { [10:56:27.330] base::local({ [10:56:27.330] has_future <- base::requireNamespace("future", [10:56:27.330] quietly = TRUE) [10:56:27.330] if (has_future) { [10:56:27.330] ns <- base::getNamespace("future") [10:56:27.330] version <- ns[[".package"]][["version"]] [10:56:27.330] if (is.null(version)) [10:56:27.330] version <- utils::packageVersion("future") [10:56:27.330] } [10:56:27.330] else { [10:56:27.330] version <- NULL [10:56:27.330] } [10:56:27.330] if (!has_future || version < "1.8.0") { [10:56:27.330] info <- base::c(r_version = base::gsub("R version ", [10:56:27.330] "", base::R.version$version.string), [10:56:27.330] platform = base::sprintf("%s (%s-bit)", [10:56:27.330] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.330] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.330] "release", "version")], collapse = " "), [10:56:27.330] hostname = base::Sys.info()[["nodename"]]) [10:56:27.330] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.330] info) [10:56:27.330] info <- base::paste(info, collapse = "; ") [10:56:27.330] if (!has_future) { [10:56:27.330] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.330] info) [10:56:27.330] } [10:56:27.330] else { [10:56:27.330] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.330] info, version) [10:56:27.330] } [10:56:27.330] base::stop(msg) [10:56:27.330] } [10:56:27.330] }) [10:56:27.330] } [10:56:27.330] ...future.strategy.old <- future::plan("list") [10:56:27.330] options(future.plan = NULL) [10:56:27.330] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.330] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.330] } [10:56:27.330] ...future.workdir <- getwd() [10:56:27.330] } [10:56:27.330] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.330] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.330] } [10:56:27.330] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.330] future.globals.maxSize = NULL, future.globals.method = NULL, [10:56:27.330] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.330] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.330] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.330] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.330] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.330] base::names(...future.oldOptions)) [10:56:27.330] } [10:56:27.330] if (FALSE) { [10:56:27.330] } [10:56:27.330] else { [10:56:27.330] if (TRUE) { [10:56:27.330] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.330] open = "w") [10:56:27.330] } [10:56:27.330] else { [10:56:27.330] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.330] windows = "NUL", "/dev/null"), open = "w") [10:56:27.330] } [10:56:27.330] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.330] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.330] base::sink(type = "output", split = FALSE) [10:56:27.330] base::close(...future.stdout) [10:56:27.330] }, add = TRUE) [10:56:27.330] } [10:56:27.330] ...future.frame <- base::sys.nframe() [10:56:27.330] ...future.conditions <- base::list() [10:56:27.330] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.330] if (FALSE) { [10:56:27.330] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.330] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.330] } [10:56:27.330] ...future.result <- base::tryCatch({ [10:56:27.330] base::withCallingHandlers({ [10:56:27.330] ...future.value <- base::withVisible(base::local(NA)) [10:56:27.330] future::FutureResult(value = ...future.value$value, [10:56:27.330] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.330] ...future.rng), globalenv = if (FALSE) [10:56:27.330] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.330] ...future.globalenv.names)) [10:56:27.330] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.330] }, condition = base::local({ [10:56:27.330] c <- base::c [10:56:27.330] inherits <- base::inherits [10:56:27.330] invokeRestart <- base::invokeRestart [10:56:27.330] length <- base::length [10:56:27.330] list <- base::list [10:56:27.330] seq.int <- base::seq.int [10:56:27.330] signalCondition <- base::signalCondition [10:56:27.330] sys.calls <- base::sys.calls [10:56:27.330] `[[` <- base::`[[` [10:56:27.330] `+` <- base::`+` [10:56:27.330] `<<-` <- base::`<<-` [10:56:27.330] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.330] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.330] 3L)] [10:56:27.330] } [10:56:27.330] function(cond) { [10:56:27.330] is_error <- inherits(cond, "error") [10:56:27.330] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.330] NULL) [10:56:27.330] if (is_error) { [10:56:27.330] sessionInformation <- function() { [10:56:27.330] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.330] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.330] search = base::search(), system = base::Sys.info()) [10:56:27.330] } [10:56:27.330] ...future.conditions[[length(...future.conditions) + [10:56:27.330] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.330] cond$call), session = sessionInformation(), [10:56:27.330] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.330] signalCondition(cond) [10:56:27.330] } [10:56:27.330] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.330] signal <- FALSE && inherits(cond, character(0)) [10:56:27.330] ...future.conditions[[length(...future.conditions) + [10:56:27.330] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.330] if (FALSE && !signal) { [10:56:27.330] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.330] { [10:56:27.330] inherits <- base::inherits [10:56:27.330] invokeRestart <- base::invokeRestart [10:56:27.330] is.null <- base::is.null [10:56:27.330] muffled <- FALSE [10:56:27.330] if (inherits(cond, "message")) { [10:56:27.330] muffled <- grepl(pattern, "muffleMessage") [10:56:27.330] if (muffled) [10:56:27.330] invokeRestart("muffleMessage") [10:56:27.330] } [10:56:27.330] else if (inherits(cond, "warning")) { [10:56:27.330] muffled <- grepl(pattern, "muffleWarning") [10:56:27.330] if (muffled) [10:56:27.330] invokeRestart("muffleWarning") [10:56:27.330] } [10:56:27.330] else if (inherits(cond, "condition")) { [10:56:27.330] if (!is.null(pattern)) { [10:56:27.330] computeRestarts <- base::computeRestarts [10:56:27.330] grepl <- base::grepl [10:56:27.330] restarts <- computeRestarts(cond) [10:56:27.330] for (restart in restarts) { [10:56:27.330] name <- restart$name [10:56:27.330] if (is.null(name)) [10:56:27.330] next [10:56:27.330] if (!grepl(pattern, name)) [10:56:27.330] next [10:56:27.330] invokeRestart(restart) [10:56:27.330] muffled <- TRUE [10:56:27.330] break [10:56:27.330] } [10:56:27.330] } [10:56:27.330] } [10:56:27.330] invisible(muffled) [10:56:27.330] } [10:56:27.330] muffleCondition(cond, pattern = "^muffle") [10:56:27.330] } [10:56:27.330] } [10:56:27.330] else { [10:56:27.330] if (TRUE) { [10:56:27.330] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.330] { [10:56:27.330] inherits <- base::inherits [10:56:27.330] invokeRestart <- base::invokeRestart [10:56:27.330] is.null <- base::is.null [10:56:27.330] muffled <- FALSE [10:56:27.330] if (inherits(cond, "message")) { [10:56:27.330] muffled <- grepl(pattern, "muffleMessage") [10:56:27.330] if (muffled) [10:56:27.330] invokeRestart("muffleMessage") [10:56:27.330] } [10:56:27.330] else if (inherits(cond, "warning")) { [10:56:27.330] muffled <- grepl(pattern, "muffleWarning") [10:56:27.330] if (muffled) [10:56:27.330] invokeRestart("muffleWarning") [10:56:27.330] } [10:56:27.330] else if (inherits(cond, "condition")) { [10:56:27.330] if (!is.null(pattern)) { [10:56:27.330] computeRestarts <- base::computeRestarts [10:56:27.330] grepl <- base::grepl [10:56:27.330] restarts <- computeRestarts(cond) [10:56:27.330] for (restart in restarts) { [10:56:27.330] name <- restart$name [10:56:27.330] if (is.null(name)) [10:56:27.330] next [10:56:27.330] if (!grepl(pattern, name)) [10:56:27.330] next [10:56:27.330] invokeRestart(restart) [10:56:27.330] muffled <- TRUE [10:56:27.330] break [10:56:27.330] } [10:56:27.330] } [10:56:27.330] } [10:56:27.330] invisible(muffled) [10:56:27.330] } [10:56:27.330] muffleCondition(cond, pattern = "^muffle") [10:56:27.330] } [10:56:27.330] } [10:56:27.330] } [10:56:27.330] })) [10:56:27.330] }, error = function(ex) { [10:56:27.330] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.330] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.330] ...future.rng), started = ...future.startTime, [10:56:27.330] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.330] version = "1.8"), class = "FutureResult") [10:56:27.330] }, finally = { [10:56:27.330] if (!identical(...future.workdir, getwd())) [10:56:27.330] setwd(...future.workdir) [10:56:27.330] { [10:56:27.330] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.330] ...future.oldOptions$nwarnings <- NULL [10:56:27.330] } [10:56:27.330] base::options(...future.oldOptions) [10:56:27.330] if (.Platform$OS.type == "windows") { [10:56:27.330] old_names <- names(...future.oldEnvVars) [10:56:27.330] envs <- base::Sys.getenv() [10:56:27.330] names <- names(envs) [10:56:27.330] common <- intersect(names, old_names) [10:56:27.330] added <- setdiff(names, old_names) [10:56:27.330] removed <- setdiff(old_names, names) [10:56:27.330] changed <- common[...future.oldEnvVars[common] != [10:56:27.330] envs[common]] [10:56:27.330] NAMES <- toupper(changed) [10:56:27.330] args <- list() [10:56:27.330] for (kk in seq_along(NAMES)) { [10:56:27.330] name <- changed[[kk]] [10:56:27.330] NAME <- NAMES[[kk]] [10:56:27.330] if (name != NAME && is.element(NAME, old_names)) [10:56:27.330] next [10:56:27.330] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.330] } [10:56:27.330] NAMES <- toupper(added) [10:56:27.330] for (kk in seq_along(NAMES)) { [10:56:27.330] name <- added[[kk]] [10:56:27.330] NAME <- NAMES[[kk]] [10:56:27.330] if (name != NAME && is.element(NAME, old_names)) [10:56:27.330] next [10:56:27.330] args[[name]] <- "" [10:56:27.330] } [10:56:27.330] NAMES <- toupper(removed) [10:56:27.330] for (kk in seq_along(NAMES)) { [10:56:27.330] name <- removed[[kk]] [10:56:27.330] NAME <- NAMES[[kk]] [10:56:27.330] if (name != NAME && is.element(NAME, old_names)) [10:56:27.330] next [10:56:27.330] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.330] } [10:56:27.330] if (length(args) > 0) [10:56:27.330] base::do.call(base::Sys.setenv, args = args) [10:56:27.330] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.330] } [10:56:27.330] else { [10:56:27.330] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.330] } [10:56:27.330] { [10:56:27.330] if (base::length(...future.futureOptionsAdded) > [10:56:27.330] 0L) { [10:56:27.330] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.330] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.330] base::options(opts) [10:56:27.330] } [10:56:27.330] { [10:56:27.330] NULL [10:56:27.330] options(future.plan = NULL) [10:56:27.330] if (is.na(NA_character_)) [10:56:27.330] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.330] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.330] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.330] .init = FALSE) [10:56:27.330] } [10:56:27.330] } [10:56:27.330] } [10:56:27.330] }) [10:56:27.330] if (TRUE) { [10:56:27.330] base::sink(type = "output", split = FALSE) [10:56:27.330] if (TRUE) { [10:56:27.330] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.330] } [10:56:27.330] else { [10:56:27.330] ...future.result["stdout"] <- base::list(NULL) [10:56:27.330] } [10:56:27.330] base::close(...future.stdout) [10:56:27.330] ...future.stdout <- NULL [10:56:27.330] } [10:56:27.330] ...future.result$conditions <- ...future.conditions [10:56:27.330] ...future.result$finished <- base::Sys.time() [10:56:27.330] ...future.result [10:56:27.330] } [10:56:27.338] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [10:56:27.339] plan(): nbrOfWorkers() = 2 [10:56:27.339] future_lapply() ... [10:56:27.361] Number of chunks: 1 [10:56:27.362] getGlobalsAndPackagesXApply() ... [10:56:27.362] - future.globals: TRUE [10:56:27.362] getGlobalsAndPackages() ... [10:56:27.363] Searching for globals... [10:56:27.380] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [10:56:27.380] Searching for globals ... DONE [10:56:27.380] Resolving globals: FALSE [10:56:27.382] The total size of the 1 globals is 69.62 KiB (71288 bytes) [10:56:27.383] 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') [10:56:27.383] - globals: [1] 'FUN' [10:56:27.383] - packages: [1] 'future' [10:56:27.384] getGlobalsAndPackages() ... DONE [10:56:27.384] - globals found/used: [n=1] 'FUN' [10:56:27.384] - needed namespaces: [n=1] 'future' [10:56:27.384] Finding globals ... DONE [10:56:27.388] - use_args: TRUE [10:56:27.388] - Getting '...' globals ... [10:56:27.388] resolve() on list ... [10:56:27.389] recursive: 0 [10:56:27.389] length: 1 [10:56:27.389] elements: '...' [10:56:27.390] length: 0 (resolved future 1) [10:56:27.390] resolve() on list ... DONE [10:56:27.390] - '...' content: [n=2] 'collapse', 'maxHead' [10:56:27.390] List of 1 [10:56:27.390] $ ...:List of 2 [10:56:27.390] ..$ collapse: chr "; " [10:56:27.390] ..$ maxHead : int 3 [10:56:27.390] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.390] - attr(*, "where")=List of 1 [10:56:27.390] ..$ ...: [10:56:27.390] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.390] - attr(*, "resolved")= logi TRUE [10:56:27.390] - attr(*, "total_size")= num NA [10:56:27.396] - Getting '...' globals ... DONE [10:56:27.397] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [10:56:27.397] List of 2 [10:56:27.397] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [10:56:27.397] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [10:56:27.397] $ ... :List of 2 [10:56:27.397] ..$ collapse: chr "; " [10:56:27.397] ..$ maxHead : int 3 [10:56:27.397] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.397] - attr(*, "where")=List of 2 [10:56:27.397] ..$ ...future.FUN: [10:56:27.397] ..$ ... : [10:56:27.397] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.397] - attr(*, "resolved")= logi FALSE [10:56:27.397] - attr(*, "total_size")= num 71456 [10:56:27.402] Packages to be attached in all futures: [n=1] 'future' [10:56:27.402] getGlobalsAndPackagesXApply() ... DONE [10:56:27.402] Number of futures (= number of chunks): 1 [10:56:27.403] Launching 1 futures (chunks) ... [10:56:27.403] Chunk #1 of 1 ... [10:56:27.403] - Finding globals in 'X' for chunk #1 ... [10:56:27.403] getGlobalsAndPackages() ... [10:56:27.404] Searching for globals... [10:56:27.404] [10:56:27.404] Searching for globals ... DONE [10:56:27.404] - globals: [0] [10:56:27.405] getGlobalsAndPackages() ... DONE [10:56:27.405] + additional globals found: [n=0] [10:56:27.405] + additional namespaces needed: [n=0] [10:56:27.405] - Finding globals in 'X' for chunk #1 ... DONE [10:56:27.405] - seeds: [10:56:27.405] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.406] getGlobalsAndPackages() ... [10:56:27.406] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.406] Resolving globals: FALSE [10:56:27.406] Tweak future expression to call with '...' arguments ... [10:56:27.406] { [10:56:27.406] do.call(function(...) { [10:56:27.406] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.406] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.406] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.406] on.exit(options(oopts), add = TRUE) [10:56:27.406] } [10:56:27.406] { [10:56:27.406] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.406] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.406] ...future.FUN(...future.X_jj, ...) [10:56:27.406] }) [10:56:27.406] } [10:56:27.406] }, args = future.call.arguments) [10:56:27.406] } [10:56:27.407] Tweak future expression to call with '...' arguments ... DONE [10:56:27.408] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.408] - packages: [1] 'future' [10:56:27.408] getGlobalsAndPackages() ... DONE [10:56:27.408] run() for 'Future' ... [10:56:27.409] - state: 'created' [10:56:27.409] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.412] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.412] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.412] - Field: 'label' [10:56:27.412] - Field: 'local' [10:56:27.413] - Field: 'owner' [10:56:27.413] - Field: 'envir' [10:56:27.413] - Field: 'packages' [10:56:27.413] - Field: 'gc' [10:56:27.413] - Field: 'conditions' [10:56:27.414] - Field: 'expr' [10:56:27.414] - Field: 'uuid' [10:56:27.414] - Field: 'seed' [10:56:27.414] - Field: 'version' [10:56:27.414] - Field: 'result' [10:56:27.415] - Field: 'asynchronous' [10:56:27.415] - Field: 'calls' [10:56:27.415] - Field: 'globals' [10:56:27.415] - Field: 'stdout' [10:56:27.415] - Field: 'earlySignal' [10:56:27.416] - Field: 'lazy' [10:56:27.416] - Field: 'state' [10:56:27.416] - Field: '.cluster' [10:56:27.416] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.416] - Launch lazy future ... [10:56:27.416] Packages needed by the future expression (n = 1): 'future' [10:56:27.417] Packages needed by future strategies (n = 0): [10:56:27.420] { [10:56:27.420] { [10:56:27.420] { [10:56:27.420] ...future.startTime <- base::Sys.time() [10:56:27.420] { [10:56:27.420] { [10:56:27.420] { [10:56:27.420] { [10:56:27.420] base::local({ [10:56:27.420] has_future <- base::requireNamespace("future", [10:56:27.420] quietly = TRUE) [10:56:27.420] if (has_future) { [10:56:27.420] ns <- base::getNamespace("future") [10:56:27.420] version <- ns[[".package"]][["version"]] [10:56:27.420] if (is.null(version)) [10:56:27.420] version <- utils::packageVersion("future") [10:56:27.420] } [10:56:27.420] else { [10:56:27.420] version <- NULL [10:56:27.420] } [10:56:27.420] if (!has_future || version < "1.8.0") { [10:56:27.420] info <- base::c(r_version = base::gsub("R version ", [10:56:27.420] "", base::R.version$version.string), [10:56:27.420] platform = base::sprintf("%s (%s-bit)", [10:56:27.420] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.420] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.420] "release", "version")], collapse = " "), [10:56:27.420] hostname = base::Sys.info()[["nodename"]]) [10:56:27.420] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.420] info) [10:56:27.420] info <- base::paste(info, collapse = "; ") [10:56:27.420] if (!has_future) { [10:56:27.420] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.420] info) [10:56:27.420] } [10:56:27.420] else { [10:56:27.420] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.420] info, version) [10:56:27.420] } [10:56:27.420] base::stop(msg) [10:56:27.420] } [10:56:27.420] }) [10:56:27.420] } [10:56:27.420] base::local({ [10:56:27.420] for (pkg in "future") { [10:56:27.420] base::loadNamespace(pkg) [10:56:27.420] base::library(pkg, character.only = TRUE) [10:56:27.420] } [10:56:27.420] }) [10:56:27.420] } [10:56:27.420] ...future.strategy.old <- future::plan("list") [10:56:27.420] options(future.plan = NULL) [10:56:27.420] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.420] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.420] } [10:56:27.420] ...future.workdir <- getwd() [10:56:27.420] } [10:56:27.420] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.420] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.420] } [10:56:27.420] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.420] future.globals.maxSize = NULL, future.globals.method = NULL, [10:56:27.420] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.420] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.420] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.420] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.420] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.420] base::names(...future.oldOptions)) [10:56:27.420] } [10:56:27.420] if (FALSE) { [10:56:27.420] } [10:56:27.420] else { [10:56:27.420] if (TRUE) { [10:56:27.420] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.420] open = "w") [10:56:27.420] } [10:56:27.420] else { [10:56:27.420] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.420] windows = "NUL", "/dev/null"), open = "w") [10:56:27.420] } [10:56:27.420] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.420] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.420] base::sink(type = "output", split = FALSE) [10:56:27.420] base::close(...future.stdout) [10:56:27.420] }, add = TRUE) [10:56:27.420] } [10:56:27.420] ...future.frame <- base::sys.nframe() [10:56:27.420] ...future.conditions <- base::list() [10:56:27.420] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.420] if (FALSE) { [10:56:27.420] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.420] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.420] } [10:56:27.420] ...future.result <- base::tryCatch({ [10:56:27.420] base::withCallingHandlers({ [10:56:27.420] ...future.value <- base::withVisible(base::local({ [10:56:27.420] do.call(function(...) { [10:56:27.420] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.420] if (!identical(...future.globals.maxSize.org, [10:56:27.420] ...future.globals.maxSize)) { [10:56:27.420] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.420] on.exit(options(oopts), add = TRUE) [10:56:27.420] } [10:56:27.420] { [10:56:27.420] lapply(seq_along(...future.elements_ii), [10:56:27.420] FUN = function(jj) { [10:56:27.420] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.420] ...future.FUN(...future.X_jj, ...) [10:56:27.420] }) [10:56:27.420] } [10:56:27.420] }, args = future.call.arguments) [10:56:27.420] })) [10:56:27.420] future::FutureResult(value = ...future.value$value, [10:56:27.420] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.420] ...future.rng), globalenv = if (FALSE) [10:56:27.420] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.420] ...future.globalenv.names)) [10:56:27.420] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.420] }, condition = base::local({ [10:56:27.420] c <- base::c [10:56:27.420] inherits <- base::inherits [10:56:27.420] invokeRestart <- base::invokeRestart [10:56:27.420] length <- base::length [10:56:27.420] list <- base::list [10:56:27.420] seq.int <- base::seq.int [10:56:27.420] signalCondition <- base::signalCondition [10:56:27.420] sys.calls <- base::sys.calls [10:56:27.420] `[[` <- base::`[[` [10:56:27.420] `+` <- base::`+` [10:56:27.420] `<<-` <- base::`<<-` [10:56:27.420] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.420] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.420] 3L)] [10:56:27.420] } [10:56:27.420] function(cond) { [10:56:27.420] is_error <- inherits(cond, "error") [10:56:27.420] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.420] NULL) [10:56:27.420] if (is_error) { [10:56:27.420] sessionInformation <- function() { [10:56:27.420] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.420] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.420] search = base::search(), system = base::Sys.info()) [10:56:27.420] } [10:56:27.420] ...future.conditions[[length(...future.conditions) + [10:56:27.420] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.420] cond$call), session = sessionInformation(), [10:56:27.420] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.420] signalCondition(cond) [10:56:27.420] } [10:56:27.420] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.420] signal <- FALSE && inherits(cond, character(0)) [10:56:27.420] ...future.conditions[[length(...future.conditions) + [10:56:27.420] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.420] if (FALSE && !signal) { [10:56:27.420] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.420] { [10:56:27.420] inherits <- base::inherits [10:56:27.420] invokeRestart <- base::invokeRestart [10:56:27.420] is.null <- base::is.null [10:56:27.420] muffled <- FALSE [10:56:27.420] if (inherits(cond, "message")) { [10:56:27.420] muffled <- grepl(pattern, "muffleMessage") [10:56:27.420] if (muffled) [10:56:27.420] invokeRestart("muffleMessage") [10:56:27.420] } [10:56:27.420] else if (inherits(cond, "warning")) { [10:56:27.420] muffled <- grepl(pattern, "muffleWarning") [10:56:27.420] if (muffled) [10:56:27.420] invokeRestart("muffleWarning") [10:56:27.420] } [10:56:27.420] else if (inherits(cond, "condition")) { [10:56:27.420] if (!is.null(pattern)) { [10:56:27.420] computeRestarts <- base::computeRestarts [10:56:27.420] grepl <- base::grepl [10:56:27.420] restarts <- computeRestarts(cond) [10:56:27.420] for (restart in restarts) { [10:56:27.420] name <- restart$name [10:56:27.420] if (is.null(name)) [10:56:27.420] next [10:56:27.420] if (!grepl(pattern, name)) [10:56:27.420] next [10:56:27.420] invokeRestart(restart) [10:56:27.420] muffled <- TRUE [10:56:27.420] break [10:56:27.420] } [10:56:27.420] } [10:56:27.420] } [10:56:27.420] invisible(muffled) [10:56:27.420] } [10:56:27.420] muffleCondition(cond, pattern = "^muffle") [10:56:27.420] } [10:56:27.420] } [10:56:27.420] else { [10:56:27.420] if (TRUE) { [10:56:27.420] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.420] { [10:56:27.420] inherits <- base::inherits [10:56:27.420] invokeRestart <- base::invokeRestart [10:56:27.420] is.null <- base::is.null [10:56:27.420] muffled <- FALSE [10:56:27.420] if (inherits(cond, "message")) { [10:56:27.420] muffled <- grepl(pattern, "muffleMessage") [10:56:27.420] if (muffled) [10:56:27.420] invokeRestart("muffleMessage") [10:56:27.420] } [10:56:27.420] else if (inherits(cond, "warning")) { [10:56:27.420] muffled <- grepl(pattern, "muffleWarning") [10:56:27.420] if (muffled) [10:56:27.420] invokeRestart("muffleWarning") [10:56:27.420] } [10:56:27.420] else if (inherits(cond, "condition")) { [10:56:27.420] if (!is.null(pattern)) { [10:56:27.420] computeRestarts <- base::computeRestarts [10:56:27.420] grepl <- base::grepl [10:56:27.420] restarts <- computeRestarts(cond) [10:56:27.420] for (restart in restarts) { [10:56:27.420] name <- restart$name [10:56:27.420] if (is.null(name)) [10:56:27.420] next [10:56:27.420] if (!grepl(pattern, name)) [10:56:27.420] next [10:56:27.420] invokeRestart(restart) [10:56:27.420] muffled <- TRUE [10:56:27.420] break [10:56:27.420] } [10:56:27.420] } [10:56:27.420] } [10:56:27.420] invisible(muffled) [10:56:27.420] } [10:56:27.420] muffleCondition(cond, pattern = "^muffle") [10:56:27.420] } [10:56:27.420] } [10:56:27.420] } [10:56:27.420] })) [10:56:27.420] }, error = function(ex) { [10:56:27.420] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.420] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.420] ...future.rng), started = ...future.startTime, [10:56:27.420] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.420] version = "1.8"), class = "FutureResult") [10:56:27.420] }, finally = { [10:56:27.420] if (!identical(...future.workdir, getwd())) [10:56:27.420] setwd(...future.workdir) [10:56:27.420] { [10:56:27.420] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.420] ...future.oldOptions$nwarnings <- NULL [10:56:27.420] } [10:56:27.420] base::options(...future.oldOptions) [10:56:27.420] if (.Platform$OS.type == "windows") { [10:56:27.420] old_names <- names(...future.oldEnvVars) [10:56:27.420] envs <- base::Sys.getenv() [10:56:27.420] names <- names(envs) [10:56:27.420] common <- intersect(names, old_names) [10:56:27.420] added <- setdiff(names, old_names) [10:56:27.420] removed <- setdiff(old_names, names) [10:56:27.420] changed <- common[...future.oldEnvVars[common] != [10:56:27.420] envs[common]] [10:56:27.420] NAMES <- toupper(changed) [10:56:27.420] args <- list() [10:56:27.420] for (kk in seq_along(NAMES)) { [10:56:27.420] name <- changed[[kk]] [10:56:27.420] NAME <- NAMES[[kk]] [10:56:27.420] if (name != NAME && is.element(NAME, old_names)) [10:56:27.420] next [10:56:27.420] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.420] } [10:56:27.420] NAMES <- toupper(added) [10:56:27.420] for (kk in seq_along(NAMES)) { [10:56:27.420] name <- added[[kk]] [10:56:27.420] NAME <- NAMES[[kk]] [10:56:27.420] if (name != NAME && is.element(NAME, old_names)) [10:56:27.420] next [10:56:27.420] args[[name]] <- "" [10:56:27.420] } [10:56:27.420] NAMES <- toupper(removed) [10:56:27.420] for (kk in seq_along(NAMES)) { [10:56:27.420] name <- removed[[kk]] [10:56:27.420] NAME <- NAMES[[kk]] [10:56:27.420] if (name != NAME && is.element(NAME, old_names)) [10:56:27.420] next [10:56:27.420] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.420] } [10:56:27.420] if (length(args) > 0) [10:56:27.420] base::do.call(base::Sys.setenv, args = args) [10:56:27.420] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.420] } [10:56:27.420] else { [10:56:27.420] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.420] } [10:56:27.420] { [10:56:27.420] if (base::length(...future.futureOptionsAdded) > [10:56:27.420] 0L) { [10:56:27.420] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.420] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.420] base::options(opts) [10:56:27.420] } [10:56:27.420] { [10:56:27.420] NULL [10:56:27.420] options(future.plan = NULL) [10:56:27.420] if (is.na(NA_character_)) [10:56:27.420] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.420] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.420] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.420] .init = FALSE) [10:56:27.420] } [10:56:27.420] } [10:56:27.420] } [10:56:27.420] }) [10:56:27.420] if (TRUE) { [10:56:27.420] base::sink(type = "output", split = FALSE) [10:56:27.420] if (TRUE) { [10:56:27.420] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.420] } [10:56:27.420] else { [10:56:27.420] ...future.result["stdout"] <- base::list(NULL) [10:56:27.420] } [10:56:27.420] base::close(...future.stdout) [10:56:27.420] ...future.stdout <- NULL [10:56:27.420] } [10:56:27.420] ...future.result$conditions <- ...future.conditions [10:56:27.420] ...future.result$finished <- base::Sys.time() [10:56:27.420] ...future.result [10:56:27.420] } [10:56:27.424] - Launch lazy future ... done [10:56:27.425] run() for 'MiraiFuture' ... done [10:56:27.425] Created future: [10:56:27.426] resolved() for 'MiraiFuture' ... [10:56:27.426] - state: 'running' [10:56:27.427] - run: TRUE [10:56:27.427] - result: 'NULL' [10:56:27.427] - resolved: FALSE [10:56:27.427] resolved() for 'MiraiFuture' ... done [10:56:27.425] MiraiFuture: [10:56:27.425] Label: 'future_lapply-1' [10:56:27.425] Expression: [10:56:27.425] { [10:56:27.425] do.call(function(...) { [10:56:27.425] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.425] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.425] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.425] on.exit(options(oopts), add = TRUE) [10:56:27.425] } [10:56:27.425] { [10:56:27.425] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.425] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.425] ...future.FUN(...future.X_jj, ...) [10:56:27.425] }) [10:56:27.425] } [10:56:27.425] }, args = future.call.arguments) [10:56:27.425] } [10:56:27.425] Lazy evaluation: FALSE [10:56:27.425] Asynchronous evaluation: TRUE [10:56:27.425] Local evaluation: TRUE [10:56:27.425] Environment: R_GlobalEnv [10:56:27.425] Capture standard output: TRUE [10:56:27.425] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.425] 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) [10:56:27.425] Packages: 1 packages ('future') [10:56:27.425] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.425] Resolved: FALSE [10:56:27.425] Value: [10:56:27.425] Conditions captured: [10:56:27.425] Early signaling: FALSE [10:56:27.425] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.425] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.428] Chunk #1 of 1 ... DONE [10:56:27.428] Launching 1 futures (chunks) ... DONE [10:56:27.428] Resolving 1 futures (chunks) ... [10:56:27.428] resolve() on list ... [10:56:27.428] recursive: 0 [10:56:27.429] length: 1 [10:56:27.429] [10:56:27.429] resolved() for 'MiraiFuture' ... [10:56:27.429] - state: 'running' [10:56:27.429] - run: TRUE [10:56:27.429] - result: 'NULL' [10:56:27.430] - resolved: FALSE [10:56:27.430] resolved() for 'MiraiFuture' ... done [10:56:27.446] resolved() for 'MiraiFuture' ... [10:56:27.446] - state: 'running' [10:56:27.446] - run: TRUE [10:56:27.446] - result: 'NULL' [10:56:27.446] - resolved: FALSE [10:56:27.447] resolved() for 'MiraiFuture' ... done [10:56:27.447] Future #1 [10:56:27.447] signalConditionsASAP(MiraiFuture, pos=1) ... [10:56:27.447] - nx: 1 [10:56:27.448] - relay: TRUE [10:56:27.448] - stdout: TRUE [10:56:27.448] - signal: TRUE [10:56:27.448] - resignal: FALSE [10:56:27.448] - force: TRUE [10:56:27.448] - relayed: [n=1] FALSE [10:56:27.448] - queued futures: [n=1] FALSE [10:56:27.449] - until=1 [10:56:27.449] - relaying element #1 [10:56:27.449] - relayed: [n=1] TRUE [10:56:27.449] - queued futures: [n=1] TRUE [10:56:27.449] signalConditionsASAP(MiraiFuture, pos=1) ... done [10:56:27.450] length: 0 (resolved future 1) [10:56:27.450] Relaying remaining futures [10:56:27.450] signalConditionsASAP(NULL, pos=0) ... [10:56:27.450] - nx: 1 [10:56:27.450] - relay: TRUE [10:56:27.450] - stdout: TRUE [10:56:27.451] - signal: TRUE [10:56:27.451] - resignal: FALSE [10:56:27.451] - force: TRUE [10:56:27.451] - relayed: [n=1] TRUE [10:56:27.451] - queued futures: [n=1] TRUE - flush all [10:56:27.452] - relayed: [n=1] TRUE [10:56:27.452] - queued futures: [n=1] TRUE [10:56:27.452] signalConditionsASAP(NULL, pos=0) ... done [10:56:27.452] resolve() on list ... DONE [10:56:27.452] - Number of value chunks collected: 1 [10:56:27.452] Resolving 1 futures (chunks) ... DONE [10:56:27.453] Reducing values from 1 chunks ... [10:56:27.453] - Number of values collected after concatenation: 1 [10:56:27.453] - Number of values expected: 1 [10:56:27.453] Reducing values from 1 chunks ... DONE [10:56:27.453] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" [10:56:27.454] future_lapply() ... [10:56:27.466] Number of chunks: 1 [10:56:27.466] getGlobalsAndPackagesXApply() ... [10:56:27.466] - future.globals: TRUE [10:56:27.466] getGlobalsAndPackages() ... [10:56:27.467] Searching for globals... [10:56:27.477] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [10:56:27.477] Searching for globals ... DONE [10:56:27.477] Resolving globals: FALSE [10:56:27.478] The total size of the 1 globals is 69.62 KiB (71288 bytes) [10:56:27.479] 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') [10:56:27.479] - globals: [1] 'FUN' [10:56:27.479] - packages: [1] 'future' [10:56:27.480] getGlobalsAndPackages() ... DONE [10:56:27.480] - globals found/used: [n=1] 'FUN' [10:56:27.480] - needed namespaces: [n=1] 'future' [10:56:27.480] Finding globals ... DONE [10:56:27.480] - use_args: TRUE [10:56:27.480] - Getting '...' globals ... [10:56:27.481] resolve() on list ... [10:56:27.481] recursive: 0 [10:56:27.481] length: 1 [10:56:27.481] elements: '...' [10:56:27.482] length: 0 (resolved future 1) [10:56:27.482] resolve() on list ... DONE [10:56:27.482] - '...' content: [n=2] 'collapse', 'maxHead' [10:56:27.482] List of 1 [10:56:27.482] $ ...:List of 2 [10:56:27.482] ..$ collapse: chr "; " [10:56:27.482] ..$ maxHead : int 3 [10:56:27.482] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.482] - attr(*, "where")=List of 1 [10:56:27.482] ..$ ...: [10:56:27.482] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.482] - attr(*, "resolved")= logi TRUE [10:56:27.482] - attr(*, "total_size")= num NA [10:56:27.488] - Getting '...' globals ... DONE [10:56:27.488] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [10:56:27.488] List of 2 [10:56:27.488] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [10:56:27.488] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [10:56:27.488] $ ... :List of 2 [10:56:27.488] ..$ collapse: chr "; " [10:56:27.488] ..$ maxHead : int 3 [10:56:27.488] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.488] - attr(*, "where")=List of 2 [10:56:27.488] ..$ ...future.FUN: [10:56:27.488] ..$ ... : [10:56:27.488] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.488] - attr(*, "resolved")= logi FALSE [10:56:27.488] - attr(*, "total_size")= num 71456 [10:56:27.492] Packages to be attached in all futures: [n=1] 'future' [10:56:27.492] getGlobalsAndPackagesXApply() ... DONE [10:56:27.493] Number of futures (= number of chunks): 1 [10:56:27.493] Launching 1 futures (chunks) ... [10:56:27.493] Chunk #1 of 1 ... [10:56:27.493] - Finding globals in 'X' for chunk #1 ... [10:56:27.494] getGlobalsAndPackages() ... [10:56:27.494] Searching for globals... [10:56:27.495] [10:56:27.495] Searching for globals ... DONE [10:56:27.495] - globals: [0] [10:56:27.495] getGlobalsAndPackages() ... DONE [10:56:27.496] + additional globals found: [n=0] [10:56:27.496] + additional namespaces needed: [n=0] [10:56:27.496] - Finding globals in 'X' for chunk #1 ... DONE [10:56:27.497] - seeds: [10:56:27.497] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.497] getGlobalsAndPackages() ... [10:56:27.497] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.497] Resolving globals: FALSE [10:56:27.498] Tweak future expression to call with '...' arguments ... [10:56:27.498] { [10:56:27.498] do.call(function(...) { [10:56:27.498] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.498] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.498] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.498] on.exit(options(oopts), add = TRUE) [10:56:27.498] } [10:56:27.498] { [10:56:27.498] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.498] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.498] ...future.FUN(...future.X_jj, ...) [10:56:27.498] }) [10:56:27.498] } [10:56:27.498] }, args = future.call.arguments) [10:56:27.498] } [10:56:27.498] Tweak future expression to call with '...' arguments ... DONE [10:56:27.499] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.499] - packages: [1] 'future' [10:56:27.499] getGlobalsAndPackages() ... DONE [10:56:27.500] run() for 'Future' ... [10:56:27.500] - state: 'created' [10:56:27.500] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.503] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.503] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.503] - Field: 'label' [10:56:27.503] - Field: 'local' [10:56:27.503] - Field: 'owner' [10:56:27.504] - Field: 'envir' [10:56:27.504] - Field: 'packages' [10:56:27.504] - Field: 'gc' [10:56:27.504] - Field: 'conditions' [10:56:27.504] - Field: 'expr' [10:56:27.504] - Field: 'uuid' [10:56:27.505] - Field: 'seed' [10:56:27.505] - Field: 'version' [10:56:27.505] - Field: 'result' [10:56:27.505] - Field: 'asynchronous' [10:56:27.505] - Field: 'calls' [10:56:27.505] - Field: 'globals' [10:56:27.506] - Field: 'stdout' [10:56:27.506] - Field: 'earlySignal' [10:56:27.506] - Field: 'lazy' [10:56:27.506] - Field: 'state' [10:56:27.506] - Field: '.cluster' [10:56:27.506] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.507] - Launch lazy future ... [10:56:27.507] Packages needed by the future expression (n = 1): 'future' [10:56:27.507] Packages needed by future strategies (n = 0): [10:56:27.508] { [10:56:27.508] { [10:56:27.508] { [10:56:27.508] ...future.startTime <- base::Sys.time() [10:56:27.508] { [10:56:27.508] { [10:56:27.508] { [10:56:27.508] { [10:56:27.508] base::local({ [10:56:27.508] has_future <- base::requireNamespace("future", [10:56:27.508] quietly = TRUE) [10:56:27.508] if (has_future) { [10:56:27.508] ns <- base::getNamespace("future") [10:56:27.508] version <- ns[[".package"]][["version"]] [10:56:27.508] if (is.null(version)) [10:56:27.508] version <- utils::packageVersion("future") [10:56:27.508] } [10:56:27.508] else { [10:56:27.508] version <- NULL [10:56:27.508] } [10:56:27.508] if (!has_future || version < "1.8.0") { [10:56:27.508] info <- base::c(r_version = base::gsub("R version ", [10:56:27.508] "", base::R.version$version.string), [10:56:27.508] platform = base::sprintf("%s (%s-bit)", [10:56:27.508] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.508] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.508] "release", "version")], collapse = " "), [10:56:27.508] hostname = base::Sys.info()[["nodename"]]) [10:56:27.508] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.508] info) [10:56:27.508] info <- base::paste(info, collapse = "; ") [10:56:27.508] if (!has_future) { [10:56:27.508] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.508] info) [10:56:27.508] } [10:56:27.508] else { [10:56:27.508] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.508] info, version) [10:56:27.508] } [10:56:27.508] base::stop(msg) [10:56:27.508] } [10:56:27.508] }) [10:56:27.508] } [10:56:27.508] base::local({ [10:56:27.508] for (pkg in "future") { [10:56:27.508] base::loadNamespace(pkg) [10:56:27.508] base::library(pkg, character.only = TRUE) [10:56:27.508] } [10:56:27.508] }) [10:56:27.508] } [10:56:27.508] ...future.strategy.old <- future::plan("list") [10:56:27.508] options(future.plan = NULL) [10:56:27.508] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.508] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.508] } [10:56:27.508] ...future.workdir <- getwd() [10:56:27.508] } [10:56:27.508] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.508] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.508] } [10:56:27.508] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.508] future.globals.maxSize = NULL, future.globals.method = NULL, [10:56:27.508] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.508] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.508] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.508] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.508] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.508] base::names(...future.oldOptions)) [10:56:27.508] } [10:56:27.508] if (FALSE) { [10:56:27.508] } [10:56:27.508] else { [10:56:27.508] if (TRUE) { [10:56:27.508] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.508] open = "w") [10:56:27.508] } [10:56:27.508] else { [10:56:27.508] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.508] windows = "NUL", "/dev/null"), open = "w") [10:56:27.508] } [10:56:27.508] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.508] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.508] base::sink(type = "output", split = FALSE) [10:56:27.508] base::close(...future.stdout) [10:56:27.508] }, add = TRUE) [10:56:27.508] } [10:56:27.508] ...future.frame <- base::sys.nframe() [10:56:27.508] ...future.conditions <- base::list() [10:56:27.508] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.508] if (FALSE) { [10:56:27.508] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.508] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.508] } [10:56:27.508] ...future.result <- base::tryCatch({ [10:56:27.508] base::withCallingHandlers({ [10:56:27.508] ...future.value <- base::withVisible(base::local({ [10:56:27.508] do.call(function(...) { [10:56:27.508] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.508] if (!identical(...future.globals.maxSize.org, [10:56:27.508] ...future.globals.maxSize)) { [10:56:27.508] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.508] on.exit(options(oopts), add = TRUE) [10:56:27.508] } [10:56:27.508] { [10:56:27.508] lapply(seq_along(...future.elements_ii), [10:56:27.508] FUN = function(jj) { [10:56:27.508] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.508] ...future.FUN(...future.X_jj, ...) [10:56:27.508] }) [10:56:27.508] } [10:56:27.508] }, args = future.call.arguments) [10:56:27.508] })) [10:56:27.508] future::FutureResult(value = ...future.value$value, [10:56:27.508] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.508] ...future.rng), globalenv = if (FALSE) [10:56:27.508] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.508] ...future.globalenv.names)) [10:56:27.508] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.508] }, condition = base::local({ [10:56:27.508] c <- base::c [10:56:27.508] inherits <- base::inherits [10:56:27.508] invokeRestart <- base::invokeRestart [10:56:27.508] length <- base::length [10:56:27.508] list <- base::list [10:56:27.508] seq.int <- base::seq.int [10:56:27.508] signalCondition <- base::signalCondition [10:56:27.508] sys.calls <- base::sys.calls [10:56:27.508] `[[` <- base::`[[` [10:56:27.508] `+` <- base::`+` [10:56:27.508] `<<-` <- base::`<<-` [10:56:27.508] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.508] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.508] 3L)] [10:56:27.508] } [10:56:27.508] function(cond) { [10:56:27.508] is_error <- inherits(cond, "error") [10:56:27.508] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.508] NULL) [10:56:27.508] if (is_error) { [10:56:27.508] sessionInformation <- function() { [10:56:27.508] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.508] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.508] search = base::search(), system = base::Sys.info()) [10:56:27.508] } [10:56:27.508] ...future.conditions[[length(...future.conditions) + [10:56:27.508] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.508] cond$call), session = sessionInformation(), [10:56:27.508] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.508] signalCondition(cond) [10:56:27.508] } [10:56:27.508] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.508] signal <- FALSE && inherits(cond, character(0)) [10:56:27.508] ...future.conditions[[length(...future.conditions) + [10:56:27.508] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.508] if (FALSE && !signal) { [10:56:27.508] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.508] { [10:56:27.508] inherits <- base::inherits [10:56:27.508] invokeRestart <- base::invokeRestart [10:56:27.508] is.null <- base::is.null [10:56:27.508] muffled <- FALSE [10:56:27.508] if (inherits(cond, "message")) { [10:56:27.508] muffled <- grepl(pattern, "muffleMessage") [10:56:27.508] if (muffled) [10:56:27.508] invokeRestart("muffleMessage") [10:56:27.508] } [10:56:27.508] else if (inherits(cond, "warning")) { [10:56:27.508] muffled <- grepl(pattern, "muffleWarning") [10:56:27.508] if (muffled) [10:56:27.508] invokeRestart("muffleWarning") [10:56:27.508] } [10:56:27.508] else if (inherits(cond, "condition")) { [10:56:27.508] if (!is.null(pattern)) { [10:56:27.508] computeRestarts <- base::computeRestarts [10:56:27.508] grepl <- base::grepl [10:56:27.508] restarts <- computeRestarts(cond) [10:56:27.508] for (restart in restarts) { [10:56:27.508] name <- restart$name [10:56:27.508] if (is.null(name)) [10:56:27.508] next [10:56:27.508] if (!grepl(pattern, name)) [10:56:27.508] next [10:56:27.508] invokeRestart(restart) [10:56:27.508] muffled <- TRUE [10:56:27.508] break [10:56:27.508] } [10:56:27.508] } [10:56:27.508] } [10:56:27.508] invisible(muffled) [10:56:27.508] } [10:56:27.508] muffleCondition(cond, pattern = "^muffle") [10:56:27.508] } [10:56:27.508] } [10:56:27.508] else { [10:56:27.508] if (TRUE) { [10:56:27.508] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.508] { [10:56:27.508] inherits <- base::inherits [10:56:27.508] invokeRestart <- base::invokeRestart [10:56:27.508] is.null <- base::is.null [10:56:27.508] muffled <- FALSE [10:56:27.508] if (inherits(cond, "message")) { [10:56:27.508] muffled <- grepl(pattern, "muffleMessage") [10:56:27.508] if (muffled) [10:56:27.508] invokeRestart("muffleMessage") [10:56:27.508] } [10:56:27.508] else if (inherits(cond, "warning")) { [10:56:27.508] muffled <- grepl(pattern, "muffleWarning") [10:56:27.508] if (muffled) [10:56:27.508] invokeRestart("muffleWarning") [10:56:27.508] } [10:56:27.508] else if (inherits(cond, "condition")) { [10:56:27.508] if (!is.null(pattern)) { [10:56:27.508] computeRestarts <- base::computeRestarts [10:56:27.508] grepl <- base::grepl [10:56:27.508] restarts <- computeRestarts(cond) [10:56:27.508] for (restart in restarts) { [10:56:27.508] name <- restart$name [10:56:27.508] if (is.null(name)) [10:56:27.508] next [10:56:27.508] if (!grepl(pattern, name)) [10:56:27.508] next [10:56:27.508] invokeRestart(restart) [10:56:27.508] muffled <- TRUE [10:56:27.508] break [10:56:27.508] } [10:56:27.508] } [10:56:27.508] } [10:56:27.508] invisible(muffled) [10:56:27.508] } [10:56:27.508] muffleCondition(cond, pattern = "^muffle") [10:56:27.508] } [10:56:27.508] } [10:56:27.508] } [10:56:27.508] })) [10:56:27.508] }, error = function(ex) { [10:56:27.508] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.508] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.508] ...future.rng), started = ...future.startTime, [10:56:27.508] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.508] version = "1.8"), class = "FutureResult") [10:56:27.508] }, finally = { [10:56:27.508] if (!identical(...future.workdir, getwd())) [10:56:27.508] setwd(...future.workdir) [10:56:27.508] { [10:56:27.508] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.508] ...future.oldOptions$nwarnings <- NULL [10:56:27.508] } [10:56:27.508] base::options(...future.oldOptions) [10:56:27.508] if (.Platform$OS.type == "windows") { [10:56:27.508] old_names <- names(...future.oldEnvVars) [10:56:27.508] envs <- base::Sys.getenv() [10:56:27.508] names <- names(envs) [10:56:27.508] common <- intersect(names, old_names) [10:56:27.508] added <- setdiff(names, old_names) [10:56:27.508] removed <- setdiff(old_names, names) [10:56:27.508] changed <- common[...future.oldEnvVars[common] != [10:56:27.508] envs[common]] [10:56:27.508] NAMES <- toupper(changed) [10:56:27.508] args <- list() [10:56:27.508] for (kk in seq_along(NAMES)) { [10:56:27.508] name <- changed[[kk]] [10:56:27.508] NAME <- NAMES[[kk]] [10:56:27.508] if (name != NAME && is.element(NAME, old_names)) [10:56:27.508] next [10:56:27.508] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.508] } [10:56:27.508] NAMES <- toupper(added) [10:56:27.508] for (kk in seq_along(NAMES)) { [10:56:27.508] name <- added[[kk]] [10:56:27.508] NAME <- NAMES[[kk]] [10:56:27.508] if (name != NAME && is.element(NAME, old_names)) [10:56:27.508] next [10:56:27.508] args[[name]] <- "" [10:56:27.508] } [10:56:27.508] NAMES <- toupper(removed) [10:56:27.508] for (kk in seq_along(NAMES)) { [10:56:27.508] name <- removed[[kk]] [10:56:27.508] NAME <- NAMES[[kk]] [10:56:27.508] if (name != NAME && is.element(NAME, old_names)) [10:56:27.508] next [10:56:27.508] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.508] } [10:56:27.508] if (length(args) > 0) [10:56:27.508] base::do.call(base::Sys.setenv, args = args) [10:56:27.508] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.508] } [10:56:27.508] else { [10:56:27.508] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.508] } [10:56:27.508] { [10:56:27.508] if (base::length(...future.futureOptionsAdded) > [10:56:27.508] 0L) { [10:56:27.508] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.508] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.508] base::options(opts) [10:56:27.508] } [10:56:27.508] { [10:56:27.508] NULL [10:56:27.508] options(future.plan = NULL) [10:56:27.508] if (is.na(NA_character_)) [10:56:27.508] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.508] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.508] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.508] .init = FALSE) [10:56:27.508] } [10:56:27.508] } [10:56:27.508] } [10:56:27.508] }) [10:56:27.508] if (TRUE) { [10:56:27.508] base::sink(type = "output", split = FALSE) [10:56:27.508] if (TRUE) { [10:56:27.508] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.508] } [10:56:27.508] else { [10:56:27.508] ...future.result["stdout"] <- base::list(NULL) [10:56:27.508] } [10:56:27.508] base::close(...future.stdout) [10:56:27.508] ...future.stdout <- NULL [10:56:27.508] } [10:56:27.508] ...future.result$conditions <- ...future.conditions [10:56:27.508] ...future.result$finished <- base::Sys.time() [10:56:27.508] ...future.result [10:56:27.508] } [10:56:27.513] - Launch lazy future ... done [10:56:27.513] run() for 'MiraiFuture' ... done [10:56:27.514] Created future: [10:56:27.515] resolved() for 'MiraiFuture' ... [10:56:27.515] - state: 'running' [10:56:27.515] - run: TRUE [10:56:27.516] - result: 'NULL' [10:56:27.516] - resolved: FALSE [10:56:27.516] resolved() for 'MiraiFuture' ... done [10:56:27.514] MiraiFuture: [10:56:27.514] Label: 'future_lapply-1' [10:56:27.514] Expression: [10:56:27.514] { [10:56:27.514] do.call(function(...) { [10:56:27.514] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.514] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.514] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.514] on.exit(options(oopts), add = TRUE) [10:56:27.514] } [10:56:27.514] { [10:56:27.514] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.514] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.514] ...future.FUN(...future.X_jj, ...) [10:56:27.514] }) [10:56:27.514] } [10:56:27.514] }, args = future.call.arguments) [10:56:27.514] } [10:56:27.514] Lazy evaluation: FALSE [10:56:27.514] Asynchronous evaluation: TRUE [10:56:27.514] Local evaluation: TRUE [10:56:27.514] Environment: R_GlobalEnv [10:56:27.514] Capture standard output: TRUE [10:56:27.514] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.514] 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) [10:56:27.514] Packages: 1 packages ('future') [10:56:27.514] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.514] Resolved: FALSE [10:56:27.514] Value: [10:56:27.514] Conditions captured: [10:56:27.514] Early signaling: FALSE [10:56:27.514] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.514] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.516] Chunk #1 of 1 ... DONE [10:56:27.517] Launching 1 futures (chunks) ... DONE [10:56:27.517] Resolving 1 futures (chunks) ... [10:56:27.517] resolve() on list ... [10:56:27.517] recursive: 0 [10:56:27.517] length: 1 [10:56:27.517] [10:56:27.518] resolved() for 'MiraiFuture' ... [10:56:27.518] - state: 'running' [10:56:27.518] - run: TRUE [10:56:27.518] - result: 'NULL' [10:56:27.518] - resolved: FALSE [10:56:27.554] resolved() for 'MiraiFuture' ... done [10:56:27.554] Future #1 [10:56:27.555] signalConditionsASAP(MiraiFuture, pos=1) ... [10:56:27.555] - nx: 1 [10:56:27.555] - relay: TRUE [10:56:27.555] - stdout: TRUE [10:56:27.555] - signal: TRUE [10:56:27.556] - resignal: FALSE [10:56:27.556] - force: TRUE [10:56:27.556] - relayed: [n=1] FALSE [10:56:27.556] - queued futures: [n=1] FALSE [10:56:27.556] - until=1 [10:56:27.557] - relaying element #1 [10:56:27.557] - relayed: [n=1] TRUE [10:56:27.557] - queued futures: [n=1] TRUE [10:56:27.557] signalConditionsASAP(MiraiFuture, pos=1) ... done [10:56:27.557] length: 0 (resolved future 1) [10:56:27.558] Relaying remaining futures [10:56:27.558] signalConditionsASAP(NULL, pos=0) ... [10:56:27.558] - nx: 1 [10:56:27.558] - relay: TRUE [10:56:27.558] - stdout: TRUE [10:56:27.558] - signal: TRUE [10:56:27.558] - resignal: FALSE [10:56:27.559] - force: TRUE [10:56:27.559] - relayed: [n=1] TRUE [10:56:27.559] - queued futures: [n=1] TRUE - flush all [10:56:27.559] - relayed: [n=1] TRUE [10:56:27.559] - queued futures: [n=1] TRUE [10:56:27.559] signalConditionsASAP(NULL, pos=0) ... done [10:56:27.560] resolve() on list ... DONE [10:56:27.560] - Number of value chunks collected: 1 [10:56:27.560] Resolving 1 futures (chunks) ... DONE [10:56:27.560] Reducing values from 1 chunks ... [10:56:27.560] - Number of values collected after concatenation: 1 [10:56:27.560] - Number of values expected: 1 [10:56:27.561] Reducing values from 1 chunks ... DONE [10:56:27.561] 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" [10:56:27.570] - plan('mirai_multisession') ...[10:56:27.570] plan(): Setting new future strategy stack: [10:56:27.571] List of future strategies: [10:56:27.571] 1. mirai_multisession: [10:56:27.571] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [10:56:27.571] - tweaked: FALSE [10:56:27.571] - call: plan(strategy) [10:56:27.571] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [10:56:27.571] < mirai | $data > [10:56:27.574] getGlobalsAndPackages() ... [10:56:27.574] Not searching for globals [10:56:27.574] - globals: [0] [10:56:27.574] getGlobalsAndPackages() ... DONE [10:56:27.574] getGlobalsAndPackages() ... [10:56:27.575] [10:56:27.575] - globals: [0] [10:56:27.575] getGlobalsAndPackages() ... DONE [10:56:27.575] Packages needed by the future expression (n = 0): [10:56:27.576] Packages needed by future strategies (n = 0): [10:56:27.576] { [10:56:27.576] { [10:56:27.576] { [10:56:27.576] ...future.startTime <- base::Sys.time() [10:56:27.576] { [10:56:27.576] { [10:56:27.576] { [10:56:27.576] base::local({ [10:56:27.576] has_future <- base::requireNamespace("future", [10:56:27.576] quietly = TRUE) [10:56:27.576] if (has_future) { [10:56:27.576] ns <- base::getNamespace("future") [10:56:27.576] version <- ns[[".package"]][["version"]] [10:56:27.576] if (is.null(version)) [10:56:27.576] version <- utils::packageVersion("future") [10:56:27.576] } [10:56:27.576] else { [10:56:27.576] version <- NULL [10:56:27.576] } [10:56:27.576] if (!has_future || version < "1.8.0") { [10:56:27.576] info <- base::c(r_version = base::gsub("R version ", [10:56:27.576] "", base::R.version$version.string), [10:56:27.576] platform = base::sprintf("%s (%s-bit)", [10:56:27.576] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.576] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.576] "release", "version")], collapse = " "), [10:56:27.576] hostname = base::Sys.info()[["nodename"]]) [10:56:27.576] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.576] info) [10:56:27.576] info <- base::paste(info, collapse = "; ") [10:56:27.576] if (!has_future) { [10:56:27.576] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.576] info) [10:56:27.576] } [10:56:27.576] else { [10:56:27.576] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.576] info, version) [10:56:27.576] } [10:56:27.576] base::stop(msg) [10:56:27.576] } [10:56:27.576] }) [10:56:27.576] } [10:56:27.576] ...future.strategy.old <- future::plan("list") [10:56:27.576] options(future.plan = NULL) [10:56:27.576] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.576] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.576] } [10:56:27.576] ...future.workdir <- getwd() [10:56:27.576] } [10:56:27.576] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.576] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.576] } [10:56:27.576] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.576] future.globals.maxSize = NULL, future.globals.method = NULL, [10:56:27.576] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.576] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.576] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.576] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.576] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.576] base::names(...future.oldOptions)) [10:56:27.576] } [10:56:27.576] if (FALSE) { [10:56:27.576] } [10:56:27.576] else { [10:56:27.576] if (TRUE) { [10:56:27.576] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.576] open = "w") [10:56:27.576] } [10:56:27.576] else { [10:56:27.576] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.576] windows = "NUL", "/dev/null"), open = "w") [10:56:27.576] } [10:56:27.576] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.576] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.576] base::sink(type = "output", split = FALSE) [10:56:27.576] base::close(...future.stdout) [10:56:27.576] }, add = TRUE) [10:56:27.576] } [10:56:27.576] ...future.frame <- base::sys.nframe() [10:56:27.576] ...future.conditions <- base::list() [10:56:27.576] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.576] if (FALSE) { [10:56:27.576] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.576] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.576] } [10:56:27.576] ...future.result <- base::tryCatch({ [10:56:27.576] base::withCallingHandlers({ [10:56:27.576] ...future.value <- base::withVisible(base::local(NA)) [10:56:27.576] future::FutureResult(value = ...future.value$value, [10:56:27.576] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.576] ...future.rng), globalenv = if (FALSE) [10:56:27.576] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.576] ...future.globalenv.names)) [10:56:27.576] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.576] }, condition = base::local({ [10:56:27.576] c <- base::c [10:56:27.576] inherits <- base::inherits [10:56:27.576] invokeRestart <- base::invokeRestart [10:56:27.576] length <- base::length [10:56:27.576] list <- base::list [10:56:27.576] seq.int <- base::seq.int [10:56:27.576] signalCondition <- base::signalCondition [10:56:27.576] sys.calls <- base::sys.calls [10:56:27.576] `[[` <- base::`[[` [10:56:27.576] `+` <- base::`+` [10:56:27.576] `<<-` <- base::`<<-` [10:56:27.576] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.576] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.576] 3L)] [10:56:27.576] } [10:56:27.576] function(cond) { [10:56:27.576] is_error <- inherits(cond, "error") [10:56:27.576] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.576] NULL) [10:56:27.576] if (is_error) { [10:56:27.576] sessionInformation <- function() { [10:56:27.576] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.576] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.576] search = base::search(), system = base::Sys.info()) [10:56:27.576] } [10:56:27.576] ...future.conditions[[length(...future.conditions) + [10:56:27.576] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.576] cond$call), session = sessionInformation(), [10:56:27.576] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.576] signalCondition(cond) [10:56:27.576] } [10:56:27.576] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.576] signal <- FALSE && inherits(cond, character(0)) [10:56:27.576] ...future.conditions[[length(...future.conditions) + [10:56:27.576] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.576] if (FALSE && !signal) { [10:56:27.576] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.576] { [10:56:27.576] inherits <- base::inherits [10:56:27.576] invokeRestart <- base::invokeRestart [10:56:27.576] is.null <- base::is.null [10:56:27.576] muffled <- FALSE [10:56:27.576] if (inherits(cond, "message")) { [10:56:27.576] muffled <- grepl(pattern, "muffleMessage") [10:56:27.576] if (muffled) [10:56:27.576] invokeRestart("muffleMessage") [10:56:27.576] } [10:56:27.576] else if (inherits(cond, "warning")) { [10:56:27.576] muffled <- grepl(pattern, "muffleWarning") [10:56:27.576] if (muffled) [10:56:27.576] invokeRestart("muffleWarning") [10:56:27.576] } [10:56:27.576] else if (inherits(cond, "condition")) { [10:56:27.576] if (!is.null(pattern)) { [10:56:27.576] computeRestarts <- base::computeRestarts [10:56:27.576] grepl <- base::grepl [10:56:27.576] restarts <- computeRestarts(cond) [10:56:27.576] for (restart in restarts) { [10:56:27.576] name <- restart$name [10:56:27.576] if (is.null(name)) [10:56:27.576] next [10:56:27.576] if (!grepl(pattern, name)) [10:56:27.576] next [10:56:27.576] invokeRestart(restart) [10:56:27.576] muffled <- TRUE [10:56:27.576] break [10:56:27.576] } [10:56:27.576] } [10:56:27.576] } [10:56:27.576] invisible(muffled) [10:56:27.576] } [10:56:27.576] muffleCondition(cond, pattern = "^muffle") [10:56:27.576] } [10:56:27.576] } [10:56:27.576] else { [10:56:27.576] if (TRUE) { [10:56:27.576] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.576] { [10:56:27.576] inherits <- base::inherits [10:56:27.576] invokeRestart <- base::invokeRestart [10:56:27.576] is.null <- base::is.null [10:56:27.576] muffled <- FALSE [10:56:27.576] if (inherits(cond, "message")) { [10:56:27.576] muffled <- grepl(pattern, "muffleMessage") [10:56:27.576] if (muffled) [10:56:27.576] invokeRestart("muffleMessage") [10:56:27.576] } [10:56:27.576] else if (inherits(cond, "warning")) { [10:56:27.576] muffled <- grepl(pattern, "muffleWarning") [10:56:27.576] if (muffled) [10:56:27.576] invokeRestart("muffleWarning") [10:56:27.576] } [10:56:27.576] else if (inherits(cond, "condition")) { [10:56:27.576] if (!is.null(pattern)) { [10:56:27.576] computeRestarts <- base::computeRestarts [10:56:27.576] grepl <- base::grepl [10:56:27.576] restarts <- computeRestarts(cond) [10:56:27.576] for (restart in restarts) { [10:56:27.576] name <- restart$name [10:56:27.576] if (is.null(name)) [10:56:27.576] next [10:56:27.576] if (!grepl(pattern, name)) [10:56:27.576] next [10:56:27.576] invokeRestart(restart) [10:56:27.576] muffled <- TRUE [10:56:27.576] break [10:56:27.576] } [10:56:27.576] } [10:56:27.576] } [10:56:27.576] invisible(muffled) [10:56:27.576] } [10:56:27.576] muffleCondition(cond, pattern = "^muffle") [10:56:27.576] } [10:56:27.576] } [10:56:27.576] } [10:56:27.576] })) [10:56:27.576] }, error = function(ex) { [10:56:27.576] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.576] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.576] ...future.rng), started = ...future.startTime, [10:56:27.576] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.576] version = "1.8"), class = "FutureResult") [10:56:27.576] }, finally = { [10:56:27.576] if (!identical(...future.workdir, getwd())) [10:56:27.576] setwd(...future.workdir) [10:56:27.576] { [10:56:27.576] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.576] ...future.oldOptions$nwarnings <- NULL [10:56:27.576] } [10:56:27.576] base::options(...future.oldOptions) [10:56:27.576] if (.Platform$OS.type == "windows") { [10:56:27.576] old_names <- names(...future.oldEnvVars) [10:56:27.576] envs <- base::Sys.getenv() [10:56:27.576] names <- names(envs) [10:56:27.576] common <- intersect(names, old_names) [10:56:27.576] added <- setdiff(names, old_names) [10:56:27.576] removed <- setdiff(old_names, names) [10:56:27.576] changed <- common[...future.oldEnvVars[common] != [10:56:27.576] envs[common]] [10:56:27.576] NAMES <- toupper(changed) [10:56:27.576] args <- list() [10:56:27.576] for (kk in seq_along(NAMES)) { [10:56:27.576] name <- changed[[kk]] [10:56:27.576] NAME <- NAMES[[kk]] [10:56:27.576] if (name != NAME && is.element(NAME, old_names)) [10:56:27.576] next [10:56:27.576] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.576] } [10:56:27.576] NAMES <- toupper(added) [10:56:27.576] for (kk in seq_along(NAMES)) { [10:56:27.576] name <- added[[kk]] [10:56:27.576] NAME <- NAMES[[kk]] [10:56:27.576] if (name != NAME && is.element(NAME, old_names)) [10:56:27.576] next [10:56:27.576] args[[name]] <- "" [10:56:27.576] } [10:56:27.576] NAMES <- toupper(removed) [10:56:27.576] for (kk in seq_along(NAMES)) { [10:56:27.576] name <- removed[[kk]] [10:56:27.576] NAME <- NAMES[[kk]] [10:56:27.576] if (name != NAME && is.element(NAME, old_names)) [10:56:27.576] next [10:56:27.576] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.576] } [10:56:27.576] if (length(args) > 0) [10:56:27.576] base::do.call(base::Sys.setenv, args = args) [10:56:27.576] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.576] } [10:56:27.576] else { [10:56:27.576] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.576] } [10:56:27.576] { [10:56:27.576] if (base::length(...future.futureOptionsAdded) > [10:56:27.576] 0L) { [10:56:27.576] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.576] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.576] base::options(opts) [10:56:27.576] } [10:56:27.576] { [10:56:27.576] NULL [10:56:27.576] options(future.plan = NULL) [10:56:27.576] if (is.na(NA_character_)) [10:56:27.576] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.576] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.576] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.576] .init = FALSE) [10:56:27.576] } [10:56:27.576] } [10:56:27.576] } [10:56:27.576] }) [10:56:27.576] if (TRUE) { [10:56:27.576] base::sink(type = "output", split = FALSE) [10:56:27.576] if (TRUE) { [10:56:27.576] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.576] } [10:56:27.576] else { [10:56:27.576] ...future.result["stdout"] <- base::list(NULL) [10:56:27.576] } [10:56:27.576] base::close(...future.stdout) [10:56:27.576] ...future.stdout <- NULL [10:56:27.576] } [10:56:27.576] ...future.result$conditions <- ...future.conditions [10:56:27.576] ...future.result$finished <- base::Sys.time() [10:56:27.576] ...future.result [10:56:27.576] } [10:56:27.605] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [10:56:27.605] plan(): nbrOfWorkers() = 2 [10:56:27.605] future_lapply() ... [10:56:27.606] Number of chunks: 2 [10:56:27.606] getGlobalsAndPackagesXApply() ... [10:56:27.607] - future.globals: TRUE [10:56:27.607] getGlobalsAndPackages() ... [10:56:27.607] Searching for globals... [10:56:27.609] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [10:56:27.609] Searching for globals ... DONE [10:56:27.609] Resolving globals: FALSE [10:56:27.609] The total size of the 1 globals is 4.85 KiB (4968 bytes) [10:56:27.610] 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') [10:56:27.610] - globals: [1] 'FUN' [10:56:27.610] - packages: [1] 'listenv' [10:56:27.611] getGlobalsAndPackages() ... DONE [10:56:27.611] - globals found/used: [n=1] 'FUN' [10:56:27.611] - needed namespaces: [n=1] 'listenv' [10:56:27.611] Finding globals ... DONE [10:56:27.611] - use_args: TRUE [10:56:27.611] - Getting '...' globals ... [10:56:27.612] resolve() on list ... [10:56:27.612] recursive: 0 [10:56:27.612] length: 1 [10:56:27.613] elements: '...' [10:56:27.613] length: 0 (resolved future 1) [10:56:27.613] resolve() on list ... DONE [10:56:27.613] - '...' content: [n=0] [10:56:27.613] List of 1 [10:56:27.613] $ ...: list() [10:56:27.613] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.613] - attr(*, "where")=List of 1 [10:56:27.613] ..$ ...: [10:56:27.613] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.613] - attr(*, "resolved")= logi TRUE [10:56:27.613] - attr(*, "total_size")= num NA [10:56:27.617] - Getting '...' globals ... DONE [10:56:27.617] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [10:56:27.617] List of 2 [10:56:27.617] $ ...future.FUN:function (x, ...) [10:56:27.617] $ ... : list() [10:56:27.617] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.617] - attr(*, "where")=List of 2 [10:56:27.617] ..$ ...future.FUN: [10:56:27.617] ..$ ... : [10:56:27.617] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.617] - attr(*, "resolved")= logi FALSE [10:56:27.617] - attr(*, "total_size")= num 4968 [10:56:27.621] Packages to be attached in all futures: [n=1] 'listenv' [10:56:27.622] getGlobalsAndPackagesXApply() ... DONE [10:56:27.622] Number of futures (= number of chunks): 2 [10:56:27.622] Launching 2 futures (chunks) ... [10:56:27.622] Chunk #1 of 2 ... [10:56:27.622] - Finding globals in 'X' for chunk #1 ... [10:56:27.623] getGlobalsAndPackages() ... [10:56:27.623] Searching for globals... [10:56:27.623] [10:56:27.624] Searching for globals ... DONE [10:56:27.624] - globals: [0] [10:56:27.624] getGlobalsAndPackages() ... DONE [10:56:27.624] + additional globals found: [n=0] [10:56:27.624] + additional namespaces needed: [n=0] [10:56:27.625] - Finding globals in 'X' for chunk #1 ... DONE [10:56:27.625] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [10:56:27.625] - seeds: [10:56:27.625] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.625] getGlobalsAndPackages() ... [10:56:27.625] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.626] Resolving globals: FALSE [10:56:27.626] Tweak future expression to call with '...' arguments ... [10:56:27.626] { [10:56:27.626] do.call(function(...) { [10:56:27.626] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.626] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.626] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.626] on.exit(options(oopts), add = TRUE) [10:56:27.626] } [10:56:27.626] { [10:56:27.626] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.626] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.626] ...future.FUN(...future.X_jj, ...) [10:56:27.626] }) [10:56:27.626] } [10:56:27.626] }, args = future.call.arguments) [10:56:27.626] } [10:56:27.627] Tweak future expression to call with '...' arguments ... DONE [10:56:27.627] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.627] - packages: [1] 'listenv' [10:56:27.628] getGlobalsAndPackages() ... DONE [10:56:27.628] run() for 'Future' ... [10:56:27.628] - state: 'created' [10:56:27.628] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.631] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.631] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.632] - Field: 'label' [10:56:27.632] - Field: 'local' [10:56:27.632] - Field: 'owner' [10:56:27.632] - Field: 'envir' [10:56:27.632] - Field: 'packages' [10:56:27.633] - Field: 'gc' [10:56:27.633] - Field: 'conditions' [10:56:27.633] - Field: 'expr' [10:56:27.633] - Field: 'uuid' [10:56:27.634] - Field: 'seed' [10:56:27.634] - Field: 'version' [10:56:27.634] - Field: 'result' [10:56:27.634] - Field: 'asynchronous' [10:56:27.634] - Field: 'calls' [10:56:27.635] - Field: 'globals' [10:56:27.635] - Field: 'stdout' [10:56:27.635] - Field: 'earlySignal' [10:56:27.635] - Field: 'lazy' [10:56:27.635] - Field: 'state' [10:56:27.636] - Field: '.cluster' [10:56:27.636] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.636] - Launch lazy future ... [10:56:27.636] Packages needed by the future expression (n = 1): 'listenv' [10:56:27.636] Packages needed by future strategies (n = 0): [10:56:27.637] { [10:56:27.637] { [10:56:27.637] { [10:56:27.637] ...future.startTime <- base::Sys.time() [10:56:27.637] { [10:56:27.637] { [10:56:27.637] { [10:56:27.637] { [10:56:27.637] base::local({ [10:56:27.637] has_future <- base::requireNamespace("future", [10:56:27.637] quietly = TRUE) [10:56:27.637] if (has_future) { [10:56:27.637] ns <- base::getNamespace("future") [10:56:27.637] version <- ns[[".package"]][["version"]] [10:56:27.637] if (is.null(version)) [10:56:27.637] version <- utils::packageVersion("future") [10:56:27.637] } [10:56:27.637] else { [10:56:27.637] version <- NULL [10:56:27.637] } [10:56:27.637] if (!has_future || version < "1.8.0") { [10:56:27.637] info <- base::c(r_version = base::gsub("R version ", [10:56:27.637] "", base::R.version$version.string), [10:56:27.637] platform = base::sprintf("%s (%s-bit)", [10:56:27.637] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.637] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.637] "release", "version")], collapse = " "), [10:56:27.637] hostname = base::Sys.info()[["nodename"]]) [10:56:27.637] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.637] info) [10:56:27.637] info <- base::paste(info, collapse = "; ") [10:56:27.637] if (!has_future) { [10:56:27.637] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.637] info) [10:56:27.637] } [10:56:27.637] else { [10:56:27.637] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.637] info, version) [10:56:27.637] } [10:56:27.637] base::stop(msg) [10:56:27.637] } [10:56:27.637] }) [10:56:27.637] } [10:56:27.637] base::local({ [10:56:27.637] for (pkg in "listenv") { [10:56:27.637] base::loadNamespace(pkg) [10:56:27.637] base::library(pkg, character.only = TRUE) [10:56:27.637] } [10:56:27.637] }) [10:56:27.637] } [10:56:27.637] ...future.strategy.old <- future::plan("list") [10:56:27.637] options(future.plan = NULL) [10:56:27.637] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.637] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.637] } [10:56:27.637] ...future.workdir <- getwd() [10:56:27.637] } [10:56:27.637] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.637] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.637] } [10:56:27.637] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.637] future.globals.maxSize = 1048576000, future.globals.method = NULL, [10:56:27.637] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.637] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.637] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.637] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.637] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.637] base::names(...future.oldOptions)) [10:56:27.637] } [10:56:27.637] if (FALSE) { [10:56:27.637] } [10:56:27.637] else { [10:56:27.637] if (TRUE) { [10:56:27.637] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.637] open = "w") [10:56:27.637] } [10:56:27.637] else { [10:56:27.637] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.637] windows = "NUL", "/dev/null"), open = "w") [10:56:27.637] } [10:56:27.637] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.637] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.637] base::sink(type = "output", split = FALSE) [10:56:27.637] base::close(...future.stdout) [10:56:27.637] }, add = TRUE) [10:56:27.637] } [10:56:27.637] ...future.frame <- base::sys.nframe() [10:56:27.637] ...future.conditions <- base::list() [10:56:27.637] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.637] if (FALSE) { [10:56:27.637] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.637] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.637] } [10:56:27.637] ...future.result <- base::tryCatch({ [10:56:27.637] base::withCallingHandlers({ [10:56:27.637] ...future.value <- base::withVisible(base::local({ [10:56:27.637] do.call(function(...) { [10:56:27.637] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.637] if (!identical(...future.globals.maxSize.org, [10:56:27.637] ...future.globals.maxSize)) { [10:56:27.637] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.637] on.exit(options(oopts), add = TRUE) [10:56:27.637] } [10:56:27.637] { [10:56:27.637] lapply(seq_along(...future.elements_ii), [10:56:27.637] FUN = function(jj) { [10:56:27.637] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.637] ...future.FUN(...future.X_jj, ...) [10:56:27.637] }) [10:56:27.637] } [10:56:27.637] }, args = future.call.arguments) [10:56:27.637] })) [10:56:27.637] future::FutureResult(value = ...future.value$value, [10:56:27.637] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.637] ...future.rng), globalenv = if (FALSE) [10:56:27.637] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.637] ...future.globalenv.names)) [10:56:27.637] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.637] }, condition = base::local({ [10:56:27.637] c <- base::c [10:56:27.637] inherits <- base::inherits [10:56:27.637] invokeRestart <- base::invokeRestart [10:56:27.637] length <- base::length [10:56:27.637] list <- base::list [10:56:27.637] seq.int <- base::seq.int [10:56:27.637] signalCondition <- base::signalCondition [10:56:27.637] sys.calls <- base::sys.calls [10:56:27.637] `[[` <- base::`[[` [10:56:27.637] `+` <- base::`+` [10:56:27.637] `<<-` <- base::`<<-` [10:56:27.637] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.637] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.637] 3L)] [10:56:27.637] } [10:56:27.637] function(cond) { [10:56:27.637] is_error <- inherits(cond, "error") [10:56:27.637] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.637] NULL) [10:56:27.637] if (is_error) { [10:56:27.637] sessionInformation <- function() { [10:56:27.637] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.637] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.637] search = base::search(), system = base::Sys.info()) [10:56:27.637] } [10:56:27.637] ...future.conditions[[length(...future.conditions) + [10:56:27.637] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.637] cond$call), session = sessionInformation(), [10:56:27.637] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.637] signalCondition(cond) [10:56:27.637] } [10:56:27.637] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.637] signal <- FALSE && inherits(cond, character(0)) [10:56:27.637] ...future.conditions[[length(...future.conditions) + [10:56:27.637] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.637] if (FALSE && !signal) { [10:56:27.637] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.637] { [10:56:27.637] inherits <- base::inherits [10:56:27.637] invokeRestart <- base::invokeRestart [10:56:27.637] is.null <- base::is.null [10:56:27.637] muffled <- FALSE [10:56:27.637] if (inherits(cond, "message")) { [10:56:27.637] muffled <- grepl(pattern, "muffleMessage") [10:56:27.637] if (muffled) [10:56:27.637] invokeRestart("muffleMessage") [10:56:27.637] } [10:56:27.637] else if (inherits(cond, "warning")) { [10:56:27.637] muffled <- grepl(pattern, "muffleWarning") [10:56:27.637] if (muffled) [10:56:27.637] invokeRestart("muffleWarning") [10:56:27.637] } [10:56:27.637] else if (inherits(cond, "condition")) { [10:56:27.637] if (!is.null(pattern)) { [10:56:27.637] computeRestarts <- base::computeRestarts [10:56:27.637] grepl <- base::grepl [10:56:27.637] restarts <- computeRestarts(cond) [10:56:27.637] for (restart in restarts) { [10:56:27.637] name <- restart$name [10:56:27.637] if (is.null(name)) [10:56:27.637] next [10:56:27.637] if (!grepl(pattern, name)) [10:56:27.637] next [10:56:27.637] invokeRestart(restart) [10:56:27.637] muffled <- TRUE [10:56:27.637] break [10:56:27.637] } [10:56:27.637] } [10:56:27.637] } [10:56:27.637] invisible(muffled) [10:56:27.637] } [10:56:27.637] muffleCondition(cond, pattern = "^muffle") [10:56:27.637] } [10:56:27.637] } [10:56:27.637] else { [10:56:27.637] if (TRUE) { [10:56:27.637] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.637] { [10:56:27.637] inherits <- base::inherits [10:56:27.637] invokeRestart <- base::invokeRestart [10:56:27.637] is.null <- base::is.null [10:56:27.637] muffled <- FALSE [10:56:27.637] if (inherits(cond, "message")) { [10:56:27.637] muffled <- grepl(pattern, "muffleMessage") [10:56:27.637] if (muffled) [10:56:27.637] invokeRestart("muffleMessage") [10:56:27.637] } [10:56:27.637] else if (inherits(cond, "warning")) { [10:56:27.637] muffled <- grepl(pattern, "muffleWarning") [10:56:27.637] if (muffled) [10:56:27.637] invokeRestart("muffleWarning") [10:56:27.637] } [10:56:27.637] else if (inherits(cond, "condition")) { [10:56:27.637] if (!is.null(pattern)) { [10:56:27.637] computeRestarts <- base::computeRestarts [10:56:27.637] grepl <- base::grepl [10:56:27.637] restarts <- computeRestarts(cond) [10:56:27.637] for (restart in restarts) { [10:56:27.637] name <- restart$name [10:56:27.637] if (is.null(name)) [10:56:27.637] next [10:56:27.637] if (!grepl(pattern, name)) [10:56:27.637] next [10:56:27.637] invokeRestart(restart) [10:56:27.637] muffled <- TRUE [10:56:27.637] break [10:56:27.637] } [10:56:27.637] } [10:56:27.637] } [10:56:27.637] invisible(muffled) [10:56:27.637] } [10:56:27.637] muffleCondition(cond, pattern = "^muffle") [10:56:27.637] } [10:56:27.637] } [10:56:27.637] } [10:56:27.637] })) [10:56:27.637] }, error = function(ex) { [10:56:27.637] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.637] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.637] ...future.rng), started = ...future.startTime, [10:56:27.637] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.637] version = "1.8"), class = "FutureResult") [10:56:27.637] }, finally = { [10:56:27.637] if (!identical(...future.workdir, getwd())) [10:56:27.637] setwd(...future.workdir) [10:56:27.637] { [10:56:27.637] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.637] ...future.oldOptions$nwarnings <- NULL [10:56:27.637] } [10:56:27.637] base::options(...future.oldOptions) [10:56:27.637] if (.Platform$OS.type == "windows") { [10:56:27.637] old_names <- names(...future.oldEnvVars) [10:56:27.637] envs <- base::Sys.getenv() [10:56:27.637] names <- names(envs) [10:56:27.637] common <- intersect(names, old_names) [10:56:27.637] added <- setdiff(names, old_names) [10:56:27.637] removed <- setdiff(old_names, names) [10:56:27.637] changed <- common[...future.oldEnvVars[common] != [10:56:27.637] envs[common]] [10:56:27.637] NAMES <- toupper(changed) [10:56:27.637] args <- list() [10:56:27.637] for (kk in seq_along(NAMES)) { [10:56:27.637] name <- changed[[kk]] [10:56:27.637] NAME <- NAMES[[kk]] [10:56:27.637] if (name != NAME && is.element(NAME, old_names)) [10:56:27.637] next [10:56:27.637] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.637] } [10:56:27.637] NAMES <- toupper(added) [10:56:27.637] for (kk in seq_along(NAMES)) { [10:56:27.637] name <- added[[kk]] [10:56:27.637] NAME <- NAMES[[kk]] [10:56:27.637] if (name != NAME && is.element(NAME, old_names)) [10:56:27.637] next [10:56:27.637] args[[name]] <- "" [10:56:27.637] } [10:56:27.637] NAMES <- toupper(removed) [10:56:27.637] for (kk in seq_along(NAMES)) { [10:56:27.637] name <- removed[[kk]] [10:56:27.637] NAME <- NAMES[[kk]] [10:56:27.637] if (name != NAME && is.element(NAME, old_names)) [10:56:27.637] next [10:56:27.637] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.637] } [10:56:27.637] if (length(args) > 0) [10:56:27.637] base::do.call(base::Sys.setenv, args = args) [10:56:27.637] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.637] } [10:56:27.637] else { [10:56:27.637] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.637] } [10:56:27.637] { [10:56:27.637] if (base::length(...future.futureOptionsAdded) > [10:56:27.637] 0L) { [10:56:27.637] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.637] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.637] base::options(opts) [10:56:27.637] } [10:56:27.637] { [10:56:27.637] NULL [10:56:27.637] options(future.plan = NULL) [10:56:27.637] if (is.na(NA_character_)) [10:56:27.637] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.637] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.637] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.637] .init = FALSE) [10:56:27.637] } [10:56:27.637] } [10:56:27.637] } [10:56:27.637] }) [10:56:27.637] if (TRUE) { [10:56:27.637] base::sink(type = "output", split = FALSE) [10:56:27.637] if (TRUE) { [10:56:27.637] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.637] } [10:56:27.637] else { [10:56:27.637] ...future.result["stdout"] <- base::list(NULL) [10:56:27.637] } [10:56:27.637] base::close(...future.stdout) [10:56:27.637] ...future.stdout <- NULL [10:56:27.637] } [10:56:27.637] ...future.result$conditions <- ...future.conditions [10:56:27.637] ...future.result$finished <- base::Sys.time() [10:56:27.637] ...future.result [10:56:27.637] } [10:56:27.642] - Launch lazy future ... done [10:56:27.642] run() for 'MiraiFuture' ... done [10:56:27.642] Created future: [10:56:27.644] resolved() for 'MiraiFuture' ... [10:56:27.644] - state: 'running' [10:56:27.644] - run: TRUE [10:56:27.644] - result: 'NULL' [10:56:27.644] - resolved: FALSE [10:56:27.645] resolved() for 'MiraiFuture' ... done [10:56:27.642] MiraiFuture: [10:56:27.642] Label: 'future_lapply-1' [10:56:27.642] Expression: [10:56:27.642] { [10:56:27.642] do.call(function(...) { [10:56:27.642] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.642] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.642] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.642] on.exit(options(oopts), add = TRUE) [10:56:27.642] } [10:56:27.642] { [10:56:27.642] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.642] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.642] ...future.FUN(...future.X_jj, ...) [10:56:27.642] }) [10:56:27.642] } [10:56:27.642] }, args = future.call.arguments) [10:56:27.642] } [10:56:27.642] Lazy evaluation: FALSE [10:56:27.642] Asynchronous evaluation: TRUE [10:56:27.642] Local evaluation: TRUE [10:56:27.642] Environment: R_GlobalEnv [10:56:27.642] Capture standard output: TRUE [10:56:27.642] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.642] 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) [10:56:27.642] Packages: 1 packages ('listenv') [10:56:27.642] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.642] Resolved: FALSE [10:56:27.642] Value: [10:56:27.642] Conditions captured: [10:56:27.642] Early signaling: FALSE [10:56:27.642] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.642] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.645] Chunk #1 of 2 ... DONE [10:56:27.645] Chunk #2 of 2 ... [10:56:27.646] - Finding globals in 'X' for chunk #2 ... [10:56:27.646] getGlobalsAndPackages() ... [10:56:27.646] Searching for globals... [10:56:27.647] [10:56:27.647] Searching for globals ... DONE [10:56:27.647] - globals: [0] [10:56:27.647] getGlobalsAndPackages() ... DONE [10:56:27.647] + additional globals found: [n=0] [10:56:27.648] + additional namespaces needed: [n=0] [10:56:27.648] - Finding globals in 'X' for chunk #2 ... DONE [10:56:27.648] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [10:56:27.648] - seeds: [10:56:27.648] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.649] getGlobalsAndPackages() ... [10:56:27.649] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.649] Resolving globals: FALSE [10:56:27.649] Tweak future expression to call with '...' arguments ... [10:56:27.649] { [10:56:27.649] do.call(function(...) { [10:56:27.649] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.649] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.649] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.649] on.exit(options(oopts), add = TRUE) [10:56:27.649] } [10:56:27.649] { [10:56:27.649] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.649] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.649] ...future.FUN(...future.X_jj, ...) [10:56:27.649] }) [10:56:27.649] } [10:56:27.649] }, args = future.call.arguments) [10:56:27.649] } [10:56:27.650] Tweak future expression to call with '...' arguments ... DONE [10:56:27.651] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.651] - packages: [1] 'listenv' [10:56:27.651] getGlobalsAndPackages() ... DONE [10:56:27.651] run() for 'Future' ... [10:56:27.652] - state: 'created' [10:56:27.652] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.655] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.655] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.655] - Field: 'label' [10:56:27.655] - Field: 'local' [10:56:27.656] - Field: 'owner' [10:56:27.656] - Field: 'envir' [10:56:27.656] - Field: 'packages' [10:56:27.656] - Field: 'gc' [10:56:27.656] - Field: 'conditions' [10:56:27.657] - Field: 'expr' [10:56:27.657] - Field: 'uuid' [10:56:27.657] - Field: 'seed' [10:56:27.657] - Field: 'version' [10:56:27.657] - Field: 'result' [10:56:27.658] - Field: 'asynchronous' [10:56:27.658] - Field: 'calls' [10:56:27.658] - Field: 'globals' [10:56:27.658] - Field: 'stdout' [10:56:27.658] - Field: 'earlySignal' [10:56:27.659] - Field: 'lazy' [10:56:27.659] - Field: 'state' [10:56:27.659] - Field: '.cluster' [10:56:27.659] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.659] - Launch lazy future ... [10:56:27.660] Packages needed by the future expression (n = 1): 'listenv' [10:56:27.660] Packages needed by future strategies (n = 0): [10:56:27.660] { [10:56:27.660] { [10:56:27.660] { [10:56:27.660] ...future.startTime <- base::Sys.time() [10:56:27.660] { [10:56:27.660] { [10:56:27.660] { [10:56:27.660] { [10:56:27.660] base::local({ [10:56:27.660] has_future <- base::requireNamespace("future", [10:56:27.660] quietly = TRUE) [10:56:27.660] if (has_future) { [10:56:27.660] ns <- base::getNamespace("future") [10:56:27.660] version <- ns[[".package"]][["version"]] [10:56:27.660] if (is.null(version)) [10:56:27.660] version <- utils::packageVersion("future") [10:56:27.660] } [10:56:27.660] else { [10:56:27.660] version <- NULL [10:56:27.660] } [10:56:27.660] if (!has_future || version < "1.8.0") { [10:56:27.660] info <- base::c(r_version = base::gsub("R version ", [10:56:27.660] "", base::R.version$version.string), [10:56:27.660] platform = base::sprintf("%s (%s-bit)", [10:56:27.660] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.660] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.660] "release", "version")], collapse = " "), [10:56:27.660] hostname = base::Sys.info()[["nodename"]]) [10:56:27.660] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.660] info) [10:56:27.660] info <- base::paste(info, collapse = "; ") [10:56:27.660] if (!has_future) { [10:56:27.660] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.660] info) [10:56:27.660] } [10:56:27.660] else { [10:56:27.660] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.660] info, version) [10:56:27.660] } [10:56:27.660] base::stop(msg) [10:56:27.660] } [10:56:27.660] }) [10:56:27.660] } [10:56:27.660] base::local({ [10:56:27.660] for (pkg in "listenv") { [10:56:27.660] base::loadNamespace(pkg) [10:56:27.660] base::library(pkg, character.only = TRUE) [10:56:27.660] } [10:56:27.660] }) [10:56:27.660] } [10:56:27.660] ...future.strategy.old <- future::plan("list") [10:56:27.660] options(future.plan = NULL) [10:56:27.660] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.660] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.660] } [10:56:27.660] ...future.workdir <- getwd() [10:56:27.660] } [10:56:27.660] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.660] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.660] } [10:56:27.660] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.660] future.globals.maxSize = 1048576000, future.globals.method = NULL, [10:56:27.660] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.660] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.660] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.660] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.660] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.660] base::names(...future.oldOptions)) [10:56:27.660] } [10:56:27.660] if (FALSE) { [10:56:27.660] } [10:56:27.660] else { [10:56:27.660] if (TRUE) { [10:56:27.660] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.660] open = "w") [10:56:27.660] } [10:56:27.660] else { [10:56:27.660] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.660] windows = "NUL", "/dev/null"), open = "w") [10:56:27.660] } [10:56:27.660] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.660] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.660] base::sink(type = "output", split = FALSE) [10:56:27.660] base::close(...future.stdout) [10:56:27.660] }, add = TRUE) [10:56:27.660] } [10:56:27.660] ...future.frame <- base::sys.nframe() [10:56:27.660] ...future.conditions <- base::list() [10:56:27.660] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.660] if (FALSE) { [10:56:27.660] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.660] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.660] } [10:56:27.660] ...future.result <- base::tryCatch({ [10:56:27.660] base::withCallingHandlers({ [10:56:27.660] ...future.value <- base::withVisible(base::local({ [10:56:27.660] do.call(function(...) { [10:56:27.660] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.660] if (!identical(...future.globals.maxSize.org, [10:56:27.660] ...future.globals.maxSize)) { [10:56:27.660] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.660] on.exit(options(oopts), add = TRUE) [10:56:27.660] } [10:56:27.660] { [10:56:27.660] lapply(seq_along(...future.elements_ii), [10:56:27.660] FUN = function(jj) { [10:56:27.660] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.660] ...future.FUN(...future.X_jj, ...) [10:56:27.660] }) [10:56:27.660] } [10:56:27.660] }, args = future.call.arguments) [10:56:27.660] })) [10:56:27.660] future::FutureResult(value = ...future.value$value, [10:56:27.660] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.660] ...future.rng), globalenv = if (FALSE) [10:56:27.660] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.660] ...future.globalenv.names)) [10:56:27.660] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.660] }, condition = base::local({ [10:56:27.660] c <- base::c [10:56:27.660] inherits <- base::inherits [10:56:27.660] invokeRestart <- base::invokeRestart [10:56:27.660] length <- base::length [10:56:27.660] list <- base::list [10:56:27.660] seq.int <- base::seq.int [10:56:27.660] signalCondition <- base::signalCondition [10:56:27.660] sys.calls <- base::sys.calls [10:56:27.660] `[[` <- base::`[[` [10:56:27.660] `+` <- base::`+` [10:56:27.660] `<<-` <- base::`<<-` [10:56:27.660] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.660] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.660] 3L)] [10:56:27.660] } [10:56:27.660] function(cond) { [10:56:27.660] is_error <- inherits(cond, "error") [10:56:27.660] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.660] NULL) [10:56:27.660] if (is_error) { [10:56:27.660] sessionInformation <- function() { [10:56:27.660] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.660] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.660] search = base::search(), system = base::Sys.info()) [10:56:27.660] } [10:56:27.660] ...future.conditions[[length(...future.conditions) + [10:56:27.660] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.660] cond$call), session = sessionInformation(), [10:56:27.660] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.660] signalCondition(cond) [10:56:27.660] } [10:56:27.660] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.660] signal <- FALSE && inherits(cond, character(0)) [10:56:27.660] ...future.conditions[[length(...future.conditions) + [10:56:27.660] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.660] if (FALSE && !signal) { [10:56:27.660] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.660] { [10:56:27.660] inherits <- base::inherits [10:56:27.660] invokeRestart <- base::invokeRestart [10:56:27.660] is.null <- base::is.null [10:56:27.660] muffled <- FALSE [10:56:27.660] if (inherits(cond, "message")) { [10:56:27.660] muffled <- grepl(pattern, "muffleMessage") [10:56:27.660] if (muffled) [10:56:27.660] invokeRestart("muffleMessage") [10:56:27.660] } [10:56:27.660] else if (inherits(cond, "warning")) { [10:56:27.660] muffled <- grepl(pattern, "muffleWarning") [10:56:27.660] if (muffled) [10:56:27.660] invokeRestart("muffleWarning") [10:56:27.660] } [10:56:27.660] else if (inherits(cond, "condition")) { [10:56:27.660] if (!is.null(pattern)) { [10:56:27.660] computeRestarts <- base::computeRestarts [10:56:27.660] grepl <- base::grepl [10:56:27.660] restarts <- computeRestarts(cond) [10:56:27.660] for (restart in restarts) { [10:56:27.660] name <- restart$name [10:56:27.660] if (is.null(name)) [10:56:27.660] next [10:56:27.660] if (!grepl(pattern, name)) [10:56:27.660] next [10:56:27.660] invokeRestart(restart) [10:56:27.660] muffled <- TRUE [10:56:27.660] break [10:56:27.660] } [10:56:27.660] } [10:56:27.660] } [10:56:27.660] invisible(muffled) [10:56:27.660] } [10:56:27.660] muffleCondition(cond, pattern = "^muffle") [10:56:27.660] } [10:56:27.660] } [10:56:27.660] else { [10:56:27.660] if (TRUE) { [10:56:27.660] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.660] { [10:56:27.660] inherits <- base::inherits [10:56:27.660] invokeRestart <- base::invokeRestart [10:56:27.660] is.null <- base::is.null [10:56:27.660] muffled <- FALSE [10:56:27.660] if (inherits(cond, "message")) { [10:56:27.660] muffled <- grepl(pattern, "muffleMessage") [10:56:27.660] if (muffled) [10:56:27.660] invokeRestart("muffleMessage") [10:56:27.660] } [10:56:27.660] else if (inherits(cond, "warning")) { [10:56:27.660] muffled <- grepl(pattern, "muffleWarning") [10:56:27.660] if (muffled) [10:56:27.660] invokeRestart("muffleWarning") [10:56:27.660] } [10:56:27.660] else if (inherits(cond, "condition")) { [10:56:27.660] if (!is.null(pattern)) { [10:56:27.660] computeRestarts <- base::computeRestarts [10:56:27.660] grepl <- base::grepl [10:56:27.660] restarts <- computeRestarts(cond) [10:56:27.660] for (restart in restarts) { [10:56:27.660] name <- restart$name [10:56:27.660] if (is.null(name)) [10:56:27.660] next [10:56:27.660] if (!grepl(pattern, name)) [10:56:27.660] next [10:56:27.660] invokeRestart(restart) [10:56:27.660] muffled <- TRUE [10:56:27.660] break [10:56:27.660] } [10:56:27.660] } [10:56:27.660] } [10:56:27.660] invisible(muffled) [10:56:27.660] } [10:56:27.660] muffleCondition(cond, pattern = "^muffle") [10:56:27.660] } [10:56:27.660] } [10:56:27.660] } [10:56:27.660] })) [10:56:27.660] }, error = function(ex) { [10:56:27.660] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.660] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.660] ...future.rng), started = ...future.startTime, [10:56:27.660] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.660] version = "1.8"), class = "FutureResult") [10:56:27.660] }, finally = { [10:56:27.660] if (!identical(...future.workdir, getwd())) [10:56:27.660] setwd(...future.workdir) [10:56:27.660] { [10:56:27.660] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.660] ...future.oldOptions$nwarnings <- NULL [10:56:27.660] } [10:56:27.660] base::options(...future.oldOptions) [10:56:27.660] if (.Platform$OS.type == "windows") { [10:56:27.660] old_names <- names(...future.oldEnvVars) [10:56:27.660] envs <- base::Sys.getenv() [10:56:27.660] names <- names(envs) [10:56:27.660] common <- intersect(names, old_names) [10:56:27.660] added <- setdiff(names, old_names) [10:56:27.660] removed <- setdiff(old_names, names) [10:56:27.660] changed <- common[...future.oldEnvVars[common] != [10:56:27.660] envs[common]] [10:56:27.660] NAMES <- toupper(changed) [10:56:27.660] args <- list() [10:56:27.660] for (kk in seq_along(NAMES)) { [10:56:27.660] name <- changed[[kk]] [10:56:27.660] NAME <- NAMES[[kk]] [10:56:27.660] if (name != NAME && is.element(NAME, old_names)) [10:56:27.660] next [10:56:27.660] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.660] } [10:56:27.660] NAMES <- toupper(added) [10:56:27.660] for (kk in seq_along(NAMES)) { [10:56:27.660] name <- added[[kk]] [10:56:27.660] NAME <- NAMES[[kk]] [10:56:27.660] if (name != NAME && is.element(NAME, old_names)) [10:56:27.660] next [10:56:27.660] args[[name]] <- "" [10:56:27.660] } [10:56:27.660] NAMES <- toupper(removed) [10:56:27.660] for (kk in seq_along(NAMES)) { [10:56:27.660] name <- removed[[kk]] [10:56:27.660] NAME <- NAMES[[kk]] [10:56:27.660] if (name != NAME && is.element(NAME, old_names)) [10:56:27.660] next [10:56:27.660] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.660] } [10:56:27.660] if (length(args) > 0) [10:56:27.660] base::do.call(base::Sys.setenv, args = args) [10:56:27.660] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.660] } [10:56:27.660] else { [10:56:27.660] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.660] } [10:56:27.660] { [10:56:27.660] if (base::length(...future.futureOptionsAdded) > [10:56:27.660] 0L) { [10:56:27.660] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.660] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.660] base::options(opts) [10:56:27.660] } [10:56:27.660] { [10:56:27.660] NULL [10:56:27.660] options(future.plan = NULL) [10:56:27.660] if (is.na(NA_character_)) [10:56:27.660] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.660] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.660] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.660] .init = FALSE) [10:56:27.660] } [10:56:27.660] } [10:56:27.660] } [10:56:27.660] }) [10:56:27.660] if (TRUE) { [10:56:27.660] base::sink(type = "output", split = FALSE) [10:56:27.660] if (TRUE) { [10:56:27.660] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.660] } [10:56:27.660] else { [10:56:27.660] ...future.result["stdout"] <- base::list(NULL) [10:56:27.660] } [10:56:27.660] base::close(...future.stdout) [10:56:27.660] ...future.stdout <- NULL [10:56:27.660] } [10:56:27.660] ...future.result$conditions <- ...future.conditions [10:56:27.660] ...future.result$finished <- base::Sys.time() [10:56:27.660] ...future.result [10:56:27.660] } [10:56:27.665] - Launch lazy future ... done [10:56:27.665] run() for 'MiraiFuture' ... done [10:56:27.665] Created future: [10:56:27.667] resolved() for 'MiraiFuture' ... [10:56:27.667] - state: 'running' [10:56:27.667] - run: TRUE [10:56:27.668] - result: 'NULL' [10:56:27.668] - resolved: FALSE [10:56:27.668] resolved() for 'MiraiFuture' ... done [10:56:27.666] MiraiFuture: [10:56:27.666] Label: 'future_lapply-2' [10:56:27.666] Expression: [10:56:27.666] { [10:56:27.666] do.call(function(...) { [10:56:27.666] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.666] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.666] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.666] on.exit(options(oopts), add = TRUE) [10:56:27.666] } [10:56:27.666] { [10:56:27.666] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.666] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.666] ...future.FUN(...future.X_jj, ...) [10:56:27.666] }) [10:56:27.666] } [10:56:27.666] }, args = future.call.arguments) [10:56:27.666] } [10:56:27.666] Lazy evaluation: FALSE [10:56:27.666] Asynchronous evaluation: TRUE [10:56:27.666] Local evaluation: TRUE [10:56:27.666] Environment: R_GlobalEnv [10:56:27.666] Capture standard output: TRUE [10:56:27.666] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.666] 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) [10:56:27.666] Packages: 1 packages ('listenv') [10:56:27.666] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.666] Resolved: FALSE [10:56:27.666] Value: [10:56:27.666] Conditions captured: [10:56:27.666] Early signaling: FALSE [10:56:27.666] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.666] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.669] Chunk #2 of 2 ... DONE [10:56:27.669] Launching 2 futures (chunks) ... DONE [10:56:27.669] Resolving 2 futures (chunks) ... [10:56:27.669] resolve() on list ... [10:56:27.669] recursive: 0 [10:56:27.669] length: 2 [10:56:27.670] [10:56:27.670] resolved() for 'MiraiFuture' ... [10:56:27.670] - state: 'running' [10:56:27.670] - run: TRUE [10:56:27.670] - result: 'NULL' [10:56:27.671] - resolved: FALSE [10:56:27.671] resolved() for 'MiraiFuture' ... done [10:56:27.671] Future #1 [10:56:27.671] signalConditionsASAP(MiraiFuture, pos=1) ... [10:56:27.672] - nx: 2 [10:56:27.672] - relay: TRUE [10:56:27.672] - stdout: TRUE [10:56:27.672] - signal: TRUE [10:56:27.672] - resignal: FALSE [10:56:27.673] - force: TRUE [10:56:27.673] - relayed: [n=2] FALSE, FALSE [10:56:27.673] - queued futures: [n=2] FALSE, FALSE [10:56:27.673] - until=1 [10:56:27.673] - relaying element #1 [10:56:27.674] - relayed: [n=2] TRUE, FALSE [10:56:27.674] - queued futures: [n=2] TRUE, FALSE [10:56:27.674] signalConditionsASAP(MiraiFuture, pos=1) ... done [10:56:27.674] length: 1 (resolved future 1) [10:56:27.674] resolved() for 'MiraiFuture' ... [10:56:27.675] - state: 'running' [10:56:27.675] - run: TRUE [10:56:27.675] - result: 'NULL' [10:56:27.675] - resolved: FALSE [10:56:27.675] resolved() for 'MiraiFuture' ... done [10:56:27.676] Future #2 [10:56:27.676] signalConditionsASAP(MiraiFuture, pos=2) ... [10:56:27.676] - nx: 2 [10:56:27.676] - relay: TRUE [10:56:27.676] - stdout: TRUE [10:56:27.677] - signal: TRUE [10:56:27.677] - resignal: FALSE [10:56:27.677] - force: TRUE [10:56:27.677] - relayed: [n=2] TRUE, FALSE [10:56:27.677] - queued futures: [n=2] TRUE, FALSE [10:56:27.677] - until=2 [10:56:27.678] - relaying element #2 [10:56:27.678] - relayed: [n=2] TRUE, TRUE [10:56:27.678] - queued futures: [n=2] TRUE, TRUE [10:56:27.678] signalConditionsASAP(MiraiFuture, pos=2) ... done [10:56:27.679] length: 0 (resolved future 2) [10:56:27.679] Relaying remaining futures [10:56:27.679] signalConditionsASAP(NULL, pos=0) ... [10:56:27.679] - nx: 2 [10:56:27.679] - relay: TRUE [10:56:27.679] - stdout: TRUE [10:56:27.680] - signal: TRUE [10:56:27.680] - resignal: FALSE [10:56:27.680] - force: TRUE [10:56:27.680] - relayed: [n=2] TRUE, TRUE [10:56:27.680] - queued futures: [n=2] TRUE, TRUE - flush all [10:56:27.681] - relayed: [n=2] TRUE, TRUE [10:56:27.681] - queued futures: [n=2] TRUE, TRUE [10:56:27.681] signalConditionsASAP(NULL, pos=0) ... done [10:56:27.682] resolve() on list ... DONE [10:56:27.682] - Number of value chunks collected: 2 [10:56:27.682] Resolving 2 futures (chunks) ... DONE [10:56:27.683] Reducing values from 2 chunks ... [10:56:27.683] - Number of values collected after concatenation: 2 [10:56:27.683] - Number of values expected: 2 [10:56:27.683] Reducing values from 2 chunks ... DONE [10:56:27.684] 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" [10:56:27.686] future_lapply() ... [10:56:27.687] Number of chunks: 2 [10:56:27.687] getGlobalsAndPackagesXApply() ... [10:56:27.688] - future.globals: TRUE [10:56:27.688] getGlobalsAndPackages() ... [10:56:27.688] Searching for globals... [10:56:27.690] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [10:56:27.690] Searching for globals ... DONE [10:56:27.690] Resolving globals: FALSE [10:56:27.691] The total size of the 1 globals is 4.85 KiB (4968 bytes) [10:56:27.691] 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') [10:56:27.692] - globals: [1] 'FUN' [10:56:27.692] - packages: [1] 'listenv' [10:56:27.692] getGlobalsAndPackages() ... DONE [10:56:27.692] - globals found/used: [n=1] 'FUN' [10:56:27.693] - needed namespaces: [n=1] 'listenv' [10:56:27.693] Finding globals ... DONE [10:56:27.693] - use_args: TRUE [10:56:27.693] - Getting '...' globals ... [10:56:27.694] resolve() on list ... [10:56:27.694] recursive: 0 [10:56:27.694] length: 1 [10:56:27.694] elements: '...' [10:56:27.694] length: 0 (resolved future 1) [10:56:27.695] resolve() on list ... DONE [10:56:27.695] - '...' content: [n=0] [10:56:27.695] List of 1 [10:56:27.695] $ ...: list() [10:56:27.695] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.695] - attr(*, "where")=List of 1 [10:56:27.695] ..$ ...: [10:56:27.695] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.695] - attr(*, "resolved")= logi TRUE [10:56:27.695] - attr(*, "total_size")= num NA [10:56:27.699] - Getting '...' globals ... DONE [10:56:27.699] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [10:56:27.699] List of 2 [10:56:27.699] $ ...future.FUN:function (x, ...) [10:56:27.699] $ ... : list() [10:56:27.699] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.699] - attr(*, "where")=List of 2 [10:56:27.699] ..$ ...future.FUN: [10:56:27.699] ..$ ... : [10:56:27.699] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.699] - attr(*, "resolved")= logi FALSE [10:56:27.699] - attr(*, "total_size")= num 4968 [10:56:27.703] Packages to be attached in all futures: [n=1] 'listenv' [10:56:27.703] getGlobalsAndPackagesXApply() ... DONE [10:56:27.704] Number of futures (= number of chunks): 2 [10:56:27.704] Launching 2 futures (chunks) ... [10:56:27.704] Chunk #1 of 2 ... [10:56:27.704] - Finding globals in 'X' for chunk #1 ... [10:56:27.705] getGlobalsAndPackages() ... [10:56:27.705] Searching for globals... [10:56:27.705] [10:56:27.706] Searching for globals ... DONE [10:56:27.706] - globals: [0] [10:56:27.706] getGlobalsAndPackages() ... DONE [10:56:27.706] + additional globals found: [n=0] [10:56:27.706] + additional namespaces needed: [n=0] [10:56:27.707] - Finding globals in 'X' for chunk #1 ... DONE [10:56:27.707] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [10:56:27.707] - seeds: [10:56:27.707] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.707] getGlobalsAndPackages() ... [10:56:27.708] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.708] Resolving globals: FALSE [10:56:27.708] Tweak future expression to call with '...' arguments ... [10:56:27.708] { [10:56:27.708] do.call(function(...) { [10:56:27.708] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.708] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.708] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.708] on.exit(options(oopts), add = TRUE) [10:56:27.708] } [10:56:27.708] { [10:56:27.708] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.708] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.708] ...future.FUN(...future.X_jj, ...) [10:56:27.708] }) [10:56:27.708] } [10:56:27.708] }, args = future.call.arguments) [10:56:27.708] } [10:56:27.709] Tweak future expression to call with '...' arguments ... DONE [10:56:27.709] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.709] - packages: [1] 'listenv' [10:56:27.710] getGlobalsAndPackages() ... DONE [10:56:27.710] run() for 'Future' ... [10:56:27.710] - state: 'created' [10:56:27.711] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.714] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.714] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.714] - Field: 'label' [10:56:27.714] - Field: 'local' [10:56:27.715] - Field: 'owner' [10:56:27.715] - Field: 'envir' [10:56:27.715] - Field: 'packages' [10:56:27.715] - Field: 'gc' [10:56:27.715] - Field: 'conditions' [10:56:27.716] - Field: 'expr' [10:56:27.716] - Field: 'uuid' [10:56:27.716] - Field: 'seed' [10:56:27.716] - Field: 'version' [10:56:27.716] - Field: 'result' [10:56:27.717] - Field: 'asynchronous' [10:56:27.717] - Field: 'calls' [10:56:27.717] - Field: 'globals' [10:56:27.717] - Field: 'stdout' [10:56:27.717] - Field: 'earlySignal' [10:56:27.718] - Field: 'lazy' [10:56:27.718] - Field: 'state' [10:56:27.718] - Field: '.cluster' [10:56:27.718] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.718] - Launch lazy future ... [10:56:27.719] Packages needed by the future expression (n = 1): 'listenv' [10:56:27.719] Packages needed by future strategies (n = 0): [10:56:27.720] { [10:56:27.720] { [10:56:27.720] { [10:56:27.720] ...future.startTime <- base::Sys.time() [10:56:27.720] { [10:56:27.720] { [10:56:27.720] { [10:56:27.720] { [10:56:27.720] base::local({ [10:56:27.720] has_future <- base::requireNamespace("future", [10:56:27.720] quietly = TRUE) [10:56:27.720] if (has_future) { [10:56:27.720] ns <- base::getNamespace("future") [10:56:27.720] version <- ns[[".package"]][["version"]] [10:56:27.720] if (is.null(version)) [10:56:27.720] version <- utils::packageVersion("future") [10:56:27.720] } [10:56:27.720] else { [10:56:27.720] version <- NULL [10:56:27.720] } [10:56:27.720] if (!has_future || version < "1.8.0") { [10:56:27.720] info <- base::c(r_version = base::gsub("R version ", [10:56:27.720] "", base::R.version$version.string), [10:56:27.720] platform = base::sprintf("%s (%s-bit)", [10:56:27.720] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.720] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.720] "release", "version")], collapse = " "), [10:56:27.720] hostname = base::Sys.info()[["nodename"]]) [10:56:27.720] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.720] info) [10:56:27.720] info <- base::paste(info, collapse = "; ") [10:56:27.720] if (!has_future) { [10:56:27.720] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.720] info) [10:56:27.720] } [10:56:27.720] else { [10:56:27.720] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.720] info, version) [10:56:27.720] } [10:56:27.720] base::stop(msg) [10:56:27.720] } [10:56:27.720] }) [10:56:27.720] } [10:56:27.720] base::local({ [10:56:27.720] for (pkg in "listenv") { [10:56:27.720] base::loadNamespace(pkg) [10:56:27.720] base::library(pkg, character.only = TRUE) [10:56:27.720] } [10:56:27.720] }) [10:56:27.720] } [10:56:27.720] ...future.strategy.old <- future::plan("list") [10:56:27.720] options(future.plan = NULL) [10:56:27.720] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.720] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.720] } [10:56:27.720] ...future.workdir <- getwd() [10:56:27.720] } [10:56:27.720] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.720] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.720] } [10:56:27.720] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.720] future.globals.maxSize = 1048576000, future.globals.method = NULL, [10:56:27.720] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.720] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.720] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.720] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.720] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.720] base::names(...future.oldOptions)) [10:56:27.720] } [10:56:27.720] if (FALSE) { [10:56:27.720] } [10:56:27.720] else { [10:56:27.720] if (TRUE) { [10:56:27.720] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.720] open = "w") [10:56:27.720] } [10:56:27.720] else { [10:56:27.720] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.720] windows = "NUL", "/dev/null"), open = "w") [10:56:27.720] } [10:56:27.720] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.720] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.720] base::sink(type = "output", split = FALSE) [10:56:27.720] base::close(...future.stdout) [10:56:27.720] }, add = TRUE) [10:56:27.720] } [10:56:27.720] ...future.frame <- base::sys.nframe() [10:56:27.720] ...future.conditions <- base::list() [10:56:27.720] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.720] if (FALSE) { [10:56:27.720] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.720] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.720] } [10:56:27.720] ...future.result <- base::tryCatch({ [10:56:27.720] base::withCallingHandlers({ [10:56:27.720] ...future.value <- base::withVisible(base::local({ [10:56:27.720] do.call(function(...) { [10:56:27.720] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.720] if (!identical(...future.globals.maxSize.org, [10:56:27.720] ...future.globals.maxSize)) { [10:56:27.720] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.720] on.exit(options(oopts), add = TRUE) [10:56:27.720] } [10:56:27.720] { [10:56:27.720] lapply(seq_along(...future.elements_ii), [10:56:27.720] FUN = function(jj) { [10:56:27.720] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.720] ...future.FUN(...future.X_jj, ...) [10:56:27.720] }) [10:56:27.720] } [10:56:27.720] }, args = future.call.arguments) [10:56:27.720] })) [10:56:27.720] future::FutureResult(value = ...future.value$value, [10:56:27.720] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.720] ...future.rng), globalenv = if (FALSE) [10:56:27.720] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.720] ...future.globalenv.names)) [10:56:27.720] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.720] }, condition = base::local({ [10:56:27.720] c <- base::c [10:56:27.720] inherits <- base::inherits [10:56:27.720] invokeRestart <- base::invokeRestart [10:56:27.720] length <- base::length [10:56:27.720] list <- base::list [10:56:27.720] seq.int <- base::seq.int [10:56:27.720] signalCondition <- base::signalCondition [10:56:27.720] sys.calls <- base::sys.calls [10:56:27.720] `[[` <- base::`[[` [10:56:27.720] `+` <- base::`+` [10:56:27.720] `<<-` <- base::`<<-` [10:56:27.720] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.720] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.720] 3L)] [10:56:27.720] } [10:56:27.720] function(cond) { [10:56:27.720] is_error <- inherits(cond, "error") [10:56:27.720] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.720] NULL) [10:56:27.720] if (is_error) { [10:56:27.720] sessionInformation <- function() { [10:56:27.720] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.720] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.720] search = base::search(), system = base::Sys.info()) [10:56:27.720] } [10:56:27.720] ...future.conditions[[length(...future.conditions) + [10:56:27.720] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.720] cond$call), session = sessionInformation(), [10:56:27.720] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.720] signalCondition(cond) [10:56:27.720] } [10:56:27.720] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.720] signal <- FALSE && inherits(cond, character(0)) [10:56:27.720] ...future.conditions[[length(...future.conditions) + [10:56:27.720] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.720] if (FALSE && !signal) { [10:56:27.720] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.720] { [10:56:27.720] inherits <- base::inherits [10:56:27.720] invokeRestart <- base::invokeRestart [10:56:27.720] is.null <- base::is.null [10:56:27.720] muffled <- FALSE [10:56:27.720] if (inherits(cond, "message")) { [10:56:27.720] muffled <- grepl(pattern, "muffleMessage") [10:56:27.720] if (muffled) [10:56:27.720] invokeRestart("muffleMessage") [10:56:27.720] } [10:56:27.720] else if (inherits(cond, "warning")) { [10:56:27.720] muffled <- grepl(pattern, "muffleWarning") [10:56:27.720] if (muffled) [10:56:27.720] invokeRestart("muffleWarning") [10:56:27.720] } [10:56:27.720] else if (inherits(cond, "condition")) { [10:56:27.720] if (!is.null(pattern)) { [10:56:27.720] computeRestarts <- base::computeRestarts [10:56:27.720] grepl <- base::grepl [10:56:27.720] restarts <- computeRestarts(cond) [10:56:27.720] for (restart in restarts) { [10:56:27.720] name <- restart$name [10:56:27.720] if (is.null(name)) [10:56:27.720] next [10:56:27.720] if (!grepl(pattern, name)) [10:56:27.720] next [10:56:27.720] invokeRestart(restart) [10:56:27.720] muffled <- TRUE [10:56:27.720] break [10:56:27.720] } [10:56:27.720] } [10:56:27.720] } [10:56:27.720] invisible(muffled) [10:56:27.720] } [10:56:27.720] muffleCondition(cond, pattern = "^muffle") [10:56:27.720] } [10:56:27.720] } [10:56:27.720] else { [10:56:27.720] if (TRUE) { [10:56:27.720] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.720] { [10:56:27.720] inherits <- base::inherits [10:56:27.720] invokeRestart <- base::invokeRestart [10:56:27.720] is.null <- base::is.null [10:56:27.720] muffled <- FALSE [10:56:27.720] if (inherits(cond, "message")) { [10:56:27.720] muffled <- grepl(pattern, "muffleMessage") [10:56:27.720] if (muffled) [10:56:27.720] invokeRestart("muffleMessage") [10:56:27.720] } [10:56:27.720] else if (inherits(cond, "warning")) { [10:56:27.720] muffled <- grepl(pattern, "muffleWarning") [10:56:27.720] if (muffled) [10:56:27.720] invokeRestart("muffleWarning") [10:56:27.720] } [10:56:27.720] else if (inherits(cond, "condition")) { [10:56:27.720] if (!is.null(pattern)) { [10:56:27.720] computeRestarts <- base::computeRestarts [10:56:27.720] grepl <- base::grepl [10:56:27.720] restarts <- computeRestarts(cond) [10:56:27.720] for (restart in restarts) { [10:56:27.720] name <- restart$name [10:56:27.720] if (is.null(name)) [10:56:27.720] next [10:56:27.720] if (!grepl(pattern, name)) [10:56:27.720] next [10:56:27.720] invokeRestart(restart) [10:56:27.720] muffled <- TRUE [10:56:27.720] break [10:56:27.720] } [10:56:27.720] } [10:56:27.720] } [10:56:27.720] invisible(muffled) [10:56:27.720] } [10:56:27.720] muffleCondition(cond, pattern = "^muffle") [10:56:27.720] } [10:56:27.720] } [10:56:27.720] } [10:56:27.720] })) [10:56:27.720] }, error = function(ex) { [10:56:27.720] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.720] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.720] ...future.rng), started = ...future.startTime, [10:56:27.720] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.720] version = "1.8"), class = "FutureResult") [10:56:27.720] }, finally = { [10:56:27.720] if (!identical(...future.workdir, getwd())) [10:56:27.720] setwd(...future.workdir) [10:56:27.720] { [10:56:27.720] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.720] ...future.oldOptions$nwarnings <- NULL [10:56:27.720] } [10:56:27.720] base::options(...future.oldOptions) [10:56:27.720] if (.Platform$OS.type == "windows") { [10:56:27.720] old_names <- names(...future.oldEnvVars) [10:56:27.720] envs <- base::Sys.getenv() [10:56:27.720] names <- names(envs) [10:56:27.720] common <- intersect(names, old_names) [10:56:27.720] added <- setdiff(names, old_names) [10:56:27.720] removed <- setdiff(old_names, names) [10:56:27.720] changed <- common[...future.oldEnvVars[common] != [10:56:27.720] envs[common]] [10:56:27.720] NAMES <- toupper(changed) [10:56:27.720] args <- list() [10:56:27.720] for (kk in seq_along(NAMES)) { [10:56:27.720] name <- changed[[kk]] [10:56:27.720] NAME <- NAMES[[kk]] [10:56:27.720] if (name != NAME && is.element(NAME, old_names)) [10:56:27.720] next [10:56:27.720] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.720] } [10:56:27.720] NAMES <- toupper(added) [10:56:27.720] for (kk in seq_along(NAMES)) { [10:56:27.720] name <- added[[kk]] [10:56:27.720] NAME <- NAMES[[kk]] [10:56:27.720] if (name != NAME && is.element(NAME, old_names)) [10:56:27.720] next [10:56:27.720] args[[name]] <- "" [10:56:27.720] } [10:56:27.720] NAMES <- toupper(removed) [10:56:27.720] for (kk in seq_along(NAMES)) { [10:56:27.720] name <- removed[[kk]] [10:56:27.720] NAME <- NAMES[[kk]] [10:56:27.720] if (name != NAME && is.element(NAME, old_names)) [10:56:27.720] next [10:56:27.720] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.720] } [10:56:27.720] if (length(args) > 0) [10:56:27.720] base::do.call(base::Sys.setenv, args = args) [10:56:27.720] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.720] } [10:56:27.720] else { [10:56:27.720] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.720] } [10:56:27.720] { [10:56:27.720] if (base::length(...future.futureOptionsAdded) > [10:56:27.720] 0L) { [10:56:27.720] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.720] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.720] base::options(opts) [10:56:27.720] } [10:56:27.720] { [10:56:27.720] NULL [10:56:27.720] options(future.plan = NULL) [10:56:27.720] if (is.na(NA_character_)) [10:56:27.720] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.720] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.720] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.720] .init = FALSE) [10:56:27.720] } [10:56:27.720] } [10:56:27.720] } [10:56:27.720] }) [10:56:27.720] if (TRUE) { [10:56:27.720] base::sink(type = "output", split = FALSE) [10:56:27.720] if (TRUE) { [10:56:27.720] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.720] } [10:56:27.720] else { [10:56:27.720] ...future.result["stdout"] <- base::list(NULL) [10:56:27.720] } [10:56:27.720] base::close(...future.stdout) [10:56:27.720] ...future.stdout <- NULL [10:56:27.720] } [10:56:27.720] ...future.result$conditions <- ...future.conditions [10:56:27.720] ...future.result$finished <- base::Sys.time() [10:56:27.720] ...future.result [10:56:27.720] } [10:56:27.727] - Launch lazy future ... done [10:56:27.727] run() for 'MiraiFuture' ... done [10:56:27.727] Created future: [10:56:27.728] resolved() for 'MiraiFuture' ... [10:56:27.729] - state: 'running' [10:56:27.729] - run: TRUE [10:56:27.729] - result: 'NULL' [10:56:27.729] - resolved: FALSE [10:56:27.729] resolved() for 'MiraiFuture' ... done [10:56:27.727] MiraiFuture: [10:56:27.727] Label: 'future_lapply-1' [10:56:27.727] Expression: [10:56:27.727] { [10:56:27.727] do.call(function(...) { [10:56:27.727] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.727] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.727] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.727] on.exit(options(oopts), add = TRUE) [10:56:27.727] } [10:56:27.727] { [10:56:27.727] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.727] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.727] ...future.FUN(...future.X_jj, ...) [10:56:27.727] }) [10:56:27.727] } [10:56:27.727] }, args = future.call.arguments) [10:56:27.727] } [10:56:27.727] Lazy evaluation: FALSE [10:56:27.727] Asynchronous evaluation: TRUE [10:56:27.727] Local evaluation: TRUE [10:56:27.727] Environment: R_GlobalEnv [10:56:27.727] Capture standard output: TRUE [10:56:27.727] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.727] 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) [10:56:27.727] Packages: 1 packages ('listenv') [10:56:27.727] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.727] Resolved: FALSE [10:56:27.727] Value: [10:56:27.727] Conditions captured: [10:56:27.727] Early signaling: FALSE [10:56:27.727] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.727] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.730] Chunk #1 of 2 ... DONE [10:56:27.730] Chunk #2 of 2 ... [10:56:27.730] - Finding globals in 'X' for chunk #2 ... [10:56:27.730] getGlobalsAndPackages() ... [10:56:27.730] Searching for globals... [10:56:27.731] [10:56:27.731] Searching for globals ... DONE [10:56:27.731] - globals: [0] [10:56:27.732] getGlobalsAndPackages() ... DONE [10:56:27.732] + additional globals found: [n=0] [10:56:27.732] + additional namespaces needed: [n=0] [10:56:27.732] - Finding globals in 'X' for chunk #2 ... DONE [10:56:27.732] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [10:56:27.732] - seeds: [10:56:27.732] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.733] getGlobalsAndPackages() ... [10:56:27.733] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.733] Resolving globals: FALSE [10:56:27.733] Tweak future expression to call with '...' arguments ... [10:56:27.733] { [10:56:27.733] do.call(function(...) { [10:56:27.733] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.733] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.733] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.733] on.exit(options(oopts), add = TRUE) [10:56:27.733] } [10:56:27.733] { [10:56:27.733] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.733] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.733] ...future.FUN(...future.X_jj, ...) [10:56:27.733] }) [10:56:27.733] } [10:56:27.733] }, args = future.call.arguments) [10:56:27.733] } [10:56:27.734] Tweak future expression to call with '...' arguments ... DONE [10:56:27.734] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:27.735] - packages: [1] 'listenv' [10:56:27.735] getGlobalsAndPackages() ... DONE [10:56:27.735] run() for 'Future' ... [10:56:27.735] - state: 'created' [10:56:27.736] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:27.738] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.738] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:27.738] - Field: 'label' [10:56:27.739] - Field: 'local' [10:56:27.739] - Field: 'owner' [10:56:27.739] - Field: 'envir' [10:56:27.739] - Field: 'packages' [10:56:27.739] - Field: 'gc' [10:56:27.739] - Field: 'conditions' [10:56:27.740] - Field: 'expr' [10:56:27.740] - Field: 'uuid' [10:56:27.740] - Field: 'seed' [10:56:27.740] - Field: 'version' [10:56:27.740] - Field: 'result' [10:56:27.740] - Field: 'asynchronous' [10:56:27.741] - Field: 'calls' [10:56:27.741] - Field: 'globals' [10:56:27.741] - Field: 'stdout' [10:56:27.741] - Field: 'earlySignal' [10:56:27.741] - Field: 'lazy' [10:56:27.742] - Field: 'state' [10:56:27.742] - Field: '.cluster' [10:56:27.742] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:27.742] - Launch lazy future ... [10:56:27.742] Packages needed by the future expression (n = 1): 'listenv' [10:56:27.742] Packages needed by future strategies (n = 0): [10:56:27.743] { [10:56:27.743] { [10:56:27.743] { [10:56:27.743] ...future.startTime <- base::Sys.time() [10:56:27.743] { [10:56:27.743] { [10:56:27.743] { [10:56:27.743] { [10:56:27.743] base::local({ [10:56:27.743] has_future <- base::requireNamespace("future", [10:56:27.743] quietly = TRUE) [10:56:27.743] if (has_future) { [10:56:27.743] ns <- base::getNamespace("future") [10:56:27.743] version <- ns[[".package"]][["version"]] [10:56:27.743] if (is.null(version)) [10:56:27.743] version <- utils::packageVersion("future") [10:56:27.743] } [10:56:27.743] else { [10:56:27.743] version <- NULL [10:56:27.743] } [10:56:27.743] if (!has_future || version < "1.8.0") { [10:56:27.743] info <- base::c(r_version = base::gsub("R version ", [10:56:27.743] "", base::R.version$version.string), [10:56:27.743] platform = base::sprintf("%s (%s-bit)", [10:56:27.743] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:27.743] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:27.743] "release", "version")], collapse = " "), [10:56:27.743] hostname = base::Sys.info()[["nodename"]]) [10:56:27.743] info <- base::sprintf("%s: %s", base::names(info), [10:56:27.743] info) [10:56:27.743] info <- base::paste(info, collapse = "; ") [10:56:27.743] if (!has_future) { [10:56:27.743] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:27.743] info) [10:56:27.743] } [10:56:27.743] else { [10:56:27.743] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:27.743] info, version) [10:56:27.743] } [10:56:27.743] base::stop(msg) [10:56:27.743] } [10:56:27.743] }) [10:56:27.743] } [10:56:27.743] base::local({ [10:56:27.743] for (pkg in "listenv") { [10:56:27.743] base::loadNamespace(pkg) [10:56:27.743] base::library(pkg, character.only = TRUE) [10:56:27.743] } [10:56:27.743] }) [10:56:27.743] } [10:56:27.743] ...future.strategy.old <- future::plan("list") [10:56:27.743] options(future.plan = NULL) [10:56:27.743] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.743] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:27.743] } [10:56:27.743] ...future.workdir <- getwd() [10:56:27.743] } [10:56:27.743] ...future.oldOptions <- base::as.list(base::.Options) [10:56:27.743] ...future.oldEnvVars <- base::Sys.getenv() [10:56:27.743] } [10:56:27.743] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:27.743] future.globals.maxSize = 1048576000, future.globals.method = NULL, [10:56:27.743] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:27.743] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:27.743] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:27.743] future.stdout.windows.reencode = NULL, width = 80L) [10:56:27.743] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:27.743] base::names(...future.oldOptions)) [10:56:27.743] } [10:56:27.743] if (FALSE) { [10:56:27.743] } [10:56:27.743] else { [10:56:27.743] if (TRUE) { [10:56:27.743] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:27.743] open = "w") [10:56:27.743] } [10:56:27.743] else { [10:56:27.743] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:27.743] windows = "NUL", "/dev/null"), open = "w") [10:56:27.743] } [10:56:27.743] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:27.743] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:27.743] base::sink(type = "output", split = FALSE) [10:56:27.743] base::close(...future.stdout) [10:56:27.743] }, add = TRUE) [10:56:27.743] } [10:56:27.743] ...future.frame <- base::sys.nframe() [10:56:27.743] ...future.conditions <- base::list() [10:56:27.743] ...future.rng <- base::globalenv()$.Random.seed [10:56:27.743] if (FALSE) { [10:56:27.743] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:27.743] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:27.743] } [10:56:27.743] ...future.result <- base::tryCatch({ [10:56:27.743] base::withCallingHandlers({ [10:56:27.743] ...future.value <- base::withVisible(base::local({ [10:56:27.743] do.call(function(...) { [10:56:27.743] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.743] if (!identical(...future.globals.maxSize.org, [10:56:27.743] ...future.globals.maxSize)) { [10:56:27.743] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.743] on.exit(options(oopts), add = TRUE) [10:56:27.743] } [10:56:27.743] { [10:56:27.743] lapply(seq_along(...future.elements_ii), [10:56:27.743] FUN = function(jj) { [10:56:27.743] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.743] ...future.FUN(...future.X_jj, ...) [10:56:27.743] }) [10:56:27.743] } [10:56:27.743] }, args = future.call.arguments) [10:56:27.743] })) [10:56:27.743] future::FutureResult(value = ...future.value$value, [10:56:27.743] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.743] ...future.rng), globalenv = if (FALSE) [10:56:27.743] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:27.743] ...future.globalenv.names)) [10:56:27.743] else NULL, started = ...future.startTime, version = "1.8") [10:56:27.743] }, condition = base::local({ [10:56:27.743] c <- base::c [10:56:27.743] inherits <- base::inherits [10:56:27.743] invokeRestart <- base::invokeRestart [10:56:27.743] length <- base::length [10:56:27.743] list <- base::list [10:56:27.743] seq.int <- base::seq.int [10:56:27.743] signalCondition <- base::signalCondition [10:56:27.743] sys.calls <- base::sys.calls [10:56:27.743] `[[` <- base::`[[` [10:56:27.743] `+` <- base::`+` [10:56:27.743] `<<-` <- base::`<<-` [10:56:27.743] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:27.743] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:27.743] 3L)] [10:56:27.743] } [10:56:27.743] function(cond) { [10:56:27.743] is_error <- inherits(cond, "error") [10:56:27.743] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:27.743] NULL) [10:56:27.743] if (is_error) { [10:56:27.743] sessionInformation <- function() { [10:56:27.743] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:27.743] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:27.743] search = base::search(), system = base::Sys.info()) [10:56:27.743] } [10:56:27.743] ...future.conditions[[length(...future.conditions) + [10:56:27.743] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:27.743] cond$call), session = sessionInformation(), [10:56:27.743] timestamp = base::Sys.time(), signaled = 0L) [10:56:27.743] signalCondition(cond) [10:56:27.743] } [10:56:27.743] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:27.743] signal <- FALSE && inherits(cond, character(0)) [10:56:27.743] ...future.conditions[[length(...future.conditions) + [10:56:27.743] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:27.743] if (FALSE && !signal) { [10:56:27.743] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.743] { [10:56:27.743] inherits <- base::inherits [10:56:27.743] invokeRestart <- base::invokeRestart [10:56:27.743] is.null <- base::is.null [10:56:27.743] muffled <- FALSE [10:56:27.743] if (inherits(cond, "message")) { [10:56:27.743] muffled <- grepl(pattern, "muffleMessage") [10:56:27.743] if (muffled) [10:56:27.743] invokeRestart("muffleMessage") [10:56:27.743] } [10:56:27.743] else if (inherits(cond, "warning")) { [10:56:27.743] muffled <- grepl(pattern, "muffleWarning") [10:56:27.743] if (muffled) [10:56:27.743] invokeRestart("muffleWarning") [10:56:27.743] } [10:56:27.743] else if (inherits(cond, "condition")) { [10:56:27.743] if (!is.null(pattern)) { [10:56:27.743] computeRestarts <- base::computeRestarts [10:56:27.743] grepl <- base::grepl [10:56:27.743] restarts <- computeRestarts(cond) [10:56:27.743] for (restart in restarts) { [10:56:27.743] name <- restart$name [10:56:27.743] if (is.null(name)) [10:56:27.743] next [10:56:27.743] if (!grepl(pattern, name)) [10:56:27.743] next [10:56:27.743] invokeRestart(restart) [10:56:27.743] muffled <- TRUE [10:56:27.743] break [10:56:27.743] } [10:56:27.743] } [10:56:27.743] } [10:56:27.743] invisible(muffled) [10:56:27.743] } [10:56:27.743] muffleCondition(cond, pattern = "^muffle") [10:56:27.743] } [10:56:27.743] } [10:56:27.743] else { [10:56:27.743] if (TRUE) { [10:56:27.743] muffleCondition <- function (cond, pattern = "^muffle") [10:56:27.743] { [10:56:27.743] inherits <- base::inherits [10:56:27.743] invokeRestart <- base::invokeRestart [10:56:27.743] is.null <- base::is.null [10:56:27.743] muffled <- FALSE [10:56:27.743] if (inherits(cond, "message")) { [10:56:27.743] muffled <- grepl(pattern, "muffleMessage") [10:56:27.743] if (muffled) [10:56:27.743] invokeRestart("muffleMessage") [10:56:27.743] } [10:56:27.743] else if (inherits(cond, "warning")) { [10:56:27.743] muffled <- grepl(pattern, "muffleWarning") [10:56:27.743] if (muffled) [10:56:27.743] invokeRestart("muffleWarning") [10:56:27.743] } [10:56:27.743] else if (inherits(cond, "condition")) { [10:56:27.743] if (!is.null(pattern)) { [10:56:27.743] computeRestarts <- base::computeRestarts [10:56:27.743] grepl <- base::grepl [10:56:27.743] restarts <- computeRestarts(cond) [10:56:27.743] for (restart in restarts) { [10:56:27.743] name <- restart$name [10:56:27.743] if (is.null(name)) [10:56:27.743] next [10:56:27.743] if (!grepl(pattern, name)) [10:56:27.743] next [10:56:27.743] invokeRestart(restart) [10:56:27.743] muffled <- TRUE [10:56:27.743] break [10:56:27.743] } [10:56:27.743] } [10:56:27.743] } [10:56:27.743] invisible(muffled) [10:56:27.743] } [10:56:27.743] muffleCondition(cond, pattern = "^muffle") [10:56:27.743] } [10:56:27.743] } [10:56:27.743] } [10:56:27.743] })) [10:56:27.743] }, error = function(ex) { [10:56:27.743] base::structure(base::list(value = NULL, visible = NULL, [10:56:27.743] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:27.743] ...future.rng), started = ...future.startTime, [10:56:27.743] finished = Sys.time(), session_uuid = NA_character_, [10:56:27.743] version = "1.8"), class = "FutureResult") [10:56:27.743] }, finally = { [10:56:27.743] if (!identical(...future.workdir, getwd())) [10:56:27.743] setwd(...future.workdir) [10:56:27.743] { [10:56:27.743] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:27.743] ...future.oldOptions$nwarnings <- NULL [10:56:27.743] } [10:56:27.743] base::options(...future.oldOptions) [10:56:27.743] if (.Platform$OS.type == "windows") { [10:56:27.743] old_names <- names(...future.oldEnvVars) [10:56:27.743] envs <- base::Sys.getenv() [10:56:27.743] names <- names(envs) [10:56:27.743] common <- intersect(names, old_names) [10:56:27.743] added <- setdiff(names, old_names) [10:56:27.743] removed <- setdiff(old_names, names) [10:56:27.743] changed <- common[...future.oldEnvVars[common] != [10:56:27.743] envs[common]] [10:56:27.743] NAMES <- toupper(changed) [10:56:27.743] args <- list() [10:56:27.743] for (kk in seq_along(NAMES)) { [10:56:27.743] name <- changed[[kk]] [10:56:27.743] NAME <- NAMES[[kk]] [10:56:27.743] if (name != NAME && is.element(NAME, old_names)) [10:56:27.743] next [10:56:27.743] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.743] } [10:56:27.743] NAMES <- toupper(added) [10:56:27.743] for (kk in seq_along(NAMES)) { [10:56:27.743] name <- added[[kk]] [10:56:27.743] NAME <- NAMES[[kk]] [10:56:27.743] if (name != NAME && is.element(NAME, old_names)) [10:56:27.743] next [10:56:27.743] args[[name]] <- "" [10:56:27.743] } [10:56:27.743] NAMES <- toupper(removed) [10:56:27.743] for (kk in seq_along(NAMES)) { [10:56:27.743] name <- removed[[kk]] [10:56:27.743] NAME <- NAMES[[kk]] [10:56:27.743] if (name != NAME && is.element(NAME, old_names)) [10:56:27.743] next [10:56:27.743] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:27.743] } [10:56:27.743] if (length(args) > 0) [10:56:27.743] base::do.call(base::Sys.setenv, args = args) [10:56:27.743] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:27.743] } [10:56:27.743] else { [10:56:27.743] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:27.743] } [10:56:27.743] { [10:56:27.743] if (base::length(...future.futureOptionsAdded) > [10:56:27.743] 0L) { [10:56:27.743] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:27.743] base::names(opts) <- ...future.futureOptionsAdded [10:56:27.743] base::options(opts) [10:56:27.743] } [10:56:27.743] { [10:56:27.743] NULL [10:56:27.743] options(future.plan = NULL) [10:56:27.743] if (is.na(NA_character_)) [10:56:27.743] Sys.unsetenv("R_FUTURE_PLAN") [10:56:27.743] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:27.743] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:27.743] .init = FALSE) [10:56:27.743] } [10:56:27.743] } [10:56:27.743] } [10:56:27.743] }) [10:56:27.743] if (TRUE) { [10:56:27.743] base::sink(type = "output", split = FALSE) [10:56:27.743] if (TRUE) { [10:56:27.743] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:27.743] } [10:56:27.743] else { [10:56:27.743] ...future.result["stdout"] <- base::list(NULL) [10:56:27.743] } [10:56:27.743] base::close(...future.stdout) [10:56:27.743] ...future.stdout <- NULL [10:56:27.743] } [10:56:27.743] ...future.result$conditions <- ...future.conditions [10:56:27.743] ...future.result$finished <- base::Sys.time() [10:56:27.743] ...future.result [10:56:27.743] } [10:56:27.747] - Launch lazy future ... done [10:56:27.747] run() for 'MiraiFuture' ... done [10:56:27.748] Created future: [10:56:27.749] resolved() for 'MiraiFuture' ... [10:56:27.749] - state: 'running' [10:56:27.749] - run: TRUE [10:56:27.750] - result: 'NULL' [10:56:27.750] - resolved: FALSE [10:56:27.750] resolved() for 'MiraiFuture' ... done [10:56:27.748] MiraiFuture: [10:56:27.748] Label: 'future_lapply-2' [10:56:27.748] Expression: [10:56:27.748] { [10:56:27.748] do.call(function(...) { [10:56:27.748] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:27.748] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:27.748] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:27.748] on.exit(options(oopts), add = TRUE) [10:56:27.748] } [10:56:27.748] { [10:56:27.748] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:27.748] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:27.748] ...future.FUN(...future.X_jj, ...) [10:56:27.748] }) [10:56:27.748] } [10:56:27.748] }, args = future.call.arguments) [10:56:27.748] } [10:56:27.748] Lazy evaluation: FALSE [10:56:27.748] Asynchronous evaluation: TRUE [10:56:27.748] Local evaluation: TRUE [10:56:27.748] Environment: R_GlobalEnv [10:56:27.748] Capture standard output: TRUE [10:56:27.748] Capture condition classes: 'condition' (excluding 'nothing') [10:56:27.748] 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) [10:56:27.748] Packages: 1 packages ('listenv') [10:56:27.748] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:27.748] Resolved: FALSE [10:56:27.748] Value: [10:56:27.748] Conditions captured: [10:56:27.748] Early signaling: FALSE [10:56:27.748] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:27.748] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:27.750] Chunk #2 of 2 ... DONE [10:56:27.751] Launching 2 futures (chunks) ... DONE [10:56:27.751] Resolving 2 futures (chunks) ... [10:56:27.751] resolve() on list ... [10:56:27.751] recursive: 0 [10:56:27.751] length: 2 [10:56:27.751] [10:56:27.752] resolved() for 'MiraiFuture' ... [10:56:27.752] - state: 'running' [10:56:27.752] - run: TRUE [10:56:27.752] - result: 'NULL' [10:56:27.752] - resolved: FALSE [10:56:27.753] resolved() for 'MiraiFuture' ... done [10:56:27.753] Future #1 [10:56:27.753] signalConditionsASAP(MiraiFuture, pos=1) ... [10:56:27.753] - nx: 2 [10:56:27.753] - relay: TRUE [10:56:27.754] - stdout: TRUE [10:56:27.754] - signal: TRUE [10:56:27.754] - resignal: FALSE [10:56:27.754] - force: TRUE [10:56:27.754] - relayed: [n=2] FALSE, FALSE [10:56:27.754] - queued futures: [n=2] FALSE, FALSE [10:56:27.755] - until=1 [10:56:27.755] - relaying element #1 [10:56:27.755] - relayed: [n=2] TRUE, FALSE [10:56:27.755] - queued futures: [n=2] TRUE, FALSE [10:56:27.755] signalConditionsASAP(MiraiFuture, pos=1) ... done [10:56:27.756] length: 1 (resolved future 1) [10:56:27.756] resolved() for 'MiraiFuture' ... [10:56:27.756] - state: 'running' [10:56:27.756] - run: TRUE [10:56:27.756] - result: 'NULL' [10:56:27.757] - resolved: FALSE [10:56:27.757] resolved() for 'MiraiFuture' ... done [10:56:27.757] Future #2 [10:56:27.757] signalConditionsASAP(MiraiFuture, pos=2) ... [10:56:27.758] - nx: 2 [10:56:27.758] - relay: TRUE [10:56:27.758] - stdout: TRUE [10:56:27.758] - signal: TRUE [10:56:27.758] - resignal: FALSE [10:56:27.758] - force: TRUE [10:56:27.758] - relayed: [n=2] TRUE, FALSE [10:56:27.759] - queued futures: [n=2] TRUE, FALSE [10:56:27.759] - until=2 [10:56:27.759] - relaying element #2 [10:56:27.759] - relayed: [n=2] TRUE, TRUE [10:56:27.759] - queued futures: [n=2] TRUE, TRUE [10:56:27.760] signalConditionsASAP(MiraiFuture, pos=2) ... done [10:56:27.760] length: 0 (resolved future 2) [10:56:27.760] Relaying remaining futures [10:56:27.760] signalConditionsASAP(NULL, pos=0) ... [10:56:27.760] - nx: 2 [10:56:27.760] - relay: TRUE [10:56:27.761] - stdout: TRUE [10:56:27.761] - signal: TRUE [10:56:27.761] - resignal: FALSE [10:56:27.761] - force: TRUE [10:56:27.761] - relayed: [n=2] TRUE, TRUE [10:56:27.761] - queued futures: [n=2] TRUE, TRUE - flush all [10:56:27.762] - relayed: [n=2] TRUE, TRUE [10:56:27.762] - queued futures: [n=2] TRUE, TRUE [10:56:27.762] signalConditionsASAP(NULL, pos=0) ... done [10:56:27.762] resolve() on list ... DONE [10:56:27.762] - Number of value chunks collected: 2 [10:56:27.763] Resolving 2 futures (chunks) ... DONE [10:56:27.763] Reducing values from 2 chunks ... [10:56:27.763] - Number of values collected after concatenation: 2 [10:56:27.763] - Number of values expected: 2 [10:56:27.763] Reducing values from 2 chunks ... DONE [10:56:27.763] 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) ... [10:56:27.766] future_lapply() ... [10:56:27.820] Number of chunks: 2 [10:56:27.821] getGlobalsAndPackagesXApply() ... [10:56:27.821] - future.globals: TRUE [10:56:27.821] getGlobalsAndPackages() ... [10:56:27.822] Searching for globals... [10:56:27.824] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [10:56:27.824] Searching for globals ... DONE [10:56:27.824] Resolving globals: FALSE [10:56:27.825] The total size of the 2 globals is 784 bytes (784 bytes) [10:56:27.825] 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') [10:56:27.825] - globals: [2] 'FUN', 'a' [10:56:27.826] [10:56:27.826] getGlobalsAndPackages() ... DONE [10:56:27.826] - globals found/used: [n=2] 'FUN', 'a' [10:56:27.826] - needed namespaces: [n=0] [10:56:27.826] Finding globals ... DONE [10:56:27.826] - use_args: TRUE [10:56:27.826] - Getting '...' globals ... [10:56:27.827] resolve() on list ... [10:56:27.827] recursive: 0 [10:56:27.827] length: 1 [10:56:27.827] elements: '...' [10:56:27.828] length: 0 (resolved future 1) [10:56:27.828] resolve() on list ... DONE [10:56:27.828] - '...' content: [n=0] [10:56:27.828] List of 1 [10:56:27.828] $ ...: list() [10:56:27.828] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.828] - attr(*, "where")=List of 1 [10:56:27.828] ..$ ...: [10:56:27.828] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.828] - attr(*, "resolved")= logi TRUE [10:56:27.828] - attr(*, "total_size")= num NA [10:56:27.831] - Getting '...' globals ... DONE [10:56:27.832] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [10:56:27.832] List of 3 [10:56:27.832] $ ...future.FUN:function (z) [10:56:27.832] $ a : num 3.14 [10:56:27.832] $ ... : list() [10:56:27.832] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:27.832] - attr(*, "where")=List of 3 [10:56:27.832] ..$ ...future.FUN: [10:56:27.832] ..$ a : [10:56:27.832] ..$ ... : [10:56:27.832] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:27.832] - attr(*, "resolved")= logi FALSE [10:56:27.832] - attr(*, "total_size")= num 784 [10:56:27.836] Packages to be attached in all futures: [n=0] [10:56:27.836] getGlobalsAndPackagesXApply() ... DONE [10:56:27.836] Number of futures (= number of chunks): 2 [10:56:27.836] Launching 2 futures (chunks) ... [10:56:27.837] Chunk #1 of 2 ... [10:56:27.964] - Finding globals in 'X' for chunk #1 ... [10:56:27.964] getGlobalsAndPackages() ... [10:56:27.965] Searching for globals... [10:56:28.371] [10:56:28.371] Searching for globals ... DONE [10:56:28.371] - globals: [0] [10:56:28.372] getGlobalsAndPackages() ... DONE [10:56:28.372] + additional globals found: [n=0] [10:56:28.372] + additional namespaces needed: [n=0] [10:56:28.372] - Finding globals in 'X' for chunk #1 ... DONE [10:56:28.373] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [10:56:28.373] - seeds: [10:56:28.373] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:28.373] getGlobalsAndPackages() ... [10:56:28.374] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:28.374] Resolving globals: FALSE [10:56:28.374] Tweak future expression to call with '...' arguments ... [10:56:28.375] { [10:56:28.375] do.call(function(...) { [10:56:28.375] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:28.375] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:28.375] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:28.375] on.exit(options(oopts), add = TRUE) [10:56:28.375] } [10:56:28.375] { [10:56:28.375] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:28.375] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:28.375] ...future.FUN(...future.X_jj, ...) [10:56:28.375] }) [10:56:28.375] } [10:56:28.375] }, args = future.call.arguments) [10:56:28.375] } [10:56:28.375] Tweak future expression to call with '...' arguments ... DONE [10:56:28.376] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:28.376] [10:56:28.377] getGlobalsAndPackages() ... DONE [10:56:28.377] run() for 'Future' ... [10:56:28.378] - state: 'created' [10:56:28.378] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:28.382] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:28.382] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:28.382] - Field: 'label' [10:56:28.382] - Field: 'local' [10:56:28.383] - Field: 'owner' [10:56:28.383] - Field: 'envir' [10:56:28.383] - Field: 'packages' [10:56:28.384] - Field: 'gc' [10:56:28.384] - Field: 'conditions' [10:56:28.384] - Field: 'expr' [10:56:28.384] - Field: 'uuid' [10:56:28.385] - Field: 'seed' [10:56:28.385] - Field: 'version' [10:56:28.385] - Field: 'result' [10:56:28.385] - Field: 'asynchronous' [10:56:28.386] - Field: 'calls' [10:56:28.386] - Field: 'globals' [10:56:28.386] - Field: 'stdout' [10:56:28.387] - Field: 'earlySignal' [10:56:28.387] - Field: 'lazy' [10:56:28.387] - Field: 'state' [10:56:28.387] - Field: '.cluster' [10:56:28.388] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:28.388] - Launch lazy future ... [10:56:28.388] Packages needed by the future expression (n = 0): [10:56:28.388] Packages needed by future strategies (n = 0): [10:56:28.389] { [10:56:28.389] { [10:56:28.389] { [10:56:28.389] ...future.startTime <- base::Sys.time() [10:56:28.389] { [10:56:28.389] { [10:56:28.389] { [10:56:28.389] base::local({ [10:56:28.389] has_future <- base::requireNamespace("future", [10:56:28.389] quietly = TRUE) [10:56:28.389] if (has_future) { [10:56:28.389] ns <- base::getNamespace("future") [10:56:28.389] version <- ns[[".package"]][["version"]] [10:56:28.389] if (is.null(version)) [10:56:28.389] version <- utils::packageVersion("future") [10:56:28.389] } [10:56:28.389] else { [10:56:28.389] version <- NULL [10:56:28.389] } [10:56:28.389] if (!has_future || version < "1.8.0") { [10:56:28.389] info <- base::c(r_version = base::gsub("R version ", [10:56:28.389] "", base::R.version$version.string), [10:56:28.389] platform = base::sprintf("%s (%s-bit)", [10:56:28.389] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:28.389] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:28.389] "release", "version")], collapse = " "), [10:56:28.389] hostname = base::Sys.info()[["nodename"]]) [10:56:28.389] info <- base::sprintf("%s: %s", base::names(info), [10:56:28.389] info) [10:56:28.389] info <- base::paste(info, collapse = "; ") [10:56:28.389] if (!has_future) { [10:56:28.389] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:28.389] info) [10:56:28.389] } [10:56:28.389] else { [10:56:28.389] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:28.389] info, version) [10:56:28.389] } [10:56:28.389] base::stop(msg) [10:56:28.389] } [10:56:28.389] }) [10:56:28.389] } [10:56:28.389] ...future.strategy.old <- future::plan("list") [10:56:28.389] options(future.plan = NULL) [10:56:28.389] Sys.unsetenv("R_FUTURE_PLAN") [10:56:28.389] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:28.389] } [10:56:28.389] ...future.workdir <- getwd() [10:56:28.389] } [10:56:28.389] ...future.oldOptions <- base::as.list(base::.Options) [10:56:28.389] ...future.oldEnvVars <- base::Sys.getenv() [10:56:28.389] } [10:56:28.389] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:28.389] future.globals.maxSize = 1048576000, future.globals.method = NULL, [10:56:28.389] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:28.389] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:28.389] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:28.389] future.stdout.windows.reencode = NULL, width = 80L) [10:56:28.389] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:28.389] base::names(...future.oldOptions)) [10:56:28.389] } [10:56:28.389] if (FALSE) { [10:56:28.389] } [10:56:28.389] else { [10:56:28.389] if (TRUE) { [10:56:28.389] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:28.389] open = "w") [10:56:28.389] } [10:56:28.389] else { [10:56:28.389] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:28.389] windows = "NUL", "/dev/null"), open = "w") [10:56:28.389] } [10:56:28.389] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:28.389] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:28.389] base::sink(type = "output", split = FALSE) [10:56:28.389] base::close(...future.stdout) [10:56:28.389] }, add = TRUE) [10:56:28.389] } [10:56:28.389] ...future.frame <- base::sys.nframe() [10:56:28.389] ...future.conditions <- base::list() [10:56:28.389] ...future.rng <- base::globalenv()$.Random.seed [10:56:28.389] if (FALSE) { [10:56:28.389] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:28.389] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:28.389] } [10:56:28.389] ...future.result <- base::tryCatch({ [10:56:28.389] base::withCallingHandlers({ [10:56:28.389] ...future.value <- base::withVisible(base::local({ [10:56:28.389] do.call(function(...) { [10:56:28.389] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:28.389] if (!identical(...future.globals.maxSize.org, [10:56:28.389] ...future.globals.maxSize)) { [10:56:28.389] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:28.389] on.exit(options(oopts), add = TRUE) [10:56:28.389] } [10:56:28.389] { [10:56:28.389] lapply(seq_along(...future.elements_ii), [10:56:28.389] FUN = function(jj) { [10:56:28.389] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:28.389] ...future.FUN(...future.X_jj, ...) [10:56:28.389] }) [10:56:28.389] } [10:56:28.389] }, args = future.call.arguments) [10:56:28.389] })) [10:56:28.389] future::FutureResult(value = ...future.value$value, [10:56:28.389] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:28.389] ...future.rng), globalenv = if (FALSE) [10:56:28.389] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:28.389] ...future.globalenv.names)) [10:56:28.389] else NULL, started = ...future.startTime, version = "1.8") [10:56:28.389] }, condition = base::local({ [10:56:28.389] c <- base::c [10:56:28.389] inherits <- base::inherits [10:56:28.389] invokeRestart <- base::invokeRestart [10:56:28.389] length <- base::length [10:56:28.389] list <- base::list [10:56:28.389] seq.int <- base::seq.int [10:56:28.389] signalCondition <- base::signalCondition [10:56:28.389] sys.calls <- base::sys.calls [10:56:28.389] `[[` <- base::`[[` [10:56:28.389] `+` <- base::`+` [10:56:28.389] `<<-` <- base::`<<-` [10:56:28.389] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:28.389] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:28.389] 3L)] [10:56:28.389] } [10:56:28.389] function(cond) { [10:56:28.389] is_error <- inherits(cond, "error") [10:56:28.389] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:28.389] NULL) [10:56:28.389] if (is_error) { [10:56:28.389] sessionInformation <- function() { [10:56:28.389] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:28.389] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:28.389] search = base::search(), system = base::Sys.info()) [10:56:28.389] } [10:56:28.389] ...future.conditions[[length(...future.conditions) + [10:56:28.389] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:28.389] cond$call), session = sessionInformation(), [10:56:28.389] timestamp = base::Sys.time(), signaled = 0L) [10:56:28.389] signalCondition(cond) [10:56:28.389] } [10:56:28.389] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:28.389] signal <- FALSE && inherits(cond, character(0)) [10:56:28.389] ...future.conditions[[length(...future.conditions) + [10:56:28.389] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:28.389] if (FALSE && !signal) { [10:56:28.389] muffleCondition <- function (cond, pattern = "^muffle") [10:56:28.389] { [10:56:28.389] inherits <- base::inherits [10:56:28.389] invokeRestart <- base::invokeRestart [10:56:28.389] is.null <- base::is.null [10:56:28.389] muffled <- FALSE [10:56:28.389] if (inherits(cond, "message")) { [10:56:28.389] muffled <- grepl(pattern, "muffleMessage") [10:56:28.389] if (muffled) [10:56:28.389] invokeRestart("muffleMessage") [10:56:28.389] } [10:56:28.389] else if (inherits(cond, "warning")) { [10:56:28.389] muffled <- grepl(pattern, "muffleWarning") [10:56:28.389] if (muffled) [10:56:28.389] invokeRestart("muffleWarning") [10:56:28.389] } [10:56:28.389] else if (inherits(cond, "condition")) { [10:56:28.389] if (!is.null(pattern)) { [10:56:28.389] computeRestarts <- base::computeRestarts [10:56:28.389] grepl <- base::grepl [10:56:28.389] restarts <- computeRestarts(cond) [10:56:28.389] for (restart in restarts) { [10:56:28.389] name <- restart$name [10:56:28.389] if (is.null(name)) [10:56:28.389] next [10:56:28.389] if (!grepl(pattern, name)) [10:56:28.389] next [10:56:28.389] invokeRestart(restart) [10:56:28.389] muffled <- TRUE [10:56:28.389] break [10:56:28.389] } [10:56:28.389] } [10:56:28.389] } [10:56:28.389] invisible(muffled) [10:56:28.389] } [10:56:28.389] muffleCondition(cond, pattern = "^muffle") [10:56:28.389] } [10:56:28.389] } [10:56:28.389] else { [10:56:28.389] if (TRUE) { [10:56:28.389] muffleCondition <- function (cond, pattern = "^muffle") [10:56:28.389] { [10:56:28.389] inherits <- base::inherits [10:56:28.389] invokeRestart <- base::invokeRestart [10:56:28.389] is.null <- base::is.null [10:56:28.389] muffled <- FALSE [10:56:28.389] if (inherits(cond, "message")) { [10:56:28.389] muffled <- grepl(pattern, "muffleMessage") [10:56:28.389] if (muffled) [10:56:28.389] invokeRestart("muffleMessage") [10:56:28.389] } [10:56:28.389] else if (inherits(cond, "warning")) { [10:56:28.389] muffled <- grepl(pattern, "muffleWarning") [10:56:28.389] if (muffled) [10:56:28.389] invokeRestart("muffleWarning") [10:56:28.389] } [10:56:28.389] else if (inherits(cond, "condition")) { [10:56:28.389] if (!is.null(pattern)) { [10:56:28.389] computeRestarts <- base::computeRestarts [10:56:28.389] grepl <- base::grepl [10:56:28.389] restarts <- computeRestarts(cond) [10:56:28.389] for (restart in restarts) { [10:56:28.389] name <- restart$name [10:56:28.389] if (is.null(name)) [10:56:28.389] next [10:56:28.389] if (!grepl(pattern, name)) [10:56:28.389] next [10:56:28.389] invokeRestart(restart) [10:56:28.389] muffled <- TRUE [10:56:28.389] break [10:56:28.389] } [10:56:28.389] } [10:56:28.389] } [10:56:28.389] invisible(muffled) [10:56:28.389] } [10:56:28.389] muffleCondition(cond, pattern = "^muffle") [10:56:28.389] } [10:56:28.389] } [10:56:28.389] } [10:56:28.389] })) [10:56:28.389] }, error = function(ex) { [10:56:28.389] base::structure(base::list(value = NULL, visible = NULL, [10:56:28.389] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:28.389] ...future.rng), started = ...future.startTime, [10:56:28.389] finished = Sys.time(), session_uuid = NA_character_, [10:56:28.389] version = "1.8"), class = "FutureResult") [10:56:28.389] }, finally = { [10:56:28.389] if (!identical(...future.workdir, getwd())) [10:56:28.389] setwd(...future.workdir) [10:56:28.389] { [10:56:28.389] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:28.389] ...future.oldOptions$nwarnings <- NULL [10:56:28.389] } [10:56:28.389] base::options(...future.oldOptions) [10:56:28.389] if (.Platform$OS.type == "windows") { [10:56:28.389] old_names <- names(...future.oldEnvVars) [10:56:28.389] envs <- base::Sys.getenv() [10:56:28.389] names <- names(envs) [10:56:28.389] common <- intersect(names, old_names) [10:56:28.389] added <- setdiff(names, old_names) [10:56:28.389] removed <- setdiff(old_names, names) [10:56:28.389] changed <- common[...future.oldEnvVars[common] != [10:56:28.389] envs[common]] [10:56:28.389] NAMES <- toupper(changed) [10:56:28.389] args <- list() [10:56:28.389] for (kk in seq_along(NAMES)) { [10:56:28.389] name <- changed[[kk]] [10:56:28.389] NAME <- NAMES[[kk]] [10:56:28.389] if (name != NAME && is.element(NAME, old_names)) [10:56:28.389] next [10:56:28.389] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:28.389] } [10:56:28.389] NAMES <- toupper(added) [10:56:28.389] for (kk in seq_along(NAMES)) { [10:56:28.389] name <- added[[kk]] [10:56:28.389] NAME <- NAMES[[kk]] [10:56:28.389] if (name != NAME && is.element(NAME, old_names)) [10:56:28.389] next [10:56:28.389] args[[name]] <- "" [10:56:28.389] } [10:56:28.389] NAMES <- toupper(removed) [10:56:28.389] for (kk in seq_along(NAMES)) { [10:56:28.389] name <- removed[[kk]] [10:56:28.389] NAME <- NAMES[[kk]] [10:56:28.389] if (name != NAME && is.element(NAME, old_names)) [10:56:28.389] next [10:56:28.389] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:28.389] } [10:56:28.389] if (length(args) > 0) [10:56:28.389] base::do.call(base::Sys.setenv, args = args) [10:56:28.389] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:28.389] } [10:56:28.389] else { [10:56:28.389] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:28.389] } [10:56:28.389] { [10:56:28.389] if (base::length(...future.futureOptionsAdded) > [10:56:28.389] 0L) { [10:56:28.389] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:28.389] base::names(opts) <- ...future.futureOptionsAdded [10:56:28.389] base::options(opts) [10:56:28.389] } [10:56:28.389] { [10:56:28.389] NULL [10:56:28.389] options(future.plan = NULL) [10:56:28.389] if (is.na(NA_character_)) [10:56:28.389] Sys.unsetenv("R_FUTURE_PLAN") [10:56:28.389] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:28.389] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:28.389] .init = FALSE) [10:56:28.389] } [10:56:28.389] } [10:56:28.389] } [10:56:28.389] }) [10:56:28.389] if (TRUE) { [10:56:28.389] base::sink(type = "output", split = FALSE) [10:56:28.389] if (TRUE) { [10:56:28.389] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:28.389] } [10:56:28.389] else { [10:56:28.389] ...future.result["stdout"] <- base::list(NULL) [10:56:28.389] } [10:56:28.389] base::close(...future.stdout) [10:56:28.389] ...future.stdout <- NULL [10:56:28.389] } [10:56:28.389] ...future.result$conditions <- ...future.conditions [10:56:28.389] ...future.result$finished <- base::Sys.time() [10:56:28.389] ...future.result [10:56:28.389] } [10:56:28.425] - Launch lazy future ... done [10:56:28.425] run() for 'MiraiFuture' ... done [10:56:28.425] Created future: [10:56:31.011] resolved() for 'MiraiFuture' ... [10:56:31.012] - state: 'running' [10:56:31.012] - run: TRUE [10:56:31.012] - result: 'NULL' [10:56:31.012] - resolved: FALSE [10:56:31.013] resolved() for 'MiraiFuture' ... done [10:56:28.426] MiraiFuture: [10:56:28.426] Label: 'future_lapply-1' [10:56:28.426] Expression: [10:56:28.426] { [10:56:28.426] do.call(function(...) { [10:56:28.426] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:28.426] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:28.426] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:28.426] on.exit(options(oopts), add = TRUE) [10:56:28.426] } [10:56:28.426] { [10:56:28.426] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:28.426] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:28.426] ...future.FUN(...future.X_jj, ...) [10:56:28.426] }) [10:56:28.426] } [10:56:28.426] }, args = future.call.arguments) [10:56:28.426] } [10:56:28.426] Lazy evaluation: FALSE [10:56:28.426] Asynchronous evaluation: TRUE [10:56:28.426] Local evaluation: TRUE [10:56:28.426] Environment: R_GlobalEnv [10:56:28.426] Capture standard output: TRUE [10:56:28.426] Capture condition classes: 'condition' (excluding 'nothing') [10:56:28.426] 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, ...) [10:56:28.426] Packages: [10:56:28.426] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:28.426] Resolved: TRUE [10:56:28.426] Value: [10:56:28.426] Conditions captured: [10:56:28.426] Early signaling: FALSE [10:56:28.426] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:28.426] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:31.047] Chunk #1 of 2 ... DONE [10:56:31.047] Chunk #2 of 2 ... [10:56:31.189] - Finding globals in 'X' for chunk #2 ... [10:56:31.189] getGlobalsAndPackages() ... [10:56:31.189] Searching for globals... [10:56:31.628] [10:56:31.629] Searching for globals ... DONE [10:56:31.629] - globals: [0] [10:56:31.629] getGlobalsAndPackages() ... DONE [10:56:31.629] + additional globals found: [n=0] [10:56:31.629] + additional namespaces needed: [n=0] [10:56:31.630] - Finding globals in 'X' for chunk #2 ... DONE [10:56:31.630] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [10:56:31.630] - seeds: [10:56:31.630] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:31.630] getGlobalsAndPackages() ... [10:56:31.630] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:31.631] Resolving globals: FALSE [10:56:31.631] Tweak future expression to call with '...' arguments ... [10:56:31.631] { [10:56:31.631] do.call(function(...) { [10:56:31.631] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:31.631] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:31.631] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:31.631] on.exit(options(oopts), add = TRUE) [10:56:31.631] } [10:56:31.631] { [10:56:31.631] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:31.631] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:31.631] ...future.FUN(...future.X_jj, ...) [10:56:31.631] }) [10:56:31.631] } [10:56:31.631] }, args = future.call.arguments) [10:56:31.631] } [10:56:31.632] Tweak future expression to call with '...' arguments ... DONE [10:56:31.632] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:31.633] [10:56:31.633] getGlobalsAndPackages() ... DONE [10:56:31.633] run() for 'Future' ... [10:56:31.633] - state: 'created' [10:56:31.634] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:31.636] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:31.637] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:31.637] - Field: 'label' [10:56:31.637] - Field: 'local' [10:56:31.637] - Field: 'owner' [10:56:31.637] - Field: 'envir' [10:56:31.638] - Field: 'packages' [10:56:31.638] - Field: 'gc' [10:56:31.638] - Field: 'conditions' [10:56:31.638] - Field: 'expr' [10:56:31.638] - Field: 'uuid' [10:56:31.638] - Field: 'seed' [10:56:31.639] - Field: 'version' [10:56:31.639] - Field: 'result' [10:56:31.639] - Field: 'asynchronous' [10:56:31.639] - Field: 'calls' [10:56:31.639] - Field: 'globals' [10:56:31.639] - Field: 'stdout' [10:56:31.640] - Field: 'earlySignal' [10:56:31.640] - Field: 'lazy' [10:56:31.640] - Field: 'state' [10:56:31.640] - Field: '.cluster' [10:56:31.640] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:31.641] - Launch lazy future ... [10:56:31.641] Packages needed by the future expression (n = 0): [10:56:31.641] Packages needed by future strategies (n = 0): [10:56:31.642] { [10:56:31.642] { [10:56:31.642] { [10:56:31.642] ...future.startTime <- base::Sys.time() [10:56:31.642] { [10:56:31.642] { [10:56:31.642] { [10:56:31.642] base::local({ [10:56:31.642] has_future <- base::requireNamespace("future", [10:56:31.642] quietly = TRUE) [10:56:31.642] if (has_future) { [10:56:31.642] ns <- base::getNamespace("future") [10:56:31.642] version <- ns[[".package"]][["version"]] [10:56:31.642] if (is.null(version)) [10:56:31.642] version <- utils::packageVersion("future") [10:56:31.642] } [10:56:31.642] else { [10:56:31.642] version <- NULL [10:56:31.642] } [10:56:31.642] if (!has_future || version < "1.8.0") { [10:56:31.642] info <- base::c(r_version = base::gsub("R version ", [10:56:31.642] "", base::R.version$version.string), [10:56:31.642] platform = base::sprintf("%s (%s-bit)", [10:56:31.642] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:31.642] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:31.642] "release", "version")], collapse = " "), [10:56:31.642] hostname = base::Sys.info()[["nodename"]]) [10:56:31.642] info <- base::sprintf("%s: %s", base::names(info), [10:56:31.642] info) [10:56:31.642] info <- base::paste(info, collapse = "; ") [10:56:31.642] if (!has_future) { [10:56:31.642] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:31.642] info) [10:56:31.642] } [10:56:31.642] else { [10:56:31.642] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:31.642] info, version) [10:56:31.642] } [10:56:31.642] base::stop(msg) [10:56:31.642] } [10:56:31.642] }) [10:56:31.642] } [10:56:31.642] ...future.strategy.old <- future::plan("list") [10:56:31.642] options(future.plan = NULL) [10:56:31.642] Sys.unsetenv("R_FUTURE_PLAN") [10:56:31.642] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:31.642] } [10:56:31.642] ...future.workdir <- getwd() [10:56:31.642] } [10:56:31.642] ...future.oldOptions <- base::as.list(base::.Options) [10:56:31.642] ...future.oldEnvVars <- base::Sys.getenv() [10:56:31.642] } [10:56:31.642] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:31.642] future.globals.maxSize = 1048576000, future.globals.method = NULL, [10:56:31.642] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:31.642] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:31.642] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:31.642] future.stdout.windows.reencode = NULL, width = 80L) [10:56:31.642] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:31.642] base::names(...future.oldOptions)) [10:56:31.642] } [10:56:31.642] if (FALSE) { [10:56:31.642] } [10:56:31.642] else { [10:56:31.642] if (TRUE) { [10:56:31.642] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:31.642] open = "w") [10:56:31.642] } [10:56:31.642] else { [10:56:31.642] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:31.642] windows = "NUL", "/dev/null"), open = "w") [10:56:31.642] } [10:56:31.642] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:31.642] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:31.642] base::sink(type = "output", split = FALSE) [10:56:31.642] base::close(...future.stdout) [10:56:31.642] }, add = TRUE) [10:56:31.642] } [10:56:31.642] ...future.frame <- base::sys.nframe() [10:56:31.642] ...future.conditions <- base::list() [10:56:31.642] ...future.rng <- base::globalenv()$.Random.seed [10:56:31.642] if (FALSE) { [10:56:31.642] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:31.642] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:31.642] } [10:56:31.642] ...future.result <- base::tryCatch({ [10:56:31.642] base::withCallingHandlers({ [10:56:31.642] ...future.value <- base::withVisible(base::local({ [10:56:31.642] do.call(function(...) { [10:56:31.642] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:31.642] if (!identical(...future.globals.maxSize.org, [10:56:31.642] ...future.globals.maxSize)) { [10:56:31.642] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:31.642] on.exit(options(oopts), add = TRUE) [10:56:31.642] } [10:56:31.642] { [10:56:31.642] lapply(seq_along(...future.elements_ii), [10:56:31.642] FUN = function(jj) { [10:56:31.642] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:31.642] ...future.FUN(...future.X_jj, ...) [10:56:31.642] }) [10:56:31.642] } [10:56:31.642] }, args = future.call.arguments) [10:56:31.642] })) [10:56:31.642] future::FutureResult(value = ...future.value$value, [10:56:31.642] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:31.642] ...future.rng), globalenv = if (FALSE) [10:56:31.642] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:31.642] ...future.globalenv.names)) [10:56:31.642] else NULL, started = ...future.startTime, version = "1.8") [10:56:31.642] }, condition = base::local({ [10:56:31.642] c <- base::c [10:56:31.642] inherits <- base::inherits [10:56:31.642] invokeRestart <- base::invokeRestart [10:56:31.642] length <- base::length [10:56:31.642] list <- base::list [10:56:31.642] seq.int <- base::seq.int [10:56:31.642] signalCondition <- base::signalCondition [10:56:31.642] sys.calls <- base::sys.calls [10:56:31.642] `[[` <- base::`[[` [10:56:31.642] `+` <- base::`+` [10:56:31.642] `<<-` <- base::`<<-` [10:56:31.642] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:31.642] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:31.642] 3L)] [10:56:31.642] } [10:56:31.642] function(cond) { [10:56:31.642] is_error <- inherits(cond, "error") [10:56:31.642] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:31.642] NULL) [10:56:31.642] if (is_error) { [10:56:31.642] sessionInformation <- function() { [10:56:31.642] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:31.642] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:31.642] search = base::search(), system = base::Sys.info()) [10:56:31.642] } [10:56:31.642] ...future.conditions[[length(...future.conditions) + [10:56:31.642] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:31.642] cond$call), session = sessionInformation(), [10:56:31.642] timestamp = base::Sys.time(), signaled = 0L) [10:56:31.642] signalCondition(cond) [10:56:31.642] } [10:56:31.642] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:31.642] signal <- FALSE && inherits(cond, character(0)) [10:56:31.642] ...future.conditions[[length(...future.conditions) + [10:56:31.642] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:31.642] if (FALSE && !signal) { [10:56:31.642] muffleCondition <- function (cond, pattern = "^muffle") [10:56:31.642] { [10:56:31.642] inherits <- base::inherits [10:56:31.642] invokeRestart <- base::invokeRestart [10:56:31.642] is.null <- base::is.null [10:56:31.642] muffled <- FALSE [10:56:31.642] if (inherits(cond, "message")) { [10:56:31.642] muffled <- grepl(pattern, "muffleMessage") [10:56:31.642] if (muffled) [10:56:31.642] invokeRestart("muffleMessage") [10:56:31.642] } [10:56:31.642] else if (inherits(cond, "warning")) { [10:56:31.642] muffled <- grepl(pattern, "muffleWarning") [10:56:31.642] if (muffled) [10:56:31.642] invokeRestart("muffleWarning") [10:56:31.642] } [10:56:31.642] else if (inherits(cond, "condition")) { [10:56:31.642] if (!is.null(pattern)) { [10:56:31.642] computeRestarts <- base::computeRestarts [10:56:31.642] grepl <- base::grepl [10:56:31.642] restarts <- computeRestarts(cond) [10:56:31.642] for (restart in restarts) { [10:56:31.642] name <- restart$name [10:56:31.642] if (is.null(name)) [10:56:31.642] next [10:56:31.642] if (!grepl(pattern, name)) [10:56:31.642] next [10:56:31.642] invokeRestart(restart) [10:56:31.642] muffled <- TRUE [10:56:31.642] break [10:56:31.642] } [10:56:31.642] } [10:56:31.642] } [10:56:31.642] invisible(muffled) [10:56:31.642] } [10:56:31.642] muffleCondition(cond, pattern = "^muffle") [10:56:31.642] } [10:56:31.642] } [10:56:31.642] else { [10:56:31.642] if (TRUE) { [10:56:31.642] muffleCondition <- function (cond, pattern = "^muffle") [10:56:31.642] { [10:56:31.642] inherits <- base::inherits [10:56:31.642] invokeRestart <- base::invokeRestart [10:56:31.642] is.null <- base::is.null [10:56:31.642] muffled <- FALSE [10:56:31.642] if (inherits(cond, "message")) { [10:56:31.642] muffled <- grepl(pattern, "muffleMessage") [10:56:31.642] if (muffled) [10:56:31.642] invokeRestart("muffleMessage") [10:56:31.642] } [10:56:31.642] else if (inherits(cond, "warning")) { [10:56:31.642] muffled <- grepl(pattern, "muffleWarning") [10:56:31.642] if (muffled) [10:56:31.642] invokeRestart("muffleWarning") [10:56:31.642] } [10:56:31.642] else if (inherits(cond, "condition")) { [10:56:31.642] if (!is.null(pattern)) { [10:56:31.642] computeRestarts <- base::computeRestarts [10:56:31.642] grepl <- base::grepl [10:56:31.642] restarts <- computeRestarts(cond) [10:56:31.642] for (restart in restarts) { [10:56:31.642] name <- restart$name [10:56:31.642] if (is.null(name)) [10:56:31.642] next [10:56:31.642] if (!grepl(pattern, name)) [10:56:31.642] next [10:56:31.642] invokeRestart(restart) [10:56:31.642] muffled <- TRUE [10:56:31.642] break [10:56:31.642] } [10:56:31.642] } [10:56:31.642] } [10:56:31.642] invisible(muffled) [10:56:31.642] } [10:56:31.642] muffleCondition(cond, pattern = "^muffle") [10:56:31.642] } [10:56:31.642] } [10:56:31.642] } [10:56:31.642] })) [10:56:31.642] }, error = function(ex) { [10:56:31.642] base::structure(base::list(value = NULL, visible = NULL, [10:56:31.642] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:31.642] ...future.rng), started = ...future.startTime, [10:56:31.642] finished = Sys.time(), session_uuid = NA_character_, [10:56:31.642] version = "1.8"), class = "FutureResult") [10:56:31.642] }, finally = { [10:56:31.642] if (!identical(...future.workdir, getwd())) [10:56:31.642] setwd(...future.workdir) [10:56:31.642] { [10:56:31.642] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:31.642] ...future.oldOptions$nwarnings <- NULL [10:56:31.642] } [10:56:31.642] base::options(...future.oldOptions) [10:56:31.642] if (.Platform$OS.type == "windows") { [10:56:31.642] old_names <- names(...future.oldEnvVars) [10:56:31.642] envs <- base::Sys.getenv() [10:56:31.642] names <- names(envs) [10:56:31.642] common <- intersect(names, old_names) [10:56:31.642] added <- setdiff(names, old_names) [10:56:31.642] removed <- setdiff(old_names, names) [10:56:31.642] changed <- common[...future.oldEnvVars[common] != [10:56:31.642] envs[common]] [10:56:31.642] NAMES <- toupper(changed) [10:56:31.642] args <- list() [10:56:31.642] for (kk in seq_along(NAMES)) { [10:56:31.642] name <- changed[[kk]] [10:56:31.642] NAME <- NAMES[[kk]] [10:56:31.642] if (name != NAME && is.element(NAME, old_names)) [10:56:31.642] next [10:56:31.642] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:31.642] } [10:56:31.642] NAMES <- toupper(added) [10:56:31.642] for (kk in seq_along(NAMES)) { [10:56:31.642] name <- added[[kk]] [10:56:31.642] NAME <- NAMES[[kk]] [10:56:31.642] if (name != NAME && is.element(NAME, old_names)) [10:56:31.642] next [10:56:31.642] args[[name]] <- "" [10:56:31.642] } [10:56:31.642] NAMES <- toupper(removed) [10:56:31.642] for (kk in seq_along(NAMES)) { [10:56:31.642] name <- removed[[kk]] [10:56:31.642] NAME <- NAMES[[kk]] [10:56:31.642] if (name != NAME && is.element(NAME, old_names)) [10:56:31.642] next [10:56:31.642] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:31.642] } [10:56:31.642] if (length(args) > 0) [10:56:31.642] base::do.call(base::Sys.setenv, args = args) [10:56:31.642] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:31.642] } [10:56:31.642] else { [10:56:31.642] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:31.642] } [10:56:31.642] { [10:56:31.642] if (base::length(...future.futureOptionsAdded) > [10:56:31.642] 0L) { [10:56:31.642] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:31.642] base::names(opts) <- ...future.futureOptionsAdded [10:56:31.642] base::options(opts) [10:56:31.642] } [10:56:31.642] { [10:56:31.642] NULL [10:56:31.642] options(future.plan = NULL) [10:56:31.642] if (is.na(NA_character_)) [10:56:31.642] Sys.unsetenv("R_FUTURE_PLAN") [10:56:31.642] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:31.642] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:31.642] .init = FALSE) [10:56:31.642] } [10:56:31.642] } [10:56:31.642] } [10:56:31.642] }) [10:56:31.642] if (TRUE) { [10:56:31.642] base::sink(type = "output", split = FALSE) [10:56:31.642] if (TRUE) { [10:56:31.642] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:31.642] } [10:56:31.642] else { [10:56:31.642] ...future.result["stdout"] <- base::list(NULL) [10:56:31.642] } [10:56:31.642] base::close(...future.stdout) [10:56:31.642] ...future.stdout <- NULL [10:56:31.642] } [10:56:31.642] ...future.result$conditions <- ...future.conditions [10:56:31.642] ...future.result$finished <- base::Sys.time() [10:56:31.642] ...future.result [10:56:31.642] } [10:56:31.680] - Launch lazy future ... done [10:56:31.680] run() for 'MiraiFuture' ... done [10:56:31.680] Created future: [10:56:34.469] resolved() for 'MiraiFuture' ... [10:56:34.469] - state: 'running' [10:56:34.469] - run: TRUE [10:56:34.469] - result: 'NULL' [10:56:34.470] - resolved: FALSE [10:56:34.470] resolved() for 'MiraiFuture' ... done [10:56:31.681] MiraiFuture: [10:56:31.681] Label: 'future_lapply-2' [10:56:31.681] Expression: [10:56:31.681] { [10:56:31.681] do.call(function(...) { [10:56:31.681] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:31.681] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:31.681] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:31.681] on.exit(options(oopts), add = TRUE) [10:56:31.681] } [10:56:31.681] { [10:56:31.681] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:31.681] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:31.681] ...future.FUN(...future.X_jj, ...) [10:56:31.681] }) [10:56:31.681] } [10:56:31.681] }, args = future.call.arguments) [10:56:31.681] } [10:56:31.681] Lazy evaluation: FALSE [10:56:31.681] Asynchronous evaluation: TRUE [10:56:31.681] Local evaluation: TRUE [10:56:31.681] Environment: R_GlobalEnv [10:56:31.681] Capture standard output: TRUE [10:56:31.681] Capture condition classes: 'condition' (excluding 'nothing') [10:56:31.681] 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, ...) [10:56:31.681] Packages: [10:56:31.681] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:31.681] Resolved: TRUE [10:56:31.681] Value: [10:56:31.681] Conditions captured: [10:56:31.681] Early signaling: FALSE [10:56:31.681] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:31.681] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:34.501] Chunk #2 of 2 ... DONE [10:56:34.501] Launching 2 futures (chunks) ... DONE [10:56:34.501] Resolving 2 futures (chunks) ... [10:56:34.502] resolve() on list ... [10:56:34.502] recursive: 0 [10:56:34.502] length: 2 [10:56:34.502] [10:56:34.502] resolved() for 'MiraiFuture' ... [10:56:34.503] - state: 'running' [10:56:34.503] - run: TRUE [10:56:34.503] - result: 'NULL' [10:56:34.503] - resolved: FALSE [10:56:34.503] resolved() for 'MiraiFuture' ... done [10:56:34.503] Future #1 [10:56:34.504] signalConditionsASAP(MiraiFuture, pos=1) ... [10:56:34.504] - nx: 2 [10:56:34.504] - relay: TRUE [10:56:34.504] - stdout: TRUE [10:56:34.504] - signal: TRUE [10:56:34.505] - resignal: FALSE [10:56:34.505] - force: TRUE [10:56:34.505] - relayed: [n=2] FALSE, FALSE [10:56:34.505] - queued futures: [n=2] FALSE, FALSE [10:56:34.505] - until=1 [10:56:34.505] - relaying element #1 [10:56:34.506] - relayed: [n=2] TRUE, FALSE [10:56:34.506] - queued futures: [n=2] TRUE, FALSE [10:56:34.506] signalConditionsASAP(MiraiFuture, pos=1) ... done [10:56:34.506] length: 1 (resolved future 1) [10:56:34.506] resolved() for 'MiraiFuture' ... [10:56:34.507] - state: 'running' [10:56:34.507] - run: TRUE [10:56:34.507] - result: 'NULL' [10:56:34.507] - resolved: FALSE [10:56:34.507] resolved() for 'MiraiFuture' ... done [10:56:34.508] Future #2 [10:56:34.508] signalConditionsASAP(MiraiFuture, pos=2) ... [10:56:34.508] - nx: 2 [10:56:34.508] - relay: TRUE [10:56:34.508] - stdout: TRUE [10:56:34.508] - signal: TRUE [10:56:34.509] - resignal: FALSE [10:56:34.509] - force: TRUE [10:56:34.509] - relayed: [n=2] TRUE, FALSE [10:56:34.509] - queued futures: [n=2] TRUE, FALSE [10:56:34.509] - until=2 [10:56:34.509] - relaying element #2 [10:56:34.510] - relayed: [n=2] TRUE, TRUE [10:56:34.510] - queued futures: [n=2] TRUE, TRUE [10:56:34.510] signalConditionsASAP(MiraiFuture, pos=2) ... done [10:56:34.511] length: 0 (resolved future 2) [10:56:34.511] Relaying remaining futures [10:56:34.511] signalConditionsASAP(NULL, pos=0) ... [10:56:34.511] - nx: 2 [10:56:34.511] - relay: TRUE [10:56:34.511] - stdout: TRUE [10:56:34.512] - signal: TRUE [10:56:34.512] - resignal: FALSE [10:56:34.512] - force: TRUE [10:56:34.512] - relayed: [n=2] TRUE, TRUE [10:56:34.512] - queued futures: [n=2] TRUE, TRUE - flush all [10:56:34.512] - relayed: [n=2] TRUE, TRUE [10:56:34.513] - queued futures: [n=2] TRUE, TRUE [10:56:34.513] signalConditionsASAP(NULL, pos=0) ... done [10:56:34.513] resolve() on list ... DONE [10:56:34.527] - Number of value chunks collected: 2 [10:56:34.527] Resolving 2 futures (chunks) ... DONE [10:56:34.527] Reducing values from 2 chunks ... [10:56:34.546] - Number of values collected after concatenation: 1000000 [10:56:34.546] - Number of values expected: 1000000 [10:56:34.546] Reducing values from 2 chunks ... DONE [10:56:34.561] future_lapply() ... DONE - future_lapply() with global in non-attached package ... [10:56:34.848] plan(): Setting new future strategy stack: [10:56:34.848] List of future strategies: [10:56:34.848] 1. mirai_multisession: [10:56:34.848] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [10:56:34.848] - tweaked: FALSE [10:56:34.848] - call: plan(strategy) [10:56:34.849] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [10:56:34.849] < mirai | $data > [10:56:34.852] getGlobalsAndPackages() ... [10:56:34.852] Not searching for globals [10:56:34.852] - globals: [0] [10:56:34.852] getGlobalsAndPackages() ... DONE [10:56:34.852] getGlobalsAndPackages() ... [10:56:34.853] [10:56:34.854] - globals: [0] [10:56:34.854] getGlobalsAndPackages() ... DONE [10:56:34.855] Packages needed by the future expression (n = 0): [10:56:34.855] Packages needed by future strategies (n = 0): [10:56:34.856] { [10:56:34.856] { [10:56:34.856] { [10:56:34.856] ...future.startTime <- base::Sys.time() [10:56:34.856] { [10:56:34.856] { [10:56:34.856] { [10:56:34.856] base::local({ [10:56:34.856] has_future <- base::requireNamespace("future", [10:56:34.856] quietly = TRUE) [10:56:34.856] if (has_future) { [10:56:34.856] ns <- base::getNamespace("future") [10:56:34.856] version <- ns[[".package"]][["version"]] [10:56:34.856] if (is.null(version)) [10:56:34.856] version <- utils::packageVersion("future") [10:56:34.856] } [10:56:34.856] else { [10:56:34.856] version <- NULL [10:56:34.856] } [10:56:34.856] if (!has_future || version < "1.8.0") { [10:56:34.856] info <- base::c(r_version = base::gsub("R version ", [10:56:34.856] "", base::R.version$version.string), [10:56:34.856] platform = base::sprintf("%s (%s-bit)", [10:56:34.856] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:34.856] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:34.856] "release", "version")], collapse = " "), [10:56:34.856] hostname = base::Sys.info()[["nodename"]]) [10:56:34.856] info <- base::sprintf("%s: %s", base::names(info), [10:56:34.856] info) [10:56:34.856] info <- base::paste(info, collapse = "; ") [10:56:34.856] if (!has_future) { [10:56:34.856] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:34.856] info) [10:56:34.856] } [10:56:34.856] else { [10:56:34.856] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:34.856] info, version) [10:56:34.856] } [10:56:34.856] base::stop(msg) [10:56:34.856] } [10:56:34.856] }) [10:56:34.856] } [10:56:34.856] ...future.strategy.old <- future::plan("list") [10:56:34.856] options(future.plan = NULL) [10:56:34.856] Sys.unsetenv("R_FUTURE_PLAN") [10:56:34.856] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:34.856] } [10:56:34.856] ...future.workdir <- getwd() [10:56:34.856] } [10:56:34.856] ...future.oldOptions <- base::as.list(base::.Options) [10:56:34.856] ...future.oldEnvVars <- base::Sys.getenv() [10:56:34.856] } [10:56:34.856] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:34.856] future.globals.maxSize = NULL, future.globals.method = NULL, [10:56:34.856] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:34.856] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:34.856] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:34.856] future.stdout.windows.reencode = NULL, width = 80L) [10:56:34.856] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:34.856] base::names(...future.oldOptions)) [10:56:34.856] } [10:56:34.856] if (FALSE) { [10:56:34.856] } [10:56:34.856] else { [10:56:34.856] if (TRUE) { [10:56:34.856] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:34.856] open = "w") [10:56:34.856] } [10:56:34.856] else { [10:56:34.856] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:34.856] windows = "NUL", "/dev/null"), open = "w") [10:56:34.856] } [10:56:34.856] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:34.856] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:34.856] base::sink(type = "output", split = FALSE) [10:56:34.856] base::close(...future.stdout) [10:56:34.856] }, add = TRUE) [10:56:34.856] } [10:56:34.856] ...future.frame <- base::sys.nframe() [10:56:34.856] ...future.conditions <- base::list() [10:56:34.856] ...future.rng <- base::globalenv()$.Random.seed [10:56:34.856] if (FALSE) { [10:56:34.856] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:34.856] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:34.856] } [10:56:34.856] ...future.result <- base::tryCatch({ [10:56:34.856] base::withCallingHandlers({ [10:56:34.856] ...future.value <- base::withVisible(base::local(NA)) [10:56:34.856] future::FutureResult(value = ...future.value$value, [10:56:34.856] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:34.856] ...future.rng), globalenv = if (FALSE) [10:56:34.856] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:34.856] ...future.globalenv.names)) [10:56:34.856] else NULL, started = ...future.startTime, version = "1.8") [10:56:34.856] }, condition = base::local({ [10:56:34.856] c <- base::c [10:56:34.856] inherits <- base::inherits [10:56:34.856] invokeRestart <- base::invokeRestart [10:56:34.856] length <- base::length [10:56:34.856] list <- base::list [10:56:34.856] seq.int <- base::seq.int [10:56:34.856] signalCondition <- base::signalCondition [10:56:34.856] sys.calls <- base::sys.calls [10:56:34.856] `[[` <- base::`[[` [10:56:34.856] `+` <- base::`+` [10:56:34.856] `<<-` <- base::`<<-` [10:56:34.856] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:34.856] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:34.856] 3L)] [10:56:34.856] } [10:56:34.856] function(cond) { [10:56:34.856] is_error <- inherits(cond, "error") [10:56:34.856] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:34.856] NULL) [10:56:34.856] if (is_error) { [10:56:34.856] sessionInformation <- function() { [10:56:34.856] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:34.856] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:34.856] search = base::search(), system = base::Sys.info()) [10:56:34.856] } [10:56:34.856] ...future.conditions[[length(...future.conditions) + [10:56:34.856] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:34.856] cond$call), session = sessionInformation(), [10:56:34.856] timestamp = base::Sys.time(), signaled = 0L) [10:56:34.856] signalCondition(cond) [10:56:34.856] } [10:56:34.856] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:34.856] signal <- FALSE && inherits(cond, character(0)) [10:56:34.856] ...future.conditions[[length(...future.conditions) + [10:56:34.856] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:34.856] if (FALSE && !signal) { [10:56:34.856] muffleCondition <- function (cond, pattern = "^muffle") [10:56:34.856] { [10:56:34.856] inherits <- base::inherits [10:56:34.856] invokeRestart <- base::invokeRestart [10:56:34.856] is.null <- base::is.null [10:56:34.856] muffled <- FALSE [10:56:34.856] if (inherits(cond, "message")) { [10:56:34.856] muffled <- grepl(pattern, "muffleMessage") [10:56:34.856] if (muffled) [10:56:34.856] invokeRestart("muffleMessage") [10:56:34.856] } [10:56:34.856] else if (inherits(cond, "warning")) { [10:56:34.856] muffled <- grepl(pattern, "muffleWarning") [10:56:34.856] if (muffled) [10:56:34.856] invokeRestart("muffleWarning") [10:56:34.856] } [10:56:34.856] else if (inherits(cond, "condition")) { [10:56:34.856] if (!is.null(pattern)) { [10:56:34.856] computeRestarts <- base::computeRestarts [10:56:34.856] grepl <- base::grepl [10:56:34.856] restarts <- computeRestarts(cond) [10:56:34.856] for (restart in restarts) { [10:56:34.856] name <- restart$name [10:56:34.856] if (is.null(name)) [10:56:34.856] next [10:56:34.856] if (!grepl(pattern, name)) [10:56:34.856] next [10:56:34.856] invokeRestart(restart) [10:56:34.856] muffled <- TRUE [10:56:34.856] break [10:56:34.856] } [10:56:34.856] } [10:56:34.856] } [10:56:34.856] invisible(muffled) [10:56:34.856] } [10:56:34.856] muffleCondition(cond, pattern = "^muffle") [10:56:34.856] } [10:56:34.856] } [10:56:34.856] else { [10:56:34.856] if (TRUE) { [10:56:34.856] muffleCondition <- function (cond, pattern = "^muffle") [10:56:34.856] { [10:56:34.856] inherits <- base::inherits [10:56:34.856] invokeRestart <- base::invokeRestart [10:56:34.856] is.null <- base::is.null [10:56:34.856] muffled <- FALSE [10:56:34.856] if (inherits(cond, "message")) { [10:56:34.856] muffled <- grepl(pattern, "muffleMessage") [10:56:34.856] if (muffled) [10:56:34.856] invokeRestart("muffleMessage") [10:56:34.856] } [10:56:34.856] else if (inherits(cond, "warning")) { [10:56:34.856] muffled <- grepl(pattern, "muffleWarning") [10:56:34.856] if (muffled) [10:56:34.856] invokeRestart("muffleWarning") [10:56:34.856] } [10:56:34.856] else if (inherits(cond, "condition")) { [10:56:34.856] if (!is.null(pattern)) { [10:56:34.856] computeRestarts <- base::computeRestarts [10:56:34.856] grepl <- base::grepl [10:56:34.856] restarts <- computeRestarts(cond) [10:56:34.856] for (restart in restarts) { [10:56:34.856] name <- restart$name [10:56:34.856] if (is.null(name)) [10:56:34.856] next [10:56:34.856] if (!grepl(pattern, name)) [10:56:34.856] next [10:56:34.856] invokeRestart(restart) [10:56:34.856] muffled <- TRUE [10:56:34.856] break [10:56:34.856] } [10:56:34.856] } [10:56:34.856] } [10:56:34.856] invisible(muffled) [10:56:34.856] } [10:56:34.856] muffleCondition(cond, pattern = "^muffle") [10:56:34.856] } [10:56:34.856] } [10:56:34.856] } [10:56:34.856] })) [10:56:34.856] }, error = function(ex) { [10:56:34.856] base::structure(base::list(value = NULL, visible = NULL, [10:56:34.856] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:34.856] ...future.rng), started = ...future.startTime, [10:56:34.856] finished = Sys.time(), session_uuid = NA_character_, [10:56:34.856] version = "1.8"), class = "FutureResult") [10:56:34.856] }, finally = { [10:56:34.856] if (!identical(...future.workdir, getwd())) [10:56:34.856] setwd(...future.workdir) [10:56:34.856] { [10:56:34.856] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:34.856] ...future.oldOptions$nwarnings <- NULL [10:56:34.856] } [10:56:34.856] base::options(...future.oldOptions) [10:56:34.856] if (.Platform$OS.type == "windows") { [10:56:34.856] old_names <- names(...future.oldEnvVars) [10:56:34.856] envs <- base::Sys.getenv() [10:56:34.856] names <- names(envs) [10:56:34.856] common <- intersect(names, old_names) [10:56:34.856] added <- setdiff(names, old_names) [10:56:34.856] removed <- setdiff(old_names, names) [10:56:34.856] changed <- common[...future.oldEnvVars[common] != [10:56:34.856] envs[common]] [10:56:34.856] NAMES <- toupper(changed) [10:56:34.856] args <- list() [10:56:34.856] for (kk in seq_along(NAMES)) { [10:56:34.856] name <- changed[[kk]] [10:56:34.856] NAME <- NAMES[[kk]] [10:56:34.856] if (name != NAME && is.element(NAME, old_names)) [10:56:34.856] next [10:56:34.856] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:34.856] } [10:56:34.856] NAMES <- toupper(added) [10:56:34.856] for (kk in seq_along(NAMES)) { [10:56:34.856] name <- added[[kk]] [10:56:34.856] NAME <- NAMES[[kk]] [10:56:34.856] if (name != NAME && is.element(NAME, old_names)) [10:56:34.856] next [10:56:34.856] args[[name]] <- "" [10:56:34.856] } [10:56:34.856] NAMES <- toupper(removed) [10:56:34.856] for (kk in seq_along(NAMES)) { [10:56:34.856] name <- removed[[kk]] [10:56:34.856] NAME <- NAMES[[kk]] [10:56:34.856] if (name != NAME && is.element(NAME, old_names)) [10:56:34.856] next [10:56:34.856] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:34.856] } [10:56:34.856] if (length(args) > 0) [10:56:34.856] base::do.call(base::Sys.setenv, args = args) [10:56:34.856] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:34.856] } [10:56:34.856] else { [10:56:34.856] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:34.856] } [10:56:34.856] { [10:56:34.856] if (base::length(...future.futureOptionsAdded) > [10:56:34.856] 0L) { [10:56:34.856] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:34.856] base::names(opts) <- ...future.futureOptionsAdded [10:56:34.856] base::options(opts) [10:56:34.856] } [10:56:34.856] { [10:56:34.856] NULL [10:56:34.856] options(future.plan = NULL) [10:56:34.856] if (is.na(NA_character_)) [10:56:34.856] Sys.unsetenv("R_FUTURE_PLAN") [10:56:34.856] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:34.856] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:34.856] .init = FALSE) [10:56:34.856] } [10:56:34.856] } [10:56:34.856] } [10:56:34.856] }) [10:56:34.856] if (TRUE) { [10:56:34.856] base::sink(type = "output", split = FALSE) [10:56:34.856] if (TRUE) { [10:56:34.856] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:34.856] } [10:56:34.856] else { [10:56:34.856] ...future.result["stdout"] <- base::list(NULL) [10:56:34.856] } [10:56:34.856] base::close(...future.stdout) [10:56:34.856] ...future.stdout <- NULL [10:56:34.856] } [10:56:34.856] ...future.result$conditions <- ...future.conditions [10:56:34.856] ...future.result$finished <- base::Sys.time() [10:56:34.856] ...future.result [10:56:34.856] } [10:56:34.863] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [10:56:34.864] plan(): nbrOfWorkers() = 2 [10:56:34.864] future_lapply() ... [10:56:34.865] Number of chunks: 1 [10:56:34.866] getGlobalsAndPackagesXApply() ... [10:56:34.866] - future.globals: TRUE [10:56:34.866] getGlobalsAndPackages() ... [10:56:34.867] Searching for globals... [10:56:34.869] - globals found: [2] 'FUN', 'file_ext' [10:56:34.870] Searching for globals ... DONE [10:56:34.870] Resolving globals: FALSE [10:56:34.871] The total size of the 1 globals is 448 bytes (448 bytes) [10:56:34.872] 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') [10:56:34.872] - globals: [1] 'FUN' [10:56:34.873] - packages: [1] 'tools' [10:56:34.873] getGlobalsAndPackages() ... DONE [10:56:34.873] - globals found/used: [n=1] 'FUN' [10:56:34.874] - needed namespaces: [n=1] 'tools' [10:56:34.874] Finding globals ... DONE [10:56:34.874] - use_args: TRUE [10:56:34.875] - Getting '...' globals ... [10:56:34.876] resolve() on list ... [10:56:34.876] recursive: 0 [10:56:34.876] length: 1 [10:56:34.876] elements: '...' [10:56:34.877] length: 0 (resolved future 1) [10:56:34.877] resolve() on list ... DONE [10:56:34.877] - '...' content: [n=0] [10:56:34.878] List of 1 [10:56:34.878] $ ...: list() [10:56:34.878] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:34.878] - attr(*, "where")=List of 1 [10:56:34.878] ..$ ...: [10:56:34.878] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:34.878] - attr(*, "resolved")= logi TRUE [10:56:34.878] - attr(*, "total_size")= num NA [10:56:34.884] - Getting '...' globals ... DONE [10:56:34.884] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [10:56:34.885] List of 2 [10:56:34.885] $ ...future.FUN:function (x) [10:56:34.885] $ ... : list() [10:56:34.885] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [10:56:34.885] - attr(*, "where")=List of 2 [10:56:34.885] ..$ ...future.FUN: [10:56:34.885] ..$ ... : [10:56:34.885] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [10:56:34.885] - attr(*, "resolved")= logi FALSE [10:56:34.885] - attr(*, "total_size")= num 448 [10:56:34.892] Packages to be attached in all futures: [n=1] 'tools' [10:56:34.892] getGlobalsAndPackagesXApply() ... DONE [10:56:34.892] Number of futures (= number of chunks): 1 [10:56:34.893] Launching 1 futures (chunks) ... [10:56:34.893] Chunk #1 of 1 ... [10:56:34.893] - Finding globals in 'X' for chunk #1 ... [10:56:34.894] getGlobalsAndPackages() ... [10:56:34.894] Searching for globals... [10:56:34.895] [10:56:34.895] Searching for globals ... DONE [10:56:34.895] - globals: [0] [10:56:34.896] getGlobalsAndPackages() ... DONE [10:56:34.896] + additional globals found: [n=0] [10:56:34.896] + additional namespaces needed: [n=0] [10:56:34.897] - Finding globals in 'X' for chunk #1 ... DONE [10:56:34.897] - seeds: [10:56:34.897] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:34.897] getGlobalsAndPackages() ... [10:56:34.898] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:34.898] Resolving globals: FALSE [10:56:34.898] Tweak future expression to call with '...' arguments ... [10:56:34.899] { [10:56:34.899] do.call(function(...) { [10:56:34.899] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:34.899] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:34.899] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:34.899] on.exit(options(oopts), add = TRUE) [10:56:34.899] } [10:56:34.899] { [10:56:34.899] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:34.899] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:34.899] ...future.FUN(...future.X_jj, ...) [10:56:34.899] }) [10:56:34.899] } [10:56:34.899] }, args = future.call.arguments) [10:56:34.899] } [10:56:34.900] Tweak future expression to call with '...' arguments ... DONE [10:56:34.900] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [10:56:34.900] [10:56:34.901] getGlobalsAndPackages() ... DONE [10:56:34.901] run() for 'Future' ... [10:56:34.901] - state: 'created' [10:56:34.902] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [10:56:34.905] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:34.905] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [10:56:34.905] - Field: 'label' [10:56:34.905] - Field: 'local' [10:56:34.906] - Field: 'owner' [10:56:34.906] - Field: 'envir' [10:56:34.906] - Field: 'packages' [10:56:34.906] - Field: 'gc' [10:56:34.906] - Field: 'conditions' [10:56:34.906] - Field: 'expr' [10:56:34.907] - Field: 'uuid' [10:56:34.907] - Field: 'seed' [10:56:34.907] - Field: 'version' [10:56:34.907] - Field: 'result' [10:56:34.908] - Field: 'asynchronous' [10:56:34.908] - Field: 'calls' [10:56:34.908] - Field: 'globals' [10:56:34.908] - Field: 'stdout' [10:56:34.908] - Field: 'earlySignal' [10:56:34.909] - Field: 'lazy' [10:56:34.909] - Field: 'state' [10:56:34.909] - Field: '.cluster' [10:56:34.909] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [10:56:34.909] - Launch lazy future ... [10:56:34.910] Packages needed by the future expression (n = 1): 'tools' [10:56:34.910] Packages needed by future strategies (n = 0): [10:56:34.911] { [10:56:34.911] { [10:56:34.911] { [10:56:34.911] ...future.startTime <- base::Sys.time() [10:56:34.911] { [10:56:34.911] { [10:56:34.911] { [10:56:34.911] { [10:56:34.911] base::local({ [10:56:34.911] has_future <- base::requireNamespace("future", [10:56:34.911] quietly = TRUE) [10:56:34.911] if (has_future) { [10:56:34.911] ns <- base::getNamespace("future") [10:56:34.911] version <- ns[[".package"]][["version"]] [10:56:34.911] if (is.null(version)) [10:56:34.911] version <- utils::packageVersion("future") [10:56:34.911] } [10:56:34.911] else { [10:56:34.911] version <- NULL [10:56:34.911] } [10:56:34.911] if (!has_future || version < "1.8.0") { [10:56:34.911] info <- base::c(r_version = base::gsub("R version ", [10:56:34.911] "", base::R.version$version.string), [10:56:34.911] platform = base::sprintf("%s (%s-bit)", [10:56:34.911] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [10:56:34.911] os = base::paste(base::Sys.info()[base::c("sysname", [10:56:34.911] "release", "version")], collapse = " "), [10:56:34.911] hostname = base::Sys.info()[["nodename"]]) [10:56:34.911] info <- base::sprintf("%s: %s", base::names(info), [10:56:34.911] info) [10:56:34.911] info <- base::paste(info, collapse = "; ") [10:56:34.911] if (!has_future) { [10:56:34.911] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [10:56:34.911] info) [10:56:34.911] } [10:56:34.911] else { [10:56:34.911] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [10:56:34.911] info, version) [10:56:34.911] } [10:56:34.911] base::stop(msg) [10:56:34.911] } [10:56:34.911] }) [10:56:34.911] } [10:56:34.911] base::local({ [10:56:34.911] for (pkg in "tools") { [10:56:34.911] base::loadNamespace(pkg) [10:56:34.911] base::library(pkg, character.only = TRUE) [10:56:34.911] } [10:56:34.911] }) [10:56:34.911] } [10:56:34.911] ...future.strategy.old <- future::plan("list") [10:56:34.911] options(future.plan = NULL) [10:56:34.911] Sys.unsetenv("R_FUTURE_PLAN") [10:56:34.911] future::plan("default", .cleanup = FALSE, .init = FALSE) [10:56:34.911] } [10:56:34.911] ...future.workdir <- getwd() [10:56:34.911] } [10:56:34.911] ...future.oldOptions <- base::as.list(base::.Options) [10:56:34.911] ...future.oldEnvVars <- base::Sys.getenv() [10:56:34.911] } [10:56:34.911] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [10:56:34.911] future.globals.maxSize = NULL, future.globals.method = NULL, [10:56:34.911] future.globals.onMissing = NULL, future.globals.onReference = NULL, [10:56:34.911] future.globals.resolve = NULL, future.resolve.recursive = NULL, [10:56:34.911] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [10:56:34.911] future.stdout.windows.reencode = NULL, width = 80L) [10:56:34.911] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [10:56:34.911] base::names(...future.oldOptions)) [10:56:34.911] } [10:56:34.911] if (FALSE) { [10:56:34.911] } [10:56:34.911] else { [10:56:34.911] if (TRUE) { [10:56:34.911] ...future.stdout <- base::rawConnection(base::raw(0L), [10:56:34.911] open = "w") [10:56:34.911] } [10:56:34.911] else { [10:56:34.911] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [10:56:34.911] windows = "NUL", "/dev/null"), open = "w") [10:56:34.911] } [10:56:34.911] base::sink(...future.stdout, type = "output", split = FALSE) [10:56:34.911] base::on.exit(if (!base::is.null(...future.stdout)) { [10:56:34.911] base::sink(type = "output", split = FALSE) [10:56:34.911] base::close(...future.stdout) [10:56:34.911] }, add = TRUE) [10:56:34.911] } [10:56:34.911] ...future.frame <- base::sys.nframe() [10:56:34.911] ...future.conditions <- base::list() [10:56:34.911] ...future.rng <- base::globalenv()$.Random.seed [10:56:34.911] if (FALSE) { [10:56:34.911] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [10:56:34.911] "...future.value", "...future.globalenv.names", ".Random.seed") [10:56:34.911] } [10:56:34.911] ...future.result <- base::tryCatch({ [10:56:34.911] base::withCallingHandlers({ [10:56:34.911] ...future.value <- base::withVisible(base::local({ [10:56:34.911] do.call(function(...) { [10:56:34.911] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:34.911] if (!identical(...future.globals.maxSize.org, [10:56:34.911] ...future.globals.maxSize)) { [10:56:34.911] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:34.911] on.exit(options(oopts), add = TRUE) [10:56:34.911] } [10:56:34.911] { [10:56:34.911] lapply(seq_along(...future.elements_ii), [10:56:34.911] FUN = function(jj) { [10:56:34.911] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:34.911] ...future.FUN(...future.X_jj, ...) [10:56:34.911] }) [10:56:34.911] } [10:56:34.911] }, args = future.call.arguments) [10:56:34.911] })) [10:56:34.911] future::FutureResult(value = ...future.value$value, [10:56:34.911] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [10:56:34.911] ...future.rng), globalenv = if (FALSE) [10:56:34.911] list(added = base::setdiff(base::names(base::.GlobalEnv), [10:56:34.911] ...future.globalenv.names)) [10:56:34.911] else NULL, started = ...future.startTime, version = "1.8") [10:56:34.911] }, condition = base::local({ [10:56:34.911] c <- base::c [10:56:34.911] inherits <- base::inherits [10:56:34.911] invokeRestart <- base::invokeRestart [10:56:34.911] length <- base::length [10:56:34.911] list <- base::list [10:56:34.911] seq.int <- base::seq.int [10:56:34.911] signalCondition <- base::signalCondition [10:56:34.911] sys.calls <- base::sys.calls [10:56:34.911] `[[` <- base::`[[` [10:56:34.911] `+` <- base::`+` [10:56:34.911] `<<-` <- base::`<<-` [10:56:34.911] sysCalls <- function(calls = sys.calls(), from = 1L) { [10:56:34.911] calls[seq.int(from = from + 12L, to = length(calls) - [10:56:34.911] 3L)] [10:56:34.911] } [10:56:34.911] function(cond) { [10:56:34.911] is_error <- inherits(cond, "error") [10:56:34.911] ignore <- !is_error && !is.null(NULL) && inherits(cond, [10:56:34.911] NULL) [10:56:34.911] if (is_error) { [10:56:34.911] sessionInformation <- function() { [10:56:34.911] list(r = base::R.Version(), locale = base::Sys.getlocale(), [10:56:34.911] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [10:56:34.911] search = base::search(), system = base::Sys.info()) [10:56:34.911] } [10:56:34.911] ...future.conditions[[length(...future.conditions) + [10:56:34.911] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [10:56:34.911] cond$call), session = sessionInformation(), [10:56:34.911] timestamp = base::Sys.time(), signaled = 0L) [10:56:34.911] signalCondition(cond) [10:56:34.911] } [10:56:34.911] else if (!ignore && TRUE && inherits(cond, "condition")) { [10:56:34.911] signal <- FALSE && inherits(cond, character(0)) [10:56:34.911] ...future.conditions[[length(...future.conditions) + [10:56:34.911] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [10:56:34.911] if (FALSE && !signal) { [10:56:34.911] muffleCondition <- function (cond, pattern = "^muffle") [10:56:34.911] { [10:56:34.911] inherits <- base::inherits [10:56:34.911] invokeRestart <- base::invokeRestart [10:56:34.911] is.null <- base::is.null [10:56:34.911] muffled <- FALSE [10:56:34.911] if (inherits(cond, "message")) { [10:56:34.911] muffled <- grepl(pattern, "muffleMessage") [10:56:34.911] if (muffled) [10:56:34.911] invokeRestart("muffleMessage") [10:56:34.911] } [10:56:34.911] else if (inherits(cond, "warning")) { [10:56:34.911] muffled <- grepl(pattern, "muffleWarning") [10:56:34.911] if (muffled) [10:56:34.911] invokeRestart("muffleWarning") [10:56:34.911] } [10:56:34.911] else if (inherits(cond, "condition")) { [10:56:34.911] if (!is.null(pattern)) { [10:56:34.911] computeRestarts <- base::computeRestarts [10:56:34.911] grepl <- base::grepl [10:56:34.911] restarts <- computeRestarts(cond) [10:56:34.911] for (restart in restarts) { [10:56:34.911] name <- restart$name [10:56:34.911] if (is.null(name)) [10:56:34.911] next [10:56:34.911] if (!grepl(pattern, name)) [10:56:34.911] next [10:56:34.911] invokeRestart(restart) [10:56:34.911] muffled <- TRUE [10:56:34.911] break [10:56:34.911] } [10:56:34.911] } [10:56:34.911] } [10:56:34.911] invisible(muffled) [10:56:34.911] } [10:56:34.911] muffleCondition(cond, pattern = "^muffle") [10:56:34.911] } [10:56:34.911] } [10:56:34.911] else { [10:56:34.911] if (TRUE) { [10:56:34.911] muffleCondition <- function (cond, pattern = "^muffle") [10:56:34.911] { [10:56:34.911] inherits <- base::inherits [10:56:34.911] invokeRestart <- base::invokeRestart [10:56:34.911] is.null <- base::is.null [10:56:34.911] muffled <- FALSE [10:56:34.911] if (inherits(cond, "message")) { [10:56:34.911] muffled <- grepl(pattern, "muffleMessage") [10:56:34.911] if (muffled) [10:56:34.911] invokeRestart("muffleMessage") [10:56:34.911] } [10:56:34.911] else if (inherits(cond, "warning")) { [10:56:34.911] muffled <- grepl(pattern, "muffleWarning") [10:56:34.911] if (muffled) [10:56:34.911] invokeRestart("muffleWarning") [10:56:34.911] } [10:56:34.911] else if (inherits(cond, "condition")) { [10:56:34.911] if (!is.null(pattern)) { [10:56:34.911] computeRestarts <- base::computeRestarts [10:56:34.911] grepl <- base::grepl [10:56:34.911] restarts <- computeRestarts(cond) [10:56:34.911] for (restart in restarts) { [10:56:34.911] name <- restart$name [10:56:34.911] if (is.null(name)) [10:56:34.911] next [10:56:34.911] if (!grepl(pattern, name)) [10:56:34.911] next [10:56:34.911] invokeRestart(restart) [10:56:34.911] muffled <- TRUE [10:56:34.911] break [10:56:34.911] } [10:56:34.911] } [10:56:34.911] } [10:56:34.911] invisible(muffled) [10:56:34.911] } [10:56:34.911] muffleCondition(cond, pattern = "^muffle") [10:56:34.911] } [10:56:34.911] } [10:56:34.911] } [10:56:34.911] })) [10:56:34.911] }, error = function(ex) { [10:56:34.911] base::structure(base::list(value = NULL, visible = NULL, [10:56:34.911] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [10:56:34.911] ...future.rng), started = ...future.startTime, [10:56:34.911] finished = Sys.time(), session_uuid = NA_character_, [10:56:34.911] version = "1.8"), class = "FutureResult") [10:56:34.911] }, finally = { [10:56:34.911] if (!identical(...future.workdir, getwd())) [10:56:34.911] setwd(...future.workdir) [10:56:34.911] { [10:56:34.911] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [10:56:34.911] ...future.oldOptions$nwarnings <- NULL [10:56:34.911] } [10:56:34.911] base::options(...future.oldOptions) [10:56:34.911] if (.Platform$OS.type == "windows") { [10:56:34.911] old_names <- names(...future.oldEnvVars) [10:56:34.911] envs <- base::Sys.getenv() [10:56:34.911] names <- names(envs) [10:56:34.911] common <- intersect(names, old_names) [10:56:34.911] added <- setdiff(names, old_names) [10:56:34.911] removed <- setdiff(old_names, names) [10:56:34.911] changed <- common[...future.oldEnvVars[common] != [10:56:34.911] envs[common]] [10:56:34.911] NAMES <- toupper(changed) [10:56:34.911] args <- list() [10:56:34.911] for (kk in seq_along(NAMES)) { [10:56:34.911] name <- changed[[kk]] [10:56:34.911] NAME <- NAMES[[kk]] [10:56:34.911] if (name != NAME && is.element(NAME, old_names)) [10:56:34.911] next [10:56:34.911] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:34.911] } [10:56:34.911] NAMES <- toupper(added) [10:56:34.911] for (kk in seq_along(NAMES)) { [10:56:34.911] name <- added[[kk]] [10:56:34.911] NAME <- NAMES[[kk]] [10:56:34.911] if (name != NAME && is.element(NAME, old_names)) [10:56:34.911] next [10:56:34.911] args[[name]] <- "" [10:56:34.911] } [10:56:34.911] NAMES <- toupper(removed) [10:56:34.911] for (kk in seq_along(NAMES)) { [10:56:34.911] name <- removed[[kk]] [10:56:34.911] NAME <- NAMES[[kk]] [10:56:34.911] if (name != NAME && is.element(NAME, old_names)) [10:56:34.911] next [10:56:34.911] args[[name]] <- ...future.oldEnvVars[[name]] [10:56:34.911] } [10:56:34.911] if (length(args) > 0) [10:56:34.911] base::do.call(base::Sys.setenv, args = args) [10:56:34.911] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [10:56:34.911] } [10:56:34.911] else { [10:56:34.911] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [10:56:34.911] } [10:56:34.911] { [10:56:34.911] if (base::length(...future.futureOptionsAdded) > [10:56:34.911] 0L) { [10:56:34.911] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [10:56:34.911] base::names(opts) <- ...future.futureOptionsAdded [10:56:34.911] base::options(opts) [10:56:34.911] } [10:56:34.911] { [10:56:34.911] NULL [10:56:34.911] options(future.plan = NULL) [10:56:34.911] if (is.na(NA_character_)) [10:56:34.911] Sys.unsetenv("R_FUTURE_PLAN") [10:56:34.911] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [10:56:34.911] future::plan(...future.strategy.old, .cleanup = FALSE, [10:56:34.911] .init = FALSE) [10:56:34.911] } [10:56:34.911] } [10:56:34.911] } [10:56:34.911] }) [10:56:34.911] if (TRUE) { [10:56:34.911] base::sink(type = "output", split = FALSE) [10:56:34.911] if (TRUE) { [10:56:34.911] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [10:56:34.911] } [10:56:34.911] else { [10:56:34.911] ...future.result["stdout"] <- base::list(NULL) [10:56:34.911] } [10:56:34.911] base::close(...future.stdout) [10:56:34.911] ...future.stdout <- NULL [10:56:34.911] } [10:56:34.911] ...future.result$conditions <- ...future.conditions [10:56:34.911] ...future.result$finished <- base::Sys.time() [10:56:34.911] ...future.result [10:56:34.911] } [10:56:34.915] - Launch lazy future ... done [10:56:34.915] run() for 'MiraiFuture' ... done [10:56:34.916] Created future: [10:56:34.917] resolved() for 'MiraiFuture' ... [10:56:34.917] - state: 'running' [10:56:34.917] - run: TRUE [10:56:34.918] - result: 'NULL' [10:56:34.918] - resolved: FALSE [10:56:34.918] resolved() for 'MiraiFuture' ... done [10:56:34.916] MiraiFuture: [10:56:34.916] Label: 'future_lapply-1' [10:56:34.916] Expression: [10:56:34.916] { [10:56:34.916] do.call(function(...) { [10:56:34.916] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [10:56:34.916] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [10:56:34.916] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [10:56:34.916] on.exit(options(oopts), add = TRUE) [10:56:34.916] } [10:56:34.916] { [10:56:34.916] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [10:56:34.916] ...future.X_jj <- ...future.elements_ii[[jj]] [10:56:34.916] ...future.FUN(...future.X_jj, ...) [10:56:34.916] }) [10:56:34.916] } [10:56:34.916] }, args = future.call.arguments) [10:56:34.916] } [10:56:34.916] Lazy evaluation: FALSE [10:56:34.916] Asynchronous evaluation: TRUE [10:56:34.916] Local evaluation: TRUE [10:56:34.916] Environment: R_GlobalEnv [10:56:34.916] Capture standard output: TRUE [10:56:34.916] Capture condition classes: 'condition' (excluding 'nothing') [10:56:34.916] 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) [10:56:34.916] Packages: 1 packages ('tools') [10:56:34.916] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [10:56:34.916] Resolved: FALSE [10:56:34.916] Value: [10:56:34.916] Conditions captured: [10:56:34.916] Early signaling: FALSE [10:56:34.916] Owner process: 5cc6f9ab-14cb-0ada-858b-9897d48df8a5 [10:56:34.916] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [10:56:34.919] Chunk #1 of 1 ... DONE [10:56:34.919] Launching 1 futures (chunks) ... DONE [10:56:34.919] Resolving 1 futures (chunks) ... [10:56:34.919] resolve() on list ... [10:56:34.919] recursive: 0 [10:56:34.919] length: 1 [10:56:34.920] [10:56:34.920] resolved() for 'MiraiFuture' ... [10:56:34.920] - state: 'running' [10:56:34.920] - run: TRUE [10:56:34.920] - result: 'NULL' [10:56:34.920] - resolved: FALSE [10:56:34.921] resolved() for 'MiraiFuture' ... done [10:56:34.946] resolved() for 'MiraiFuture' ... [10:56:34.947] - state: 'running' [10:56:34.947] - run: TRUE [10:56:34.947] - result: 'NULL' [10:56:34.948] - resolved: FALSE [10:56:34.948] resolved() for 'MiraiFuture' ... done [10:56:34.948] Future #1 [10:56:34.948] signalConditionsASAP(MiraiFuture, pos=1) ... [10:56:34.949] - nx: 1 [10:56:34.949] - relay: TRUE [10:56:34.949] - stdout: TRUE [10:56:34.949] - signal: TRUE [10:56:34.949] - resignal: FALSE [10:56:34.950] - force: TRUE [10:56:34.950] - relayed: [n=1] FALSE [10:56:34.950] - queued futures: [n=1] FALSE [10:56:34.950] - until=1 [10:56:34.950] - relaying element #1 [10:56:34.951] - relayed: [n=1] TRUE [10:56:34.951] - queued futures: [n=1] TRUE [10:56:34.951] signalConditionsASAP(MiraiFuture, pos=1) ... done [10:56:34.951] length: 0 (resolved future 1) [10:56:34.951] Relaying remaining futures [10:56:34.952] signalConditionsASAP(NULL, pos=0) ... [10:56:34.952] - nx: 1 [10:56:34.952] - relay: TRUE [10:56:34.952] - stdout: TRUE [10:56:34.952] - signal: TRUE [10:56:34.952] - resignal: FALSE [10:56:34.952] - force: TRUE [10:56:34.953] - relayed: [n=1] TRUE [10:56:34.953] - queued futures: [n=1] TRUE - flush all [10:56:34.953] - relayed: [n=1] TRUE [10:56:34.953] - queued futures: [n=1] TRUE [10:56:34.953] signalConditionsASAP(NULL, pos=0) ... done [10:56:34.953] resolve() on list ... DONE [10:56:34.954] - Number of value chunks collected: 1 [10:56:34.954] Resolving 1 futures (chunks) ... DONE [10:56:34.954] Reducing values from 1 chunks ... [10:56:34.954] - Number of values collected after concatenation: 1 [10:56:34.954] - Number of values expected: 1 [10:56:34.954] Reducing values from 1 chunks ... DONE [10:56:34.955] future_lapply() ... DONE *** future_lapply() ... DONE > > proc.time() user system elapsed 8.17 0.28 9.03