R version 4.4.0 beta (2024-04-15 r86425 ucrt) -- "Puppy Cup" Copyright (C) 2024 The R Foundation for Statistical Computing Platform: x86_64-w64-mingw32/x64 R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details. R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications. Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R. > ## This requires mirai (>= 0.13.2) > if (packageVersion("mirai") >= "0.13.2") { + + source("incl/start.R") + library("listenv") + + if (requireNamespace("future.apply", quietly = TRUE)) { + future_lapply <- future.apply::future_lapply + + strategies <- c("mirai_multisession") + + message("*** future_lapply() ...") + + message("- future_lapply(x, FUN = vector, ...) ...") + + x <- list(a = "integer", c = "character", c = "list") + str(list(x = x)) + + y0 <- lapply(x, FUN = vector, length = 2L) + str(list(y0 = y0)) + + for (strategy in strategies) { + mprintf("- plan('%s') ...", strategy) + plan(strategy) + stopifnot(nbrOfWorkers() < Inf) + + for (scheduling in list(FALSE, TRUE)) { + y <- future_lapply(x, FUN = vector, length = 2L, + future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y0)) + } + } + + + message("- future_lapply(x, FUN = base::vector, ...) ...") + + x <- list(a = "integer", c = "character", c = "list") + str(list(x = x)) + + y0 <- lapply(x, FUN = base::vector, length = 2L) + str(list(y0 = y0)) + + for (strategy in strategies) { + mprintf("- plan('%s') ...", strategy) + plan(strategy) + stopifnot(nbrOfWorkers() < Inf) + + for (scheduling in list(FALSE, TRUE)) { + y <- future_lapply(x, FUN = base::vector, length = 2L, + future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y0)) + } + } + + message("- future_lapply(x, FUN = future:::hpaste, ...) ...") + + x <- list(a = c("hello", b = 1:100)) + str(list(x = x)) + + y0 <- lapply(x, FUN = future:::hpaste, collapse = "; ", maxHead = 3L) + str(list(y0 = y0)) + + for (strategy in strategies) { + mprintf("- plan('%s') ...", strategy) + plan(strategy) + stopifnot(nbrOfWorkers() < Inf) + + for (scheduling in list(FALSE, TRUE)) { + y <- future_lapply(x, FUN = future:::hpaste, collapse = "; ", + maxHead = 3L, future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y0)) + } + } + + + message("- future_lapply(x, FUN = listenv::listenv, ...) ...") + + x <- list() + + y <- listenv() + y$A <- 3L + x$a <- y + + y <- listenv() + y$A <- 3L + y$B <- c("hello", b = 1:100) + x$b <- y + + print(x) + + y0 <- lapply(x, FUN = listenv::mapping) + str(list(y0 = y0)) + + for (strategy in strategies) { + mprintf("- plan('%s') ...", strategy) + plan(strategy) + stopifnot(nbrOfWorkers() < Inf) + + for (scheduling in list(FALSE, TRUE)) { + y <- future_lapply(x, FUN = listenv::mapping, future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y0)) + } + } + + + message("- future_lapply(x, FUN, ...) for large length(x) ...") + a <- 3.14 + x <- 1:1e6 + + y <- future_lapply(x, FUN = function(z) sqrt(z + a)) + y <- unlist(y, use.names = FALSE) + + stopifnot(all.equal(y, sqrt(x + a))) + + + message("- future_lapply() with global in non-attached package ...") + library("tools") + my_ext <- function(x) file_ext(x) + y_truth <- lapply("abc.txt", FUN = my_ext) + + for (strategy in strategies) { + plan(strategy) + y <- future_lapply("abc.txt", FUN = my_ext) + stopifnot(identical(y, y_truth)) + } + + message("*** future_lapply() ... DONE") + } + + source("incl/end.R") + + } Loading required package: future [13:11:14.562] plan(): Setting new future strategy stack: [13:11:14.563] List of future strategies: [13:11:14.563] 1. mirai_multisession: [13:11:14.563] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:11:14.563] - tweaked: FALSE [13:11:14.563] - call: future::plan(future.mirai::mirai_multisession) [13:11:14.576] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:11:14.576] < mirai | $data > [13:11:14.580] getGlobalsAndPackages() ... [13:11:14.581] Not searching for globals [13:11:14.581] - globals: [0] [13:11:14.581] getGlobalsAndPackages() ... DONE [13:11:14.582] getGlobalsAndPackages() ... [13:11:14.582] [13:11:14.582] - globals: [0] [13:11:14.582] getGlobalsAndPackages() ... DONE [13:11:14.859] Packages needed by the future expression (n = 0): [13:11:14.859] Packages needed by future strategies (n = 0): [13:11:14.860] { [13:11:14.860] { [13:11:14.860] { [13:11:14.860] ...future.startTime <- base::Sys.time() [13:11:14.860] { [13:11:14.860] { [13:11:14.860] { [13:11:14.860] base::local({ [13:11:14.860] has_future <- base::requireNamespace("future", [13:11:14.860] quietly = TRUE) [13:11:14.860] if (has_future) { [13:11:14.860] ns <- base::getNamespace("future") [13:11:14.860] version <- ns[[".package"]][["version"]] [13:11:14.860] if (is.null(version)) [13:11:14.860] version <- utils::packageVersion("future") [13:11:14.860] } [13:11:14.860] else { [13:11:14.860] version <- NULL [13:11:14.860] } [13:11:14.860] if (!has_future || version < "1.8.0") { [13:11:14.860] info <- base::c(r_version = base::gsub("R version ", [13:11:14.860] "", base::R.version$version.string), [13:11:14.860] platform = base::sprintf("%s (%s-bit)", [13:11:14.860] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:14.860] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:14.860] "release", "version")], collapse = " "), [13:11:14.860] hostname = base::Sys.info()[["nodename"]]) [13:11:14.860] info <- base::sprintf("%s: %s", base::names(info), [13:11:14.860] info) [13:11:14.860] info <- base::paste(info, collapse = "; ") [13:11:14.860] if (!has_future) { [13:11:14.860] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:14.860] info) [13:11:14.860] } [13:11:14.860] else { [13:11:14.860] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:14.860] info, version) [13:11:14.860] } [13:11:14.860] base::stop(msg) [13:11:14.860] } [13:11:14.860] }) [13:11:14.860] } [13:11:14.860] ...future.strategy.old <- future::plan("list") [13:11:14.860] options(future.plan = NULL) [13:11:14.860] Sys.unsetenv("R_FUTURE_PLAN") [13:11:14.860] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:14.860] } [13:11:14.860] ...future.workdir <- getwd() [13:11:14.860] } [13:11:14.860] ...future.oldOptions <- base::as.list(base::.Options) [13:11:14.860] ...future.oldEnvVars <- base::Sys.getenv() [13:11:14.860] } [13:11:14.860] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:14.860] future.globals.maxSize = NULL, future.globals.method = NULL, [13:11:14.860] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:14.860] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:14.860] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:14.860] future.stdout.windows.reencode = NULL, width = 80L) [13:11:14.860] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:14.860] base::names(...future.oldOptions)) [13:11:14.860] } [13:11:14.860] if (FALSE) { [13:11:14.860] } [13:11:14.860] else { [13:11:14.860] if (TRUE) { [13:11:14.860] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:14.860] open = "w") [13:11:14.860] } [13:11:14.860] else { [13:11:14.860] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:14.860] windows = "NUL", "/dev/null"), open = "w") [13:11:14.860] } [13:11:14.860] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:14.860] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:14.860] base::sink(type = "output", split = FALSE) [13:11:14.860] base::close(...future.stdout) [13:11:14.860] }, add = TRUE) [13:11:14.860] } [13:11:14.860] ...future.frame <- base::sys.nframe() [13:11:14.860] ...future.conditions <- base::list() [13:11:14.860] ...future.rng <- base::globalenv()$.Random.seed [13:11:14.860] if (FALSE) { [13:11:14.860] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:14.860] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:14.860] } [13:11:14.860] ...future.result <- base::tryCatch({ [13:11:14.860] base::withCallingHandlers({ [13:11:14.860] ...future.value <- base::withVisible(base::local(NA)) [13:11:14.860] future::FutureResult(value = ...future.value$value, [13:11:14.860] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:14.860] ...future.rng), globalenv = if (FALSE) [13:11:14.860] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:14.860] ...future.globalenv.names)) [13:11:14.860] else NULL, started = ...future.startTime, version = "1.8") [13:11:14.860] }, condition = base::local({ [13:11:14.860] c <- base::c [13:11:14.860] inherits <- base::inherits [13:11:14.860] invokeRestart <- base::invokeRestart [13:11:14.860] length <- base::length [13:11:14.860] list <- base::list [13:11:14.860] seq.int <- base::seq.int [13:11:14.860] signalCondition <- base::signalCondition [13:11:14.860] sys.calls <- base::sys.calls [13:11:14.860] `[[` <- base::`[[` [13:11:14.860] `+` <- base::`+` [13:11:14.860] `<<-` <- base::`<<-` [13:11:14.860] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:14.860] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:14.860] 3L)] [13:11:14.860] } [13:11:14.860] function(cond) { [13:11:14.860] is_error <- inherits(cond, "error") [13:11:14.860] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:14.860] NULL) [13:11:14.860] if (is_error) { [13:11:14.860] sessionInformation <- function() { [13:11:14.860] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:14.860] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:14.860] search = base::search(), system = base::Sys.info()) [13:11:14.860] } [13:11:14.860] ...future.conditions[[length(...future.conditions) + [13:11:14.860] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:14.860] cond$call), session = sessionInformation(), [13:11:14.860] timestamp = base::Sys.time(), signaled = 0L) [13:11:14.860] signalCondition(cond) [13:11:14.860] } [13:11:14.860] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:14.860] signal <- FALSE && inherits(cond, character(0)) [13:11:14.860] ...future.conditions[[length(...future.conditions) + [13:11:14.860] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:14.860] if (FALSE && !signal) { [13:11:14.860] muffleCondition <- function (cond, pattern = "^muffle") [13:11:14.860] { [13:11:14.860] inherits <- base::inherits [13:11:14.860] invokeRestart <- base::invokeRestart [13:11:14.860] is.null <- base::is.null [13:11:14.860] muffled <- FALSE [13:11:14.860] if (inherits(cond, "message")) { [13:11:14.860] muffled <- grepl(pattern, "muffleMessage") [13:11:14.860] if (muffled) [13:11:14.860] invokeRestart("muffleMessage") [13:11:14.860] } [13:11:14.860] else if (inherits(cond, "warning")) { [13:11:14.860] muffled <- grepl(pattern, "muffleWarning") [13:11:14.860] if (muffled) [13:11:14.860] invokeRestart("muffleWarning") [13:11:14.860] } [13:11:14.860] else if (inherits(cond, "condition")) { [13:11:14.860] if (!is.null(pattern)) { [13:11:14.860] computeRestarts <- base::computeRestarts [13:11:14.860] grepl <- base::grepl [13:11:14.860] restarts <- computeRestarts(cond) [13:11:14.860] for (restart in restarts) { [13:11:14.860] name <- restart$name [13:11:14.860] if (is.null(name)) [13:11:14.860] next [13:11:14.860] if (!grepl(pattern, name)) [13:11:14.860] next [13:11:14.860] invokeRestart(restart) [13:11:14.860] muffled <- TRUE [13:11:14.860] break [13:11:14.860] } [13:11:14.860] } [13:11:14.860] } [13:11:14.860] invisible(muffled) [13:11:14.860] } [13:11:14.860] muffleCondition(cond, pattern = "^muffle") [13:11:14.860] } [13:11:14.860] } [13:11:14.860] else { [13:11:14.860] if (TRUE) { [13:11:14.860] muffleCondition <- function (cond, pattern = "^muffle") [13:11:14.860] { [13:11:14.860] inherits <- base::inherits [13:11:14.860] invokeRestart <- base::invokeRestart [13:11:14.860] is.null <- base::is.null [13:11:14.860] muffled <- FALSE [13:11:14.860] if (inherits(cond, "message")) { [13:11:14.860] muffled <- grepl(pattern, "muffleMessage") [13:11:14.860] if (muffled) [13:11:14.860] invokeRestart("muffleMessage") [13:11:14.860] } [13:11:14.860] else if (inherits(cond, "warning")) { [13:11:14.860] muffled <- grepl(pattern, "muffleWarning") [13:11:14.860] if (muffled) [13:11:14.860] invokeRestart("muffleWarning") [13:11:14.860] } [13:11:14.860] else if (inherits(cond, "condition")) { [13:11:14.860] if (!is.null(pattern)) { [13:11:14.860] computeRestarts <- base::computeRestarts [13:11:14.860] grepl <- base::grepl [13:11:14.860] restarts <- computeRestarts(cond) [13:11:14.860] for (restart in restarts) { [13:11:14.860] name <- restart$name [13:11:14.860] if (is.null(name)) [13:11:14.860] next [13:11:14.860] if (!grepl(pattern, name)) [13:11:14.860] next [13:11:14.860] invokeRestart(restart) [13:11:14.860] muffled <- TRUE [13:11:14.860] break [13:11:14.860] } [13:11:14.860] } [13:11:14.860] } [13:11:14.860] invisible(muffled) [13:11:14.860] } [13:11:14.860] muffleCondition(cond, pattern = "^muffle") [13:11:14.860] } [13:11:14.860] } [13:11:14.860] } [13:11:14.860] })) [13:11:14.860] }, error = function(ex) { [13:11:14.860] base::structure(base::list(value = NULL, visible = NULL, [13:11:14.860] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:14.860] ...future.rng), started = ...future.startTime, [13:11:14.860] finished = Sys.time(), session_uuid = NA_character_, [13:11:14.860] version = "1.8"), class = "FutureResult") [13:11:14.860] }, finally = { [13:11:14.860] if (!identical(...future.workdir, getwd())) [13:11:14.860] setwd(...future.workdir) [13:11:14.860] { [13:11:14.860] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:14.860] ...future.oldOptions$nwarnings <- NULL [13:11:14.860] } [13:11:14.860] base::options(...future.oldOptions) [13:11:14.860] if (.Platform$OS.type == "windows") { [13:11:14.860] old_names <- names(...future.oldEnvVars) [13:11:14.860] envs <- base::Sys.getenv() [13:11:14.860] names <- names(envs) [13:11:14.860] common <- intersect(names, old_names) [13:11:14.860] added <- setdiff(names, old_names) [13:11:14.860] removed <- setdiff(old_names, names) [13:11:14.860] changed <- common[...future.oldEnvVars[common] != [13:11:14.860] envs[common]] [13:11:14.860] NAMES <- toupper(changed) [13:11:14.860] args <- list() [13:11:14.860] for (kk in seq_along(NAMES)) { [13:11:14.860] name <- changed[[kk]] [13:11:14.860] NAME <- NAMES[[kk]] [13:11:14.860] if (name != NAME && is.element(NAME, old_names)) [13:11:14.860] next [13:11:14.860] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:14.860] } [13:11:14.860] NAMES <- toupper(added) [13:11:14.860] for (kk in seq_along(NAMES)) { [13:11:14.860] name <- added[[kk]] [13:11:14.860] NAME <- NAMES[[kk]] [13:11:14.860] if (name != NAME && is.element(NAME, old_names)) [13:11:14.860] next [13:11:14.860] args[[name]] <- "" [13:11:14.860] } [13:11:14.860] NAMES <- toupper(removed) [13:11:14.860] for (kk in seq_along(NAMES)) { [13:11:14.860] name <- removed[[kk]] [13:11:14.860] NAME <- NAMES[[kk]] [13:11:14.860] if (name != NAME && is.element(NAME, old_names)) [13:11:14.860] next [13:11:14.860] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:14.860] } [13:11:14.860] if (length(args) > 0) [13:11:14.860] base::do.call(base::Sys.setenv, args = args) [13:11:14.860] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:14.860] } [13:11:14.860] else { [13:11:14.860] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:14.860] } [13:11:14.860] { [13:11:14.860] if (base::length(...future.futureOptionsAdded) > [13:11:14.860] 0L) { [13:11:14.860] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:14.860] base::names(opts) <- ...future.futureOptionsAdded [13:11:14.860] base::options(opts) [13:11:14.860] } [13:11:14.860] { [13:11:14.860] NULL [13:11:14.860] options(future.plan = NULL) [13:11:14.860] if (is.na(NA_character_)) [13:11:14.860] Sys.unsetenv("R_FUTURE_PLAN") [13:11:14.860] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:14.860] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:14.860] .init = FALSE) [13:11:14.860] } [13:11:14.860] } [13:11:14.860] } [13:11:14.860] }) [13:11:14.860] if (TRUE) { [13:11:14.860] base::sink(type = "output", split = FALSE) [13:11:14.860] if (TRUE) { [13:11:14.860] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:14.860] } [13:11:14.860] else { [13:11:14.860] ...future.result["stdout"] <- base::list(NULL) [13:11:14.860] } [13:11:14.860] base::close(...future.stdout) [13:11:14.860] ...future.stdout <- NULL [13:11:14.860] } [13:11:14.860] ...future.result$conditions <- ...future.conditions [13:11:14.860] ...future.result$finished <- base::Sys.time() [13:11:14.860] ...future.result [13:11:14.860] } [13:11:14.960] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:11:14.961] plan(): nbrOfWorkers() = 2 *** future_lapply() ... - future_lapply(x, FUN = vector, ...) ... List of 1 $ x:List of 3 ..$ a: chr "integer" ..$ c: chr "character" ..$ c: chr "list" List of 1 $ y0:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:11:14.985] - plan('mirai_multisession') ...[13:11:14.986] plan(): Setting new future strategy stack: [13:11:14.986] List of future strategies: [13:11:14.986] 1. mirai_multisession: [13:11:14.986] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:11:14.986] - tweaked: FALSE [13:11:14.986] - call: plan(strategy) [13:11:15.000] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:11:15.000] < mirai | $data > [13:11:15.002] getGlobalsAndPackages() ... [13:11:15.003] Not searching for globals [13:11:15.003] - globals: [0] [13:11:15.003] getGlobalsAndPackages() ... DONE [13:11:15.003] getGlobalsAndPackages() ... [13:11:15.003] [13:11:15.003] - globals: [0] [13:11:15.004] getGlobalsAndPackages() ... DONE [13:11:15.004] Packages needed by the future expression (n = 0): [13:11:15.004] Packages needed by future strategies (n = 0): [13:11:15.005] { [13:11:15.005] { [13:11:15.005] { [13:11:15.005] ...future.startTime <- base::Sys.time() [13:11:15.005] { [13:11:15.005] { [13:11:15.005] { [13:11:15.005] base::local({ [13:11:15.005] has_future <- base::requireNamespace("future", [13:11:15.005] quietly = TRUE) [13:11:15.005] if (has_future) { [13:11:15.005] ns <- base::getNamespace("future") [13:11:15.005] version <- ns[[".package"]][["version"]] [13:11:15.005] if (is.null(version)) [13:11:15.005] version <- utils::packageVersion("future") [13:11:15.005] } [13:11:15.005] else { [13:11:15.005] version <- NULL [13:11:15.005] } [13:11:15.005] if (!has_future || version < "1.8.0") { [13:11:15.005] info <- base::c(r_version = base::gsub("R version ", [13:11:15.005] "", base::R.version$version.string), [13:11:15.005] platform = base::sprintf("%s (%s-bit)", [13:11:15.005] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.005] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.005] "release", "version")], collapse = " "), [13:11:15.005] hostname = base::Sys.info()[["nodename"]]) [13:11:15.005] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.005] info) [13:11:15.005] info <- base::paste(info, collapse = "; ") [13:11:15.005] if (!has_future) { [13:11:15.005] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.005] info) [13:11:15.005] } [13:11:15.005] else { [13:11:15.005] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.005] info, version) [13:11:15.005] } [13:11:15.005] base::stop(msg) [13:11:15.005] } [13:11:15.005] }) [13:11:15.005] } [13:11:15.005] ...future.strategy.old <- future::plan("list") [13:11:15.005] options(future.plan = NULL) [13:11:15.005] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.005] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.005] } [13:11:15.005] ...future.workdir <- getwd() [13:11:15.005] } [13:11:15.005] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.005] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.005] } [13:11:15.005] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.005] future.globals.maxSize = NULL, future.globals.method = NULL, [13:11:15.005] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.005] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.005] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.005] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.005] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.005] base::names(...future.oldOptions)) [13:11:15.005] } [13:11:15.005] if (FALSE) { [13:11:15.005] } [13:11:15.005] else { [13:11:15.005] if (TRUE) { [13:11:15.005] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.005] open = "w") [13:11:15.005] } [13:11:15.005] else { [13:11:15.005] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.005] windows = "NUL", "/dev/null"), open = "w") [13:11:15.005] } [13:11:15.005] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.005] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.005] base::sink(type = "output", split = FALSE) [13:11:15.005] base::close(...future.stdout) [13:11:15.005] }, add = TRUE) [13:11:15.005] } [13:11:15.005] ...future.frame <- base::sys.nframe() [13:11:15.005] ...future.conditions <- base::list() [13:11:15.005] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.005] if (FALSE) { [13:11:15.005] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.005] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.005] } [13:11:15.005] ...future.result <- base::tryCatch({ [13:11:15.005] base::withCallingHandlers({ [13:11:15.005] ...future.value <- base::withVisible(base::local(NA)) [13:11:15.005] future::FutureResult(value = ...future.value$value, [13:11:15.005] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.005] ...future.rng), globalenv = if (FALSE) [13:11:15.005] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.005] ...future.globalenv.names)) [13:11:15.005] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.005] }, condition = base::local({ [13:11:15.005] c <- base::c [13:11:15.005] inherits <- base::inherits [13:11:15.005] invokeRestart <- base::invokeRestart [13:11:15.005] length <- base::length [13:11:15.005] list <- base::list [13:11:15.005] seq.int <- base::seq.int [13:11:15.005] signalCondition <- base::signalCondition [13:11:15.005] sys.calls <- base::sys.calls [13:11:15.005] `[[` <- base::`[[` [13:11:15.005] `+` <- base::`+` [13:11:15.005] `<<-` <- base::`<<-` [13:11:15.005] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.005] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.005] 3L)] [13:11:15.005] } [13:11:15.005] function(cond) { [13:11:15.005] is_error <- inherits(cond, "error") [13:11:15.005] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.005] NULL) [13:11:15.005] if (is_error) { [13:11:15.005] sessionInformation <- function() { [13:11:15.005] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.005] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.005] search = base::search(), system = base::Sys.info()) [13:11:15.005] } [13:11:15.005] ...future.conditions[[length(...future.conditions) + [13:11:15.005] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.005] cond$call), session = sessionInformation(), [13:11:15.005] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.005] signalCondition(cond) [13:11:15.005] } [13:11:15.005] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.005] signal <- FALSE && inherits(cond, character(0)) [13:11:15.005] ...future.conditions[[length(...future.conditions) + [13:11:15.005] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.005] if (FALSE && !signal) { [13:11:15.005] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.005] { [13:11:15.005] inherits <- base::inherits [13:11:15.005] invokeRestart <- base::invokeRestart [13:11:15.005] is.null <- base::is.null [13:11:15.005] muffled <- FALSE [13:11:15.005] if (inherits(cond, "message")) { [13:11:15.005] muffled <- grepl(pattern, "muffleMessage") [13:11:15.005] if (muffled) [13:11:15.005] invokeRestart("muffleMessage") [13:11:15.005] } [13:11:15.005] else if (inherits(cond, "warning")) { [13:11:15.005] muffled <- grepl(pattern, "muffleWarning") [13:11:15.005] if (muffled) [13:11:15.005] invokeRestart("muffleWarning") [13:11:15.005] } [13:11:15.005] else if (inherits(cond, "condition")) { [13:11:15.005] if (!is.null(pattern)) { [13:11:15.005] computeRestarts <- base::computeRestarts [13:11:15.005] grepl <- base::grepl [13:11:15.005] restarts <- computeRestarts(cond) [13:11:15.005] for (restart in restarts) { [13:11:15.005] name <- restart$name [13:11:15.005] if (is.null(name)) [13:11:15.005] next [13:11:15.005] if (!grepl(pattern, name)) [13:11:15.005] next [13:11:15.005] invokeRestart(restart) [13:11:15.005] muffled <- TRUE [13:11:15.005] break [13:11:15.005] } [13:11:15.005] } [13:11:15.005] } [13:11:15.005] invisible(muffled) [13:11:15.005] } [13:11:15.005] muffleCondition(cond, pattern = "^muffle") [13:11:15.005] } [13:11:15.005] } [13:11:15.005] else { [13:11:15.005] if (TRUE) { [13:11:15.005] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.005] { [13:11:15.005] inherits <- base::inherits [13:11:15.005] invokeRestart <- base::invokeRestart [13:11:15.005] is.null <- base::is.null [13:11:15.005] muffled <- FALSE [13:11:15.005] if (inherits(cond, "message")) { [13:11:15.005] muffled <- grepl(pattern, "muffleMessage") [13:11:15.005] if (muffled) [13:11:15.005] invokeRestart("muffleMessage") [13:11:15.005] } [13:11:15.005] else if (inherits(cond, "warning")) { [13:11:15.005] muffled <- grepl(pattern, "muffleWarning") [13:11:15.005] if (muffled) [13:11:15.005] invokeRestart("muffleWarning") [13:11:15.005] } [13:11:15.005] else if (inherits(cond, "condition")) { [13:11:15.005] if (!is.null(pattern)) { [13:11:15.005] computeRestarts <- base::computeRestarts [13:11:15.005] grepl <- base::grepl [13:11:15.005] restarts <- computeRestarts(cond) [13:11:15.005] for (restart in restarts) { [13:11:15.005] name <- restart$name [13:11:15.005] if (is.null(name)) [13:11:15.005] next [13:11:15.005] if (!grepl(pattern, name)) [13:11:15.005] next [13:11:15.005] invokeRestart(restart) [13:11:15.005] muffled <- TRUE [13:11:15.005] break [13:11:15.005] } [13:11:15.005] } [13:11:15.005] } [13:11:15.005] invisible(muffled) [13:11:15.005] } [13:11:15.005] muffleCondition(cond, pattern = "^muffle") [13:11:15.005] } [13:11:15.005] } [13:11:15.005] } [13:11:15.005] })) [13:11:15.005] }, error = function(ex) { [13:11:15.005] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.005] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.005] ...future.rng), started = ...future.startTime, [13:11:15.005] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.005] version = "1.8"), class = "FutureResult") [13:11:15.005] }, finally = { [13:11:15.005] if (!identical(...future.workdir, getwd())) [13:11:15.005] setwd(...future.workdir) [13:11:15.005] { [13:11:15.005] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.005] ...future.oldOptions$nwarnings <- NULL [13:11:15.005] } [13:11:15.005] base::options(...future.oldOptions) [13:11:15.005] if (.Platform$OS.type == "windows") { [13:11:15.005] old_names <- names(...future.oldEnvVars) [13:11:15.005] envs <- base::Sys.getenv() [13:11:15.005] names <- names(envs) [13:11:15.005] common <- intersect(names, old_names) [13:11:15.005] added <- setdiff(names, old_names) [13:11:15.005] removed <- setdiff(old_names, names) [13:11:15.005] changed <- common[...future.oldEnvVars[common] != [13:11:15.005] envs[common]] [13:11:15.005] NAMES <- toupper(changed) [13:11:15.005] args <- list() [13:11:15.005] for (kk in seq_along(NAMES)) { [13:11:15.005] name <- changed[[kk]] [13:11:15.005] NAME <- NAMES[[kk]] [13:11:15.005] if (name != NAME && is.element(NAME, old_names)) [13:11:15.005] next [13:11:15.005] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.005] } [13:11:15.005] NAMES <- toupper(added) [13:11:15.005] for (kk in seq_along(NAMES)) { [13:11:15.005] name <- added[[kk]] [13:11:15.005] NAME <- NAMES[[kk]] [13:11:15.005] if (name != NAME && is.element(NAME, old_names)) [13:11:15.005] next [13:11:15.005] args[[name]] <- "" [13:11:15.005] } [13:11:15.005] NAMES <- toupper(removed) [13:11:15.005] for (kk in seq_along(NAMES)) { [13:11:15.005] name <- removed[[kk]] [13:11:15.005] NAME <- NAMES[[kk]] [13:11:15.005] if (name != NAME && is.element(NAME, old_names)) [13:11:15.005] next [13:11:15.005] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.005] } [13:11:15.005] if (length(args) > 0) [13:11:15.005] base::do.call(base::Sys.setenv, args = args) [13:11:15.005] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.005] } [13:11:15.005] else { [13:11:15.005] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.005] } [13:11:15.005] { [13:11:15.005] if (base::length(...future.futureOptionsAdded) > [13:11:15.005] 0L) { [13:11:15.005] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.005] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.005] base::options(opts) [13:11:15.005] } [13:11:15.005] { [13:11:15.005] NULL [13:11:15.005] options(future.plan = NULL) [13:11:15.005] if (is.na(NA_character_)) [13:11:15.005] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.005] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.005] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.005] .init = FALSE) [13:11:15.005] } [13:11:15.005] } [13:11:15.005] } [13:11:15.005] }) [13:11:15.005] if (TRUE) { [13:11:15.005] base::sink(type = "output", split = FALSE) [13:11:15.005] if (TRUE) { [13:11:15.005] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.005] } [13:11:15.005] else { [13:11:15.005] ...future.result["stdout"] <- base::list(NULL) [13:11:15.005] } [13:11:15.005] base::close(...future.stdout) [13:11:15.005] ...future.stdout <- NULL [13:11:15.005] } [13:11:15.005] ...future.result$conditions <- ...future.conditions [13:11:15.005] ...future.result$finished <- base::Sys.time() [13:11:15.005] ...future.result [13:11:15.005] } [13:11:15.108] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:11:15.108] plan(): nbrOfWorkers() = 2 [13:11:15.108] future_lapply() ... [13:11:15.115] Number of chunks: 3 [13:11:15.115] getGlobalsAndPackagesXApply() ... [13:11:15.115] - future.globals: TRUE [13:11:15.116] getGlobalsAndPackages() ... [13:11:15.116] Searching for globals... [13:11:15.118] - globals found: [2] 'FUN', '.Internal' [13:11:15.119] Searching for globals ... DONE [13:11:15.119] Resolving globals: FALSE [13:11:15.120] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:11:15.121] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:11:15.121] - globals: [1] 'FUN' [13:11:15.121] [13:11:15.121] getGlobalsAndPackages() ... DONE [13:11:15.121] - globals found/used: [n=1] 'FUN' [13:11:15.121] - needed namespaces: [n=0] [13:11:15.122] Finding globals ... DONE [13:11:15.122] - use_args: TRUE [13:11:15.122] - Getting '...' globals ... [13:11:15.123] resolve() on list ... [13:11:15.123] recursive: 0 [13:11:15.123] length: 1 [13:11:15.124] elements: '...' [13:11:15.124] length: 0 (resolved future 1) [13:11:15.124] resolve() on list ... DONE [13:11:15.124] - '...' content: [n=1] 'length' [13:11:15.124] List of 1 [13:11:15.124] $ ...:List of 1 [13:11:15.124] ..$ length: int 2 [13:11:15.124] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.124] - attr(*, "where")=List of 1 [13:11:15.124] ..$ ...: [13:11:15.124] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.124] - attr(*, "resolved")= logi TRUE [13:11:15.124] - attr(*, "total_size")= num NA [13:11:15.131] - Getting '...' globals ... DONE [13:11:15.131] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:11:15.132] List of 2 [13:11:15.132] $ ...future.FUN:function (mode = "logical", length = 0L) [13:11:15.132] $ ... :List of 1 [13:11:15.132] ..$ length: int 2 [13:11:15.132] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.132] - attr(*, "where")=List of 2 [13:11:15.132] ..$ ...future.FUN: [13:11:15.132] ..$ ... : [13:11:15.132] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.132] - attr(*, "resolved")= logi FALSE [13:11:15.132] - attr(*, "total_size")= num 2240 [13:11:15.135] Packages to be attached in all futures: [n=0] [13:11:15.136] getGlobalsAndPackagesXApply() ... DONE [13:11:15.136] Number of futures (= number of chunks): 3 [13:11:15.136] Launching 3 futures (chunks) ... [13:11:15.136] Chunk #1 of 3 ... [13:11:15.137] - Finding globals in 'X' for chunk #1 ... [13:11:15.137] getGlobalsAndPackages() ... [13:11:15.137] Searching for globals... [13:11:15.137] [13:11:15.138] Searching for globals ... DONE [13:11:15.138] - globals: [0] [13:11:15.138] getGlobalsAndPackages() ... DONE [13:11:15.138] + additional globals found: [n=0] [13:11:15.138] + additional namespaces needed: [n=0] [13:11:15.138] - Finding globals in 'X' for chunk #1 ... DONE [13:11:15.139] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:11:15.139] - seeds: [13:11:15.139] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.139] getGlobalsAndPackages() ... [13:11:15.139] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.139] Resolving globals: FALSE [13:11:15.140] Tweak future expression to call with '...' arguments ... [13:11:15.140] { [13:11:15.140] do.call(function(...) { [13:11:15.140] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.140] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.140] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.140] on.exit(options(oopts), add = TRUE) [13:11:15.140] } [13:11:15.140] { [13:11:15.140] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.140] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.140] ...future.FUN(...future.X_jj, ...) [13:11:15.140] }) [13:11:15.140] } [13:11:15.140] }, args = future.call.arguments) [13:11:15.140] } [13:11:15.140] Tweak future expression to call with '...' arguments ... DONE [13:11:15.141] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.141] [13:11:15.141] getGlobalsAndPackages() ... DONE [13:11:15.142] run() for 'Future' ... [13:11:15.142] - state: 'created' [13:11:15.142] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.145] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.145] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.145] - Field: 'label' [13:11:15.145] - Field: 'local' [13:11:15.145] - Field: 'owner' [13:11:15.145] - Field: 'envir' [13:11:15.146] - Field: 'packages' [13:11:15.146] - Field: 'gc' [13:11:15.146] - Field: 'conditions' [13:11:15.146] - Field: 'expr' [13:11:15.146] - Field: 'uuid' [13:11:15.147] - Field: 'seed' [13:11:15.147] - Field: 'version' [13:11:15.147] - Field: 'result' [13:11:15.147] - Field: 'asynchronous' [13:11:15.147] - Field: 'calls' [13:11:15.147] - Field: 'globals' [13:11:15.148] - Field: 'stdout' [13:11:15.148] - Field: 'earlySignal' [13:11:15.148] - Field: 'lazy' [13:11:15.148] - Field: 'state' [13:11:15.148] - Field: '.cluster' [13:11:15.148] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.149] - Launch lazy future ... [13:11:15.149] Packages needed by the future expression (n = 0): [13:11:15.149] Packages needed by future strategies (n = 0): [13:11:15.150] { [13:11:15.150] { [13:11:15.150] { [13:11:15.150] ...future.startTime <- base::Sys.time() [13:11:15.150] { [13:11:15.150] { [13:11:15.150] { [13:11:15.150] base::local({ [13:11:15.150] has_future <- base::requireNamespace("future", [13:11:15.150] quietly = TRUE) [13:11:15.150] if (has_future) { [13:11:15.150] ns <- base::getNamespace("future") [13:11:15.150] version <- ns[[".package"]][["version"]] [13:11:15.150] if (is.null(version)) [13:11:15.150] version <- utils::packageVersion("future") [13:11:15.150] } [13:11:15.150] else { [13:11:15.150] version <- NULL [13:11:15.150] } [13:11:15.150] if (!has_future || version < "1.8.0") { [13:11:15.150] info <- base::c(r_version = base::gsub("R version ", [13:11:15.150] "", base::R.version$version.string), [13:11:15.150] platform = base::sprintf("%s (%s-bit)", [13:11:15.150] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.150] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.150] "release", "version")], collapse = " "), [13:11:15.150] hostname = base::Sys.info()[["nodename"]]) [13:11:15.150] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.150] info) [13:11:15.150] info <- base::paste(info, collapse = "; ") [13:11:15.150] if (!has_future) { [13:11:15.150] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.150] info) [13:11:15.150] } [13:11:15.150] else { [13:11:15.150] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.150] info, version) [13:11:15.150] } [13:11:15.150] base::stop(msg) [13:11:15.150] } [13:11:15.150] }) [13:11:15.150] } [13:11:15.150] ...future.strategy.old <- future::plan("list") [13:11:15.150] options(future.plan = NULL) [13:11:15.150] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.150] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.150] } [13:11:15.150] ...future.workdir <- getwd() [13:11:15.150] } [13:11:15.150] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.150] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.150] } [13:11:15.150] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.150] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:11:15.150] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.150] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.150] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.150] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.150] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.150] base::names(...future.oldOptions)) [13:11:15.150] } [13:11:15.150] if (FALSE) { [13:11:15.150] } [13:11:15.150] else { [13:11:15.150] if (TRUE) { [13:11:15.150] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.150] open = "w") [13:11:15.150] } [13:11:15.150] else { [13:11:15.150] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.150] windows = "NUL", "/dev/null"), open = "w") [13:11:15.150] } [13:11:15.150] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.150] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.150] base::sink(type = "output", split = FALSE) [13:11:15.150] base::close(...future.stdout) [13:11:15.150] }, add = TRUE) [13:11:15.150] } [13:11:15.150] ...future.frame <- base::sys.nframe() [13:11:15.150] ...future.conditions <- base::list() [13:11:15.150] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.150] if (FALSE) { [13:11:15.150] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.150] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.150] } [13:11:15.150] ...future.result <- base::tryCatch({ [13:11:15.150] base::withCallingHandlers({ [13:11:15.150] ...future.value <- base::withVisible(base::local({ [13:11:15.150] do.call(function(...) { [13:11:15.150] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.150] if (!identical(...future.globals.maxSize.org, [13:11:15.150] ...future.globals.maxSize)) { [13:11:15.150] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.150] on.exit(options(oopts), add = TRUE) [13:11:15.150] } [13:11:15.150] { [13:11:15.150] lapply(seq_along(...future.elements_ii), [13:11:15.150] FUN = function(jj) { [13:11:15.150] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.150] ...future.FUN(...future.X_jj, ...) [13:11:15.150] }) [13:11:15.150] } [13:11:15.150] }, args = future.call.arguments) [13:11:15.150] })) [13:11:15.150] future::FutureResult(value = ...future.value$value, [13:11:15.150] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.150] ...future.rng), globalenv = if (FALSE) [13:11:15.150] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.150] ...future.globalenv.names)) [13:11:15.150] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.150] }, condition = base::local({ [13:11:15.150] c <- base::c [13:11:15.150] inherits <- base::inherits [13:11:15.150] invokeRestart <- base::invokeRestart [13:11:15.150] length <- base::length [13:11:15.150] list <- base::list [13:11:15.150] seq.int <- base::seq.int [13:11:15.150] signalCondition <- base::signalCondition [13:11:15.150] sys.calls <- base::sys.calls [13:11:15.150] `[[` <- base::`[[` [13:11:15.150] `+` <- base::`+` [13:11:15.150] `<<-` <- base::`<<-` [13:11:15.150] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.150] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.150] 3L)] [13:11:15.150] } [13:11:15.150] function(cond) { [13:11:15.150] is_error <- inherits(cond, "error") [13:11:15.150] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.150] NULL) [13:11:15.150] if (is_error) { [13:11:15.150] sessionInformation <- function() { [13:11:15.150] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.150] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.150] search = base::search(), system = base::Sys.info()) [13:11:15.150] } [13:11:15.150] ...future.conditions[[length(...future.conditions) + [13:11:15.150] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.150] cond$call), session = sessionInformation(), [13:11:15.150] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.150] signalCondition(cond) [13:11:15.150] } [13:11:15.150] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.150] signal <- FALSE && inherits(cond, character(0)) [13:11:15.150] ...future.conditions[[length(...future.conditions) + [13:11:15.150] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.150] if (FALSE && !signal) { [13:11:15.150] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.150] { [13:11:15.150] inherits <- base::inherits [13:11:15.150] invokeRestart <- base::invokeRestart [13:11:15.150] is.null <- base::is.null [13:11:15.150] muffled <- FALSE [13:11:15.150] if (inherits(cond, "message")) { [13:11:15.150] muffled <- grepl(pattern, "muffleMessage") [13:11:15.150] if (muffled) [13:11:15.150] invokeRestart("muffleMessage") [13:11:15.150] } [13:11:15.150] else if (inherits(cond, "warning")) { [13:11:15.150] muffled <- grepl(pattern, "muffleWarning") [13:11:15.150] if (muffled) [13:11:15.150] invokeRestart("muffleWarning") [13:11:15.150] } [13:11:15.150] else if (inherits(cond, "condition")) { [13:11:15.150] if (!is.null(pattern)) { [13:11:15.150] computeRestarts <- base::computeRestarts [13:11:15.150] grepl <- base::grepl [13:11:15.150] restarts <- computeRestarts(cond) [13:11:15.150] for (restart in restarts) { [13:11:15.150] name <- restart$name [13:11:15.150] if (is.null(name)) [13:11:15.150] next [13:11:15.150] if (!grepl(pattern, name)) [13:11:15.150] next [13:11:15.150] invokeRestart(restart) [13:11:15.150] muffled <- TRUE [13:11:15.150] break [13:11:15.150] } [13:11:15.150] } [13:11:15.150] } [13:11:15.150] invisible(muffled) [13:11:15.150] } [13:11:15.150] muffleCondition(cond, pattern = "^muffle") [13:11:15.150] } [13:11:15.150] } [13:11:15.150] else { [13:11:15.150] if (TRUE) { [13:11:15.150] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.150] { [13:11:15.150] inherits <- base::inherits [13:11:15.150] invokeRestart <- base::invokeRestart [13:11:15.150] is.null <- base::is.null [13:11:15.150] muffled <- FALSE [13:11:15.150] if (inherits(cond, "message")) { [13:11:15.150] muffled <- grepl(pattern, "muffleMessage") [13:11:15.150] if (muffled) [13:11:15.150] invokeRestart("muffleMessage") [13:11:15.150] } [13:11:15.150] else if (inherits(cond, "warning")) { [13:11:15.150] muffled <- grepl(pattern, "muffleWarning") [13:11:15.150] if (muffled) [13:11:15.150] invokeRestart("muffleWarning") [13:11:15.150] } [13:11:15.150] else if (inherits(cond, "condition")) { [13:11:15.150] if (!is.null(pattern)) { [13:11:15.150] computeRestarts <- base::computeRestarts [13:11:15.150] grepl <- base::grepl [13:11:15.150] restarts <- computeRestarts(cond) [13:11:15.150] for (restart in restarts) { [13:11:15.150] name <- restart$name [13:11:15.150] if (is.null(name)) [13:11:15.150] next [13:11:15.150] if (!grepl(pattern, name)) [13:11:15.150] next [13:11:15.150] invokeRestart(restart) [13:11:15.150] muffled <- TRUE [13:11:15.150] break [13:11:15.150] } [13:11:15.150] } [13:11:15.150] } [13:11:15.150] invisible(muffled) [13:11:15.150] } [13:11:15.150] muffleCondition(cond, pattern = "^muffle") [13:11:15.150] } [13:11:15.150] } [13:11:15.150] } [13:11:15.150] })) [13:11:15.150] }, error = function(ex) { [13:11:15.150] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.150] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.150] ...future.rng), started = ...future.startTime, [13:11:15.150] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.150] version = "1.8"), class = "FutureResult") [13:11:15.150] }, finally = { [13:11:15.150] if (!identical(...future.workdir, getwd())) [13:11:15.150] setwd(...future.workdir) [13:11:15.150] { [13:11:15.150] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.150] ...future.oldOptions$nwarnings <- NULL [13:11:15.150] } [13:11:15.150] base::options(...future.oldOptions) [13:11:15.150] if (.Platform$OS.type == "windows") { [13:11:15.150] old_names <- names(...future.oldEnvVars) [13:11:15.150] envs <- base::Sys.getenv() [13:11:15.150] names <- names(envs) [13:11:15.150] common <- intersect(names, old_names) [13:11:15.150] added <- setdiff(names, old_names) [13:11:15.150] removed <- setdiff(old_names, names) [13:11:15.150] changed <- common[...future.oldEnvVars[common] != [13:11:15.150] envs[common]] [13:11:15.150] NAMES <- toupper(changed) [13:11:15.150] args <- list() [13:11:15.150] for (kk in seq_along(NAMES)) { [13:11:15.150] name <- changed[[kk]] [13:11:15.150] NAME <- NAMES[[kk]] [13:11:15.150] if (name != NAME && is.element(NAME, old_names)) [13:11:15.150] next [13:11:15.150] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.150] } [13:11:15.150] NAMES <- toupper(added) [13:11:15.150] for (kk in seq_along(NAMES)) { [13:11:15.150] name <- added[[kk]] [13:11:15.150] NAME <- NAMES[[kk]] [13:11:15.150] if (name != NAME && is.element(NAME, old_names)) [13:11:15.150] next [13:11:15.150] args[[name]] <- "" [13:11:15.150] } [13:11:15.150] NAMES <- toupper(removed) [13:11:15.150] for (kk in seq_along(NAMES)) { [13:11:15.150] name <- removed[[kk]] [13:11:15.150] NAME <- NAMES[[kk]] [13:11:15.150] if (name != NAME && is.element(NAME, old_names)) [13:11:15.150] next [13:11:15.150] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.150] } [13:11:15.150] if (length(args) > 0) [13:11:15.150] base::do.call(base::Sys.setenv, args = args) [13:11:15.150] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.150] } [13:11:15.150] else { [13:11:15.150] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.150] } [13:11:15.150] { [13:11:15.150] if (base::length(...future.futureOptionsAdded) > [13:11:15.150] 0L) { [13:11:15.150] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.150] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.150] base::options(opts) [13:11:15.150] } [13:11:15.150] { [13:11:15.150] NULL [13:11:15.150] options(future.plan = NULL) [13:11:15.150] if (is.na(NA_character_)) [13:11:15.150] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.150] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.150] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.150] .init = FALSE) [13:11:15.150] } [13:11:15.150] } [13:11:15.150] } [13:11:15.150] }) [13:11:15.150] if (TRUE) { [13:11:15.150] base::sink(type = "output", split = FALSE) [13:11:15.150] if (TRUE) { [13:11:15.150] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.150] } [13:11:15.150] else { [13:11:15.150] ...future.result["stdout"] <- base::list(NULL) [13:11:15.150] } [13:11:15.150] base::close(...future.stdout) [13:11:15.150] ...future.stdout <- NULL [13:11:15.150] } [13:11:15.150] ...future.result$conditions <- ...future.conditions [13:11:15.150] ...future.result$finished <- base::Sys.time() [13:11:15.150] ...future.result [13:11:15.150] } [13:11:15.154] - Launch lazy future ... done [13:11:15.154] run() for 'MiraiFuture' ... done [13:11:15.154] Created future: [13:11:15.156] resolved() for 'MiraiFuture' ... [13:11:15.156] - state: 'running' [13:11:15.157] - run: TRUE [13:11:15.157] - result: 'NULL' [13:11:15.157] - resolved: FALSE [13:11:15.157] resolved() for 'MiraiFuture' ... done [13:11:15.155] MiraiFuture: [13:11:15.155] Label: 'future_lapply-1' [13:11:15.155] Expression: [13:11:15.155] { [13:11:15.155] do.call(function(...) { [13:11:15.155] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.155] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.155] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.155] on.exit(options(oopts), add = TRUE) [13:11:15.155] } [13:11:15.155] { [13:11:15.155] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.155] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.155] ...future.FUN(...future.X_jj, ...) [13:11:15.155] }) [13:11:15.155] } [13:11:15.155] }, args = future.call.arguments) [13:11:15.155] } [13:11:15.155] Lazy evaluation: FALSE [13:11:15.155] Asynchronous evaluation: TRUE [13:11:15.155] Local evaluation: TRUE [13:11:15.155] Environment: R_GlobalEnv [13:11:15.155] Capture standard output: TRUE [13:11:15.155] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.155] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.155] Packages: [13:11:15.155] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.155] Resolved: TRUE [13:11:15.155] Value: [13:11:15.155] Conditions captured: [13:11:15.155] Early signaling: FALSE [13:11:15.155] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.155] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.158] Chunk #1 of 3 ... DONE [13:11:15.158] Chunk #2 of 3 ... [13:11:15.158] - Finding globals in 'X' for chunk #2 ... [13:11:15.158] getGlobalsAndPackages() ... [13:11:15.158] Searching for globals... [13:11:15.159] [13:11:15.159] Searching for globals ... DONE [13:11:15.159] - globals: [0] [13:11:15.161] getGlobalsAndPackages() ... DONE [13:11:15.161] + additional globals found: [n=0] [13:11:15.161] + additional namespaces needed: [n=0] [13:11:15.161] - Finding globals in 'X' for chunk #2 ... DONE [13:11:15.162] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:11:15.162] - seeds: [13:11:15.162] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.162] getGlobalsAndPackages() ... [13:11:15.162] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.162] Resolving globals: FALSE [13:11:15.163] Tweak future expression to call with '...' arguments ... [13:11:15.163] { [13:11:15.163] do.call(function(...) { [13:11:15.163] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.163] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.163] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.163] on.exit(options(oopts), add = TRUE) [13:11:15.163] } [13:11:15.163] { [13:11:15.163] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.163] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.163] ...future.FUN(...future.X_jj, ...) [13:11:15.163] }) [13:11:15.163] } [13:11:15.163] }, args = future.call.arguments) [13:11:15.163] } [13:11:15.163] Tweak future expression to call with '...' arguments ... DONE [13:11:15.164] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.164] [13:11:15.164] getGlobalsAndPackages() ... DONE [13:11:15.164] run() for 'Future' ... [13:11:15.165] - state: 'created' [13:11:15.165] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.167] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.167] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.168] - Field: 'label' [13:11:15.168] - Field: 'local' [13:11:15.168] - Field: 'owner' [13:11:15.168] - Field: 'envir' [13:11:15.168] - Field: 'packages' [13:11:15.168] - Field: 'gc' [13:11:15.169] - Field: 'conditions' [13:11:15.169] - Field: 'expr' [13:11:15.169] - Field: 'uuid' [13:11:15.169] - Field: 'seed' [13:11:15.169] - Field: 'version' [13:11:15.170] - Field: 'result' [13:11:15.170] - Field: 'asynchronous' [13:11:15.170] - Field: 'calls' [13:11:15.170] - Field: 'globals' [13:11:15.170] - Field: 'stdout' [13:11:15.170] - Field: 'earlySignal' [13:11:15.171] - Field: 'lazy' [13:11:15.171] - Field: 'state' [13:11:15.171] - Field: '.cluster' [13:11:15.171] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.171] - Launch lazy future ... [13:11:15.171] Packages needed by the future expression (n = 0): [13:11:15.172] Packages needed by future strategies (n = 0): [13:11:15.172] { [13:11:15.172] { [13:11:15.172] { [13:11:15.172] ...future.startTime <- base::Sys.time() [13:11:15.172] { [13:11:15.172] { [13:11:15.172] { [13:11:15.172] base::local({ [13:11:15.172] has_future <- base::requireNamespace("future", [13:11:15.172] quietly = TRUE) [13:11:15.172] if (has_future) { [13:11:15.172] ns <- base::getNamespace("future") [13:11:15.172] version <- ns[[".package"]][["version"]] [13:11:15.172] if (is.null(version)) [13:11:15.172] version <- utils::packageVersion("future") [13:11:15.172] } [13:11:15.172] else { [13:11:15.172] version <- NULL [13:11:15.172] } [13:11:15.172] if (!has_future || version < "1.8.0") { [13:11:15.172] info <- base::c(r_version = base::gsub("R version ", [13:11:15.172] "", base::R.version$version.string), [13:11:15.172] platform = base::sprintf("%s (%s-bit)", [13:11:15.172] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.172] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.172] "release", "version")], collapse = " "), [13:11:15.172] hostname = base::Sys.info()[["nodename"]]) [13:11:15.172] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.172] info) [13:11:15.172] info <- base::paste(info, collapse = "; ") [13:11:15.172] if (!has_future) { [13:11:15.172] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.172] info) [13:11:15.172] } [13:11:15.172] else { [13:11:15.172] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.172] info, version) [13:11:15.172] } [13:11:15.172] base::stop(msg) [13:11:15.172] } [13:11:15.172] }) [13:11:15.172] } [13:11:15.172] ...future.strategy.old <- future::plan("list") [13:11:15.172] options(future.plan = NULL) [13:11:15.172] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.172] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.172] } [13:11:15.172] ...future.workdir <- getwd() [13:11:15.172] } [13:11:15.172] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.172] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.172] } [13:11:15.172] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.172] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:11:15.172] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.172] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.172] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.172] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.172] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.172] base::names(...future.oldOptions)) [13:11:15.172] } [13:11:15.172] if (FALSE) { [13:11:15.172] } [13:11:15.172] else { [13:11:15.172] if (TRUE) { [13:11:15.172] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.172] open = "w") [13:11:15.172] } [13:11:15.172] else { [13:11:15.172] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.172] windows = "NUL", "/dev/null"), open = "w") [13:11:15.172] } [13:11:15.172] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.172] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.172] base::sink(type = "output", split = FALSE) [13:11:15.172] base::close(...future.stdout) [13:11:15.172] }, add = TRUE) [13:11:15.172] } [13:11:15.172] ...future.frame <- base::sys.nframe() [13:11:15.172] ...future.conditions <- base::list() [13:11:15.172] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.172] if (FALSE) { [13:11:15.172] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.172] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.172] } [13:11:15.172] ...future.result <- base::tryCatch({ [13:11:15.172] base::withCallingHandlers({ [13:11:15.172] ...future.value <- base::withVisible(base::local({ [13:11:15.172] do.call(function(...) { [13:11:15.172] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.172] if (!identical(...future.globals.maxSize.org, [13:11:15.172] ...future.globals.maxSize)) { [13:11:15.172] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.172] on.exit(options(oopts), add = TRUE) [13:11:15.172] } [13:11:15.172] { [13:11:15.172] lapply(seq_along(...future.elements_ii), [13:11:15.172] FUN = function(jj) { [13:11:15.172] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.172] ...future.FUN(...future.X_jj, ...) [13:11:15.172] }) [13:11:15.172] } [13:11:15.172] }, args = future.call.arguments) [13:11:15.172] })) [13:11:15.172] future::FutureResult(value = ...future.value$value, [13:11:15.172] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.172] ...future.rng), globalenv = if (FALSE) [13:11:15.172] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.172] ...future.globalenv.names)) [13:11:15.172] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.172] }, condition = base::local({ [13:11:15.172] c <- base::c [13:11:15.172] inherits <- base::inherits [13:11:15.172] invokeRestart <- base::invokeRestart [13:11:15.172] length <- base::length [13:11:15.172] list <- base::list [13:11:15.172] seq.int <- base::seq.int [13:11:15.172] signalCondition <- base::signalCondition [13:11:15.172] sys.calls <- base::sys.calls [13:11:15.172] `[[` <- base::`[[` [13:11:15.172] `+` <- base::`+` [13:11:15.172] `<<-` <- base::`<<-` [13:11:15.172] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.172] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.172] 3L)] [13:11:15.172] } [13:11:15.172] function(cond) { [13:11:15.172] is_error <- inherits(cond, "error") [13:11:15.172] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.172] NULL) [13:11:15.172] if (is_error) { [13:11:15.172] sessionInformation <- function() { [13:11:15.172] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.172] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.172] search = base::search(), system = base::Sys.info()) [13:11:15.172] } [13:11:15.172] ...future.conditions[[length(...future.conditions) + [13:11:15.172] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.172] cond$call), session = sessionInformation(), [13:11:15.172] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.172] signalCondition(cond) [13:11:15.172] } [13:11:15.172] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.172] signal <- FALSE && inherits(cond, character(0)) [13:11:15.172] ...future.conditions[[length(...future.conditions) + [13:11:15.172] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.172] if (FALSE && !signal) { [13:11:15.172] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.172] { [13:11:15.172] inherits <- base::inherits [13:11:15.172] invokeRestart <- base::invokeRestart [13:11:15.172] is.null <- base::is.null [13:11:15.172] muffled <- FALSE [13:11:15.172] if (inherits(cond, "message")) { [13:11:15.172] muffled <- grepl(pattern, "muffleMessage") [13:11:15.172] if (muffled) [13:11:15.172] invokeRestart("muffleMessage") [13:11:15.172] } [13:11:15.172] else if (inherits(cond, "warning")) { [13:11:15.172] muffled <- grepl(pattern, "muffleWarning") [13:11:15.172] if (muffled) [13:11:15.172] invokeRestart("muffleWarning") [13:11:15.172] } [13:11:15.172] else if (inherits(cond, "condition")) { [13:11:15.172] if (!is.null(pattern)) { [13:11:15.172] computeRestarts <- base::computeRestarts [13:11:15.172] grepl <- base::grepl [13:11:15.172] restarts <- computeRestarts(cond) [13:11:15.172] for (restart in restarts) { [13:11:15.172] name <- restart$name [13:11:15.172] if (is.null(name)) [13:11:15.172] next [13:11:15.172] if (!grepl(pattern, name)) [13:11:15.172] next [13:11:15.172] invokeRestart(restart) [13:11:15.172] muffled <- TRUE [13:11:15.172] break [13:11:15.172] } [13:11:15.172] } [13:11:15.172] } [13:11:15.172] invisible(muffled) [13:11:15.172] } [13:11:15.172] muffleCondition(cond, pattern = "^muffle") [13:11:15.172] } [13:11:15.172] } [13:11:15.172] else { [13:11:15.172] if (TRUE) { [13:11:15.172] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.172] { [13:11:15.172] inherits <- base::inherits [13:11:15.172] invokeRestart <- base::invokeRestart [13:11:15.172] is.null <- base::is.null [13:11:15.172] muffled <- FALSE [13:11:15.172] if (inherits(cond, "message")) { [13:11:15.172] muffled <- grepl(pattern, "muffleMessage") [13:11:15.172] if (muffled) [13:11:15.172] invokeRestart("muffleMessage") [13:11:15.172] } [13:11:15.172] else if (inherits(cond, "warning")) { [13:11:15.172] muffled <- grepl(pattern, "muffleWarning") [13:11:15.172] if (muffled) [13:11:15.172] invokeRestart("muffleWarning") [13:11:15.172] } [13:11:15.172] else if (inherits(cond, "condition")) { [13:11:15.172] if (!is.null(pattern)) { [13:11:15.172] computeRestarts <- base::computeRestarts [13:11:15.172] grepl <- base::grepl [13:11:15.172] restarts <- computeRestarts(cond) [13:11:15.172] for (restart in restarts) { [13:11:15.172] name <- restart$name [13:11:15.172] if (is.null(name)) [13:11:15.172] next [13:11:15.172] if (!grepl(pattern, name)) [13:11:15.172] next [13:11:15.172] invokeRestart(restart) [13:11:15.172] muffled <- TRUE [13:11:15.172] break [13:11:15.172] } [13:11:15.172] } [13:11:15.172] } [13:11:15.172] invisible(muffled) [13:11:15.172] } [13:11:15.172] muffleCondition(cond, pattern = "^muffle") [13:11:15.172] } [13:11:15.172] } [13:11:15.172] } [13:11:15.172] })) [13:11:15.172] }, error = function(ex) { [13:11:15.172] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.172] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.172] ...future.rng), started = ...future.startTime, [13:11:15.172] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.172] version = "1.8"), class = "FutureResult") [13:11:15.172] }, finally = { [13:11:15.172] if (!identical(...future.workdir, getwd())) [13:11:15.172] setwd(...future.workdir) [13:11:15.172] { [13:11:15.172] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.172] ...future.oldOptions$nwarnings <- NULL [13:11:15.172] } [13:11:15.172] base::options(...future.oldOptions) [13:11:15.172] if (.Platform$OS.type == "windows") { [13:11:15.172] old_names <- names(...future.oldEnvVars) [13:11:15.172] envs <- base::Sys.getenv() [13:11:15.172] names <- names(envs) [13:11:15.172] common <- intersect(names, old_names) [13:11:15.172] added <- setdiff(names, old_names) [13:11:15.172] removed <- setdiff(old_names, names) [13:11:15.172] changed <- common[...future.oldEnvVars[common] != [13:11:15.172] envs[common]] [13:11:15.172] NAMES <- toupper(changed) [13:11:15.172] args <- list() [13:11:15.172] for (kk in seq_along(NAMES)) { [13:11:15.172] name <- changed[[kk]] [13:11:15.172] NAME <- NAMES[[kk]] [13:11:15.172] if (name != NAME && is.element(NAME, old_names)) [13:11:15.172] next [13:11:15.172] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.172] } [13:11:15.172] NAMES <- toupper(added) [13:11:15.172] for (kk in seq_along(NAMES)) { [13:11:15.172] name <- added[[kk]] [13:11:15.172] NAME <- NAMES[[kk]] [13:11:15.172] if (name != NAME && is.element(NAME, old_names)) [13:11:15.172] next [13:11:15.172] args[[name]] <- "" [13:11:15.172] } [13:11:15.172] NAMES <- toupper(removed) [13:11:15.172] for (kk in seq_along(NAMES)) { [13:11:15.172] name <- removed[[kk]] [13:11:15.172] NAME <- NAMES[[kk]] [13:11:15.172] if (name != NAME && is.element(NAME, old_names)) [13:11:15.172] next [13:11:15.172] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.172] } [13:11:15.172] if (length(args) > 0) [13:11:15.172] base::do.call(base::Sys.setenv, args = args) [13:11:15.172] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.172] } [13:11:15.172] else { [13:11:15.172] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.172] } [13:11:15.172] { [13:11:15.172] if (base::length(...future.futureOptionsAdded) > [13:11:15.172] 0L) { [13:11:15.172] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.172] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.172] base::options(opts) [13:11:15.172] } [13:11:15.172] { [13:11:15.172] NULL [13:11:15.172] options(future.plan = NULL) [13:11:15.172] if (is.na(NA_character_)) [13:11:15.172] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.172] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.172] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.172] .init = FALSE) [13:11:15.172] } [13:11:15.172] } [13:11:15.172] } [13:11:15.172] }) [13:11:15.172] if (TRUE) { [13:11:15.172] base::sink(type = "output", split = FALSE) [13:11:15.172] if (TRUE) { [13:11:15.172] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.172] } [13:11:15.172] else { [13:11:15.172] ...future.result["stdout"] <- base::list(NULL) [13:11:15.172] } [13:11:15.172] base::close(...future.stdout) [13:11:15.172] ...future.stdout <- NULL [13:11:15.172] } [13:11:15.172] ...future.result$conditions <- ...future.conditions [13:11:15.172] ...future.result$finished <- base::Sys.time() [13:11:15.172] ...future.result [13:11:15.172] } [13:11:15.176] - Launch lazy future ... done [13:11:15.176] run() for 'MiraiFuture' ... done [13:11:15.177] Created future: [13:11:15.178] resolved() for 'MiraiFuture' ... [13:11:15.178] - state: 'running' [13:11:15.178] - run: TRUE [13:11:15.178] - result: 'NULL' [13:11:15.179] - resolved: FALSE [13:11:15.179] resolved() for 'MiraiFuture' ... done [13:11:15.177] MiraiFuture: [13:11:15.177] Label: 'future_lapply-2' [13:11:15.177] Expression: [13:11:15.177] { [13:11:15.177] do.call(function(...) { [13:11:15.177] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.177] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.177] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.177] on.exit(options(oopts), add = TRUE) [13:11:15.177] } [13:11:15.177] { [13:11:15.177] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.177] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.177] ...future.FUN(...future.X_jj, ...) [13:11:15.177] }) [13:11:15.177] } [13:11:15.177] }, args = future.call.arguments) [13:11:15.177] } [13:11:15.177] Lazy evaluation: FALSE [13:11:15.177] Asynchronous evaluation: TRUE [13:11:15.177] Local evaluation: TRUE [13:11:15.177] Environment: R_GlobalEnv [13:11:15.177] Capture standard output: TRUE [13:11:15.177] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.177] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.177] Packages: [13:11:15.177] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.177] Resolved: TRUE [13:11:15.177] Value: [13:11:15.177] Conditions captured: [13:11:15.177] Early signaling: FALSE [13:11:15.177] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.177] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.179] Chunk #2 of 3 ... DONE [13:11:15.179] Chunk #3 of 3 ... [13:11:15.180] - Finding globals in 'X' for chunk #3 ... [13:11:15.180] getGlobalsAndPackages() ... [13:11:15.180] Searching for globals... [13:11:15.180] [13:11:15.180] Searching for globals ... DONE [13:11:15.181] - globals: [0] [13:11:15.181] getGlobalsAndPackages() ... DONE [13:11:15.181] + additional globals found: [n=0] [13:11:15.181] + additional namespaces needed: [n=0] [13:11:15.181] - Finding globals in 'X' for chunk #3 ... DONE [13:11:15.181] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:11:15.182] - seeds: [13:11:15.182] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.182] getGlobalsAndPackages() ... [13:11:15.182] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.182] Resolving globals: FALSE [13:11:15.182] Tweak future expression to call with '...' arguments ... [13:11:15.183] { [13:11:15.183] do.call(function(...) { [13:11:15.183] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.183] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.183] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.183] on.exit(options(oopts), add = TRUE) [13:11:15.183] } [13:11:15.183] { [13:11:15.183] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.183] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.183] ...future.FUN(...future.X_jj, ...) [13:11:15.183] }) [13:11:15.183] } [13:11:15.183] }, args = future.call.arguments) [13:11:15.183] } [13:11:15.183] Tweak future expression to call with '...' arguments ... DONE [13:11:15.183] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.184] [13:11:15.184] getGlobalsAndPackages() ... DONE [13:11:15.184] run() for 'Future' ... [13:11:15.184] - state: 'created' [13:11:15.185] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.187] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.187] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.187] - Field: 'label' [13:11:15.187] - Field: 'local' [13:11:15.188] - Field: 'owner' [13:11:15.188] - Field: 'envir' [13:11:15.188] - Field: 'packages' [13:11:15.188] - Field: 'gc' [13:11:15.188] - Field: 'conditions' [13:11:15.188] - Field: 'expr' [13:11:15.189] - Field: 'uuid' [13:11:15.189] - Field: 'seed' [13:11:15.189] - Field: 'version' [13:11:15.189] - Field: 'result' [13:11:15.189] - Field: 'asynchronous' [13:11:15.189] - Field: 'calls' [13:11:15.190] - Field: 'globals' [13:11:15.190] - Field: 'stdout' [13:11:15.190] - Field: 'earlySignal' [13:11:15.190] - Field: 'lazy' [13:11:15.190] - Field: 'state' [13:11:15.190] - Field: '.cluster' [13:11:15.191] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.191] - Launch lazy future ... [13:11:15.191] Packages needed by the future expression (n = 0): [13:11:15.191] Packages needed by future strategies (n = 0): [13:11:15.192] { [13:11:15.192] { [13:11:15.192] { [13:11:15.192] ...future.startTime <- base::Sys.time() [13:11:15.192] { [13:11:15.192] { [13:11:15.192] { [13:11:15.192] base::local({ [13:11:15.192] has_future <- base::requireNamespace("future", [13:11:15.192] quietly = TRUE) [13:11:15.192] if (has_future) { [13:11:15.192] ns <- base::getNamespace("future") [13:11:15.192] version <- ns[[".package"]][["version"]] [13:11:15.192] if (is.null(version)) [13:11:15.192] version <- utils::packageVersion("future") [13:11:15.192] } [13:11:15.192] else { [13:11:15.192] version <- NULL [13:11:15.192] } [13:11:15.192] if (!has_future || version < "1.8.0") { [13:11:15.192] info <- base::c(r_version = base::gsub("R version ", [13:11:15.192] "", base::R.version$version.string), [13:11:15.192] platform = base::sprintf("%s (%s-bit)", [13:11:15.192] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.192] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.192] "release", "version")], collapse = " "), [13:11:15.192] hostname = base::Sys.info()[["nodename"]]) [13:11:15.192] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.192] info) [13:11:15.192] info <- base::paste(info, collapse = "; ") [13:11:15.192] if (!has_future) { [13:11:15.192] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.192] info) [13:11:15.192] } [13:11:15.192] else { [13:11:15.192] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.192] info, version) [13:11:15.192] } [13:11:15.192] base::stop(msg) [13:11:15.192] } [13:11:15.192] }) [13:11:15.192] } [13:11:15.192] ...future.strategy.old <- future::plan("list") [13:11:15.192] options(future.plan = NULL) [13:11:15.192] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.192] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.192] } [13:11:15.192] ...future.workdir <- getwd() [13:11:15.192] } [13:11:15.192] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.192] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.192] } [13:11:15.192] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.192] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:11:15.192] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.192] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.192] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.192] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.192] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.192] base::names(...future.oldOptions)) [13:11:15.192] } [13:11:15.192] if (FALSE) { [13:11:15.192] } [13:11:15.192] else { [13:11:15.192] if (TRUE) { [13:11:15.192] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.192] open = "w") [13:11:15.192] } [13:11:15.192] else { [13:11:15.192] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.192] windows = "NUL", "/dev/null"), open = "w") [13:11:15.192] } [13:11:15.192] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.192] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.192] base::sink(type = "output", split = FALSE) [13:11:15.192] base::close(...future.stdout) [13:11:15.192] }, add = TRUE) [13:11:15.192] } [13:11:15.192] ...future.frame <- base::sys.nframe() [13:11:15.192] ...future.conditions <- base::list() [13:11:15.192] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.192] if (FALSE) { [13:11:15.192] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.192] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.192] } [13:11:15.192] ...future.result <- base::tryCatch({ [13:11:15.192] base::withCallingHandlers({ [13:11:15.192] ...future.value <- base::withVisible(base::local({ [13:11:15.192] do.call(function(...) { [13:11:15.192] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.192] if (!identical(...future.globals.maxSize.org, [13:11:15.192] ...future.globals.maxSize)) { [13:11:15.192] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.192] on.exit(options(oopts), add = TRUE) [13:11:15.192] } [13:11:15.192] { [13:11:15.192] lapply(seq_along(...future.elements_ii), [13:11:15.192] FUN = function(jj) { [13:11:15.192] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.192] ...future.FUN(...future.X_jj, ...) [13:11:15.192] }) [13:11:15.192] } [13:11:15.192] }, args = future.call.arguments) [13:11:15.192] })) [13:11:15.192] future::FutureResult(value = ...future.value$value, [13:11:15.192] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.192] ...future.rng), globalenv = if (FALSE) [13:11:15.192] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.192] ...future.globalenv.names)) [13:11:15.192] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.192] }, condition = base::local({ [13:11:15.192] c <- base::c [13:11:15.192] inherits <- base::inherits [13:11:15.192] invokeRestart <- base::invokeRestart [13:11:15.192] length <- base::length [13:11:15.192] list <- base::list [13:11:15.192] seq.int <- base::seq.int [13:11:15.192] signalCondition <- base::signalCondition [13:11:15.192] sys.calls <- base::sys.calls [13:11:15.192] `[[` <- base::`[[` [13:11:15.192] `+` <- base::`+` [13:11:15.192] `<<-` <- base::`<<-` [13:11:15.192] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.192] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.192] 3L)] [13:11:15.192] } [13:11:15.192] function(cond) { [13:11:15.192] is_error <- inherits(cond, "error") [13:11:15.192] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.192] NULL) [13:11:15.192] if (is_error) { [13:11:15.192] sessionInformation <- function() { [13:11:15.192] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.192] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.192] search = base::search(), system = base::Sys.info()) [13:11:15.192] } [13:11:15.192] ...future.conditions[[length(...future.conditions) + [13:11:15.192] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.192] cond$call), session = sessionInformation(), [13:11:15.192] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.192] signalCondition(cond) [13:11:15.192] } [13:11:15.192] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.192] signal <- FALSE && inherits(cond, character(0)) [13:11:15.192] ...future.conditions[[length(...future.conditions) + [13:11:15.192] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.192] if (FALSE && !signal) { [13:11:15.192] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.192] { [13:11:15.192] inherits <- base::inherits [13:11:15.192] invokeRestart <- base::invokeRestart [13:11:15.192] is.null <- base::is.null [13:11:15.192] muffled <- FALSE [13:11:15.192] if (inherits(cond, "message")) { [13:11:15.192] muffled <- grepl(pattern, "muffleMessage") [13:11:15.192] if (muffled) [13:11:15.192] invokeRestart("muffleMessage") [13:11:15.192] } [13:11:15.192] else if (inherits(cond, "warning")) { [13:11:15.192] muffled <- grepl(pattern, "muffleWarning") [13:11:15.192] if (muffled) [13:11:15.192] invokeRestart("muffleWarning") [13:11:15.192] } [13:11:15.192] else if (inherits(cond, "condition")) { [13:11:15.192] if (!is.null(pattern)) { [13:11:15.192] computeRestarts <- base::computeRestarts [13:11:15.192] grepl <- base::grepl [13:11:15.192] restarts <- computeRestarts(cond) [13:11:15.192] for (restart in restarts) { [13:11:15.192] name <- restart$name [13:11:15.192] if (is.null(name)) [13:11:15.192] next [13:11:15.192] if (!grepl(pattern, name)) [13:11:15.192] next [13:11:15.192] invokeRestart(restart) [13:11:15.192] muffled <- TRUE [13:11:15.192] break [13:11:15.192] } [13:11:15.192] } [13:11:15.192] } [13:11:15.192] invisible(muffled) [13:11:15.192] } [13:11:15.192] muffleCondition(cond, pattern = "^muffle") [13:11:15.192] } [13:11:15.192] } [13:11:15.192] else { [13:11:15.192] if (TRUE) { [13:11:15.192] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.192] { [13:11:15.192] inherits <- base::inherits [13:11:15.192] invokeRestart <- base::invokeRestart [13:11:15.192] is.null <- base::is.null [13:11:15.192] muffled <- FALSE [13:11:15.192] if (inherits(cond, "message")) { [13:11:15.192] muffled <- grepl(pattern, "muffleMessage") [13:11:15.192] if (muffled) [13:11:15.192] invokeRestart("muffleMessage") [13:11:15.192] } [13:11:15.192] else if (inherits(cond, "warning")) { [13:11:15.192] muffled <- grepl(pattern, "muffleWarning") [13:11:15.192] if (muffled) [13:11:15.192] invokeRestart("muffleWarning") [13:11:15.192] } [13:11:15.192] else if (inherits(cond, "condition")) { [13:11:15.192] if (!is.null(pattern)) { [13:11:15.192] computeRestarts <- base::computeRestarts [13:11:15.192] grepl <- base::grepl [13:11:15.192] restarts <- computeRestarts(cond) [13:11:15.192] for (restart in restarts) { [13:11:15.192] name <- restart$name [13:11:15.192] if (is.null(name)) [13:11:15.192] next [13:11:15.192] if (!grepl(pattern, name)) [13:11:15.192] next [13:11:15.192] invokeRestart(restart) [13:11:15.192] muffled <- TRUE [13:11:15.192] break [13:11:15.192] } [13:11:15.192] } [13:11:15.192] } [13:11:15.192] invisible(muffled) [13:11:15.192] } [13:11:15.192] muffleCondition(cond, pattern = "^muffle") [13:11:15.192] } [13:11:15.192] } [13:11:15.192] } [13:11:15.192] })) [13:11:15.192] }, error = function(ex) { [13:11:15.192] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.192] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.192] ...future.rng), started = ...future.startTime, [13:11:15.192] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.192] version = "1.8"), class = "FutureResult") [13:11:15.192] }, finally = { [13:11:15.192] if (!identical(...future.workdir, getwd())) [13:11:15.192] setwd(...future.workdir) [13:11:15.192] { [13:11:15.192] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.192] ...future.oldOptions$nwarnings <- NULL [13:11:15.192] } [13:11:15.192] base::options(...future.oldOptions) [13:11:15.192] if (.Platform$OS.type == "windows") { [13:11:15.192] old_names <- names(...future.oldEnvVars) [13:11:15.192] envs <- base::Sys.getenv() [13:11:15.192] names <- names(envs) [13:11:15.192] common <- intersect(names, old_names) [13:11:15.192] added <- setdiff(names, old_names) [13:11:15.192] removed <- setdiff(old_names, names) [13:11:15.192] changed <- common[...future.oldEnvVars[common] != [13:11:15.192] envs[common]] [13:11:15.192] NAMES <- toupper(changed) [13:11:15.192] args <- list() [13:11:15.192] for (kk in seq_along(NAMES)) { [13:11:15.192] name <- changed[[kk]] [13:11:15.192] NAME <- NAMES[[kk]] [13:11:15.192] if (name != NAME && is.element(NAME, old_names)) [13:11:15.192] next [13:11:15.192] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.192] } [13:11:15.192] NAMES <- toupper(added) [13:11:15.192] for (kk in seq_along(NAMES)) { [13:11:15.192] name <- added[[kk]] [13:11:15.192] NAME <- NAMES[[kk]] [13:11:15.192] if (name != NAME && is.element(NAME, old_names)) [13:11:15.192] next [13:11:15.192] args[[name]] <- "" [13:11:15.192] } [13:11:15.192] NAMES <- toupper(removed) [13:11:15.192] for (kk in seq_along(NAMES)) { [13:11:15.192] name <- removed[[kk]] [13:11:15.192] NAME <- NAMES[[kk]] [13:11:15.192] if (name != NAME && is.element(NAME, old_names)) [13:11:15.192] next [13:11:15.192] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.192] } [13:11:15.192] if (length(args) > 0) [13:11:15.192] base::do.call(base::Sys.setenv, args = args) [13:11:15.192] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.192] } [13:11:15.192] else { [13:11:15.192] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.192] } [13:11:15.192] { [13:11:15.192] if (base::length(...future.futureOptionsAdded) > [13:11:15.192] 0L) { [13:11:15.192] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.192] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.192] base::options(opts) [13:11:15.192] } [13:11:15.192] { [13:11:15.192] NULL [13:11:15.192] options(future.plan = NULL) [13:11:15.192] if (is.na(NA_character_)) [13:11:15.192] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.192] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.192] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.192] .init = FALSE) [13:11:15.192] } [13:11:15.192] } [13:11:15.192] } [13:11:15.192] }) [13:11:15.192] if (TRUE) { [13:11:15.192] base::sink(type = "output", split = FALSE) [13:11:15.192] if (TRUE) { [13:11:15.192] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.192] } [13:11:15.192] else { [13:11:15.192] ...future.result["stdout"] <- base::list(NULL) [13:11:15.192] } [13:11:15.192] base::close(...future.stdout) [13:11:15.192] ...future.stdout <- NULL [13:11:15.192] } [13:11:15.192] ...future.result$conditions <- ...future.conditions [13:11:15.192] ...future.result$finished <- base::Sys.time() [13:11:15.192] ...future.result [13:11:15.192] } [13:11:15.196] - Launch lazy future ... done [13:11:15.197] run() for 'MiraiFuture' ... done [13:11:15.198] Created future: [13:11:15.199] resolved() for 'MiraiFuture' ... [13:11:15.199] - state: 'running' [13:11:15.199] - run: TRUE [13:11:15.199] - result: 'NULL' [13:11:15.200] - resolved: FALSE [13:11:15.200] resolved() for 'MiraiFuture' ... done [13:11:15.198] MiraiFuture: [13:11:15.198] Label: 'future_lapply-3' [13:11:15.198] Expression: [13:11:15.198] { [13:11:15.198] do.call(function(...) { [13:11:15.198] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.198] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.198] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.198] on.exit(options(oopts), add = TRUE) [13:11:15.198] } [13:11:15.198] { [13:11:15.198] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.198] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.198] ...future.FUN(...future.X_jj, ...) [13:11:15.198] }) [13:11:15.198] } [13:11:15.198] }, args = future.call.arguments) [13:11:15.198] } [13:11:15.198] Lazy evaluation: FALSE [13:11:15.198] Asynchronous evaluation: TRUE [13:11:15.198] Local evaluation: TRUE [13:11:15.198] Environment: R_GlobalEnv [13:11:15.198] Capture standard output: TRUE [13:11:15.198] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.198] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.198] Packages: [13:11:15.198] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.198] Resolved: TRUE [13:11:15.198] Value: [13:11:15.198] Conditions captured: [13:11:15.198] Early signaling: FALSE [13:11:15.198] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.198] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.200] Chunk #3 of 3 ... DONE [13:11:15.200] Launching 3 futures (chunks) ... DONE [13:11:15.201] Resolving 3 futures (chunks) ... [13:11:15.201] resolve() on list ... [13:11:15.201] recursive: 0 [13:11:15.201] length: 3 [13:11:15.201] [13:11:15.201] resolved() for 'MiraiFuture' ... [13:11:15.202] - state: 'running' [13:11:15.202] - run: TRUE [13:11:15.202] - result: 'NULL' [13:11:15.202] - resolved: FALSE [13:11:15.202] resolved() for 'MiraiFuture' ... done [13:11:15.203] Future #1 [13:11:15.203] signalConditionsASAP(MiraiFuture, pos=1) ... [13:11:15.203] - nx: 3 [13:11:15.203] - relay: TRUE [13:11:15.203] - stdout: TRUE [13:11:15.203] - signal: TRUE [13:11:15.204] - resignal: FALSE [13:11:15.204] - force: TRUE [13:11:15.204] - relayed: [n=3] FALSE, FALSE, FALSE [13:11:15.204] - queued futures: [n=3] FALSE, FALSE, FALSE [13:11:15.204] - until=1 [13:11:15.204] - relaying element #1 [13:11:15.205] - relayed: [n=3] TRUE, FALSE, FALSE [13:11:15.205] - queued futures: [n=3] TRUE, FALSE, FALSE [13:11:15.205] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:11:15.205] length: 2 (resolved future 1) [13:11:15.205] resolved() for 'MiraiFuture' ... [13:11:15.206] - state: 'running' [13:11:15.206] - run: TRUE [13:11:15.206] - result: 'NULL' [13:11:15.206] - resolved: FALSE [13:11:15.206] resolved() for 'MiraiFuture' ... done [13:11:15.207] Future #2 [13:11:15.207] signalConditionsASAP(MiraiFuture, pos=2) ... [13:11:15.207] - nx: 3 [13:11:15.207] - relay: TRUE [13:11:15.207] - stdout: TRUE [13:11:15.207] - signal: TRUE [13:11:15.208] - resignal: FALSE [13:11:15.208] - force: TRUE [13:11:15.208] - relayed: [n=3] TRUE, FALSE, FALSE [13:11:15.208] - queued futures: [n=3] TRUE, FALSE, FALSE [13:11:15.208] - until=2 [13:11:15.208] - relaying element #2 [13:11:15.209] - relayed: [n=3] TRUE, TRUE, FALSE [13:11:15.209] - queued futures: [n=3] TRUE, TRUE, FALSE [13:11:15.209] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:11:15.209] length: 1 (resolved future 2) [13:11:15.209] resolved() for 'MiraiFuture' ... [13:11:15.209] - state: 'running' [13:11:15.210] - run: TRUE [13:11:15.210] - result: 'NULL' [13:11:15.210] - resolved: FALSE [13:11:15.210] resolved() for 'MiraiFuture' ... done [13:11:15.210] Future #3 [13:11:15.211] signalConditionsASAP(MiraiFuture, pos=3) ... [13:11:15.211] - nx: 3 [13:11:15.211] - relay: TRUE [13:11:15.211] - stdout: TRUE [13:11:15.211] - signal: TRUE [13:11:15.211] - resignal: FALSE [13:11:15.212] - force: TRUE [13:11:15.212] - relayed: [n=3] TRUE, TRUE, FALSE [13:11:15.212] - queued futures: [n=3] TRUE, TRUE, FALSE [13:11:15.212] - until=3 [13:11:15.212] - relaying element #3 [13:11:15.212] - relayed: [n=3] TRUE, TRUE, TRUE [13:11:15.213] - queued futures: [n=3] TRUE, TRUE, TRUE [13:11:15.213] signalConditionsASAP(MiraiFuture, pos=3) ... done [13:11:15.213] length: 0 (resolved future 3) [13:11:15.213] Relaying remaining futures [13:11:15.213] signalConditionsASAP(NULL, pos=0) ... [13:11:15.213] - nx: 3 [13:11:15.214] - relay: TRUE [13:11:15.214] - stdout: TRUE [13:11:15.214] - signal: TRUE [13:11:15.214] - resignal: FALSE [13:11:15.214] - force: TRUE [13:11:15.214] - relayed: [n=3] TRUE, TRUE, TRUE [13:11:15.214] - queued futures: [n=3] TRUE, TRUE, TRUE - flush all [13:11:15.215] - relayed: [n=3] TRUE, TRUE, TRUE [13:11:15.215] - queued futures: [n=3] TRUE, TRUE, TRUE [13:11:15.215] signalConditionsASAP(NULL, pos=0) ... done [13:11:15.215] resolve() on list ... DONE [13:11:15.215] - Number of value chunks collected: 3 [13:11:15.216] Resolving 3 futures (chunks) ... DONE [13:11:15.216] Reducing values from 3 chunks ... [13:11:15.216] - Number of values collected after concatenation: 3 [13:11:15.216] - Number of values expected: 3 [13:11:15.216] Reducing values from 3 chunks ... DONE [13:11:15.216] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:11:15.219] future_lapply() ... [13:11:15.220] Number of chunks: 2 [13:11:15.220] getGlobalsAndPackagesXApply() ... [13:11:15.220] - future.globals: TRUE [13:11:15.220] getGlobalsAndPackages() ... [13:11:15.220] Searching for globals... [13:11:15.222] - globals found: [2] 'FUN', '.Internal' [13:11:15.222] Searching for globals ... DONE [13:11:15.222] Resolving globals: FALSE [13:11:15.222] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:11:15.224] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:11:15.224] - globals: [1] 'FUN' [13:11:15.224] [13:11:15.225] getGlobalsAndPackages() ... DONE [13:11:15.225] - globals found/used: [n=1] 'FUN' [13:11:15.225] - needed namespaces: [n=0] [13:11:15.225] Finding globals ... DONE [13:11:15.225] - use_args: TRUE [13:11:15.226] - Getting '...' globals ... [13:11:15.226] resolve() on list ... [13:11:15.226] recursive: 0 [13:11:15.226] length: 1 [13:11:15.226] elements: '...' [13:11:15.227] length: 0 (resolved future 1) [13:11:15.227] resolve() on list ... DONE [13:11:15.227] - '...' content: [n=1] 'length' [13:11:15.227] List of 1 [13:11:15.227] $ ...:List of 1 [13:11:15.227] ..$ length: int 2 [13:11:15.227] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.227] - attr(*, "where")=List of 1 [13:11:15.227] ..$ ...: [13:11:15.227] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.227] - attr(*, "resolved")= logi TRUE [13:11:15.227] - attr(*, "total_size")= num NA [13:11:15.231] - Getting '...' globals ... DONE [13:11:15.231] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:11:15.231] List of 2 [13:11:15.231] $ ...future.FUN:function (mode = "logical", length = 0L) [13:11:15.231] $ ... :List of 1 [13:11:15.231] ..$ length: int 2 [13:11:15.231] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.231] - attr(*, "where")=List of 2 [13:11:15.231] ..$ ...future.FUN: [13:11:15.231] ..$ ... : [13:11:15.231] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.231] - attr(*, "resolved")= logi FALSE [13:11:15.231] - attr(*, "total_size")= num 2240 [13:11:15.235] Packages to be attached in all futures: [n=0] [13:11:15.235] getGlobalsAndPackagesXApply() ... DONE [13:11:15.235] Number of futures (= number of chunks): 2 [13:11:15.235] Launching 2 futures (chunks) ... [13:11:15.235] Chunk #1 of 2 ... [13:11:15.236] - Finding globals in 'X' for chunk #1 ... [13:11:15.236] getGlobalsAndPackages() ... [13:11:15.236] Searching for globals... [13:11:15.236] [13:11:15.236] Searching for globals ... DONE [13:11:15.237] - globals: [0] [13:11:15.237] getGlobalsAndPackages() ... DONE [13:11:15.237] + additional globals found: [n=0] [13:11:15.237] + additional namespaces needed: [n=0] [13:11:15.237] - Finding globals in 'X' for chunk #1 ... DONE [13:11:15.237] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:11:15.238] - seeds: [13:11:15.238] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.238] getGlobalsAndPackages() ... [13:11:15.238] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.238] Resolving globals: FALSE [13:11:15.238] Tweak future expression to call with '...' arguments ... [13:11:15.239] { [13:11:15.239] do.call(function(...) { [13:11:15.239] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.239] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.239] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.239] on.exit(options(oopts), add = TRUE) [13:11:15.239] } [13:11:15.239] { [13:11:15.239] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.239] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.239] ...future.FUN(...future.X_jj, ...) [13:11:15.239] }) [13:11:15.239] } [13:11:15.239] }, args = future.call.arguments) [13:11:15.239] } [13:11:15.239] Tweak future expression to call with '...' arguments ... DONE [13:11:15.239] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.240] [13:11:15.240] getGlobalsAndPackages() ... DONE [13:11:15.240] run() for 'Future' ... [13:11:15.240] - state: 'created' [13:11:15.241] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.243] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.243] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.243] - Field: 'label' [13:11:15.243] - Field: 'local' [13:11:15.244] - Field: 'owner' [13:11:15.244] - Field: 'envir' [13:11:15.244] - Field: 'packages' [13:11:15.244] - Field: 'gc' [13:11:15.244] - Field: 'conditions' [13:11:15.244] - Field: 'expr' [13:11:15.245] - Field: 'uuid' [13:11:15.245] - Field: 'seed' [13:11:15.245] - Field: 'version' [13:11:15.245] - Field: 'result' [13:11:15.245] - Field: 'asynchronous' [13:11:15.245] - Field: 'calls' [13:11:15.246] - Field: 'globals' [13:11:15.246] - Field: 'stdout' [13:11:15.246] - Field: 'earlySignal' [13:11:15.246] - Field: 'lazy' [13:11:15.246] - Field: 'state' [13:11:15.246] - Field: '.cluster' [13:11:15.247] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.247] - Launch lazy future ... [13:11:15.247] Packages needed by the future expression (n = 0): [13:11:15.247] Packages needed by future strategies (n = 0): [13:11:15.249] { [13:11:15.249] { [13:11:15.249] { [13:11:15.249] ...future.startTime <- base::Sys.time() [13:11:15.249] { [13:11:15.249] { [13:11:15.249] { [13:11:15.249] base::local({ [13:11:15.249] has_future <- base::requireNamespace("future", [13:11:15.249] quietly = TRUE) [13:11:15.249] if (has_future) { [13:11:15.249] ns <- base::getNamespace("future") [13:11:15.249] version <- ns[[".package"]][["version"]] [13:11:15.249] if (is.null(version)) [13:11:15.249] version <- utils::packageVersion("future") [13:11:15.249] } [13:11:15.249] else { [13:11:15.249] version <- NULL [13:11:15.249] } [13:11:15.249] if (!has_future || version < "1.8.0") { [13:11:15.249] info <- base::c(r_version = base::gsub("R version ", [13:11:15.249] "", base::R.version$version.string), [13:11:15.249] platform = base::sprintf("%s (%s-bit)", [13:11:15.249] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.249] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.249] "release", "version")], collapse = " "), [13:11:15.249] hostname = base::Sys.info()[["nodename"]]) [13:11:15.249] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.249] info) [13:11:15.249] info <- base::paste(info, collapse = "; ") [13:11:15.249] if (!has_future) { [13:11:15.249] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.249] info) [13:11:15.249] } [13:11:15.249] else { [13:11:15.249] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.249] info, version) [13:11:15.249] } [13:11:15.249] base::stop(msg) [13:11:15.249] } [13:11:15.249] }) [13:11:15.249] } [13:11:15.249] ...future.strategy.old <- future::plan("list") [13:11:15.249] options(future.plan = NULL) [13:11:15.249] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.249] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.249] } [13:11:15.249] ...future.workdir <- getwd() [13:11:15.249] } [13:11:15.249] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.249] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.249] } [13:11:15.249] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.249] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:11:15.249] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.249] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.249] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.249] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.249] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.249] base::names(...future.oldOptions)) [13:11:15.249] } [13:11:15.249] if (FALSE) { [13:11:15.249] } [13:11:15.249] else { [13:11:15.249] if (TRUE) { [13:11:15.249] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.249] open = "w") [13:11:15.249] } [13:11:15.249] else { [13:11:15.249] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.249] windows = "NUL", "/dev/null"), open = "w") [13:11:15.249] } [13:11:15.249] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.249] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.249] base::sink(type = "output", split = FALSE) [13:11:15.249] base::close(...future.stdout) [13:11:15.249] }, add = TRUE) [13:11:15.249] } [13:11:15.249] ...future.frame <- base::sys.nframe() [13:11:15.249] ...future.conditions <- base::list() [13:11:15.249] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.249] if (FALSE) { [13:11:15.249] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.249] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.249] } [13:11:15.249] ...future.result <- base::tryCatch({ [13:11:15.249] base::withCallingHandlers({ [13:11:15.249] ...future.value <- base::withVisible(base::local({ [13:11:15.249] do.call(function(...) { [13:11:15.249] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.249] if (!identical(...future.globals.maxSize.org, [13:11:15.249] ...future.globals.maxSize)) { [13:11:15.249] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.249] on.exit(options(oopts), add = TRUE) [13:11:15.249] } [13:11:15.249] { [13:11:15.249] lapply(seq_along(...future.elements_ii), [13:11:15.249] FUN = function(jj) { [13:11:15.249] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.249] ...future.FUN(...future.X_jj, ...) [13:11:15.249] }) [13:11:15.249] } [13:11:15.249] }, args = future.call.arguments) [13:11:15.249] })) [13:11:15.249] future::FutureResult(value = ...future.value$value, [13:11:15.249] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.249] ...future.rng), globalenv = if (FALSE) [13:11:15.249] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.249] ...future.globalenv.names)) [13:11:15.249] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.249] }, condition = base::local({ [13:11:15.249] c <- base::c [13:11:15.249] inherits <- base::inherits [13:11:15.249] invokeRestart <- base::invokeRestart [13:11:15.249] length <- base::length [13:11:15.249] list <- base::list [13:11:15.249] seq.int <- base::seq.int [13:11:15.249] signalCondition <- base::signalCondition [13:11:15.249] sys.calls <- base::sys.calls [13:11:15.249] `[[` <- base::`[[` [13:11:15.249] `+` <- base::`+` [13:11:15.249] `<<-` <- base::`<<-` [13:11:15.249] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.249] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.249] 3L)] [13:11:15.249] } [13:11:15.249] function(cond) { [13:11:15.249] is_error <- inherits(cond, "error") [13:11:15.249] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.249] NULL) [13:11:15.249] if (is_error) { [13:11:15.249] sessionInformation <- function() { [13:11:15.249] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.249] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.249] search = base::search(), system = base::Sys.info()) [13:11:15.249] } [13:11:15.249] ...future.conditions[[length(...future.conditions) + [13:11:15.249] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.249] cond$call), session = sessionInformation(), [13:11:15.249] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.249] signalCondition(cond) [13:11:15.249] } [13:11:15.249] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.249] signal <- FALSE && inherits(cond, character(0)) [13:11:15.249] ...future.conditions[[length(...future.conditions) + [13:11:15.249] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.249] if (FALSE && !signal) { [13:11:15.249] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.249] { [13:11:15.249] inherits <- base::inherits [13:11:15.249] invokeRestart <- base::invokeRestart [13:11:15.249] is.null <- base::is.null [13:11:15.249] muffled <- FALSE [13:11:15.249] if (inherits(cond, "message")) { [13:11:15.249] muffled <- grepl(pattern, "muffleMessage") [13:11:15.249] if (muffled) [13:11:15.249] invokeRestart("muffleMessage") [13:11:15.249] } [13:11:15.249] else if (inherits(cond, "warning")) { [13:11:15.249] muffled <- grepl(pattern, "muffleWarning") [13:11:15.249] if (muffled) [13:11:15.249] invokeRestart("muffleWarning") [13:11:15.249] } [13:11:15.249] else if (inherits(cond, "condition")) { [13:11:15.249] if (!is.null(pattern)) { [13:11:15.249] computeRestarts <- base::computeRestarts [13:11:15.249] grepl <- base::grepl [13:11:15.249] restarts <- computeRestarts(cond) [13:11:15.249] for (restart in restarts) { [13:11:15.249] name <- restart$name [13:11:15.249] if (is.null(name)) [13:11:15.249] next [13:11:15.249] if (!grepl(pattern, name)) [13:11:15.249] next [13:11:15.249] invokeRestart(restart) [13:11:15.249] muffled <- TRUE [13:11:15.249] break [13:11:15.249] } [13:11:15.249] } [13:11:15.249] } [13:11:15.249] invisible(muffled) [13:11:15.249] } [13:11:15.249] muffleCondition(cond, pattern = "^muffle") [13:11:15.249] } [13:11:15.249] } [13:11:15.249] else { [13:11:15.249] if (TRUE) { [13:11:15.249] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.249] { [13:11:15.249] inherits <- base::inherits [13:11:15.249] invokeRestart <- base::invokeRestart [13:11:15.249] is.null <- base::is.null [13:11:15.249] muffled <- FALSE [13:11:15.249] if (inherits(cond, "message")) { [13:11:15.249] muffled <- grepl(pattern, "muffleMessage") [13:11:15.249] if (muffled) [13:11:15.249] invokeRestart("muffleMessage") [13:11:15.249] } [13:11:15.249] else if (inherits(cond, "warning")) { [13:11:15.249] muffled <- grepl(pattern, "muffleWarning") [13:11:15.249] if (muffled) [13:11:15.249] invokeRestart("muffleWarning") [13:11:15.249] } [13:11:15.249] else if (inherits(cond, "condition")) { [13:11:15.249] if (!is.null(pattern)) { [13:11:15.249] computeRestarts <- base::computeRestarts [13:11:15.249] grepl <- base::grepl [13:11:15.249] restarts <- computeRestarts(cond) [13:11:15.249] for (restart in restarts) { [13:11:15.249] name <- restart$name [13:11:15.249] if (is.null(name)) [13:11:15.249] next [13:11:15.249] if (!grepl(pattern, name)) [13:11:15.249] next [13:11:15.249] invokeRestart(restart) [13:11:15.249] muffled <- TRUE [13:11:15.249] break [13:11:15.249] } [13:11:15.249] } [13:11:15.249] } [13:11:15.249] invisible(muffled) [13:11:15.249] } [13:11:15.249] muffleCondition(cond, pattern = "^muffle") [13:11:15.249] } [13:11:15.249] } [13:11:15.249] } [13:11:15.249] })) [13:11:15.249] }, error = function(ex) { [13:11:15.249] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.249] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.249] ...future.rng), started = ...future.startTime, [13:11:15.249] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.249] version = "1.8"), class = "FutureResult") [13:11:15.249] }, finally = { [13:11:15.249] if (!identical(...future.workdir, getwd())) [13:11:15.249] setwd(...future.workdir) [13:11:15.249] { [13:11:15.249] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.249] ...future.oldOptions$nwarnings <- NULL [13:11:15.249] } [13:11:15.249] base::options(...future.oldOptions) [13:11:15.249] if (.Platform$OS.type == "windows") { [13:11:15.249] old_names <- names(...future.oldEnvVars) [13:11:15.249] envs <- base::Sys.getenv() [13:11:15.249] names <- names(envs) [13:11:15.249] common <- intersect(names, old_names) [13:11:15.249] added <- setdiff(names, old_names) [13:11:15.249] removed <- setdiff(old_names, names) [13:11:15.249] changed <- common[...future.oldEnvVars[common] != [13:11:15.249] envs[common]] [13:11:15.249] NAMES <- toupper(changed) [13:11:15.249] args <- list() [13:11:15.249] for (kk in seq_along(NAMES)) { [13:11:15.249] name <- changed[[kk]] [13:11:15.249] NAME <- NAMES[[kk]] [13:11:15.249] if (name != NAME && is.element(NAME, old_names)) [13:11:15.249] next [13:11:15.249] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.249] } [13:11:15.249] NAMES <- toupper(added) [13:11:15.249] for (kk in seq_along(NAMES)) { [13:11:15.249] name <- added[[kk]] [13:11:15.249] NAME <- NAMES[[kk]] [13:11:15.249] if (name != NAME && is.element(NAME, old_names)) [13:11:15.249] next [13:11:15.249] args[[name]] <- "" [13:11:15.249] } [13:11:15.249] NAMES <- toupper(removed) [13:11:15.249] for (kk in seq_along(NAMES)) { [13:11:15.249] name <- removed[[kk]] [13:11:15.249] NAME <- NAMES[[kk]] [13:11:15.249] if (name != NAME && is.element(NAME, old_names)) [13:11:15.249] next [13:11:15.249] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.249] } [13:11:15.249] if (length(args) > 0) [13:11:15.249] base::do.call(base::Sys.setenv, args = args) [13:11:15.249] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.249] } [13:11:15.249] else { [13:11:15.249] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.249] } [13:11:15.249] { [13:11:15.249] if (base::length(...future.futureOptionsAdded) > [13:11:15.249] 0L) { [13:11:15.249] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.249] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.249] base::options(opts) [13:11:15.249] } [13:11:15.249] { [13:11:15.249] NULL [13:11:15.249] options(future.plan = NULL) [13:11:15.249] if (is.na(NA_character_)) [13:11:15.249] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.249] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.249] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.249] .init = FALSE) [13:11:15.249] } [13:11:15.249] } [13:11:15.249] } [13:11:15.249] }) [13:11:15.249] if (TRUE) { [13:11:15.249] base::sink(type = "output", split = FALSE) [13:11:15.249] if (TRUE) { [13:11:15.249] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.249] } [13:11:15.249] else { [13:11:15.249] ...future.result["stdout"] <- base::list(NULL) [13:11:15.249] } [13:11:15.249] base::close(...future.stdout) [13:11:15.249] ...future.stdout <- NULL [13:11:15.249] } [13:11:15.249] ...future.result$conditions <- ...future.conditions [13:11:15.249] ...future.result$finished <- base::Sys.time() [13:11:15.249] ...future.result [13:11:15.249] } [13:11:15.253] - Launch lazy future ... done [13:11:15.253] run() for 'MiraiFuture' ... done [13:11:15.253] Created future: [13:11:15.254] resolved() for 'MiraiFuture' ... [13:11:15.255] - state: 'running' [13:11:15.255] - run: TRUE [13:11:15.255] - result: 'NULL' [13:11:15.255] - resolved: FALSE [13:11:15.255] resolved() for 'MiraiFuture' ... done [13:11:15.254] MiraiFuture: [13:11:15.254] Label: 'future_lapply-1' [13:11:15.254] Expression: [13:11:15.254] { [13:11:15.254] do.call(function(...) { [13:11:15.254] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.254] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.254] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.254] on.exit(options(oopts), add = TRUE) [13:11:15.254] } [13:11:15.254] { [13:11:15.254] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.254] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.254] ...future.FUN(...future.X_jj, ...) [13:11:15.254] }) [13:11:15.254] } [13:11:15.254] }, args = future.call.arguments) [13:11:15.254] } [13:11:15.254] Lazy evaluation: FALSE [13:11:15.254] Asynchronous evaluation: TRUE [13:11:15.254] Local evaluation: TRUE [13:11:15.254] Environment: R_GlobalEnv [13:11:15.254] Capture standard output: TRUE [13:11:15.254] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.254] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.254] Packages: [13:11:15.254] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.254] Resolved: TRUE [13:11:15.254] Value: [13:11:15.254] Conditions captured: [13:11:15.254] Early signaling: FALSE [13:11:15.254] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.254] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.256] Chunk #1 of 2 ... DONE [13:11:15.256] Chunk #2 of 2 ... [13:11:15.256] - Finding globals in 'X' for chunk #2 ... [13:11:15.256] getGlobalsAndPackages() ... [13:11:15.257] Searching for globals... [13:11:15.257] [13:11:15.257] Searching for globals ... DONE [13:11:15.257] - globals: [0] [13:11:15.257] getGlobalsAndPackages() ... DONE [13:11:15.258] + additional globals found: [n=0] [13:11:15.258] + additional namespaces needed: [n=0] [13:11:15.258] - Finding globals in 'X' for chunk #2 ... DONE [13:11:15.258] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:11:15.258] - seeds: [13:11:15.258] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.258] getGlobalsAndPackages() ... [13:11:15.259] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.259] Resolving globals: FALSE [13:11:15.259] Tweak future expression to call with '...' arguments ... [13:11:15.259] { [13:11:15.259] do.call(function(...) { [13:11:15.259] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.259] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.259] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.259] on.exit(options(oopts), add = TRUE) [13:11:15.259] } [13:11:15.259] { [13:11:15.259] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.259] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.259] ...future.FUN(...future.X_jj, ...) [13:11:15.259] }) [13:11:15.259] } [13:11:15.259] }, args = future.call.arguments) [13:11:15.259] } [13:11:15.260] Tweak future expression to call with '...' arguments ... DONE [13:11:15.260] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.260] [13:11:15.260] getGlobalsAndPackages() ... DONE [13:11:15.261] run() for 'Future' ... [13:11:15.261] - state: 'created' [13:11:15.261] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.263] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.264] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.264] - Field: 'label' [13:11:15.264] - Field: 'local' [13:11:15.264] - Field: 'owner' [13:11:15.264] - Field: 'envir' [13:11:15.264] - Field: 'packages' [13:11:15.265] - Field: 'gc' [13:11:15.265] - Field: 'conditions' [13:11:15.265] - Field: 'expr' [13:11:15.265] - Field: 'uuid' [13:11:15.265] - Field: 'seed' [13:11:15.265] - Field: 'version' [13:11:15.266] - Field: 'result' [13:11:15.266] - Field: 'asynchronous' [13:11:15.266] - Field: 'calls' [13:11:15.266] - Field: 'globals' [13:11:15.266] - Field: 'stdout' [13:11:15.266] - Field: 'earlySignal' [13:11:15.267] - Field: 'lazy' [13:11:15.267] - Field: 'state' [13:11:15.267] - Field: '.cluster' [13:11:15.267] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.267] - Launch lazy future ... [13:11:15.268] Packages needed by the future expression (n = 0): [13:11:15.268] Packages needed by future strategies (n = 0): [13:11:15.268] { [13:11:15.268] { [13:11:15.268] { [13:11:15.268] ...future.startTime <- base::Sys.time() [13:11:15.268] { [13:11:15.268] { [13:11:15.268] { [13:11:15.268] base::local({ [13:11:15.268] has_future <- base::requireNamespace("future", [13:11:15.268] quietly = TRUE) [13:11:15.268] if (has_future) { [13:11:15.268] ns <- base::getNamespace("future") [13:11:15.268] version <- ns[[".package"]][["version"]] [13:11:15.268] if (is.null(version)) [13:11:15.268] version <- utils::packageVersion("future") [13:11:15.268] } [13:11:15.268] else { [13:11:15.268] version <- NULL [13:11:15.268] } [13:11:15.268] if (!has_future || version < "1.8.0") { [13:11:15.268] info <- base::c(r_version = base::gsub("R version ", [13:11:15.268] "", base::R.version$version.string), [13:11:15.268] platform = base::sprintf("%s (%s-bit)", [13:11:15.268] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.268] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.268] "release", "version")], collapse = " "), [13:11:15.268] hostname = base::Sys.info()[["nodename"]]) [13:11:15.268] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.268] info) [13:11:15.268] info <- base::paste(info, collapse = "; ") [13:11:15.268] if (!has_future) { [13:11:15.268] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.268] info) [13:11:15.268] } [13:11:15.268] else { [13:11:15.268] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.268] info, version) [13:11:15.268] } [13:11:15.268] base::stop(msg) [13:11:15.268] } [13:11:15.268] }) [13:11:15.268] } [13:11:15.268] ...future.strategy.old <- future::plan("list") [13:11:15.268] options(future.plan = NULL) [13:11:15.268] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.268] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.268] } [13:11:15.268] ...future.workdir <- getwd() [13:11:15.268] } [13:11:15.268] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.268] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.268] } [13:11:15.268] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.268] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:11:15.268] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.268] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.268] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.268] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.268] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.268] base::names(...future.oldOptions)) [13:11:15.268] } [13:11:15.268] if (FALSE) { [13:11:15.268] } [13:11:15.268] else { [13:11:15.268] if (TRUE) { [13:11:15.268] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.268] open = "w") [13:11:15.268] } [13:11:15.268] else { [13:11:15.268] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.268] windows = "NUL", "/dev/null"), open = "w") [13:11:15.268] } [13:11:15.268] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.268] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.268] base::sink(type = "output", split = FALSE) [13:11:15.268] base::close(...future.stdout) [13:11:15.268] }, add = TRUE) [13:11:15.268] } [13:11:15.268] ...future.frame <- base::sys.nframe() [13:11:15.268] ...future.conditions <- base::list() [13:11:15.268] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.268] if (FALSE) { [13:11:15.268] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.268] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.268] } [13:11:15.268] ...future.result <- base::tryCatch({ [13:11:15.268] base::withCallingHandlers({ [13:11:15.268] ...future.value <- base::withVisible(base::local({ [13:11:15.268] do.call(function(...) { [13:11:15.268] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.268] if (!identical(...future.globals.maxSize.org, [13:11:15.268] ...future.globals.maxSize)) { [13:11:15.268] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.268] on.exit(options(oopts), add = TRUE) [13:11:15.268] } [13:11:15.268] { [13:11:15.268] lapply(seq_along(...future.elements_ii), [13:11:15.268] FUN = function(jj) { [13:11:15.268] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.268] ...future.FUN(...future.X_jj, ...) [13:11:15.268] }) [13:11:15.268] } [13:11:15.268] }, args = future.call.arguments) [13:11:15.268] })) [13:11:15.268] future::FutureResult(value = ...future.value$value, [13:11:15.268] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.268] ...future.rng), globalenv = if (FALSE) [13:11:15.268] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.268] ...future.globalenv.names)) [13:11:15.268] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.268] }, condition = base::local({ [13:11:15.268] c <- base::c [13:11:15.268] inherits <- base::inherits [13:11:15.268] invokeRestart <- base::invokeRestart [13:11:15.268] length <- base::length [13:11:15.268] list <- base::list [13:11:15.268] seq.int <- base::seq.int [13:11:15.268] signalCondition <- base::signalCondition [13:11:15.268] sys.calls <- base::sys.calls [13:11:15.268] `[[` <- base::`[[` [13:11:15.268] `+` <- base::`+` [13:11:15.268] `<<-` <- base::`<<-` [13:11:15.268] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.268] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.268] 3L)] [13:11:15.268] } [13:11:15.268] function(cond) { [13:11:15.268] is_error <- inherits(cond, "error") [13:11:15.268] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.268] NULL) [13:11:15.268] if (is_error) { [13:11:15.268] sessionInformation <- function() { [13:11:15.268] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.268] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.268] search = base::search(), system = base::Sys.info()) [13:11:15.268] } [13:11:15.268] ...future.conditions[[length(...future.conditions) + [13:11:15.268] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.268] cond$call), session = sessionInformation(), [13:11:15.268] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.268] signalCondition(cond) [13:11:15.268] } [13:11:15.268] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.268] signal <- FALSE && inherits(cond, character(0)) [13:11:15.268] ...future.conditions[[length(...future.conditions) + [13:11:15.268] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.268] if (FALSE && !signal) { [13:11:15.268] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.268] { [13:11:15.268] inherits <- base::inherits [13:11:15.268] invokeRestart <- base::invokeRestart [13:11:15.268] is.null <- base::is.null [13:11:15.268] muffled <- FALSE [13:11:15.268] if (inherits(cond, "message")) { [13:11:15.268] muffled <- grepl(pattern, "muffleMessage") [13:11:15.268] if (muffled) [13:11:15.268] invokeRestart("muffleMessage") [13:11:15.268] } [13:11:15.268] else if (inherits(cond, "warning")) { [13:11:15.268] muffled <- grepl(pattern, "muffleWarning") [13:11:15.268] if (muffled) [13:11:15.268] invokeRestart("muffleWarning") [13:11:15.268] } [13:11:15.268] else if (inherits(cond, "condition")) { [13:11:15.268] if (!is.null(pattern)) { [13:11:15.268] computeRestarts <- base::computeRestarts [13:11:15.268] grepl <- base::grepl [13:11:15.268] restarts <- computeRestarts(cond) [13:11:15.268] for (restart in restarts) { [13:11:15.268] name <- restart$name [13:11:15.268] if (is.null(name)) [13:11:15.268] next [13:11:15.268] if (!grepl(pattern, name)) [13:11:15.268] next [13:11:15.268] invokeRestart(restart) [13:11:15.268] muffled <- TRUE [13:11:15.268] break [13:11:15.268] } [13:11:15.268] } [13:11:15.268] } [13:11:15.268] invisible(muffled) [13:11:15.268] } [13:11:15.268] muffleCondition(cond, pattern = "^muffle") [13:11:15.268] } [13:11:15.268] } [13:11:15.268] else { [13:11:15.268] if (TRUE) { [13:11:15.268] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.268] { [13:11:15.268] inherits <- base::inherits [13:11:15.268] invokeRestart <- base::invokeRestart [13:11:15.268] is.null <- base::is.null [13:11:15.268] muffled <- FALSE [13:11:15.268] if (inherits(cond, "message")) { [13:11:15.268] muffled <- grepl(pattern, "muffleMessage") [13:11:15.268] if (muffled) [13:11:15.268] invokeRestart("muffleMessage") [13:11:15.268] } [13:11:15.268] else if (inherits(cond, "warning")) { [13:11:15.268] muffled <- grepl(pattern, "muffleWarning") [13:11:15.268] if (muffled) [13:11:15.268] invokeRestart("muffleWarning") [13:11:15.268] } [13:11:15.268] else if (inherits(cond, "condition")) { [13:11:15.268] if (!is.null(pattern)) { [13:11:15.268] computeRestarts <- base::computeRestarts [13:11:15.268] grepl <- base::grepl [13:11:15.268] restarts <- computeRestarts(cond) [13:11:15.268] for (restart in restarts) { [13:11:15.268] name <- restart$name [13:11:15.268] if (is.null(name)) [13:11:15.268] next [13:11:15.268] if (!grepl(pattern, name)) [13:11:15.268] next [13:11:15.268] invokeRestart(restart) [13:11:15.268] muffled <- TRUE [13:11:15.268] break [13:11:15.268] } [13:11:15.268] } [13:11:15.268] } [13:11:15.268] invisible(muffled) [13:11:15.268] } [13:11:15.268] muffleCondition(cond, pattern = "^muffle") [13:11:15.268] } [13:11:15.268] } [13:11:15.268] } [13:11:15.268] })) [13:11:15.268] }, error = function(ex) { [13:11:15.268] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.268] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.268] ...future.rng), started = ...future.startTime, [13:11:15.268] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.268] version = "1.8"), class = "FutureResult") [13:11:15.268] }, finally = { [13:11:15.268] if (!identical(...future.workdir, getwd())) [13:11:15.268] setwd(...future.workdir) [13:11:15.268] { [13:11:15.268] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.268] ...future.oldOptions$nwarnings <- NULL [13:11:15.268] } [13:11:15.268] base::options(...future.oldOptions) [13:11:15.268] if (.Platform$OS.type == "windows") { [13:11:15.268] old_names <- names(...future.oldEnvVars) [13:11:15.268] envs <- base::Sys.getenv() [13:11:15.268] names <- names(envs) [13:11:15.268] common <- intersect(names, old_names) [13:11:15.268] added <- setdiff(names, old_names) [13:11:15.268] removed <- setdiff(old_names, names) [13:11:15.268] changed <- common[...future.oldEnvVars[common] != [13:11:15.268] envs[common]] [13:11:15.268] NAMES <- toupper(changed) [13:11:15.268] args <- list() [13:11:15.268] for (kk in seq_along(NAMES)) { [13:11:15.268] name <- changed[[kk]] [13:11:15.268] NAME <- NAMES[[kk]] [13:11:15.268] if (name != NAME && is.element(NAME, old_names)) [13:11:15.268] next [13:11:15.268] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.268] } [13:11:15.268] NAMES <- toupper(added) [13:11:15.268] for (kk in seq_along(NAMES)) { [13:11:15.268] name <- added[[kk]] [13:11:15.268] NAME <- NAMES[[kk]] [13:11:15.268] if (name != NAME && is.element(NAME, old_names)) [13:11:15.268] next [13:11:15.268] args[[name]] <- "" [13:11:15.268] } [13:11:15.268] NAMES <- toupper(removed) [13:11:15.268] for (kk in seq_along(NAMES)) { [13:11:15.268] name <- removed[[kk]] [13:11:15.268] NAME <- NAMES[[kk]] [13:11:15.268] if (name != NAME && is.element(NAME, old_names)) [13:11:15.268] next [13:11:15.268] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.268] } [13:11:15.268] if (length(args) > 0) [13:11:15.268] base::do.call(base::Sys.setenv, args = args) [13:11:15.268] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.268] } [13:11:15.268] else { [13:11:15.268] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.268] } [13:11:15.268] { [13:11:15.268] if (base::length(...future.futureOptionsAdded) > [13:11:15.268] 0L) { [13:11:15.268] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.268] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.268] base::options(opts) [13:11:15.268] } [13:11:15.268] { [13:11:15.268] NULL [13:11:15.268] options(future.plan = NULL) [13:11:15.268] if (is.na(NA_character_)) [13:11:15.268] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.268] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.268] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.268] .init = FALSE) [13:11:15.268] } [13:11:15.268] } [13:11:15.268] } [13:11:15.268] }) [13:11:15.268] if (TRUE) { [13:11:15.268] base::sink(type = "output", split = FALSE) [13:11:15.268] if (TRUE) { [13:11:15.268] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.268] } [13:11:15.268] else { [13:11:15.268] ...future.result["stdout"] <- base::list(NULL) [13:11:15.268] } [13:11:15.268] base::close(...future.stdout) [13:11:15.268] ...future.stdout <- NULL [13:11:15.268] } [13:11:15.268] ...future.result$conditions <- ...future.conditions [13:11:15.268] ...future.result$finished <- base::Sys.time() [13:11:15.268] ...future.result [13:11:15.268] } [13:11:15.272] - Launch lazy future ... done [13:11:15.273] run() for 'MiraiFuture' ... done [13:11:15.274] Created future: [13:11:15.276] resolved() for 'MiraiFuture' ... [13:11:15.277] - state: 'running' [13:11:15.277] - run: TRUE [13:11:15.277] - result: 'NULL' [13:11:15.277] - resolved: FALSE [13:11:15.278] resolved() for 'MiraiFuture' ... done [13:11:15.274] MiraiFuture: [13:11:15.274] Label: 'future_lapply-2' [13:11:15.274] Expression: [13:11:15.274] { [13:11:15.274] do.call(function(...) { [13:11:15.274] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.274] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.274] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.274] on.exit(options(oopts), add = TRUE) [13:11:15.274] } [13:11:15.274] { [13:11:15.274] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.274] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.274] ...future.FUN(...future.X_jj, ...) [13:11:15.274] }) [13:11:15.274] } [13:11:15.274] }, args = future.call.arguments) [13:11:15.274] } [13:11:15.274] Lazy evaluation: FALSE [13:11:15.274] Asynchronous evaluation: TRUE [13:11:15.274] Local evaluation: TRUE [13:11:15.274] Environment: R_GlobalEnv [13:11:15.274] Capture standard output: TRUE [13:11:15.274] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.274] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.274] Packages: [13:11:15.274] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.274] Resolved: TRUE [13:11:15.274] Value: [13:11:15.274] Conditions captured: [13:11:15.274] Early signaling: FALSE [13:11:15.274] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.274] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.278] Chunk #2 of 2 ... DONE [13:11:15.279] Launching 2 futures (chunks) ... DONE [13:11:15.279] Resolving 2 futures (chunks) ... [13:11:15.279] resolve() on list ... [13:11:15.279] recursive: 0 [13:11:15.279] length: 2 [13:11:15.280] [13:11:15.280] resolved() for 'MiraiFuture' ... [13:11:15.280] - state: 'running' [13:11:15.280] - run: TRUE [13:11:15.281] - result: 'NULL' [13:11:15.281] - resolved: FALSE [13:11:15.281] resolved() for 'MiraiFuture' ... done [13:11:15.281] Future #1 [13:11:15.282] signalConditionsASAP(MiraiFuture, pos=1) ... [13:11:15.282] - nx: 2 [13:11:15.282] - relay: TRUE [13:11:15.282] - stdout: TRUE [13:11:15.282] - signal: TRUE [13:11:15.283] - resignal: FALSE [13:11:15.283] - force: TRUE [13:11:15.283] - relayed: [n=2] FALSE, FALSE [13:11:15.283] - queued futures: [n=2] FALSE, FALSE [13:11:15.284] - until=1 [13:11:15.284] - relaying element #1 [13:11:15.284] - relayed: [n=2] TRUE, FALSE [13:11:15.284] - queued futures: [n=2] TRUE, FALSE [13:11:15.285] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:11:15.285] length: 1 (resolved future 1) [13:11:15.285] resolved() for 'MiraiFuture' ... [13:11:15.285] - state: 'running' [13:11:15.286] - run: TRUE [13:11:15.286] - result: 'NULL' [13:11:15.286] - resolved: FALSE [13:11:15.286] resolved() for 'MiraiFuture' ... done [13:11:15.286] Future #2 [13:11:15.287] signalConditionsASAP(MiraiFuture, pos=2) ... [13:11:15.287] - nx: 2 [13:11:15.287] - relay: TRUE [13:11:15.287] - stdout: TRUE [13:11:15.293] - signal: TRUE [13:11:15.293] - resignal: FALSE [13:11:15.293] - force: TRUE [13:11:15.293] - relayed: [n=2] TRUE, FALSE [13:11:15.293] - queued futures: [n=2] TRUE, FALSE [13:11:15.294] - until=2 [13:11:15.294] - relaying element #2 [13:11:15.294] - relayed: [n=2] TRUE, TRUE [13:11:15.294] - queued futures: [n=2] TRUE, TRUE [13:11:15.295] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:11:15.295] length: 0 (resolved future 2) [13:11:15.295] Relaying remaining futures [13:11:15.295] signalConditionsASAP(NULL, pos=0) ... [13:11:15.295] - nx: 2 [13:11:15.296] - relay: TRUE [13:11:15.296] - stdout: TRUE [13:11:15.296] - signal: TRUE [13:11:15.296] - resignal: FALSE [13:11:15.296] - force: TRUE [13:11:15.296] - relayed: [n=2] TRUE, TRUE [13:11:15.297] - queued futures: [n=2] TRUE, TRUE - flush all [13:11:15.297] - relayed: [n=2] TRUE, TRUE [13:11:15.297] - queued futures: [n=2] TRUE, TRUE [13:11:15.297] signalConditionsASAP(NULL, pos=0) ... done [13:11:15.298] resolve() on list ... DONE [13:11:15.298] - Number of value chunks collected: 2 [13:11:15.298] Resolving 2 futures (chunks) ... DONE [13:11:15.298] Reducing values from 2 chunks ... [13:11:15.299] - Number of values collected after concatenation: 3 [13:11:15.299] - Number of values expected: 3 [13:11:15.299] Reducing values from 2 chunks ... DONE [13:11:15.299] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... List of 1 $ x:List of 3 ..$ a: chr "integer" ..$ c: chr "character" ..$ c: chr "list" List of 1 $ y0:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:11:15.314] - plan('mirai_multisession') ...[13:11:15.314] plan(): Setting new future strategy stack: [13:11:15.315] List of future strategies: [13:11:15.315] 1. mirai_multisession: [13:11:15.315] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:11:15.315] - tweaked: FALSE [13:11:15.315] - call: plan(strategy) [13:11:15.315] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:11:15.315] < mirai | $data > [13:11:15.320] getGlobalsAndPackages() ... [13:11:15.320] Not searching for globals [13:11:15.321] - globals: [0] [13:11:15.321] getGlobalsAndPackages() ... DONE [13:11:15.321] getGlobalsAndPackages() ... [13:11:15.321] [13:11:15.321] - globals: [0] [13:11:15.321] getGlobalsAndPackages() ... DONE [13:11:15.322] Packages needed by the future expression (n = 0): [13:11:15.322] Packages needed by future strategies (n = 0): [13:11:15.323] { [13:11:15.323] { [13:11:15.323] { [13:11:15.323] ...future.startTime <- base::Sys.time() [13:11:15.323] { [13:11:15.323] { [13:11:15.323] { [13:11:15.323] base::local({ [13:11:15.323] has_future <- base::requireNamespace("future", [13:11:15.323] quietly = TRUE) [13:11:15.323] if (has_future) { [13:11:15.323] ns <- base::getNamespace("future") [13:11:15.323] version <- ns[[".package"]][["version"]] [13:11:15.323] if (is.null(version)) [13:11:15.323] version <- utils::packageVersion("future") [13:11:15.323] } [13:11:15.323] else { [13:11:15.323] version <- NULL [13:11:15.323] } [13:11:15.323] if (!has_future || version < "1.8.0") { [13:11:15.323] info <- base::c(r_version = base::gsub("R version ", [13:11:15.323] "", base::R.version$version.string), [13:11:15.323] platform = base::sprintf("%s (%s-bit)", [13:11:15.323] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.323] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.323] "release", "version")], collapse = " "), [13:11:15.323] hostname = base::Sys.info()[["nodename"]]) [13:11:15.323] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.323] info) [13:11:15.323] info <- base::paste(info, collapse = "; ") [13:11:15.323] if (!has_future) { [13:11:15.323] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.323] info) [13:11:15.323] } [13:11:15.323] else { [13:11:15.323] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.323] info, version) [13:11:15.323] } [13:11:15.323] base::stop(msg) [13:11:15.323] } [13:11:15.323] }) [13:11:15.323] } [13:11:15.323] ...future.strategy.old <- future::plan("list") [13:11:15.323] options(future.plan = NULL) [13:11:15.323] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.323] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.323] } [13:11:15.323] ...future.workdir <- getwd() [13:11:15.323] } [13:11:15.323] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.323] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.323] } [13:11:15.323] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.323] future.globals.maxSize = NULL, future.globals.method = NULL, [13:11:15.323] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.323] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.323] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.323] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.323] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.323] base::names(...future.oldOptions)) [13:11:15.323] } [13:11:15.323] if (FALSE) { [13:11:15.323] } [13:11:15.323] else { [13:11:15.323] if (TRUE) { [13:11:15.323] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.323] open = "w") [13:11:15.323] } [13:11:15.323] else { [13:11:15.323] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.323] windows = "NUL", "/dev/null"), open = "w") [13:11:15.323] } [13:11:15.323] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.323] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.323] base::sink(type = "output", split = FALSE) [13:11:15.323] base::close(...future.stdout) [13:11:15.323] }, add = TRUE) [13:11:15.323] } [13:11:15.323] ...future.frame <- base::sys.nframe() [13:11:15.323] ...future.conditions <- base::list() [13:11:15.323] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.323] if (FALSE) { [13:11:15.323] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.323] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.323] } [13:11:15.323] ...future.result <- base::tryCatch({ [13:11:15.323] base::withCallingHandlers({ [13:11:15.323] ...future.value <- base::withVisible(base::local(NA)) [13:11:15.323] future::FutureResult(value = ...future.value$value, [13:11:15.323] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.323] ...future.rng), globalenv = if (FALSE) [13:11:15.323] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.323] ...future.globalenv.names)) [13:11:15.323] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.323] }, condition = base::local({ [13:11:15.323] c <- base::c [13:11:15.323] inherits <- base::inherits [13:11:15.323] invokeRestart <- base::invokeRestart [13:11:15.323] length <- base::length [13:11:15.323] list <- base::list [13:11:15.323] seq.int <- base::seq.int [13:11:15.323] signalCondition <- base::signalCondition [13:11:15.323] sys.calls <- base::sys.calls [13:11:15.323] `[[` <- base::`[[` [13:11:15.323] `+` <- base::`+` [13:11:15.323] `<<-` <- base::`<<-` [13:11:15.323] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.323] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.323] 3L)] [13:11:15.323] } [13:11:15.323] function(cond) { [13:11:15.323] is_error <- inherits(cond, "error") [13:11:15.323] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.323] NULL) [13:11:15.323] if (is_error) { [13:11:15.323] sessionInformation <- function() { [13:11:15.323] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.323] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.323] search = base::search(), system = base::Sys.info()) [13:11:15.323] } [13:11:15.323] ...future.conditions[[length(...future.conditions) + [13:11:15.323] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.323] cond$call), session = sessionInformation(), [13:11:15.323] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.323] signalCondition(cond) [13:11:15.323] } [13:11:15.323] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.323] signal <- FALSE && inherits(cond, character(0)) [13:11:15.323] ...future.conditions[[length(...future.conditions) + [13:11:15.323] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.323] if (FALSE && !signal) { [13:11:15.323] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.323] { [13:11:15.323] inherits <- base::inherits [13:11:15.323] invokeRestart <- base::invokeRestart [13:11:15.323] is.null <- base::is.null [13:11:15.323] muffled <- FALSE [13:11:15.323] if (inherits(cond, "message")) { [13:11:15.323] muffled <- grepl(pattern, "muffleMessage") [13:11:15.323] if (muffled) [13:11:15.323] invokeRestart("muffleMessage") [13:11:15.323] } [13:11:15.323] else if (inherits(cond, "warning")) { [13:11:15.323] muffled <- grepl(pattern, "muffleWarning") [13:11:15.323] if (muffled) [13:11:15.323] invokeRestart("muffleWarning") [13:11:15.323] } [13:11:15.323] else if (inherits(cond, "condition")) { [13:11:15.323] if (!is.null(pattern)) { [13:11:15.323] computeRestarts <- base::computeRestarts [13:11:15.323] grepl <- base::grepl [13:11:15.323] restarts <- computeRestarts(cond) [13:11:15.323] for (restart in restarts) { [13:11:15.323] name <- restart$name [13:11:15.323] if (is.null(name)) [13:11:15.323] next [13:11:15.323] if (!grepl(pattern, name)) [13:11:15.323] next [13:11:15.323] invokeRestart(restart) [13:11:15.323] muffled <- TRUE [13:11:15.323] break [13:11:15.323] } [13:11:15.323] } [13:11:15.323] } [13:11:15.323] invisible(muffled) [13:11:15.323] } [13:11:15.323] muffleCondition(cond, pattern = "^muffle") [13:11:15.323] } [13:11:15.323] } [13:11:15.323] else { [13:11:15.323] if (TRUE) { [13:11:15.323] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.323] { [13:11:15.323] inherits <- base::inherits [13:11:15.323] invokeRestart <- base::invokeRestart [13:11:15.323] is.null <- base::is.null [13:11:15.323] muffled <- FALSE [13:11:15.323] if (inherits(cond, "message")) { [13:11:15.323] muffled <- grepl(pattern, "muffleMessage") [13:11:15.323] if (muffled) [13:11:15.323] invokeRestart("muffleMessage") [13:11:15.323] } [13:11:15.323] else if (inherits(cond, "warning")) { [13:11:15.323] muffled <- grepl(pattern, "muffleWarning") [13:11:15.323] if (muffled) [13:11:15.323] invokeRestart("muffleWarning") [13:11:15.323] } [13:11:15.323] else if (inherits(cond, "condition")) { [13:11:15.323] if (!is.null(pattern)) { [13:11:15.323] computeRestarts <- base::computeRestarts [13:11:15.323] grepl <- base::grepl [13:11:15.323] restarts <- computeRestarts(cond) [13:11:15.323] for (restart in restarts) { [13:11:15.323] name <- restart$name [13:11:15.323] if (is.null(name)) [13:11:15.323] next [13:11:15.323] if (!grepl(pattern, name)) [13:11:15.323] next [13:11:15.323] invokeRestart(restart) [13:11:15.323] muffled <- TRUE [13:11:15.323] break [13:11:15.323] } [13:11:15.323] } [13:11:15.323] } [13:11:15.323] invisible(muffled) [13:11:15.323] } [13:11:15.323] muffleCondition(cond, pattern = "^muffle") [13:11:15.323] } [13:11:15.323] } [13:11:15.323] } [13:11:15.323] })) [13:11:15.323] }, error = function(ex) { [13:11:15.323] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.323] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.323] ...future.rng), started = ...future.startTime, [13:11:15.323] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.323] version = "1.8"), class = "FutureResult") [13:11:15.323] }, finally = { [13:11:15.323] if (!identical(...future.workdir, getwd())) [13:11:15.323] setwd(...future.workdir) [13:11:15.323] { [13:11:15.323] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.323] ...future.oldOptions$nwarnings <- NULL [13:11:15.323] } [13:11:15.323] base::options(...future.oldOptions) [13:11:15.323] if (.Platform$OS.type == "windows") { [13:11:15.323] old_names <- names(...future.oldEnvVars) [13:11:15.323] envs <- base::Sys.getenv() [13:11:15.323] names <- names(envs) [13:11:15.323] common <- intersect(names, old_names) [13:11:15.323] added <- setdiff(names, old_names) [13:11:15.323] removed <- setdiff(old_names, names) [13:11:15.323] changed <- common[...future.oldEnvVars[common] != [13:11:15.323] envs[common]] [13:11:15.323] NAMES <- toupper(changed) [13:11:15.323] args <- list() [13:11:15.323] for (kk in seq_along(NAMES)) { [13:11:15.323] name <- changed[[kk]] [13:11:15.323] NAME <- NAMES[[kk]] [13:11:15.323] if (name != NAME && is.element(NAME, old_names)) [13:11:15.323] next [13:11:15.323] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.323] } [13:11:15.323] NAMES <- toupper(added) [13:11:15.323] for (kk in seq_along(NAMES)) { [13:11:15.323] name <- added[[kk]] [13:11:15.323] NAME <- NAMES[[kk]] [13:11:15.323] if (name != NAME && is.element(NAME, old_names)) [13:11:15.323] next [13:11:15.323] args[[name]] <- "" [13:11:15.323] } [13:11:15.323] NAMES <- toupper(removed) [13:11:15.323] for (kk in seq_along(NAMES)) { [13:11:15.323] name <- removed[[kk]] [13:11:15.323] NAME <- NAMES[[kk]] [13:11:15.323] if (name != NAME && is.element(NAME, old_names)) [13:11:15.323] next [13:11:15.323] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.323] } [13:11:15.323] if (length(args) > 0) [13:11:15.323] base::do.call(base::Sys.setenv, args = args) [13:11:15.323] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.323] } [13:11:15.323] else { [13:11:15.323] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.323] } [13:11:15.323] { [13:11:15.323] if (base::length(...future.futureOptionsAdded) > [13:11:15.323] 0L) { [13:11:15.323] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.323] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.323] base::options(opts) [13:11:15.323] } [13:11:15.323] { [13:11:15.323] NULL [13:11:15.323] options(future.plan = NULL) [13:11:15.323] if (is.na(NA_character_)) [13:11:15.323] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.323] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.323] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.323] .init = FALSE) [13:11:15.323] } [13:11:15.323] } [13:11:15.323] } [13:11:15.323] }) [13:11:15.323] if (TRUE) { [13:11:15.323] base::sink(type = "output", split = FALSE) [13:11:15.323] if (TRUE) { [13:11:15.323] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.323] } [13:11:15.323] else { [13:11:15.323] ...future.result["stdout"] <- base::list(NULL) [13:11:15.323] } [13:11:15.323] base::close(...future.stdout) [13:11:15.323] ...future.stdout <- NULL [13:11:15.323] } [13:11:15.323] ...future.result$conditions <- ...future.conditions [13:11:15.323] ...future.result$finished <- base::Sys.time() [13:11:15.323] ...future.result [13:11:15.323] } [13:11:15.329] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:11:15.330] plan(): nbrOfWorkers() = 2 [13:11:15.330] future_lapply() ... [13:11:15.332] Number of chunks: 3 [13:11:15.332] getGlobalsAndPackagesXApply() ... [13:11:15.332] - future.globals: TRUE [13:11:15.332] getGlobalsAndPackages() ... [13:11:15.333] Searching for globals... [13:11:15.335] - globals found: [2] 'FUN', '.Internal' [13:11:15.335] Searching for globals ... DONE [13:11:15.335] Resolving globals: FALSE [13:11:15.336] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:11:15.336] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:11:15.336] - globals: [1] 'FUN' [13:11:15.337] [13:11:15.337] getGlobalsAndPackages() ... DONE [13:11:15.337] - globals found/used: [n=1] 'FUN' [13:11:15.337] - needed namespaces: [n=0] [13:11:15.337] Finding globals ... DONE [13:11:15.338] - use_args: TRUE [13:11:15.338] - Getting '...' globals ... [13:11:15.338] resolve() on list ... [13:11:15.339] recursive: 0 [13:11:15.339] length: 1 [13:11:15.339] elements: '...' [13:11:15.339] length: 0 (resolved future 1) [13:11:15.340] resolve() on list ... DONE [13:11:15.340] - '...' content: [n=1] 'length' [13:11:15.340] List of 1 [13:11:15.340] $ ...:List of 1 [13:11:15.340] ..$ length: int 2 [13:11:15.340] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.340] - attr(*, "where")=List of 1 [13:11:15.340] ..$ ...: [13:11:15.340] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.340] - attr(*, "resolved")= logi TRUE [13:11:15.340] - attr(*, "total_size")= num NA [13:11:15.345] - Getting '...' globals ... DONE [13:11:15.345] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:11:15.345] List of 2 [13:11:15.345] $ ...future.FUN:function (mode = "logical", length = 0L) [13:11:15.345] $ ... :List of 1 [13:11:15.345] ..$ length: int 2 [13:11:15.345] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.345] - attr(*, "where")=List of 2 [13:11:15.345] ..$ ...future.FUN: [13:11:15.345] ..$ ... : [13:11:15.345] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.345] - attr(*, "resolved")= logi FALSE [13:11:15.345] - attr(*, "total_size")= num 2240 [13:11:15.350] Packages to be attached in all futures: [n=0] [13:11:15.350] getGlobalsAndPackagesXApply() ... DONE [13:11:15.351] Number of futures (= number of chunks): 3 [13:11:15.351] Launching 3 futures (chunks) ... [13:11:15.351] Chunk #1 of 3 ... [13:11:15.351] - Finding globals in 'X' for chunk #1 ... [13:11:15.351] getGlobalsAndPackages() ... [13:11:15.352] Searching for globals... [13:11:15.352] [13:11:15.352] Searching for globals ... DONE [13:11:15.353] - globals: [0] [13:11:15.353] getGlobalsAndPackages() ... DONE [13:11:15.353] + additional globals found: [n=0] [13:11:15.353] + additional namespaces needed: [n=0] [13:11:15.411] - Finding globals in 'X' for chunk #1 ... DONE [13:11:15.411] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:11:15.412] - seeds: [13:11:15.412] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.412] getGlobalsAndPackages() ... [13:11:15.412] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.413] Resolving globals: FALSE [13:11:15.413] Tweak future expression to call with '...' arguments ... [13:11:15.413] { [13:11:15.413] do.call(function(...) { [13:11:15.413] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.413] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.413] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.413] on.exit(options(oopts), add = TRUE) [13:11:15.413] } [13:11:15.413] { [13:11:15.413] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.413] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.413] ...future.FUN(...future.X_jj, ...) [13:11:15.413] }) [13:11:15.413] } [13:11:15.413] }, args = future.call.arguments) [13:11:15.413] } [13:11:15.414] Tweak future expression to call with '...' arguments ... DONE [13:11:15.414] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.415] [13:11:15.415] getGlobalsAndPackages() ... DONE [13:11:15.415] run() for 'Future' ... [13:11:15.416] - state: 'created' [13:11:15.416] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.419] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.419] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.420] - Field: 'label' [13:11:15.420] - Field: 'local' [13:11:15.420] - Field: 'owner' [13:11:15.420] - Field: 'envir' [13:11:15.421] - Field: 'packages' [13:11:15.421] - Field: 'gc' [13:11:15.421] - Field: 'conditions' [13:11:15.421] - Field: 'expr' [13:11:15.421] - Field: 'uuid' [13:11:15.422] - Field: 'seed' [13:11:15.422] - Field: 'version' [13:11:15.422] - Field: 'result' [13:11:15.422] - Field: 'asynchronous' [13:11:15.422] - Field: 'calls' [13:11:15.423] - Field: 'globals' [13:11:15.423] - Field: 'stdout' [13:11:15.423] - Field: 'earlySignal' [13:11:15.423] - Field: 'lazy' [13:11:15.423] - Field: 'state' [13:11:15.424] - Field: '.cluster' [13:11:15.424] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.424] - Launch lazy future ... [13:11:15.424] Packages needed by the future expression (n = 0): [13:11:15.425] Packages needed by future strategies (n = 0): [13:11:15.425] { [13:11:15.425] { [13:11:15.425] { [13:11:15.425] ...future.startTime <- base::Sys.time() [13:11:15.425] { [13:11:15.425] { [13:11:15.425] { [13:11:15.425] base::local({ [13:11:15.425] has_future <- base::requireNamespace("future", [13:11:15.425] quietly = TRUE) [13:11:15.425] if (has_future) { [13:11:15.425] ns <- base::getNamespace("future") [13:11:15.425] version <- ns[[".package"]][["version"]] [13:11:15.425] if (is.null(version)) [13:11:15.425] version <- utils::packageVersion("future") [13:11:15.425] } [13:11:15.425] else { [13:11:15.425] version <- NULL [13:11:15.425] } [13:11:15.425] if (!has_future || version < "1.8.0") { [13:11:15.425] info <- base::c(r_version = base::gsub("R version ", [13:11:15.425] "", base::R.version$version.string), [13:11:15.425] platform = base::sprintf("%s (%s-bit)", [13:11:15.425] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.425] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.425] "release", "version")], collapse = " "), [13:11:15.425] hostname = base::Sys.info()[["nodename"]]) [13:11:15.425] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.425] info) [13:11:15.425] info <- base::paste(info, collapse = "; ") [13:11:15.425] if (!has_future) { [13:11:15.425] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.425] info) [13:11:15.425] } [13:11:15.425] else { [13:11:15.425] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.425] info, version) [13:11:15.425] } [13:11:15.425] base::stop(msg) [13:11:15.425] } [13:11:15.425] }) [13:11:15.425] } [13:11:15.425] ...future.strategy.old <- future::plan("list") [13:11:15.425] options(future.plan = NULL) [13:11:15.425] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.425] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.425] } [13:11:15.425] ...future.workdir <- getwd() [13:11:15.425] } [13:11:15.425] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.425] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.425] } [13:11:15.425] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.425] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:11:15.425] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.425] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.425] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.425] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.425] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.425] base::names(...future.oldOptions)) [13:11:15.425] } [13:11:15.425] if (FALSE) { [13:11:15.425] } [13:11:15.425] else { [13:11:15.425] if (TRUE) { [13:11:15.425] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.425] open = "w") [13:11:15.425] } [13:11:15.425] else { [13:11:15.425] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.425] windows = "NUL", "/dev/null"), open = "w") [13:11:15.425] } [13:11:15.425] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.425] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.425] base::sink(type = "output", split = FALSE) [13:11:15.425] base::close(...future.stdout) [13:11:15.425] }, add = TRUE) [13:11:15.425] } [13:11:15.425] ...future.frame <- base::sys.nframe() [13:11:15.425] ...future.conditions <- base::list() [13:11:15.425] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.425] if (FALSE) { [13:11:15.425] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.425] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.425] } [13:11:15.425] ...future.result <- base::tryCatch({ [13:11:15.425] base::withCallingHandlers({ [13:11:15.425] ...future.value <- base::withVisible(base::local({ [13:11:15.425] do.call(function(...) { [13:11:15.425] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.425] if (!identical(...future.globals.maxSize.org, [13:11:15.425] ...future.globals.maxSize)) { [13:11:15.425] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.425] on.exit(options(oopts), add = TRUE) [13:11:15.425] } [13:11:15.425] { [13:11:15.425] lapply(seq_along(...future.elements_ii), [13:11:15.425] FUN = function(jj) { [13:11:15.425] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.425] ...future.FUN(...future.X_jj, ...) [13:11:15.425] }) [13:11:15.425] } [13:11:15.425] }, args = future.call.arguments) [13:11:15.425] })) [13:11:15.425] future::FutureResult(value = ...future.value$value, [13:11:15.425] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.425] ...future.rng), globalenv = if (FALSE) [13:11:15.425] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.425] ...future.globalenv.names)) [13:11:15.425] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.425] }, condition = base::local({ [13:11:15.425] c <- base::c [13:11:15.425] inherits <- base::inherits [13:11:15.425] invokeRestart <- base::invokeRestart [13:11:15.425] length <- base::length [13:11:15.425] list <- base::list [13:11:15.425] seq.int <- base::seq.int [13:11:15.425] signalCondition <- base::signalCondition [13:11:15.425] sys.calls <- base::sys.calls [13:11:15.425] `[[` <- base::`[[` [13:11:15.425] `+` <- base::`+` [13:11:15.425] `<<-` <- base::`<<-` [13:11:15.425] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.425] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.425] 3L)] [13:11:15.425] } [13:11:15.425] function(cond) { [13:11:15.425] is_error <- inherits(cond, "error") [13:11:15.425] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.425] NULL) [13:11:15.425] if (is_error) { [13:11:15.425] sessionInformation <- function() { [13:11:15.425] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.425] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.425] search = base::search(), system = base::Sys.info()) [13:11:15.425] } [13:11:15.425] ...future.conditions[[length(...future.conditions) + [13:11:15.425] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.425] cond$call), session = sessionInformation(), [13:11:15.425] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.425] signalCondition(cond) [13:11:15.425] } [13:11:15.425] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.425] signal <- FALSE && inherits(cond, character(0)) [13:11:15.425] ...future.conditions[[length(...future.conditions) + [13:11:15.425] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.425] if (FALSE && !signal) { [13:11:15.425] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.425] { [13:11:15.425] inherits <- base::inherits [13:11:15.425] invokeRestart <- base::invokeRestart [13:11:15.425] is.null <- base::is.null [13:11:15.425] muffled <- FALSE [13:11:15.425] if (inherits(cond, "message")) { [13:11:15.425] muffled <- grepl(pattern, "muffleMessage") [13:11:15.425] if (muffled) [13:11:15.425] invokeRestart("muffleMessage") [13:11:15.425] } [13:11:15.425] else if (inherits(cond, "warning")) { [13:11:15.425] muffled <- grepl(pattern, "muffleWarning") [13:11:15.425] if (muffled) [13:11:15.425] invokeRestart("muffleWarning") [13:11:15.425] } [13:11:15.425] else if (inherits(cond, "condition")) { [13:11:15.425] if (!is.null(pattern)) { [13:11:15.425] computeRestarts <- base::computeRestarts [13:11:15.425] grepl <- base::grepl [13:11:15.425] restarts <- computeRestarts(cond) [13:11:15.425] for (restart in restarts) { [13:11:15.425] name <- restart$name [13:11:15.425] if (is.null(name)) [13:11:15.425] next [13:11:15.425] if (!grepl(pattern, name)) [13:11:15.425] next [13:11:15.425] invokeRestart(restart) [13:11:15.425] muffled <- TRUE [13:11:15.425] break [13:11:15.425] } [13:11:15.425] } [13:11:15.425] } [13:11:15.425] invisible(muffled) [13:11:15.425] } [13:11:15.425] muffleCondition(cond, pattern = "^muffle") [13:11:15.425] } [13:11:15.425] } [13:11:15.425] else { [13:11:15.425] if (TRUE) { [13:11:15.425] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.425] { [13:11:15.425] inherits <- base::inherits [13:11:15.425] invokeRestart <- base::invokeRestart [13:11:15.425] is.null <- base::is.null [13:11:15.425] muffled <- FALSE [13:11:15.425] if (inherits(cond, "message")) { [13:11:15.425] muffled <- grepl(pattern, "muffleMessage") [13:11:15.425] if (muffled) [13:11:15.425] invokeRestart("muffleMessage") [13:11:15.425] } [13:11:15.425] else if (inherits(cond, "warning")) { [13:11:15.425] muffled <- grepl(pattern, "muffleWarning") [13:11:15.425] if (muffled) [13:11:15.425] invokeRestart("muffleWarning") [13:11:15.425] } [13:11:15.425] else if (inherits(cond, "condition")) { [13:11:15.425] if (!is.null(pattern)) { [13:11:15.425] computeRestarts <- base::computeRestarts [13:11:15.425] grepl <- base::grepl [13:11:15.425] restarts <- computeRestarts(cond) [13:11:15.425] for (restart in restarts) { [13:11:15.425] name <- restart$name [13:11:15.425] if (is.null(name)) [13:11:15.425] next [13:11:15.425] if (!grepl(pattern, name)) [13:11:15.425] next [13:11:15.425] invokeRestart(restart) [13:11:15.425] muffled <- TRUE [13:11:15.425] break [13:11:15.425] } [13:11:15.425] } [13:11:15.425] } [13:11:15.425] invisible(muffled) [13:11:15.425] } [13:11:15.425] muffleCondition(cond, pattern = "^muffle") [13:11:15.425] } [13:11:15.425] } [13:11:15.425] } [13:11:15.425] })) [13:11:15.425] }, error = function(ex) { [13:11:15.425] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.425] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.425] ...future.rng), started = ...future.startTime, [13:11:15.425] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.425] version = "1.8"), class = "FutureResult") [13:11:15.425] }, finally = { [13:11:15.425] if (!identical(...future.workdir, getwd())) [13:11:15.425] setwd(...future.workdir) [13:11:15.425] { [13:11:15.425] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.425] ...future.oldOptions$nwarnings <- NULL [13:11:15.425] } [13:11:15.425] base::options(...future.oldOptions) [13:11:15.425] if (.Platform$OS.type == "windows") { [13:11:15.425] old_names <- names(...future.oldEnvVars) [13:11:15.425] envs <- base::Sys.getenv() [13:11:15.425] names <- names(envs) [13:11:15.425] common <- intersect(names, old_names) [13:11:15.425] added <- setdiff(names, old_names) [13:11:15.425] removed <- setdiff(old_names, names) [13:11:15.425] changed <- common[...future.oldEnvVars[common] != [13:11:15.425] envs[common]] [13:11:15.425] NAMES <- toupper(changed) [13:11:15.425] args <- list() [13:11:15.425] for (kk in seq_along(NAMES)) { [13:11:15.425] name <- changed[[kk]] [13:11:15.425] NAME <- NAMES[[kk]] [13:11:15.425] if (name != NAME && is.element(NAME, old_names)) [13:11:15.425] next [13:11:15.425] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.425] } [13:11:15.425] NAMES <- toupper(added) [13:11:15.425] for (kk in seq_along(NAMES)) { [13:11:15.425] name <- added[[kk]] [13:11:15.425] NAME <- NAMES[[kk]] [13:11:15.425] if (name != NAME && is.element(NAME, old_names)) [13:11:15.425] next [13:11:15.425] args[[name]] <- "" [13:11:15.425] } [13:11:15.425] NAMES <- toupper(removed) [13:11:15.425] for (kk in seq_along(NAMES)) { [13:11:15.425] name <- removed[[kk]] [13:11:15.425] NAME <- NAMES[[kk]] [13:11:15.425] if (name != NAME && is.element(NAME, old_names)) [13:11:15.425] next [13:11:15.425] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.425] } [13:11:15.425] if (length(args) > 0) [13:11:15.425] base::do.call(base::Sys.setenv, args = args) [13:11:15.425] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.425] } [13:11:15.425] else { [13:11:15.425] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.425] } [13:11:15.425] { [13:11:15.425] if (base::length(...future.futureOptionsAdded) > [13:11:15.425] 0L) { [13:11:15.425] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.425] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.425] base::options(opts) [13:11:15.425] } [13:11:15.425] { [13:11:15.425] NULL [13:11:15.425] options(future.plan = NULL) [13:11:15.425] if (is.na(NA_character_)) [13:11:15.425] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.425] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.425] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.425] .init = FALSE) [13:11:15.425] } [13:11:15.425] } [13:11:15.425] } [13:11:15.425] }) [13:11:15.425] if (TRUE) { [13:11:15.425] base::sink(type = "output", split = FALSE) [13:11:15.425] if (TRUE) { [13:11:15.425] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.425] } [13:11:15.425] else { [13:11:15.425] ...future.result["stdout"] <- base::list(NULL) [13:11:15.425] } [13:11:15.425] base::close(...future.stdout) [13:11:15.425] ...future.stdout <- NULL [13:11:15.425] } [13:11:15.425] ...future.result$conditions <- ...future.conditions [13:11:15.425] ...future.result$finished <- base::Sys.time() [13:11:15.425] ...future.result [13:11:15.425] } [13:11:15.430] - Launch lazy future ... done [13:11:15.430] run() for 'MiraiFuture' ... done [13:11:15.430] Created future: [13:11:15.432] resolved() for 'MiraiFuture' ... [13:11:15.432] - state: 'running' [13:11:15.432] - run: TRUE [13:11:15.433] - result: 'NULL' [13:11:15.433] - resolved: FALSE [13:11:15.433] resolved() for 'MiraiFuture' ... done [13:11:15.431] MiraiFuture: [13:11:15.431] Label: 'future_lapply-1' [13:11:15.431] Expression: [13:11:15.431] { [13:11:15.431] do.call(function(...) { [13:11:15.431] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.431] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.431] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.431] on.exit(options(oopts), add = TRUE) [13:11:15.431] } [13:11:15.431] { [13:11:15.431] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.431] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.431] ...future.FUN(...future.X_jj, ...) [13:11:15.431] }) [13:11:15.431] } [13:11:15.431] }, args = future.call.arguments) [13:11:15.431] } [13:11:15.431] Lazy evaluation: FALSE [13:11:15.431] Asynchronous evaluation: TRUE [13:11:15.431] Local evaluation: TRUE [13:11:15.431] Environment: R_GlobalEnv [13:11:15.431] Capture standard output: TRUE [13:11:15.431] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.431] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.431] Packages: [13:11:15.431] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.431] Resolved: TRUE [13:11:15.431] Value: [13:11:15.431] Conditions captured: [13:11:15.431] Early signaling: FALSE [13:11:15.431] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.431] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.434] Chunk #1 of 3 ... DONE [13:11:15.434] Chunk #2 of 3 ... [13:11:15.434] - Finding globals in 'X' for chunk #2 ... [13:11:15.434] getGlobalsAndPackages() ... [13:11:15.434] Searching for globals... [13:11:15.435] [13:11:15.435] Searching for globals ... DONE [13:11:15.435] - globals: [0] [13:11:15.435] getGlobalsAndPackages() ... DONE [13:11:15.436] + additional globals found: [n=0] [13:11:15.436] + additional namespaces needed: [n=0] [13:11:15.436] - Finding globals in 'X' for chunk #2 ... DONE [13:11:15.436] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:11:15.436] - seeds: [13:11:15.437] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.437] getGlobalsAndPackages() ... [13:11:15.437] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.437] Resolving globals: FALSE [13:11:15.437] Tweak future expression to call with '...' arguments ... [13:11:15.438] { [13:11:15.438] do.call(function(...) { [13:11:15.438] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.438] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.438] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.438] on.exit(options(oopts), add = TRUE) [13:11:15.438] } [13:11:15.438] { [13:11:15.438] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.438] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.438] ...future.FUN(...future.X_jj, ...) [13:11:15.438] }) [13:11:15.438] } [13:11:15.438] }, args = future.call.arguments) [13:11:15.438] } [13:11:15.438] Tweak future expression to call with '...' arguments ... DONE [13:11:15.439] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.439] [13:11:15.439] getGlobalsAndPackages() ... DONE [13:11:15.440] run() for 'Future' ... [13:11:15.440] - state: 'created' [13:11:15.440] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.443] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.443] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.443] - Field: 'label' [13:11:15.444] - Field: 'local' [13:11:15.444] - Field: 'owner' [13:11:15.444] - Field: 'envir' [13:11:15.444] - Field: 'packages' [13:11:15.445] - Field: 'gc' [13:11:15.445] - Field: 'conditions' [13:11:15.445] - Field: 'expr' [13:11:15.445] - Field: 'uuid' [13:11:15.445] - Field: 'seed' [13:11:15.446] - Field: 'version' [13:11:15.446] - Field: 'result' [13:11:15.446] - Field: 'asynchronous' [13:11:15.446] - Field: 'calls' [13:11:15.446] - Field: 'globals' [13:11:15.447] - Field: 'stdout' [13:11:15.447] - Field: 'earlySignal' [13:11:15.447] - Field: 'lazy' [13:11:15.447] - Field: 'state' [13:11:15.447] - Field: '.cluster' [13:11:15.448] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.448] - Launch lazy future ... [13:11:15.448] Packages needed by the future expression (n = 0): [13:11:15.448] Packages needed by future strategies (n = 0): [13:11:15.449] { [13:11:15.449] { [13:11:15.449] { [13:11:15.449] ...future.startTime <- base::Sys.time() [13:11:15.449] { [13:11:15.449] { [13:11:15.449] { [13:11:15.449] base::local({ [13:11:15.449] has_future <- base::requireNamespace("future", [13:11:15.449] quietly = TRUE) [13:11:15.449] if (has_future) { [13:11:15.449] ns <- base::getNamespace("future") [13:11:15.449] version <- ns[[".package"]][["version"]] [13:11:15.449] if (is.null(version)) [13:11:15.449] version <- utils::packageVersion("future") [13:11:15.449] } [13:11:15.449] else { [13:11:15.449] version <- NULL [13:11:15.449] } [13:11:15.449] if (!has_future || version < "1.8.0") { [13:11:15.449] info <- base::c(r_version = base::gsub("R version ", [13:11:15.449] "", base::R.version$version.string), [13:11:15.449] platform = base::sprintf("%s (%s-bit)", [13:11:15.449] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.449] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.449] "release", "version")], collapse = " "), [13:11:15.449] hostname = base::Sys.info()[["nodename"]]) [13:11:15.449] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.449] info) [13:11:15.449] info <- base::paste(info, collapse = "; ") [13:11:15.449] if (!has_future) { [13:11:15.449] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.449] info) [13:11:15.449] } [13:11:15.449] else { [13:11:15.449] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.449] info, version) [13:11:15.449] } [13:11:15.449] base::stop(msg) [13:11:15.449] } [13:11:15.449] }) [13:11:15.449] } [13:11:15.449] ...future.strategy.old <- future::plan("list") [13:11:15.449] options(future.plan = NULL) [13:11:15.449] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.449] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.449] } [13:11:15.449] ...future.workdir <- getwd() [13:11:15.449] } [13:11:15.449] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.449] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.449] } [13:11:15.449] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.449] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:11:15.449] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.449] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.449] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.449] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.449] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.449] base::names(...future.oldOptions)) [13:11:15.449] } [13:11:15.449] if (FALSE) { [13:11:15.449] } [13:11:15.449] else { [13:11:15.449] if (TRUE) { [13:11:15.449] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.449] open = "w") [13:11:15.449] } [13:11:15.449] else { [13:11:15.449] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.449] windows = "NUL", "/dev/null"), open = "w") [13:11:15.449] } [13:11:15.449] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.449] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.449] base::sink(type = "output", split = FALSE) [13:11:15.449] base::close(...future.stdout) [13:11:15.449] }, add = TRUE) [13:11:15.449] } [13:11:15.449] ...future.frame <- base::sys.nframe() [13:11:15.449] ...future.conditions <- base::list() [13:11:15.449] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.449] if (FALSE) { [13:11:15.449] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.449] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.449] } [13:11:15.449] ...future.result <- base::tryCatch({ [13:11:15.449] base::withCallingHandlers({ [13:11:15.449] ...future.value <- base::withVisible(base::local({ [13:11:15.449] do.call(function(...) { [13:11:15.449] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.449] if (!identical(...future.globals.maxSize.org, [13:11:15.449] ...future.globals.maxSize)) { [13:11:15.449] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.449] on.exit(options(oopts), add = TRUE) [13:11:15.449] } [13:11:15.449] { [13:11:15.449] lapply(seq_along(...future.elements_ii), [13:11:15.449] FUN = function(jj) { [13:11:15.449] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.449] ...future.FUN(...future.X_jj, ...) [13:11:15.449] }) [13:11:15.449] } [13:11:15.449] }, args = future.call.arguments) [13:11:15.449] })) [13:11:15.449] future::FutureResult(value = ...future.value$value, [13:11:15.449] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.449] ...future.rng), globalenv = if (FALSE) [13:11:15.449] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.449] ...future.globalenv.names)) [13:11:15.449] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.449] }, condition = base::local({ [13:11:15.449] c <- base::c [13:11:15.449] inherits <- base::inherits [13:11:15.449] invokeRestart <- base::invokeRestart [13:11:15.449] length <- base::length [13:11:15.449] list <- base::list [13:11:15.449] seq.int <- base::seq.int [13:11:15.449] signalCondition <- base::signalCondition [13:11:15.449] sys.calls <- base::sys.calls [13:11:15.449] `[[` <- base::`[[` [13:11:15.449] `+` <- base::`+` [13:11:15.449] `<<-` <- base::`<<-` [13:11:15.449] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.449] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.449] 3L)] [13:11:15.449] } [13:11:15.449] function(cond) { [13:11:15.449] is_error <- inherits(cond, "error") [13:11:15.449] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.449] NULL) [13:11:15.449] if (is_error) { [13:11:15.449] sessionInformation <- function() { [13:11:15.449] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.449] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.449] search = base::search(), system = base::Sys.info()) [13:11:15.449] } [13:11:15.449] ...future.conditions[[length(...future.conditions) + [13:11:15.449] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.449] cond$call), session = sessionInformation(), [13:11:15.449] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.449] signalCondition(cond) [13:11:15.449] } [13:11:15.449] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.449] signal <- FALSE && inherits(cond, character(0)) [13:11:15.449] ...future.conditions[[length(...future.conditions) + [13:11:15.449] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.449] if (FALSE && !signal) { [13:11:15.449] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.449] { [13:11:15.449] inherits <- base::inherits [13:11:15.449] invokeRestart <- base::invokeRestart [13:11:15.449] is.null <- base::is.null [13:11:15.449] muffled <- FALSE [13:11:15.449] if (inherits(cond, "message")) { [13:11:15.449] muffled <- grepl(pattern, "muffleMessage") [13:11:15.449] if (muffled) [13:11:15.449] invokeRestart("muffleMessage") [13:11:15.449] } [13:11:15.449] else if (inherits(cond, "warning")) { [13:11:15.449] muffled <- grepl(pattern, "muffleWarning") [13:11:15.449] if (muffled) [13:11:15.449] invokeRestart("muffleWarning") [13:11:15.449] } [13:11:15.449] else if (inherits(cond, "condition")) { [13:11:15.449] if (!is.null(pattern)) { [13:11:15.449] computeRestarts <- base::computeRestarts [13:11:15.449] grepl <- base::grepl [13:11:15.449] restarts <- computeRestarts(cond) [13:11:15.449] for (restart in restarts) { [13:11:15.449] name <- restart$name [13:11:15.449] if (is.null(name)) [13:11:15.449] next [13:11:15.449] if (!grepl(pattern, name)) [13:11:15.449] next [13:11:15.449] invokeRestart(restart) [13:11:15.449] muffled <- TRUE [13:11:15.449] break [13:11:15.449] } [13:11:15.449] } [13:11:15.449] } [13:11:15.449] invisible(muffled) [13:11:15.449] } [13:11:15.449] muffleCondition(cond, pattern = "^muffle") [13:11:15.449] } [13:11:15.449] } [13:11:15.449] else { [13:11:15.449] if (TRUE) { [13:11:15.449] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.449] { [13:11:15.449] inherits <- base::inherits [13:11:15.449] invokeRestart <- base::invokeRestart [13:11:15.449] is.null <- base::is.null [13:11:15.449] muffled <- FALSE [13:11:15.449] if (inherits(cond, "message")) { [13:11:15.449] muffled <- grepl(pattern, "muffleMessage") [13:11:15.449] if (muffled) [13:11:15.449] invokeRestart("muffleMessage") [13:11:15.449] } [13:11:15.449] else if (inherits(cond, "warning")) { [13:11:15.449] muffled <- grepl(pattern, "muffleWarning") [13:11:15.449] if (muffled) [13:11:15.449] invokeRestart("muffleWarning") [13:11:15.449] } [13:11:15.449] else if (inherits(cond, "condition")) { [13:11:15.449] if (!is.null(pattern)) { [13:11:15.449] computeRestarts <- base::computeRestarts [13:11:15.449] grepl <- base::grepl [13:11:15.449] restarts <- computeRestarts(cond) [13:11:15.449] for (restart in restarts) { [13:11:15.449] name <- restart$name [13:11:15.449] if (is.null(name)) [13:11:15.449] next [13:11:15.449] if (!grepl(pattern, name)) [13:11:15.449] next [13:11:15.449] invokeRestart(restart) [13:11:15.449] muffled <- TRUE [13:11:15.449] break [13:11:15.449] } [13:11:15.449] } [13:11:15.449] } [13:11:15.449] invisible(muffled) [13:11:15.449] } [13:11:15.449] muffleCondition(cond, pattern = "^muffle") [13:11:15.449] } [13:11:15.449] } [13:11:15.449] } [13:11:15.449] })) [13:11:15.449] }, error = function(ex) { [13:11:15.449] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.449] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.449] ...future.rng), started = ...future.startTime, [13:11:15.449] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.449] version = "1.8"), class = "FutureResult") [13:11:15.449] }, finally = { [13:11:15.449] if (!identical(...future.workdir, getwd())) [13:11:15.449] setwd(...future.workdir) [13:11:15.449] { [13:11:15.449] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.449] ...future.oldOptions$nwarnings <- NULL [13:11:15.449] } [13:11:15.449] base::options(...future.oldOptions) [13:11:15.449] if (.Platform$OS.type == "windows") { [13:11:15.449] old_names <- names(...future.oldEnvVars) [13:11:15.449] envs <- base::Sys.getenv() [13:11:15.449] names <- names(envs) [13:11:15.449] common <- intersect(names, old_names) [13:11:15.449] added <- setdiff(names, old_names) [13:11:15.449] removed <- setdiff(old_names, names) [13:11:15.449] changed <- common[...future.oldEnvVars[common] != [13:11:15.449] envs[common]] [13:11:15.449] NAMES <- toupper(changed) [13:11:15.449] args <- list() [13:11:15.449] for (kk in seq_along(NAMES)) { [13:11:15.449] name <- changed[[kk]] [13:11:15.449] NAME <- NAMES[[kk]] [13:11:15.449] if (name != NAME && is.element(NAME, old_names)) [13:11:15.449] next [13:11:15.449] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.449] } [13:11:15.449] NAMES <- toupper(added) [13:11:15.449] for (kk in seq_along(NAMES)) { [13:11:15.449] name <- added[[kk]] [13:11:15.449] NAME <- NAMES[[kk]] [13:11:15.449] if (name != NAME && is.element(NAME, old_names)) [13:11:15.449] next [13:11:15.449] args[[name]] <- "" [13:11:15.449] } [13:11:15.449] NAMES <- toupper(removed) [13:11:15.449] for (kk in seq_along(NAMES)) { [13:11:15.449] name <- removed[[kk]] [13:11:15.449] NAME <- NAMES[[kk]] [13:11:15.449] if (name != NAME && is.element(NAME, old_names)) [13:11:15.449] next [13:11:15.449] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.449] } [13:11:15.449] if (length(args) > 0) [13:11:15.449] base::do.call(base::Sys.setenv, args = args) [13:11:15.449] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.449] } [13:11:15.449] else { [13:11:15.449] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.449] } [13:11:15.449] { [13:11:15.449] if (base::length(...future.futureOptionsAdded) > [13:11:15.449] 0L) { [13:11:15.449] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.449] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.449] base::options(opts) [13:11:15.449] } [13:11:15.449] { [13:11:15.449] NULL [13:11:15.449] options(future.plan = NULL) [13:11:15.449] if (is.na(NA_character_)) [13:11:15.449] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.449] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.449] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.449] .init = FALSE) [13:11:15.449] } [13:11:15.449] } [13:11:15.449] } [13:11:15.449] }) [13:11:15.449] if (TRUE) { [13:11:15.449] base::sink(type = "output", split = FALSE) [13:11:15.449] if (TRUE) { [13:11:15.449] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.449] } [13:11:15.449] else { [13:11:15.449] ...future.result["stdout"] <- base::list(NULL) [13:11:15.449] } [13:11:15.449] base::close(...future.stdout) [13:11:15.449] ...future.stdout <- NULL [13:11:15.449] } [13:11:15.449] ...future.result$conditions <- ...future.conditions [13:11:15.449] ...future.result$finished <- base::Sys.time() [13:11:15.449] ...future.result [13:11:15.449] } [13:11:15.453] - Launch lazy future ... done [13:11:15.454] run() for 'MiraiFuture' ... done [13:11:15.454] Created future: [13:11:15.455] resolved() for 'MiraiFuture' ... [13:11:15.455] - state: 'running' [13:11:15.456] - run: TRUE [13:11:15.457] - result: 'NULL' [13:11:15.457] - resolved: FALSE [13:11:15.457] resolved() for 'MiraiFuture' ... done [13:11:15.454] MiraiFuture: [13:11:15.454] Label: 'future_lapply-2' [13:11:15.454] Expression: [13:11:15.454] { [13:11:15.454] do.call(function(...) { [13:11:15.454] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.454] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.454] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.454] on.exit(options(oopts), add = TRUE) [13:11:15.454] } [13:11:15.454] { [13:11:15.454] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.454] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.454] ...future.FUN(...future.X_jj, ...) [13:11:15.454] }) [13:11:15.454] } [13:11:15.454] }, args = future.call.arguments) [13:11:15.454] } [13:11:15.454] Lazy evaluation: FALSE [13:11:15.454] Asynchronous evaluation: TRUE [13:11:15.454] Local evaluation: TRUE [13:11:15.454] Environment: R_GlobalEnv [13:11:15.454] Capture standard output: TRUE [13:11:15.454] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.454] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.454] Packages: [13:11:15.454] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.454] Resolved: TRUE [13:11:15.454] Value: [13:11:15.454] Conditions captured: [13:11:15.454] Early signaling: FALSE [13:11:15.454] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.454] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.458] Chunk #2 of 3 ... DONE [13:11:15.458] Chunk #3 of 3 ... [13:11:15.458] - Finding globals in 'X' for chunk #3 ... [13:11:15.459] getGlobalsAndPackages() ... [13:11:15.459] Searching for globals... [13:11:15.459] [13:11:15.459] Searching for globals ... DONE [13:11:15.459] - globals: [0] [13:11:15.460] getGlobalsAndPackages() ... DONE [13:11:15.460] + additional globals found: [n=0] [13:11:15.460] + additional namespaces needed: [n=0] [13:11:15.460] - Finding globals in 'X' for chunk #3 ... DONE [13:11:15.460] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:11:15.460] - seeds: [13:11:15.461] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.461] getGlobalsAndPackages() ... [13:11:15.461] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.461] Resolving globals: FALSE [13:11:15.461] Tweak future expression to call with '...' arguments ... [13:11:15.462] { [13:11:15.462] do.call(function(...) { [13:11:15.462] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.462] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.462] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.462] on.exit(options(oopts), add = TRUE) [13:11:15.462] } [13:11:15.462] { [13:11:15.462] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.462] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.462] ...future.FUN(...future.X_jj, ...) [13:11:15.462] }) [13:11:15.462] } [13:11:15.462] }, args = future.call.arguments) [13:11:15.462] } [13:11:15.462] Tweak future expression to call with '...' arguments ... DONE [13:11:15.462] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.463] [13:11:15.463] getGlobalsAndPackages() ... DONE [13:11:15.463] run() for 'Future' ... [13:11:15.463] - state: 'created' [13:11:15.464] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.466] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.466] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.466] - Field: 'label' [13:11:15.466] - Field: 'local' [13:11:15.467] - Field: 'owner' [13:11:15.467] - Field: 'envir' [13:11:15.467] - Field: 'packages' [13:11:15.467] - Field: 'gc' [13:11:15.467] - Field: 'conditions' [13:11:15.468] - Field: 'expr' [13:11:15.468] - Field: 'uuid' [13:11:15.468] - Field: 'seed' [13:11:15.468] - Field: 'version' [13:11:15.468] - Field: 'result' [13:11:15.468] - Field: 'asynchronous' [13:11:15.469] - Field: 'calls' [13:11:15.469] - Field: 'globals' [13:11:15.469] - Field: 'stdout' [13:11:15.469] - Field: 'earlySignal' [13:11:15.469] - Field: 'lazy' [13:11:15.469] - Field: 'state' [13:11:15.470] - Field: '.cluster' [13:11:15.470] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.470] - Launch lazy future ... [13:11:15.470] Packages needed by the future expression (n = 0): [13:11:15.470] Packages needed by future strategies (n = 0): [13:11:15.471] { [13:11:15.471] { [13:11:15.471] { [13:11:15.471] ...future.startTime <- base::Sys.time() [13:11:15.471] { [13:11:15.471] { [13:11:15.471] { [13:11:15.471] base::local({ [13:11:15.471] has_future <- base::requireNamespace("future", [13:11:15.471] quietly = TRUE) [13:11:15.471] if (has_future) { [13:11:15.471] ns <- base::getNamespace("future") [13:11:15.471] version <- ns[[".package"]][["version"]] [13:11:15.471] if (is.null(version)) [13:11:15.471] version <- utils::packageVersion("future") [13:11:15.471] } [13:11:15.471] else { [13:11:15.471] version <- NULL [13:11:15.471] } [13:11:15.471] if (!has_future || version < "1.8.0") { [13:11:15.471] info <- base::c(r_version = base::gsub("R version ", [13:11:15.471] "", base::R.version$version.string), [13:11:15.471] platform = base::sprintf("%s (%s-bit)", [13:11:15.471] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.471] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.471] "release", "version")], collapse = " "), [13:11:15.471] hostname = base::Sys.info()[["nodename"]]) [13:11:15.471] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.471] info) [13:11:15.471] info <- base::paste(info, collapse = "; ") [13:11:15.471] if (!has_future) { [13:11:15.471] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.471] info) [13:11:15.471] } [13:11:15.471] else { [13:11:15.471] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.471] info, version) [13:11:15.471] } [13:11:15.471] base::stop(msg) [13:11:15.471] } [13:11:15.471] }) [13:11:15.471] } [13:11:15.471] ...future.strategy.old <- future::plan("list") [13:11:15.471] options(future.plan = NULL) [13:11:15.471] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.471] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.471] } [13:11:15.471] ...future.workdir <- getwd() [13:11:15.471] } [13:11:15.471] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.471] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.471] } [13:11:15.471] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.471] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:11:15.471] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.471] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.471] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.471] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.471] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.471] base::names(...future.oldOptions)) [13:11:15.471] } [13:11:15.471] if (FALSE) { [13:11:15.471] } [13:11:15.471] else { [13:11:15.471] if (TRUE) { [13:11:15.471] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.471] open = "w") [13:11:15.471] } [13:11:15.471] else { [13:11:15.471] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.471] windows = "NUL", "/dev/null"), open = "w") [13:11:15.471] } [13:11:15.471] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.471] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.471] base::sink(type = "output", split = FALSE) [13:11:15.471] base::close(...future.stdout) [13:11:15.471] }, add = TRUE) [13:11:15.471] } [13:11:15.471] ...future.frame <- base::sys.nframe() [13:11:15.471] ...future.conditions <- base::list() [13:11:15.471] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.471] if (FALSE) { [13:11:15.471] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.471] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.471] } [13:11:15.471] ...future.result <- base::tryCatch({ [13:11:15.471] base::withCallingHandlers({ [13:11:15.471] ...future.value <- base::withVisible(base::local({ [13:11:15.471] do.call(function(...) { [13:11:15.471] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.471] if (!identical(...future.globals.maxSize.org, [13:11:15.471] ...future.globals.maxSize)) { [13:11:15.471] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.471] on.exit(options(oopts), add = TRUE) [13:11:15.471] } [13:11:15.471] { [13:11:15.471] lapply(seq_along(...future.elements_ii), [13:11:15.471] FUN = function(jj) { [13:11:15.471] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.471] ...future.FUN(...future.X_jj, ...) [13:11:15.471] }) [13:11:15.471] } [13:11:15.471] }, args = future.call.arguments) [13:11:15.471] })) [13:11:15.471] future::FutureResult(value = ...future.value$value, [13:11:15.471] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.471] ...future.rng), globalenv = if (FALSE) [13:11:15.471] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.471] ...future.globalenv.names)) [13:11:15.471] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.471] }, condition = base::local({ [13:11:15.471] c <- base::c [13:11:15.471] inherits <- base::inherits [13:11:15.471] invokeRestart <- base::invokeRestart [13:11:15.471] length <- base::length [13:11:15.471] list <- base::list [13:11:15.471] seq.int <- base::seq.int [13:11:15.471] signalCondition <- base::signalCondition [13:11:15.471] sys.calls <- base::sys.calls [13:11:15.471] `[[` <- base::`[[` [13:11:15.471] `+` <- base::`+` [13:11:15.471] `<<-` <- base::`<<-` [13:11:15.471] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.471] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.471] 3L)] [13:11:15.471] } [13:11:15.471] function(cond) { [13:11:15.471] is_error <- inherits(cond, "error") [13:11:15.471] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.471] NULL) [13:11:15.471] if (is_error) { [13:11:15.471] sessionInformation <- function() { [13:11:15.471] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.471] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.471] search = base::search(), system = base::Sys.info()) [13:11:15.471] } [13:11:15.471] ...future.conditions[[length(...future.conditions) + [13:11:15.471] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.471] cond$call), session = sessionInformation(), [13:11:15.471] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.471] signalCondition(cond) [13:11:15.471] } [13:11:15.471] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.471] signal <- FALSE && inherits(cond, character(0)) [13:11:15.471] ...future.conditions[[length(...future.conditions) + [13:11:15.471] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.471] if (FALSE && !signal) { [13:11:15.471] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.471] { [13:11:15.471] inherits <- base::inherits [13:11:15.471] invokeRestart <- base::invokeRestart [13:11:15.471] is.null <- base::is.null [13:11:15.471] muffled <- FALSE [13:11:15.471] if (inherits(cond, "message")) { [13:11:15.471] muffled <- grepl(pattern, "muffleMessage") [13:11:15.471] if (muffled) [13:11:15.471] invokeRestart("muffleMessage") [13:11:15.471] } [13:11:15.471] else if (inherits(cond, "warning")) { [13:11:15.471] muffled <- grepl(pattern, "muffleWarning") [13:11:15.471] if (muffled) [13:11:15.471] invokeRestart("muffleWarning") [13:11:15.471] } [13:11:15.471] else if (inherits(cond, "condition")) { [13:11:15.471] if (!is.null(pattern)) { [13:11:15.471] computeRestarts <- base::computeRestarts [13:11:15.471] grepl <- base::grepl [13:11:15.471] restarts <- computeRestarts(cond) [13:11:15.471] for (restart in restarts) { [13:11:15.471] name <- restart$name [13:11:15.471] if (is.null(name)) [13:11:15.471] next [13:11:15.471] if (!grepl(pattern, name)) [13:11:15.471] next [13:11:15.471] invokeRestart(restart) [13:11:15.471] muffled <- TRUE [13:11:15.471] break [13:11:15.471] } [13:11:15.471] } [13:11:15.471] } [13:11:15.471] invisible(muffled) [13:11:15.471] } [13:11:15.471] muffleCondition(cond, pattern = "^muffle") [13:11:15.471] } [13:11:15.471] } [13:11:15.471] else { [13:11:15.471] if (TRUE) { [13:11:15.471] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.471] { [13:11:15.471] inherits <- base::inherits [13:11:15.471] invokeRestart <- base::invokeRestart [13:11:15.471] is.null <- base::is.null [13:11:15.471] muffled <- FALSE [13:11:15.471] if (inherits(cond, "message")) { [13:11:15.471] muffled <- grepl(pattern, "muffleMessage") [13:11:15.471] if (muffled) [13:11:15.471] invokeRestart("muffleMessage") [13:11:15.471] } [13:11:15.471] else if (inherits(cond, "warning")) { [13:11:15.471] muffled <- grepl(pattern, "muffleWarning") [13:11:15.471] if (muffled) [13:11:15.471] invokeRestart("muffleWarning") [13:11:15.471] } [13:11:15.471] else if (inherits(cond, "condition")) { [13:11:15.471] if (!is.null(pattern)) { [13:11:15.471] computeRestarts <- base::computeRestarts [13:11:15.471] grepl <- base::grepl [13:11:15.471] restarts <- computeRestarts(cond) [13:11:15.471] for (restart in restarts) { [13:11:15.471] name <- restart$name [13:11:15.471] if (is.null(name)) [13:11:15.471] next [13:11:15.471] if (!grepl(pattern, name)) [13:11:15.471] next [13:11:15.471] invokeRestart(restart) [13:11:15.471] muffled <- TRUE [13:11:15.471] break [13:11:15.471] } [13:11:15.471] } [13:11:15.471] } [13:11:15.471] invisible(muffled) [13:11:15.471] } [13:11:15.471] muffleCondition(cond, pattern = "^muffle") [13:11:15.471] } [13:11:15.471] } [13:11:15.471] } [13:11:15.471] })) [13:11:15.471] }, error = function(ex) { [13:11:15.471] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.471] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.471] ...future.rng), started = ...future.startTime, [13:11:15.471] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.471] version = "1.8"), class = "FutureResult") [13:11:15.471] }, finally = { [13:11:15.471] if (!identical(...future.workdir, getwd())) [13:11:15.471] setwd(...future.workdir) [13:11:15.471] { [13:11:15.471] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.471] ...future.oldOptions$nwarnings <- NULL [13:11:15.471] } [13:11:15.471] base::options(...future.oldOptions) [13:11:15.471] if (.Platform$OS.type == "windows") { [13:11:15.471] old_names <- names(...future.oldEnvVars) [13:11:15.471] envs <- base::Sys.getenv() [13:11:15.471] names <- names(envs) [13:11:15.471] common <- intersect(names, old_names) [13:11:15.471] added <- setdiff(names, old_names) [13:11:15.471] removed <- setdiff(old_names, names) [13:11:15.471] changed <- common[...future.oldEnvVars[common] != [13:11:15.471] envs[common]] [13:11:15.471] NAMES <- toupper(changed) [13:11:15.471] args <- list() [13:11:15.471] for (kk in seq_along(NAMES)) { [13:11:15.471] name <- changed[[kk]] [13:11:15.471] NAME <- NAMES[[kk]] [13:11:15.471] if (name != NAME && is.element(NAME, old_names)) [13:11:15.471] next [13:11:15.471] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.471] } [13:11:15.471] NAMES <- toupper(added) [13:11:15.471] for (kk in seq_along(NAMES)) { [13:11:15.471] name <- added[[kk]] [13:11:15.471] NAME <- NAMES[[kk]] [13:11:15.471] if (name != NAME && is.element(NAME, old_names)) [13:11:15.471] next [13:11:15.471] args[[name]] <- "" [13:11:15.471] } [13:11:15.471] NAMES <- toupper(removed) [13:11:15.471] for (kk in seq_along(NAMES)) { [13:11:15.471] name <- removed[[kk]] [13:11:15.471] NAME <- NAMES[[kk]] [13:11:15.471] if (name != NAME && is.element(NAME, old_names)) [13:11:15.471] next [13:11:15.471] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.471] } [13:11:15.471] if (length(args) > 0) [13:11:15.471] base::do.call(base::Sys.setenv, args = args) [13:11:15.471] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.471] } [13:11:15.471] else { [13:11:15.471] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.471] } [13:11:15.471] { [13:11:15.471] if (base::length(...future.futureOptionsAdded) > [13:11:15.471] 0L) { [13:11:15.471] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.471] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.471] base::options(opts) [13:11:15.471] } [13:11:15.471] { [13:11:15.471] NULL [13:11:15.471] options(future.plan = NULL) [13:11:15.471] if (is.na(NA_character_)) [13:11:15.471] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.471] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.471] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.471] .init = FALSE) [13:11:15.471] } [13:11:15.471] } [13:11:15.471] } [13:11:15.471] }) [13:11:15.471] if (TRUE) { [13:11:15.471] base::sink(type = "output", split = FALSE) [13:11:15.471] if (TRUE) { [13:11:15.471] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.471] } [13:11:15.471] else { [13:11:15.471] ...future.result["stdout"] <- base::list(NULL) [13:11:15.471] } [13:11:15.471] base::close(...future.stdout) [13:11:15.471] ...future.stdout <- NULL [13:11:15.471] } [13:11:15.471] ...future.result$conditions <- ...future.conditions [13:11:15.471] ...future.result$finished <- base::Sys.time() [13:11:15.471] ...future.result [13:11:15.471] } [13:11:15.475] - Launch lazy future ... done [13:11:15.476] run() for 'MiraiFuture' ... done [13:11:15.476] Created future: [13:11:15.477] resolved() for 'MiraiFuture' ... [13:11:15.477] - state: 'running' [13:11:15.477] - run: TRUE [13:11:15.478] - result: 'NULL' [13:11:15.478] - resolved: FALSE [13:11:15.478] resolved() for 'MiraiFuture' ... done [13:11:15.476] MiraiFuture: [13:11:15.476] Label: 'future_lapply-3' [13:11:15.476] Expression: [13:11:15.476] { [13:11:15.476] do.call(function(...) { [13:11:15.476] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.476] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.476] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.476] on.exit(options(oopts), add = TRUE) [13:11:15.476] } [13:11:15.476] { [13:11:15.476] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.476] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.476] ...future.FUN(...future.X_jj, ...) [13:11:15.476] }) [13:11:15.476] } [13:11:15.476] }, args = future.call.arguments) [13:11:15.476] } [13:11:15.476] Lazy evaluation: FALSE [13:11:15.476] Asynchronous evaluation: TRUE [13:11:15.476] Local evaluation: TRUE [13:11:15.476] Environment: R_GlobalEnv [13:11:15.476] Capture standard output: TRUE [13:11:15.476] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.476] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.476] Packages: [13:11:15.476] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.476] Resolved: TRUE [13:11:15.476] Value: [13:11:15.476] Conditions captured: [13:11:15.476] Early signaling: FALSE [13:11:15.476] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.476] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.478] Chunk #3 of 3 ... DONE [13:11:15.479] Launching 3 futures (chunks) ... DONE [13:11:15.479] Resolving 3 futures (chunks) ... [13:11:15.479] resolve() on list ... [13:11:15.479] recursive: 0 [13:11:15.479] length: 3 [13:11:15.479] [13:11:15.480] resolved() for 'MiraiFuture' ... [13:11:15.480] - state: 'running' [13:11:15.480] - run: TRUE [13:11:15.480] - result: 'NULL' [13:11:15.480] - resolved: FALSE [13:11:15.481] resolved() for 'MiraiFuture' ... done [13:11:15.481] Future #1 [13:11:15.481] signalConditionsASAP(MiraiFuture, pos=1) ... [13:11:15.481] - nx: 3 [13:11:15.481] - relay: TRUE [13:11:15.481] - stdout: TRUE [13:11:15.482] - signal: TRUE [13:11:15.482] - resignal: FALSE [13:11:15.482] - force: TRUE [13:11:15.482] - relayed: [n=3] FALSE, FALSE, FALSE [13:11:15.482] - queued futures: [n=3] FALSE, FALSE, FALSE [13:11:15.482] - until=1 [13:11:15.483] - relaying element #1 [13:11:15.483] - relayed: [n=3] TRUE, FALSE, FALSE [13:11:15.483] - queued futures: [n=3] TRUE, FALSE, FALSE [13:11:15.483] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:11:15.483] length: 2 (resolved future 1) [13:11:15.484] resolved() for 'MiraiFuture' ... [13:11:15.484] - state: 'running' [13:11:15.484] - run: TRUE [13:11:15.484] - result: 'NULL' [13:11:15.484] - resolved: FALSE [13:11:15.485] resolved() for 'MiraiFuture' ... done [13:11:15.485] Future #2 [13:11:15.485] signalConditionsASAP(MiraiFuture, pos=2) ... [13:11:15.485] - nx: 3 [13:11:15.485] - relay: TRUE [13:11:15.485] - stdout: TRUE [13:11:15.486] - signal: TRUE [13:11:15.486] - resignal: FALSE [13:11:15.486] - force: TRUE [13:11:15.486] - relayed: [n=3] TRUE, FALSE, FALSE [13:11:15.486] - queued futures: [n=3] TRUE, FALSE, FALSE [13:11:15.486] - until=2 [13:11:15.487] - relaying element #2 [13:11:15.487] - relayed: [n=3] TRUE, TRUE, FALSE [13:11:15.487] - queued futures: [n=3] TRUE, TRUE, FALSE [13:11:15.487] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:11:15.487] length: 1 (resolved future 2) [13:11:15.488] resolved() for 'MiraiFuture' ... [13:11:15.488] - state: 'running' [13:11:15.488] - run: TRUE [13:11:15.488] - result: 'NULL' [13:11:15.489] - resolved: FALSE [13:11:15.489] resolved() for 'MiraiFuture' ... done [13:11:15.489] Future #3 [13:11:15.489] signalConditionsASAP(MiraiFuture, pos=3) ... [13:11:15.490] - nx: 3 [13:11:15.490] - relay: TRUE [13:11:15.490] - stdout: TRUE [13:11:15.490] - signal: TRUE [13:11:15.490] - resignal: FALSE [13:11:15.491] - force: TRUE [13:11:15.491] - relayed: [n=3] TRUE, TRUE, FALSE [13:11:15.491] - queued futures: [n=3] TRUE, TRUE, FALSE [13:11:15.491] - until=3 [13:11:15.491] - relaying element #3 [13:11:15.493] - relayed: [n=3] TRUE, TRUE, TRUE [13:11:15.493] - queued futures: [n=3] TRUE, TRUE, TRUE [13:11:15.493] signalConditionsASAP(MiraiFuture, pos=3) ... done [13:11:15.494] length: 0 (resolved future 3) [13:11:15.494] Relaying remaining futures [13:11:15.494] signalConditionsASAP(NULL, pos=0) ... [13:11:15.494] - nx: 3 [13:11:15.494] - relay: TRUE [13:11:15.494] - stdout: TRUE [13:11:15.494] - signal: TRUE [13:11:15.495] - resignal: FALSE [13:11:15.495] - force: TRUE [13:11:15.495] - relayed: [n=3] TRUE, TRUE, TRUE [13:11:15.495] - queued futures: [n=3] TRUE, TRUE, TRUE - flush all [13:11:15.495] - relayed: [n=3] TRUE, TRUE, TRUE [13:11:15.496] - queued futures: [n=3] TRUE, TRUE, TRUE [13:11:15.496] signalConditionsASAP(NULL, pos=0) ... done [13:11:15.496] resolve() on list ... DONE [13:11:15.496] - Number of value chunks collected: 3 [13:11:15.496] Resolving 3 futures (chunks) ... DONE [13:11:15.497] Reducing values from 3 chunks ... [13:11:15.497] - Number of values collected after concatenation: 3 [13:11:15.497] - Number of values expected: 3 [13:11:15.497] Reducing values from 3 chunks ... DONE [13:11:15.497] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:11:15.500] future_lapply() ... [13:11:15.501] Number of chunks: 2 [13:11:15.501] getGlobalsAndPackagesXApply() ... [13:11:15.501] - future.globals: TRUE [13:11:15.502] getGlobalsAndPackages() ... [13:11:15.502] Searching for globals... [13:11:15.503] - globals found: [2] 'FUN', '.Internal' [13:11:15.504] Searching for globals ... DONE [13:11:15.504] Resolving globals: FALSE [13:11:15.504] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:11:15.505] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:11:15.505] - globals: [1] 'FUN' [13:11:15.505] [13:11:15.505] getGlobalsAndPackages() ... DONE [13:11:15.505] - globals found/used: [n=1] 'FUN' [13:11:15.506] - needed namespaces: [n=0] [13:11:15.506] Finding globals ... DONE [13:11:15.506] - use_args: TRUE [13:11:15.506] - Getting '...' globals ... [13:11:15.507] resolve() on list ... [13:11:15.507] recursive: 0 [13:11:15.507] length: 1 [13:11:15.507] elements: '...' [13:11:15.507] length: 0 (resolved future 1) [13:11:15.507] resolve() on list ... DONE [13:11:15.508] - '...' content: [n=1] 'length' [13:11:15.508] List of 1 [13:11:15.508] $ ...:List of 1 [13:11:15.508] ..$ length: int 2 [13:11:15.508] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.508] - attr(*, "where")=List of 1 [13:11:15.508] ..$ ...: [13:11:15.508] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.508] - attr(*, "resolved")= logi TRUE [13:11:15.508] - attr(*, "total_size")= num NA [13:11:15.512] - Getting '...' globals ... DONE [13:11:15.512] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:11:15.512] List of 2 [13:11:15.512] $ ...future.FUN:function (mode = "logical", length = 0L) [13:11:15.512] $ ... :List of 1 [13:11:15.512] ..$ length: int 2 [13:11:15.512] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.512] - attr(*, "where")=List of 2 [13:11:15.512] ..$ ...future.FUN: [13:11:15.512] ..$ ... : [13:11:15.512] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.512] - attr(*, "resolved")= logi FALSE [13:11:15.512] - attr(*, "total_size")= num 2240 [13:11:15.517] Packages to be attached in all futures: [n=0] [13:11:15.517] getGlobalsAndPackagesXApply() ... DONE [13:11:15.517] Number of futures (= number of chunks): 2 [13:11:15.517] Launching 2 futures (chunks) ... [13:11:15.518] Chunk #1 of 2 ... [13:11:15.518] - Finding globals in 'X' for chunk #1 ... [13:11:15.518] getGlobalsAndPackages() ... [13:11:15.518] Searching for globals... [13:11:15.520] [13:11:15.520] Searching for globals ... DONE [13:11:15.520] - globals: [0] [13:11:15.520] getGlobalsAndPackages() ... DONE [13:11:15.520] + additional globals found: [n=0] [13:11:15.521] + additional namespaces needed: [n=0] [13:11:15.521] - Finding globals in 'X' for chunk #1 ... DONE [13:11:15.521] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:11:15.521] - seeds: [13:11:15.521] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.521] getGlobalsAndPackages() ... [13:11:15.522] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.522] Resolving globals: FALSE [13:11:15.522] Tweak future expression to call with '...' arguments ... [13:11:15.522] { [13:11:15.522] do.call(function(...) { [13:11:15.522] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.522] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.522] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.522] on.exit(options(oopts), add = TRUE) [13:11:15.522] } [13:11:15.522] { [13:11:15.522] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.522] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.522] ...future.FUN(...future.X_jj, ...) [13:11:15.522] }) [13:11:15.522] } [13:11:15.522] }, args = future.call.arguments) [13:11:15.522] } [13:11:15.523] Tweak future expression to call with '...' arguments ... DONE [13:11:15.523] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.524] [13:11:15.524] getGlobalsAndPackages() ... DONE [13:11:15.524] run() for 'Future' ... [13:11:15.524] - state: 'created' [13:11:15.525] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.527] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.527] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.528] - Field: 'label' [13:11:15.528] - Field: 'local' [13:11:15.528] - Field: 'owner' [13:11:15.528] - Field: 'envir' [13:11:15.528] - Field: 'packages' [13:11:15.528] - Field: 'gc' [13:11:15.529] - Field: 'conditions' [13:11:15.529] - Field: 'expr' [13:11:15.529] - Field: 'uuid' [13:11:15.529] - Field: 'seed' [13:11:15.529] - Field: 'version' [13:11:15.529] - Field: 'result' [13:11:15.530] - Field: 'asynchronous' [13:11:15.530] - Field: 'calls' [13:11:15.530] - Field: 'globals' [13:11:15.530] - Field: 'stdout' [13:11:15.530] - Field: 'earlySignal' [13:11:15.530] - Field: 'lazy' [13:11:15.531] - Field: 'state' [13:11:15.531] - Field: '.cluster' [13:11:15.531] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.531] - Launch lazy future ... [13:11:15.531] Packages needed by the future expression (n = 0): [13:11:15.532] Packages needed by future strategies (n = 0): [13:11:15.532] { [13:11:15.532] { [13:11:15.532] { [13:11:15.532] ...future.startTime <- base::Sys.time() [13:11:15.532] { [13:11:15.532] { [13:11:15.532] { [13:11:15.532] base::local({ [13:11:15.532] has_future <- base::requireNamespace("future", [13:11:15.532] quietly = TRUE) [13:11:15.532] if (has_future) { [13:11:15.532] ns <- base::getNamespace("future") [13:11:15.532] version <- ns[[".package"]][["version"]] [13:11:15.532] if (is.null(version)) [13:11:15.532] version <- utils::packageVersion("future") [13:11:15.532] } [13:11:15.532] else { [13:11:15.532] version <- NULL [13:11:15.532] } [13:11:15.532] if (!has_future || version < "1.8.0") { [13:11:15.532] info <- base::c(r_version = base::gsub("R version ", [13:11:15.532] "", base::R.version$version.string), [13:11:15.532] platform = base::sprintf("%s (%s-bit)", [13:11:15.532] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.532] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.532] "release", "version")], collapse = " "), [13:11:15.532] hostname = base::Sys.info()[["nodename"]]) [13:11:15.532] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.532] info) [13:11:15.532] info <- base::paste(info, collapse = "; ") [13:11:15.532] if (!has_future) { [13:11:15.532] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.532] info) [13:11:15.532] } [13:11:15.532] else { [13:11:15.532] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.532] info, version) [13:11:15.532] } [13:11:15.532] base::stop(msg) [13:11:15.532] } [13:11:15.532] }) [13:11:15.532] } [13:11:15.532] ...future.strategy.old <- future::plan("list") [13:11:15.532] options(future.plan = NULL) [13:11:15.532] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.532] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.532] } [13:11:15.532] ...future.workdir <- getwd() [13:11:15.532] } [13:11:15.532] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.532] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.532] } [13:11:15.532] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.532] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:11:15.532] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.532] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.532] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.532] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.532] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.532] base::names(...future.oldOptions)) [13:11:15.532] } [13:11:15.532] if (FALSE) { [13:11:15.532] } [13:11:15.532] else { [13:11:15.532] if (TRUE) { [13:11:15.532] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.532] open = "w") [13:11:15.532] } [13:11:15.532] else { [13:11:15.532] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.532] windows = "NUL", "/dev/null"), open = "w") [13:11:15.532] } [13:11:15.532] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.532] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.532] base::sink(type = "output", split = FALSE) [13:11:15.532] base::close(...future.stdout) [13:11:15.532] }, add = TRUE) [13:11:15.532] } [13:11:15.532] ...future.frame <- base::sys.nframe() [13:11:15.532] ...future.conditions <- base::list() [13:11:15.532] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.532] if (FALSE) { [13:11:15.532] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.532] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.532] } [13:11:15.532] ...future.result <- base::tryCatch({ [13:11:15.532] base::withCallingHandlers({ [13:11:15.532] ...future.value <- base::withVisible(base::local({ [13:11:15.532] do.call(function(...) { [13:11:15.532] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.532] if (!identical(...future.globals.maxSize.org, [13:11:15.532] ...future.globals.maxSize)) { [13:11:15.532] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.532] on.exit(options(oopts), add = TRUE) [13:11:15.532] } [13:11:15.532] { [13:11:15.532] lapply(seq_along(...future.elements_ii), [13:11:15.532] FUN = function(jj) { [13:11:15.532] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.532] ...future.FUN(...future.X_jj, ...) [13:11:15.532] }) [13:11:15.532] } [13:11:15.532] }, args = future.call.arguments) [13:11:15.532] })) [13:11:15.532] future::FutureResult(value = ...future.value$value, [13:11:15.532] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.532] ...future.rng), globalenv = if (FALSE) [13:11:15.532] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.532] ...future.globalenv.names)) [13:11:15.532] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.532] }, condition = base::local({ [13:11:15.532] c <- base::c [13:11:15.532] inherits <- base::inherits [13:11:15.532] invokeRestart <- base::invokeRestart [13:11:15.532] length <- base::length [13:11:15.532] list <- base::list [13:11:15.532] seq.int <- base::seq.int [13:11:15.532] signalCondition <- base::signalCondition [13:11:15.532] sys.calls <- base::sys.calls [13:11:15.532] `[[` <- base::`[[` [13:11:15.532] `+` <- base::`+` [13:11:15.532] `<<-` <- base::`<<-` [13:11:15.532] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.532] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.532] 3L)] [13:11:15.532] } [13:11:15.532] function(cond) { [13:11:15.532] is_error <- inherits(cond, "error") [13:11:15.532] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.532] NULL) [13:11:15.532] if (is_error) { [13:11:15.532] sessionInformation <- function() { [13:11:15.532] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.532] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.532] search = base::search(), system = base::Sys.info()) [13:11:15.532] } [13:11:15.532] ...future.conditions[[length(...future.conditions) + [13:11:15.532] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.532] cond$call), session = sessionInformation(), [13:11:15.532] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.532] signalCondition(cond) [13:11:15.532] } [13:11:15.532] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.532] signal <- FALSE && inherits(cond, character(0)) [13:11:15.532] ...future.conditions[[length(...future.conditions) + [13:11:15.532] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.532] if (FALSE && !signal) { [13:11:15.532] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.532] { [13:11:15.532] inherits <- base::inherits [13:11:15.532] invokeRestart <- base::invokeRestart [13:11:15.532] is.null <- base::is.null [13:11:15.532] muffled <- FALSE [13:11:15.532] if (inherits(cond, "message")) { [13:11:15.532] muffled <- grepl(pattern, "muffleMessage") [13:11:15.532] if (muffled) [13:11:15.532] invokeRestart("muffleMessage") [13:11:15.532] } [13:11:15.532] else if (inherits(cond, "warning")) { [13:11:15.532] muffled <- grepl(pattern, "muffleWarning") [13:11:15.532] if (muffled) [13:11:15.532] invokeRestart("muffleWarning") [13:11:15.532] } [13:11:15.532] else if (inherits(cond, "condition")) { [13:11:15.532] if (!is.null(pattern)) { [13:11:15.532] computeRestarts <- base::computeRestarts [13:11:15.532] grepl <- base::grepl [13:11:15.532] restarts <- computeRestarts(cond) [13:11:15.532] for (restart in restarts) { [13:11:15.532] name <- restart$name [13:11:15.532] if (is.null(name)) [13:11:15.532] next [13:11:15.532] if (!grepl(pattern, name)) [13:11:15.532] next [13:11:15.532] invokeRestart(restart) [13:11:15.532] muffled <- TRUE [13:11:15.532] break [13:11:15.532] } [13:11:15.532] } [13:11:15.532] } [13:11:15.532] invisible(muffled) [13:11:15.532] } [13:11:15.532] muffleCondition(cond, pattern = "^muffle") [13:11:15.532] } [13:11:15.532] } [13:11:15.532] else { [13:11:15.532] if (TRUE) { [13:11:15.532] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.532] { [13:11:15.532] inherits <- base::inherits [13:11:15.532] invokeRestart <- base::invokeRestart [13:11:15.532] is.null <- base::is.null [13:11:15.532] muffled <- FALSE [13:11:15.532] if (inherits(cond, "message")) { [13:11:15.532] muffled <- grepl(pattern, "muffleMessage") [13:11:15.532] if (muffled) [13:11:15.532] invokeRestart("muffleMessage") [13:11:15.532] } [13:11:15.532] else if (inherits(cond, "warning")) { [13:11:15.532] muffled <- grepl(pattern, "muffleWarning") [13:11:15.532] if (muffled) [13:11:15.532] invokeRestart("muffleWarning") [13:11:15.532] } [13:11:15.532] else if (inherits(cond, "condition")) { [13:11:15.532] if (!is.null(pattern)) { [13:11:15.532] computeRestarts <- base::computeRestarts [13:11:15.532] grepl <- base::grepl [13:11:15.532] restarts <- computeRestarts(cond) [13:11:15.532] for (restart in restarts) { [13:11:15.532] name <- restart$name [13:11:15.532] if (is.null(name)) [13:11:15.532] next [13:11:15.532] if (!grepl(pattern, name)) [13:11:15.532] next [13:11:15.532] invokeRestart(restart) [13:11:15.532] muffled <- TRUE [13:11:15.532] break [13:11:15.532] } [13:11:15.532] } [13:11:15.532] } [13:11:15.532] invisible(muffled) [13:11:15.532] } [13:11:15.532] muffleCondition(cond, pattern = "^muffle") [13:11:15.532] } [13:11:15.532] } [13:11:15.532] } [13:11:15.532] })) [13:11:15.532] }, error = function(ex) { [13:11:15.532] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.532] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.532] ...future.rng), started = ...future.startTime, [13:11:15.532] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.532] version = "1.8"), class = "FutureResult") [13:11:15.532] }, finally = { [13:11:15.532] if (!identical(...future.workdir, getwd())) [13:11:15.532] setwd(...future.workdir) [13:11:15.532] { [13:11:15.532] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.532] ...future.oldOptions$nwarnings <- NULL [13:11:15.532] } [13:11:15.532] base::options(...future.oldOptions) [13:11:15.532] if (.Platform$OS.type == "windows") { [13:11:15.532] old_names <- names(...future.oldEnvVars) [13:11:15.532] envs <- base::Sys.getenv() [13:11:15.532] names <- names(envs) [13:11:15.532] common <- intersect(names, old_names) [13:11:15.532] added <- setdiff(names, old_names) [13:11:15.532] removed <- setdiff(old_names, names) [13:11:15.532] changed <- common[...future.oldEnvVars[common] != [13:11:15.532] envs[common]] [13:11:15.532] NAMES <- toupper(changed) [13:11:15.532] args <- list() [13:11:15.532] for (kk in seq_along(NAMES)) { [13:11:15.532] name <- changed[[kk]] [13:11:15.532] NAME <- NAMES[[kk]] [13:11:15.532] if (name != NAME && is.element(NAME, old_names)) [13:11:15.532] next [13:11:15.532] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.532] } [13:11:15.532] NAMES <- toupper(added) [13:11:15.532] for (kk in seq_along(NAMES)) { [13:11:15.532] name <- added[[kk]] [13:11:15.532] NAME <- NAMES[[kk]] [13:11:15.532] if (name != NAME && is.element(NAME, old_names)) [13:11:15.532] next [13:11:15.532] args[[name]] <- "" [13:11:15.532] } [13:11:15.532] NAMES <- toupper(removed) [13:11:15.532] for (kk in seq_along(NAMES)) { [13:11:15.532] name <- removed[[kk]] [13:11:15.532] NAME <- NAMES[[kk]] [13:11:15.532] if (name != NAME && is.element(NAME, old_names)) [13:11:15.532] next [13:11:15.532] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.532] } [13:11:15.532] if (length(args) > 0) [13:11:15.532] base::do.call(base::Sys.setenv, args = args) [13:11:15.532] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.532] } [13:11:15.532] else { [13:11:15.532] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.532] } [13:11:15.532] { [13:11:15.532] if (base::length(...future.futureOptionsAdded) > [13:11:15.532] 0L) { [13:11:15.532] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.532] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.532] base::options(opts) [13:11:15.532] } [13:11:15.532] { [13:11:15.532] NULL [13:11:15.532] options(future.plan = NULL) [13:11:15.532] if (is.na(NA_character_)) [13:11:15.532] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.532] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.532] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.532] .init = FALSE) [13:11:15.532] } [13:11:15.532] } [13:11:15.532] } [13:11:15.532] }) [13:11:15.532] if (TRUE) { [13:11:15.532] base::sink(type = "output", split = FALSE) [13:11:15.532] if (TRUE) { [13:11:15.532] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.532] } [13:11:15.532] else { [13:11:15.532] ...future.result["stdout"] <- base::list(NULL) [13:11:15.532] } [13:11:15.532] base::close(...future.stdout) [13:11:15.532] ...future.stdout <- NULL [13:11:15.532] } [13:11:15.532] ...future.result$conditions <- ...future.conditions [13:11:15.532] ...future.result$finished <- base::Sys.time() [13:11:15.532] ...future.result [13:11:15.532] } [13:11:15.536] - Launch lazy future ... done [13:11:15.536] run() for 'MiraiFuture' ... done [13:11:15.537] Created future: [13:11:15.538] resolved() for 'MiraiFuture' ... [13:11:15.538] - state: 'running' [13:11:15.538] - run: TRUE [13:11:15.538] - result: 'NULL' [13:11:15.539] - resolved: FALSE [13:11:15.539] resolved() for 'MiraiFuture' ... done [13:11:15.537] MiraiFuture: [13:11:15.537] Label: 'future_lapply-1' [13:11:15.537] Expression: [13:11:15.537] { [13:11:15.537] do.call(function(...) { [13:11:15.537] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.537] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.537] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.537] on.exit(options(oopts), add = TRUE) [13:11:15.537] } [13:11:15.537] { [13:11:15.537] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.537] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.537] ...future.FUN(...future.X_jj, ...) [13:11:15.537] }) [13:11:15.537] } [13:11:15.537] }, args = future.call.arguments) [13:11:15.537] } [13:11:15.537] Lazy evaluation: FALSE [13:11:15.537] Asynchronous evaluation: TRUE [13:11:15.537] Local evaluation: TRUE [13:11:15.537] Environment: R_GlobalEnv [13:11:15.537] Capture standard output: TRUE [13:11:15.537] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.537] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.537] Packages: [13:11:15.537] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.537] Resolved: TRUE [13:11:15.537] Value: [13:11:15.537] Conditions captured: [13:11:15.537] Early signaling: FALSE [13:11:15.537] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.537] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.539] Chunk #1 of 2 ... DONE [13:11:15.539] Chunk #2 of 2 ... [13:11:15.540] - Finding globals in 'X' for chunk #2 ... [13:11:15.540] getGlobalsAndPackages() ... [13:11:15.540] Searching for globals... [13:11:15.540] [13:11:15.540] Searching for globals ... DONE [13:11:15.541] - globals: [0] [13:11:15.541] getGlobalsAndPackages() ... DONE [13:11:15.541] + additional globals found: [n=0] [13:11:15.541] + additional namespaces needed: [n=0] [13:11:15.541] - Finding globals in 'X' for chunk #2 ... DONE [13:11:15.541] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:11:15.541] - seeds: [13:11:15.542] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.542] getGlobalsAndPackages() ... [13:11:15.542] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.542] Resolving globals: FALSE [13:11:15.542] Tweak future expression to call with '...' arguments ... [13:11:15.543] { [13:11:15.543] do.call(function(...) { [13:11:15.543] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.543] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.543] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.543] on.exit(options(oopts), add = TRUE) [13:11:15.543] } [13:11:15.543] { [13:11:15.543] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.543] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.543] ...future.FUN(...future.X_jj, ...) [13:11:15.543] }) [13:11:15.543] } [13:11:15.543] }, args = future.call.arguments) [13:11:15.543] } [13:11:15.543] Tweak future expression to call with '...' arguments ... DONE [13:11:15.543] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.544] [13:11:15.544] getGlobalsAndPackages() ... DONE [13:11:15.544] run() for 'Future' ... [13:11:15.544] - state: 'created' [13:11:15.544] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.547] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.547] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.547] - Field: 'label' [13:11:15.547] - Field: 'local' [13:11:15.548] - Field: 'owner' [13:11:15.548] - Field: 'envir' [13:11:15.548] - Field: 'packages' [13:11:15.548] - Field: 'gc' [13:11:15.548] - Field: 'conditions' [13:11:15.548] - Field: 'expr' [13:11:15.549] - Field: 'uuid' [13:11:15.549] - Field: 'seed' [13:11:15.549] - Field: 'version' [13:11:15.549] - Field: 'result' [13:11:15.549] - Field: 'asynchronous' [13:11:15.550] - Field: 'calls' [13:11:15.550] - Field: 'globals' [13:11:15.550] - Field: 'stdout' [13:11:15.550] - Field: 'earlySignal' [13:11:15.550] - Field: 'lazy' [13:11:15.551] - Field: 'state' [13:11:15.551] - Field: '.cluster' [13:11:15.551] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.551] - Launch lazy future ... [13:11:15.551] Packages needed by the future expression (n = 0): [13:11:15.551] Packages needed by future strategies (n = 0): [13:11:15.552] { [13:11:15.552] { [13:11:15.552] { [13:11:15.552] ...future.startTime <- base::Sys.time() [13:11:15.552] { [13:11:15.552] { [13:11:15.552] { [13:11:15.552] base::local({ [13:11:15.552] has_future <- base::requireNamespace("future", [13:11:15.552] quietly = TRUE) [13:11:15.552] if (has_future) { [13:11:15.552] ns <- base::getNamespace("future") [13:11:15.552] version <- ns[[".package"]][["version"]] [13:11:15.552] if (is.null(version)) [13:11:15.552] version <- utils::packageVersion("future") [13:11:15.552] } [13:11:15.552] else { [13:11:15.552] version <- NULL [13:11:15.552] } [13:11:15.552] if (!has_future || version < "1.8.0") { [13:11:15.552] info <- base::c(r_version = base::gsub("R version ", [13:11:15.552] "", base::R.version$version.string), [13:11:15.552] platform = base::sprintf("%s (%s-bit)", [13:11:15.552] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.552] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.552] "release", "version")], collapse = " "), [13:11:15.552] hostname = base::Sys.info()[["nodename"]]) [13:11:15.552] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.552] info) [13:11:15.552] info <- base::paste(info, collapse = "; ") [13:11:15.552] if (!has_future) { [13:11:15.552] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.552] info) [13:11:15.552] } [13:11:15.552] else { [13:11:15.552] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.552] info, version) [13:11:15.552] } [13:11:15.552] base::stop(msg) [13:11:15.552] } [13:11:15.552] }) [13:11:15.552] } [13:11:15.552] ...future.strategy.old <- future::plan("list") [13:11:15.552] options(future.plan = NULL) [13:11:15.552] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.552] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.552] } [13:11:15.552] ...future.workdir <- getwd() [13:11:15.552] } [13:11:15.552] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.552] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.552] } [13:11:15.552] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.552] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:11:15.552] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.552] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.552] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.552] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.552] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.552] base::names(...future.oldOptions)) [13:11:15.552] } [13:11:15.552] if (FALSE) { [13:11:15.552] } [13:11:15.552] else { [13:11:15.552] if (TRUE) { [13:11:15.552] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.552] open = "w") [13:11:15.552] } [13:11:15.552] else { [13:11:15.552] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.552] windows = "NUL", "/dev/null"), open = "w") [13:11:15.552] } [13:11:15.552] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.552] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.552] base::sink(type = "output", split = FALSE) [13:11:15.552] base::close(...future.stdout) [13:11:15.552] }, add = TRUE) [13:11:15.552] } [13:11:15.552] ...future.frame <- base::sys.nframe() [13:11:15.552] ...future.conditions <- base::list() [13:11:15.552] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.552] if (FALSE) { [13:11:15.552] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.552] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.552] } [13:11:15.552] ...future.result <- base::tryCatch({ [13:11:15.552] base::withCallingHandlers({ [13:11:15.552] ...future.value <- base::withVisible(base::local({ [13:11:15.552] do.call(function(...) { [13:11:15.552] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.552] if (!identical(...future.globals.maxSize.org, [13:11:15.552] ...future.globals.maxSize)) { [13:11:15.552] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.552] on.exit(options(oopts), add = TRUE) [13:11:15.552] } [13:11:15.552] { [13:11:15.552] lapply(seq_along(...future.elements_ii), [13:11:15.552] FUN = function(jj) { [13:11:15.552] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.552] ...future.FUN(...future.X_jj, ...) [13:11:15.552] }) [13:11:15.552] } [13:11:15.552] }, args = future.call.arguments) [13:11:15.552] })) [13:11:15.552] future::FutureResult(value = ...future.value$value, [13:11:15.552] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.552] ...future.rng), globalenv = if (FALSE) [13:11:15.552] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.552] ...future.globalenv.names)) [13:11:15.552] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.552] }, condition = base::local({ [13:11:15.552] c <- base::c [13:11:15.552] inherits <- base::inherits [13:11:15.552] invokeRestart <- base::invokeRestart [13:11:15.552] length <- base::length [13:11:15.552] list <- base::list [13:11:15.552] seq.int <- base::seq.int [13:11:15.552] signalCondition <- base::signalCondition [13:11:15.552] sys.calls <- base::sys.calls [13:11:15.552] `[[` <- base::`[[` [13:11:15.552] `+` <- base::`+` [13:11:15.552] `<<-` <- base::`<<-` [13:11:15.552] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.552] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.552] 3L)] [13:11:15.552] } [13:11:15.552] function(cond) { [13:11:15.552] is_error <- inherits(cond, "error") [13:11:15.552] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.552] NULL) [13:11:15.552] if (is_error) { [13:11:15.552] sessionInformation <- function() { [13:11:15.552] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.552] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.552] search = base::search(), system = base::Sys.info()) [13:11:15.552] } [13:11:15.552] ...future.conditions[[length(...future.conditions) + [13:11:15.552] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.552] cond$call), session = sessionInformation(), [13:11:15.552] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.552] signalCondition(cond) [13:11:15.552] } [13:11:15.552] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.552] signal <- FALSE && inherits(cond, character(0)) [13:11:15.552] ...future.conditions[[length(...future.conditions) + [13:11:15.552] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.552] if (FALSE && !signal) { [13:11:15.552] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.552] { [13:11:15.552] inherits <- base::inherits [13:11:15.552] invokeRestart <- base::invokeRestart [13:11:15.552] is.null <- base::is.null [13:11:15.552] muffled <- FALSE [13:11:15.552] if (inherits(cond, "message")) { [13:11:15.552] muffled <- grepl(pattern, "muffleMessage") [13:11:15.552] if (muffled) [13:11:15.552] invokeRestart("muffleMessage") [13:11:15.552] } [13:11:15.552] else if (inherits(cond, "warning")) { [13:11:15.552] muffled <- grepl(pattern, "muffleWarning") [13:11:15.552] if (muffled) [13:11:15.552] invokeRestart("muffleWarning") [13:11:15.552] } [13:11:15.552] else if (inherits(cond, "condition")) { [13:11:15.552] if (!is.null(pattern)) { [13:11:15.552] computeRestarts <- base::computeRestarts [13:11:15.552] grepl <- base::grepl [13:11:15.552] restarts <- computeRestarts(cond) [13:11:15.552] for (restart in restarts) { [13:11:15.552] name <- restart$name [13:11:15.552] if (is.null(name)) [13:11:15.552] next [13:11:15.552] if (!grepl(pattern, name)) [13:11:15.552] next [13:11:15.552] invokeRestart(restart) [13:11:15.552] muffled <- TRUE [13:11:15.552] break [13:11:15.552] } [13:11:15.552] } [13:11:15.552] } [13:11:15.552] invisible(muffled) [13:11:15.552] } [13:11:15.552] muffleCondition(cond, pattern = "^muffle") [13:11:15.552] } [13:11:15.552] } [13:11:15.552] else { [13:11:15.552] if (TRUE) { [13:11:15.552] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.552] { [13:11:15.552] inherits <- base::inherits [13:11:15.552] invokeRestart <- base::invokeRestart [13:11:15.552] is.null <- base::is.null [13:11:15.552] muffled <- FALSE [13:11:15.552] if (inherits(cond, "message")) { [13:11:15.552] muffled <- grepl(pattern, "muffleMessage") [13:11:15.552] if (muffled) [13:11:15.552] invokeRestart("muffleMessage") [13:11:15.552] } [13:11:15.552] else if (inherits(cond, "warning")) { [13:11:15.552] muffled <- grepl(pattern, "muffleWarning") [13:11:15.552] if (muffled) [13:11:15.552] invokeRestart("muffleWarning") [13:11:15.552] } [13:11:15.552] else if (inherits(cond, "condition")) { [13:11:15.552] if (!is.null(pattern)) { [13:11:15.552] computeRestarts <- base::computeRestarts [13:11:15.552] grepl <- base::grepl [13:11:15.552] restarts <- computeRestarts(cond) [13:11:15.552] for (restart in restarts) { [13:11:15.552] name <- restart$name [13:11:15.552] if (is.null(name)) [13:11:15.552] next [13:11:15.552] if (!grepl(pattern, name)) [13:11:15.552] next [13:11:15.552] invokeRestart(restart) [13:11:15.552] muffled <- TRUE [13:11:15.552] break [13:11:15.552] } [13:11:15.552] } [13:11:15.552] } [13:11:15.552] invisible(muffled) [13:11:15.552] } [13:11:15.552] muffleCondition(cond, pattern = "^muffle") [13:11:15.552] } [13:11:15.552] } [13:11:15.552] } [13:11:15.552] })) [13:11:15.552] }, error = function(ex) { [13:11:15.552] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.552] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.552] ...future.rng), started = ...future.startTime, [13:11:15.552] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.552] version = "1.8"), class = "FutureResult") [13:11:15.552] }, finally = { [13:11:15.552] if (!identical(...future.workdir, getwd())) [13:11:15.552] setwd(...future.workdir) [13:11:15.552] { [13:11:15.552] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.552] ...future.oldOptions$nwarnings <- NULL [13:11:15.552] } [13:11:15.552] base::options(...future.oldOptions) [13:11:15.552] if (.Platform$OS.type == "windows") { [13:11:15.552] old_names <- names(...future.oldEnvVars) [13:11:15.552] envs <- base::Sys.getenv() [13:11:15.552] names <- names(envs) [13:11:15.552] common <- intersect(names, old_names) [13:11:15.552] added <- setdiff(names, old_names) [13:11:15.552] removed <- setdiff(old_names, names) [13:11:15.552] changed <- common[...future.oldEnvVars[common] != [13:11:15.552] envs[common]] [13:11:15.552] NAMES <- toupper(changed) [13:11:15.552] args <- list() [13:11:15.552] for (kk in seq_along(NAMES)) { [13:11:15.552] name <- changed[[kk]] [13:11:15.552] NAME <- NAMES[[kk]] [13:11:15.552] if (name != NAME && is.element(NAME, old_names)) [13:11:15.552] next [13:11:15.552] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.552] } [13:11:15.552] NAMES <- toupper(added) [13:11:15.552] for (kk in seq_along(NAMES)) { [13:11:15.552] name <- added[[kk]] [13:11:15.552] NAME <- NAMES[[kk]] [13:11:15.552] if (name != NAME && is.element(NAME, old_names)) [13:11:15.552] next [13:11:15.552] args[[name]] <- "" [13:11:15.552] } [13:11:15.552] NAMES <- toupper(removed) [13:11:15.552] for (kk in seq_along(NAMES)) { [13:11:15.552] name <- removed[[kk]] [13:11:15.552] NAME <- NAMES[[kk]] [13:11:15.552] if (name != NAME && is.element(NAME, old_names)) [13:11:15.552] next [13:11:15.552] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.552] } [13:11:15.552] if (length(args) > 0) [13:11:15.552] base::do.call(base::Sys.setenv, args = args) [13:11:15.552] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.552] } [13:11:15.552] else { [13:11:15.552] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.552] } [13:11:15.552] { [13:11:15.552] if (base::length(...future.futureOptionsAdded) > [13:11:15.552] 0L) { [13:11:15.552] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.552] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.552] base::options(opts) [13:11:15.552] } [13:11:15.552] { [13:11:15.552] NULL [13:11:15.552] options(future.plan = NULL) [13:11:15.552] if (is.na(NA_character_)) [13:11:15.552] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.552] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.552] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.552] .init = FALSE) [13:11:15.552] } [13:11:15.552] } [13:11:15.552] } [13:11:15.552] }) [13:11:15.552] if (TRUE) { [13:11:15.552] base::sink(type = "output", split = FALSE) [13:11:15.552] if (TRUE) { [13:11:15.552] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.552] } [13:11:15.552] else { [13:11:15.552] ...future.result["stdout"] <- base::list(NULL) [13:11:15.552] } [13:11:15.552] base::close(...future.stdout) [13:11:15.552] ...future.stdout <- NULL [13:11:15.552] } [13:11:15.552] ...future.result$conditions <- ...future.conditions [13:11:15.552] ...future.result$finished <- base::Sys.time() [13:11:15.552] ...future.result [13:11:15.552] } [13:11:15.556] - Launch lazy future ... done [13:11:15.557] run() for 'MiraiFuture' ... done [13:11:15.557] Created future: [13:11:15.559] resolved() for 'MiraiFuture' ... [13:11:15.559] - state: 'running' [13:11:15.559] - run: TRUE [13:11:15.560] - result: 'NULL' [13:11:15.560] - resolved: FALSE [13:11:15.560] resolved() for 'MiraiFuture' ... done [13:11:15.558] MiraiFuture: [13:11:15.558] Label: 'future_lapply-2' [13:11:15.558] Expression: [13:11:15.558] { [13:11:15.558] do.call(function(...) { [13:11:15.558] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.558] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.558] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.558] on.exit(options(oopts), add = TRUE) [13:11:15.558] } [13:11:15.558] { [13:11:15.558] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.558] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.558] ...future.FUN(...future.X_jj, ...) [13:11:15.558] }) [13:11:15.558] } [13:11:15.558] }, args = future.call.arguments) [13:11:15.558] } [13:11:15.558] Lazy evaluation: FALSE [13:11:15.558] Asynchronous evaluation: TRUE [13:11:15.558] Local evaluation: TRUE [13:11:15.558] Environment: R_GlobalEnv [13:11:15.558] Capture standard output: TRUE [13:11:15.558] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.558] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.558] Packages: [13:11:15.558] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.558] Resolved: TRUE [13:11:15.558] Value: [13:11:15.558] Conditions captured: [13:11:15.558] Early signaling: FALSE [13:11:15.558] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.558] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.561] Chunk #2 of 2 ... DONE [13:11:15.561] Launching 2 futures (chunks) ... DONE [13:11:15.561] Resolving 2 futures (chunks) ... [13:11:15.561] resolve() on list ... [13:11:15.561] recursive: 0 [13:11:15.561] length: 2 [13:11:15.562] [13:11:15.562] resolved() for 'MiraiFuture' ... [13:11:15.562] - state: 'running' [13:11:15.562] - run: TRUE [13:11:15.562] - result: 'NULL' [13:11:15.562] - resolved: FALSE [13:11:15.563] resolved() for 'MiraiFuture' ... done [13:11:15.563] Future #1 [13:11:15.563] signalConditionsASAP(MiraiFuture, pos=1) ... [13:11:15.563] - nx: 2 [13:11:15.563] - relay: TRUE [13:11:15.564] - stdout: TRUE [13:11:15.564] - signal: TRUE [13:11:15.564] - resignal: FALSE [13:11:15.564] - force: TRUE [13:11:15.564] - relayed: [n=2] FALSE, FALSE [13:11:15.564] - queued futures: [n=2] FALSE, FALSE [13:11:15.564] - until=1 [13:11:15.565] - relaying element #1 [13:11:15.565] - relayed: [n=2] TRUE, FALSE [13:11:15.565] - queued futures: [n=2] TRUE, FALSE [13:11:15.565] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:11:15.565] length: 1 (resolved future 1) [13:11:15.566] resolved() for 'MiraiFuture' ... [13:11:15.566] - state: 'running' [13:11:15.566] - run: TRUE [13:11:15.566] - result: 'NULL' [13:11:15.566] - resolved: FALSE [13:11:15.566] resolved() for 'MiraiFuture' ... done [13:11:15.567] Future #2 [13:11:15.567] signalConditionsASAP(MiraiFuture, pos=2) ... [13:11:15.567] - nx: 2 [13:11:15.567] - relay: TRUE [13:11:15.567] - stdout: TRUE [13:11:15.568] - signal: TRUE [13:11:15.568] - resignal: FALSE [13:11:15.568] - force: TRUE [13:11:15.568] - relayed: [n=2] TRUE, FALSE [13:11:15.568] - queued futures: [n=2] TRUE, FALSE [13:11:15.568] - until=2 [13:11:15.568] - relaying element #2 [13:11:15.569] - relayed: [n=2] TRUE, TRUE [13:11:15.569] - queued futures: [n=2] TRUE, TRUE [13:11:15.569] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:11:15.569] length: 0 (resolved future 2) [13:11:15.570] Relaying remaining futures [13:11:15.570] signalConditionsASAP(NULL, pos=0) ... [13:11:15.570] - nx: 2 [13:11:15.570] - relay: TRUE [13:11:15.570] - stdout: TRUE [13:11:15.570] - signal: TRUE [13:11:15.571] - resignal: FALSE [13:11:15.571] - force: TRUE [13:11:15.571] - relayed: [n=2] TRUE, TRUE [13:11:15.571] - queued futures: [n=2] TRUE, TRUE - flush all [13:11:15.571] - relayed: [n=2] TRUE, TRUE [13:11:15.571] - queued futures: [n=2] TRUE, TRUE [13:11:15.572] signalConditionsASAP(NULL, pos=0) ... done [13:11:15.572] resolve() on list ... DONE [13:11:15.572] - Number of value chunks collected: 2 [13:11:15.572] Resolving 2 futures (chunks) ... DONE [13:11:15.572] Reducing values from 2 chunks ... [13:11:15.573] - Number of values collected after concatenation: 3 [13:11:15.573] - Number of values expected: 3 [13:11:15.573] Reducing values from 2 chunks ... DONE [13:11:15.573] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... List of 1 $ x:List of 1 ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... List of 1 $ y0:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" [13:11:15.584] - plan('mirai_multisession') ...[13:11:15.585] plan(): Setting new future strategy stack: [13:11:15.585] List of future strategies: [13:11:15.585] 1. mirai_multisession: [13:11:15.585] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:11:15.585] - tweaked: FALSE [13:11:15.585] - call: plan(strategy) [13:11:15.586] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:11:15.586] < mirai | $data > [13:11:15.588] getGlobalsAndPackages() ... [13:11:15.588] Not searching for globals [13:11:15.588] - globals: [0] [13:11:15.588] getGlobalsAndPackages() ... DONE [13:11:15.589] getGlobalsAndPackages() ... [13:11:15.589] [13:11:15.589] - globals: [0] [13:11:15.589] getGlobalsAndPackages() ... DONE [13:11:15.589] Packages needed by the future expression (n = 0): [13:11:15.590] Packages needed by future strategies (n = 0): [13:11:15.590] { [13:11:15.590] { [13:11:15.590] { [13:11:15.590] ...future.startTime <- base::Sys.time() [13:11:15.590] { [13:11:15.590] { [13:11:15.590] { [13:11:15.590] base::local({ [13:11:15.590] has_future <- base::requireNamespace("future", [13:11:15.590] quietly = TRUE) [13:11:15.590] if (has_future) { [13:11:15.590] ns <- base::getNamespace("future") [13:11:15.590] version <- ns[[".package"]][["version"]] [13:11:15.590] if (is.null(version)) [13:11:15.590] version <- utils::packageVersion("future") [13:11:15.590] } [13:11:15.590] else { [13:11:15.590] version <- NULL [13:11:15.590] } [13:11:15.590] if (!has_future || version < "1.8.0") { [13:11:15.590] info <- base::c(r_version = base::gsub("R version ", [13:11:15.590] "", base::R.version$version.string), [13:11:15.590] platform = base::sprintf("%s (%s-bit)", [13:11:15.590] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.590] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.590] "release", "version")], collapse = " "), [13:11:15.590] hostname = base::Sys.info()[["nodename"]]) [13:11:15.590] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.590] info) [13:11:15.590] info <- base::paste(info, collapse = "; ") [13:11:15.590] if (!has_future) { [13:11:15.590] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.590] info) [13:11:15.590] } [13:11:15.590] else { [13:11:15.590] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.590] info, version) [13:11:15.590] } [13:11:15.590] base::stop(msg) [13:11:15.590] } [13:11:15.590] }) [13:11:15.590] } [13:11:15.590] ...future.strategy.old <- future::plan("list") [13:11:15.590] options(future.plan = NULL) [13:11:15.590] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.590] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.590] } [13:11:15.590] ...future.workdir <- getwd() [13:11:15.590] } [13:11:15.590] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.590] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.590] } [13:11:15.590] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.590] future.globals.maxSize = NULL, future.globals.method = NULL, [13:11:15.590] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.590] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.590] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.590] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.590] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.590] base::names(...future.oldOptions)) [13:11:15.590] } [13:11:15.590] if (FALSE) { [13:11:15.590] } [13:11:15.590] else { [13:11:15.590] if (TRUE) { [13:11:15.590] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.590] open = "w") [13:11:15.590] } [13:11:15.590] else { [13:11:15.590] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.590] windows = "NUL", "/dev/null"), open = "w") [13:11:15.590] } [13:11:15.590] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.590] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.590] base::sink(type = "output", split = FALSE) [13:11:15.590] base::close(...future.stdout) [13:11:15.590] }, add = TRUE) [13:11:15.590] } [13:11:15.590] ...future.frame <- base::sys.nframe() [13:11:15.590] ...future.conditions <- base::list() [13:11:15.590] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.590] if (FALSE) { [13:11:15.590] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.590] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.590] } [13:11:15.590] ...future.result <- base::tryCatch({ [13:11:15.590] base::withCallingHandlers({ [13:11:15.590] ...future.value <- base::withVisible(base::local(NA)) [13:11:15.590] future::FutureResult(value = ...future.value$value, [13:11:15.590] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.590] ...future.rng), globalenv = if (FALSE) [13:11:15.590] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.590] ...future.globalenv.names)) [13:11:15.590] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.590] }, condition = base::local({ [13:11:15.590] c <- base::c [13:11:15.590] inherits <- base::inherits [13:11:15.590] invokeRestart <- base::invokeRestart [13:11:15.590] length <- base::length [13:11:15.590] list <- base::list [13:11:15.590] seq.int <- base::seq.int [13:11:15.590] signalCondition <- base::signalCondition [13:11:15.590] sys.calls <- base::sys.calls [13:11:15.590] `[[` <- base::`[[` [13:11:15.590] `+` <- base::`+` [13:11:15.590] `<<-` <- base::`<<-` [13:11:15.590] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.590] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.590] 3L)] [13:11:15.590] } [13:11:15.590] function(cond) { [13:11:15.590] is_error <- inherits(cond, "error") [13:11:15.590] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.590] NULL) [13:11:15.590] if (is_error) { [13:11:15.590] sessionInformation <- function() { [13:11:15.590] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.590] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.590] search = base::search(), system = base::Sys.info()) [13:11:15.590] } [13:11:15.590] ...future.conditions[[length(...future.conditions) + [13:11:15.590] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.590] cond$call), session = sessionInformation(), [13:11:15.590] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.590] signalCondition(cond) [13:11:15.590] } [13:11:15.590] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.590] signal <- FALSE && inherits(cond, character(0)) [13:11:15.590] ...future.conditions[[length(...future.conditions) + [13:11:15.590] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.590] if (FALSE && !signal) { [13:11:15.590] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.590] { [13:11:15.590] inherits <- base::inherits [13:11:15.590] invokeRestart <- base::invokeRestart [13:11:15.590] is.null <- base::is.null [13:11:15.590] muffled <- FALSE [13:11:15.590] if (inherits(cond, "message")) { [13:11:15.590] muffled <- grepl(pattern, "muffleMessage") [13:11:15.590] if (muffled) [13:11:15.590] invokeRestart("muffleMessage") [13:11:15.590] } [13:11:15.590] else if (inherits(cond, "warning")) { [13:11:15.590] muffled <- grepl(pattern, "muffleWarning") [13:11:15.590] if (muffled) [13:11:15.590] invokeRestart("muffleWarning") [13:11:15.590] } [13:11:15.590] else if (inherits(cond, "condition")) { [13:11:15.590] if (!is.null(pattern)) { [13:11:15.590] computeRestarts <- base::computeRestarts [13:11:15.590] grepl <- base::grepl [13:11:15.590] restarts <- computeRestarts(cond) [13:11:15.590] for (restart in restarts) { [13:11:15.590] name <- restart$name [13:11:15.590] if (is.null(name)) [13:11:15.590] next [13:11:15.590] if (!grepl(pattern, name)) [13:11:15.590] next [13:11:15.590] invokeRestart(restart) [13:11:15.590] muffled <- TRUE [13:11:15.590] break [13:11:15.590] } [13:11:15.590] } [13:11:15.590] } [13:11:15.590] invisible(muffled) [13:11:15.590] } [13:11:15.590] muffleCondition(cond, pattern = "^muffle") [13:11:15.590] } [13:11:15.590] } [13:11:15.590] else { [13:11:15.590] if (TRUE) { [13:11:15.590] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.590] { [13:11:15.590] inherits <- base::inherits [13:11:15.590] invokeRestart <- base::invokeRestart [13:11:15.590] is.null <- base::is.null [13:11:15.590] muffled <- FALSE [13:11:15.590] if (inherits(cond, "message")) { [13:11:15.590] muffled <- grepl(pattern, "muffleMessage") [13:11:15.590] if (muffled) [13:11:15.590] invokeRestart("muffleMessage") [13:11:15.590] } [13:11:15.590] else if (inherits(cond, "warning")) { [13:11:15.590] muffled <- grepl(pattern, "muffleWarning") [13:11:15.590] if (muffled) [13:11:15.590] invokeRestart("muffleWarning") [13:11:15.590] } [13:11:15.590] else if (inherits(cond, "condition")) { [13:11:15.590] if (!is.null(pattern)) { [13:11:15.590] computeRestarts <- base::computeRestarts [13:11:15.590] grepl <- base::grepl [13:11:15.590] restarts <- computeRestarts(cond) [13:11:15.590] for (restart in restarts) { [13:11:15.590] name <- restart$name [13:11:15.590] if (is.null(name)) [13:11:15.590] next [13:11:15.590] if (!grepl(pattern, name)) [13:11:15.590] next [13:11:15.590] invokeRestart(restart) [13:11:15.590] muffled <- TRUE [13:11:15.590] break [13:11:15.590] } [13:11:15.590] } [13:11:15.590] } [13:11:15.590] invisible(muffled) [13:11:15.590] } [13:11:15.590] muffleCondition(cond, pattern = "^muffle") [13:11:15.590] } [13:11:15.590] } [13:11:15.590] } [13:11:15.590] })) [13:11:15.590] }, error = function(ex) { [13:11:15.590] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.590] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.590] ...future.rng), started = ...future.startTime, [13:11:15.590] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.590] version = "1.8"), class = "FutureResult") [13:11:15.590] }, finally = { [13:11:15.590] if (!identical(...future.workdir, getwd())) [13:11:15.590] setwd(...future.workdir) [13:11:15.590] { [13:11:15.590] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.590] ...future.oldOptions$nwarnings <- NULL [13:11:15.590] } [13:11:15.590] base::options(...future.oldOptions) [13:11:15.590] if (.Platform$OS.type == "windows") { [13:11:15.590] old_names <- names(...future.oldEnvVars) [13:11:15.590] envs <- base::Sys.getenv() [13:11:15.590] names <- names(envs) [13:11:15.590] common <- intersect(names, old_names) [13:11:15.590] added <- setdiff(names, old_names) [13:11:15.590] removed <- setdiff(old_names, names) [13:11:15.590] changed <- common[...future.oldEnvVars[common] != [13:11:15.590] envs[common]] [13:11:15.590] NAMES <- toupper(changed) [13:11:15.590] args <- list() [13:11:15.590] for (kk in seq_along(NAMES)) { [13:11:15.590] name <- changed[[kk]] [13:11:15.590] NAME <- NAMES[[kk]] [13:11:15.590] if (name != NAME && is.element(NAME, old_names)) [13:11:15.590] next [13:11:15.590] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.590] } [13:11:15.590] NAMES <- toupper(added) [13:11:15.590] for (kk in seq_along(NAMES)) { [13:11:15.590] name <- added[[kk]] [13:11:15.590] NAME <- NAMES[[kk]] [13:11:15.590] if (name != NAME && is.element(NAME, old_names)) [13:11:15.590] next [13:11:15.590] args[[name]] <- "" [13:11:15.590] } [13:11:15.590] NAMES <- toupper(removed) [13:11:15.590] for (kk in seq_along(NAMES)) { [13:11:15.590] name <- removed[[kk]] [13:11:15.590] NAME <- NAMES[[kk]] [13:11:15.590] if (name != NAME && is.element(NAME, old_names)) [13:11:15.590] next [13:11:15.590] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.590] } [13:11:15.590] if (length(args) > 0) [13:11:15.590] base::do.call(base::Sys.setenv, args = args) [13:11:15.590] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.590] } [13:11:15.590] else { [13:11:15.590] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.590] } [13:11:15.590] { [13:11:15.590] if (base::length(...future.futureOptionsAdded) > [13:11:15.590] 0L) { [13:11:15.590] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.590] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.590] base::options(opts) [13:11:15.590] } [13:11:15.590] { [13:11:15.590] NULL [13:11:15.590] options(future.plan = NULL) [13:11:15.590] if (is.na(NA_character_)) [13:11:15.590] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.590] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.590] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.590] .init = FALSE) [13:11:15.590] } [13:11:15.590] } [13:11:15.590] } [13:11:15.590] }) [13:11:15.590] if (TRUE) { [13:11:15.590] base::sink(type = "output", split = FALSE) [13:11:15.590] if (TRUE) { [13:11:15.590] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.590] } [13:11:15.590] else { [13:11:15.590] ...future.result["stdout"] <- base::list(NULL) [13:11:15.590] } [13:11:15.590] base::close(...future.stdout) [13:11:15.590] ...future.stdout <- NULL [13:11:15.590] } [13:11:15.590] ...future.result$conditions <- ...future.conditions [13:11:15.590] ...future.result$finished <- base::Sys.time() [13:11:15.590] ...future.result [13:11:15.590] } [13:11:15.596] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:11:15.596] plan(): nbrOfWorkers() = 2 [13:11:15.597] future_lapply() ... [13:11:15.608] Number of chunks: 1 [13:11:15.608] getGlobalsAndPackagesXApply() ... [13:11:15.608] - future.globals: TRUE [13:11:15.608] getGlobalsAndPackages() ... [13:11:15.608] Searching for globals... [13:11:15.619] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:11:15.619] Searching for globals ... DONE [13:11:15.620] Resolving globals: FALSE [13:11:15.621] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:11:15.621] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [13:11:15.621] - globals: [1] 'FUN' [13:11:15.622] - packages: [1] 'future' [13:11:15.622] getGlobalsAndPackages() ... DONE [13:11:15.622] - globals found/used: [n=1] 'FUN' [13:11:15.622] - needed namespaces: [n=1] 'future' [13:11:15.622] Finding globals ... DONE [13:11:15.622] - use_args: TRUE [13:11:15.622] - Getting '...' globals ... [13:11:15.623] resolve() on list ... [13:11:15.623] recursive: 0 [13:11:15.623] length: 1 [13:11:15.623] elements: '...' [13:11:15.624] length: 0 (resolved future 1) [13:11:15.624] resolve() on list ... DONE [13:11:15.624] - '...' content: [n=2] 'collapse', 'maxHead' [13:11:15.624] List of 1 [13:11:15.624] $ ...:List of 2 [13:11:15.624] ..$ collapse: chr "; " [13:11:15.624] ..$ maxHead : int 3 [13:11:15.624] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.624] - attr(*, "where")=List of 1 [13:11:15.624] ..$ ...: [13:11:15.624] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.624] - attr(*, "resolved")= logi TRUE [13:11:15.624] - attr(*, "total_size")= num NA [13:11:15.628] - Getting '...' globals ... DONE [13:11:15.628] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:11:15.628] List of 2 [13:11:15.628] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:11:15.628] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:11:15.628] $ ... :List of 2 [13:11:15.628] ..$ collapse: chr "; " [13:11:15.628] ..$ maxHead : int 3 [13:11:15.628] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.628] - attr(*, "where")=List of 2 [13:11:15.628] ..$ ...future.FUN: [13:11:15.628] ..$ ... : [13:11:15.628] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.628] - attr(*, "resolved")= logi FALSE [13:11:15.628] - attr(*, "total_size")= num 71456 [13:11:15.634] Packages to be attached in all futures: [n=1] 'future' [13:11:15.634] getGlobalsAndPackagesXApply() ... DONE [13:11:15.634] Number of futures (= number of chunks): 1 [13:11:15.635] Launching 1 futures (chunks) ... [13:11:15.635] Chunk #1 of 1 ... [13:11:15.635] - Finding globals in 'X' for chunk #1 ... [13:11:15.635] getGlobalsAndPackages() ... [13:11:15.635] Searching for globals... [13:11:15.636] [13:11:15.636] Searching for globals ... DONE [13:11:15.636] - globals: [0] [13:11:15.636] getGlobalsAndPackages() ... DONE [13:11:15.636] + additional globals found: [n=0] [13:11:15.636] + additional namespaces needed: [n=0] [13:11:15.637] - Finding globals in 'X' for chunk #1 ... DONE [13:11:15.637] - seeds: [13:11:15.637] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.637] getGlobalsAndPackages() ... [13:11:15.637] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.637] Resolving globals: FALSE [13:11:15.638] Tweak future expression to call with '...' arguments ... [13:11:15.638] { [13:11:15.638] do.call(function(...) { [13:11:15.638] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.638] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.638] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.638] on.exit(options(oopts), add = TRUE) [13:11:15.638] } [13:11:15.638] { [13:11:15.638] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.638] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.638] ...future.FUN(...future.X_jj, ...) [13:11:15.638] }) [13:11:15.638] } [13:11:15.638] }, args = future.call.arguments) [13:11:15.638] } [13:11:15.638] Tweak future expression to call with '...' arguments ... DONE [13:11:15.639] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.639] - packages: [1] 'future' [13:11:15.639] getGlobalsAndPackages() ... DONE [13:11:15.639] run() for 'Future' ... [13:11:15.640] - state: 'created' [13:11:15.640] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.642] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.642] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.643] - Field: 'label' [13:11:15.643] - Field: 'local' [13:11:15.643] - Field: 'owner' [13:11:15.643] - Field: 'envir' [13:11:15.643] - Field: 'packages' [13:11:15.643] - Field: 'gc' [13:11:15.644] - Field: 'conditions' [13:11:15.644] - Field: 'expr' [13:11:15.644] - Field: 'uuid' [13:11:15.644] - Field: 'seed' [13:11:15.644] - Field: 'version' [13:11:15.644] - Field: 'result' [13:11:15.645] - Field: 'asynchronous' [13:11:15.645] - Field: 'calls' [13:11:15.645] - Field: 'globals' [13:11:15.645] - Field: 'stdout' [13:11:15.645] - Field: 'earlySignal' [13:11:15.645] - Field: 'lazy' [13:11:15.646] - Field: 'state' [13:11:15.646] - Field: '.cluster' [13:11:15.646] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.646] - Launch lazy future ... [13:11:15.646] Packages needed by the future expression (n = 1): 'future' [13:11:15.647] Packages needed by future strategies (n = 0): [13:11:15.647] { [13:11:15.647] { [13:11:15.647] { [13:11:15.647] ...future.startTime <- base::Sys.time() [13:11:15.647] { [13:11:15.647] { [13:11:15.647] { [13:11:15.647] { [13:11:15.647] base::local({ [13:11:15.647] has_future <- base::requireNamespace("future", [13:11:15.647] quietly = TRUE) [13:11:15.647] if (has_future) { [13:11:15.647] ns <- base::getNamespace("future") [13:11:15.647] version <- ns[[".package"]][["version"]] [13:11:15.647] if (is.null(version)) [13:11:15.647] version <- utils::packageVersion("future") [13:11:15.647] } [13:11:15.647] else { [13:11:15.647] version <- NULL [13:11:15.647] } [13:11:15.647] if (!has_future || version < "1.8.0") { [13:11:15.647] info <- base::c(r_version = base::gsub("R version ", [13:11:15.647] "", base::R.version$version.string), [13:11:15.647] platform = base::sprintf("%s (%s-bit)", [13:11:15.647] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.647] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.647] "release", "version")], collapse = " "), [13:11:15.647] hostname = base::Sys.info()[["nodename"]]) [13:11:15.647] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.647] info) [13:11:15.647] info <- base::paste(info, collapse = "; ") [13:11:15.647] if (!has_future) { [13:11:15.647] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.647] info) [13:11:15.647] } [13:11:15.647] else { [13:11:15.647] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.647] info, version) [13:11:15.647] } [13:11:15.647] base::stop(msg) [13:11:15.647] } [13:11:15.647] }) [13:11:15.647] } [13:11:15.647] base::local({ [13:11:15.647] for (pkg in "future") { [13:11:15.647] base::loadNamespace(pkg) [13:11:15.647] base::library(pkg, character.only = TRUE) [13:11:15.647] } [13:11:15.647] }) [13:11:15.647] } [13:11:15.647] ...future.strategy.old <- future::plan("list") [13:11:15.647] options(future.plan = NULL) [13:11:15.647] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.647] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.647] } [13:11:15.647] ...future.workdir <- getwd() [13:11:15.647] } [13:11:15.647] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.647] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.647] } [13:11:15.647] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.647] future.globals.maxSize = NULL, future.globals.method = NULL, [13:11:15.647] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.647] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.647] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.647] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.647] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.647] base::names(...future.oldOptions)) [13:11:15.647] } [13:11:15.647] if (FALSE) { [13:11:15.647] } [13:11:15.647] else { [13:11:15.647] if (TRUE) { [13:11:15.647] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.647] open = "w") [13:11:15.647] } [13:11:15.647] else { [13:11:15.647] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.647] windows = "NUL", "/dev/null"), open = "w") [13:11:15.647] } [13:11:15.647] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.647] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.647] base::sink(type = "output", split = FALSE) [13:11:15.647] base::close(...future.stdout) [13:11:15.647] }, add = TRUE) [13:11:15.647] } [13:11:15.647] ...future.frame <- base::sys.nframe() [13:11:15.647] ...future.conditions <- base::list() [13:11:15.647] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.647] if (FALSE) { [13:11:15.647] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.647] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.647] } [13:11:15.647] ...future.result <- base::tryCatch({ [13:11:15.647] base::withCallingHandlers({ [13:11:15.647] ...future.value <- base::withVisible(base::local({ [13:11:15.647] do.call(function(...) { [13:11:15.647] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.647] if (!identical(...future.globals.maxSize.org, [13:11:15.647] ...future.globals.maxSize)) { [13:11:15.647] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.647] on.exit(options(oopts), add = TRUE) [13:11:15.647] } [13:11:15.647] { [13:11:15.647] lapply(seq_along(...future.elements_ii), [13:11:15.647] FUN = function(jj) { [13:11:15.647] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.647] ...future.FUN(...future.X_jj, ...) [13:11:15.647] }) [13:11:15.647] } [13:11:15.647] }, args = future.call.arguments) [13:11:15.647] })) [13:11:15.647] future::FutureResult(value = ...future.value$value, [13:11:15.647] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.647] ...future.rng), globalenv = if (FALSE) [13:11:15.647] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.647] ...future.globalenv.names)) [13:11:15.647] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.647] }, condition = base::local({ [13:11:15.647] c <- base::c [13:11:15.647] inherits <- base::inherits [13:11:15.647] invokeRestart <- base::invokeRestart [13:11:15.647] length <- base::length [13:11:15.647] list <- base::list [13:11:15.647] seq.int <- base::seq.int [13:11:15.647] signalCondition <- base::signalCondition [13:11:15.647] sys.calls <- base::sys.calls [13:11:15.647] `[[` <- base::`[[` [13:11:15.647] `+` <- base::`+` [13:11:15.647] `<<-` <- base::`<<-` [13:11:15.647] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.647] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.647] 3L)] [13:11:15.647] } [13:11:15.647] function(cond) { [13:11:15.647] is_error <- inherits(cond, "error") [13:11:15.647] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.647] NULL) [13:11:15.647] if (is_error) { [13:11:15.647] sessionInformation <- function() { [13:11:15.647] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.647] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.647] search = base::search(), system = base::Sys.info()) [13:11:15.647] } [13:11:15.647] ...future.conditions[[length(...future.conditions) + [13:11:15.647] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.647] cond$call), session = sessionInformation(), [13:11:15.647] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.647] signalCondition(cond) [13:11:15.647] } [13:11:15.647] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.647] signal <- FALSE && inherits(cond, character(0)) [13:11:15.647] ...future.conditions[[length(...future.conditions) + [13:11:15.647] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.647] if (FALSE && !signal) { [13:11:15.647] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.647] { [13:11:15.647] inherits <- base::inherits [13:11:15.647] invokeRestart <- base::invokeRestart [13:11:15.647] is.null <- base::is.null [13:11:15.647] muffled <- FALSE [13:11:15.647] if (inherits(cond, "message")) { [13:11:15.647] muffled <- grepl(pattern, "muffleMessage") [13:11:15.647] if (muffled) [13:11:15.647] invokeRestart("muffleMessage") [13:11:15.647] } [13:11:15.647] else if (inherits(cond, "warning")) { [13:11:15.647] muffled <- grepl(pattern, "muffleWarning") [13:11:15.647] if (muffled) [13:11:15.647] invokeRestart("muffleWarning") [13:11:15.647] } [13:11:15.647] else if (inherits(cond, "condition")) { [13:11:15.647] if (!is.null(pattern)) { [13:11:15.647] computeRestarts <- base::computeRestarts [13:11:15.647] grepl <- base::grepl [13:11:15.647] restarts <- computeRestarts(cond) [13:11:15.647] for (restart in restarts) { [13:11:15.647] name <- restart$name [13:11:15.647] if (is.null(name)) [13:11:15.647] next [13:11:15.647] if (!grepl(pattern, name)) [13:11:15.647] next [13:11:15.647] invokeRestart(restart) [13:11:15.647] muffled <- TRUE [13:11:15.647] break [13:11:15.647] } [13:11:15.647] } [13:11:15.647] } [13:11:15.647] invisible(muffled) [13:11:15.647] } [13:11:15.647] muffleCondition(cond, pattern = "^muffle") [13:11:15.647] } [13:11:15.647] } [13:11:15.647] else { [13:11:15.647] if (TRUE) { [13:11:15.647] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.647] { [13:11:15.647] inherits <- base::inherits [13:11:15.647] invokeRestart <- base::invokeRestart [13:11:15.647] is.null <- base::is.null [13:11:15.647] muffled <- FALSE [13:11:15.647] if (inherits(cond, "message")) { [13:11:15.647] muffled <- grepl(pattern, "muffleMessage") [13:11:15.647] if (muffled) [13:11:15.647] invokeRestart("muffleMessage") [13:11:15.647] } [13:11:15.647] else if (inherits(cond, "warning")) { [13:11:15.647] muffled <- grepl(pattern, "muffleWarning") [13:11:15.647] if (muffled) [13:11:15.647] invokeRestart("muffleWarning") [13:11:15.647] } [13:11:15.647] else if (inherits(cond, "condition")) { [13:11:15.647] if (!is.null(pattern)) { [13:11:15.647] computeRestarts <- base::computeRestarts [13:11:15.647] grepl <- base::grepl [13:11:15.647] restarts <- computeRestarts(cond) [13:11:15.647] for (restart in restarts) { [13:11:15.647] name <- restart$name [13:11:15.647] if (is.null(name)) [13:11:15.647] next [13:11:15.647] if (!grepl(pattern, name)) [13:11:15.647] next [13:11:15.647] invokeRestart(restart) [13:11:15.647] muffled <- TRUE [13:11:15.647] break [13:11:15.647] } [13:11:15.647] } [13:11:15.647] } [13:11:15.647] invisible(muffled) [13:11:15.647] } [13:11:15.647] muffleCondition(cond, pattern = "^muffle") [13:11:15.647] } [13:11:15.647] } [13:11:15.647] } [13:11:15.647] })) [13:11:15.647] }, error = function(ex) { [13:11:15.647] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.647] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.647] ...future.rng), started = ...future.startTime, [13:11:15.647] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.647] version = "1.8"), class = "FutureResult") [13:11:15.647] }, finally = { [13:11:15.647] if (!identical(...future.workdir, getwd())) [13:11:15.647] setwd(...future.workdir) [13:11:15.647] { [13:11:15.647] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.647] ...future.oldOptions$nwarnings <- NULL [13:11:15.647] } [13:11:15.647] base::options(...future.oldOptions) [13:11:15.647] if (.Platform$OS.type == "windows") { [13:11:15.647] old_names <- names(...future.oldEnvVars) [13:11:15.647] envs <- base::Sys.getenv() [13:11:15.647] names <- names(envs) [13:11:15.647] common <- intersect(names, old_names) [13:11:15.647] added <- setdiff(names, old_names) [13:11:15.647] removed <- setdiff(old_names, names) [13:11:15.647] changed <- common[...future.oldEnvVars[common] != [13:11:15.647] envs[common]] [13:11:15.647] NAMES <- toupper(changed) [13:11:15.647] args <- list() [13:11:15.647] for (kk in seq_along(NAMES)) { [13:11:15.647] name <- changed[[kk]] [13:11:15.647] NAME <- NAMES[[kk]] [13:11:15.647] if (name != NAME && is.element(NAME, old_names)) [13:11:15.647] next [13:11:15.647] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.647] } [13:11:15.647] NAMES <- toupper(added) [13:11:15.647] for (kk in seq_along(NAMES)) { [13:11:15.647] name <- added[[kk]] [13:11:15.647] NAME <- NAMES[[kk]] [13:11:15.647] if (name != NAME && is.element(NAME, old_names)) [13:11:15.647] next [13:11:15.647] args[[name]] <- "" [13:11:15.647] } [13:11:15.647] NAMES <- toupper(removed) [13:11:15.647] for (kk in seq_along(NAMES)) { [13:11:15.647] name <- removed[[kk]] [13:11:15.647] NAME <- NAMES[[kk]] [13:11:15.647] if (name != NAME && is.element(NAME, old_names)) [13:11:15.647] next [13:11:15.647] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.647] } [13:11:15.647] if (length(args) > 0) [13:11:15.647] base::do.call(base::Sys.setenv, args = args) [13:11:15.647] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.647] } [13:11:15.647] else { [13:11:15.647] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.647] } [13:11:15.647] { [13:11:15.647] if (base::length(...future.futureOptionsAdded) > [13:11:15.647] 0L) { [13:11:15.647] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.647] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.647] base::options(opts) [13:11:15.647] } [13:11:15.647] { [13:11:15.647] NULL [13:11:15.647] options(future.plan = NULL) [13:11:15.647] if (is.na(NA_character_)) [13:11:15.647] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.647] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.647] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.647] .init = FALSE) [13:11:15.647] } [13:11:15.647] } [13:11:15.647] } [13:11:15.647] }) [13:11:15.647] if (TRUE) { [13:11:15.647] base::sink(type = "output", split = FALSE) [13:11:15.647] if (TRUE) { [13:11:15.647] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.647] } [13:11:15.647] else { [13:11:15.647] ...future.result["stdout"] <- base::list(NULL) [13:11:15.647] } [13:11:15.647] base::close(...future.stdout) [13:11:15.647] ...future.stdout <- NULL [13:11:15.647] } [13:11:15.647] ...future.result$conditions <- ...future.conditions [13:11:15.647] ...future.result$finished <- base::Sys.time() [13:11:15.647] ...future.result [13:11:15.647] } [13:11:15.651] - Launch lazy future ... done [13:11:15.652] run() for 'MiraiFuture' ... done [13:11:15.652] Created future: [13:11:15.653] resolved() for 'MiraiFuture' ... [13:11:15.653] - state: 'running' [13:11:15.653] - run: TRUE [13:11:15.654] - result: 'NULL' [13:11:15.654] - resolved: FALSE [13:11:15.654] resolved() for 'MiraiFuture' ... done [13:11:15.652] MiraiFuture: [13:11:15.652] Label: 'future_lapply-1' [13:11:15.652] Expression: [13:11:15.652] { [13:11:15.652] do.call(function(...) { [13:11:15.652] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.652] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.652] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.652] on.exit(options(oopts), add = TRUE) [13:11:15.652] } [13:11:15.652] { [13:11:15.652] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.652] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.652] ...future.FUN(...future.X_jj, ...) [13:11:15.652] }) [13:11:15.652] } [13:11:15.652] }, args = future.call.arguments) [13:11:15.652] } [13:11:15.652] Lazy evaluation: FALSE [13:11:15.652] Asynchronous evaluation: TRUE [13:11:15.652] Local evaluation: TRUE [13:11:15.652] Environment: R_GlobalEnv [13:11:15.652] Capture standard output: TRUE [13:11:15.652] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.652] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.652] Packages: 1 packages ('future') [13:11:15.652] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.652] Resolved: FALSE [13:11:15.652] Value: [13:11:15.652] Conditions captured: [13:11:15.652] Early signaling: FALSE [13:11:15.652] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.652] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.655] Chunk #1 of 1 ... DONE [13:11:15.655] Launching 1 futures (chunks) ... DONE [13:11:15.655] Resolving 1 futures (chunks) ... [13:11:15.655] resolve() on list ... [13:11:15.655] recursive: 0 [13:11:15.655] length: 1 [13:11:15.655] [13:11:15.656] resolved() for 'MiraiFuture' ... [13:11:15.656] - state: 'running' [13:11:15.656] - run: TRUE [13:11:15.656] - result: 'NULL' [13:11:15.656] - resolved: FALSE [13:11:15.657] resolved() for 'MiraiFuture' ... done [13:11:15.678] resolved() for 'MiraiFuture' ... [13:11:15.679] - state: 'running' [13:11:15.679] - run: TRUE [13:11:15.679] - result: 'NULL' [13:11:15.679] - resolved: FALSE [13:11:15.679] resolved() for 'MiraiFuture' ... done [13:11:15.680] Future #1 [13:11:15.680] signalConditionsASAP(MiraiFuture, pos=1) ... [13:11:15.680] - nx: 1 [13:11:15.680] - relay: TRUE [13:11:15.680] - stdout: TRUE [13:11:15.681] - signal: TRUE [13:11:15.681] - resignal: FALSE [13:11:15.681] - force: TRUE [13:11:15.681] - relayed: [n=1] FALSE [13:11:15.681] - queued futures: [n=1] FALSE [13:11:15.681] - until=1 [13:11:15.682] - relaying element #1 [13:11:15.682] - relayed: [n=1] TRUE [13:11:15.682] - queued futures: [n=1] TRUE [13:11:15.683] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:11:15.683] length: 0 (resolved future 1) [13:11:15.683] Relaying remaining futures [13:11:15.684] signalConditionsASAP(NULL, pos=0) ... [13:11:15.684] - nx: 1 [13:11:15.684] - relay: TRUE [13:11:15.684] - stdout: TRUE [13:11:15.684] - signal: TRUE [13:11:15.684] - resignal: FALSE [13:11:15.684] - force: TRUE [13:11:15.685] - relayed: [n=1] TRUE [13:11:15.685] - queued futures: [n=1] TRUE - flush all [13:11:15.685] - relayed: [n=1] TRUE [13:11:15.685] - queued futures: [n=1] TRUE [13:11:15.685] signalConditionsASAP(NULL, pos=0) ... done [13:11:15.685] resolve() on list ... DONE [13:11:15.686] - Number of value chunks collected: 1 [13:11:15.686] Resolving 1 futures (chunks) ... DONE [13:11:15.686] Reducing values from 1 chunks ... [13:11:15.686] - Number of values collected after concatenation: 1 [13:11:15.686] - Number of values expected: 1 [13:11:15.687] Reducing values from 1 chunks ... DONE [13:11:15.687] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" [13:11:15.688] future_lapply() ... [13:11:15.696] Number of chunks: 1 [13:11:15.696] getGlobalsAndPackagesXApply() ... [13:11:15.696] - future.globals: TRUE [13:11:15.696] getGlobalsAndPackages() ... [13:11:15.697] Searching for globals... [13:11:15.706] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:11:15.707] Searching for globals ... DONE [13:11:15.707] Resolving globals: FALSE [13:11:15.708] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:11:15.708] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [13:11:15.708] - globals: [1] 'FUN' [13:11:15.709] - packages: [1] 'future' [13:11:15.709] getGlobalsAndPackages() ... DONE [13:11:15.709] - globals found/used: [n=1] 'FUN' [13:11:15.709] - needed namespaces: [n=1] 'future' [13:11:15.709] Finding globals ... DONE [13:11:15.709] - use_args: TRUE [13:11:15.710] - Getting '...' globals ... [13:11:15.710] resolve() on list ... [13:11:15.710] recursive: 0 [13:11:15.710] length: 1 [13:11:15.710] elements: '...' [13:11:15.711] length: 0 (resolved future 1) [13:11:15.711] resolve() on list ... DONE [13:11:15.711] - '...' content: [n=2] 'collapse', 'maxHead' [13:11:15.711] List of 1 [13:11:15.711] $ ...:List of 2 [13:11:15.711] ..$ collapse: chr "; " [13:11:15.711] ..$ maxHead : int 3 [13:11:15.711] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.711] - attr(*, "where")=List of 1 [13:11:15.711] ..$ ...: [13:11:15.711] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.711] - attr(*, "resolved")= logi TRUE [13:11:15.711] - attr(*, "total_size")= num NA [13:11:15.715] - Getting '...' globals ... DONE [13:11:15.715] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:11:15.715] List of 2 [13:11:15.715] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:11:15.715] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:11:15.715] $ ... :List of 2 [13:11:15.715] ..$ collapse: chr "; " [13:11:15.715] ..$ maxHead : int 3 [13:11:15.715] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.715] - attr(*, "where")=List of 2 [13:11:15.715] ..$ ...future.FUN: [13:11:15.715] ..$ ... : [13:11:15.715] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.715] - attr(*, "resolved")= logi FALSE [13:11:15.715] - attr(*, "total_size")= num 71456 [13:11:15.719] Packages to be attached in all futures: [n=1] 'future' [13:11:15.719] getGlobalsAndPackagesXApply() ... DONE [13:11:15.720] Number of futures (= number of chunks): 1 [13:11:15.720] Launching 1 futures (chunks) ... [13:11:15.720] Chunk #1 of 1 ... [13:11:15.720] - Finding globals in 'X' for chunk #1 ... [13:11:15.720] getGlobalsAndPackages() ... [13:11:15.721] Searching for globals... [13:11:15.721] [13:11:15.721] Searching for globals ... DONE [13:11:15.721] - globals: [0] [13:11:15.721] getGlobalsAndPackages() ... DONE [13:11:15.721] + additional globals found: [n=0] [13:11:15.722] + additional namespaces needed: [n=0] [13:11:15.722] - Finding globals in 'X' for chunk #1 ... DONE [13:11:15.722] - seeds: [13:11:15.723] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.723] getGlobalsAndPackages() ... [13:11:15.724] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.724] Resolving globals: FALSE [13:11:15.724] Tweak future expression to call with '...' arguments ... [13:11:15.724] { [13:11:15.724] do.call(function(...) { [13:11:15.724] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.724] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.724] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.724] on.exit(options(oopts), add = TRUE) [13:11:15.724] } [13:11:15.724] { [13:11:15.724] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.724] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.724] ...future.FUN(...future.X_jj, ...) [13:11:15.724] }) [13:11:15.724] } [13:11:15.724] }, args = future.call.arguments) [13:11:15.724] } [13:11:15.725] Tweak future expression to call with '...' arguments ... DONE [13:11:15.725] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.725] - packages: [1] 'future' [13:11:15.726] getGlobalsAndPackages() ... DONE [13:11:15.726] run() for 'Future' ... [13:11:15.726] - state: 'created' [13:11:15.726] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.729] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.729] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.729] - Field: 'label' [13:11:15.729] - Field: 'local' [13:11:15.730] - Field: 'owner' [13:11:15.730] - Field: 'envir' [13:11:15.730] - Field: 'packages' [13:11:15.730] - Field: 'gc' [13:11:15.730] - Field: 'conditions' [13:11:15.730] - Field: 'expr' [13:11:15.731] - Field: 'uuid' [13:11:15.731] - Field: 'seed' [13:11:15.731] - Field: 'version' [13:11:15.731] - Field: 'result' [13:11:15.731] - Field: 'asynchronous' [13:11:15.731] - Field: 'calls' [13:11:15.732] - Field: 'globals' [13:11:15.732] - Field: 'stdout' [13:11:15.732] - Field: 'earlySignal' [13:11:15.732] - Field: 'lazy' [13:11:15.732] - Field: 'state' [13:11:15.732] - Field: '.cluster' [13:11:15.733] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.733] - Launch lazy future ... [13:11:15.733] Packages needed by the future expression (n = 1): 'future' [13:11:15.733] Packages needed by future strategies (n = 0): [13:11:15.734] { [13:11:15.734] { [13:11:15.734] { [13:11:15.734] ...future.startTime <- base::Sys.time() [13:11:15.734] { [13:11:15.734] { [13:11:15.734] { [13:11:15.734] { [13:11:15.734] base::local({ [13:11:15.734] has_future <- base::requireNamespace("future", [13:11:15.734] quietly = TRUE) [13:11:15.734] if (has_future) { [13:11:15.734] ns <- base::getNamespace("future") [13:11:15.734] version <- ns[[".package"]][["version"]] [13:11:15.734] if (is.null(version)) [13:11:15.734] version <- utils::packageVersion("future") [13:11:15.734] } [13:11:15.734] else { [13:11:15.734] version <- NULL [13:11:15.734] } [13:11:15.734] if (!has_future || version < "1.8.0") { [13:11:15.734] info <- base::c(r_version = base::gsub("R version ", [13:11:15.734] "", base::R.version$version.string), [13:11:15.734] platform = base::sprintf("%s (%s-bit)", [13:11:15.734] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.734] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.734] "release", "version")], collapse = " "), [13:11:15.734] hostname = base::Sys.info()[["nodename"]]) [13:11:15.734] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.734] info) [13:11:15.734] info <- base::paste(info, collapse = "; ") [13:11:15.734] if (!has_future) { [13:11:15.734] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.734] info) [13:11:15.734] } [13:11:15.734] else { [13:11:15.734] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.734] info, version) [13:11:15.734] } [13:11:15.734] base::stop(msg) [13:11:15.734] } [13:11:15.734] }) [13:11:15.734] } [13:11:15.734] base::local({ [13:11:15.734] for (pkg in "future") { [13:11:15.734] base::loadNamespace(pkg) [13:11:15.734] base::library(pkg, character.only = TRUE) [13:11:15.734] } [13:11:15.734] }) [13:11:15.734] } [13:11:15.734] ...future.strategy.old <- future::plan("list") [13:11:15.734] options(future.plan = NULL) [13:11:15.734] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.734] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.734] } [13:11:15.734] ...future.workdir <- getwd() [13:11:15.734] } [13:11:15.734] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.734] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.734] } [13:11:15.734] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.734] future.globals.maxSize = NULL, future.globals.method = NULL, [13:11:15.734] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.734] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.734] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.734] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.734] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.734] base::names(...future.oldOptions)) [13:11:15.734] } [13:11:15.734] if (FALSE) { [13:11:15.734] } [13:11:15.734] else { [13:11:15.734] if (TRUE) { [13:11:15.734] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.734] open = "w") [13:11:15.734] } [13:11:15.734] else { [13:11:15.734] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.734] windows = "NUL", "/dev/null"), open = "w") [13:11:15.734] } [13:11:15.734] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.734] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.734] base::sink(type = "output", split = FALSE) [13:11:15.734] base::close(...future.stdout) [13:11:15.734] }, add = TRUE) [13:11:15.734] } [13:11:15.734] ...future.frame <- base::sys.nframe() [13:11:15.734] ...future.conditions <- base::list() [13:11:15.734] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.734] if (FALSE) { [13:11:15.734] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.734] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.734] } [13:11:15.734] ...future.result <- base::tryCatch({ [13:11:15.734] base::withCallingHandlers({ [13:11:15.734] ...future.value <- base::withVisible(base::local({ [13:11:15.734] do.call(function(...) { [13:11:15.734] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.734] if (!identical(...future.globals.maxSize.org, [13:11:15.734] ...future.globals.maxSize)) { [13:11:15.734] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.734] on.exit(options(oopts), add = TRUE) [13:11:15.734] } [13:11:15.734] { [13:11:15.734] lapply(seq_along(...future.elements_ii), [13:11:15.734] FUN = function(jj) { [13:11:15.734] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.734] ...future.FUN(...future.X_jj, ...) [13:11:15.734] }) [13:11:15.734] } [13:11:15.734] }, args = future.call.arguments) [13:11:15.734] })) [13:11:15.734] future::FutureResult(value = ...future.value$value, [13:11:15.734] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.734] ...future.rng), globalenv = if (FALSE) [13:11:15.734] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.734] ...future.globalenv.names)) [13:11:15.734] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.734] }, condition = base::local({ [13:11:15.734] c <- base::c [13:11:15.734] inherits <- base::inherits [13:11:15.734] invokeRestart <- base::invokeRestart [13:11:15.734] length <- base::length [13:11:15.734] list <- base::list [13:11:15.734] seq.int <- base::seq.int [13:11:15.734] signalCondition <- base::signalCondition [13:11:15.734] sys.calls <- base::sys.calls [13:11:15.734] `[[` <- base::`[[` [13:11:15.734] `+` <- base::`+` [13:11:15.734] `<<-` <- base::`<<-` [13:11:15.734] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.734] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.734] 3L)] [13:11:15.734] } [13:11:15.734] function(cond) { [13:11:15.734] is_error <- inherits(cond, "error") [13:11:15.734] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.734] NULL) [13:11:15.734] if (is_error) { [13:11:15.734] sessionInformation <- function() { [13:11:15.734] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.734] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.734] search = base::search(), system = base::Sys.info()) [13:11:15.734] } [13:11:15.734] ...future.conditions[[length(...future.conditions) + [13:11:15.734] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.734] cond$call), session = sessionInformation(), [13:11:15.734] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.734] signalCondition(cond) [13:11:15.734] } [13:11:15.734] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.734] signal <- FALSE && inherits(cond, character(0)) [13:11:15.734] ...future.conditions[[length(...future.conditions) + [13:11:15.734] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.734] if (FALSE && !signal) { [13:11:15.734] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.734] { [13:11:15.734] inherits <- base::inherits [13:11:15.734] invokeRestart <- base::invokeRestart [13:11:15.734] is.null <- base::is.null [13:11:15.734] muffled <- FALSE [13:11:15.734] if (inherits(cond, "message")) { [13:11:15.734] muffled <- grepl(pattern, "muffleMessage") [13:11:15.734] if (muffled) [13:11:15.734] invokeRestart("muffleMessage") [13:11:15.734] } [13:11:15.734] else if (inherits(cond, "warning")) { [13:11:15.734] muffled <- grepl(pattern, "muffleWarning") [13:11:15.734] if (muffled) [13:11:15.734] invokeRestart("muffleWarning") [13:11:15.734] } [13:11:15.734] else if (inherits(cond, "condition")) { [13:11:15.734] if (!is.null(pattern)) { [13:11:15.734] computeRestarts <- base::computeRestarts [13:11:15.734] grepl <- base::grepl [13:11:15.734] restarts <- computeRestarts(cond) [13:11:15.734] for (restart in restarts) { [13:11:15.734] name <- restart$name [13:11:15.734] if (is.null(name)) [13:11:15.734] next [13:11:15.734] if (!grepl(pattern, name)) [13:11:15.734] next [13:11:15.734] invokeRestart(restart) [13:11:15.734] muffled <- TRUE [13:11:15.734] break [13:11:15.734] } [13:11:15.734] } [13:11:15.734] } [13:11:15.734] invisible(muffled) [13:11:15.734] } [13:11:15.734] muffleCondition(cond, pattern = "^muffle") [13:11:15.734] } [13:11:15.734] } [13:11:15.734] else { [13:11:15.734] if (TRUE) { [13:11:15.734] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.734] { [13:11:15.734] inherits <- base::inherits [13:11:15.734] invokeRestart <- base::invokeRestart [13:11:15.734] is.null <- base::is.null [13:11:15.734] muffled <- FALSE [13:11:15.734] if (inherits(cond, "message")) { [13:11:15.734] muffled <- grepl(pattern, "muffleMessage") [13:11:15.734] if (muffled) [13:11:15.734] invokeRestart("muffleMessage") [13:11:15.734] } [13:11:15.734] else if (inherits(cond, "warning")) { [13:11:15.734] muffled <- grepl(pattern, "muffleWarning") [13:11:15.734] if (muffled) [13:11:15.734] invokeRestart("muffleWarning") [13:11:15.734] } [13:11:15.734] else if (inherits(cond, "condition")) { [13:11:15.734] if (!is.null(pattern)) { [13:11:15.734] computeRestarts <- base::computeRestarts [13:11:15.734] grepl <- base::grepl [13:11:15.734] restarts <- computeRestarts(cond) [13:11:15.734] for (restart in restarts) { [13:11:15.734] name <- restart$name [13:11:15.734] if (is.null(name)) [13:11:15.734] next [13:11:15.734] if (!grepl(pattern, name)) [13:11:15.734] next [13:11:15.734] invokeRestart(restart) [13:11:15.734] muffled <- TRUE [13:11:15.734] break [13:11:15.734] } [13:11:15.734] } [13:11:15.734] } [13:11:15.734] invisible(muffled) [13:11:15.734] } [13:11:15.734] muffleCondition(cond, pattern = "^muffle") [13:11:15.734] } [13:11:15.734] } [13:11:15.734] } [13:11:15.734] })) [13:11:15.734] }, error = function(ex) { [13:11:15.734] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.734] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.734] ...future.rng), started = ...future.startTime, [13:11:15.734] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.734] version = "1.8"), class = "FutureResult") [13:11:15.734] }, finally = { [13:11:15.734] if (!identical(...future.workdir, getwd())) [13:11:15.734] setwd(...future.workdir) [13:11:15.734] { [13:11:15.734] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.734] ...future.oldOptions$nwarnings <- NULL [13:11:15.734] } [13:11:15.734] base::options(...future.oldOptions) [13:11:15.734] if (.Platform$OS.type == "windows") { [13:11:15.734] old_names <- names(...future.oldEnvVars) [13:11:15.734] envs <- base::Sys.getenv() [13:11:15.734] names <- names(envs) [13:11:15.734] common <- intersect(names, old_names) [13:11:15.734] added <- setdiff(names, old_names) [13:11:15.734] removed <- setdiff(old_names, names) [13:11:15.734] changed <- common[...future.oldEnvVars[common] != [13:11:15.734] envs[common]] [13:11:15.734] NAMES <- toupper(changed) [13:11:15.734] args <- list() [13:11:15.734] for (kk in seq_along(NAMES)) { [13:11:15.734] name <- changed[[kk]] [13:11:15.734] NAME <- NAMES[[kk]] [13:11:15.734] if (name != NAME && is.element(NAME, old_names)) [13:11:15.734] next [13:11:15.734] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.734] } [13:11:15.734] NAMES <- toupper(added) [13:11:15.734] for (kk in seq_along(NAMES)) { [13:11:15.734] name <- added[[kk]] [13:11:15.734] NAME <- NAMES[[kk]] [13:11:15.734] if (name != NAME && is.element(NAME, old_names)) [13:11:15.734] next [13:11:15.734] args[[name]] <- "" [13:11:15.734] } [13:11:15.734] NAMES <- toupper(removed) [13:11:15.734] for (kk in seq_along(NAMES)) { [13:11:15.734] name <- removed[[kk]] [13:11:15.734] NAME <- NAMES[[kk]] [13:11:15.734] if (name != NAME && is.element(NAME, old_names)) [13:11:15.734] next [13:11:15.734] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.734] } [13:11:15.734] if (length(args) > 0) [13:11:15.734] base::do.call(base::Sys.setenv, args = args) [13:11:15.734] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.734] } [13:11:15.734] else { [13:11:15.734] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.734] } [13:11:15.734] { [13:11:15.734] if (base::length(...future.futureOptionsAdded) > [13:11:15.734] 0L) { [13:11:15.734] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.734] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.734] base::options(opts) [13:11:15.734] } [13:11:15.734] { [13:11:15.734] NULL [13:11:15.734] options(future.plan = NULL) [13:11:15.734] if (is.na(NA_character_)) [13:11:15.734] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.734] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.734] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.734] .init = FALSE) [13:11:15.734] } [13:11:15.734] } [13:11:15.734] } [13:11:15.734] }) [13:11:15.734] if (TRUE) { [13:11:15.734] base::sink(type = "output", split = FALSE) [13:11:15.734] if (TRUE) { [13:11:15.734] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.734] } [13:11:15.734] else { [13:11:15.734] ...future.result["stdout"] <- base::list(NULL) [13:11:15.734] } [13:11:15.734] base::close(...future.stdout) [13:11:15.734] ...future.stdout <- NULL [13:11:15.734] } [13:11:15.734] ...future.result$conditions <- ...future.conditions [13:11:15.734] ...future.result$finished <- base::Sys.time() [13:11:15.734] ...future.result [13:11:15.734] } [13:11:15.738] - Launch lazy future ... done [13:11:15.738] run() for 'MiraiFuture' ... done [13:11:15.738] Created future: [13:11:15.740] resolved() for 'MiraiFuture' ... [13:11:15.740] - state: 'running' [13:11:15.740] - run: TRUE [13:11:15.740] - result: 'NULL' [13:11:15.740] - resolved: FALSE [13:11:15.741] resolved() for 'MiraiFuture' ... done [13:11:15.738] MiraiFuture: [13:11:15.738] Label: 'future_lapply-1' [13:11:15.738] Expression: [13:11:15.738] { [13:11:15.738] do.call(function(...) { [13:11:15.738] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.738] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.738] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.738] on.exit(options(oopts), add = TRUE) [13:11:15.738] } [13:11:15.738] { [13:11:15.738] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.738] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.738] ...future.FUN(...future.X_jj, ...) [13:11:15.738] }) [13:11:15.738] } [13:11:15.738] }, args = future.call.arguments) [13:11:15.738] } [13:11:15.738] Lazy evaluation: FALSE [13:11:15.738] Asynchronous evaluation: TRUE [13:11:15.738] Local evaluation: TRUE [13:11:15.738] Environment: R_GlobalEnv [13:11:15.738] Capture standard output: TRUE [13:11:15.738] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.738] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.738] Packages: 1 packages ('future') [13:11:15.738] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.738] Resolved: FALSE [13:11:15.738] Value: [13:11:15.738] Conditions captured: [13:11:15.738] Early signaling: FALSE [13:11:15.738] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.738] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.741] Chunk #1 of 1 ... DONE [13:11:15.741] Launching 1 futures (chunks) ... DONE [13:11:15.741] Resolving 1 futures (chunks) ... [13:11:15.741] resolve() on list ... [13:11:15.742] recursive: 0 [13:11:15.742] length: 1 [13:11:15.742] [13:11:15.742] resolved() for 'MiraiFuture' ... [13:11:15.742] - state: 'running' [13:11:15.743] - run: TRUE [13:11:15.743] - result: 'NULL' [13:11:15.743] - resolved: FALSE [13:11:15.743] resolved() for 'MiraiFuture' ... done [13:11:15.756] resolved() for 'MiraiFuture' ... [13:11:15.757] - state: 'running' [13:11:15.757] - run: TRUE [13:11:15.757] - result: 'NULL' [13:11:15.757] - resolved: FALSE [13:11:15.757] resolved() for 'MiraiFuture' ... done [13:11:15.758] Future #1 [13:11:15.758] signalConditionsASAP(MiraiFuture, pos=1) ... [13:11:15.758] - nx: 1 [13:11:15.758] - relay: TRUE [13:11:15.758] - stdout: TRUE [13:11:15.758] - signal: TRUE [13:11:15.759] - resignal: FALSE [13:11:15.759] - force: TRUE [13:11:15.759] - relayed: [n=1] FALSE [13:11:15.759] - queued futures: [n=1] FALSE [13:11:15.759] - until=1 [13:11:15.759] - relaying element #1 [13:11:15.760] - relayed: [n=1] TRUE [13:11:15.760] - queued futures: [n=1] TRUE [13:11:15.760] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:11:15.760] length: 0 (resolved future 1) [13:11:15.760] Relaying remaining futures [13:11:15.760] signalConditionsASAP(NULL, pos=0) ... [13:11:15.761] - nx: 1 [13:11:15.761] - relay: TRUE [13:11:15.761] - stdout: TRUE [13:11:15.761] - signal: TRUE [13:11:15.761] - resignal: FALSE [13:11:15.761] - force: TRUE [13:11:15.761] - relayed: [n=1] TRUE [13:11:15.762] - queued futures: [n=1] TRUE - flush all [13:11:15.762] - relayed: [n=1] TRUE [13:11:15.762] - queued futures: [n=1] TRUE [13:11:15.762] signalConditionsASAP(NULL, pos=0) ... done [13:11:15.762] resolve() on list ... DONE [13:11:15.763] - Number of value chunks collected: 1 [13:11:15.763] Resolving 1 futures (chunks) ... DONE [13:11:15.763] Reducing values from 1 chunks ... [13:11:15.763] - Number of values collected after concatenation: 1 [13:11:15.763] - Number of values expected: 1 [13:11:15.763] Reducing values from 1 chunks ... DONE [13:11:15.764] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... $a A 'listenv' vector with 1 element ('A'). $b A 'listenv' vector with 2 elements ('A', 'B'). List of 1 $ y0:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" [13:11:15.776] - plan('mirai_multisession') ...[13:11:15.777] plan(): Setting new future strategy stack: [13:11:15.777] List of future strategies: [13:11:15.777] 1. mirai_multisession: [13:11:15.777] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:11:15.777] - tweaked: FALSE [13:11:15.777] - call: plan(strategy) [13:11:15.777] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:11:15.778] < mirai | $data > [13:11:15.780] getGlobalsAndPackages() ... [13:11:15.780] Not searching for globals [13:11:15.780] - globals: [0] [13:11:15.781] getGlobalsAndPackages() ... DONE [13:11:15.781] getGlobalsAndPackages() ... [13:11:15.781] [13:11:15.781] - globals: [0] [13:11:15.781] getGlobalsAndPackages() ... DONE [13:11:15.782] Packages needed by the future expression (n = 0): [13:11:15.782] Packages needed by future strategies (n = 0): [13:11:15.782] { [13:11:15.782] { [13:11:15.782] { [13:11:15.782] ...future.startTime <- base::Sys.time() [13:11:15.782] { [13:11:15.782] { [13:11:15.782] { [13:11:15.782] base::local({ [13:11:15.782] has_future <- base::requireNamespace("future", [13:11:15.782] quietly = TRUE) [13:11:15.782] if (has_future) { [13:11:15.782] ns <- base::getNamespace("future") [13:11:15.782] version <- ns[[".package"]][["version"]] [13:11:15.782] if (is.null(version)) [13:11:15.782] version <- utils::packageVersion("future") [13:11:15.782] } [13:11:15.782] else { [13:11:15.782] version <- NULL [13:11:15.782] } [13:11:15.782] if (!has_future || version < "1.8.0") { [13:11:15.782] info <- base::c(r_version = base::gsub("R version ", [13:11:15.782] "", base::R.version$version.string), [13:11:15.782] platform = base::sprintf("%s (%s-bit)", [13:11:15.782] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.782] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.782] "release", "version")], collapse = " "), [13:11:15.782] hostname = base::Sys.info()[["nodename"]]) [13:11:15.782] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.782] info) [13:11:15.782] info <- base::paste(info, collapse = "; ") [13:11:15.782] if (!has_future) { [13:11:15.782] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.782] info) [13:11:15.782] } [13:11:15.782] else { [13:11:15.782] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.782] info, version) [13:11:15.782] } [13:11:15.782] base::stop(msg) [13:11:15.782] } [13:11:15.782] }) [13:11:15.782] } [13:11:15.782] ...future.strategy.old <- future::plan("list") [13:11:15.782] options(future.plan = NULL) [13:11:15.782] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.782] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.782] } [13:11:15.782] ...future.workdir <- getwd() [13:11:15.782] } [13:11:15.782] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.782] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.782] } [13:11:15.782] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.782] future.globals.maxSize = NULL, future.globals.method = NULL, [13:11:15.782] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.782] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.782] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.782] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.782] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.782] base::names(...future.oldOptions)) [13:11:15.782] } [13:11:15.782] if (FALSE) { [13:11:15.782] } [13:11:15.782] else { [13:11:15.782] if (TRUE) { [13:11:15.782] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.782] open = "w") [13:11:15.782] } [13:11:15.782] else { [13:11:15.782] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.782] windows = "NUL", "/dev/null"), open = "w") [13:11:15.782] } [13:11:15.782] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.782] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.782] base::sink(type = "output", split = FALSE) [13:11:15.782] base::close(...future.stdout) [13:11:15.782] }, add = TRUE) [13:11:15.782] } [13:11:15.782] ...future.frame <- base::sys.nframe() [13:11:15.782] ...future.conditions <- base::list() [13:11:15.782] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.782] if (FALSE) { [13:11:15.782] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.782] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.782] } [13:11:15.782] ...future.result <- base::tryCatch({ [13:11:15.782] base::withCallingHandlers({ [13:11:15.782] ...future.value <- base::withVisible(base::local(NA)) [13:11:15.782] future::FutureResult(value = ...future.value$value, [13:11:15.782] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.782] ...future.rng), globalenv = if (FALSE) [13:11:15.782] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.782] ...future.globalenv.names)) [13:11:15.782] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.782] }, condition = base::local({ [13:11:15.782] c <- base::c [13:11:15.782] inherits <- base::inherits [13:11:15.782] invokeRestart <- base::invokeRestart [13:11:15.782] length <- base::length [13:11:15.782] list <- base::list [13:11:15.782] seq.int <- base::seq.int [13:11:15.782] signalCondition <- base::signalCondition [13:11:15.782] sys.calls <- base::sys.calls [13:11:15.782] `[[` <- base::`[[` [13:11:15.782] `+` <- base::`+` [13:11:15.782] `<<-` <- base::`<<-` [13:11:15.782] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.782] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.782] 3L)] [13:11:15.782] } [13:11:15.782] function(cond) { [13:11:15.782] is_error <- inherits(cond, "error") [13:11:15.782] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.782] NULL) [13:11:15.782] if (is_error) { [13:11:15.782] sessionInformation <- function() { [13:11:15.782] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.782] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.782] search = base::search(), system = base::Sys.info()) [13:11:15.782] } [13:11:15.782] ...future.conditions[[length(...future.conditions) + [13:11:15.782] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.782] cond$call), session = sessionInformation(), [13:11:15.782] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.782] signalCondition(cond) [13:11:15.782] } [13:11:15.782] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.782] signal <- FALSE && inherits(cond, character(0)) [13:11:15.782] ...future.conditions[[length(...future.conditions) + [13:11:15.782] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.782] if (FALSE && !signal) { [13:11:15.782] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.782] { [13:11:15.782] inherits <- base::inherits [13:11:15.782] invokeRestart <- base::invokeRestart [13:11:15.782] is.null <- base::is.null [13:11:15.782] muffled <- FALSE [13:11:15.782] if (inherits(cond, "message")) { [13:11:15.782] muffled <- grepl(pattern, "muffleMessage") [13:11:15.782] if (muffled) [13:11:15.782] invokeRestart("muffleMessage") [13:11:15.782] } [13:11:15.782] else if (inherits(cond, "warning")) { [13:11:15.782] muffled <- grepl(pattern, "muffleWarning") [13:11:15.782] if (muffled) [13:11:15.782] invokeRestart("muffleWarning") [13:11:15.782] } [13:11:15.782] else if (inherits(cond, "condition")) { [13:11:15.782] if (!is.null(pattern)) { [13:11:15.782] computeRestarts <- base::computeRestarts [13:11:15.782] grepl <- base::grepl [13:11:15.782] restarts <- computeRestarts(cond) [13:11:15.782] for (restart in restarts) { [13:11:15.782] name <- restart$name [13:11:15.782] if (is.null(name)) [13:11:15.782] next [13:11:15.782] if (!grepl(pattern, name)) [13:11:15.782] next [13:11:15.782] invokeRestart(restart) [13:11:15.782] muffled <- TRUE [13:11:15.782] break [13:11:15.782] } [13:11:15.782] } [13:11:15.782] } [13:11:15.782] invisible(muffled) [13:11:15.782] } [13:11:15.782] muffleCondition(cond, pattern = "^muffle") [13:11:15.782] } [13:11:15.782] } [13:11:15.782] else { [13:11:15.782] if (TRUE) { [13:11:15.782] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.782] { [13:11:15.782] inherits <- base::inherits [13:11:15.782] invokeRestart <- base::invokeRestart [13:11:15.782] is.null <- base::is.null [13:11:15.782] muffled <- FALSE [13:11:15.782] if (inherits(cond, "message")) { [13:11:15.782] muffled <- grepl(pattern, "muffleMessage") [13:11:15.782] if (muffled) [13:11:15.782] invokeRestart("muffleMessage") [13:11:15.782] } [13:11:15.782] else if (inherits(cond, "warning")) { [13:11:15.782] muffled <- grepl(pattern, "muffleWarning") [13:11:15.782] if (muffled) [13:11:15.782] invokeRestart("muffleWarning") [13:11:15.782] } [13:11:15.782] else if (inherits(cond, "condition")) { [13:11:15.782] if (!is.null(pattern)) { [13:11:15.782] computeRestarts <- base::computeRestarts [13:11:15.782] grepl <- base::grepl [13:11:15.782] restarts <- computeRestarts(cond) [13:11:15.782] for (restart in restarts) { [13:11:15.782] name <- restart$name [13:11:15.782] if (is.null(name)) [13:11:15.782] next [13:11:15.782] if (!grepl(pattern, name)) [13:11:15.782] next [13:11:15.782] invokeRestart(restart) [13:11:15.782] muffled <- TRUE [13:11:15.782] break [13:11:15.782] } [13:11:15.782] } [13:11:15.782] } [13:11:15.782] invisible(muffled) [13:11:15.782] } [13:11:15.782] muffleCondition(cond, pattern = "^muffle") [13:11:15.782] } [13:11:15.782] } [13:11:15.782] } [13:11:15.782] })) [13:11:15.782] }, error = function(ex) { [13:11:15.782] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.782] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.782] ...future.rng), started = ...future.startTime, [13:11:15.782] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.782] version = "1.8"), class = "FutureResult") [13:11:15.782] }, finally = { [13:11:15.782] if (!identical(...future.workdir, getwd())) [13:11:15.782] setwd(...future.workdir) [13:11:15.782] { [13:11:15.782] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.782] ...future.oldOptions$nwarnings <- NULL [13:11:15.782] } [13:11:15.782] base::options(...future.oldOptions) [13:11:15.782] if (.Platform$OS.type == "windows") { [13:11:15.782] old_names <- names(...future.oldEnvVars) [13:11:15.782] envs <- base::Sys.getenv() [13:11:15.782] names <- names(envs) [13:11:15.782] common <- intersect(names, old_names) [13:11:15.782] added <- setdiff(names, old_names) [13:11:15.782] removed <- setdiff(old_names, names) [13:11:15.782] changed <- common[...future.oldEnvVars[common] != [13:11:15.782] envs[common]] [13:11:15.782] NAMES <- toupper(changed) [13:11:15.782] args <- list() [13:11:15.782] for (kk in seq_along(NAMES)) { [13:11:15.782] name <- changed[[kk]] [13:11:15.782] NAME <- NAMES[[kk]] [13:11:15.782] if (name != NAME && is.element(NAME, old_names)) [13:11:15.782] next [13:11:15.782] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.782] } [13:11:15.782] NAMES <- toupper(added) [13:11:15.782] for (kk in seq_along(NAMES)) { [13:11:15.782] name <- added[[kk]] [13:11:15.782] NAME <- NAMES[[kk]] [13:11:15.782] if (name != NAME && is.element(NAME, old_names)) [13:11:15.782] next [13:11:15.782] args[[name]] <- "" [13:11:15.782] } [13:11:15.782] NAMES <- toupper(removed) [13:11:15.782] for (kk in seq_along(NAMES)) { [13:11:15.782] name <- removed[[kk]] [13:11:15.782] NAME <- NAMES[[kk]] [13:11:15.782] if (name != NAME && is.element(NAME, old_names)) [13:11:15.782] next [13:11:15.782] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.782] } [13:11:15.782] if (length(args) > 0) [13:11:15.782] base::do.call(base::Sys.setenv, args = args) [13:11:15.782] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.782] } [13:11:15.782] else { [13:11:15.782] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.782] } [13:11:15.782] { [13:11:15.782] if (base::length(...future.futureOptionsAdded) > [13:11:15.782] 0L) { [13:11:15.782] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.782] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.782] base::options(opts) [13:11:15.782] } [13:11:15.782] { [13:11:15.782] NULL [13:11:15.782] options(future.plan = NULL) [13:11:15.782] if (is.na(NA_character_)) [13:11:15.782] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.782] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.782] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.782] .init = FALSE) [13:11:15.782] } [13:11:15.782] } [13:11:15.782] } [13:11:15.782] }) [13:11:15.782] if (TRUE) { [13:11:15.782] base::sink(type = "output", split = FALSE) [13:11:15.782] if (TRUE) { [13:11:15.782] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.782] } [13:11:15.782] else { [13:11:15.782] ...future.result["stdout"] <- base::list(NULL) [13:11:15.782] } [13:11:15.782] base::close(...future.stdout) [13:11:15.782] ...future.stdout <- NULL [13:11:15.782] } [13:11:15.782] ...future.result$conditions <- ...future.conditions [13:11:15.782] ...future.result$finished <- base::Sys.time() [13:11:15.782] ...future.result [13:11:15.782] } [13:11:15.807] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:11:15.807] plan(): nbrOfWorkers() = 2 [13:11:15.808] future_lapply() ... [13:11:15.809] Number of chunks: 2 [13:11:15.809] getGlobalsAndPackagesXApply() ... [13:11:15.809] - future.globals: TRUE [13:11:15.809] getGlobalsAndPackages() ... [13:11:15.809] Searching for globals... [13:11:15.811] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:11:15.811] Searching for globals ... DONE [13:11:15.811] Resolving globals: FALSE [13:11:15.812] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:11:15.812] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [13:11:15.813] - globals: [1] 'FUN' [13:11:15.813] - packages: [1] 'listenv' [13:11:15.813] getGlobalsAndPackages() ... DONE [13:11:15.813] - globals found/used: [n=1] 'FUN' [13:11:15.813] - needed namespaces: [n=1] 'listenv' [13:11:15.813] Finding globals ... DONE [13:11:15.814] - use_args: TRUE [13:11:15.814] - Getting '...' globals ... [13:11:15.814] resolve() on list ... [13:11:15.814] recursive: 0 [13:11:15.815] length: 1 [13:11:15.815] elements: '...' [13:11:15.815] length: 0 (resolved future 1) [13:11:15.815] resolve() on list ... DONE [13:11:15.815] - '...' content: [n=0] [13:11:15.815] List of 1 [13:11:15.815] $ ...: list() [13:11:15.815] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.815] - attr(*, "where")=List of 1 [13:11:15.815] ..$ ...: [13:11:15.815] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.815] - attr(*, "resolved")= logi TRUE [13:11:15.815] - attr(*, "total_size")= num NA [13:11:15.820] - Getting '...' globals ... DONE [13:11:15.821] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:11:15.821] List of 2 [13:11:15.821] $ ...future.FUN:function (x, ...) [13:11:15.821] $ ... : list() [13:11:15.821] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.821] - attr(*, "where")=List of 2 [13:11:15.821] ..$ ...future.FUN: [13:11:15.821] ..$ ... : [13:11:15.821] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.821] - attr(*, "resolved")= logi FALSE [13:11:15.821] - attr(*, "total_size")= num 4968 [13:11:15.824] Packages to be attached in all futures: [n=1] 'listenv' [13:11:15.824] getGlobalsAndPackagesXApply() ... DONE [13:11:15.825] Number of futures (= number of chunks): 2 [13:11:15.825] Launching 2 futures (chunks) ... [13:11:15.825] Chunk #1 of 2 ... [13:11:15.825] - Finding globals in 'X' for chunk #1 ... [13:11:15.825] getGlobalsAndPackages() ... [13:11:15.825] Searching for globals... [13:11:15.826] [13:11:15.826] Searching for globals ... DONE [13:11:15.826] - globals: [0] [13:11:15.827] getGlobalsAndPackages() ... DONE [13:11:15.827] + additional globals found: [n=0] [13:11:15.827] + additional namespaces needed: [n=0] [13:11:15.827] - Finding globals in 'X' for chunk #1 ... DONE [13:11:15.827] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:11:15.827] - seeds: [13:11:15.827] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.828] getGlobalsAndPackages() ... [13:11:15.828] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.828] Resolving globals: FALSE [13:11:15.828] Tweak future expression to call with '...' arguments ... [13:11:15.828] { [13:11:15.828] do.call(function(...) { [13:11:15.828] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.828] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.828] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.828] on.exit(options(oopts), add = TRUE) [13:11:15.828] } [13:11:15.828] { [13:11:15.828] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.828] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.828] ...future.FUN(...future.X_jj, ...) [13:11:15.828] }) [13:11:15.828] } [13:11:15.828] }, args = future.call.arguments) [13:11:15.828] } [13:11:15.829] Tweak future expression to call with '...' arguments ... DONE [13:11:15.829] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.830] - packages: [1] 'listenv' [13:11:15.830] getGlobalsAndPackages() ... DONE [13:11:15.830] run() for 'Future' ... [13:11:15.830] - state: 'created' [13:11:15.830] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.833] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.833] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.833] - Field: 'label' [13:11:15.833] - Field: 'local' [13:11:15.834] - Field: 'owner' [13:11:15.834] - Field: 'envir' [13:11:15.834] - Field: 'packages' [13:11:15.834] - Field: 'gc' [13:11:15.834] - Field: 'conditions' [13:11:15.834] - Field: 'expr' [13:11:15.835] - Field: 'uuid' [13:11:15.835] - Field: 'seed' [13:11:15.835] - Field: 'version' [13:11:15.835] - Field: 'result' [13:11:15.835] - Field: 'asynchronous' [13:11:15.835] - Field: 'calls' [13:11:15.836] - Field: 'globals' [13:11:15.836] - Field: 'stdout' [13:11:15.836] - Field: 'earlySignal' [13:11:15.836] - Field: 'lazy' [13:11:15.836] - Field: 'state' [13:11:15.837] - Field: '.cluster' [13:11:15.837] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.837] - Launch lazy future ... [13:11:15.837] Packages needed by the future expression (n = 1): 'listenv' [13:11:15.837] Packages needed by future strategies (n = 0): [13:11:15.838] { [13:11:15.838] { [13:11:15.838] { [13:11:15.838] ...future.startTime <- base::Sys.time() [13:11:15.838] { [13:11:15.838] { [13:11:15.838] { [13:11:15.838] { [13:11:15.838] base::local({ [13:11:15.838] has_future <- base::requireNamespace("future", [13:11:15.838] quietly = TRUE) [13:11:15.838] if (has_future) { [13:11:15.838] ns <- base::getNamespace("future") [13:11:15.838] version <- ns[[".package"]][["version"]] [13:11:15.838] if (is.null(version)) [13:11:15.838] version <- utils::packageVersion("future") [13:11:15.838] } [13:11:15.838] else { [13:11:15.838] version <- NULL [13:11:15.838] } [13:11:15.838] if (!has_future || version < "1.8.0") { [13:11:15.838] info <- base::c(r_version = base::gsub("R version ", [13:11:15.838] "", base::R.version$version.string), [13:11:15.838] platform = base::sprintf("%s (%s-bit)", [13:11:15.838] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.838] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.838] "release", "version")], collapse = " "), [13:11:15.838] hostname = base::Sys.info()[["nodename"]]) [13:11:15.838] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.838] info) [13:11:15.838] info <- base::paste(info, collapse = "; ") [13:11:15.838] if (!has_future) { [13:11:15.838] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.838] info) [13:11:15.838] } [13:11:15.838] else { [13:11:15.838] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.838] info, version) [13:11:15.838] } [13:11:15.838] base::stop(msg) [13:11:15.838] } [13:11:15.838] }) [13:11:15.838] } [13:11:15.838] base::local({ [13:11:15.838] for (pkg in "listenv") { [13:11:15.838] base::loadNamespace(pkg) [13:11:15.838] base::library(pkg, character.only = TRUE) [13:11:15.838] } [13:11:15.838] }) [13:11:15.838] } [13:11:15.838] ...future.strategy.old <- future::plan("list") [13:11:15.838] options(future.plan = NULL) [13:11:15.838] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.838] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.838] } [13:11:15.838] ...future.workdir <- getwd() [13:11:15.838] } [13:11:15.838] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.838] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.838] } [13:11:15.838] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.838] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:11:15.838] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.838] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.838] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.838] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.838] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.838] base::names(...future.oldOptions)) [13:11:15.838] } [13:11:15.838] if (FALSE) { [13:11:15.838] } [13:11:15.838] else { [13:11:15.838] if (TRUE) { [13:11:15.838] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.838] open = "w") [13:11:15.838] } [13:11:15.838] else { [13:11:15.838] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.838] windows = "NUL", "/dev/null"), open = "w") [13:11:15.838] } [13:11:15.838] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.838] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.838] base::sink(type = "output", split = FALSE) [13:11:15.838] base::close(...future.stdout) [13:11:15.838] }, add = TRUE) [13:11:15.838] } [13:11:15.838] ...future.frame <- base::sys.nframe() [13:11:15.838] ...future.conditions <- base::list() [13:11:15.838] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.838] if (FALSE) { [13:11:15.838] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.838] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.838] } [13:11:15.838] ...future.result <- base::tryCatch({ [13:11:15.838] base::withCallingHandlers({ [13:11:15.838] ...future.value <- base::withVisible(base::local({ [13:11:15.838] do.call(function(...) { [13:11:15.838] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.838] if (!identical(...future.globals.maxSize.org, [13:11:15.838] ...future.globals.maxSize)) { [13:11:15.838] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.838] on.exit(options(oopts), add = TRUE) [13:11:15.838] } [13:11:15.838] { [13:11:15.838] lapply(seq_along(...future.elements_ii), [13:11:15.838] FUN = function(jj) { [13:11:15.838] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.838] ...future.FUN(...future.X_jj, ...) [13:11:15.838] }) [13:11:15.838] } [13:11:15.838] }, args = future.call.arguments) [13:11:15.838] })) [13:11:15.838] future::FutureResult(value = ...future.value$value, [13:11:15.838] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.838] ...future.rng), globalenv = if (FALSE) [13:11:15.838] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.838] ...future.globalenv.names)) [13:11:15.838] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.838] }, condition = base::local({ [13:11:15.838] c <- base::c [13:11:15.838] inherits <- base::inherits [13:11:15.838] invokeRestart <- base::invokeRestart [13:11:15.838] length <- base::length [13:11:15.838] list <- base::list [13:11:15.838] seq.int <- base::seq.int [13:11:15.838] signalCondition <- base::signalCondition [13:11:15.838] sys.calls <- base::sys.calls [13:11:15.838] `[[` <- base::`[[` [13:11:15.838] `+` <- base::`+` [13:11:15.838] `<<-` <- base::`<<-` [13:11:15.838] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.838] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.838] 3L)] [13:11:15.838] } [13:11:15.838] function(cond) { [13:11:15.838] is_error <- inherits(cond, "error") [13:11:15.838] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.838] NULL) [13:11:15.838] if (is_error) { [13:11:15.838] sessionInformation <- function() { [13:11:15.838] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.838] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.838] search = base::search(), system = base::Sys.info()) [13:11:15.838] } [13:11:15.838] ...future.conditions[[length(...future.conditions) + [13:11:15.838] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.838] cond$call), session = sessionInformation(), [13:11:15.838] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.838] signalCondition(cond) [13:11:15.838] } [13:11:15.838] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.838] signal <- FALSE && inherits(cond, character(0)) [13:11:15.838] ...future.conditions[[length(...future.conditions) + [13:11:15.838] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.838] if (FALSE && !signal) { [13:11:15.838] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.838] { [13:11:15.838] inherits <- base::inherits [13:11:15.838] invokeRestart <- base::invokeRestart [13:11:15.838] is.null <- base::is.null [13:11:15.838] muffled <- FALSE [13:11:15.838] if (inherits(cond, "message")) { [13:11:15.838] muffled <- grepl(pattern, "muffleMessage") [13:11:15.838] if (muffled) [13:11:15.838] invokeRestart("muffleMessage") [13:11:15.838] } [13:11:15.838] else if (inherits(cond, "warning")) { [13:11:15.838] muffled <- grepl(pattern, "muffleWarning") [13:11:15.838] if (muffled) [13:11:15.838] invokeRestart("muffleWarning") [13:11:15.838] } [13:11:15.838] else if (inherits(cond, "condition")) { [13:11:15.838] if (!is.null(pattern)) { [13:11:15.838] computeRestarts <- base::computeRestarts [13:11:15.838] grepl <- base::grepl [13:11:15.838] restarts <- computeRestarts(cond) [13:11:15.838] for (restart in restarts) { [13:11:15.838] name <- restart$name [13:11:15.838] if (is.null(name)) [13:11:15.838] next [13:11:15.838] if (!grepl(pattern, name)) [13:11:15.838] next [13:11:15.838] invokeRestart(restart) [13:11:15.838] muffled <- TRUE [13:11:15.838] break [13:11:15.838] } [13:11:15.838] } [13:11:15.838] } [13:11:15.838] invisible(muffled) [13:11:15.838] } [13:11:15.838] muffleCondition(cond, pattern = "^muffle") [13:11:15.838] } [13:11:15.838] } [13:11:15.838] else { [13:11:15.838] if (TRUE) { [13:11:15.838] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.838] { [13:11:15.838] inherits <- base::inherits [13:11:15.838] invokeRestart <- base::invokeRestart [13:11:15.838] is.null <- base::is.null [13:11:15.838] muffled <- FALSE [13:11:15.838] if (inherits(cond, "message")) { [13:11:15.838] muffled <- grepl(pattern, "muffleMessage") [13:11:15.838] if (muffled) [13:11:15.838] invokeRestart("muffleMessage") [13:11:15.838] } [13:11:15.838] else if (inherits(cond, "warning")) { [13:11:15.838] muffled <- grepl(pattern, "muffleWarning") [13:11:15.838] if (muffled) [13:11:15.838] invokeRestart("muffleWarning") [13:11:15.838] } [13:11:15.838] else if (inherits(cond, "condition")) { [13:11:15.838] if (!is.null(pattern)) { [13:11:15.838] computeRestarts <- base::computeRestarts [13:11:15.838] grepl <- base::grepl [13:11:15.838] restarts <- computeRestarts(cond) [13:11:15.838] for (restart in restarts) { [13:11:15.838] name <- restart$name [13:11:15.838] if (is.null(name)) [13:11:15.838] next [13:11:15.838] if (!grepl(pattern, name)) [13:11:15.838] next [13:11:15.838] invokeRestart(restart) [13:11:15.838] muffled <- TRUE [13:11:15.838] break [13:11:15.838] } [13:11:15.838] } [13:11:15.838] } [13:11:15.838] invisible(muffled) [13:11:15.838] } [13:11:15.838] muffleCondition(cond, pattern = "^muffle") [13:11:15.838] } [13:11:15.838] } [13:11:15.838] } [13:11:15.838] })) [13:11:15.838] }, error = function(ex) { [13:11:15.838] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.838] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.838] ...future.rng), started = ...future.startTime, [13:11:15.838] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.838] version = "1.8"), class = "FutureResult") [13:11:15.838] }, finally = { [13:11:15.838] if (!identical(...future.workdir, getwd())) [13:11:15.838] setwd(...future.workdir) [13:11:15.838] { [13:11:15.838] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.838] ...future.oldOptions$nwarnings <- NULL [13:11:15.838] } [13:11:15.838] base::options(...future.oldOptions) [13:11:15.838] if (.Platform$OS.type == "windows") { [13:11:15.838] old_names <- names(...future.oldEnvVars) [13:11:15.838] envs <- base::Sys.getenv() [13:11:15.838] names <- names(envs) [13:11:15.838] common <- intersect(names, old_names) [13:11:15.838] added <- setdiff(names, old_names) [13:11:15.838] removed <- setdiff(old_names, names) [13:11:15.838] changed <- common[...future.oldEnvVars[common] != [13:11:15.838] envs[common]] [13:11:15.838] NAMES <- toupper(changed) [13:11:15.838] args <- list() [13:11:15.838] for (kk in seq_along(NAMES)) { [13:11:15.838] name <- changed[[kk]] [13:11:15.838] NAME <- NAMES[[kk]] [13:11:15.838] if (name != NAME && is.element(NAME, old_names)) [13:11:15.838] next [13:11:15.838] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.838] } [13:11:15.838] NAMES <- toupper(added) [13:11:15.838] for (kk in seq_along(NAMES)) { [13:11:15.838] name <- added[[kk]] [13:11:15.838] NAME <- NAMES[[kk]] [13:11:15.838] if (name != NAME && is.element(NAME, old_names)) [13:11:15.838] next [13:11:15.838] args[[name]] <- "" [13:11:15.838] } [13:11:15.838] NAMES <- toupper(removed) [13:11:15.838] for (kk in seq_along(NAMES)) { [13:11:15.838] name <- removed[[kk]] [13:11:15.838] NAME <- NAMES[[kk]] [13:11:15.838] if (name != NAME && is.element(NAME, old_names)) [13:11:15.838] next [13:11:15.838] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.838] } [13:11:15.838] if (length(args) > 0) [13:11:15.838] base::do.call(base::Sys.setenv, args = args) [13:11:15.838] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.838] } [13:11:15.838] else { [13:11:15.838] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.838] } [13:11:15.838] { [13:11:15.838] if (base::length(...future.futureOptionsAdded) > [13:11:15.838] 0L) { [13:11:15.838] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.838] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.838] base::options(opts) [13:11:15.838] } [13:11:15.838] { [13:11:15.838] NULL [13:11:15.838] options(future.plan = NULL) [13:11:15.838] if (is.na(NA_character_)) [13:11:15.838] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.838] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.838] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.838] .init = FALSE) [13:11:15.838] } [13:11:15.838] } [13:11:15.838] } [13:11:15.838] }) [13:11:15.838] if (TRUE) { [13:11:15.838] base::sink(type = "output", split = FALSE) [13:11:15.838] if (TRUE) { [13:11:15.838] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.838] } [13:11:15.838] else { [13:11:15.838] ...future.result["stdout"] <- base::list(NULL) [13:11:15.838] } [13:11:15.838] base::close(...future.stdout) [13:11:15.838] ...future.stdout <- NULL [13:11:15.838] } [13:11:15.838] ...future.result$conditions <- ...future.conditions [13:11:15.838] ...future.result$finished <- base::Sys.time() [13:11:15.838] ...future.result [13:11:15.838] } [13:11:15.842] - Launch lazy future ... done [13:11:15.842] run() for 'MiraiFuture' ... done [13:11:15.843] Created future: [13:11:15.844] resolved() for 'MiraiFuture' ... [13:11:15.844] - state: 'running' [13:11:15.844] - run: TRUE [13:11:15.844] - result: 'NULL' [13:11:15.845] - resolved: FALSE [13:11:15.845] resolved() for 'MiraiFuture' ... done [13:11:15.843] MiraiFuture: [13:11:15.843] Label: 'future_lapply-1' [13:11:15.843] Expression: [13:11:15.843] { [13:11:15.843] do.call(function(...) { [13:11:15.843] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.843] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.843] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.843] on.exit(options(oopts), add = TRUE) [13:11:15.843] } [13:11:15.843] { [13:11:15.843] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.843] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.843] ...future.FUN(...future.X_jj, ...) [13:11:15.843] }) [13:11:15.843] } [13:11:15.843] }, args = future.call.arguments) [13:11:15.843] } [13:11:15.843] Lazy evaluation: FALSE [13:11:15.843] Asynchronous evaluation: TRUE [13:11:15.843] Local evaluation: TRUE [13:11:15.843] Environment: R_GlobalEnv [13:11:15.843] Capture standard output: TRUE [13:11:15.843] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.843] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.843] Packages: 1 packages ('listenv') [13:11:15.843] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.843] Resolved: FALSE [13:11:15.843] Value: [13:11:15.843] Conditions captured: [13:11:15.843] Early signaling: FALSE [13:11:15.843] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.843] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.845] Chunk #1 of 2 ... DONE [13:11:15.845] Chunk #2 of 2 ... [13:11:15.846] - Finding globals in 'X' for chunk #2 ... [13:11:15.846] getGlobalsAndPackages() ... [13:11:15.846] Searching for globals... [13:11:15.848] [13:11:15.848] Searching for globals ... DONE [13:11:15.848] - globals: [0] [13:11:15.848] getGlobalsAndPackages() ... DONE [13:11:15.849] + additional globals found: [n=0] [13:11:15.849] + additional namespaces needed: [n=0] [13:11:15.849] - Finding globals in 'X' for chunk #2 ... DONE [13:11:15.849] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:11:15.849] - seeds: [13:11:15.849] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.850] getGlobalsAndPackages() ... [13:11:15.850] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.850] Resolving globals: FALSE [13:11:15.850] Tweak future expression to call with '...' arguments ... [13:11:15.850] { [13:11:15.850] do.call(function(...) { [13:11:15.850] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.850] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.850] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.850] on.exit(options(oopts), add = TRUE) [13:11:15.850] } [13:11:15.850] { [13:11:15.850] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.850] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.850] ...future.FUN(...future.X_jj, ...) [13:11:15.850] }) [13:11:15.850] } [13:11:15.850] }, args = future.call.arguments) [13:11:15.850] } [13:11:15.851] Tweak future expression to call with '...' arguments ... DONE [13:11:15.851] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.851] - packages: [1] 'listenv' [13:11:15.852] getGlobalsAndPackages() ... DONE [13:11:15.852] run() for 'Future' ... [13:11:15.852] - state: 'created' [13:11:15.852] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.855] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.855] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.855] - Field: 'label' [13:11:15.855] - Field: 'local' [13:11:15.856] - Field: 'owner' [13:11:15.856] - Field: 'envir' [13:11:15.856] - Field: 'packages' [13:11:15.856] - Field: 'gc' [13:11:15.856] - Field: 'conditions' [13:11:15.856] - Field: 'expr' [13:11:15.857] - Field: 'uuid' [13:11:15.857] - Field: 'seed' [13:11:15.857] - Field: 'version' [13:11:15.857] - Field: 'result' [13:11:15.857] - Field: 'asynchronous' [13:11:15.858] - Field: 'calls' [13:11:15.858] - Field: 'globals' [13:11:15.858] - Field: 'stdout' [13:11:15.858] - Field: 'earlySignal' [13:11:15.858] - Field: 'lazy' [13:11:15.858] - Field: 'state' [13:11:15.859] - Field: '.cluster' [13:11:15.859] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.859] - Launch lazy future ... [13:11:15.859] Packages needed by the future expression (n = 1): 'listenv' [13:11:15.859] Packages needed by future strategies (n = 0): [13:11:15.860] { [13:11:15.860] { [13:11:15.860] { [13:11:15.860] ...future.startTime <- base::Sys.time() [13:11:15.860] { [13:11:15.860] { [13:11:15.860] { [13:11:15.860] { [13:11:15.860] base::local({ [13:11:15.860] has_future <- base::requireNamespace("future", [13:11:15.860] quietly = TRUE) [13:11:15.860] if (has_future) { [13:11:15.860] ns <- base::getNamespace("future") [13:11:15.860] version <- ns[[".package"]][["version"]] [13:11:15.860] if (is.null(version)) [13:11:15.860] version <- utils::packageVersion("future") [13:11:15.860] } [13:11:15.860] else { [13:11:15.860] version <- NULL [13:11:15.860] } [13:11:15.860] if (!has_future || version < "1.8.0") { [13:11:15.860] info <- base::c(r_version = base::gsub("R version ", [13:11:15.860] "", base::R.version$version.string), [13:11:15.860] platform = base::sprintf("%s (%s-bit)", [13:11:15.860] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.860] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.860] "release", "version")], collapse = " "), [13:11:15.860] hostname = base::Sys.info()[["nodename"]]) [13:11:15.860] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.860] info) [13:11:15.860] info <- base::paste(info, collapse = "; ") [13:11:15.860] if (!has_future) { [13:11:15.860] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.860] info) [13:11:15.860] } [13:11:15.860] else { [13:11:15.860] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.860] info, version) [13:11:15.860] } [13:11:15.860] base::stop(msg) [13:11:15.860] } [13:11:15.860] }) [13:11:15.860] } [13:11:15.860] base::local({ [13:11:15.860] for (pkg in "listenv") { [13:11:15.860] base::loadNamespace(pkg) [13:11:15.860] base::library(pkg, character.only = TRUE) [13:11:15.860] } [13:11:15.860] }) [13:11:15.860] } [13:11:15.860] ...future.strategy.old <- future::plan("list") [13:11:15.860] options(future.plan = NULL) [13:11:15.860] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.860] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.860] } [13:11:15.860] ...future.workdir <- getwd() [13:11:15.860] } [13:11:15.860] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.860] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.860] } [13:11:15.860] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.860] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:11:15.860] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.860] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.860] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.860] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.860] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.860] base::names(...future.oldOptions)) [13:11:15.860] } [13:11:15.860] if (FALSE) { [13:11:15.860] } [13:11:15.860] else { [13:11:15.860] if (TRUE) { [13:11:15.860] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.860] open = "w") [13:11:15.860] } [13:11:15.860] else { [13:11:15.860] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.860] windows = "NUL", "/dev/null"), open = "w") [13:11:15.860] } [13:11:15.860] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.860] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.860] base::sink(type = "output", split = FALSE) [13:11:15.860] base::close(...future.stdout) [13:11:15.860] }, add = TRUE) [13:11:15.860] } [13:11:15.860] ...future.frame <- base::sys.nframe() [13:11:15.860] ...future.conditions <- base::list() [13:11:15.860] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.860] if (FALSE) { [13:11:15.860] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.860] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.860] } [13:11:15.860] ...future.result <- base::tryCatch({ [13:11:15.860] base::withCallingHandlers({ [13:11:15.860] ...future.value <- base::withVisible(base::local({ [13:11:15.860] do.call(function(...) { [13:11:15.860] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.860] if (!identical(...future.globals.maxSize.org, [13:11:15.860] ...future.globals.maxSize)) { [13:11:15.860] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.860] on.exit(options(oopts), add = TRUE) [13:11:15.860] } [13:11:15.860] { [13:11:15.860] lapply(seq_along(...future.elements_ii), [13:11:15.860] FUN = function(jj) { [13:11:15.860] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.860] ...future.FUN(...future.X_jj, ...) [13:11:15.860] }) [13:11:15.860] } [13:11:15.860] }, args = future.call.arguments) [13:11:15.860] })) [13:11:15.860] future::FutureResult(value = ...future.value$value, [13:11:15.860] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.860] ...future.rng), globalenv = if (FALSE) [13:11:15.860] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.860] ...future.globalenv.names)) [13:11:15.860] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.860] }, condition = base::local({ [13:11:15.860] c <- base::c [13:11:15.860] inherits <- base::inherits [13:11:15.860] invokeRestart <- base::invokeRestart [13:11:15.860] length <- base::length [13:11:15.860] list <- base::list [13:11:15.860] seq.int <- base::seq.int [13:11:15.860] signalCondition <- base::signalCondition [13:11:15.860] sys.calls <- base::sys.calls [13:11:15.860] `[[` <- base::`[[` [13:11:15.860] `+` <- base::`+` [13:11:15.860] `<<-` <- base::`<<-` [13:11:15.860] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.860] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.860] 3L)] [13:11:15.860] } [13:11:15.860] function(cond) { [13:11:15.860] is_error <- inherits(cond, "error") [13:11:15.860] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.860] NULL) [13:11:15.860] if (is_error) { [13:11:15.860] sessionInformation <- function() { [13:11:15.860] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.860] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.860] search = base::search(), system = base::Sys.info()) [13:11:15.860] } [13:11:15.860] ...future.conditions[[length(...future.conditions) + [13:11:15.860] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.860] cond$call), session = sessionInformation(), [13:11:15.860] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.860] signalCondition(cond) [13:11:15.860] } [13:11:15.860] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.860] signal <- FALSE && inherits(cond, character(0)) [13:11:15.860] ...future.conditions[[length(...future.conditions) + [13:11:15.860] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.860] if (FALSE && !signal) { [13:11:15.860] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.860] { [13:11:15.860] inherits <- base::inherits [13:11:15.860] invokeRestart <- base::invokeRestart [13:11:15.860] is.null <- base::is.null [13:11:15.860] muffled <- FALSE [13:11:15.860] if (inherits(cond, "message")) { [13:11:15.860] muffled <- grepl(pattern, "muffleMessage") [13:11:15.860] if (muffled) [13:11:15.860] invokeRestart("muffleMessage") [13:11:15.860] } [13:11:15.860] else if (inherits(cond, "warning")) { [13:11:15.860] muffled <- grepl(pattern, "muffleWarning") [13:11:15.860] if (muffled) [13:11:15.860] invokeRestart("muffleWarning") [13:11:15.860] } [13:11:15.860] else if (inherits(cond, "condition")) { [13:11:15.860] if (!is.null(pattern)) { [13:11:15.860] computeRestarts <- base::computeRestarts [13:11:15.860] grepl <- base::grepl [13:11:15.860] restarts <- computeRestarts(cond) [13:11:15.860] for (restart in restarts) { [13:11:15.860] name <- restart$name [13:11:15.860] if (is.null(name)) [13:11:15.860] next [13:11:15.860] if (!grepl(pattern, name)) [13:11:15.860] next [13:11:15.860] invokeRestart(restart) [13:11:15.860] muffled <- TRUE [13:11:15.860] break [13:11:15.860] } [13:11:15.860] } [13:11:15.860] } [13:11:15.860] invisible(muffled) [13:11:15.860] } [13:11:15.860] muffleCondition(cond, pattern = "^muffle") [13:11:15.860] } [13:11:15.860] } [13:11:15.860] else { [13:11:15.860] if (TRUE) { [13:11:15.860] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.860] { [13:11:15.860] inherits <- base::inherits [13:11:15.860] invokeRestart <- base::invokeRestart [13:11:15.860] is.null <- base::is.null [13:11:15.860] muffled <- FALSE [13:11:15.860] if (inherits(cond, "message")) { [13:11:15.860] muffled <- grepl(pattern, "muffleMessage") [13:11:15.860] if (muffled) [13:11:15.860] invokeRestart("muffleMessage") [13:11:15.860] } [13:11:15.860] else if (inherits(cond, "warning")) { [13:11:15.860] muffled <- grepl(pattern, "muffleWarning") [13:11:15.860] if (muffled) [13:11:15.860] invokeRestart("muffleWarning") [13:11:15.860] } [13:11:15.860] else if (inherits(cond, "condition")) { [13:11:15.860] if (!is.null(pattern)) { [13:11:15.860] computeRestarts <- base::computeRestarts [13:11:15.860] grepl <- base::grepl [13:11:15.860] restarts <- computeRestarts(cond) [13:11:15.860] for (restart in restarts) { [13:11:15.860] name <- restart$name [13:11:15.860] if (is.null(name)) [13:11:15.860] next [13:11:15.860] if (!grepl(pattern, name)) [13:11:15.860] next [13:11:15.860] invokeRestart(restart) [13:11:15.860] muffled <- TRUE [13:11:15.860] break [13:11:15.860] } [13:11:15.860] } [13:11:15.860] } [13:11:15.860] invisible(muffled) [13:11:15.860] } [13:11:15.860] muffleCondition(cond, pattern = "^muffle") [13:11:15.860] } [13:11:15.860] } [13:11:15.860] } [13:11:15.860] })) [13:11:15.860] }, error = function(ex) { [13:11:15.860] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.860] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.860] ...future.rng), started = ...future.startTime, [13:11:15.860] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.860] version = "1.8"), class = "FutureResult") [13:11:15.860] }, finally = { [13:11:15.860] if (!identical(...future.workdir, getwd())) [13:11:15.860] setwd(...future.workdir) [13:11:15.860] { [13:11:15.860] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.860] ...future.oldOptions$nwarnings <- NULL [13:11:15.860] } [13:11:15.860] base::options(...future.oldOptions) [13:11:15.860] if (.Platform$OS.type == "windows") { [13:11:15.860] old_names <- names(...future.oldEnvVars) [13:11:15.860] envs <- base::Sys.getenv() [13:11:15.860] names <- names(envs) [13:11:15.860] common <- intersect(names, old_names) [13:11:15.860] added <- setdiff(names, old_names) [13:11:15.860] removed <- setdiff(old_names, names) [13:11:15.860] changed <- common[...future.oldEnvVars[common] != [13:11:15.860] envs[common]] [13:11:15.860] NAMES <- toupper(changed) [13:11:15.860] args <- list() [13:11:15.860] for (kk in seq_along(NAMES)) { [13:11:15.860] name <- changed[[kk]] [13:11:15.860] NAME <- NAMES[[kk]] [13:11:15.860] if (name != NAME && is.element(NAME, old_names)) [13:11:15.860] next [13:11:15.860] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.860] } [13:11:15.860] NAMES <- toupper(added) [13:11:15.860] for (kk in seq_along(NAMES)) { [13:11:15.860] name <- added[[kk]] [13:11:15.860] NAME <- NAMES[[kk]] [13:11:15.860] if (name != NAME && is.element(NAME, old_names)) [13:11:15.860] next [13:11:15.860] args[[name]] <- "" [13:11:15.860] } [13:11:15.860] NAMES <- toupper(removed) [13:11:15.860] for (kk in seq_along(NAMES)) { [13:11:15.860] name <- removed[[kk]] [13:11:15.860] NAME <- NAMES[[kk]] [13:11:15.860] if (name != NAME && is.element(NAME, old_names)) [13:11:15.860] next [13:11:15.860] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.860] } [13:11:15.860] if (length(args) > 0) [13:11:15.860] base::do.call(base::Sys.setenv, args = args) [13:11:15.860] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.860] } [13:11:15.860] else { [13:11:15.860] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.860] } [13:11:15.860] { [13:11:15.860] if (base::length(...future.futureOptionsAdded) > [13:11:15.860] 0L) { [13:11:15.860] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.860] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.860] base::options(opts) [13:11:15.860] } [13:11:15.860] { [13:11:15.860] NULL [13:11:15.860] options(future.plan = NULL) [13:11:15.860] if (is.na(NA_character_)) [13:11:15.860] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.860] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.860] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.860] .init = FALSE) [13:11:15.860] } [13:11:15.860] } [13:11:15.860] } [13:11:15.860] }) [13:11:15.860] if (TRUE) { [13:11:15.860] base::sink(type = "output", split = FALSE) [13:11:15.860] if (TRUE) { [13:11:15.860] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.860] } [13:11:15.860] else { [13:11:15.860] ...future.result["stdout"] <- base::list(NULL) [13:11:15.860] } [13:11:15.860] base::close(...future.stdout) [13:11:15.860] ...future.stdout <- NULL [13:11:15.860] } [13:11:15.860] ...future.result$conditions <- ...future.conditions [13:11:15.860] ...future.result$finished <- base::Sys.time() [13:11:15.860] ...future.result [13:11:15.860] } [13:11:15.864] - Launch lazy future ... done [13:11:15.864] run() for 'MiraiFuture' ... done [13:11:15.865] Created future: [13:11:15.866] resolved() for 'MiraiFuture' ... [13:11:15.866] - state: 'running' [13:11:15.867] - run: TRUE [13:11:15.867] - result: 'NULL' [13:11:15.867] - resolved: FALSE [13:11:15.867] resolved() for 'MiraiFuture' ... done [13:11:15.865] MiraiFuture: [13:11:15.865] Label: 'future_lapply-2' [13:11:15.865] Expression: [13:11:15.865] { [13:11:15.865] do.call(function(...) { [13:11:15.865] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.865] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.865] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.865] on.exit(options(oopts), add = TRUE) [13:11:15.865] } [13:11:15.865] { [13:11:15.865] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.865] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.865] ...future.FUN(...future.X_jj, ...) [13:11:15.865] }) [13:11:15.865] } [13:11:15.865] }, args = future.call.arguments) [13:11:15.865] } [13:11:15.865] Lazy evaluation: FALSE [13:11:15.865] Asynchronous evaluation: TRUE [13:11:15.865] Local evaluation: TRUE [13:11:15.865] Environment: R_GlobalEnv [13:11:15.865] Capture standard output: TRUE [13:11:15.865] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.865] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.865] Packages: 1 packages ('listenv') [13:11:15.865] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.865] Resolved: FALSE [13:11:15.865] Value: [13:11:15.865] Conditions captured: [13:11:15.865] Early signaling: FALSE [13:11:15.865] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.865] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.868] Chunk #2 of 2 ... DONE [13:11:15.868] Launching 2 futures (chunks) ... DONE [13:11:15.868] Resolving 2 futures (chunks) ... [13:11:15.868] resolve() on list ... [13:11:15.868] recursive: 0 [13:11:15.868] length: 2 [13:11:15.869] [13:11:15.869] resolved() for 'MiraiFuture' ... [13:11:15.869] - state: 'running' [13:11:15.869] - run: TRUE [13:11:15.869] - result: 'NULL' [13:11:15.870] - resolved: FALSE [13:11:15.870] resolved() for 'MiraiFuture' ... done [13:11:15.870] resolved() for 'MiraiFuture' ... [13:11:15.870] - state: 'running' [13:11:15.870] - run: TRUE [13:11:15.870] - result: 'NULL' [13:11:15.871] - resolved: FALSE [13:11:15.871] resolved() for 'MiraiFuture' ... done [13:11:15.871] Future #2 [13:11:15.871] signalConditionsASAP(MiraiFuture, pos=2) ... [13:11:15.872] - nx: 2 [13:11:15.872] - relay: TRUE [13:11:15.872] - stdout: TRUE [13:11:15.872] - signal: TRUE [13:11:15.872] - resignal: FALSE [13:11:15.872] - force: TRUE [13:11:15.872] - relayed: [n=2] FALSE, FALSE [13:11:15.873] - queued futures: [n=2] FALSE, FALSE [13:11:15.873] - until=1 [13:11:15.873] - relaying element #1 [13:11:15.873] - relayed: [n=2] FALSE, FALSE [13:11:15.873] - queued futures: [n=2] FALSE, TRUE [13:11:15.873] signalConditionsASAP(NULL, pos=2) ... done [13:11:15.874] length: 1 (resolved future 2) [13:11:15.897] resolved() for 'MiraiFuture' ... [13:11:15.897] - state: 'running' [13:11:15.897] - run: TRUE [13:11:15.898] - result: 'NULL' [13:11:15.898] - resolved: FALSE [13:11:15.898] resolved() for 'MiraiFuture' ... done [13:11:15.898] Future #1 [13:11:15.899] signalConditionsASAP(MiraiFuture, pos=1) ... [13:11:15.899] - nx: 2 [13:11:15.899] - relay: TRUE [13:11:15.899] - stdout: TRUE [13:11:15.899] - signal: TRUE [13:11:15.900] - resignal: FALSE [13:11:15.900] - force: TRUE [13:11:15.900] - relayed: [n=2] FALSE, FALSE [13:11:15.900] - queued futures: [n=2] FALSE, TRUE [13:11:15.900] - until=1 [13:11:15.900] - relaying element #1 [13:11:15.901] - relayed: [n=2] TRUE, FALSE [13:11:15.901] - queued futures: [n=2] TRUE, TRUE [13:11:15.901] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:11:15.901] length: 0 (resolved future 1) [13:11:15.902] Relaying remaining futures [13:11:15.902] signalConditionsASAP(NULL, pos=0) ... [13:11:15.902] - nx: 2 [13:11:15.902] - relay: TRUE [13:11:15.902] - stdout: TRUE [13:11:15.902] - signal: TRUE [13:11:15.903] - resignal: FALSE [13:11:15.905] - force: TRUE [13:11:15.905] - relayed: [n=2] TRUE, FALSE [13:11:15.905] - queued futures: [n=2] TRUE, TRUE - flush all [13:11:15.906] - relaying element #2 [13:11:15.906] - relayed: [n=2] TRUE, TRUE [13:11:15.906] - queued futures: [n=2] TRUE, TRUE [13:11:15.906] signalConditionsASAP(MiraiFuture, pos=0) ... done [13:11:15.907] resolve() on list ... DONE [13:11:15.907] - Number of value chunks collected: 2 [13:11:15.907] Resolving 2 futures (chunks) ... DONE [13:11:15.907] Reducing values from 2 chunks ... [13:11:15.908] - Number of values collected after concatenation: 2 [13:11:15.908] - Number of values expected: 2 [13:11:15.908] Reducing values from 2 chunks ... DONE [13:11:15.908] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" [13:11:15.910] future_lapply() ... [13:11:15.912] Number of chunks: 2 [13:11:15.912] getGlobalsAndPackagesXApply() ... [13:11:15.912] - future.globals: TRUE [13:11:15.912] getGlobalsAndPackages() ... [13:11:15.912] Searching for globals... [13:11:15.914] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:11:15.914] Searching for globals ... DONE [13:11:15.915] Resolving globals: FALSE [13:11:15.915] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:11:15.916] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [13:11:15.916] - globals: [1] 'FUN' [13:11:15.916] - packages: [1] 'listenv' [13:11:15.916] getGlobalsAndPackages() ... DONE [13:11:15.916] - globals found/used: [n=1] 'FUN' [13:11:15.917] - needed namespaces: [n=1] 'listenv' [13:11:15.917] Finding globals ... DONE [13:11:15.917] - use_args: TRUE [13:11:15.917] - Getting '...' globals ... [13:11:15.917] resolve() on list ... [13:11:15.918] recursive: 0 [13:11:15.918] length: 1 [13:11:15.918] elements: '...' [13:11:15.918] length: 0 (resolved future 1) [13:11:15.918] resolve() on list ... DONE [13:11:15.919] - '...' content: [n=0] [13:11:15.919] List of 1 [13:11:15.919] $ ...: list() [13:11:15.919] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.919] - attr(*, "where")=List of 1 [13:11:15.919] ..$ ...: [13:11:15.919] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.919] - attr(*, "resolved")= logi TRUE [13:11:15.919] - attr(*, "total_size")= num NA [13:11:15.922] - Getting '...' globals ... DONE [13:11:15.922] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:11:15.922] List of 2 [13:11:15.922] $ ...future.FUN:function (x, ...) [13:11:15.922] $ ... : list() [13:11:15.922] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:15.922] - attr(*, "where")=List of 2 [13:11:15.922] ..$ ...future.FUN: [13:11:15.922] ..$ ... : [13:11:15.922] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:15.922] - attr(*, "resolved")= logi FALSE [13:11:15.922] - attr(*, "total_size")= num 4968 [13:11:15.926] Packages to be attached in all futures: [n=1] 'listenv' [13:11:15.926] getGlobalsAndPackagesXApply() ... DONE [13:11:15.926] Number of futures (= number of chunks): 2 [13:11:15.927] Launching 2 futures (chunks) ... [13:11:15.927] Chunk #1 of 2 ... [13:11:15.927] - Finding globals in 'X' for chunk #1 ... [13:11:15.927] getGlobalsAndPackages() ... [13:11:15.927] Searching for globals... [13:11:15.928] [13:11:15.928] Searching for globals ... DONE [13:11:15.931] - globals: [0] [13:11:15.931] getGlobalsAndPackages() ... DONE [13:11:15.931] + additional globals found: [n=0] [13:11:15.931] + additional namespaces needed: [n=0] [13:11:15.931] - Finding globals in 'X' for chunk #1 ... DONE [13:11:15.932] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:11:15.932] - seeds: [13:11:15.932] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.932] getGlobalsAndPackages() ... [13:11:15.932] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.932] Resolving globals: FALSE [13:11:15.933] Tweak future expression to call with '...' arguments ... [13:11:15.933] { [13:11:15.933] do.call(function(...) { [13:11:15.933] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.933] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.933] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.933] on.exit(options(oopts), add = TRUE) [13:11:15.933] } [13:11:15.933] { [13:11:15.933] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.933] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.933] ...future.FUN(...future.X_jj, ...) [13:11:15.933] }) [13:11:15.933] } [13:11:15.933] }, args = future.call.arguments) [13:11:15.933] } [13:11:15.933] Tweak future expression to call with '...' arguments ... DONE [13:11:15.934] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.934] - packages: [1] 'listenv' [13:11:15.934] getGlobalsAndPackages() ... DONE [13:11:15.935] run() for 'Future' ... [13:11:15.935] - state: 'created' [13:11:15.935] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.938] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.938] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.938] - Field: 'label' [13:11:15.938] - Field: 'local' [13:11:15.939] - Field: 'owner' [13:11:15.939] - Field: 'envir' [13:11:15.939] - Field: 'packages' [13:11:15.939] - Field: 'gc' [13:11:15.939] - Field: 'conditions' [13:11:15.939] - Field: 'expr' [13:11:15.940] - Field: 'uuid' [13:11:15.940] - Field: 'seed' [13:11:15.940] - Field: 'version' [13:11:15.940] - Field: 'result' [13:11:15.940] - Field: 'asynchronous' [13:11:15.941] - Field: 'calls' [13:11:15.941] - Field: 'globals' [13:11:15.941] - Field: 'stdout' [13:11:15.941] - Field: 'earlySignal' [13:11:15.941] - Field: 'lazy' [13:11:15.941] - Field: 'state' [13:11:15.942] - Field: '.cluster' [13:11:15.942] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.942] - Launch lazy future ... [13:11:15.942] Packages needed by the future expression (n = 1): 'listenv' [13:11:15.942] Packages needed by future strategies (n = 0): [13:11:15.943] { [13:11:15.943] { [13:11:15.943] { [13:11:15.943] ...future.startTime <- base::Sys.time() [13:11:15.943] { [13:11:15.943] { [13:11:15.943] { [13:11:15.943] { [13:11:15.943] base::local({ [13:11:15.943] has_future <- base::requireNamespace("future", [13:11:15.943] quietly = TRUE) [13:11:15.943] if (has_future) { [13:11:15.943] ns <- base::getNamespace("future") [13:11:15.943] version <- ns[[".package"]][["version"]] [13:11:15.943] if (is.null(version)) [13:11:15.943] version <- utils::packageVersion("future") [13:11:15.943] } [13:11:15.943] else { [13:11:15.943] version <- NULL [13:11:15.943] } [13:11:15.943] if (!has_future || version < "1.8.0") { [13:11:15.943] info <- base::c(r_version = base::gsub("R version ", [13:11:15.943] "", base::R.version$version.string), [13:11:15.943] platform = base::sprintf("%s (%s-bit)", [13:11:15.943] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.943] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.943] "release", "version")], collapse = " "), [13:11:15.943] hostname = base::Sys.info()[["nodename"]]) [13:11:15.943] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.943] info) [13:11:15.943] info <- base::paste(info, collapse = "; ") [13:11:15.943] if (!has_future) { [13:11:15.943] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.943] info) [13:11:15.943] } [13:11:15.943] else { [13:11:15.943] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.943] info, version) [13:11:15.943] } [13:11:15.943] base::stop(msg) [13:11:15.943] } [13:11:15.943] }) [13:11:15.943] } [13:11:15.943] base::local({ [13:11:15.943] for (pkg in "listenv") { [13:11:15.943] base::loadNamespace(pkg) [13:11:15.943] base::library(pkg, character.only = TRUE) [13:11:15.943] } [13:11:15.943] }) [13:11:15.943] } [13:11:15.943] ...future.strategy.old <- future::plan("list") [13:11:15.943] options(future.plan = NULL) [13:11:15.943] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.943] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.943] } [13:11:15.943] ...future.workdir <- getwd() [13:11:15.943] } [13:11:15.943] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.943] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.943] } [13:11:15.943] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.943] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:11:15.943] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.943] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.943] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.943] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.943] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.943] base::names(...future.oldOptions)) [13:11:15.943] } [13:11:15.943] if (FALSE) { [13:11:15.943] } [13:11:15.943] else { [13:11:15.943] if (TRUE) { [13:11:15.943] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.943] open = "w") [13:11:15.943] } [13:11:15.943] else { [13:11:15.943] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.943] windows = "NUL", "/dev/null"), open = "w") [13:11:15.943] } [13:11:15.943] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.943] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.943] base::sink(type = "output", split = FALSE) [13:11:15.943] base::close(...future.stdout) [13:11:15.943] }, add = TRUE) [13:11:15.943] } [13:11:15.943] ...future.frame <- base::sys.nframe() [13:11:15.943] ...future.conditions <- base::list() [13:11:15.943] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.943] if (FALSE) { [13:11:15.943] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.943] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.943] } [13:11:15.943] ...future.result <- base::tryCatch({ [13:11:15.943] base::withCallingHandlers({ [13:11:15.943] ...future.value <- base::withVisible(base::local({ [13:11:15.943] do.call(function(...) { [13:11:15.943] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.943] if (!identical(...future.globals.maxSize.org, [13:11:15.943] ...future.globals.maxSize)) { [13:11:15.943] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.943] on.exit(options(oopts), add = TRUE) [13:11:15.943] } [13:11:15.943] { [13:11:15.943] lapply(seq_along(...future.elements_ii), [13:11:15.943] FUN = function(jj) { [13:11:15.943] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.943] ...future.FUN(...future.X_jj, ...) [13:11:15.943] }) [13:11:15.943] } [13:11:15.943] }, args = future.call.arguments) [13:11:15.943] })) [13:11:15.943] future::FutureResult(value = ...future.value$value, [13:11:15.943] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.943] ...future.rng), globalenv = if (FALSE) [13:11:15.943] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.943] ...future.globalenv.names)) [13:11:15.943] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.943] }, condition = base::local({ [13:11:15.943] c <- base::c [13:11:15.943] inherits <- base::inherits [13:11:15.943] invokeRestart <- base::invokeRestart [13:11:15.943] length <- base::length [13:11:15.943] list <- base::list [13:11:15.943] seq.int <- base::seq.int [13:11:15.943] signalCondition <- base::signalCondition [13:11:15.943] sys.calls <- base::sys.calls [13:11:15.943] `[[` <- base::`[[` [13:11:15.943] `+` <- base::`+` [13:11:15.943] `<<-` <- base::`<<-` [13:11:15.943] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.943] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.943] 3L)] [13:11:15.943] } [13:11:15.943] function(cond) { [13:11:15.943] is_error <- inherits(cond, "error") [13:11:15.943] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.943] NULL) [13:11:15.943] if (is_error) { [13:11:15.943] sessionInformation <- function() { [13:11:15.943] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.943] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.943] search = base::search(), system = base::Sys.info()) [13:11:15.943] } [13:11:15.943] ...future.conditions[[length(...future.conditions) + [13:11:15.943] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.943] cond$call), session = sessionInformation(), [13:11:15.943] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.943] signalCondition(cond) [13:11:15.943] } [13:11:15.943] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.943] signal <- FALSE && inherits(cond, character(0)) [13:11:15.943] ...future.conditions[[length(...future.conditions) + [13:11:15.943] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.943] if (FALSE && !signal) { [13:11:15.943] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.943] { [13:11:15.943] inherits <- base::inherits [13:11:15.943] invokeRestart <- base::invokeRestart [13:11:15.943] is.null <- base::is.null [13:11:15.943] muffled <- FALSE [13:11:15.943] if (inherits(cond, "message")) { [13:11:15.943] muffled <- grepl(pattern, "muffleMessage") [13:11:15.943] if (muffled) [13:11:15.943] invokeRestart("muffleMessage") [13:11:15.943] } [13:11:15.943] else if (inherits(cond, "warning")) { [13:11:15.943] muffled <- grepl(pattern, "muffleWarning") [13:11:15.943] if (muffled) [13:11:15.943] invokeRestart("muffleWarning") [13:11:15.943] } [13:11:15.943] else if (inherits(cond, "condition")) { [13:11:15.943] if (!is.null(pattern)) { [13:11:15.943] computeRestarts <- base::computeRestarts [13:11:15.943] grepl <- base::grepl [13:11:15.943] restarts <- computeRestarts(cond) [13:11:15.943] for (restart in restarts) { [13:11:15.943] name <- restart$name [13:11:15.943] if (is.null(name)) [13:11:15.943] next [13:11:15.943] if (!grepl(pattern, name)) [13:11:15.943] next [13:11:15.943] invokeRestart(restart) [13:11:15.943] muffled <- TRUE [13:11:15.943] break [13:11:15.943] } [13:11:15.943] } [13:11:15.943] } [13:11:15.943] invisible(muffled) [13:11:15.943] } [13:11:15.943] muffleCondition(cond, pattern = "^muffle") [13:11:15.943] } [13:11:15.943] } [13:11:15.943] else { [13:11:15.943] if (TRUE) { [13:11:15.943] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.943] { [13:11:15.943] inherits <- base::inherits [13:11:15.943] invokeRestart <- base::invokeRestart [13:11:15.943] is.null <- base::is.null [13:11:15.943] muffled <- FALSE [13:11:15.943] if (inherits(cond, "message")) { [13:11:15.943] muffled <- grepl(pattern, "muffleMessage") [13:11:15.943] if (muffled) [13:11:15.943] invokeRestart("muffleMessage") [13:11:15.943] } [13:11:15.943] else if (inherits(cond, "warning")) { [13:11:15.943] muffled <- grepl(pattern, "muffleWarning") [13:11:15.943] if (muffled) [13:11:15.943] invokeRestart("muffleWarning") [13:11:15.943] } [13:11:15.943] else if (inherits(cond, "condition")) { [13:11:15.943] if (!is.null(pattern)) { [13:11:15.943] computeRestarts <- base::computeRestarts [13:11:15.943] grepl <- base::grepl [13:11:15.943] restarts <- computeRestarts(cond) [13:11:15.943] for (restart in restarts) { [13:11:15.943] name <- restart$name [13:11:15.943] if (is.null(name)) [13:11:15.943] next [13:11:15.943] if (!grepl(pattern, name)) [13:11:15.943] next [13:11:15.943] invokeRestart(restart) [13:11:15.943] muffled <- TRUE [13:11:15.943] break [13:11:15.943] } [13:11:15.943] } [13:11:15.943] } [13:11:15.943] invisible(muffled) [13:11:15.943] } [13:11:15.943] muffleCondition(cond, pattern = "^muffle") [13:11:15.943] } [13:11:15.943] } [13:11:15.943] } [13:11:15.943] })) [13:11:15.943] }, error = function(ex) { [13:11:15.943] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.943] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.943] ...future.rng), started = ...future.startTime, [13:11:15.943] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.943] version = "1.8"), class = "FutureResult") [13:11:15.943] }, finally = { [13:11:15.943] if (!identical(...future.workdir, getwd())) [13:11:15.943] setwd(...future.workdir) [13:11:15.943] { [13:11:15.943] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.943] ...future.oldOptions$nwarnings <- NULL [13:11:15.943] } [13:11:15.943] base::options(...future.oldOptions) [13:11:15.943] if (.Platform$OS.type == "windows") { [13:11:15.943] old_names <- names(...future.oldEnvVars) [13:11:15.943] envs <- base::Sys.getenv() [13:11:15.943] names <- names(envs) [13:11:15.943] common <- intersect(names, old_names) [13:11:15.943] added <- setdiff(names, old_names) [13:11:15.943] removed <- setdiff(old_names, names) [13:11:15.943] changed <- common[...future.oldEnvVars[common] != [13:11:15.943] envs[common]] [13:11:15.943] NAMES <- toupper(changed) [13:11:15.943] args <- list() [13:11:15.943] for (kk in seq_along(NAMES)) { [13:11:15.943] name <- changed[[kk]] [13:11:15.943] NAME <- NAMES[[kk]] [13:11:15.943] if (name != NAME && is.element(NAME, old_names)) [13:11:15.943] next [13:11:15.943] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.943] } [13:11:15.943] NAMES <- toupper(added) [13:11:15.943] for (kk in seq_along(NAMES)) { [13:11:15.943] name <- added[[kk]] [13:11:15.943] NAME <- NAMES[[kk]] [13:11:15.943] if (name != NAME && is.element(NAME, old_names)) [13:11:15.943] next [13:11:15.943] args[[name]] <- "" [13:11:15.943] } [13:11:15.943] NAMES <- toupper(removed) [13:11:15.943] for (kk in seq_along(NAMES)) { [13:11:15.943] name <- removed[[kk]] [13:11:15.943] NAME <- NAMES[[kk]] [13:11:15.943] if (name != NAME && is.element(NAME, old_names)) [13:11:15.943] next [13:11:15.943] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.943] } [13:11:15.943] if (length(args) > 0) [13:11:15.943] base::do.call(base::Sys.setenv, args = args) [13:11:15.943] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.943] } [13:11:15.943] else { [13:11:15.943] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.943] } [13:11:15.943] { [13:11:15.943] if (base::length(...future.futureOptionsAdded) > [13:11:15.943] 0L) { [13:11:15.943] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.943] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.943] base::options(opts) [13:11:15.943] } [13:11:15.943] { [13:11:15.943] NULL [13:11:15.943] options(future.plan = NULL) [13:11:15.943] if (is.na(NA_character_)) [13:11:15.943] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.943] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.943] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.943] .init = FALSE) [13:11:15.943] } [13:11:15.943] } [13:11:15.943] } [13:11:15.943] }) [13:11:15.943] if (TRUE) { [13:11:15.943] base::sink(type = "output", split = FALSE) [13:11:15.943] if (TRUE) { [13:11:15.943] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.943] } [13:11:15.943] else { [13:11:15.943] ...future.result["stdout"] <- base::list(NULL) [13:11:15.943] } [13:11:15.943] base::close(...future.stdout) [13:11:15.943] ...future.stdout <- NULL [13:11:15.943] } [13:11:15.943] ...future.result$conditions <- ...future.conditions [13:11:15.943] ...future.result$finished <- base::Sys.time() [13:11:15.943] ...future.result [13:11:15.943] } [13:11:15.947] - Launch lazy future ... done [13:11:15.947] run() for 'MiraiFuture' ... done [13:11:15.948] Created future: [13:11:15.949] resolved() for 'MiraiFuture' ... [13:11:15.949] - state: 'running' [13:11:15.949] - run: TRUE [13:11:15.950] - result: 'NULL' [13:11:15.950] - resolved: FALSE [13:11:15.950] resolved() for 'MiraiFuture' ... done [13:11:15.948] MiraiFuture: [13:11:15.948] Label: 'future_lapply-1' [13:11:15.948] Expression: [13:11:15.948] { [13:11:15.948] do.call(function(...) { [13:11:15.948] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.948] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.948] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.948] on.exit(options(oopts), add = TRUE) [13:11:15.948] } [13:11:15.948] { [13:11:15.948] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.948] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.948] ...future.FUN(...future.X_jj, ...) [13:11:15.948] }) [13:11:15.948] } [13:11:15.948] }, args = future.call.arguments) [13:11:15.948] } [13:11:15.948] Lazy evaluation: FALSE [13:11:15.948] Asynchronous evaluation: TRUE [13:11:15.948] Local evaluation: TRUE [13:11:15.948] Environment: R_GlobalEnv [13:11:15.948] Capture standard output: TRUE [13:11:15.948] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.948] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.948] Packages: 1 packages ('listenv') [13:11:15.948] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.948] Resolved: FALSE [13:11:15.948] Value: [13:11:15.948] Conditions captured: [13:11:15.948] Early signaling: FALSE [13:11:15.948] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.948] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.951] Chunk #1 of 2 ... DONE [13:11:15.951] Chunk #2 of 2 ... [13:11:15.951] - Finding globals in 'X' for chunk #2 ... [13:11:15.951] getGlobalsAndPackages() ... [13:11:15.951] Searching for globals... [13:11:15.952] [13:11:15.952] Searching for globals ... DONE [13:11:15.952] - globals: [0] [13:11:15.952] getGlobalsAndPackages() ... DONE [13:11:15.952] + additional globals found: [n=0] [13:11:15.953] + additional namespaces needed: [n=0] [13:11:15.953] - Finding globals in 'X' for chunk #2 ... DONE [13:11:15.953] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:11:15.953] - seeds: [13:11:15.953] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.953] getGlobalsAndPackages() ... [13:11:15.954] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.954] Resolving globals: FALSE [13:11:15.954] Tweak future expression to call with '...' arguments ... [13:11:15.954] { [13:11:15.954] do.call(function(...) { [13:11:15.954] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.954] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.954] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.954] on.exit(options(oopts), add = TRUE) [13:11:15.954] } [13:11:15.954] { [13:11:15.954] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.954] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.954] ...future.FUN(...future.X_jj, ...) [13:11:15.954] }) [13:11:15.954] } [13:11:15.954] }, args = future.call.arguments) [13:11:15.954] } [13:11:15.955] Tweak future expression to call with '...' arguments ... DONE [13:11:15.955] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:15.955] - packages: [1] 'listenv' [13:11:15.956] getGlobalsAndPackages() ... DONE [13:11:15.956] run() for 'Future' ... [13:11:15.956] - state: 'created' [13:11:15.956] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:15.959] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.959] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:15.959] - Field: 'label' [13:11:15.960] - Field: 'local' [13:11:15.960] - Field: 'owner' [13:11:15.960] - Field: 'envir' [13:11:15.960] - Field: 'packages' [13:11:15.960] - Field: 'gc' [13:11:15.960] - Field: 'conditions' [13:11:15.961] - Field: 'expr' [13:11:15.961] - Field: 'uuid' [13:11:15.961] - Field: 'seed' [13:11:15.961] - Field: 'version' [13:11:15.961] - Field: 'result' [13:11:15.962] - Field: 'asynchronous' [13:11:15.962] - Field: 'calls' [13:11:15.962] - Field: 'globals' [13:11:15.962] - Field: 'stdout' [13:11:15.962] - Field: 'earlySignal' [13:11:15.963] - Field: 'lazy' [13:11:15.963] - Field: 'state' [13:11:15.963] - Field: '.cluster' [13:11:15.963] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:15.963] - Launch lazy future ... [13:11:15.963] Packages needed by the future expression (n = 1): 'listenv' [13:11:15.964] Packages needed by future strategies (n = 0): [13:11:15.966] { [13:11:15.966] { [13:11:15.966] { [13:11:15.966] ...future.startTime <- base::Sys.time() [13:11:15.966] { [13:11:15.966] { [13:11:15.966] { [13:11:15.966] { [13:11:15.966] base::local({ [13:11:15.966] has_future <- base::requireNamespace("future", [13:11:15.966] quietly = TRUE) [13:11:15.966] if (has_future) { [13:11:15.966] ns <- base::getNamespace("future") [13:11:15.966] version <- ns[[".package"]][["version"]] [13:11:15.966] if (is.null(version)) [13:11:15.966] version <- utils::packageVersion("future") [13:11:15.966] } [13:11:15.966] else { [13:11:15.966] version <- NULL [13:11:15.966] } [13:11:15.966] if (!has_future || version < "1.8.0") { [13:11:15.966] info <- base::c(r_version = base::gsub("R version ", [13:11:15.966] "", base::R.version$version.string), [13:11:15.966] platform = base::sprintf("%s (%s-bit)", [13:11:15.966] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:15.966] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:15.966] "release", "version")], collapse = " "), [13:11:15.966] hostname = base::Sys.info()[["nodename"]]) [13:11:15.966] info <- base::sprintf("%s: %s", base::names(info), [13:11:15.966] info) [13:11:15.966] info <- base::paste(info, collapse = "; ") [13:11:15.966] if (!has_future) { [13:11:15.966] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:15.966] info) [13:11:15.966] } [13:11:15.966] else { [13:11:15.966] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:15.966] info, version) [13:11:15.966] } [13:11:15.966] base::stop(msg) [13:11:15.966] } [13:11:15.966] }) [13:11:15.966] } [13:11:15.966] base::local({ [13:11:15.966] for (pkg in "listenv") { [13:11:15.966] base::loadNamespace(pkg) [13:11:15.966] base::library(pkg, character.only = TRUE) [13:11:15.966] } [13:11:15.966] }) [13:11:15.966] } [13:11:15.966] ...future.strategy.old <- future::plan("list") [13:11:15.966] options(future.plan = NULL) [13:11:15.966] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.966] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:15.966] } [13:11:15.966] ...future.workdir <- getwd() [13:11:15.966] } [13:11:15.966] ...future.oldOptions <- base::as.list(base::.Options) [13:11:15.966] ...future.oldEnvVars <- base::Sys.getenv() [13:11:15.966] } [13:11:15.966] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:15.966] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:11:15.966] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:15.966] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:15.966] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:15.966] future.stdout.windows.reencode = NULL, width = 80L) [13:11:15.966] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:15.966] base::names(...future.oldOptions)) [13:11:15.966] } [13:11:15.966] if (FALSE) { [13:11:15.966] } [13:11:15.966] else { [13:11:15.966] if (TRUE) { [13:11:15.966] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:15.966] open = "w") [13:11:15.966] } [13:11:15.966] else { [13:11:15.966] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:15.966] windows = "NUL", "/dev/null"), open = "w") [13:11:15.966] } [13:11:15.966] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:15.966] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:15.966] base::sink(type = "output", split = FALSE) [13:11:15.966] base::close(...future.stdout) [13:11:15.966] }, add = TRUE) [13:11:15.966] } [13:11:15.966] ...future.frame <- base::sys.nframe() [13:11:15.966] ...future.conditions <- base::list() [13:11:15.966] ...future.rng <- base::globalenv()$.Random.seed [13:11:15.966] if (FALSE) { [13:11:15.966] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:15.966] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:15.966] } [13:11:15.966] ...future.result <- base::tryCatch({ [13:11:15.966] base::withCallingHandlers({ [13:11:15.966] ...future.value <- base::withVisible(base::local({ [13:11:15.966] do.call(function(...) { [13:11:15.966] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.966] if (!identical(...future.globals.maxSize.org, [13:11:15.966] ...future.globals.maxSize)) { [13:11:15.966] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.966] on.exit(options(oopts), add = TRUE) [13:11:15.966] } [13:11:15.966] { [13:11:15.966] lapply(seq_along(...future.elements_ii), [13:11:15.966] FUN = function(jj) { [13:11:15.966] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.966] ...future.FUN(...future.X_jj, ...) [13:11:15.966] }) [13:11:15.966] } [13:11:15.966] }, args = future.call.arguments) [13:11:15.966] })) [13:11:15.966] future::FutureResult(value = ...future.value$value, [13:11:15.966] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.966] ...future.rng), globalenv = if (FALSE) [13:11:15.966] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:15.966] ...future.globalenv.names)) [13:11:15.966] else NULL, started = ...future.startTime, version = "1.8") [13:11:15.966] }, condition = base::local({ [13:11:15.966] c <- base::c [13:11:15.966] inherits <- base::inherits [13:11:15.966] invokeRestart <- base::invokeRestart [13:11:15.966] length <- base::length [13:11:15.966] list <- base::list [13:11:15.966] seq.int <- base::seq.int [13:11:15.966] signalCondition <- base::signalCondition [13:11:15.966] sys.calls <- base::sys.calls [13:11:15.966] `[[` <- base::`[[` [13:11:15.966] `+` <- base::`+` [13:11:15.966] `<<-` <- base::`<<-` [13:11:15.966] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:15.966] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:15.966] 3L)] [13:11:15.966] } [13:11:15.966] function(cond) { [13:11:15.966] is_error <- inherits(cond, "error") [13:11:15.966] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:15.966] NULL) [13:11:15.966] if (is_error) { [13:11:15.966] sessionInformation <- function() { [13:11:15.966] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:15.966] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:15.966] search = base::search(), system = base::Sys.info()) [13:11:15.966] } [13:11:15.966] ...future.conditions[[length(...future.conditions) + [13:11:15.966] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:15.966] cond$call), session = sessionInformation(), [13:11:15.966] timestamp = base::Sys.time(), signaled = 0L) [13:11:15.966] signalCondition(cond) [13:11:15.966] } [13:11:15.966] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:15.966] signal <- FALSE && inherits(cond, character(0)) [13:11:15.966] ...future.conditions[[length(...future.conditions) + [13:11:15.966] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:15.966] if (FALSE && !signal) { [13:11:15.966] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.966] { [13:11:15.966] inherits <- base::inherits [13:11:15.966] invokeRestart <- base::invokeRestart [13:11:15.966] is.null <- base::is.null [13:11:15.966] muffled <- FALSE [13:11:15.966] if (inherits(cond, "message")) { [13:11:15.966] muffled <- grepl(pattern, "muffleMessage") [13:11:15.966] if (muffled) [13:11:15.966] invokeRestart("muffleMessage") [13:11:15.966] } [13:11:15.966] else if (inherits(cond, "warning")) { [13:11:15.966] muffled <- grepl(pattern, "muffleWarning") [13:11:15.966] if (muffled) [13:11:15.966] invokeRestart("muffleWarning") [13:11:15.966] } [13:11:15.966] else if (inherits(cond, "condition")) { [13:11:15.966] if (!is.null(pattern)) { [13:11:15.966] computeRestarts <- base::computeRestarts [13:11:15.966] grepl <- base::grepl [13:11:15.966] restarts <- computeRestarts(cond) [13:11:15.966] for (restart in restarts) { [13:11:15.966] name <- restart$name [13:11:15.966] if (is.null(name)) [13:11:15.966] next [13:11:15.966] if (!grepl(pattern, name)) [13:11:15.966] next [13:11:15.966] invokeRestart(restart) [13:11:15.966] muffled <- TRUE [13:11:15.966] break [13:11:15.966] } [13:11:15.966] } [13:11:15.966] } [13:11:15.966] invisible(muffled) [13:11:15.966] } [13:11:15.966] muffleCondition(cond, pattern = "^muffle") [13:11:15.966] } [13:11:15.966] } [13:11:15.966] else { [13:11:15.966] if (TRUE) { [13:11:15.966] muffleCondition <- function (cond, pattern = "^muffle") [13:11:15.966] { [13:11:15.966] inherits <- base::inherits [13:11:15.966] invokeRestart <- base::invokeRestart [13:11:15.966] is.null <- base::is.null [13:11:15.966] muffled <- FALSE [13:11:15.966] if (inherits(cond, "message")) { [13:11:15.966] muffled <- grepl(pattern, "muffleMessage") [13:11:15.966] if (muffled) [13:11:15.966] invokeRestart("muffleMessage") [13:11:15.966] } [13:11:15.966] else if (inherits(cond, "warning")) { [13:11:15.966] muffled <- grepl(pattern, "muffleWarning") [13:11:15.966] if (muffled) [13:11:15.966] invokeRestart("muffleWarning") [13:11:15.966] } [13:11:15.966] else if (inherits(cond, "condition")) { [13:11:15.966] if (!is.null(pattern)) { [13:11:15.966] computeRestarts <- base::computeRestarts [13:11:15.966] grepl <- base::grepl [13:11:15.966] restarts <- computeRestarts(cond) [13:11:15.966] for (restart in restarts) { [13:11:15.966] name <- restart$name [13:11:15.966] if (is.null(name)) [13:11:15.966] next [13:11:15.966] if (!grepl(pattern, name)) [13:11:15.966] next [13:11:15.966] invokeRestart(restart) [13:11:15.966] muffled <- TRUE [13:11:15.966] break [13:11:15.966] } [13:11:15.966] } [13:11:15.966] } [13:11:15.966] invisible(muffled) [13:11:15.966] } [13:11:15.966] muffleCondition(cond, pattern = "^muffle") [13:11:15.966] } [13:11:15.966] } [13:11:15.966] } [13:11:15.966] })) [13:11:15.966] }, error = function(ex) { [13:11:15.966] base::structure(base::list(value = NULL, visible = NULL, [13:11:15.966] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:15.966] ...future.rng), started = ...future.startTime, [13:11:15.966] finished = Sys.time(), session_uuid = NA_character_, [13:11:15.966] version = "1.8"), class = "FutureResult") [13:11:15.966] }, finally = { [13:11:15.966] if (!identical(...future.workdir, getwd())) [13:11:15.966] setwd(...future.workdir) [13:11:15.966] { [13:11:15.966] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:15.966] ...future.oldOptions$nwarnings <- NULL [13:11:15.966] } [13:11:15.966] base::options(...future.oldOptions) [13:11:15.966] if (.Platform$OS.type == "windows") { [13:11:15.966] old_names <- names(...future.oldEnvVars) [13:11:15.966] envs <- base::Sys.getenv() [13:11:15.966] names <- names(envs) [13:11:15.966] common <- intersect(names, old_names) [13:11:15.966] added <- setdiff(names, old_names) [13:11:15.966] removed <- setdiff(old_names, names) [13:11:15.966] changed <- common[...future.oldEnvVars[common] != [13:11:15.966] envs[common]] [13:11:15.966] NAMES <- toupper(changed) [13:11:15.966] args <- list() [13:11:15.966] for (kk in seq_along(NAMES)) { [13:11:15.966] name <- changed[[kk]] [13:11:15.966] NAME <- NAMES[[kk]] [13:11:15.966] if (name != NAME && is.element(NAME, old_names)) [13:11:15.966] next [13:11:15.966] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.966] } [13:11:15.966] NAMES <- toupper(added) [13:11:15.966] for (kk in seq_along(NAMES)) { [13:11:15.966] name <- added[[kk]] [13:11:15.966] NAME <- NAMES[[kk]] [13:11:15.966] if (name != NAME && is.element(NAME, old_names)) [13:11:15.966] next [13:11:15.966] args[[name]] <- "" [13:11:15.966] } [13:11:15.966] NAMES <- toupper(removed) [13:11:15.966] for (kk in seq_along(NAMES)) { [13:11:15.966] name <- removed[[kk]] [13:11:15.966] NAME <- NAMES[[kk]] [13:11:15.966] if (name != NAME && is.element(NAME, old_names)) [13:11:15.966] next [13:11:15.966] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:15.966] } [13:11:15.966] if (length(args) > 0) [13:11:15.966] base::do.call(base::Sys.setenv, args = args) [13:11:15.966] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:15.966] } [13:11:15.966] else { [13:11:15.966] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:15.966] } [13:11:15.966] { [13:11:15.966] if (base::length(...future.futureOptionsAdded) > [13:11:15.966] 0L) { [13:11:15.966] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:15.966] base::names(opts) <- ...future.futureOptionsAdded [13:11:15.966] base::options(opts) [13:11:15.966] } [13:11:15.966] { [13:11:15.966] NULL [13:11:15.966] options(future.plan = NULL) [13:11:15.966] if (is.na(NA_character_)) [13:11:15.966] Sys.unsetenv("R_FUTURE_PLAN") [13:11:15.966] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:15.966] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:15.966] .init = FALSE) [13:11:15.966] } [13:11:15.966] } [13:11:15.966] } [13:11:15.966] }) [13:11:15.966] if (TRUE) { [13:11:15.966] base::sink(type = "output", split = FALSE) [13:11:15.966] if (TRUE) { [13:11:15.966] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:15.966] } [13:11:15.966] else { [13:11:15.966] ...future.result["stdout"] <- base::list(NULL) [13:11:15.966] } [13:11:15.966] base::close(...future.stdout) [13:11:15.966] ...future.stdout <- NULL [13:11:15.966] } [13:11:15.966] ...future.result$conditions <- ...future.conditions [13:11:15.966] ...future.result$finished <- base::Sys.time() [13:11:15.966] ...future.result [13:11:15.966] } [13:11:15.971] - Launch lazy future ... done [13:11:15.971] run() for 'MiraiFuture' ... done [13:11:15.971] Created future: [13:11:15.972] resolved() for 'MiraiFuture' ... [13:11:15.973] - state: 'running' [13:11:15.973] - run: TRUE [13:11:15.973] - result: 'NULL' [13:11:15.973] - resolved: FALSE [13:11:15.973] resolved() for 'MiraiFuture' ... done [13:11:15.971] MiraiFuture: [13:11:15.971] Label: 'future_lapply-2' [13:11:15.971] Expression: [13:11:15.971] { [13:11:15.971] do.call(function(...) { [13:11:15.971] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:15.971] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:15.971] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:15.971] on.exit(options(oopts), add = TRUE) [13:11:15.971] } [13:11:15.971] { [13:11:15.971] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:15.971] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:15.971] ...future.FUN(...future.X_jj, ...) [13:11:15.971] }) [13:11:15.971] } [13:11:15.971] }, args = future.call.arguments) [13:11:15.971] } [13:11:15.971] Lazy evaluation: FALSE [13:11:15.971] Asynchronous evaluation: TRUE [13:11:15.971] Local evaluation: TRUE [13:11:15.971] Environment: R_GlobalEnv [13:11:15.971] Capture standard output: TRUE [13:11:15.971] Capture condition classes: 'condition' (excluding 'nothing') [13:11:15.971] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:15.971] Packages: 1 packages ('listenv') [13:11:15.971] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:15.971] Resolved: FALSE [13:11:15.971] Value: [13:11:15.971] Conditions captured: [13:11:15.971] Early signaling: FALSE [13:11:15.971] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:15.971] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:15.974] Chunk #2 of 2 ... DONE [13:11:15.974] Launching 2 futures (chunks) ... DONE [13:11:15.974] Resolving 2 futures (chunks) ... [13:11:15.974] resolve() on list ... [13:11:15.975] recursive: 0 [13:11:15.975] length: 2 [13:11:15.975] [13:11:15.975] resolved() for 'MiraiFuture' ... [13:11:15.975] - state: 'running' [13:11:15.975] - run: TRUE [13:11:15.976] - result: 'NULL' [13:11:15.976] - resolved: FALSE [13:11:15.976] resolved() for 'MiraiFuture' ... done [13:11:15.976] Future #1 [13:11:15.976] signalConditionsASAP(MiraiFuture, pos=1) ... [13:11:15.977] - nx: 2 [13:11:15.977] - relay: TRUE [13:11:15.977] - stdout: TRUE [13:11:15.977] - signal: TRUE [13:11:15.977] - resignal: FALSE [13:11:15.977] - force: TRUE [13:11:15.978] - relayed: [n=2] FALSE, FALSE [13:11:15.978] - queued futures: [n=2] FALSE, FALSE [13:11:15.978] - until=1 [13:11:15.978] - relaying element #1 [13:11:15.978] - relayed: [n=2] TRUE, FALSE [13:11:15.979] - queued futures: [n=2] TRUE, FALSE [13:11:15.979] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:11:15.979] length: 1 (resolved future 1) [13:11:15.979] resolved() for 'MiraiFuture' ... [13:11:15.979] - state: 'running' [13:11:15.979] - run: TRUE [13:11:15.980] - result: 'NULL' [13:11:15.980] - resolved: FALSE [13:11:15.980] resolved() for 'MiraiFuture' ... done [13:11:15.980] Future #2 [13:11:15.980] signalConditionsASAP(MiraiFuture, pos=2) ... [13:11:15.981] - nx: 2 [13:11:15.981] - relay: TRUE [13:11:15.981] - stdout: TRUE [13:11:15.981] - signal: TRUE [13:11:15.981] - resignal: FALSE [13:11:15.981] - force: TRUE [13:11:15.982] - relayed: [n=2] TRUE, FALSE [13:11:15.982] - queued futures: [n=2] TRUE, FALSE [13:11:15.982] - until=2 [13:11:15.982] - relaying element #2 [13:11:15.982] - relayed: [n=2] TRUE, TRUE [13:11:15.982] - queued futures: [n=2] TRUE, TRUE [13:11:15.983] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:11:15.983] length: 0 (resolved future 2) [13:11:15.983] Relaying remaining futures [13:11:15.983] signalConditionsASAP(NULL, pos=0) ... [13:11:15.983] - nx: 2 [13:11:15.983] - relay: TRUE [13:11:15.984] - stdout: TRUE [13:11:15.984] - signal: TRUE [13:11:15.984] - resignal: FALSE [13:11:15.984] - force: TRUE [13:11:15.984] - relayed: [n=2] TRUE, TRUE [13:11:15.984] - queued futures: [n=2] TRUE, TRUE - flush all [13:11:15.985] - relayed: [n=2] TRUE, TRUE [13:11:15.985] - queued futures: [n=2] TRUE, TRUE [13:11:15.985] signalConditionsASAP(NULL, pos=0) ... done [13:11:15.985] resolve() on list ... DONE [13:11:15.985] - Number of value chunks collected: 2 [13:11:15.986] Resolving 2 futures (chunks) ... DONE [13:11:15.986] Reducing values from 2 chunks ... [13:11:15.986] - Number of values collected after concatenation: 2 [13:11:15.986] - Number of values expected: 2 [13:11:15.986] Reducing values from 2 chunks ... DONE [13:11:15.986] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN, ...) for large length(x) ... [13:11:15.988] future_lapply() ... [13:11:16.042] Number of chunks: 2 [13:11:16.042] getGlobalsAndPackagesXApply() ... [13:11:16.042] - future.globals: TRUE [13:11:16.042] getGlobalsAndPackages() ... [13:11:16.043] Searching for globals... [13:11:16.045] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [13:11:16.045] Searching for globals ... DONE [13:11:16.046] Resolving globals: FALSE [13:11:16.046] The total size of the 2 globals is 784 bytes (784 bytes) [13:11:16.047] The total size of the 2 globals exported for future expression ('FUN()') is 784 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'FUN' (728 bytes of class 'function') and 'a' (56 bytes of class 'numeric') [13:11:16.047] - globals: [2] 'FUN', 'a' [13:11:16.048] [13:11:16.048] getGlobalsAndPackages() ... DONE [13:11:16.048] - globals found/used: [n=2] 'FUN', 'a' [13:11:16.048] - needed namespaces: [n=0] [13:11:16.048] Finding globals ... DONE [13:11:16.049] - use_args: TRUE [13:11:16.055] - Getting '...' globals ... [13:11:16.056] resolve() on list ... [13:11:16.056] recursive: 0 [13:11:16.057] length: 1 [13:11:16.057] elements: '...' [13:11:16.057] length: 0 (resolved future 1) [13:11:16.057] resolve() on list ... DONE [13:11:16.058] - '...' content: [n=0] [13:11:16.058] List of 1 [13:11:16.058] $ ...: list() [13:11:16.058] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:16.058] - attr(*, "where")=List of 1 [13:11:16.058] ..$ ...: [13:11:16.058] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:16.058] - attr(*, "resolved")= logi TRUE [13:11:16.058] - attr(*, "total_size")= num NA [13:11:16.063] - Getting '...' globals ... DONE [13:11:16.063] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [13:11:16.063] List of 3 [13:11:16.063] $ ...future.FUN:function (z) [13:11:16.063] $ a : num 3.14 [13:11:16.063] $ ... : list() [13:11:16.063] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:16.063] - attr(*, "where")=List of 3 [13:11:16.063] ..$ ...future.FUN: [13:11:16.063] ..$ a : [13:11:16.063] ..$ ... : [13:11:16.063] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:16.063] - attr(*, "resolved")= logi FALSE [13:11:16.063] - attr(*, "total_size")= num 784 [13:11:16.068] Packages to be attached in all futures: [n=0] [13:11:16.068] getGlobalsAndPackagesXApply() ... DONE [13:11:16.069] Number of futures (= number of chunks): 2 [13:11:16.069] Launching 2 futures (chunks) ... [13:11:16.069] Chunk #1 of 2 ... [13:11:16.219] - Finding globals in 'X' for chunk #1 ... [13:11:16.220] getGlobalsAndPackages() ... [13:11:16.220] Searching for globals... [13:11:16.599] [13:11:16.599] Searching for globals ... DONE [13:11:16.600] - globals: [0] [13:11:16.600] getGlobalsAndPackages() ... DONE [13:11:16.600] + additional globals found: [n=0] [13:11:16.600] + additional namespaces needed: [n=0] [13:11:16.600] - Finding globals in 'X' for chunk #1 ... DONE [13:11:16.601] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:11:16.601] - seeds: [13:11:16.601] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:16.601] getGlobalsAndPackages() ... [13:11:16.601] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:16.601] Resolving globals: FALSE [13:11:16.602] Tweak future expression to call with '...' arguments ... [13:11:16.602] { [13:11:16.602] do.call(function(...) { [13:11:16.602] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:16.602] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:16.602] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:16.602] on.exit(options(oopts), add = TRUE) [13:11:16.602] } [13:11:16.602] { [13:11:16.602] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:16.602] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:16.602] ...future.FUN(...future.X_jj, ...) [13:11:16.602] }) [13:11:16.602] } [13:11:16.602] }, args = future.call.arguments) [13:11:16.602] } [13:11:16.602] Tweak future expression to call with '...' arguments ... DONE [13:11:16.603] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:16.603] [13:11:16.603] getGlobalsAndPackages() ... DONE [13:11:16.604] run() for 'Future' ... [13:11:16.604] - state: 'created' [13:11:16.604] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:16.607] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:16.607] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:16.607] - Field: 'label' [13:11:16.607] - Field: 'local' [13:11:16.608] - Field: 'owner' [13:11:16.608] - Field: 'envir' [13:11:16.608] - Field: 'packages' [13:11:16.608] - Field: 'gc' [13:11:16.608] - Field: 'conditions' [13:11:16.609] - Field: 'expr' [13:11:16.609] - Field: 'uuid' [13:11:16.609] - Field: 'seed' [13:11:16.609] - Field: 'version' [13:11:16.609] - Field: 'result' [13:11:16.609] - Field: 'asynchronous' [13:11:16.610] - Field: 'calls' [13:11:16.610] - Field: 'globals' [13:11:16.610] - Field: 'stdout' [13:11:16.610] - Field: 'earlySignal' [13:11:16.611] - Field: 'lazy' [13:11:16.611] - Field: 'state' [13:11:16.611] - Field: '.cluster' [13:11:16.611] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:16.611] - Launch lazy future ... [13:11:16.611] Packages needed by the future expression (n = 0): [13:11:16.612] Packages needed by future strategies (n = 0): [13:11:16.612] { [13:11:16.612] { [13:11:16.612] { [13:11:16.612] ...future.startTime <- base::Sys.time() [13:11:16.612] { [13:11:16.612] { [13:11:16.612] { [13:11:16.612] base::local({ [13:11:16.612] has_future <- base::requireNamespace("future", [13:11:16.612] quietly = TRUE) [13:11:16.612] if (has_future) { [13:11:16.612] ns <- base::getNamespace("future") [13:11:16.612] version <- ns[[".package"]][["version"]] [13:11:16.612] if (is.null(version)) [13:11:16.612] version <- utils::packageVersion("future") [13:11:16.612] } [13:11:16.612] else { [13:11:16.612] version <- NULL [13:11:16.612] } [13:11:16.612] if (!has_future || version < "1.8.0") { [13:11:16.612] info <- base::c(r_version = base::gsub("R version ", [13:11:16.612] "", base::R.version$version.string), [13:11:16.612] platform = base::sprintf("%s (%s-bit)", [13:11:16.612] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:16.612] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:16.612] "release", "version")], collapse = " "), [13:11:16.612] hostname = base::Sys.info()[["nodename"]]) [13:11:16.612] info <- base::sprintf("%s: %s", base::names(info), [13:11:16.612] info) [13:11:16.612] info <- base::paste(info, collapse = "; ") [13:11:16.612] if (!has_future) { [13:11:16.612] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:16.612] info) [13:11:16.612] } [13:11:16.612] else { [13:11:16.612] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:16.612] info, version) [13:11:16.612] } [13:11:16.612] base::stop(msg) [13:11:16.612] } [13:11:16.612] }) [13:11:16.612] } [13:11:16.612] ...future.strategy.old <- future::plan("list") [13:11:16.612] options(future.plan = NULL) [13:11:16.612] Sys.unsetenv("R_FUTURE_PLAN") [13:11:16.612] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:16.612] } [13:11:16.612] ...future.workdir <- getwd() [13:11:16.612] } [13:11:16.612] ...future.oldOptions <- base::as.list(base::.Options) [13:11:16.612] ...future.oldEnvVars <- base::Sys.getenv() [13:11:16.612] } [13:11:16.612] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:16.612] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:11:16.612] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:16.612] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:16.612] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:16.612] future.stdout.windows.reencode = NULL, width = 80L) [13:11:16.612] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:16.612] base::names(...future.oldOptions)) [13:11:16.612] } [13:11:16.612] if (FALSE) { [13:11:16.612] } [13:11:16.612] else { [13:11:16.612] if (TRUE) { [13:11:16.612] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:16.612] open = "w") [13:11:16.612] } [13:11:16.612] else { [13:11:16.612] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:16.612] windows = "NUL", "/dev/null"), open = "w") [13:11:16.612] } [13:11:16.612] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:16.612] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:16.612] base::sink(type = "output", split = FALSE) [13:11:16.612] base::close(...future.stdout) [13:11:16.612] }, add = TRUE) [13:11:16.612] } [13:11:16.612] ...future.frame <- base::sys.nframe() [13:11:16.612] ...future.conditions <- base::list() [13:11:16.612] ...future.rng <- base::globalenv()$.Random.seed [13:11:16.612] if (FALSE) { [13:11:16.612] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:16.612] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:16.612] } [13:11:16.612] ...future.result <- base::tryCatch({ [13:11:16.612] base::withCallingHandlers({ [13:11:16.612] ...future.value <- base::withVisible(base::local({ [13:11:16.612] do.call(function(...) { [13:11:16.612] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:16.612] if (!identical(...future.globals.maxSize.org, [13:11:16.612] ...future.globals.maxSize)) { [13:11:16.612] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:16.612] on.exit(options(oopts), add = TRUE) [13:11:16.612] } [13:11:16.612] { [13:11:16.612] lapply(seq_along(...future.elements_ii), [13:11:16.612] FUN = function(jj) { [13:11:16.612] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:16.612] ...future.FUN(...future.X_jj, ...) [13:11:16.612] }) [13:11:16.612] } [13:11:16.612] }, args = future.call.arguments) [13:11:16.612] })) [13:11:16.612] future::FutureResult(value = ...future.value$value, [13:11:16.612] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:16.612] ...future.rng), globalenv = if (FALSE) [13:11:16.612] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:16.612] ...future.globalenv.names)) [13:11:16.612] else NULL, started = ...future.startTime, version = "1.8") [13:11:16.612] }, condition = base::local({ [13:11:16.612] c <- base::c [13:11:16.612] inherits <- base::inherits [13:11:16.612] invokeRestart <- base::invokeRestart [13:11:16.612] length <- base::length [13:11:16.612] list <- base::list [13:11:16.612] seq.int <- base::seq.int [13:11:16.612] signalCondition <- base::signalCondition [13:11:16.612] sys.calls <- base::sys.calls [13:11:16.612] `[[` <- base::`[[` [13:11:16.612] `+` <- base::`+` [13:11:16.612] `<<-` <- base::`<<-` [13:11:16.612] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:16.612] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:16.612] 3L)] [13:11:16.612] } [13:11:16.612] function(cond) { [13:11:16.612] is_error <- inherits(cond, "error") [13:11:16.612] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:16.612] NULL) [13:11:16.612] if (is_error) { [13:11:16.612] sessionInformation <- function() { [13:11:16.612] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:16.612] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:16.612] search = base::search(), system = base::Sys.info()) [13:11:16.612] } [13:11:16.612] ...future.conditions[[length(...future.conditions) + [13:11:16.612] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:16.612] cond$call), session = sessionInformation(), [13:11:16.612] timestamp = base::Sys.time(), signaled = 0L) [13:11:16.612] signalCondition(cond) [13:11:16.612] } [13:11:16.612] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:16.612] signal <- FALSE && inherits(cond, character(0)) [13:11:16.612] ...future.conditions[[length(...future.conditions) + [13:11:16.612] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:16.612] if (FALSE && !signal) { [13:11:16.612] muffleCondition <- function (cond, pattern = "^muffle") [13:11:16.612] { [13:11:16.612] inherits <- base::inherits [13:11:16.612] invokeRestart <- base::invokeRestart [13:11:16.612] is.null <- base::is.null [13:11:16.612] muffled <- FALSE [13:11:16.612] if (inherits(cond, "message")) { [13:11:16.612] muffled <- grepl(pattern, "muffleMessage") [13:11:16.612] if (muffled) [13:11:16.612] invokeRestart("muffleMessage") [13:11:16.612] } [13:11:16.612] else if (inherits(cond, "warning")) { [13:11:16.612] muffled <- grepl(pattern, "muffleWarning") [13:11:16.612] if (muffled) [13:11:16.612] invokeRestart("muffleWarning") [13:11:16.612] } [13:11:16.612] else if (inherits(cond, "condition")) { [13:11:16.612] if (!is.null(pattern)) { [13:11:16.612] computeRestarts <- base::computeRestarts [13:11:16.612] grepl <- base::grepl [13:11:16.612] restarts <- computeRestarts(cond) [13:11:16.612] for (restart in restarts) { [13:11:16.612] name <- restart$name [13:11:16.612] if (is.null(name)) [13:11:16.612] next [13:11:16.612] if (!grepl(pattern, name)) [13:11:16.612] next [13:11:16.612] invokeRestart(restart) [13:11:16.612] muffled <- TRUE [13:11:16.612] break [13:11:16.612] } [13:11:16.612] } [13:11:16.612] } [13:11:16.612] invisible(muffled) [13:11:16.612] } [13:11:16.612] muffleCondition(cond, pattern = "^muffle") [13:11:16.612] } [13:11:16.612] } [13:11:16.612] else { [13:11:16.612] if (TRUE) { [13:11:16.612] muffleCondition <- function (cond, pattern = "^muffle") [13:11:16.612] { [13:11:16.612] inherits <- base::inherits [13:11:16.612] invokeRestart <- base::invokeRestart [13:11:16.612] is.null <- base::is.null [13:11:16.612] muffled <- FALSE [13:11:16.612] if (inherits(cond, "message")) { [13:11:16.612] muffled <- grepl(pattern, "muffleMessage") [13:11:16.612] if (muffled) [13:11:16.612] invokeRestart("muffleMessage") [13:11:16.612] } [13:11:16.612] else if (inherits(cond, "warning")) { [13:11:16.612] muffled <- grepl(pattern, "muffleWarning") [13:11:16.612] if (muffled) [13:11:16.612] invokeRestart("muffleWarning") [13:11:16.612] } [13:11:16.612] else if (inherits(cond, "condition")) { [13:11:16.612] if (!is.null(pattern)) { [13:11:16.612] computeRestarts <- base::computeRestarts [13:11:16.612] grepl <- base::grepl [13:11:16.612] restarts <- computeRestarts(cond) [13:11:16.612] for (restart in restarts) { [13:11:16.612] name <- restart$name [13:11:16.612] if (is.null(name)) [13:11:16.612] next [13:11:16.612] if (!grepl(pattern, name)) [13:11:16.612] next [13:11:16.612] invokeRestart(restart) [13:11:16.612] muffled <- TRUE [13:11:16.612] break [13:11:16.612] } [13:11:16.612] } [13:11:16.612] } [13:11:16.612] invisible(muffled) [13:11:16.612] } [13:11:16.612] muffleCondition(cond, pattern = "^muffle") [13:11:16.612] } [13:11:16.612] } [13:11:16.612] } [13:11:16.612] })) [13:11:16.612] }, error = function(ex) { [13:11:16.612] base::structure(base::list(value = NULL, visible = NULL, [13:11:16.612] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:16.612] ...future.rng), started = ...future.startTime, [13:11:16.612] finished = Sys.time(), session_uuid = NA_character_, [13:11:16.612] version = "1.8"), class = "FutureResult") [13:11:16.612] }, finally = { [13:11:16.612] if (!identical(...future.workdir, getwd())) [13:11:16.612] setwd(...future.workdir) [13:11:16.612] { [13:11:16.612] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:16.612] ...future.oldOptions$nwarnings <- NULL [13:11:16.612] } [13:11:16.612] base::options(...future.oldOptions) [13:11:16.612] if (.Platform$OS.type == "windows") { [13:11:16.612] old_names <- names(...future.oldEnvVars) [13:11:16.612] envs <- base::Sys.getenv() [13:11:16.612] names <- names(envs) [13:11:16.612] common <- intersect(names, old_names) [13:11:16.612] added <- setdiff(names, old_names) [13:11:16.612] removed <- setdiff(old_names, names) [13:11:16.612] changed <- common[...future.oldEnvVars[common] != [13:11:16.612] envs[common]] [13:11:16.612] NAMES <- toupper(changed) [13:11:16.612] args <- list() [13:11:16.612] for (kk in seq_along(NAMES)) { [13:11:16.612] name <- changed[[kk]] [13:11:16.612] NAME <- NAMES[[kk]] [13:11:16.612] if (name != NAME && is.element(NAME, old_names)) [13:11:16.612] next [13:11:16.612] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:16.612] } [13:11:16.612] NAMES <- toupper(added) [13:11:16.612] for (kk in seq_along(NAMES)) { [13:11:16.612] name <- added[[kk]] [13:11:16.612] NAME <- NAMES[[kk]] [13:11:16.612] if (name != NAME && is.element(NAME, old_names)) [13:11:16.612] next [13:11:16.612] args[[name]] <- "" [13:11:16.612] } [13:11:16.612] NAMES <- toupper(removed) [13:11:16.612] for (kk in seq_along(NAMES)) { [13:11:16.612] name <- removed[[kk]] [13:11:16.612] NAME <- NAMES[[kk]] [13:11:16.612] if (name != NAME && is.element(NAME, old_names)) [13:11:16.612] next [13:11:16.612] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:16.612] } [13:11:16.612] if (length(args) > 0) [13:11:16.612] base::do.call(base::Sys.setenv, args = args) [13:11:16.612] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:16.612] } [13:11:16.612] else { [13:11:16.612] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:16.612] } [13:11:16.612] { [13:11:16.612] if (base::length(...future.futureOptionsAdded) > [13:11:16.612] 0L) { [13:11:16.612] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:16.612] base::names(opts) <- ...future.futureOptionsAdded [13:11:16.612] base::options(opts) [13:11:16.612] } [13:11:16.612] { [13:11:16.612] NULL [13:11:16.612] options(future.plan = NULL) [13:11:16.612] if (is.na(NA_character_)) [13:11:16.612] Sys.unsetenv("R_FUTURE_PLAN") [13:11:16.612] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:16.612] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:16.612] .init = FALSE) [13:11:16.612] } [13:11:16.612] } [13:11:16.612] } [13:11:16.612] }) [13:11:16.612] if (TRUE) { [13:11:16.612] base::sink(type = "output", split = FALSE) [13:11:16.612] if (TRUE) { [13:11:16.612] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:16.612] } [13:11:16.612] else { [13:11:16.612] ...future.result["stdout"] <- base::list(NULL) [13:11:16.612] } [13:11:16.612] base::close(...future.stdout) [13:11:16.612] ...future.stdout <- NULL [13:11:16.612] } [13:11:16.612] ...future.result$conditions <- ...future.conditions [13:11:16.612] ...future.result$finished <- base::Sys.time() [13:11:16.612] ...future.result [13:11:16.612] } [13:11:16.648] - Launch lazy future ... done [13:11:16.648] run() for 'MiraiFuture' ... done [13:11:16.648] Created future: [13:11:19.061] resolved() for 'MiraiFuture' ... [13:11:19.061] - state: 'running' [13:11:19.061] - run: TRUE [13:11:19.062] - result: 'NULL' [13:11:19.062] - resolved: FALSE [13:11:19.062] resolved() for 'MiraiFuture' ... done [13:11:16.649] MiraiFuture: [13:11:16.649] Label: 'future_lapply-1' [13:11:16.649] Expression: [13:11:16.649] { [13:11:16.649] do.call(function(...) { [13:11:16.649] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:16.649] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:16.649] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:16.649] on.exit(options(oopts), add = TRUE) [13:11:16.649] } [13:11:16.649] { [13:11:16.649] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:16.649] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:16.649] ...future.FUN(...future.X_jj, ...) [13:11:16.649] }) [13:11:16.649] } [13:11:16.649] }, args = future.call.arguments) [13:11:16.649] } [13:11:16.649] Lazy evaluation: FALSE [13:11:16.649] Asynchronous evaluation: TRUE [13:11:16.649] Local evaluation: TRUE [13:11:16.649] Environment: R_GlobalEnv [13:11:16.649] Capture standard output: TRUE [13:11:16.649] Capture condition classes: 'condition' (excluding 'nothing') [13:11:16.649] Globals: 6 objects totaling 26.70 MiB (function '...future.FUN' of 728 bytes, numeric 'a' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 26.70 MiB, NULL '...future.seeds_ii' of 0 bytes, ...) [13:11:16.649] Packages: [13:11:16.649] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:16.649] Resolved: TRUE [13:11:16.649] Value: [13:11:16.649] Conditions captured: [13:11:16.649] Early signaling: FALSE [13:11:16.649] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:16.649] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:19.091] Chunk #1 of 2 ... DONE [13:11:19.091] Chunk #2 of 2 ... [13:11:19.333] - Finding globals in 'X' for chunk #2 ... [13:11:19.333] getGlobalsAndPackages() ... [13:11:19.333] Searching for globals... [13:11:19.685] [13:11:19.685] Searching for globals ... DONE [13:11:19.685] - globals: [0] [13:11:19.685] getGlobalsAndPackages() ... DONE [13:11:19.685] + additional globals found: [n=0] [13:11:19.686] + additional namespaces needed: [n=0] [13:11:19.686] - Finding globals in 'X' for chunk #2 ... DONE [13:11:19.686] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:11:19.686] - seeds: [13:11:19.686] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:19.686] getGlobalsAndPackages() ... [13:11:19.686] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:19.687] Resolving globals: FALSE [13:11:19.687] Tweak future expression to call with '...' arguments ... [13:11:19.687] { [13:11:19.687] do.call(function(...) { [13:11:19.687] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:19.687] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:19.687] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:19.687] on.exit(options(oopts), add = TRUE) [13:11:19.687] } [13:11:19.687] { [13:11:19.687] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:19.687] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:19.687] ...future.FUN(...future.X_jj, ...) [13:11:19.687] }) [13:11:19.687] } [13:11:19.687] }, args = future.call.arguments) [13:11:19.687] } [13:11:19.688] Tweak future expression to call with '...' arguments ... DONE [13:11:19.688] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:19.688] [13:11:19.688] getGlobalsAndPackages() ... DONE [13:11:19.689] run() for 'Future' ... [13:11:19.689] - state: 'created' [13:11:19.689] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:19.692] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:19.692] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:19.692] - Field: 'label' [13:11:19.692] - Field: 'local' [13:11:19.693] - Field: 'owner' [13:11:19.693] - Field: 'envir' [13:11:19.693] - Field: 'packages' [13:11:19.693] - Field: 'gc' [13:11:19.693] - Field: 'conditions' [13:11:19.693] - Field: 'expr' [13:11:19.694] - Field: 'uuid' [13:11:19.694] - Field: 'seed' [13:11:19.694] - Field: 'version' [13:11:19.694] - Field: 'result' [13:11:19.694] - Field: 'asynchronous' [13:11:19.694] - Field: 'calls' [13:11:19.695] - Field: 'globals' [13:11:19.695] - Field: 'stdout' [13:11:19.695] - Field: 'earlySignal' [13:11:19.695] - Field: 'lazy' [13:11:19.695] - Field: 'state' [13:11:19.695] - Field: '.cluster' [13:11:19.696] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:19.696] - Launch lazy future ... [13:11:19.696] Packages needed by the future expression (n = 0): [13:11:19.696] Packages needed by future strategies (n = 0): [13:11:19.697] { [13:11:19.697] { [13:11:19.697] { [13:11:19.697] ...future.startTime <- base::Sys.time() [13:11:19.697] { [13:11:19.697] { [13:11:19.697] { [13:11:19.697] base::local({ [13:11:19.697] has_future <- base::requireNamespace("future", [13:11:19.697] quietly = TRUE) [13:11:19.697] if (has_future) { [13:11:19.697] ns <- base::getNamespace("future") [13:11:19.697] version <- ns[[".package"]][["version"]] [13:11:19.697] if (is.null(version)) [13:11:19.697] version <- utils::packageVersion("future") [13:11:19.697] } [13:11:19.697] else { [13:11:19.697] version <- NULL [13:11:19.697] } [13:11:19.697] if (!has_future || version < "1.8.0") { [13:11:19.697] info <- base::c(r_version = base::gsub("R version ", [13:11:19.697] "", base::R.version$version.string), [13:11:19.697] platform = base::sprintf("%s (%s-bit)", [13:11:19.697] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:19.697] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:19.697] "release", "version")], collapse = " "), [13:11:19.697] hostname = base::Sys.info()[["nodename"]]) [13:11:19.697] info <- base::sprintf("%s: %s", base::names(info), [13:11:19.697] info) [13:11:19.697] info <- base::paste(info, collapse = "; ") [13:11:19.697] if (!has_future) { [13:11:19.697] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:19.697] info) [13:11:19.697] } [13:11:19.697] else { [13:11:19.697] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:19.697] info, version) [13:11:19.697] } [13:11:19.697] base::stop(msg) [13:11:19.697] } [13:11:19.697] }) [13:11:19.697] } [13:11:19.697] ...future.strategy.old <- future::plan("list") [13:11:19.697] options(future.plan = NULL) [13:11:19.697] Sys.unsetenv("R_FUTURE_PLAN") [13:11:19.697] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:19.697] } [13:11:19.697] ...future.workdir <- getwd() [13:11:19.697] } [13:11:19.697] ...future.oldOptions <- base::as.list(base::.Options) [13:11:19.697] ...future.oldEnvVars <- base::Sys.getenv() [13:11:19.697] } [13:11:19.697] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:19.697] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:11:19.697] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:19.697] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:19.697] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:19.697] future.stdout.windows.reencode = NULL, width = 80L) [13:11:19.697] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:19.697] base::names(...future.oldOptions)) [13:11:19.697] } [13:11:19.697] if (FALSE) { [13:11:19.697] } [13:11:19.697] else { [13:11:19.697] if (TRUE) { [13:11:19.697] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:19.697] open = "w") [13:11:19.697] } [13:11:19.697] else { [13:11:19.697] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:19.697] windows = "NUL", "/dev/null"), open = "w") [13:11:19.697] } [13:11:19.697] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:19.697] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:19.697] base::sink(type = "output", split = FALSE) [13:11:19.697] base::close(...future.stdout) [13:11:19.697] }, add = TRUE) [13:11:19.697] } [13:11:19.697] ...future.frame <- base::sys.nframe() [13:11:19.697] ...future.conditions <- base::list() [13:11:19.697] ...future.rng <- base::globalenv()$.Random.seed [13:11:19.697] if (FALSE) { [13:11:19.697] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:19.697] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:19.697] } [13:11:19.697] ...future.result <- base::tryCatch({ [13:11:19.697] base::withCallingHandlers({ [13:11:19.697] ...future.value <- base::withVisible(base::local({ [13:11:19.697] do.call(function(...) { [13:11:19.697] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:19.697] if (!identical(...future.globals.maxSize.org, [13:11:19.697] ...future.globals.maxSize)) { [13:11:19.697] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:19.697] on.exit(options(oopts), add = TRUE) [13:11:19.697] } [13:11:19.697] { [13:11:19.697] lapply(seq_along(...future.elements_ii), [13:11:19.697] FUN = function(jj) { [13:11:19.697] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:19.697] ...future.FUN(...future.X_jj, ...) [13:11:19.697] }) [13:11:19.697] } [13:11:19.697] }, args = future.call.arguments) [13:11:19.697] })) [13:11:19.697] future::FutureResult(value = ...future.value$value, [13:11:19.697] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:19.697] ...future.rng), globalenv = if (FALSE) [13:11:19.697] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:19.697] ...future.globalenv.names)) [13:11:19.697] else NULL, started = ...future.startTime, version = "1.8") [13:11:19.697] }, condition = base::local({ [13:11:19.697] c <- base::c [13:11:19.697] inherits <- base::inherits [13:11:19.697] invokeRestart <- base::invokeRestart [13:11:19.697] length <- base::length [13:11:19.697] list <- base::list [13:11:19.697] seq.int <- base::seq.int [13:11:19.697] signalCondition <- base::signalCondition [13:11:19.697] sys.calls <- base::sys.calls [13:11:19.697] `[[` <- base::`[[` [13:11:19.697] `+` <- base::`+` [13:11:19.697] `<<-` <- base::`<<-` [13:11:19.697] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:19.697] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:19.697] 3L)] [13:11:19.697] } [13:11:19.697] function(cond) { [13:11:19.697] is_error <- inherits(cond, "error") [13:11:19.697] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:19.697] NULL) [13:11:19.697] if (is_error) { [13:11:19.697] sessionInformation <- function() { [13:11:19.697] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:19.697] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:19.697] search = base::search(), system = base::Sys.info()) [13:11:19.697] } [13:11:19.697] ...future.conditions[[length(...future.conditions) + [13:11:19.697] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:19.697] cond$call), session = sessionInformation(), [13:11:19.697] timestamp = base::Sys.time(), signaled = 0L) [13:11:19.697] signalCondition(cond) [13:11:19.697] } [13:11:19.697] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:19.697] signal <- FALSE && inherits(cond, character(0)) [13:11:19.697] ...future.conditions[[length(...future.conditions) + [13:11:19.697] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:19.697] if (FALSE && !signal) { [13:11:19.697] muffleCondition <- function (cond, pattern = "^muffle") [13:11:19.697] { [13:11:19.697] inherits <- base::inherits [13:11:19.697] invokeRestart <- base::invokeRestart [13:11:19.697] is.null <- base::is.null [13:11:19.697] muffled <- FALSE [13:11:19.697] if (inherits(cond, "message")) { [13:11:19.697] muffled <- grepl(pattern, "muffleMessage") [13:11:19.697] if (muffled) [13:11:19.697] invokeRestart("muffleMessage") [13:11:19.697] } [13:11:19.697] else if (inherits(cond, "warning")) { [13:11:19.697] muffled <- grepl(pattern, "muffleWarning") [13:11:19.697] if (muffled) [13:11:19.697] invokeRestart("muffleWarning") [13:11:19.697] } [13:11:19.697] else if (inherits(cond, "condition")) { [13:11:19.697] if (!is.null(pattern)) { [13:11:19.697] computeRestarts <- base::computeRestarts [13:11:19.697] grepl <- base::grepl [13:11:19.697] restarts <- computeRestarts(cond) [13:11:19.697] for (restart in restarts) { [13:11:19.697] name <- restart$name [13:11:19.697] if (is.null(name)) [13:11:19.697] next [13:11:19.697] if (!grepl(pattern, name)) [13:11:19.697] next [13:11:19.697] invokeRestart(restart) [13:11:19.697] muffled <- TRUE [13:11:19.697] break [13:11:19.697] } [13:11:19.697] } [13:11:19.697] } [13:11:19.697] invisible(muffled) [13:11:19.697] } [13:11:19.697] muffleCondition(cond, pattern = "^muffle") [13:11:19.697] } [13:11:19.697] } [13:11:19.697] else { [13:11:19.697] if (TRUE) { [13:11:19.697] muffleCondition <- function (cond, pattern = "^muffle") [13:11:19.697] { [13:11:19.697] inherits <- base::inherits [13:11:19.697] invokeRestart <- base::invokeRestart [13:11:19.697] is.null <- base::is.null [13:11:19.697] muffled <- FALSE [13:11:19.697] if (inherits(cond, "message")) { [13:11:19.697] muffled <- grepl(pattern, "muffleMessage") [13:11:19.697] if (muffled) [13:11:19.697] invokeRestart("muffleMessage") [13:11:19.697] } [13:11:19.697] else if (inherits(cond, "warning")) { [13:11:19.697] muffled <- grepl(pattern, "muffleWarning") [13:11:19.697] if (muffled) [13:11:19.697] invokeRestart("muffleWarning") [13:11:19.697] } [13:11:19.697] else if (inherits(cond, "condition")) { [13:11:19.697] if (!is.null(pattern)) { [13:11:19.697] computeRestarts <- base::computeRestarts [13:11:19.697] grepl <- base::grepl [13:11:19.697] restarts <- computeRestarts(cond) [13:11:19.697] for (restart in restarts) { [13:11:19.697] name <- restart$name [13:11:19.697] if (is.null(name)) [13:11:19.697] next [13:11:19.697] if (!grepl(pattern, name)) [13:11:19.697] next [13:11:19.697] invokeRestart(restart) [13:11:19.697] muffled <- TRUE [13:11:19.697] break [13:11:19.697] } [13:11:19.697] } [13:11:19.697] } [13:11:19.697] invisible(muffled) [13:11:19.697] } [13:11:19.697] muffleCondition(cond, pattern = "^muffle") [13:11:19.697] } [13:11:19.697] } [13:11:19.697] } [13:11:19.697] })) [13:11:19.697] }, error = function(ex) { [13:11:19.697] base::structure(base::list(value = NULL, visible = NULL, [13:11:19.697] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:19.697] ...future.rng), started = ...future.startTime, [13:11:19.697] finished = Sys.time(), session_uuid = NA_character_, [13:11:19.697] version = "1.8"), class = "FutureResult") [13:11:19.697] }, finally = { [13:11:19.697] if (!identical(...future.workdir, getwd())) [13:11:19.697] setwd(...future.workdir) [13:11:19.697] { [13:11:19.697] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:19.697] ...future.oldOptions$nwarnings <- NULL [13:11:19.697] } [13:11:19.697] base::options(...future.oldOptions) [13:11:19.697] if (.Platform$OS.type == "windows") { [13:11:19.697] old_names <- names(...future.oldEnvVars) [13:11:19.697] envs <- base::Sys.getenv() [13:11:19.697] names <- names(envs) [13:11:19.697] common <- intersect(names, old_names) [13:11:19.697] added <- setdiff(names, old_names) [13:11:19.697] removed <- setdiff(old_names, names) [13:11:19.697] changed <- common[...future.oldEnvVars[common] != [13:11:19.697] envs[common]] [13:11:19.697] NAMES <- toupper(changed) [13:11:19.697] args <- list() [13:11:19.697] for (kk in seq_along(NAMES)) { [13:11:19.697] name <- changed[[kk]] [13:11:19.697] NAME <- NAMES[[kk]] [13:11:19.697] if (name != NAME && is.element(NAME, old_names)) [13:11:19.697] next [13:11:19.697] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:19.697] } [13:11:19.697] NAMES <- toupper(added) [13:11:19.697] for (kk in seq_along(NAMES)) { [13:11:19.697] name <- added[[kk]] [13:11:19.697] NAME <- NAMES[[kk]] [13:11:19.697] if (name != NAME && is.element(NAME, old_names)) [13:11:19.697] next [13:11:19.697] args[[name]] <- "" [13:11:19.697] } [13:11:19.697] NAMES <- toupper(removed) [13:11:19.697] for (kk in seq_along(NAMES)) { [13:11:19.697] name <- removed[[kk]] [13:11:19.697] NAME <- NAMES[[kk]] [13:11:19.697] if (name != NAME && is.element(NAME, old_names)) [13:11:19.697] next [13:11:19.697] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:19.697] } [13:11:19.697] if (length(args) > 0) [13:11:19.697] base::do.call(base::Sys.setenv, args = args) [13:11:19.697] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:19.697] } [13:11:19.697] else { [13:11:19.697] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:19.697] } [13:11:19.697] { [13:11:19.697] if (base::length(...future.futureOptionsAdded) > [13:11:19.697] 0L) { [13:11:19.697] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:19.697] base::names(opts) <- ...future.futureOptionsAdded [13:11:19.697] base::options(opts) [13:11:19.697] } [13:11:19.697] { [13:11:19.697] NULL [13:11:19.697] options(future.plan = NULL) [13:11:19.697] if (is.na(NA_character_)) [13:11:19.697] Sys.unsetenv("R_FUTURE_PLAN") [13:11:19.697] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:19.697] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:19.697] .init = FALSE) [13:11:19.697] } [13:11:19.697] } [13:11:19.697] } [13:11:19.697] }) [13:11:19.697] if (TRUE) { [13:11:19.697] base::sink(type = "output", split = FALSE) [13:11:19.697] if (TRUE) { [13:11:19.697] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:19.697] } [13:11:19.697] else { [13:11:19.697] ...future.result["stdout"] <- base::list(NULL) [13:11:19.697] } [13:11:19.697] base::close(...future.stdout) [13:11:19.697] ...future.stdout <- NULL [13:11:19.697] } [13:11:19.697] ...future.result$conditions <- ...future.conditions [13:11:19.697] ...future.result$finished <- base::Sys.time() [13:11:19.697] ...future.result [13:11:19.697] } [13:11:19.732] - Launch lazy future ... done [13:11:19.733] run() for 'MiraiFuture' ... done [13:11:19.733] Created future: [13:11:22.271] resolved() for 'MiraiFuture' ... [13:11:22.271] - state: 'running' [13:11:22.271] - run: TRUE [13:11:22.272] - result: 'NULL' [13:11:22.272] - resolved: FALSE [13:11:22.272] resolved() for 'MiraiFuture' ... done [13:11:19.733] MiraiFuture: [13:11:19.733] Label: 'future_lapply-2' [13:11:19.733] Expression: [13:11:19.733] { [13:11:19.733] do.call(function(...) { [13:11:19.733] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:19.733] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:19.733] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:19.733] on.exit(options(oopts), add = TRUE) [13:11:19.733] } [13:11:19.733] { [13:11:19.733] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:19.733] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:19.733] ...future.FUN(...future.X_jj, ...) [13:11:19.733] }) [13:11:19.733] } [13:11:19.733] }, args = future.call.arguments) [13:11:19.733] } [13:11:19.733] Lazy evaluation: FALSE [13:11:19.733] Asynchronous evaluation: TRUE [13:11:19.733] Local evaluation: TRUE [13:11:19.733] Environment: R_GlobalEnv [13:11:19.733] Capture standard output: TRUE [13:11:19.733] Capture condition classes: 'condition' (excluding 'nothing') [13:11:19.733] Globals: 6 objects totaling 26.70 MiB (function '...future.FUN' of 728 bytes, numeric 'a' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 26.70 MiB, NULL '...future.seeds_ii' of 0 bytes, ...) [13:11:19.733] Packages: [13:11:19.733] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:19.733] Resolved: TRUE [13:11:19.733] Value: [13:11:19.733] Conditions captured: [13:11:19.733] Early signaling: FALSE [13:11:19.733] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:19.733] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:22.297] Chunk #2 of 2 ... DONE [13:11:22.297] Launching 2 futures (chunks) ... DONE [13:11:22.298] Resolving 2 futures (chunks) ... [13:11:22.298] resolve() on list ... [13:11:22.298] recursive: 0 [13:11:22.298] length: 2 [13:11:22.298] [13:11:22.298] resolved() for 'MiraiFuture' ... [13:11:22.298] - state: 'running' [13:11:22.299] - run: TRUE [13:11:22.299] - result: 'NULL' [13:11:22.299] - resolved: FALSE [13:11:22.299] resolved() for 'MiraiFuture' ... done [13:11:22.299] Future #1 [13:11:22.300] signalConditionsASAP(MiraiFuture, pos=1) ... [13:11:22.300] - nx: 2 [13:11:22.300] - relay: TRUE [13:11:22.300] - stdout: TRUE [13:11:22.300] - signal: TRUE [13:11:22.300] - resignal: FALSE [13:11:22.300] - force: TRUE [13:11:22.301] - relayed: [n=2] FALSE, FALSE [13:11:22.301] - queued futures: [n=2] FALSE, FALSE [13:11:22.301] - until=1 [13:11:22.301] - relaying element #1 [13:11:22.301] - relayed: [n=2] TRUE, FALSE [13:11:22.301] - queued futures: [n=2] TRUE, FALSE [13:11:22.302] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:11:22.302] length: 1 (resolved future 1) [13:11:22.302] resolved() for 'MiraiFuture' ... [13:11:22.302] - state: 'running' [13:11:22.302] - run: TRUE [13:11:22.302] - result: 'NULL' [13:11:22.303] - resolved: FALSE [13:11:22.303] resolved() for 'MiraiFuture' ... done [13:11:22.303] Future #2 [13:11:22.303] signalConditionsASAP(MiraiFuture, pos=2) ... [13:11:22.303] - nx: 2 [13:11:22.303] - relay: TRUE [13:11:22.304] - stdout: TRUE [13:11:22.304] - signal: TRUE [13:11:22.304] - resignal: FALSE [13:11:22.304] - force: TRUE [13:11:22.304] - relayed: [n=2] TRUE, FALSE [13:11:22.304] - queued futures: [n=2] TRUE, FALSE [13:11:22.304] - until=2 [13:11:22.305] - relaying element #2 [13:11:22.305] - relayed: [n=2] TRUE, TRUE [13:11:22.305] - queued futures: [n=2] TRUE, TRUE [13:11:22.305] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:11:22.305] length: 0 (resolved future 2) [13:11:22.305] Relaying remaining futures [13:11:22.306] signalConditionsASAP(NULL, pos=0) ... [13:11:22.306] - nx: 2 [13:11:22.306] - relay: TRUE [13:11:22.306] - stdout: TRUE [13:11:22.306] - signal: TRUE [13:11:22.306] - resignal: FALSE [13:11:22.306] - force: TRUE [13:11:22.306] - relayed: [n=2] TRUE, TRUE [13:11:22.307] - queued futures: [n=2] TRUE, TRUE - flush all [13:11:22.307] - relayed: [n=2] TRUE, TRUE [13:11:22.307] - queued futures: [n=2] TRUE, TRUE [13:11:22.307] signalConditionsASAP(NULL, pos=0) ... done [13:11:22.307] resolve() on list ... DONE [13:11:22.328] - Number of value chunks collected: 2 [13:11:22.328] Resolving 2 futures (chunks) ... DONE [13:11:22.328] Reducing values from 2 chunks ... [13:11:22.352] - Number of values collected after concatenation: 1000000 [13:11:22.352] - Number of values expected: 1000000 [13:11:22.352] Reducing values from 2 chunks ... DONE [13:11:22.377] future_lapply() ... DONE - future_lapply() with global in non-attached package ... [13:11:22.633] plan(): Setting new future strategy stack: [13:11:22.633] List of future strategies: [13:11:22.633] 1. mirai_multisession: [13:11:22.633] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:11:22.633] - tweaked: FALSE [13:11:22.633] - call: plan(strategy) [13:11:22.634] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:11:22.634] < mirai | $data > [13:11:22.636] getGlobalsAndPackages() ... [13:11:22.636] Not searching for globals [13:11:22.636] - globals: [0] [13:11:22.636] getGlobalsAndPackages() ... DONE [13:11:22.636] getGlobalsAndPackages() ... [13:11:22.637] [13:11:22.637] - globals: [0] [13:11:22.637] getGlobalsAndPackages() ... DONE [13:11:22.637] Packages needed by the future expression (n = 0): [13:11:22.637] Packages needed by future strategies (n = 0): [13:11:22.638] { [13:11:22.638] { [13:11:22.638] { [13:11:22.638] ...future.startTime <- base::Sys.time() [13:11:22.638] { [13:11:22.638] { [13:11:22.638] { [13:11:22.638] base::local({ [13:11:22.638] has_future <- base::requireNamespace("future", [13:11:22.638] quietly = TRUE) [13:11:22.638] if (has_future) { [13:11:22.638] ns <- base::getNamespace("future") [13:11:22.638] version <- ns[[".package"]][["version"]] [13:11:22.638] if (is.null(version)) [13:11:22.638] version <- utils::packageVersion("future") [13:11:22.638] } [13:11:22.638] else { [13:11:22.638] version <- NULL [13:11:22.638] } [13:11:22.638] if (!has_future || version < "1.8.0") { [13:11:22.638] info <- base::c(r_version = base::gsub("R version ", [13:11:22.638] "", base::R.version$version.string), [13:11:22.638] platform = base::sprintf("%s (%s-bit)", [13:11:22.638] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:22.638] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:22.638] "release", "version")], collapse = " "), [13:11:22.638] hostname = base::Sys.info()[["nodename"]]) [13:11:22.638] info <- base::sprintf("%s: %s", base::names(info), [13:11:22.638] info) [13:11:22.638] info <- base::paste(info, collapse = "; ") [13:11:22.638] if (!has_future) { [13:11:22.638] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:22.638] info) [13:11:22.638] } [13:11:22.638] else { [13:11:22.638] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:22.638] info, version) [13:11:22.638] } [13:11:22.638] base::stop(msg) [13:11:22.638] } [13:11:22.638] }) [13:11:22.638] } [13:11:22.638] ...future.strategy.old <- future::plan("list") [13:11:22.638] options(future.plan = NULL) [13:11:22.638] Sys.unsetenv("R_FUTURE_PLAN") [13:11:22.638] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:22.638] } [13:11:22.638] ...future.workdir <- getwd() [13:11:22.638] } [13:11:22.638] ...future.oldOptions <- base::as.list(base::.Options) [13:11:22.638] ...future.oldEnvVars <- base::Sys.getenv() [13:11:22.638] } [13:11:22.638] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:22.638] future.globals.maxSize = NULL, future.globals.method = NULL, [13:11:22.638] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:22.638] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:22.638] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:22.638] future.stdout.windows.reencode = NULL, width = 80L) [13:11:22.638] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:22.638] base::names(...future.oldOptions)) [13:11:22.638] } [13:11:22.638] if (FALSE) { [13:11:22.638] } [13:11:22.638] else { [13:11:22.638] if (TRUE) { [13:11:22.638] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:22.638] open = "w") [13:11:22.638] } [13:11:22.638] else { [13:11:22.638] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:22.638] windows = "NUL", "/dev/null"), open = "w") [13:11:22.638] } [13:11:22.638] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:22.638] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:22.638] base::sink(type = "output", split = FALSE) [13:11:22.638] base::close(...future.stdout) [13:11:22.638] }, add = TRUE) [13:11:22.638] } [13:11:22.638] ...future.frame <- base::sys.nframe() [13:11:22.638] ...future.conditions <- base::list() [13:11:22.638] ...future.rng <- base::globalenv()$.Random.seed [13:11:22.638] if (FALSE) { [13:11:22.638] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:22.638] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:22.638] } [13:11:22.638] ...future.result <- base::tryCatch({ [13:11:22.638] base::withCallingHandlers({ [13:11:22.638] ...future.value <- base::withVisible(base::local(NA)) [13:11:22.638] future::FutureResult(value = ...future.value$value, [13:11:22.638] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:22.638] ...future.rng), globalenv = if (FALSE) [13:11:22.638] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:22.638] ...future.globalenv.names)) [13:11:22.638] else NULL, started = ...future.startTime, version = "1.8") [13:11:22.638] }, condition = base::local({ [13:11:22.638] c <- base::c [13:11:22.638] inherits <- base::inherits [13:11:22.638] invokeRestart <- base::invokeRestart [13:11:22.638] length <- base::length [13:11:22.638] list <- base::list [13:11:22.638] seq.int <- base::seq.int [13:11:22.638] signalCondition <- base::signalCondition [13:11:22.638] sys.calls <- base::sys.calls [13:11:22.638] `[[` <- base::`[[` [13:11:22.638] `+` <- base::`+` [13:11:22.638] `<<-` <- base::`<<-` [13:11:22.638] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:22.638] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:22.638] 3L)] [13:11:22.638] } [13:11:22.638] function(cond) { [13:11:22.638] is_error <- inherits(cond, "error") [13:11:22.638] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:22.638] NULL) [13:11:22.638] if (is_error) { [13:11:22.638] sessionInformation <- function() { [13:11:22.638] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:22.638] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:22.638] search = base::search(), system = base::Sys.info()) [13:11:22.638] } [13:11:22.638] ...future.conditions[[length(...future.conditions) + [13:11:22.638] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:22.638] cond$call), session = sessionInformation(), [13:11:22.638] timestamp = base::Sys.time(), signaled = 0L) [13:11:22.638] signalCondition(cond) [13:11:22.638] } [13:11:22.638] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:22.638] signal <- FALSE && inherits(cond, character(0)) [13:11:22.638] ...future.conditions[[length(...future.conditions) + [13:11:22.638] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:22.638] if (FALSE && !signal) { [13:11:22.638] muffleCondition <- function (cond, pattern = "^muffle") [13:11:22.638] { [13:11:22.638] inherits <- base::inherits [13:11:22.638] invokeRestart <- base::invokeRestart [13:11:22.638] is.null <- base::is.null [13:11:22.638] muffled <- FALSE [13:11:22.638] if (inherits(cond, "message")) { [13:11:22.638] muffled <- grepl(pattern, "muffleMessage") [13:11:22.638] if (muffled) [13:11:22.638] invokeRestart("muffleMessage") [13:11:22.638] } [13:11:22.638] else if (inherits(cond, "warning")) { [13:11:22.638] muffled <- grepl(pattern, "muffleWarning") [13:11:22.638] if (muffled) [13:11:22.638] invokeRestart("muffleWarning") [13:11:22.638] } [13:11:22.638] else if (inherits(cond, "condition")) { [13:11:22.638] if (!is.null(pattern)) { [13:11:22.638] computeRestarts <- base::computeRestarts [13:11:22.638] grepl <- base::grepl [13:11:22.638] restarts <- computeRestarts(cond) [13:11:22.638] for (restart in restarts) { [13:11:22.638] name <- restart$name [13:11:22.638] if (is.null(name)) [13:11:22.638] next [13:11:22.638] if (!grepl(pattern, name)) [13:11:22.638] next [13:11:22.638] invokeRestart(restart) [13:11:22.638] muffled <- TRUE [13:11:22.638] break [13:11:22.638] } [13:11:22.638] } [13:11:22.638] } [13:11:22.638] invisible(muffled) [13:11:22.638] } [13:11:22.638] muffleCondition(cond, pattern = "^muffle") [13:11:22.638] } [13:11:22.638] } [13:11:22.638] else { [13:11:22.638] if (TRUE) { [13:11:22.638] muffleCondition <- function (cond, pattern = "^muffle") [13:11:22.638] { [13:11:22.638] inherits <- base::inherits [13:11:22.638] invokeRestart <- base::invokeRestart [13:11:22.638] is.null <- base::is.null [13:11:22.638] muffled <- FALSE [13:11:22.638] if (inherits(cond, "message")) { [13:11:22.638] muffled <- grepl(pattern, "muffleMessage") [13:11:22.638] if (muffled) [13:11:22.638] invokeRestart("muffleMessage") [13:11:22.638] } [13:11:22.638] else if (inherits(cond, "warning")) { [13:11:22.638] muffled <- grepl(pattern, "muffleWarning") [13:11:22.638] if (muffled) [13:11:22.638] invokeRestart("muffleWarning") [13:11:22.638] } [13:11:22.638] else if (inherits(cond, "condition")) { [13:11:22.638] if (!is.null(pattern)) { [13:11:22.638] computeRestarts <- base::computeRestarts [13:11:22.638] grepl <- base::grepl [13:11:22.638] restarts <- computeRestarts(cond) [13:11:22.638] for (restart in restarts) { [13:11:22.638] name <- restart$name [13:11:22.638] if (is.null(name)) [13:11:22.638] next [13:11:22.638] if (!grepl(pattern, name)) [13:11:22.638] next [13:11:22.638] invokeRestart(restart) [13:11:22.638] muffled <- TRUE [13:11:22.638] break [13:11:22.638] } [13:11:22.638] } [13:11:22.638] } [13:11:22.638] invisible(muffled) [13:11:22.638] } [13:11:22.638] muffleCondition(cond, pattern = "^muffle") [13:11:22.638] } [13:11:22.638] } [13:11:22.638] } [13:11:22.638] })) [13:11:22.638] }, error = function(ex) { [13:11:22.638] base::structure(base::list(value = NULL, visible = NULL, [13:11:22.638] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:22.638] ...future.rng), started = ...future.startTime, [13:11:22.638] finished = Sys.time(), session_uuid = NA_character_, [13:11:22.638] version = "1.8"), class = "FutureResult") [13:11:22.638] }, finally = { [13:11:22.638] if (!identical(...future.workdir, getwd())) [13:11:22.638] setwd(...future.workdir) [13:11:22.638] { [13:11:22.638] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:22.638] ...future.oldOptions$nwarnings <- NULL [13:11:22.638] } [13:11:22.638] base::options(...future.oldOptions) [13:11:22.638] if (.Platform$OS.type == "windows") { [13:11:22.638] old_names <- names(...future.oldEnvVars) [13:11:22.638] envs <- base::Sys.getenv() [13:11:22.638] names <- names(envs) [13:11:22.638] common <- intersect(names, old_names) [13:11:22.638] added <- setdiff(names, old_names) [13:11:22.638] removed <- setdiff(old_names, names) [13:11:22.638] changed <- common[...future.oldEnvVars[common] != [13:11:22.638] envs[common]] [13:11:22.638] NAMES <- toupper(changed) [13:11:22.638] args <- list() [13:11:22.638] for (kk in seq_along(NAMES)) { [13:11:22.638] name <- changed[[kk]] [13:11:22.638] NAME <- NAMES[[kk]] [13:11:22.638] if (name != NAME && is.element(NAME, old_names)) [13:11:22.638] next [13:11:22.638] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:22.638] } [13:11:22.638] NAMES <- toupper(added) [13:11:22.638] for (kk in seq_along(NAMES)) { [13:11:22.638] name <- added[[kk]] [13:11:22.638] NAME <- NAMES[[kk]] [13:11:22.638] if (name != NAME && is.element(NAME, old_names)) [13:11:22.638] next [13:11:22.638] args[[name]] <- "" [13:11:22.638] } [13:11:22.638] NAMES <- toupper(removed) [13:11:22.638] for (kk in seq_along(NAMES)) { [13:11:22.638] name <- removed[[kk]] [13:11:22.638] NAME <- NAMES[[kk]] [13:11:22.638] if (name != NAME && is.element(NAME, old_names)) [13:11:22.638] next [13:11:22.638] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:22.638] } [13:11:22.638] if (length(args) > 0) [13:11:22.638] base::do.call(base::Sys.setenv, args = args) [13:11:22.638] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:22.638] } [13:11:22.638] else { [13:11:22.638] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:22.638] } [13:11:22.638] { [13:11:22.638] if (base::length(...future.futureOptionsAdded) > [13:11:22.638] 0L) { [13:11:22.638] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:22.638] base::names(opts) <- ...future.futureOptionsAdded [13:11:22.638] base::options(opts) [13:11:22.638] } [13:11:22.638] { [13:11:22.638] NULL [13:11:22.638] options(future.plan = NULL) [13:11:22.638] if (is.na(NA_character_)) [13:11:22.638] Sys.unsetenv("R_FUTURE_PLAN") [13:11:22.638] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:22.638] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:22.638] .init = FALSE) [13:11:22.638] } [13:11:22.638] } [13:11:22.638] } [13:11:22.638] }) [13:11:22.638] if (TRUE) { [13:11:22.638] base::sink(type = "output", split = FALSE) [13:11:22.638] if (TRUE) { [13:11:22.638] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:22.638] } [13:11:22.638] else { [13:11:22.638] ...future.result["stdout"] <- base::list(NULL) [13:11:22.638] } [13:11:22.638] base::close(...future.stdout) [13:11:22.638] ...future.stdout <- NULL [13:11:22.638] } [13:11:22.638] ...future.result$conditions <- ...future.conditions [13:11:22.638] ...future.result$finished <- base::Sys.time() [13:11:22.638] ...future.result [13:11:22.638] } [13:11:22.644] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:11:22.644] plan(): nbrOfWorkers() = 2 [13:11:22.644] future_lapply() ... [13:11:22.645] Number of chunks: 1 [13:11:22.646] getGlobalsAndPackagesXApply() ... [13:11:22.646] - future.globals: TRUE [13:11:22.646] getGlobalsAndPackages() ... [13:11:22.646] Searching for globals... [13:11:22.648] - globals found: [2] 'FUN', 'file_ext' [13:11:22.648] Searching for globals ... DONE [13:11:22.648] Resolving globals: FALSE [13:11:22.649] The total size of the 1 globals is 448 bytes (448 bytes) [13:11:22.649] The total size of the 1 globals exported for future expression ('FUN()') is 448 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (448 bytes of class 'function') [13:11:22.649] - globals: [1] 'FUN' [13:11:22.649] - packages: [1] 'tools' [13:11:22.650] getGlobalsAndPackages() ... DONE [13:11:22.650] - globals found/used: [n=1] 'FUN' [13:11:22.650] - needed namespaces: [n=1] 'tools' [13:11:22.650] Finding globals ... DONE [13:11:22.650] - use_args: TRUE [13:11:22.650] - Getting '...' globals ... [13:11:22.651] resolve() on list ... [13:11:22.651] recursive: 0 [13:11:22.651] length: 1 [13:11:22.651] elements: '...' [13:11:22.652] length: 0 (resolved future 1) [13:11:22.652] resolve() on list ... DONE [13:11:22.652] - '...' content: [n=0] [13:11:22.652] List of 1 [13:11:22.652] $ ...: list() [13:11:22.652] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:22.652] - attr(*, "where")=List of 1 [13:11:22.652] ..$ ...: [13:11:22.652] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:22.652] - attr(*, "resolved")= logi TRUE [13:11:22.652] - attr(*, "total_size")= num NA [13:11:22.655] - Getting '...' globals ... DONE [13:11:22.656] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:11:22.656] List of 2 [13:11:22.656] $ ...future.FUN:function (x) [13:11:22.656] $ ... : list() [13:11:22.656] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:11:22.656] - attr(*, "where")=List of 2 [13:11:22.656] ..$ ...future.FUN: [13:11:22.656] ..$ ... : [13:11:22.656] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:11:22.656] - attr(*, "resolved")= logi FALSE [13:11:22.656] - attr(*, "total_size")= num 448 [13:11:22.659] Packages to be attached in all futures: [n=1] 'tools' [13:11:22.659] getGlobalsAndPackagesXApply() ... DONE [13:11:22.660] Number of futures (= number of chunks): 1 [13:11:22.660] Launching 1 futures (chunks) ... [13:11:22.660] Chunk #1 of 1 ... [13:11:22.660] - Finding globals in 'X' for chunk #1 ... [13:11:22.660] getGlobalsAndPackages() ... [13:11:22.660] Searching for globals... [13:11:22.661] [13:11:22.661] Searching for globals ... DONE [13:11:22.661] - globals: [0] [13:11:22.661] getGlobalsAndPackages() ... DONE [13:11:22.661] + additional globals found: [n=0] [13:11:22.662] + additional namespaces needed: [n=0] [13:11:22.662] - Finding globals in 'X' for chunk #1 ... DONE [13:11:22.662] - seeds: [13:11:22.662] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:22.662] getGlobalsAndPackages() ... [13:11:22.662] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:22.663] Resolving globals: FALSE [13:11:22.663] Tweak future expression to call with '...' arguments ... [13:11:22.663] { [13:11:22.663] do.call(function(...) { [13:11:22.663] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:22.663] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:22.663] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:22.663] on.exit(options(oopts), add = TRUE) [13:11:22.663] } [13:11:22.663] { [13:11:22.663] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:22.663] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:22.663] ...future.FUN(...future.X_jj, ...) [13:11:22.663] }) [13:11:22.663] } [13:11:22.663] }, args = future.call.arguments) [13:11:22.663] } [13:11:22.663] Tweak future expression to call with '...' arguments ... DONE [13:11:22.664] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:11:22.664] [13:11:22.664] getGlobalsAndPackages() ... DONE [13:11:22.665] run() for 'Future' ... [13:11:22.665] - state: 'created' [13:11:22.665] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:11:22.668] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:22.668] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:11:22.668] - Field: 'label' [13:11:22.668] - Field: 'local' [13:11:22.669] - Field: 'owner' [13:11:22.669] - Field: 'envir' [13:11:22.669] - Field: 'packages' [13:11:22.669] - Field: 'gc' [13:11:22.669] - Field: 'conditions' [13:11:22.670] - Field: 'expr' [13:11:22.670] - Field: 'uuid' [13:11:22.670] - Field: 'seed' [13:11:22.670] - Field: 'version' [13:11:22.670] - Field: 'result' [13:11:22.670] - Field: 'asynchronous' [13:11:22.671] - Field: 'calls' [13:11:22.671] - Field: 'globals' [13:11:22.671] - Field: 'stdout' [13:11:22.671] - Field: 'earlySignal' [13:11:22.671] - Field: 'lazy' [13:11:22.671] - Field: 'state' [13:11:22.672] - Field: '.cluster' [13:11:22.672] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:11:22.672] - Launch lazy future ... [13:11:22.672] Packages needed by the future expression (n = 1): 'tools' [13:11:22.672] Packages needed by future strategies (n = 0): [13:11:22.673] { [13:11:22.673] { [13:11:22.673] { [13:11:22.673] ...future.startTime <- base::Sys.time() [13:11:22.673] { [13:11:22.673] { [13:11:22.673] { [13:11:22.673] { [13:11:22.673] base::local({ [13:11:22.673] has_future <- base::requireNamespace("future", [13:11:22.673] quietly = TRUE) [13:11:22.673] if (has_future) { [13:11:22.673] ns <- base::getNamespace("future") [13:11:22.673] version <- ns[[".package"]][["version"]] [13:11:22.673] if (is.null(version)) [13:11:22.673] version <- utils::packageVersion("future") [13:11:22.673] } [13:11:22.673] else { [13:11:22.673] version <- NULL [13:11:22.673] } [13:11:22.673] if (!has_future || version < "1.8.0") { [13:11:22.673] info <- base::c(r_version = base::gsub("R version ", [13:11:22.673] "", base::R.version$version.string), [13:11:22.673] platform = base::sprintf("%s (%s-bit)", [13:11:22.673] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:11:22.673] os = base::paste(base::Sys.info()[base::c("sysname", [13:11:22.673] "release", "version")], collapse = " "), [13:11:22.673] hostname = base::Sys.info()[["nodename"]]) [13:11:22.673] info <- base::sprintf("%s: %s", base::names(info), [13:11:22.673] info) [13:11:22.673] info <- base::paste(info, collapse = "; ") [13:11:22.673] if (!has_future) { [13:11:22.673] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:11:22.673] info) [13:11:22.673] } [13:11:22.673] else { [13:11:22.673] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:11:22.673] info, version) [13:11:22.673] } [13:11:22.673] base::stop(msg) [13:11:22.673] } [13:11:22.673] }) [13:11:22.673] } [13:11:22.673] base::local({ [13:11:22.673] for (pkg in "tools") { [13:11:22.673] base::loadNamespace(pkg) [13:11:22.673] base::library(pkg, character.only = TRUE) [13:11:22.673] } [13:11:22.673] }) [13:11:22.673] } [13:11:22.673] ...future.strategy.old <- future::plan("list") [13:11:22.673] options(future.plan = NULL) [13:11:22.673] Sys.unsetenv("R_FUTURE_PLAN") [13:11:22.673] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:11:22.673] } [13:11:22.673] ...future.workdir <- getwd() [13:11:22.673] } [13:11:22.673] ...future.oldOptions <- base::as.list(base::.Options) [13:11:22.673] ...future.oldEnvVars <- base::Sys.getenv() [13:11:22.673] } [13:11:22.673] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:11:22.673] future.globals.maxSize = NULL, future.globals.method = NULL, [13:11:22.673] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:11:22.673] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:11:22.673] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:11:22.673] future.stdout.windows.reencode = NULL, width = 80L) [13:11:22.673] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:11:22.673] base::names(...future.oldOptions)) [13:11:22.673] } [13:11:22.673] if (FALSE) { [13:11:22.673] } [13:11:22.673] else { [13:11:22.673] if (TRUE) { [13:11:22.673] ...future.stdout <- base::rawConnection(base::raw(0L), [13:11:22.673] open = "w") [13:11:22.673] } [13:11:22.673] else { [13:11:22.673] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:11:22.673] windows = "NUL", "/dev/null"), open = "w") [13:11:22.673] } [13:11:22.673] base::sink(...future.stdout, type = "output", split = FALSE) [13:11:22.673] base::on.exit(if (!base::is.null(...future.stdout)) { [13:11:22.673] base::sink(type = "output", split = FALSE) [13:11:22.673] base::close(...future.stdout) [13:11:22.673] }, add = TRUE) [13:11:22.673] } [13:11:22.673] ...future.frame <- base::sys.nframe() [13:11:22.673] ...future.conditions <- base::list() [13:11:22.673] ...future.rng <- base::globalenv()$.Random.seed [13:11:22.673] if (FALSE) { [13:11:22.673] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:11:22.673] "...future.value", "...future.globalenv.names", ".Random.seed") [13:11:22.673] } [13:11:22.673] ...future.result <- base::tryCatch({ [13:11:22.673] base::withCallingHandlers({ [13:11:22.673] ...future.value <- base::withVisible(base::local({ [13:11:22.673] do.call(function(...) { [13:11:22.673] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:22.673] if (!identical(...future.globals.maxSize.org, [13:11:22.673] ...future.globals.maxSize)) { [13:11:22.673] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:22.673] on.exit(options(oopts), add = TRUE) [13:11:22.673] } [13:11:22.673] { [13:11:22.673] lapply(seq_along(...future.elements_ii), [13:11:22.673] FUN = function(jj) { [13:11:22.673] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:22.673] ...future.FUN(...future.X_jj, ...) [13:11:22.673] }) [13:11:22.673] } [13:11:22.673] }, args = future.call.arguments) [13:11:22.673] })) [13:11:22.673] future::FutureResult(value = ...future.value$value, [13:11:22.673] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:11:22.673] ...future.rng), globalenv = if (FALSE) [13:11:22.673] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:11:22.673] ...future.globalenv.names)) [13:11:22.673] else NULL, started = ...future.startTime, version = "1.8") [13:11:22.673] }, condition = base::local({ [13:11:22.673] c <- base::c [13:11:22.673] inherits <- base::inherits [13:11:22.673] invokeRestart <- base::invokeRestart [13:11:22.673] length <- base::length [13:11:22.673] list <- base::list [13:11:22.673] seq.int <- base::seq.int [13:11:22.673] signalCondition <- base::signalCondition [13:11:22.673] sys.calls <- base::sys.calls [13:11:22.673] `[[` <- base::`[[` [13:11:22.673] `+` <- base::`+` [13:11:22.673] `<<-` <- base::`<<-` [13:11:22.673] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:11:22.673] calls[seq.int(from = from + 12L, to = length(calls) - [13:11:22.673] 3L)] [13:11:22.673] } [13:11:22.673] function(cond) { [13:11:22.673] is_error <- inherits(cond, "error") [13:11:22.673] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:11:22.673] NULL) [13:11:22.673] if (is_error) { [13:11:22.673] sessionInformation <- function() { [13:11:22.673] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:11:22.673] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:11:22.673] search = base::search(), system = base::Sys.info()) [13:11:22.673] } [13:11:22.673] ...future.conditions[[length(...future.conditions) + [13:11:22.673] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:11:22.673] cond$call), session = sessionInformation(), [13:11:22.673] timestamp = base::Sys.time(), signaled = 0L) [13:11:22.673] signalCondition(cond) [13:11:22.673] } [13:11:22.673] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:11:22.673] signal <- FALSE && inherits(cond, character(0)) [13:11:22.673] ...future.conditions[[length(...future.conditions) + [13:11:22.673] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:11:22.673] if (FALSE && !signal) { [13:11:22.673] muffleCondition <- function (cond, pattern = "^muffle") [13:11:22.673] { [13:11:22.673] inherits <- base::inherits [13:11:22.673] invokeRestart <- base::invokeRestart [13:11:22.673] is.null <- base::is.null [13:11:22.673] muffled <- FALSE [13:11:22.673] if (inherits(cond, "message")) { [13:11:22.673] muffled <- grepl(pattern, "muffleMessage") [13:11:22.673] if (muffled) [13:11:22.673] invokeRestart("muffleMessage") [13:11:22.673] } [13:11:22.673] else if (inherits(cond, "warning")) { [13:11:22.673] muffled <- grepl(pattern, "muffleWarning") [13:11:22.673] if (muffled) [13:11:22.673] invokeRestart("muffleWarning") [13:11:22.673] } [13:11:22.673] else if (inherits(cond, "condition")) { [13:11:22.673] if (!is.null(pattern)) { [13:11:22.673] computeRestarts <- base::computeRestarts [13:11:22.673] grepl <- base::grepl [13:11:22.673] restarts <- computeRestarts(cond) [13:11:22.673] for (restart in restarts) { [13:11:22.673] name <- restart$name [13:11:22.673] if (is.null(name)) [13:11:22.673] next [13:11:22.673] if (!grepl(pattern, name)) [13:11:22.673] next [13:11:22.673] invokeRestart(restart) [13:11:22.673] muffled <- TRUE [13:11:22.673] break [13:11:22.673] } [13:11:22.673] } [13:11:22.673] } [13:11:22.673] invisible(muffled) [13:11:22.673] } [13:11:22.673] muffleCondition(cond, pattern = "^muffle") [13:11:22.673] } [13:11:22.673] } [13:11:22.673] else { [13:11:22.673] if (TRUE) { [13:11:22.673] muffleCondition <- function (cond, pattern = "^muffle") [13:11:22.673] { [13:11:22.673] inherits <- base::inherits [13:11:22.673] invokeRestart <- base::invokeRestart [13:11:22.673] is.null <- base::is.null [13:11:22.673] muffled <- FALSE [13:11:22.673] if (inherits(cond, "message")) { [13:11:22.673] muffled <- grepl(pattern, "muffleMessage") [13:11:22.673] if (muffled) [13:11:22.673] invokeRestart("muffleMessage") [13:11:22.673] } [13:11:22.673] else if (inherits(cond, "warning")) { [13:11:22.673] muffled <- grepl(pattern, "muffleWarning") [13:11:22.673] if (muffled) [13:11:22.673] invokeRestart("muffleWarning") [13:11:22.673] } [13:11:22.673] else if (inherits(cond, "condition")) { [13:11:22.673] if (!is.null(pattern)) { [13:11:22.673] computeRestarts <- base::computeRestarts [13:11:22.673] grepl <- base::grepl [13:11:22.673] restarts <- computeRestarts(cond) [13:11:22.673] for (restart in restarts) { [13:11:22.673] name <- restart$name [13:11:22.673] if (is.null(name)) [13:11:22.673] next [13:11:22.673] if (!grepl(pattern, name)) [13:11:22.673] next [13:11:22.673] invokeRestart(restart) [13:11:22.673] muffled <- TRUE [13:11:22.673] break [13:11:22.673] } [13:11:22.673] } [13:11:22.673] } [13:11:22.673] invisible(muffled) [13:11:22.673] } [13:11:22.673] muffleCondition(cond, pattern = "^muffle") [13:11:22.673] } [13:11:22.673] } [13:11:22.673] } [13:11:22.673] })) [13:11:22.673] }, error = function(ex) { [13:11:22.673] base::structure(base::list(value = NULL, visible = NULL, [13:11:22.673] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:11:22.673] ...future.rng), started = ...future.startTime, [13:11:22.673] finished = Sys.time(), session_uuid = NA_character_, [13:11:22.673] version = "1.8"), class = "FutureResult") [13:11:22.673] }, finally = { [13:11:22.673] if (!identical(...future.workdir, getwd())) [13:11:22.673] setwd(...future.workdir) [13:11:22.673] { [13:11:22.673] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:11:22.673] ...future.oldOptions$nwarnings <- NULL [13:11:22.673] } [13:11:22.673] base::options(...future.oldOptions) [13:11:22.673] if (.Platform$OS.type == "windows") { [13:11:22.673] old_names <- names(...future.oldEnvVars) [13:11:22.673] envs <- base::Sys.getenv() [13:11:22.673] names <- names(envs) [13:11:22.673] common <- intersect(names, old_names) [13:11:22.673] added <- setdiff(names, old_names) [13:11:22.673] removed <- setdiff(old_names, names) [13:11:22.673] changed <- common[...future.oldEnvVars[common] != [13:11:22.673] envs[common]] [13:11:22.673] NAMES <- toupper(changed) [13:11:22.673] args <- list() [13:11:22.673] for (kk in seq_along(NAMES)) { [13:11:22.673] name <- changed[[kk]] [13:11:22.673] NAME <- NAMES[[kk]] [13:11:22.673] if (name != NAME && is.element(NAME, old_names)) [13:11:22.673] next [13:11:22.673] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:22.673] } [13:11:22.673] NAMES <- toupper(added) [13:11:22.673] for (kk in seq_along(NAMES)) { [13:11:22.673] name <- added[[kk]] [13:11:22.673] NAME <- NAMES[[kk]] [13:11:22.673] if (name != NAME && is.element(NAME, old_names)) [13:11:22.673] next [13:11:22.673] args[[name]] <- "" [13:11:22.673] } [13:11:22.673] NAMES <- toupper(removed) [13:11:22.673] for (kk in seq_along(NAMES)) { [13:11:22.673] name <- removed[[kk]] [13:11:22.673] NAME <- NAMES[[kk]] [13:11:22.673] if (name != NAME && is.element(NAME, old_names)) [13:11:22.673] next [13:11:22.673] args[[name]] <- ...future.oldEnvVars[[name]] [13:11:22.673] } [13:11:22.673] if (length(args) > 0) [13:11:22.673] base::do.call(base::Sys.setenv, args = args) [13:11:22.673] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:11:22.673] } [13:11:22.673] else { [13:11:22.673] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:11:22.673] } [13:11:22.673] { [13:11:22.673] if (base::length(...future.futureOptionsAdded) > [13:11:22.673] 0L) { [13:11:22.673] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:11:22.673] base::names(opts) <- ...future.futureOptionsAdded [13:11:22.673] base::options(opts) [13:11:22.673] } [13:11:22.673] { [13:11:22.673] NULL [13:11:22.673] options(future.plan = NULL) [13:11:22.673] if (is.na(NA_character_)) [13:11:22.673] Sys.unsetenv("R_FUTURE_PLAN") [13:11:22.673] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:11:22.673] future::plan(...future.strategy.old, .cleanup = FALSE, [13:11:22.673] .init = FALSE) [13:11:22.673] } [13:11:22.673] } [13:11:22.673] } [13:11:22.673] }) [13:11:22.673] if (TRUE) { [13:11:22.673] base::sink(type = "output", split = FALSE) [13:11:22.673] if (TRUE) { [13:11:22.673] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:11:22.673] } [13:11:22.673] else { [13:11:22.673] ...future.result["stdout"] <- base::list(NULL) [13:11:22.673] } [13:11:22.673] base::close(...future.stdout) [13:11:22.673] ...future.stdout <- NULL [13:11:22.673] } [13:11:22.673] ...future.result$conditions <- ...future.conditions [13:11:22.673] ...future.result$finished <- base::Sys.time() [13:11:22.673] ...future.result [13:11:22.673] } [13:11:22.678] - Launch lazy future ... done [13:11:22.678] run() for 'MiraiFuture' ... done [13:11:22.678] Created future: [13:11:22.679] resolved() for 'MiraiFuture' ... [13:11:22.680] - state: 'running' [13:11:22.680] - run: TRUE [13:11:22.680] - result: 'NULL' [13:11:22.680] - resolved: FALSE [13:11:22.680] resolved() for 'MiraiFuture' ... done [13:11:22.678] MiraiFuture: [13:11:22.678] Label: 'future_lapply-1' [13:11:22.678] Expression: [13:11:22.678] { [13:11:22.678] do.call(function(...) { [13:11:22.678] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:11:22.678] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:11:22.678] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:11:22.678] on.exit(options(oopts), add = TRUE) [13:11:22.678] } [13:11:22.678] { [13:11:22.678] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:11:22.678] ...future.X_jj <- ...future.elements_ii[[jj]] [13:11:22.678] ...future.FUN(...future.X_jj, ...) [13:11:22.678] }) [13:11:22.678] } [13:11:22.678] }, args = future.call.arguments) [13:11:22.678] } [13:11:22.678] Lazy evaluation: FALSE [13:11:22.678] Asynchronous evaluation: TRUE [13:11:22.678] Local evaluation: TRUE [13:11:22.678] Environment: R_GlobalEnv [13:11:22.678] Capture standard output: TRUE [13:11:22.678] Capture condition classes: 'condition' (excluding 'nothing') [13:11:22.678] Globals: 5 objects totaling 560 bytes (function '...future.FUN' of 448 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:11:22.678] Packages: 1 packages ('tools') [13:11:22.678] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:11:22.678] Resolved: FALSE [13:11:22.678] Value: [13:11:22.678] Conditions captured: [13:11:22.678] Early signaling: FALSE [13:11:22.678] Owner process: e170a030-76b9-c481-bacd-a6e7b23ffc83 [13:11:22.678] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:11:22.681] Chunk #1 of 1 ... DONE [13:11:22.681] Launching 1 futures (chunks) ... DONE [13:11:22.681] Resolving 1 futures (chunks) ... [13:11:22.681] resolve() on list ... [13:11:22.682] recursive: 0 [13:11:22.682] length: 1 [13:11:22.682] [13:11:22.682] resolved() for 'MiraiFuture' ... [13:11:22.682] - state: 'running' [13:11:22.682] - run: TRUE [13:11:22.683] - result: 'NULL' [13:11:22.683] - resolved: FALSE [13:11:22.683] resolved() for 'MiraiFuture' ... done [13:11:22.695] resolved() for 'MiraiFuture' ... [13:11:22.695] - state: 'running' [13:11:22.695] - run: TRUE [13:11:22.695] - result: 'NULL' [13:11:22.695] - resolved: FALSE [13:11:22.695] resolved() for 'MiraiFuture' ... done [13:11:22.696] Future #1 [13:11:22.696] signalConditionsASAP(MiraiFuture, pos=1) ... [13:11:22.696] - nx: 1 [13:11:22.696] - relay: TRUE [13:11:22.696] - stdout: TRUE [13:11:22.697] - signal: TRUE [13:11:22.697] - resignal: FALSE [13:11:22.697] - force: TRUE [13:11:22.697] - relayed: [n=1] FALSE [13:11:22.697] - queued futures: [n=1] FALSE [13:11:22.697] - until=1 [13:11:22.697] - relaying element #1 [13:11:22.698] - relayed: [n=1] TRUE [13:11:22.698] - queued futures: [n=1] TRUE [13:11:22.698] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:11:22.698] length: 0 (resolved future 1) [13:11:22.698] Relaying remaining futures [13:11:22.699] signalConditionsASAP(NULL, pos=0) ... [13:11:22.699] - nx: 1 [13:11:22.699] - relay: TRUE [13:11:22.699] - stdout: TRUE [13:11:22.699] - signal: TRUE [13:11:22.699] - resignal: FALSE [13:11:22.699] - force: TRUE [13:11:22.700] - relayed: [n=1] TRUE [13:11:22.700] - queued futures: [n=1] TRUE - flush all [13:11:22.700] - relayed: [n=1] TRUE [13:11:22.700] - queued futures: [n=1] TRUE [13:11:22.700] signalConditionsASAP(NULL, pos=0) ... done [13:11:22.700] resolve() on list ... DONE [13:11:22.701] - Number of value chunks collected: 1 [13:11:22.701] Resolving 1 futures (chunks) ... DONE [13:11:22.701] Reducing values from 1 chunks ... [13:11:22.701] - Number of values collected after concatenation: 1 [13:11:22.701] - Number of values expected: 1 [13:11:22.702] Reducing values from 1 chunks ... DONE [13:11:22.702] future_lapply() ... DONE *** future_lapply() ... DONE > > proc.time() user system elapsed 7.68 0.20 8.45