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:31:15.864] plan(): Setting new future strategy stack: [13:31:15.865] List of future strategies: [13:31:15.865] 1. mirai_multisession: [13:31:15.865] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:15.865] - tweaked: FALSE [13:31:15.865] - call: future::plan(future.mirai::mirai_multisession) [13:31:15.878] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:15.878] < mirai | $data > [13:31:15.883] getGlobalsAndPackages() ... [13:31:15.883] Not searching for globals [13:31:15.884] - globals: [0] [13:31:15.884] getGlobalsAndPackages() ... DONE [13:31:15.884] getGlobalsAndPackages() ... [13:31:15.884] [13:31:15.885] - globals: [0] [13:31:15.885] getGlobalsAndPackages() ... DONE [13:31:16.164] Packages needed by the future expression (n = 0): [13:31:16.164] Packages needed by future strategies (n = 0): [13:31:16.165] { [13:31:16.165] { [13:31:16.165] { [13:31:16.165] ...future.startTime <- base::Sys.time() [13:31:16.165] { [13:31:16.165] { [13:31:16.165] { [13:31:16.165] base::local({ [13:31:16.165] has_future <- base::requireNamespace("future", [13:31:16.165] quietly = TRUE) [13:31:16.165] if (has_future) { [13:31:16.165] ns <- base::getNamespace("future") [13:31:16.165] version <- ns[[".package"]][["version"]] [13:31:16.165] if (is.null(version)) [13:31:16.165] version <- utils::packageVersion("future") [13:31:16.165] } [13:31:16.165] else { [13:31:16.165] version <- NULL [13:31:16.165] } [13:31:16.165] if (!has_future || version < "1.8.0") { [13:31:16.165] info <- base::c(r_version = base::gsub("R version ", [13:31:16.165] "", base::R.version$version.string), [13:31:16.165] platform = base::sprintf("%s (%s-bit)", [13:31:16.165] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.165] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.165] "release", "version")], collapse = " "), [13:31:16.165] hostname = base::Sys.info()[["nodename"]]) [13:31:16.165] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.165] info) [13:31:16.165] info <- base::paste(info, collapse = "; ") [13:31:16.165] if (!has_future) { [13:31:16.165] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.165] info) [13:31:16.165] } [13:31:16.165] else { [13:31:16.165] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.165] info, version) [13:31:16.165] } [13:31:16.165] base::stop(msg) [13:31:16.165] } [13:31:16.165] }) [13:31:16.165] } [13:31:16.165] ...future.strategy.old <- future::plan("list") [13:31:16.165] options(future.plan = NULL) [13:31:16.165] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.165] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.165] } [13:31:16.165] ...future.workdir <- getwd() [13:31:16.165] } [13:31:16.165] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.165] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.165] } [13:31:16.165] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.165] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:16.165] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.165] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.165] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.165] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.165] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.165] base::names(...future.oldOptions)) [13:31:16.165] } [13:31:16.165] if (FALSE) { [13:31:16.165] } [13:31:16.165] else { [13:31:16.165] if (TRUE) { [13:31:16.165] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.165] open = "w") [13:31:16.165] } [13:31:16.165] else { [13:31:16.165] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.165] windows = "NUL", "/dev/null"), open = "w") [13:31:16.165] } [13:31:16.165] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.165] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.165] base::sink(type = "output", split = FALSE) [13:31:16.165] base::close(...future.stdout) [13:31:16.165] }, add = TRUE) [13:31:16.165] } [13:31:16.165] ...future.frame <- base::sys.nframe() [13:31:16.165] ...future.conditions <- base::list() [13:31:16.165] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.165] if (FALSE) { [13:31:16.165] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.165] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.165] } [13:31:16.165] ...future.result <- base::tryCatch({ [13:31:16.165] base::withCallingHandlers({ [13:31:16.165] ...future.value <- base::withVisible(base::local(NA)) [13:31:16.165] future::FutureResult(value = ...future.value$value, [13:31:16.165] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.165] ...future.rng), globalenv = if (FALSE) [13:31:16.165] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.165] ...future.globalenv.names)) [13:31:16.165] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.165] }, condition = base::local({ [13:31:16.165] c <- base::c [13:31:16.165] inherits <- base::inherits [13:31:16.165] invokeRestart <- base::invokeRestart [13:31:16.165] length <- base::length [13:31:16.165] list <- base::list [13:31:16.165] seq.int <- base::seq.int [13:31:16.165] signalCondition <- base::signalCondition [13:31:16.165] sys.calls <- base::sys.calls [13:31:16.165] `[[` <- base::`[[` [13:31:16.165] `+` <- base::`+` [13:31:16.165] `<<-` <- base::`<<-` [13:31:16.165] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.165] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.165] 3L)] [13:31:16.165] } [13:31:16.165] function(cond) { [13:31:16.165] is_error <- inherits(cond, "error") [13:31:16.165] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.165] NULL) [13:31:16.165] if (is_error) { [13:31:16.165] sessionInformation <- function() { [13:31:16.165] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.165] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.165] search = base::search(), system = base::Sys.info()) [13:31:16.165] } [13:31:16.165] ...future.conditions[[length(...future.conditions) + [13:31:16.165] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.165] cond$call), session = sessionInformation(), [13:31:16.165] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.165] signalCondition(cond) [13:31:16.165] } [13:31:16.165] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.165] signal <- FALSE && inherits(cond, character(0)) [13:31:16.165] ...future.conditions[[length(...future.conditions) + [13:31:16.165] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.165] if (FALSE && !signal) { [13:31:16.165] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.165] { [13:31:16.165] inherits <- base::inherits [13:31:16.165] invokeRestart <- base::invokeRestart [13:31:16.165] is.null <- base::is.null [13:31:16.165] muffled <- FALSE [13:31:16.165] if (inherits(cond, "message")) { [13:31:16.165] muffled <- grepl(pattern, "muffleMessage") [13:31:16.165] if (muffled) [13:31:16.165] invokeRestart("muffleMessage") [13:31:16.165] } [13:31:16.165] else if (inherits(cond, "warning")) { [13:31:16.165] muffled <- grepl(pattern, "muffleWarning") [13:31:16.165] if (muffled) [13:31:16.165] invokeRestart("muffleWarning") [13:31:16.165] } [13:31:16.165] else if (inherits(cond, "condition")) { [13:31:16.165] if (!is.null(pattern)) { [13:31:16.165] computeRestarts <- base::computeRestarts [13:31:16.165] grepl <- base::grepl [13:31:16.165] restarts <- computeRestarts(cond) [13:31:16.165] for (restart in restarts) { [13:31:16.165] name <- restart$name [13:31:16.165] if (is.null(name)) [13:31:16.165] next [13:31:16.165] if (!grepl(pattern, name)) [13:31:16.165] next [13:31:16.165] invokeRestart(restart) [13:31:16.165] muffled <- TRUE [13:31:16.165] break [13:31:16.165] } [13:31:16.165] } [13:31:16.165] } [13:31:16.165] invisible(muffled) [13:31:16.165] } [13:31:16.165] muffleCondition(cond, pattern = "^muffle") [13:31:16.165] } [13:31:16.165] } [13:31:16.165] else { [13:31:16.165] if (TRUE) { [13:31:16.165] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.165] { [13:31:16.165] inherits <- base::inherits [13:31:16.165] invokeRestart <- base::invokeRestart [13:31:16.165] is.null <- base::is.null [13:31:16.165] muffled <- FALSE [13:31:16.165] if (inherits(cond, "message")) { [13:31:16.165] muffled <- grepl(pattern, "muffleMessage") [13:31:16.165] if (muffled) [13:31:16.165] invokeRestart("muffleMessage") [13:31:16.165] } [13:31:16.165] else if (inherits(cond, "warning")) { [13:31:16.165] muffled <- grepl(pattern, "muffleWarning") [13:31:16.165] if (muffled) [13:31:16.165] invokeRestart("muffleWarning") [13:31:16.165] } [13:31:16.165] else if (inherits(cond, "condition")) { [13:31:16.165] if (!is.null(pattern)) { [13:31:16.165] computeRestarts <- base::computeRestarts [13:31:16.165] grepl <- base::grepl [13:31:16.165] restarts <- computeRestarts(cond) [13:31:16.165] for (restart in restarts) { [13:31:16.165] name <- restart$name [13:31:16.165] if (is.null(name)) [13:31:16.165] next [13:31:16.165] if (!grepl(pattern, name)) [13:31:16.165] next [13:31:16.165] invokeRestart(restart) [13:31:16.165] muffled <- TRUE [13:31:16.165] break [13:31:16.165] } [13:31:16.165] } [13:31:16.165] } [13:31:16.165] invisible(muffled) [13:31:16.165] } [13:31:16.165] muffleCondition(cond, pattern = "^muffle") [13:31:16.165] } [13:31:16.165] } [13:31:16.165] } [13:31:16.165] })) [13:31:16.165] }, error = function(ex) { [13:31:16.165] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.165] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.165] ...future.rng), started = ...future.startTime, [13:31:16.165] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.165] version = "1.8"), class = "FutureResult") [13:31:16.165] }, finally = { [13:31:16.165] if (!identical(...future.workdir, getwd())) [13:31:16.165] setwd(...future.workdir) [13:31:16.165] { [13:31:16.165] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.165] ...future.oldOptions$nwarnings <- NULL [13:31:16.165] } [13:31:16.165] base::options(...future.oldOptions) [13:31:16.165] if (.Platform$OS.type == "windows") { [13:31:16.165] old_names <- names(...future.oldEnvVars) [13:31:16.165] envs <- base::Sys.getenv() [13:31:16.165] names <- names(envs) [13:31:16.165] common <- intersect(names, old_names) [13:31:16.165] added <- setdiff(names, old_names) [13:31:16.165] removed <- setdiff(old_names, names) [13:31:16.165] changed <- common[...future.oldEnvVars[common] != [13:31:16.165] envs[common]] [13:31:16.165] NAMES <- toupper(changed) [13:31:16.165] args <- list() [13:31:16.165] for (kk in seq_along(NAMES)) { [13:31:16.165] name <- changed[[kk]] [13:31:16.165] NAME <- NAMES[[kk]] [13:31:16.165] if (name != NAME && is.element(NAME, old_names)) [13:31:16.165] next [13:31:16.165] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.165] } [13:31:16.165] NAMES <- toupper(added) [13:31:16.165] for (kk in seq_along(NAMES)) { [13:31:16.165] name <- added[[kk]] [13:31:16.165] NAME <- NAMES[[kk]] [13:31:16.165] if (name != NAME && is.element(NAME, old_names)) [13:31:16.165] next [13:31:16.165] args[[name]] <- "" [13:31:16.165] } [13:31:16.165] NAMES <- toupper(removed) [13:31:16.165] for (kk in seq_along(NAMES)) { [13:31:16.165] name <- removed[[kk]] [13:31:16.165] NAME <- NAMES[[kk]] [13:31:16.165] if (name != NAME && is.element(NAME, old_names)) [13:31:16.165] next [13:31:16.165] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.165] } [13:31:16.165] if (length(args) > 0) [13:31:16.165] base::do.call(base::Sys.setenv, args = args) [13:31:16.165] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.165] } [13:31:16.165] else { [13:31:16.165] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.165] } [13:31:16.165] { [13:31:16.165] if (base::length(...future.futureOptionsAdded) > [13:31:16.165] 0L) { [13:31:16.165] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.165] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.165] base::options(opts) [13:31:16.165] } [13:31:16.165] { [13:31:16.165] NULL [13:31:16.165] options(future.plan = NULL) [13:31:16.165] if (is.na(NA_character_)) [13:31:16.165] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.165] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.165] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.165] .init = FALSE) [13:31:16.165] } [13:31:16.165] } [13:31:16.165] } [13:31:16.165] }) [13:31:16.165] if (TRUE) { [13:31:16.165] base::sink(type = "output", split = FALSE) [13:31:16.165] if (TRUE) { [13:31:16.165] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.165] } [13:31:16.165] else { [13:31:16.165] ...future.result["stdout"] <- base::list(NULL) [13:31:16.165] } [13:31:16.165] base::close(...future.stdout) [13:31:16.165] ...future.stdout <- NULL [13:31:16.165] } [13:31:16.165] ...future.result$conditions <- ...future.conditions [13:31:16.165] ...future.result$finished <- base::Sys.time() [13:31:16.165] ...future.result [13:31:16.165] } [13:31:16.272] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:16.272] plan(): nbrOfWorkers() = 2 *** future_lapply() ... - future_lapply(x, FUN = vector, ...) ... List of 1 $ x:List of 3 ..$ a: chr "integer" ..$ c: chr "character" ..$ c: chr "list" List of 1 $ y0:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:31:16.296] - plan('mirai_multisession') ...[13:31:16.296] plan(): Setting new future strategy stack: [13:31:16.296] List of future strategies: [13:31:16.296] 1. mirai_multisession: [13:31:16.296] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:16.296] - tweaked: FALSE [13:31:16.296] - call: plan(strategy) [13:31:16.311] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:16.311] < mirai | $data > [13:31:16.313] getGlobalsAndPackages() ... [13:31:16.313] Not searching for globals [13:31:16.313] - globals: [0] [13:31:16.314] getGlobalsAndPackages() ... DONE [13:31:16.314] getGlobalsAndPackages() ... [13:31:16.314] [13:31:16.314] - globals: [0] [13:31:16.314] getGlobalsAndPackages() ... DONE [13:31:16.315] Packages needed by the future expression (n = 0): [13:31:16.315] Packages needed by future strategies (n = 0): [13:31:16.315] { [13:31:16.315] { [13:31:16.315] { [13:31:16.315] ...future.startTime <- base::Sys.time() [13:31:16.315] { [13:31:16.315] { [13:31:16.315] { [13:31:16.315] base::local({ [13:31:16.315] has_future <- base::requireNamespace("future", [13:31:16.315] quietly = TRUE) [13:31:16.315] if (has_future) { [13:31:16.315] ns <- base::getNamespace("future") [13:31:16.315] version <- ns[[".package"]][["version"]] [13:31:16.315] if (is.null(version)) [13:31:16.315] version <- utils::packageVersion("future") [13:31:16.315] } [13:31:16.315] else { [13:31:16.315] version <- NULL [13:31:16.315] } [13:31:16.315] if (!has_future || version < "1.8.0") { [13:31:16.315] info <- base::c(r_version = base::gsub("R version ", [13:31:16.315] "", base::R.version$version.string), [13:31:16.315] platform = base::sprintf("%s (%s-bit)", [13:31:16.315] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.315] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.315] "release", "version")], collapse = " "), [13:31:16.315] hostname = base::Sys.info()[["nodename"]]) [13:31:16.315] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.315] info) [13:31:16.315] info <- base::paste(info, collapse = "; ") [13:31:16.315] if (!has_future) { [13:31:16.315] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.315] info) [13:31:16.315] } [13:31:16.315] else { [13:31:16.315] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.315] info, version) [13:31:16.315] } [13:31:16.315] base::stop(msg) [13:31:16.315] } [13:31:16.315] }) [13:31:16.315] } [13:31:16.315] ...future.strategy.old <- future::plan("list") [13:31:16.315] options(future.plan = NULL) [13:31:16.315] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.315] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.315] } [13:31:16.315] ...future.workdir <- getwd() [13:31:16.315] } [13:31:16.315] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.315] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.315] } [13:31:16.315] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.315] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:16.315] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.315] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.315] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.315] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.315] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.315] base::names(...future.oldOptions)) [13:31:16.315] } [13:31:16.315] if (FALSE) { [13:31:16.315] } [13:31:16.315] else { [13:31:16.315] if (TRUE) { [13:31:16.315] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.315] open = "w") [13:31:16.315] } [13:31:16.315] else { [13:31:16.315] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.315] windows = "NUL", "/dev/null"), open = "w") [13:31:16.315] } [13:31:16.315] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.315] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.315] base::sink(type = "output", split = FALSE) [13:31:16.315] base::close(...future.stdout) [13:31:16.315] }, add = TRUE) [13:31:16.315] } [13:31:16.315] ...future.frame <- base::sys.nframe() [13:31:16.315] ...future.conditions <- base::list() [13:31:16.315] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.315] if (FALSE) { [13:31:16.315] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.315] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.315] } [13:31:16.315] ...future.result <- base::tryCatch({ [13:31:16.315] base::withCallingHandlers({ [13:31:16.315] ...future.value <- base::withVisible(base::local(NA)) [13:31:16.315] future::FutureResult(value = ...future.value$value, [13:31:16.315] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.315] ...future.rng), globalenv = if (FALSE) [13:31:16.315] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.315] ...future.globalenv.names)) [13:31:16.315] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.315] }, condition = base::local({ [13:31:16.315] c <- base::c [13:31:16.315] inherits <- base::inherits [13:31:16.315] invokeRestart <- base::invokeRestart [13:31:16.315] length <- base::length [13:31:16.315] list <- base::list [13:31:16.315] seq.int <- base::seq.int [13:31:16.315] signalCondition <- base::signalCondition [13:31:16.315] sys.calls <- base::sys.calls [13:31:16.315] `[[` <- base::`[[` [13:31:16.315] `+` <- base::`+` [13:31:16.315] `<<-` <- base::`<<-` [13:31:16.315] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.315] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.315] 3L)] [13:31:16.315] } [13:31:16.315] function(cond) { [13:31:16.315] is_error <- inherits(cond, "error") [13:31:16.315] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.315] NULL) [13:31:16.315] if (is_error) { [13:31:16.315] sessionInformation <- function() { [13:31:16.315] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.315] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.315] search = base::search(), system = base::Sys.info()) [13:31:16.315] } [13:31:16.315] ...future.conditions[[length(...future.conditions) + [13:31:16.315] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.315] cond$call), session = sessionInformation(), [13:31:16.315] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.315] signalCondition(cond) [13:31:16.315] } [13:31:16.315] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.315] signal <- FALSE && inherits(cond, character(0)) [13:31:16.315] ...future.conditions[[length(...future.conditions) + [13:31:16.315] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.315] if (FALSE && !signal) { [13:31:16.315] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.315] { [13:31:16.315] inherits <- base::inherits [13:31:16.315] invokeRestart <- base::invokeRestart [13:31:16.315] is.null <- base::is.null [13:31:16.315] muffled <- FALSE [13:31:16.315] if (inherits(cond, "message")) { [13:31:16.315] muffled <- grepl(pattern, "muffleMessage") [13:31:16.315] if (muffled) [13:31:16.315] invokeRestart("muffleMessage") [13:31:16.315] } [13:31:16.315] else if (inherits(cond, "warning")) { [13:31:16.315] muffled <- grepl(pattern, "muffleWarning") [13:31:16.315] if (muffled) [13:31:16.315] invokeRestart("muffleWarning") [13:31:16.315] } [13:31:16.315] else if (inherits(cond, "condition")) { [13:31:16.315] if (!is.null(pattern)) { [13:31:16.315] computeRestarts <- base::computeRestarts [13:31:16.315] grepl <- base::grepl [13:31:16.315] restarts <- computeRestarts(cond) [13:31:16.315] for (restart in restarts) { [13:31:16.315] name <- restart$name [13:31:16.315] if (is.null(name)) [13:31:16.315] next [13:31:16.315] if (!grepl(pattern, name)) [13:31:16.315] next [13:31:16.315] invokeRestart(restart) [13:31:16.315] muffled <- TRUE [13:31:16.315] break [13:31:16.315] } [13:31:16.315] } [13:31:16.315] } [13:31:16.315] invisible(muffled) [13:31:16.315] } [13:31:16.315] muffleCondition(cond, pattern = "^muffle") [13:31:16.315] } [13:31:16.315] } [13:31:16.315] else { [13:31:16.315] if (TRUE) { [13:31:16.315] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.315] { [13:31:16.315] inherits <- base::inherits [13:31:16.315] invokeRestart <- base::invokeRestart [13:31:16.315] is.null <- base::is.null [13:31:16.315] muffled <- FALSE [13:31:16.315] if (inherits(cond, "message")) { [13:31:16.315] muffled <- grepl(pattern, "muffleMessage") [13:31:16.315] if (muffled) [13:31:16.315] invokeRestart("muffleMessage") [13:31:16.315] } [13:31:16.315] else if (inherits(cond, "warning")) { [13:31:16.315] muffled <- grepl(pattern, "muffleWarning") [13:31:16.315] if (muffled) [13:31:16.315] invokeRestart("muffleWarning") [13:31:16.315] } [13:31:16.315] else if (inherits(cond, "condition")) { [13:31:16.315] if (!is.null(pattern)) { [13:31:16.315] computeRestarts <- base::computeRestarts [13:31:16.315] grepl <- base::grepl [13:31:16.315] restarts <- computeRestarts(cond) [13:31:16.315] for (restart in restarts) { [13:31:16.315] name <- restart$name [13:31:16.315] if (is.null(name)) [13:31:16.315] next [13:31:16.315] if (!grepl(pattern, name)) [13:31:16.315] next [13:31:16.315] invokeRestart(restart) [13:31:16.315] muffled <- TRUE [13:31:16.315] break [13:31:16.315] } [13:31:16.315] } [13:31:16.315] } [13:31:16.315] invisible(muffled) [13:31:16.315] } [13:31:16.315] muffleCondition(cond, pattern = "^muffle") [13:31:16.315] } [13:31:16.315] } [13:31:16.315] } [13:31:16.315] })) [13:31:16.315] }, error = function(ex) { [13:31:16.315] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.315] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.315] ...future.rng), started = ...future.startTime, [13:31:16.315] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.315] version = "1.8"), class = "FutureResult") [13:31:16.315] }, finally = { [13:31:16.315] if (!identical(...future.workdir, getwd())) [13:31:16.315] setwd(...future.workdir) [13:31:16.315] { [13:31:16.315] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.315] ...future.oldOptions$nwarnings <- NULL [13:31:16.315] } [13:31:16.315] base::options(...future.oldOptions) [13:31:16.315] if (.Platform$OS.type == "windows") { [13:31:16.315] old_names <- names(...future.oldEnvVars) [13:31:16.315] envs <- base::Sys.getenv() [13:31:16.315] names <- names(envs) [13:31:16.315] common <- intersect(names, old_names) [13:31:16.315] added <- setdiff(names, old_names) [13:31:16.315] removed <- setdiff(old_names, names) [13:31:16.315] changed <- common[...future.oldEnvVars[common] != [13:31:16.315] envs[common]] [13:31:16.315] NAMES <- toupper(changed) [13:31:16.315] args <- list() [13:31:16.315] for (kk in seq_along(NAMES)) { [13:31:16.315] name <- changed[[kk]] [13:31:16.315] NAME <- NAMES[[kk]] [13:31:16.315] if (name != NAME && is.element(NAME, old_names)) [13:31:16.315] next [13:31:16.315] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.315] } [13:31:16.315] NAMES <- toupper(added) [13:31:16.315] for (kk in seq_along(NAMES)) { [13:31:16.315] name <- added[[kk]] [13:31:16.315] NAME <- NAMES[[kk]] [13:31:16.315] if (name != NAME && is.element(NAME, old_names)) [13:31:16.315] next [13:31:16.315] args[[name]] <- "" [13:31:16.315] } [13:31:16.315] NAMES <- toupper(removed) [13:31:16.315] for (kk in seq_along(NAMES)) { [13:31:16.315] name <- removed[[kk]] [13:31:16.315] NAME <- NAMES[[kk]] [13:31:16.315] if (name != NAME && is.element(NAME, old_names)) [13:31:16.315] next [13:31:16.315] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.315] } [13:31:16.315] if (length(args) > 0) [13:31:16.315] base::do.call(base::Sys.setenv, args = args) [13:31:16.315] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.315] } [13:31:16.315] else { [13:31:16.315] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.315] } [13:31:16.315] { [13:31:16.315] if (base::length(...future.futureOptionsAdded) > [13:31:16.315] 0L) { [13:31:16.315] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.315] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.315] base::options(opts) [13:31:16.315] } [13:31:16.315] { [13:31:16.315] NULL [13:31:16.315] options(future.plan = NULL) [13:31:16.315] if (is.na(NA_character_)) [13:31:16.315] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.315] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.315] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.315] .init = FALSE) [13:31:16.315] } [13:31:16.315] } [13:31:16.315] } [13:31:16.315] }) [13:31:16.315] if (TRUE) { [13:31:16.315] base::sink(type = "output", split = FALSE) [13:31:16.315] if (TRUE) { [13:31:16.315] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.315] } [13:31:16.315] else { [13:31:16.315] ...future.result["stdout"] <- base::list(NULL) [13:31:16.315] } [13:31:16.315] base::close(...future.stdout) [13:31:16.315] ...future.stdout <- NULL [13:31:16.315] } [13:31:16.315] ...future.result$conditions <- ...future.conditions [13:31:16.315] ...future.result$finished <- base::Sys.time() [13:31:16.315] ...future.result [13:31:16.315] } [13:31:16.417] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:16.417] plan(): nbrOfWorkers() = 2 [13:31:16.417] future_lapply() ... [13:31:16.423] Number of chunks: 3 [13:31:16.424] getGlobalsAndPackagesXApply() ... [13:31:16.424] - future.globals: TRUE [13:31:16.424] getGlobalsAndPackages() ... [13:31:16.424] Searching for globals... [13:31:16.427] - globals found: [2] 'FUN', '.Internal' [13:31:16.427] Searching for globals ... DONE [13:31:16.427] Resolving globals: FALSE [13:31:16.428] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:31:16.429] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:31:16.429] - globals: [1] 'FUN' [13:31:16.429] [13:31:16.429] getGlobalsAndPackages() ... DONE [13:31:16.429] - globals found/used: [n=1] 'FUN' [13:31:16.430] - needed namespaces: [n=0] [13:31:16.430] Finding globals ... DONE [13:31:16.430] - use_args: TRUE [13:31:16.430] - Getting '...' globals ... [13:31:16.431] resolve() on list ... [13:31:16.431] recursive: 0 [13:31:16.432] length: 1 [13:31:16.432] elements: '...' [13:31:16.432] length: 0 (resolved future 1) [13:31:16.432] resolve() on list ... DONE [13:31:16.432] - '...' content: [n=1] 'length' [13:31:16.433] List of 1 [13:31:16.433] $ ...:List of 1 [13:31:16.433] ..$ length: int 2 [13:31:16.433] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.433] - attr(*, "where")=List of 1 [13:31:16.433] ..$ ...: [13:31:16.433] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.433] - attr(*, "resolved")= logi TRUE [13:31:16.433] - attr(*, "total_size")= num NA [13:31:16.438] - Getting '...' globals ... DONE [13:31:16.438] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:16.438] List of 2 [13:31:16.438] $ ...future.FUN:function (mode = "logical", length = 0L) [13:31:16.438] $ ... :List of 1 [13:31:16.438] ..$ length: int 2 [13:31:16.438] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.438] - attr(*, "where")=List of 2 [13:31:16.438] ..$ ...future.FUN: [13:31:16.438] ..$ ... : [13:31:16.438] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.438] - attr(*, "resolved")= logi FALSE [13:31:16.438] - attr(*, "total_size")= num 2240 [13:31:16.442] Packages to be attached in all futures: [n=0] [13:31:16.442] getGlobalsAndPackagesXApply() ... DONE [13:31:16.442] Number of futures (= number of chunks): 3 [13:31:16.442] Launching 3 futures (chunks) ... [13:31:16.443] Chunk #1 of 3 ... [13:31:16.443] - Finding globals in 'X' for chunk #1 ... [13:31:16.443] getGlobalsAndPackages() ... [13:31:16.443] Searching for globals... [13:31:16.444] [13:31:16.444] Searching for globals ... DONE [13:31:16.444] - globals: [0] [13:31:16.444] getGlobalsAndPackages() ... DONE [13:31:16.444] + additional globals found: [n=0] [13:31:16.444] + additional namespaces needed: [n=0] [13:31:16.445] - Finding globals in 'X' for chunk #1 ... DONE [13:31:16.445] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:16.445] - seeds: [13:31:16.445] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.445] getGlobalsAndPackages() ... [13:31:16.445] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.446] Resolving globals: FALSE [13:31:16.446] Tweak future expression to call with '...' arguments ... [13:31:16.446] { [13:31:16.446] do.call(function(...) { [13:31:16.446] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.446] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.446] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.446] on.exit(options(oopts), add = TRUE) [13:31:16.446] } [13:31:16.446] { [13:31:16.446] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.446] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.446] ...future.FUN(...future.X_jj, ...) [13:31:16.446] }) [13:31:16.446] } [13:31:16.446] }, args = future.call.arguments) [13:31:16.446] } [13:31:16.446] Tweak future expression to call with '...' arguments ... DONE [13:31:16.447] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.447] [13:31:16.447] getGlobalsAndPackages() ... DONE [13:31:16.448] run() for 'Future' ... [13:31:16.448] - state: 'created' [13:31:16.448] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.450] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.451] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.451] - Field: 'label' [13:31:16.451] - Field: 'local' [13:31:16.451] - Field: 'owner' [13:31:16.451] - Field: 'envir' [13:31:16.452] - Field: 'packages' [13:31:16.452] - Field: 'gc' [13:31:16.452] - Field: 'conditions' [13:31:16.452] - Field: 'expr' [13:31:16.452] - Field: 'uuid' [13:31:16.452] - Field: 'seed' [13:31:16.453] - Field: 'version' [13:31:16.453] - Field: 'result' [13:31:16.453] - Field: 'asynchronous' [13:31:16.453] - Field: 'calls' [13:31:16.453] - Field: 'globals' [13:31:16.453] - Field: 'stdout' [13:31:16.454] - Field: 'earlySignal' [13:31:16.454] - Field: 'lazy' [13:31:16.454] - Field: 'state' [13:31:16.454] - Field: '.cluster' [13:31:16.454] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.454] - Launch lazy future ... [13:31:16.455] Packages needed by the future expression (n = 0): [13:31:16.455] Packages needed by future strategies (n = 0): [13:31:16.455] { [13:31:16.455] { [13:31:16.455] { [13:31:16.455] ...future.startTime <- base::Sys.time() [13:31:16.455] { [13:31:16.455] { [13:31:16.455] { [13:31:16.455] base::local({ [13:31:16.455] has_future <- base::requireNamespace("future", [13:31:16.455] quietly = TRUE) [13:31:16.455] if (has_future) { [13:31:16.455] ns <- base::getNamespace("future") [13:31:16.455] version <- ns[[".package"]][["version"]] [13:31:16.455] if (is.null(version)) [13:31:16.455] version <- utils::packageVersion("future") [13:31:16.455] } [13:31:16.455] else { [13:31:16.455] version <- NULL [13:31:16.455] } [13:31:16.455] if (!has_future || version < "1.8.0") { [13:31:16.455] info <- base::c(r_version = base::gsub("R version ", [13:31:16.455] "", base::R.version$version.string), [13:31:16.455] platform = base::sprintf("%s (%s-bit)", [13:31:16.455] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.455] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.455] "release", "version")], collapse = " "), [13:31:16.455] hostname = base::Sys.info()[["nodename"]]) [13:31:16.455] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.455] info) [13:31:16.455] info <- base::paste(info, collapse = "; ") [13:31:16.455] if (!has_future) { [13:31:16.455] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.455] info) [13:31:16.455] } [13:31:16.455] else { [13:31:16.455] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.455] info, version) [13:31:16.455] } [13:31:16.455] base::stop(msg) [13:31:16.455] } [13:31:16.455] }) [13:31:16.455] } [13:31:16.455] ...future.strategy.old <- future::plan("list") [13:31:16.455] options(future.plan = NULL) [13:31:16.455] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.455] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.455] } [13:31:16.455] ...future.workdir <- getwd() [13:31:16.455] } [13:31:16.455] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.455] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.455] } [13:31:16.455] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.455] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:16.455] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.455] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.455] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.455] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.455] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.455] base::names(...future.oldOptions)) [13:31:16.455] } [13:31:16.455] if (FALSE) { [13:31:16.455] } [13:31:16.455] else { [13:31:16.455] if (TRUE) { [13:31:16.455] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.455] open = "w") [13:31:16.455] } [13:31:16.455] else { [13:31:16.455] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.455] windows = "NUL", "/dev/null"), open = "w") [13:31:16.455] } [13:31:16.455] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.455] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.455] base::sink(type = "output", split = FALSE) [13:31:16.455] base::close(...future.stdout) [13:31:16.455] }, add = TRUE) [13:31:16.455] } [13:31:16.455] ...future.frame <- base::sys.nframe() [13:31:16.455] ...future.conditions <- base::list() [13:31:16.455] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.455] if (FALSE) { [13:31:16.455] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.455] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.455] } [13:31:16.455] ...future.result <- base::tryCatch({ [13:31:16.455] base::withCallingHandlers({ [13:31:16.455] ...future.value <- base::withVisible(base::local({ [13:31:16.455] do.call(function(...) { [13:31:16.455] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.455] if (!identical(...future.globals.maxSize.org, [13:31:16.455] ...future.globals.maxSize)) { [13:31:16.455] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.455] on.exit(options(oopts), add = TRUE) [13:31:16.455] } [13:31:16.455] { [13:31:16.455] lapply(seq_along(...future.elements_ii), [13:31:16.455] FUN = function(jj) { [13:31:16.455] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.455] ...future.FUN(...future.X_jj, ...) [13:31:16.455] }) [13:31:16.455] } [13:31:16.455] }, args = future.call.arguments) [13:31:16.455] })) [13:31:16.455] future::FutureResult(value = ...future.value$value, [13:31:16.455] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.455] ...future.rng), globalenv = if (FALSE) [13:31:16.455] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.455] ...future.globalenv.names)) [13:31:16.455] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.455] }, condition = base::local({ [13:31:16.455] c <- base::c [13:31:16.455] inherits <- base::inherits [13:31:16.455] invokeRestart <- base::invokeRestart [13:31:16.455] length <- base::length [13:31:16.455] list <- base::list [13:31:16.455] seq.int <- base::seq.int [13:31:16.455] signalCondition <- base::signalCondition [13:31:16.455] sys.calls <- base::sys.calls [13:31:16.455] `[[` <- base::`[[` [13:31:16.455] `+` <- base::`+` [13:31:16.455] `<<-` <- base::`<<-` [13:31:16.455] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.455] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.455] 3L)] [13:31:16.455] } [13:31:16.455] function(cond) { [13:31:16.455] is_error <- inherits(cond, "error") [13:31:16.455] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.455] NULL) [13:31:16.455] if (is_error) { [13:31:16.455] sessionInformation <- function() { [13:31:16.455] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.455] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.455] search = base::search(), system = base::Sys.info()) [13:31:16.455] } [13:31:16.455] ...future.conditions[[length(...future.conditions) + [13:31:16.455] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.455] cond$call), session = sessionInformation(), [13:31:16.455] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.455] signalCondition(cond) [13:31:16.455] } [13:31:16.455] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.455] signal <- FALSE && inherits(cond, character(0)) [13:31:16.455] ...future.conditions[[length(...future.conditions) + [13:31:16.455] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.455] if (FALSE && !signal) { [13:31:16.455] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.455] { [13:31:16.455] inherits <- base::inherits [13:31:16.455] invokeRestart <- base::invokeRestart [13:31:16.455] is.null <- base::is.null [13:31:16.455] muffled <- FALSE [13:31:16.455] if (inherits(cond, "message")) { [13:31:16.455] muffled <- grepl(pattern, "muffleMessage") [13:31:16.455] if (muffled) [13:31:16.455] invokeRestart("muffleMessage") [13:31:16.455] } [13:31:16.455] else if (inherits(cond, "warning")) { [13:31:16.455] muffled <- grepl(pattern, "muffleWarning") [13:31:16.455] if (muffled) [13:31:16.455] invokeRestart("muffleWarning") [13:31:16.455] } [13:31:16.455] else if (inherits(cond, "condition")) { [13:31:16.455] if (!is.null(pattern)) { [13:31:16.455] computeRestarts <- base::computeRestarts [13:31:16.455] grepl <- base::grepl [13:31:16.455] restarts <- computeRestarts(cond) [13:31:16.455] for (restart in restarts) { [13:31:16.455] name <- restart$name [13:31:16.455] if (is.null(name)) [13:31:16.455] next [13:31:16.455] if (!grepl(pattern, name)) [13:31:16.455] next [13:31:16.455] invokeRestart(restart) [13:31:16.455] muffled <- TRUE [13:31:16.455] break [13:31:16.455] } [13:31:16.455] } [13:31:16.455] } [13:31:16.455] invisible(muffled) [13:31:16.455] } [13:31:16.455] muffleCondition(cond, pattern = "^muffle") [13:31:16.455] } [13:31:16.455] } [13:31:16.455] else { [13:31:16.455] if (TRUE) { [13:31:16.455] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.455] { [13:31:16.455] inherits <- base::inherits [13:31:16.455] invokeRestart <- base::invokeRestart [13:31:16.455] is.null <- base::is.null [13:31:16.455] muffled <- FALSE [13:31:16.455] if (inherits(cond, "message")) { [13:31:16.455] muffled <- grepl(pattern, "muffleMessage") [13:31:16.455] if (muffled) [13:31:16.455] invokeRestart("muffleMessage") [13:31:16.455] } [13:31:16.455] else if (inherits(cond, "warning")) { [13:31:16.455] muffled <- grepl(pattern, "muffleWarning") [13:31:16.455] if (muffled) [13:31:16.455] invokeRestart("muffleWarning") [13:31:16.455] } [13:31:16.455] else if (inherits(cond, "condition")) { [13:31:16.455] if (!is.null(pattern)) { [13:31:16.455] computeRestarts <- base::computeRestarts [13:31:16.455] grepl <- base::grepl [13:31:16.455] restarts <- computeRestarts(cond) [13:31:16.455] for (restart in restarts) { [13:31:16.455] name <- restart$name [13:31:16.455] if (is.null(name)) [13:31:16.455] next [13:31:16.455] if (!grepl(pattern, name)) [13:31:16.455] next [13:31:16.455] invokeRestart(restart) [13:31:16.455] muffled <- TRUE [13:31:16.455] break [13:31:16.455] } [13:31:16.455] } [13:31:16.455] } [13:31:16.455] invisible(muffled) [13:31:16.455] } [13:31:16.455] muffleCondition(cond, pattern = "^muffle") [13:31:16.455] } [13:31:16.455] } [13:31:16.455] } [13:31:16.455] })) [13:31:16.455] }, error = function(ex) { [13:31:16.455] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.455] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.455] ...future.rng), started = ...future.startTime, [13:31:16.455] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.455] version = "1.8"), class = "FutureResult") [13:31:16.455] }, finally = { [13:31:16.455] if (!identical(...future.workdir, getwd())) [13:31:16.455] setwd(...future.workdir) [13:31:16.455] { [13:31:16.455] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.455] ...future.oldOptions$nwarnings <- NULL [13:31:16.455] } [13:31:16.455] base::options(...future.oldOptions) [13:31:16.455] if (.Platform$OS.type == "windows") { [13:31:16.455] old_names <- names(...future.oldEnvVars) [13:31:16.455] envs <- base::Sys.getenv() [13:31:16.455] names <- names(envs) [13:31:16.455] common <- intersect(names, old_names) [13:31:16.455] added <- setdiff(names, old_names) [13:31:16.455] removed <- setdiff(old_names, names) [13:31:16.455] changed <- common[...future.oldEnvVars[common] != [13:31:16.455] envs[common]] [13:31:16.455] NAMES <- toupper(changed) [13:31:16.455] args <- list() [13:31:16.455] for (kk in seq_along(NAMES)) { [13:31:16.455] name <- changed[[kk]] [13:31:16.455] NAME <- NAMES[[kk]] [13:31:16.455] if (name != NAME && is.element(NAME, old_names)) [13:31:16.455] next [13:31:16.455] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.455] } [13:31:16.455] NAMES <- toupper(added) [13:31:16.455] for (kk in seq_along(NAMES)) { [13:31:16.455] name <- added[[kk]] [13:31:16.455] NAME <- NAMES[[kk]] [13:31:16.455] if (name != NAME && is.element(NAME, old_names)) [13:31:16.455] next [13:31:16.455] args[[name]] <- "" [13:31:16.455] } [13:31:16.455] NAMES <- toupper(removed) [13:31:16.455] for (kk in seq_along(NAMES)) { [13:31:16.455] name <- removed[[kk]] [13:31:16.455] NAME <- NAMES[[kk]] [13:31:16.455] if (name != NAME && is.element(NAME, old_names)) [13:31:16.455] next [13:31:16.455] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.455] } [13:31:16.455] if (length(args) > 0) [13:31:16.455] base::do.call(base::Sys.setenv, args = args) [13:31:16.455] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.455] } [13:31:16.455] else { [13:31:16.455] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.455] } [13:31:16.455] { [13:31:16.455] if (base::length(...future.futureOptionsAdded) > [13:31:16.455] 0L) { [13:31:16.455] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.455] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.455] base::options(opts) [13:31:16.455] } [13:31:16.455] { [13:31:16.455] NULL [13:31:16.455] options(future.plan = NULL) [13:31:16.455] if (is.na(NA_character_)) [13:31:16.455] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.455] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.455] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.455] .init = FALSE) [13:31:16.455] } [13:31:16.455] } [13:31:16.455] } [13:31:16.455] }) [13:31:16.455] if (TRUE) { [13:31:16.455] base::sink(type = "output", split = FALSE) [13:31:16.455] if (TRUE) { [13:31:16.455] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.455] } [13:31:16.455] else { [13:31:16.455] ...future.result["stdout"] <- base::list(NULL) [13:31:16.455] } [13:31:16.455] base::close(...future.stdout) [13:31:16.455] ...future.stdout <- NULL [13:31:16.455] } [13:31:16.455] ...future.result$conditions <- ...future.conditions [13:31:16.455] ...future.result$finished <- base::Sys.time() [13:31:16.455] ...future.result [13:31:16.455] } [13:31:16.459] - Launch lazy future ... done [13:31:16.460] run() for 'MiraiFuture' ... done [13:31:16.460] Created future: [13:31:16.462] resolved() for 'MiraiFuture' ... [13:31:16.462] - state: 'running' [13:31:16.462] - run: TRUE [13:31:16.462] - result: 'NULL' [13:31:16.462] - resolved: FALSE [13:31:16.463] resolved() for 'MiraiFuture' ... done [13:31:16.460] MiraiFuture: [13:31:16.460] Label: 'future_lapply-1' [13:31:16.460] Expression: [13:31:16.460] { [13:31:16.460] do.call(function(...) { [13:31:16.460] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.460] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.460] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.460] on.exit(options(oopts), add = TRUE) [13:31:16.460] } [13:31:16.460] { [13:31:16.460] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.460] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.460] ...future.FUN(...future.X_jj, ...) [13:31:16.460] }) [13:31:16.460] } [13:31:16.460] }, args = future.call.arguments) [13:31:16.460] } [13:31:16.460] Lazy evaluation: FALSE [13:31:16.460] Asynchronous evaluation: TRUE [13:31:16.460] Local evaluation: TRUE [13:31:16.460] Environment: R_GlobalEnv [13:31:16.460] Capture standard output: TRUE [13:31:16.460] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.460] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.460] Packages: [13:31:16.460] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.460] Resolved: TRUE [13:31:16.460] Value: [13:31:16.460] Conditions captured: [13:31:16.460] Early signaling: FALSE [13:31:16.460] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.460] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.463] Chunk #1 of 3 ... DONE [13:31:16.463] Chunk #2 of 3 ... [13:31:16.464] - Finding globals in 'X' for chunk #2 ... [13:31:16.464] getGlobalsAndPackages() ... [13:31:16.464] Searching for globals... [13:31:16.464] [13:31:16.464] Searching for globals ... DONE [13:31:16.465] - globals: [0] [13:31:16.466] getGlobalsAndPackages() ... DONE [13:31:16.466] + additional globals found: [n=0] [13:31:16.466] + additional namespaces needed: [n=0] [13:31:16.466] - Finding globals in 'X' for chunk #2 ... DONE [13:31:16.466] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:16.466] - seeds: [13:31:16.467] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.467] getGlobalsAndPackages() ... [13:31:16.467] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.467] Resolving globals: FALSE [13:31:16.467] Tweak future expression to call with '...' arguments ... [13:31:16.467] { [13:31:16.467] do.call(function(...) { [13:31:16.467] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.467] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.467] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.467] on.exit(options(oopts), add = TRUE) [13:31:16.467] } [13:31:16.467] { [13:31:16.467] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.467] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.467] ...future.FUN(...future.X_jj, ...) [13:31:16.467] }) [13:31:16.467] } [13:31:16.467] }, args = future.call.arguments) [13:31:16.467] } [13:31:16.468] Tweak future expression to call with '...' arguments ... DONE [13:31:16.468] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.469] [13:31:16.469] getGlobalsAndPackages() ... DONE [13:31:16.469] run() for 'Future' ... [13:31:16.469] - state: 'created' [13:31:16.469] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.472] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.472] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.472] - Field: 'label' [13:31:16.472] - Field: 'local' [13:31:16.472] - Field: 'owner' [13:31:16.473] - Field: 'envir' [13:31:16.473] - Field: 'packages' [13:31:16.473] - Field: 'gc' [13:31:16.473] - Field: 'conditions' [13:31:16.473] - Field: 'expr' [13:31:16.473] - Field: 'uuid' [13:31:16.474] - Field: 'seed' [13:31:16.474] - Field: 'version' [13:31:16.474] - Field: 'result' [13:31:16.474] - Field: 'asynchronous' [13:31:16.474] - Field: 'calls' [13:31:16.474] - Field: 'globals' [13:31:16.475] - Field: 'stdout' [13:31:16.475] - Field: 'earlySignal' [13:31:16.475] - Field: 'lazy' [13:31:16.475] - Field: 'state' [13:31:16.475] - Field: '.cluster' [13:31:16.475] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.476] - Launch lazy future ... [13:31:16.476] Packages needed by the future expression (n = 0): [13:31:16.476] Packages needed by future strategies (n = 0): [13:31:16.476] { [13:31:16.476] { [13:31:16.476] { [13:31:16.476] ...future.startTime <- base::Sys.time() [13:31:16.476] { [13:31:16.476] { [13:31:16.476] { [13:31:16.476] base::local({ [13:31:16.476] has_future <- base::requireNamespace("future", [13:31:16.476] quietly = TRUE) [13:31:16.476] if (has_future) { [13:31:16.476] ns <- base::getNamespace("future") [13:31:16.476] version <- ns[[".package"]][["version"]] [13:31:16.476] if (is.null(version)) [13:31:16.476] version <- utils::packageVersion("future") [13:31:16.476] } [13:31:16.476] else { [13:31:16.476] version <- NULL [13:31:16.476] } [13:31:16.476] if (!has_future || version < "1.8.0") { [13:31:16.476] info <- base::c(r_version = base::gsub("R version ", [13:31:16.476] "", base::R.version$version.string), [13:31:16.476] platform = base::sprintf("%s (%s-bit)", [13:31:16.476] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.476] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.476] "release", "version")], collapse = " "), [13:31:16.476] hostname = base::Sys.info()[["nodename"]]) [13:31:16.476] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.476] info) [13:31:16.476] info <- base::paste(info, collapse = "; ") [13:31:16.476] if (!has_future) { [13:31:16.476] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.476] info) [13:31:16.476] } [13:31:16.476] else { [13:31:16.476] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.476] info, version) [13:31:16.476] } [13:31:16.476] base::stop(msg) [13:31:16.476] } [13:31:16.476] }) [13:31:16.476] } [13:31:16.476] ...future.strategy.old <- future::plan("list") [13:31:16.476] options(future.plan = NULL) [13:31:16.476] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.476] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.476] } [13:31:16.476] ...future.workdir <- getwd() [13:31:16.476] } [13:31:16.476] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.476] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.476] } [13:31:16.476] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.476] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:16.476] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.476] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.476] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.476] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.476] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.476] base::names(...future.oldOptions)) [13:31:16.476] } [13:31:16.476] if (FALSE) { [13:31:16.476] } [13:31:16.476] else { [13:31:16.476] if (TRUE) { [13:31:16.476] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.476] open = "w") [13:31:16.476] } [13:31:16.476] else { [13:31:16.476] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.476] windows = "NUL", "/dev/null"), open = "w") [13:31:16.476] } [13:31:16.476] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.476] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.476] base::sink(type = "output", split = FALSE) [13:31:16.476] base::close(...future.stdout) [13:31:16.476] }, add = TRUE) [13:31:16.476] } [13:31:16.476] ...future.frame <- base::sys.nframe() [13:31:16.476] ...future.conditions <- base::list() [13:31:16.476] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.476] if (FALSE) { [13:31:16.476] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.476] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.476] } [13:31:16.476] ...future.result <- base::tryCatch({ [13:31:16.476] base::withCallingHandlers({ [13:31:16.476] ...future.value <- base::withVisible(base::local({ [13:31:16.476] do.call(function(...) { [13:31:16.476] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.476] if (!identical(...future.globals.maxSize.org, [13:31:16.476] ...future.globals.maxSize)) { [13:31:16.476] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.476] on.exit(options(oopts), add = TRUE) [13:31:16.476] } [13:31:16.476] { [13:31:16.476] lapply(seq_along(...future.elements_ii), [13:31:16.476] FUN = function(jj) { [13:31:16.476] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.476] ...future.FUN(...future.X_jj, ...) [13:31:16.476] }) [13:31:16.476] } [13:31:16.476] }, args = future.call.arguments) [13:31:16.476] })) [13:31:16.476] future::FutureResult(value = ...future.value$value, [13:31:16.476] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.476] ...future.rng), globalenv = if (FALSE) [13:31:16.476] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.476] ...future.globalenv.names)) [13:31:16.476] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.476] }, condition = base::local({ [13:31:16.476] c <- base::c [13:31:16.476] inherits <- base::inherits [13:31:16.476] invokeRestart <- base::invokeRestart [13:31:16.476] length <- base::length [13:31:16.476] list <- base::list [13:31:16.476] seq.int <- base::seq.int [13:31:16.476] signalCondition <- base::signalCondition [13:31:16.476] sys.calls <- base::sys.calls [13:31:16.476] `[[` <- base::`[[` [13:31:16.476] `+` <- base::`+` [13:31:16.476] `<<-` <- base::`<<-` [13:31:16.476] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.476] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.476] 3L)] [13:31:16.476] } [13:31:16.476] function(cond) { [13:31:16.476] is_error <- inherits(cond, "error") [13:31:16.476] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.476] NULL) [13:31:16.476] if (is_error) { [13:31:16.476] sessionInformation <- function() { [13:31:16.476] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.476] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.476] search = base::search(), system = base::Sys.info()) [13:31:16.476] } [13:31:16.476] ...future.conditions[[length(...future.conditions) + [13:31:16.476] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.476] cond$call), session = sessionInformation(), [13:31:16.476] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.476] signalCondition(cond) [13:31:16.476] } [13:31:16.476] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.476] signal <- FALSE && inherits(cond, character(0)) [13:31:16.476] ...future.conditions[[length(...future.conditions) + [13:31:16.476] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.476] if (FALSE && !signal) { [13:31:16.476] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.476] { [13:31:16.476] inherits <- base::inherits [13:31:16.476] invokeRestart <- base::invokeRestart [13:31:16.476] is.null <- base::is.null [13:31:16.476] muffled <- FALSE [13:31:16.476] if (inherits(cond, "message")) { [13:31:16.476] muffled <- grepl(pattern, "muffleMessage") [13:31:16.476] if (muffled) [13:31:16.476] invokeRestart("muffleMessage") [13:31:16.476] } [13:31:16.476] else if (inherits(cond, "warning")) { [13:31:16.476] muffled <- grepl(pattern, "muffleWarning") [13:31:16.476] if (muffled) [13:31:16.476] invokeRestart("muffleWarning") [13:31:16.476] } [13:31:16.476] else if (inherits(cond, "condition")) { [13:31:16.476] if (!is.null(pattern)) { [13:31:16.476] computeRestarts <- base::computeRestarts [13:31:16.476] grepl <- base::grepl [13:31:16.476] restarts <- computeRestarts(cond) [13:31:16.476] for (restart in restarts) { [13:31:16.476] name <- restart$name [13:31:16.476] if (is.null(name)) [13:31:16.476] next [13:31:16.476] if (!grepl(pattern, name)) [13:31:16.476] next [13:31:16.476] invokeRestart(restart) [13:31:16.476] muffled <- TRUE [13:31:16.476] break [13:31:16.476] } [13:31:16.476] } [13:31:16.476] } [13:31:16.476] invisible(muffled) [13:31:16.476] } [13:31:16.476] muffleCondition(cond, pattern = "^muffle") [13:31:16.476] } [13:31:16.476] } [13:31:16.476] else { [13:31:16.476] if (TRUE) { [13:31:16.476] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.476] { [13:31:16.476] inherits <- base::inherits [13:31:16.476] invokeRestart <- base::invokeRestart [13:31:16.476] is.null <- base::is.null [13:31:16.476] muffled <- FALSE [13:31:16.476] if (inherits(cond, "message")) { [13:31:16.476] muffled <- grepl(pattern, "muffleMessage") [13:31:16.476] if (muffled) [13:31:16.476] invokeRestart("muffleMessage") [13:31:16.476] } [13:31:16.476] else if (inherits(cond, "warning")) { [13:31:16.476] muffled <- grepl(pattern, "muffleWarning") [13:31:16.476] if (muffled) [13:31:16.476] invokeRestart("muffleWarning") [13:31:16.476] } [13:31:16.476] else if (inherits(cond, "condition")) { [13:31:16.476] if (!is.null(pattern)) { [13:31:16.476] computeRestarts <- base::computeRestarts [13:31:16.476] grepl <- base::grepl [13:31:16.476] restarts <- computeRestarts(cond) [13:31:16.476] for (restart in restarts) { [13:31:16.476] name <- restart$name [13:31:16.476] if (is.null(name)) [13:31:16.476] next [13:31:16.476] if (!grepl(pattern, name)) [13:31:16.476] next [13:31:16.476] invokeRestart(restart) [13:31:16.476] muffled <- TRUE [13:31:16.476] break [13:31:16.476] } [13:31:16.476] } [13:31:16.476] } [13:31:16.476] invisible(muffled) [13:31:16.476] } [13:31:16.476] muffleCondition(cond, pattern = "^muffle") [13:31:16.476] } [13:31:16.476] } [13:31:16.476] } [13:31:16.476] })) [13:31:16.476] }, error = function(ex) { [13:31:16.476] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.476] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.476] ...future.rng), started = ...future.startTime, [13:31:16.476] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.476] version = "1.8"), class = "FutureResult") [13:31:16.476] }, finally = { [13:31:16.476] if (!identical(...future.workdir, getwd())) [13:31:16.476] setwd(...future.workdir) [13:31:16.476] { [13:31:16.476] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.476] ...future.oldOptions$nwarnings <- NULL [13:31:16.476] } [13:31:16.476] base::options(...future.oldOptions) [13:31:16.476] if (.Platform$OS.type == "windows") { [13:31:16.476] old_names <- names(...future.oldEnvVars) [13:31:16.476] envs <- base::Sys.getenv() [13:31:16.476] names <- names(envs) [13:31:16.476] common <- intersect(names, old_names) [13:31:16.476] added <- setdiff(names, old_names) [13:31:16.476] removed <- setdiff(old_names, names) [13:31:16.476] changed <- common[...future.oldEnvVars[common] != [13:31:16.476] envs[common]] [13:31:16.476] NAMES <- toupper(changed) [13:31:16.476] args <- list() [13:31:16.476] for (kk in seq_along(NAMES)) { [13:31:16.476] name <- changed[[kk]] [13:31:16.476] NAME <- NAMES[[kk]] [13:31:16.476] if (name != NAME && is.element(NAME, old_names)) [13:31:16.476] next [13:31:16.476] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.476] } [13:31:16.476] NAMES <- toupper(added) [13:31:16.476] for (kk in seq_along(NAMES)) { [13:31:16.476] name <- added[[kk]] [13:31:16.476] NAME <- NAMES[[kk]] [13:31:16.476] if (name != NAME && is.element(NAME, old_names)) [13:31:16.476] next [13:31:16.476] args[[name]] <- "" [13:31:16.476] } [13:31:16.476] NAMES <- toupper(removed) [13:31:16.476] for (kk in seq_along(NAMES)) { [13:31:16.476] name <- removed[[kk]] [13:31:16.476] NAME <- NAMES[[kk]] [13:31:16.476] if (name != NAME && is.element(NAME, old_names)) [13:31:16.476] next [13:31:16.476] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.476] } [13:31:16.476] if (length(args) > 0) [13:31:16.476] base::do.call(base::Sys.setenv, args = args) [13:31:16.476] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.476] } [13:31:16.476] else { [13:31:16.476] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.476] } [13:31:16.476] { [13:31:16.476] if (base::length(...future.futureOptionsAdded) > [13:31:16.476] 0L) { [13:31:16.476] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.476] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.476] base::options(opts) [13:31:16.476] } [13:31:16.476] { [13:31:16.476] NULL [13:31:16.476] options(future.plan = NULL) [13:31:16.476] if (is.na(NA_character_)) [13:31:16.476] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.476] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.476] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.476] .init = FALSE) [13:31:16.476] } [13:31:16.476] } [13:31:16.476] } [13:31:16.476] }) [13:31:16.476] if (TRUE) { [13:31:16.476] base::sink(type = "output", split = FALSE) [13:31:16.476] if (TRUE) { [13:31:16.476] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.476] } [13:31:16.476] else { [13:31:16.476] ...future.result["stdout"] <- base::list(NULL) [13:31:16.476] } [13:31:16.476] base::close(...future.stdout) [13:31:16.476] ...future.stdout <- NULL [13:31:16.476] } [13:31:16.476] ...future.result$conditions <- ...future.conditions [13:31:16.476] ...future.result$finished <- base::Sys.time() [13:31:16.476] ...future.result [13:31:16.476] } [13:31:16.481] - Launch lazy future ... done [13:31:16.481] run() for 'MiraiFuture' ... done [13:31:16.481] Created future: [13:31:16.482] resolved() for 'MiraiFuture' ... [13:31:16.482] - state: 'running' [13:31:16.482] - run: TRUE [13:31:16.483] - result: 'NULL' [13:31:16.483] - resolved: FALSE [13:31:16.483] resolved() for 'MiraiFuture' ... done [13:31:16.481] MiraiFuture: [13:31:16.481] Label: 'future_lapply-2' [13:31:16.481] Expression: [13:31:16.481] { [13:31:16.481] do.call(function(...) { [13:31:16.481] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.481] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.481] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.481] on.exit(options(oopts), add = TRUE) [13:31:16.481] } [13:31:16.481] { [13:31:16.481] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.481] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.481] ...future.FUN(...future.X_jj, ...) [13:31:16.481] }) [13:31:16.481] } [13:31:16.481] }, args = future.call.arguments) [13:31:16.481] } [13:31:16.481] Lazy evaluation: FALSE [13:31:16.481] Asynchronous evaluation: TRUE [13:31:16.481] Local evaluation: TRUE [13:31:16.481] Environment: R_GlobalEnv [13:31:16.481] Capture standard output: TRUE [13:31:16.481] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.481] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.481] Packages: [13:31:16.481] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.481] Resolved: TRUE [13:31:16.481] Value: [13:31:16.481] Conditions captured: [13:31:16.481] Early signaling: FALSE [13:31:16.481] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.481] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.483] Chunk #2 of 3 ... DONE [13:31:16.484] Chunk #3 of 3 ... [13:31:16.484] - Finding globals in 'X' for chunk #3 ... [13:31:16.484] getGlobalsAndPackages() ... [13:31:16.484] Searching for globals... [13:31:16.484] [13:31:16.485] Searching for globals ... DONE [13:31:16.485] - globals: [0] [13:31:16.485] getGlobalsAndPackages() ... DONE [13:31:16.485] + additional globals found: [n=0] [13:31:16.485] + additional namespaces needed: [n=0] [13:31:16.485] - Finding globals in 'X' for chunk #3 ... DONE [13:31:16.486] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:16.486] - seeds: [13:31:16.486] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.486] getGlobalsAndPackages() ... [13:31:16.486] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.486] Resolving globals: FALSE [13:31:16.486] Tweak future expression to call with '...' arguments ... [13:31:16.487] { [13:31:16.487] do.call(function(...) { [13:31:16.487] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.487] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.487] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.487] on.exit(options(oopts), add = TRUE) [13:31:16.487] } [13:31:16.487] { [13:31:16.487] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.487] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.487] ...future.FUN(...future.X_jj, ...) [13:31:16.487] }) [13:31:16.487] } [13:31:16.487] }, args = future.call.arguments) [13:31:16.487] } [13:31:16.487] Tweak future expression to call with '...' arguments ... DONE [13:31:16.488] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.488] [13:31:16.488] getGlobalsAndPackages() ... DONE [13:31:16.488] run() for 'Future' ... [13:31:16.488] - state: 'created' [13:31:16.489] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.491] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.491] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.491] - Field: 'label' [13:31:16.491] - Field: 'local' [13:31:16.492] - Field: 'owner' [13:31:16.492] - Field: 'envir' [13:31:16.492] - Field: 'packages' [13:31:16.492] - Field: 'gc' [13:31:16.492] - Field: 'conditions' [13:31:16.492] - Field: 'expr' [13:31:16.493] - Field: 'uuid' [13:31:16.493] - Field: 'seed' [13:31:16.493] - Field: 'version' [13:31:16.493] - Field: 'result' [13:31:16.493] - Field: 'asynchronous' [13:31:16.493] - Field: 'calls' [13:31:16.494] - Field: 'globals' [13:31:16.494] - Field: 'stdout' [13:31:16.494] - Field: 'earlySignal' [13:31:16.494] - Field: 'lazy' [13:31:16.494] - Field: 'state' [13:31:16.494] - Field: '.cluster' [13:31:16.495] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.495] - Launch lazy future ... [13:31:16.495] Packages needed by the future expression (n = 0): [13:31:16.495] Packages needed by future strategies (n = 0): [13:31:16.496] { [13:31:16.496] { [13:31:16.496] { [13:31:16.496] ...future.startTime <- base::Sys.time() [13:31:16.496] { [13:31:16.496] { [13:31:16.496] { [13:31:16.496] base::local({ [13:31:16.496] has_future <- base::requireNamespace("future", [13:31:16.496] quietly = TRUE) [13:31:16.496] if (has_future) { [13:31:16.496] ns <- base::getNamespace("future") [13:31:16.496] version <- ns[[".package"]][["version"]] [13:31:16.496] if (is.null(version)) [13:31:16.496] version <- utils::packageVersion("future") [13:31:16.496] } [13:31:16.496] else { [13:31:16.496] version <- NULL [13:31:16.496] } [13:31:16.496] if (!has_future || version < "1.8.0") { [13:31:16.496] info <- base::c(r_version = base::gsub("R version ", [13:31:16.496] "", base::R.version$version.string), [13:31:16.496] platform = base::sprintf("%s (%s-bit)", [13:31:16.496] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.496] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.496] "release", "version")], collapse = " "), [13:31:16.496] hostname = base::Sys.info()[["nodename"]]) [13:31:16.496] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.496] info) [13:31:16.496] info <- base::paste(info, collapse = "; ") [13:31:16.496] if (!has_future) { [13:31:16.496] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.496] info) [13:31:16.496] } [13:31:16.496] else { [13:31:16.496] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.496] info, version) [13:31:16.496] } [13:31:16.496] base::stop(msg) [13:31:16.496] } [13:31:16.496] }) [13:31:16.496] } [13:31:16.496] ...future.strategy.old <- future::plan("list") [13:31:16.496] options(future.plan = NULL) [13:31:16.496] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.496] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.496] } [13:31:16.496] ...future.workdir <- getwd() [13:31:16.496] } [13:31:16.496] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.496] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.496] } [13:31:16.496] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.496] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:16.496] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.496] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.496] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.496] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.496] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.496] base::names(...future.oldOptions)) [13:31:16.496] } [13:31:16.496] if (FALSE) { [13:31:16.496] } [13:31:16.496] else { [13:31:16.496] if (TRUE) { [13:31:16.496] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.496] open = "w") [13:31:16.496] } [13:31:16.496] else { [13:31:16.496] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.496] windows = "NUL", "/dev/null"), open = "w") [13:31:16.496] } [13:31:16.496] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.496] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.496] base::sink(type = "output", split = FALSE) [13:31:16.496] base::close(...future.stdout) [13:31:16.496] }, add = TRUE) [13:31:16.496] } [13:31:16.496] ...future.frame <- base::sys.nframe() [13:31:16.496] ...future.conditions <- base::list() [13:31:16.496] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.496] if (FALSE) { [13:31:16.496] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.496] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.496] } [13:31:16.496] ...future.result <- base::tryCatch({ [13:31:16.496] base::withCallingHandlers({ [13:31:16.496] ...future.value <- base::withVisible(base::local({ [13:31:16.496] do.call(function(...) { [13:31:16.496] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.496] if (!identical(...future.globals.maxSize.org, [13:31:16.496] ...future.globals.maxSize)) { [13:31:16.496] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.496] on.exit(options(oopts), add = TRUE) [13:31:16.496] } [13:31:16.496] { [13:31:16.496] lapply(seq_along(...future.elements_ii), [13:31:16.496] FUN = function(jj) { [13:31:16.496] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.496] ...future.FUN(...future.X_jj, ...) [13:31:16.496] }) [13:31:16.496] } [13:31:16.496] }, args = future.call.arguments) [13:31:16.496] })) [13:31:16.496] future::FutureResult(value = ...future.value$value, [13:31:16.496] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.496] ...future.rng), globalenv = if (FALSE) [13:31:16.496] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.496] ...future.globalenv.names)) [13:31:16.496] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.496] }, condition = base::local({ [13:31:16.496] c <- base::c [13:31:16.496] inherits <- base::inherits [13:31:16.496] invokeRestart <- base::invokeRestart [13:31:16.496] length <- base::length [13:31:16.496] list <- base::list [13:31:16.496] seq.int <- base::seq.int [13:31:16.496] signalCondition <- base::signalCondition [13:31:16.496] sys.calls <- base::sys.calls [13:31:16.496] `[[` <- base::`[[` [13:31:16.496] `+` <- base::`+` [13:31:16.496] `<<-` <- base::`<<-` [13:31:16.496] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.496] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.496] 3L)] [13:31:16.496] } [13:31:16.496] function(cond) { [13:31:16.496] is_error <- inherits(cond, "error") [13:31:16.496] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.496] NULL) [13:31:16.496] if (is_error) { [13:31:16.496] sessionInformation <- function() { [13:31:16.496] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.496] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.496] search = base::search(), system = base::Sys.info()) [13:31:16.496] } [13:31:16.496] ...future.conditions[[length(...future.conditions) + [13:31:16.496] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.496] cond$call), session = sessionInformation(), [13:31:16.496] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.496] signalCondition(cond) [13:31:16.496] } [13:31:16.496] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.496] signal <- FALSE && inherits(cond, character(0)) [13:31:16.496] ...future.conditions[[length(...future.conditions) + [13:31:16.496] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.496] if (FALSE && !signal) { [13:31:16.496] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.496] { [13:31:16.496] inherits <- base::inherits [13:31:16.496] invokeRestart <- base::invokeRestart [13:31:16.496] is.null <- base::is.null [13:31:16.496] muffled <- FALSE [13:31:16.496] if (inherits(cond, "message")) { [13:31:16.496] muffled <- grepl(pattern, "muffleMessage") [13:31:16.496] if (muffled) [13:31:16.496] invokeRestart("muffleMessage") [13:31:16.496] } [13:31:16.496] else if (inherits(cond, "warning")) { [13:31:16.496] muffled <- grepl(pattern, "muffleWarning") [13:31:16.496] if (muffled) [13:31:16.496] invokeRestart("muffleWarning") [13:31:16.496] } [13:31:16.496] else if (inherits(cond, "condition")) { [13:31:16.496] if (!is.null(pattern)) { [13:31:16.496] computeRestarts <- base::computeRestarts [13:31:16.496] grepl <- base::grepl [13:31:16.496] restarts <- computeRestarts(cond) [13:31:16.496] for (restart in restarts) { [13:31:16.496] name <- restart$name [13:31:16.496] if (is.null(name)) [13:31:16.496] next [13:31:16.496] if (!grepl(pattern, name)) [13:31:16.496] next [13:31:16.496] invokeRestart(restart) [13:31:16.496] muffled <- TRUE [13:31:16.496] break [13:31:16.496] } [13:31:16.496] } [13:31:16.496] } [13:31:16.496] invisible(muffled) [13:31:16.496] } [13:31:16.496] muffleCondition(cond, pattern = "^muffle") [13:31:16.496] } [13:31:16.496] } [13:31:16.496] else { [13:31:16.496] if (TRUE) { [13:31:16.496] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.496] { [13:31:16.496] inherits <- base::inherits [13:31:16.496] invokeRestart <- base::invokeRestart [13:31:16.496] is.null <- base::is.null [13:31:16.496] muffled <- FALSE [13:31:16.496] if (inherits(cond, "message")) { [13:31:16.496] muffled <- grepl(pattern, "muffleMessage") [13:31:16.496] if (muffled) [13:31:16.496] invokeRestart("muffleMessage") [13:31:16.496] } [13:31:16.496] else if (inherits(cond, "warning")) { [13:31:16.496] muffled <- grepl(pattern, "muffleWarning") [13:31:16.496] if (muffled) [13:31:16.496] invokeRestart("muffleWarning") [13:31:16.496] } [13:31:16.496] else if (inherits(cond, "condition")) { [13:31:16.496] if (!is.null(pattern)) { [13:31:16.496] computeRestarts <- base::computeRestarts [13:31:16.496] grepl <- base::grepl [13:31:16.496] restarts <- computeRestarts(cond) [13:31:16.496] for (restart in restarts) { [13:31:16.496] name <- restart$name [13:31:16.496] if (is.null(name)) [13:31:16.496] next [13:31:16.496] if (!grepl(pattern, name)) [13:31:16.496] next [13:31:16.496] invokeRestart(restart) [13:31:16.496] muffled <- TRUE [13:31:16.496] break [13:31:16.496] } [13:31:16.496] } [13:31:16.496] } [13:31:16.496] invisible(muffled) [13:31:16.496] } [13:31:16.496] muffleCondition(cond, pattern = "^muffle") [13:31:16.496] } [13:31:16.496] } [13:31:16.496] } [13:31:16.496] })) [13:31:16.496] }, error = function(ex) { [13:31:16.496] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.496] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.496] ...future.rng), started = ...future.startTime, [13:31:16.496] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.496] version = "1.8"), class = "FutureResult") [13:31:16.496] }, finally = { [13:31:16.496] if (!identical(...future.workdir, getwd())) [13:31:16.496] setwd(...future.workdir) [13:31:16.496] { [13:31:16.496] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.496] ...future.oldOptions$nwarnings <- NULL [13:31:16.496] } [13:31:16.496] base::options(...future.oldOptions) [13:31:16.496] if (.Platform$OS.type == "windows") { [13:31:16.496] old_names <- names(...future.oldEnvVars) [13:31:16.496] envs <- base::Sys.getenv() [13:31:16.496] names <- names(envs) [13:31:16.496] common <- intersect(names, old_names) [13:31:16.496] added <- setdiff(names, old_names) [13:31:16.496] removed <- setdiff(old_names, names) [13:31:16.496] changed <- common[...future.oldEnvVars[common] != [13:31:16.496] envs[common]] [13:31:16.496] NAMES <- toupper(changed) [13:31:16.496] args <- list() [13:31:16.496] for (kk in seq_along(NAMES)) { [13:31:16.496] name <- changed[[kk]] [13:31:16.496] NAME <- NAMES[[kk]] [13:31:16.496] if (name != NAME && is.element(NAME, old_names)) [13:31:16.496] next [13:31:16.496] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.496] } [13:31:16.496] NAMES <- toupper(added) [13:31:16.496] for (kk in seq_along(NAMES)) { [13:31:16.496] name <- added[[kk]] [13:31:16.496] NAME <- NAMES[[kk]] [13:31:16.496] if (name != NAME && is.element(NAME, old_names)) [13:31:16.496] next [13:31:16.496] args[[name]] <- "" [13:31:16.496] } [13:31:16.496] NAMES <- toupper(removed) [13:31:16.496] for (kk in seq_along(NAMES)) { [13:31:16.496] name <- removed[[kk]] [13:31:16.496] NAME <- NAMES[[kk]] [13:31:16.496] if (name != NAME && is.element(NAME, old_names)) [13:31:16.496] next [13:31:16.496] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.496] } [13:31:16.496] if (length(args) > 0) [13:31:16.496] base::do.call(base::Sys.setenv, args = args) [13:31:16.496] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.496] } [13:31:16.496] else { [13:31:16.496] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.496] } [13:31:16.496] { [13:31:16.496] if (base::length(...future.futureOptionsAdded) > [13:31:16.496] 0L) { [13:31:16.496] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.496] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.496] base::options(opts) [13:31:16.496] } [13:31:16.496] { [13:31:16.496] NULL [13:31:16.496] options(future.plan = NULL) [13:31:16.496] if (is.na(NA_character_)) [13:31:16.496] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.496] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.496] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.496] .init = FALSE) [13:31:16.496] } [13:31:16.496] } [13:31:16.496] } [13:31:16.496] }) [13:31:16.496] if (TRUE) { [13:31:16.496] base::sink(type = "output", split = FALSE) [13:31:16.496] if (TRUE) { [13:31:16.496] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.496] } [13:31:16.496] else { [13:31:16.496] ...future.result["stdout"] <- base::list(NULL) [13:31:16.496] } [13:31:16.496] base::close(...future.stdout) [13:31:16.496] ...future.stdout <- NULL [13:31:16.496] } [13:31:16.496] ...future.result$conditions <- ...future.conditions [13:31:16.496] ...future.result$finished <- base::Sys.time() [13:31:16.496] ...future.result [13:31:16.496] } [13:31:16.500] - Launch lazy future ... done [13:31:16.501] run() for 'MiraiFuture' ... done [13:31:16.501] Created future: [13:31:16.502] resolved() for 'MiraiFuture' ... [13:31:16.502] - state: 'running' [13:31:16.502] - run: TRUE [13:31:16.503] - result: 'NULL' [13:31:16.503] - resolved: FALSE [13:31:16.503] resolved() for 'MiraiFuture' ... done [13:31:16.501] MiraiFuture: [13:31:16.501] Label: 'future_lapply-3' [13:31:16.501] Expression: [13:31:16.501] { [13:31:16.501] do.call(function(...) { [13:31:16.501] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.501] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.501] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.501] on.exit(options(oopts), add = TRUE) [13:31:16.501] } [13:31:16.501] { [13:31:16.501] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.501] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.501] ...future.FUN(...future.X_jj, ...) [13:31:16.501] }) [13:31:16.501] } [13:31:16.501] }, args = future.call.arguments) [13:31:16.501] } [13:31:16.501] Lazy evaluation: FALSE [13:31:16.501] Asynchronous evaluation: TRUE [13:31:16.501] Local evaluation: TRUE [13:31:16.501] Environment: R_GlobalEnv [13:31:16.501] Capture standard output: TRUE [13:31:16.501] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.501] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.501] Packages: [13:31:16.501] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.501] Resolved: TRUE [13:31:16.501] Value: [13:31:16.501] Conditions captured: [13:31:16.501] Early signaling: FALSE [13:31:16.501] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.501] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.503] Chunk #3 of 3 ... DONE [13:31:16.504] Launching 3 futures (chunks) ... DONE [13:31:16.504] Resolving 3 futures (chunks) ... [13:31:16.504] resolve() on list ... [13:31:16.504] recursive: 0 [13:31:16.504] length: 3 [13:31:16.504] [13:31:16.505] resolved() for 'MiraiFuture' ... [13:31:16.505] - state: 'running' [13:31:16.505] - run: TRUE [13:31:16.505] - result: 'NULL' [13:31:16.505] - resolved: FALSE [13:31:16.505] resolved() for 'MiraiFuture' ... done [13:31:16.506] Future #1 [13:31:16.506] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:16.506] - nx: 3 [13:31:16.506] - relay: TRUE [13:31:16.506] - stdout: TRUE [13:31:16.507] - signal: TRUE [13:31:16.507] - resignal: FALSE [13:31:16.507] - force: TRUE [13:31:16.507] - relayed: [n=3] FALSE, FALSE, FALSE [13:31:16.507] - queued futures: [n=3] FALSE, FALSE, FALSE [13:31:16.507] - until=1 [13:31:16.507] - relaying element #1 [13:31:16.508] - relayed: [n=3] TRUE, FALSE, FALSE [13:31:16.508] - queued futures: [n=3] TRUE, FALSE, FALSE [13:31:16.508] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:16.508] length: 2 (resolved future 1) [13:31:16.509] resolved() for 'MiraiFuture' ... [13:31:16.509] - state: 'running' [13:31:16.509] - run: TRUE [13:31:16.509] - result: 'NULL' [13:31:16.509] - resolved: FALSE [13:31:16.509] resolved() for 'MiraiFuture' ... done [13:31:16.510] Future #2 [13:31:16.510] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:16.510] - nx: 3 [13:31:16.510] - relay: TRUE [13:31:16.510] - stdout: TRUE [13:31:16.510] - signal: TRUE [13:31:16.511] - resignal: FALSE [13:31:16.511] - force: TRUE [13:31:16.511] - relayed: [n=3] TRUE, FALSE, FALSE [13:31:16.511] - queued futures: [n=3] TRUE, FALSE, FALSE [13:31:16.511] - until=2 [13:31:16.511] - relaying element #2 [13:31:16.512] - relayed: [n=3] TRUE, TRUE, FALSE [13:31:16.512] - queued futures: [n=3] TRUE, TRUE, FALSE [13:31:16.512] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:16.512] length: 1 (resolved future 2) [13:31:16.512] resolved() for 'MiraiFuture' ... [13:31:16.512] - state: 'running' [13:31:16.513] - run: TRUE [13:31:16.513] - result: 'NULL' [13:31:16.513] - resolved: FALSE [13:31:16.513] resolved() for 'MiraiFuture' ... done [13:31:16.513] Future #3 [13:31:16.514] signalConditionsASAP(MiraiFuture, pos=3) ... [13:31:16.514] - nx: 3 [13:31:16.514] - relay: TRUE [13:31:16.514] - stdout: TRUE [13:31:16.514] - signal: TRUE [13:31:16.514] - resignal: FALSE [13:31:16.514] - force: TRUE [13:31:16.515] - relayed: [n=3] TRUE, TRUE, FALSE [13:31:16.515] - queued futures: [n=3] TRUE, TRUE, FALSE [13:31:16.515] - until=3 [13:31:16.515] - relaying element #3 [13:31:16.515] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:16.515] - queued futures: [n=3] TRUE, TRUE, TRUE [13:31:16.516] signalConditionsASAP(MiraiFuture, pos=3) ... done [13:31:16.516] length: 0 (resolved future 3) [13:31:16.516] Relaying remaining futures [13:31:16.516] signalConditionsASAP(NULL, pos=0) ... [13:31:16.516] - nx: 3 [13:31:16.516] - relay: TRUE [13:31:16.517] - stdout: TRUE [13:31:16.517] - signal: TRUE [13:31:16.517] - resignal: FALSE [13:31:16.517] - force: TRUE [13:31:16.517] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:16.517] - queued futures: [n=3] TRUE, TRUE, TRUE - flush all [13:31:16.517] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:16.518] - queued futures: [n=3] TRUE, TRUE, TRUE [13:31:16.518] signalConditionsASAP(NULL, pos=0) ... done [13:31:16.518] resolve() on list ... DONE [13:31:16.518] - Number of value chunks collected: 3 [13:31:16.518] Resolving 3 futures (chunks) ... DONE [13:31:16.519] Reducing values from 3 chunks ... [13:31:16.519] - Number of values collected after concatenation: 3 [13:31:16.519] - Number of values expected: 3 [13:31:16.519] Reducing values from 3 chunks ... DONE [13:31:16.519] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:31:16.521] future_lapply() ... [13:31:16.522] Number of chunks: 2 [13:31:16.522] getGlobalsAndPackagesXApply() ... [13:31:16.523] - future.globals: TRUE [13:31:16.523] getGlobalsAndPackages() ... [13:31:16.523] Searching for globals... [13:31:16.524] - globals found: [2] 'FUN', '.Internal' [13:31:16.525] Searching for globals ... DONE [13:31:16.525] Resolving globals: FALSE [13:31:16.525] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:31:16.526] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:31:16.526] - globals: [1] 'FUN' [13:31:16.527] [13:31:16.527] getGlobalsAndPackages() ... DONE [13:31:16.527] - globals found/used: [n=1] 'FUN' [13:31:16.527] - needed namespaces: [n=0] [13:31:16.527] Finding globals ... DONE [13:31:16.527] - use_args: TRUE [13:31:16.528] - Getting '...' globals ... [13:31:16.528] resolve() on list ... [13:31:16.528] recursive: 0 [13:31:16.528] length: 1 [13:31:16.528] elements: '...' [13:31:16.529] length: 0 (resolved future 1) [13:31:16.529] resolve() on list ... DONE [13:31:16.529] - '...' content: [n=1] 'length' [13:31:16.529] List of 1 [13:31:16.529] $ ...:List of 1 [13:31:16.529] ..$ length: int 2 [13:31:16.529] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.529] - attr(*, "where")=List of 1 [13:31:16.529] ..$ ...: [13:31:16.529] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.529] - attr(*, "resolved")= logi TRUE [13:31:16.529] - attr(*, "total_size")= num NA [13:31:16.532] - Getting '...' globals ... DONE [13:31:16.533] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:16.533] List of 2 [13:31:16.533] $ ...future.FUN:function (mode = "logical", length = 0L) [13:31:16.533] $ ... :List of 1 [13:31:16.533] ..$ length: int 2 [13:31:16.533] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.533] - attr(*, "where")=List of 2 [13:31:16.533] ..$ ...future.FUN: [13:31:16.533] ..$ ... : [13:31:16.533] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.533] - attr(*, "resolved")= logi FALSE [13:31:16.533] - attr(*, "total_size")= num 2240 [13:31:16.536] Packages to be attached in all futures: [n=0] [13:31:16.537] getGlobalsAndPackagesXApply() ... DONE [13:31:16.537] Number of futures (= number of chunks): 2 [13:31:16.537] Launching 2 futures (chunks) ... [13:31:16.537] Chunk #1 of 2 ... [13:31:16.537] - Finding globals in 'X' for chunk #1 ... [13:31:16.538] getGlobalsAndPackages() ... [13:31:16.538] Searching for globals... [13:31:16.538] [13:31:16.538] Searching for globals ... DONE [13:31:16.538] - globals: [0] [13:31:16.539] getGlobalsAndPackages() ... DONE [13:31:16.539] + additional globals found: [n=0] [13:31:16.539] + additional namespaces needed: [n=0] [13:31:16.539] - Finding globals in 'X' for chunk #1 ... DONE [13:31:16.539] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:16.539] - seeds: [13:31:16.539] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.540] getGlobalsAndPackages() ... [13:31:16.540] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.540] Resolving globals: FALSE [13:31:16.540] Tweak future expression to call with '...' arguments ... [13:31:16.540] { [13:31:16.540] do.call(function(...) { [13:31:16.540] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.540] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.540] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.540] on.exit(options(oopts), add = TRUE) [13:31:16.540] } [13:31:16.540] { [13:31:16.540] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.540] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.540] ...future.FUN(...future.X_jj, ...) [13:31:16.540] }) [13:31:16.540] } [13:31:16.540] }, args = future.call.arguments) [13:31:16.540] } [13:31:16.541] Tweak future expression to call with '...' arguments ... DONE [13:31:16.541] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.541] [13:31:16.542] getGlobalsAndPackages() ... DONE [13:31:16.542] run() for 'Future' ... [13:31:16.542] - state: 'created' [13:31:16.542] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.545] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.545] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.545] - Field: 'label' [13:31:16.545] - Field: 'local' [13:31:16.545] - Field: 'owner' [13:31:16.545] - Field: 'envir' [13:31:16.546] - Field: 'packages' [13:31:16.546] - Field: 'gc' [13:31:16.546] - Field: 'conditions' [13:31:16.546] - Field: 'expr' [13:31:16.546] - Field: 'uuid' [13:31:16.546] - Field: 'seed' [13:31:16.547] - Field: 'version' [13:31:16.547] - Field: 'result' [13:31:16.547] - Field: 'asynchronous' [13:31:16.547] - Field: 'calls' [13:31:16.547] - Field: 'globals' [13:31:16.547] - Field: 'stdout' [13:31:16.548] - Field: 'earlySignal' [13:31:16.548] - Field: 'lazy' [13:31:16.548] - Field: 'state' [13:31:16.548] - Field: '.cluster' [13:31:16.548] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.548] - Launch lazy future ... [13:31:16.549] Packages needed by the future expression (n = 0): [13:31:16.549] Packages needed by future strategies (n = 0): [13:31:16.550] { [13:31:16.550] { [13:31:16.550] { [13:31:16.550] ...future.startTime <- base::Sys.time() [13:31:16.550] { [13:31:16.550] { [13:31:16.550] { [13:31:16.550] base::local({ [13:31:16.550] has_future <- base::requireNamespace("future", [13:31:16.550] quietly = TRUE) [13:31:16.550] if (has_future) { [13:31:16.550] ns <- base::getNamespace("future") [13:31:16.550] version <- ns[[".package"]][["version"]] [13:31:16.550] if (is.null(version)) [13:31:16.550] version <- utils::packageVersion("future") [13:31:16.550] } [13:31:16.550] else { [13:31:16.550] version <- NULL [13:31:16.550] } [13:31:16.550] if (!has_future || version < "1.8.0") { [13:31:16.550] info <- base::c(r_version = base::gsub("R version ", [13:31:16.550] "", base::R.version$version.string), [13:31:16.550] platform = base::sprintf("%s (%s-bit)", [13:31:16.550] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.550] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.550] "release", "version")], collapse = " "), [13:31:16.550] hostname = base::Sys.info()[["nodename"]]) [13:31:16.550] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.550] info) [13:31:16.550] info <- base::paste(info, collapse = "; ") [13:31:16.550] if (!has_future) { [13:31:16.550] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.550] info) [13:31:16.550] } [13:31:16.550] else { [13:31:16.550] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.550] info, version) [13:31:16.550] } [13:31:16.550] base::stop(msg) [13:31:16.550] } [13:31:16.550] }) [13:31:16.550] } [13:31:16.550] ...future.strategy.old <- future::plan("list") [13:31:16.550] options(future.plan = NULL) [13:31:16.550] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.550] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.550] } [13:31:16.550] ...future.workdir <- getwd() [13:31:16.550] } [13:31:16.550] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.550] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.550] } [13:31:16.550] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.550] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:16.550] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.550] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.550] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.550] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.550] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.550] base::names(...future.oldOptions)) [13:31:16.550] } [13:31:16.550] if (FALSE) { [13:31:16.550] } [13:31:16.550] else { [13:31:16.550] if (TRUE) { [13:31:16.550] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.550] open = "w") [13:31:16.550] } [13:31:16.550] else { [13:31:16.550] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.550] windows = "NUL", "/dev/null"), open = "w") [13:31:16.550] } [13:31:16.550] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.550] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.550] base::sink(type = "output", split = FALSE) [13:31:16.550] base::close(...future.stdout) [13:31:16.550] }, add = TRUE) [13:31:16.550] } [13:31:16.550] ...future.frame <- base::sys.nframe() [13:31:16.550] ...future.conditions <- base::list() [13:31:16.550] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.550] if (FALSE) { [13:31:16.550] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.550] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.550] } [13:31:16.550] ...future.result <- base::tryCatch({ [13:31:16.550] base::withCallingHandlers({ [13:31:16.550] ...future.value <- base::withVisible(base::local({ [13:31:16.550] do.call(function(...) { [13:31:16.550] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.550] if (!identical(...future.globals.maxSize.org, [13:31:16.550] ...future.globals.maxSize)) { [13:31:16.550] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.550] on.exit(options(oopts), add = TRUE) [13:31:16.550] } [13:31:16.550] { [13:31:16.550] lapply(seq_along(...future.elements_ii), [13:31:16.550] FUN = function(jj) { [13:31:16.550] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.550] ...future.FUN(...future.X_jj, ...) [13:31:16.550] }) [13:31:16.550] } [13:31:16.550] }, args = future.call.arguments) [13:31:16.550] })) [13:31:16.550] future::FutureResult(value = ...future.value$value, [13:31:16.550] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.550] ...future.rng), globalenv = if (FALSE) [13:31:16.550] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.550] ...future.globalenv.names)) [13:31:16.550] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.550] }, condition = base::local({ [13:31:16.550] c <- base::c [13:31:16.550] inherits <- base::inherits [13:31:16.550] invokeRestart <- base::invokeRestart [13:31:16.550] length <- base::length [13:31:16.550] list <- base::list [13:31:16.550] seq.int <- base::seq.int [13:31:16.550] signalCondition <- base::signalCondition [13:31:16.550] sys.calls <- base::sys.calls [13:31:16.550] `[[` <- base::`[[` [13:31:16.550] `+` <- base::`+` [13:31:16.550] `<<-` <- base::`<<-` [13:31:16.550] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.550] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.550] 3L)] [13:31:16.550] } [13:31:16.550] function(cond) { [13:31:16.550] is_error <- inherits(cond, "error") [13:31:16.550] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.550] NULL) [13:31:16.550] if (is_error) { [13:31:16.550] sessionInformation <- function() { [13:31:16.550] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.550] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.550] search = base::search(), system = base::Sys.info()) [13:31:16.550] } [13:31:16.550] ...future.conditions[[length(...future.conditions) + [13:31:16.550] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.550] cond$call), session = sessionInformation(), [13:31:16.550] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.550] signalCondition(cond) [13:31:16.550] } [13:31:16.550] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.550] signal <- FALSE && inherits(cond, character(0)) [13:31:16.550] ...future.conditions[[length(...future.conditions) + [13:31:16.550] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.550] if (FALSE && !signal) { [13:31:16.550] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.550] { [13:31:16.550] inherits <- base::inherits [13:31:16.550] invokeRestart <- base::invokeRestart [13:31:16.550] is.null <- base::is.null [13:31:16.550] muffled <- FALSE [13:31:16.550] if (inherits(cond, "message")) { [13:31:16.550] muffled <- grepl(pattern, "muffleMessage") [13:31:16.550] if (muffled) [13:31:16.550] invokeRestart("muffleMessage") [13:31:16.550] } [13:31:16.550] else if (inherits(cond, "warning")) { [13:31:16.550] muffled <- grepl(pattern, "muffleWarning") [13:31:16.550] if (muffled) [13:31:16.550] invokeRestart("muffleWarning") [13:31:16.550] } [13:31:16.550] else if (inherits(cond, "condition")) { [13:31:16.550] if (!is.null(pattern)) { [13:31:16.550] computeRestarts <- base::computeRestarts [13:31:16.550] grepl <- base::grepl [13:31:16.550] restarts <- computeRestarts(cond) [13:31:16.550] for (restart in restarts) { [13:31:16.550] name <- restart$name [13:31:16.550] if (is.null(name)) [13:31:16.550] next [13:31:16.550] if (!grepl(pattern, name)) [13:31:16.550] next [13:31:16.550] invokeRestart(restart) [13:31:16.550] muffled <- TRUE [13:31:16.550] break [13:31:16.550] } [13:31:16.550] } [13:31:16.550] } [13:31:16.550] invisible(muffled) [13:31:16.550] } [13:31:16.550] muffleCondition(cond, pattern = "^muffle") [13:31:16.550] } [13:31:16.550] } [13:31:16.550] else { [13:31:16.550] if (TRUE) { [13:31:16.550] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.550] { [13:31:16.550] inherits <- base::inherits [13:31:16.550] invokeRestart <- base::invokeRestart [13:31:16.550] is.null <- base::is.null [13:31:16.550] muffled <- FALSE [13:31:16.550] if (inherits(cond, "message")) { [13:31:16.550] muffled <- grepl(pattern, "muffleMessage") [13:31:16.550] if (muffled) [13:31:16.550] invokeRestart("muffleMessage") [13:31:16.550] } [13:31:16.550] else if (inherits(cond, "warning")) { [13:31:16.550] muffled <- grepl(pattern, "muffleWarning") [13:31:16.550] if (muffled) [13:31:16.550] invokeRestart("muffleWarning") [13:31:16.550] } [13:31:16.550] else if (inherits(cond, "condition")) { [13:31:16.550] if (!is.null(pattern)) { [13:31:16.550] computeRestarts <- base::computeRestarts [13:31:16.550] grepl <- base::grepl [13:31:16.550] restarts <- computeRestarts(cond) [13:31:16.550] for (restart in restarts) { [13:31:16.550] name <- restart$name [13:31:16.550] if (is.null(name)) [13:31:16.550] next [13:31:16.550] if (!grepl(pattern, name)) [13:31:16.550] next [13:31:16.550] invokeRestart(restart) [13:31:16.550] muffled <- TRUE [13:31:16.550] break [13:31:16.550] } [13:31:16.550] } [13:31:16.550] } [13:31:16.550] invisible(muffled) [13:31:16.550] } [13:31:16.550] muffleCondition(cond, pattern = "^muffle") [13:31:16.550] } [13:31:16.550] } [13:31:16.550] } [13:31:16.550] })) [13:31:16.550] }, error = function(ex) { [13:31:16.550] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.550] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.550] ...future.rng), started = ...future.startTime, [13:31:16.550] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.550] version = "1.8"), class = "FutureResult") [13:31:16.550] }, finally = { [13:31:16.550] if (!identical(...future.workdir, getwd())) [13:31:16.550] setwd(...future.workdir) [13:31:16.550] { [13:31:16.550] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.550] ...future.oldOptions$nwarnings <- NULL [13:31:16.550] } [13:31:16.550] base::options(...future.oldOptions) [13:31:16.550] if (.Platform$OS.type == "windows") { [13:31:16.550] old_names <- names(...future.oldEnvVars) [13:31:16.550] envs <- base::Sys.getenv() [13:31:16.550] names <- names(envs) [13:31:16.550] common <- intersect(names, old_names) [13:31:16.550] added <- setdiff(names, old_names) [13:31:16.550] removed <- setdiff(old_names, names) [13:31:16.550] changed <- common[...future.oldEnvVars[common] != [13:31:16.550] envs[common]] [13:31:16.550] NAMES <- toupper(changed) [13:31:16.550] args <- list() [13:31:16.550] for (kk in seq_along(NAMES)) { [13:31:16.550] name <- changed[[kk]] [13:31:16.550] NAME <- NAMES[[kk]] [13:31:16.550] if (name != NAME && is.element(NAME, old_names)) [13:31:16.550] next [13:31:16.550] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.550] } [13:31:16.550] NAMES <- toupper(added) [13:31:16.550] for (kk in seq_along(NAMES)) { [13:31:16.550] name <- added[[kk]] [13:31:16.550] NAME <- NAMES[[kk]] [13:31:16.550] if (name != NAME && is.element(NAME, old_names)) [13:31:16.550] next [13:31:16.550] args[[name]] <- "" [13:31:16.550] } [13:31:16.550] NAMES <- toupper(removed) [13:31:16.550] for (kk in seq_along(NAMES)) { [13:31:16.550] name <- removed[[kk]] [13:31:16.550] NAME <- NAMES[[kk]] [13:31:16.550] if (name != NAME && is.element(NAME, old_names)) [13:31:16.550] next [13:31:16.550] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.550] } [13:31:16.550] if (length(args) > 0) [13:31:16.550] base::do.call(base::Sys.setenv, args = args) [13:31:16.550] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.550] } [13:31:16.550] else { [13:31:16.550] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.550] } [13:31:16.550] { [13:31:16.550] if (base::length(...future.futureOptionsAdded) > [13:31:16.550] 0L) { [13:31:16.550] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.550] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.550] base::options(opts) [13:31:16.550] } [13:31:16.550] { [13:31:16.550] NULL [13:31:16.550] options(future.plan = NULL) [13:31:16.550] if (is.na(NA_character_)) [13:31:16.550] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.550] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.550] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.550] .init = FALSE) [13:31:16.550] } [13:31:16.550] } [13:31:16.550] } [13:31:16.550] }) [13:31:16.550] if (TRUE) { [13:31:16.550] base::sink(type = "output", split = FALSE) [13:31:16.550] if (TRUE) { [13:31:16.550] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.550] } [13:31:16.550] else { [13:31:16.550] ...future.result["stdout"] <- base::list(NULL) [13:31:16.550] } [13:31:16.550] base::close(...future.stdout) [13:31:16.550] ...future.stdout <- NULL [13:31:16.550] } [13:31:16.550] ...future.result$conditions <- ...future.conditions [13:31:16.550] ...future.result$finished <- base::Sys.time() [13:31:16.550] ...future.result [13:31:16.550] } [13:31:16.554] - Launch lazy future ... done [13:31:16.554] run() for 'MiraiFuture' ... done [13:31:16.555] Created future: [13:31:16.556] resolved() for 'MiraiFuture' ... [13:31:16.556] - state: 'running' [13:31:16.556] - run: TRUE [13:31:16.556] - result: 'NULL' [13:31:16.556] - resolved: FALSE [13:31:16.557] resolved() for 'MiraiFuture' ... done [13:31:16.555] MiraiFuture: [13:31:16.555] Label: 'future_lapply-1' [13:31:16.555] Expression: [13:31:16.555] { [13:31:16.555] do.call(function(...) { [13:31:16.555] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.555] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.555] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.555] on.exit(options(oopts), add = TRUE) [13:31:16.555] } [13:31:16.555] { [13:31:16.555] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.555] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.555] ...future.FUN(...future.X_jj, ...) [13:31:16.555] }) [13:31:16.555] } [13:31:16.555] }, args = future.call.arguments) [13:31:16.555] } [13:31:16.555] Lazy evaluation: FALSE [13:31:16.555] Asynchronous evaluation: TRUE [13:31:16.555] Local evaluation: TRUE [13:31:16.555] Environment: R_GlobalEnv [13:31:16.555] Capture standard output: TRUE [13:31:16.555] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.555] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.555] Packages: [13:31:16.555] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.555] Resolved: TRUE [13:31:16.555] Value: [13:31:16.555] Conditions captured: [13:31:16.555] Early signaling: FALSE [13:31:16.555] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.555] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.557] Chunk #1 of 2 ... DONE [13:31:16.557] Chunk #2 of 2 ... [13:31:16.557] - Finding globals in 'X' for chunk #2 ... [13:31:16.558] getGlobalsAndPackages() ... [13:31:16.558] Searching for globals... [13:31:16.558] [13:31:16.558] Searching for globals ... DONE [13:31:16.558] - globals: [0] [13:31:16.559] getGlobalsAndPackages() ... DONE [13:31:16.559] + additional globals found: [n=0] [13:31:16.559] + additional namespaces needed: [n=0] [13:31:16.559] - Finding globals in 'X' for chunk #2 ... DONE [13:31:16.559] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:16.559] - seeds: [13:31:16.560] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.560] getGlobalsAndPackages() ... [13:31:16.560] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.560] Resolving globals: FALSE [13:31:16.560] Tweak future expression to call with '...' arguments ... [13:31:16.560] { [13:31:16.560] do.call(function(...) { [13:31:16.560] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.560] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.560] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.560] on.exit(options(oopts), add = TRUE) [13:31:16.560] } [13:31:16.560] { [13:31:16.560] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.560] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.560] ...future.FUN(...future.X_jj, ...) [13:31:16.560] }) [13:31:16.560] } [13:31:16.560] }, args = future.call.arguments) [13:31:16.560] } [13:31:16.561] Tweak future expression to call with '...' arguments ... DONE [13:31:16.561] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.561] [13:31:16.562] getGlobalsAndPackages() ... DONE [13:31:16.562] run() for 'Future' ... [13:31:16.562] - state: 'created' [13:31:16.562] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.565] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.565] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.565] - Field: 'label' [13:31:16.565] - Field: 'local' [13:31:16.565] - Field: 'owner' [13:31:16.565] - Field: 'envir' [13:31:16.566] - Field: 'packages' [13:31:16.566] - Field: 'gc' [13:31:16.566] - Field: 'conditions' [13:31:16.566] - Field: 'expr' [13:31:16.566] - Field: 'uuid' [13:31:16.566] - Field: 'seed' [13:31:16.567] - Field: 'version' [13:31:16.567] - Field: 'result' [13:31:16.567] - Field: 'asynchronous' [13:31:16.567] - Field: 'calls' [13:31:16.567] - Field: 'globals' [13:31:16.567] - Field: 'stdout' [13:31:16.568] - Field: 'earlySignal' [13:31:16.568] - Field: 'lazy' [13:31:16.568] - Field: 'state' [13:31:16.568] - Field: '.cluster' [13:31:16.568] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.568] - Launch lazy future ... [13:31:16.569] Packages needed by the future expression (n = 0): [13:31:16.569] Packages needed by future strategies (n = 0): [13:31:16.569] { [13:31:16.569] { [13:31:16.569] { [13:31:16.569] ...future.startTime <- base::Sys.time() [13:31:16.569] { [13:31:16.569] { [13:31:16.569] { [13:31:16.569] base::local({ [13:31:16.569] has_future <- base::requireNamespace("future", [13:31:16.569] quietly = TRUE) [13:31:16.569] if (has_future) { [13:31:16.569] ns <- base::getNamespace("future") [13:31:16.569] version <- ns[[".package"]][["version"]] [13:31:16.569] if (is.null(version)) [13:31:16.569] version <- utils::packageVersion("future") [13:31:16.569] } [13:31:16.569] else { [13:31:16.569] version <- NULL [13:31:16.569] } [13:31:16.569] if (!has_future || version < "1.8.0") { [13:31:16.569] info <- base::c(r_version = base::gsub("R version ", [13:31:16.569] "", base::R.version$version.string), [13:31:16.569] platform = base::sprintf("%s (%s-bit)", [13:31:16.569] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.569] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.569] "release", "version")], collapse = " "), [13:31:16.569] hostname = base::Sys.info()[["nodename"]]) [13:31:16.569] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.569] info) [13:31:16.569] info <- base::paste(info, collapse = "; ") [13:31:16.569] if (!has_future) { [13:31:16.569] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.569] info) [13:31:16.569] } [13:31:16.569] else { [13:31:16.569] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.569] info, version) [13:31:16.569] } [13:31:16.569] base::stop(msg) [13:31:16.569] } [13:31:16.569] }) [13:31:16.569] } [13:31:16.569] ...future.strategy.old <- future::plan("list") [13:31:16.569] options(future.plan = NULL) [13:31:16.569] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.569] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.569] } [13:31:16.569] ...future.workdir <- getwd() [13:31:16.569] } [13:31:16.569] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.569] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.569] } [13:31:16.569] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.569] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:16.569] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.569] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.569] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.569] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.569] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.569] base::names(...future.oldOptions)) [13:31:16.569] } [13:31:16.569] if (FALSE) { [13:31:16.569] } [13:31:16.569] else { [13:31:16.569] if (TRUE) { [13:31:16.569] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.569] open = "w") [13:31:16.569] } [13:31:16.569] else { [13:31:16.569] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.569] windows = "NUL", "/dev/null"), open = "w") [13:31:16.569] } [13:31:16.569] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.569] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.569] base::sink(type = "output", split = FALSE) [13:31:16.569] base::close(...future.stdout) [13:31:16.569] }, add = TRUE) [13:31:16.569] } [13:31:16.569] ...future.frame <- base::sys.nframe() [13:31:16.569] ...future.conditions <- base::list() [13:31:16.569] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.569] if (FALSE) { [13:31:16.569] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.569] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.569] } [13:31:16.569] ...future.result <- base::tryCatch({ [13:31:16.569] base::withCallingHandlers({ [13:31:16.569] ...future.value <- base::withVisible(base::local({ [13:31:16.569] do.call(function(...) { [13:31:16.569] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.569] if (!identical(...future.globals.maxSize.org, [13:31:16.569] ...future.globals.maxSize)) { [13:31:16.569] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.569] on.exit(options(oopts), add = TRUE) [13:31:16.569] } [13:31:16.569] { [13:31:16.569] lapply(seq_along(...future.elements_ii), [13:31:16.569] FUN = function(jj) { [13:31:16.569] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.569] ...future.FUN(...future.X_jj, ...) [13:31:16.569] }) [13:31:16.569] } [13:31:16.569] }, args = future.call.arguments) [13:31:16.569] })) [13:31:16.569] future::FutureResult(value = ...future.value$value, [13:31:16.569] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.569] ...future.rng), globalenv = if (FALSE) [13:31:16.569] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.569] ...future.globalenv.names)) [13:31:16.569] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.569] }, condition = base::local({ [13:31:16.569] c <- base::c [13:31:16.569] inherits <- base::inherits [13:31:16.569] invokeRestart <- base::invokeRestart [13:31:16.569] length <- base::length [13:31:16.569] list <- base::list [13:31:16.569] seq.int <- base::seq.int [13:31:16.569] signalCondition <- base::signalCondition [13:31:16.569] sys.calls <- base::sys.calls [13:31:16.569] `[[` <- base::`[[` [13:31:16.569] `+` <- base::`+` [13:31:16.569] `<<-` <- base::`<<-` [13:31:16.569] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.569] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.569] 3L)] [13:31:16.569] } [13:31:16.569] function(cond) { [13:31:16.569] is_error <- inherits(cond, "error") [13:31:16.569] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.569] NULL) [13:31:16.569] if (is_error) { [13:31:16.569] sessionInformation <- function() { [13:31:16.569] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.569] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.569] search = base::search(), system = base::Sys.info()) [13:31:16.569] } [13:31:16.569] ...future.conditions[[length(...future.conditions) + [13:31:16.569] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.569] cond$call), session = sessionInformation(), [13:31:16.569] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.569] signalCondition(cond) [13:31:16.569] } [13:31:16.569] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.569] signal <- FALSE && inherits(cond, character(0)) [13:31:16.569] ...future.conditions[[length(...future.conditions) + [13:31:16.569] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.569] if (FALSE && !signal) { [13:31:16.569] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.569] { [13:31:16.569] inherits <- base::inherits [13:31:16.569] invokeRestart <- base::invokeRestart [13:31:16.569] is.null <- base::is.null [13:31:16.569] muffled <- FALSE [13:31:16.569] if (inherits(cond, "message")) { [13:31:16.569] muffled <- grepl(pattern, "muffleMessage") [13:31:16.569] if (muffled) [13:31:16.569] invokeRestart("muffleMessage") [13:31:16.569] } [13:31:16.569] else if (inherits(cond, "warning")) { [13:31:16.569] muffled <- grepl(pattern, "muffleWarning") [13:31:16.569] if (muffled) [13:31:16.569] invokeRestart("muffleWarning") [13:31:16.569] } [13:31:16.569] else if (inherits(cond, "condition")) { [13:31:16.569] if (!is.null(pattern)) { [13:31:16.569] computeRestarts <- base::computeRestarts [13:31:16.569] grepl <- base::grepl [13:31:16.569] restarts <- computeRestarts(cond) [13:31:16.569] for (restart in restarts) { [13:31:16.569] name <- restart$name [13:31:16.569] if (is.null(name)) [13:31:16.569] next [13:31:16.569] if (!grepl(pattern, name)) [13:31:16.569] next [13:31:16.569] invokeRestart(restart) [13:31:16.569] muffled <- TRUE [13:31:16.569] break [13:31:16.569] } [13:31:16.569] } [13:31:16.569] } [13:31:16.569] invisible(muffled) [13:31:16.569] } [13:31:16.569] muffleCondition(cond, pattern = "^muffle") [13:31:16.569] } [13:31:16.569] } [13:31:16.569] else { [13:31:16.569] if (TRUE) { [13:31:16.569] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.569] { [13:31:16.569] inherits <- base::inherits [13:31:16.569] invokeRestart <- base::invokeRestart [13:31:16.569] is.null <- base::is.null [13:31:16.569] muffled <- FALSE [13:31:16.569] if (inherits(cond, "message")) { [13:31:16.569] muffled <- grepl(pattern, "muffleMessage") [13:31:16.569] if (muffled) [13:31:16.569] invokeRestart("muffleMessage") [13:31:16.569] } [13:31:16.569] else if (inherits(cond, "warning")) { [13:31:16.569] muffled <- grepl(pattern, "muffleWarning") [13:31:16.569] if (muffled) [13:31:16.569] invokeRestart("muffleWarning") [13:31:16.569] } [13:31:16.569] else if (inherits(cond, "condition")) { [13:31:16.569] if (!is.null(pattern)) { [13:31:16.569] computeRestarts <- base::computeRestarts [13:31:16.569] grepl <- base::grepl [13:31:16.569] restarts <- computeRestarts(cond) [13:31:16.569] for (restart in restarts) { [13:31:16.569] name <- restart$name [13:31:16.569] if (is.null(name)) [13:31:16.569] next [13:31:16.569] if (!grepl(pattern, name)) [13:31:16.569] next [13:31:16.569] invokeRestart(restart) [13:31:16.569] muffled <- TRUE [13:31:16.569] break [13:31:16.569] } [13:31:16.569] } [13:31:16.569] } [13:31:16.569] invisible(muffled) [13:31:16.569] } [13:31:16.569] muffleCondition(cond, pattern = "^muffle") [13:31:16.569] } [13:31:16.569] } [13:31:16.569] } [13:31:16.569] })) [13:31:16.569] }, error = function(ex) { [13:31:16.569] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.569] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.569] ...future.rng), started = ...future.startTime, [13:31:16.569] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.569] version = "1.8"), class = "FutureResult") [13:31:16.569] }, finally = { [13:31:16.569] if (!identical(...future.workdir, getwd())) [13:31:16.569] setwd(...future.workdir) [13:31:16.569] { [13:31:16.569] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.569] ...future.oldOptions$nwarnings <- NULL [13:31:16.569] } [13:31:16.569] base::options(...future.oldOptions) [13:31:16.569] if (.Platform$OS.type == "windows") { [13:31:16.569] old_names <- names(...future.oldEnvVars) [13:31:16.569] envs <- base::Sys.getenv() [13:31:16.569] names <- names(envs) [13:31:16.569] common <- intersect(names, old_names) [13:31:16.569] added <- setdiff(names, old_names) [13:31:16.569] removed <- setdiff(old_names, names) [13:31:16.569] changed <- common[...future.oldEnvVars[common] != [13:31:16.569] envs[common]] [13:31:16.569] NAMES <- toupper(changed) [13:31:16.569] args <- list() [13:31:16.569] for (kk in seq_along(NAMES)) { [13:31:16.569] name <- changed[[kk]] [13:31:16.569] NAME <- NAMES[[kk]] [13:31:16.569] if (name != NAME && is.element(NAME, old_names)) [13:31:16.569] next [13:31:16.569] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.569] } [13:31:16.569] NAMES <- toupper(added) [13:31:16.569] for (kk in seq_along(NAMES)) { [13:31:16.569] name <- added[[kk]] [13:31:16.569] NAME <- NAMES[[kk]] [13:31:16.569] if (name != NAME && is.element(NAME, old_names)) [13:31:16.569] next [13:31:16.569] args[[name]] <- "" [13:31:16.569] } [13:31:16.569] NAMES <- toupper(removed) [13:31:16.569] for (kk in seq_along(NAMES)) { [13:31:16.569] name <- removed[[kk]] [13:31:16.569] NAME <- NAMES[[kk]] [13:31:16.569] if (name != NAME && is.element(NAME, old_names)) [13:31:16.569] next [13:31:16.569] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.569] } [13:31:16.569] if (length(args) > 0) [13:31:16.569] base::do.call(base::Sys.setenv, args = args) [13:31:16.569] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.569] } [13:31:16.569] else { [13:31:16.569] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.569] } [13:31:16.569] { [13:31:16.569] if (base::length(...future.futureOptionsAdded) > [13:31:16.569] 0L) { [13:31:16.569] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.569] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.569] base::options(opts) [13:31:16.569] } [13:31:16.569] { [13:31:16.569] NULL [13:31:16.569] options(future.plan = NULL) [13:31:16.569] if (is.na(NA_character_)) [13:31:16.569] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.569] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.569] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.569] .init = FALSE) [13:31:16.569] } [13:31:16.569] } [13:31:16.569] } [13:31:16.569] }) [13:31:16.569] if (TRUE) { [13:31:16.569] base::sink(type = "output", split = FALSE) [13:31:16.569] if (TRUE) { [13:31:16.569] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.569] } [13:31:16.569] else { [13:31:16.569] ...future.result["stdout"] <- base::list(NULL) [13:31:16.569] } [13:31:16.569] base::close(...future.stdout) [13:31:16.569] ...future.stdout <- NULL [13:31:16.569] } [13:31:16.569] ...future.result$conditions <- ...future.conditions [13:31:16.569] ...future.result$finished <- base::Sys.time() [13:31:16.569] ...future.result [13:31:16.569] } [13:31:16.573] - Launch lazy future ... done [13:31:16.574] run() for 'MiraiFuture' ... done [13:31:16.574] Created future: [13:31:16.575] resolved() for 'MiraiFuture' ... [13:31:16.575] - state: 'running' [13:31:16.575] - run: TRUE [13:31:16.575] - result: 'NULL' [13:31:16.576] - resolved: FALSE [13:31:16.576] resolved() for 'MiraiFuture' ... done [13:31:16.574] MiraiFuture: [13:31:16.574] Label: 'future_lapply-2' [13:31:16.574] Expression: [13:31:16.574] { [13:31:16.574] do.call(function(...) { [13:31:16.574] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.574] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.574] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.574] on.exit(options(oopts), add = TRUE) [13:31:16.574] } [13:31:16.574] { [13:31:16.574] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.574] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.574] ...future.FUN(...future.X_jj, ...) [13:31:16.574] }) [13:31:16.574] } [13:31:16.574] }, args = future.call.arguments) [13:31:16.574] } [13:31:16.574] Lazy evaluation: FALSE [13:31:16.574] Asynchronous evaluation: TRUE [13:31:16.574] Local evaluation: TRUE [13:31:16.574] Environment: R_GlobalEnv [13:31:16.574] Capture standard output: TRUE [13:31:16.574] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.574] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.574] Packages: [13:31:16.574] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.574] Resolved: TRUE [13:31:16.574] Value: [13:31:16.574] Conditions captured: [13:31:16.574] Early signaling: FALSE [13:31:16.574] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.574] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.576] Chunk #2 of 2 ... DONE [13:31:16.576] Launching 2 futures (chunks) ... DONE [13:31:16.577] Resolving 2 futures (chunks) ... [13:31:16.577] resolve() on list ... [13:31:16.577] recursive: 0 [13:31:16.577] length: 2 [13:31:16.577] [13:31:16.577] resolved() for 'MiraiFuture' ... [13:31:16.578] - state: 'running' [13:31:16.578] - run: TRUE [13:31:16.578] - result: 'NULL' [13:31:16.578] - resolved: FALSE [13:31:16.578] resolved() for 'MiraiFuture' ... done [13:31:16.578] Future #1 [13:31:16.579] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:16.579] - nx: 2 [13:31:16.579] - relay: TRUE [13:31:16.579] - stdout: TRUE [13:31:16.579] - signal: TRUE [13:31:16.579] - resignal: FALSE [13:31:16.580] - force: TRUE [13:31:16.580] - relayed: [n=2] FALSE, FALSE [13:31:16.580] - queued futures: [n=2] FALSE, FALSE [13:31:16.580] - until=1 [13:31:16.580] - relaying element #1 [13:31:16.580] - relayed: [n=2] TRUE, FALSE [13:31:16.581] - queued futures: [n=2] TRUE, FALSE [13:31:16.581] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:16.581] length: 1 (resolved future 1) [13:31:16.581] resolved() for 'MiraiFuture' ... [13:31:16.581] - state: 'running' [13:31:16.582] - run: TRUE [13:31:16.582] - result: 'NULL' [13:31:16.582] - resolved: FALSE [13:31:16.582] resolved() for 'MiraiFuture' ... done [13:31:16.582] Future #2 [13:31:16.582] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:16.583] - nx: 2 [13:31:16.583] - relay: TRUE [13:31:16.583] - stdout: TRUE [13:31:16.584] - signal: TRUE [13:31:16.584] - resignal: FALSE [13:31:16.584] - force: TRUE [13:31:16.584] - relayed: [n=2] TRUE, FALSE [13:31:16.585] - queued futures: [n=2] TRUE, FALSE [13:31:16.585] - until=2 [13:31:16.585] - relaying element #2 [13:31:16.585] - relayed: [n=2] TRUE, TRUE [13:31:16.585] - queued futures: [n=2] TRUE, TRUE [13:31:16.585] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:16.586] length: 0 (resolved future 2) [13:31:16.586] Relaying remaining futures [13:31:16.586] signalConditionsASAP(NULL, pos=0) ... [13:31:16.586] - nx: 2 [13:31:16.586] - relay: TRUE [13:31:16.586] - stdout: TRUE [13:31:16.587] - signal: TRUE [13:31:16.587] - resignal: FALSE [13:31:16.587] - force: TRUE [13:31:16.587] - relayed: [n=2] TRUE, TRUE [13:31:16.587] - queued futures: [n=2] TRUE, TRUE - flush all [13:31:16.587] - relayed: [n=2] TRUE, TRUE [13:31:16.588] - queued futures: [n=2] TRUE, TRUE [13:31:16.588] signalConditionsASAP(NULL, pos=0) ... done [13:31:16.588] resolve() on list ... DONE [13:31:16.588] - Number of value chunks collected: 2 [13:31:16.588] Resolving 2 futures (chunks) ... DONE [13:31:16.588] Reducing values from 2 chunks ... [13:31:16.589] - Number of values collected after concatenation: 3 [13:31:16.589] - Number of values expected: 3 [13:31:16.589] Reducing values from 2 chunks ... DONE [13:31:16.589] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... List of 1 $ x:List of 3 ..$ a: chr "integer" ..$ c: chr "character" ..$ c: chr "list" List of 1 $ y0:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:31:16.600] - plan('mirai_multisession') ...[13:31:16.600] plan(): Setting new future strategy stack: [13:31:16.600] List of future strategies: [13:31:16.600] 1. mirai_multisession: [13:31:16.600] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:16.600] - tweaked: FALSE [13:31:16.600] - call: plan(strategy) [13:31:16.600] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:16.601] < mirai | $data > [13:31:16.604] getGlobalsAndPackages() ... [13:31:16.604] Not searching for globals [13:31:16.604] - globals: [0] [13:31:16.604] getGlobalsAndPackages() ... DONE [13:31:16.604] getGlobalsAndPackages() ... [13:31:16.604] [13:31:16.605] - globals: [0] [13:31:16.605] getGlobalsAndPackages() ... DONE [13:31:16.605] Packages needed by the future expression (n = 0): [13:31:16.605] Packages needed by future strategies (n = 0): [13:31:16.606] { [13:31:16.606] { [13:31:16.606] { [13:31:16.606] ...future.startTime <- base::Sys.time() [13:31:16.606] { [13:31:16.606] { [13:31:16.606] { [13:31:16.606] base::local({ [13:31:16.606] has_future <- base::requireNamespace("future", [13:31:16.606] quietly = TRUE) [13:31:16.606] if (has_future) { [13:31:16.606] ns <- base::getNamespace("future") [13:31:16.606] version <- ns[[".package"]][["version"]] [13:31:16.606] if (is.null(version)) [13:31:16.606] version <- utils::packageVersion("future") [13:31:16.606] } [13:31:16.606] else { [13:31:16.606] version <- NULL [13:31:16.606] } [13:31:16.606] if (!has_future || version < "1.8.0") { [13:31:16.606] info <- base::c(r_version = base::gsub("R version ", [13:31:16.606] "", base::R.version$version.string), [13:31:16.606] platform = base::sprintf("%s (%s-bit)", [13:31:16.606] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.606] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.606] "release", "version")], collapse = " "), [13:31:16.606] hostname = base::Sys.info()[["nodename"]]) [13:31:16.606] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.606] info) [13:31:16.606] info <- base::paste(info, collapse = "; ") [13:31:16.606] if (!has_future) { [13:31:16.606] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.606] info) [13:31:16.606] } [13:31:16.606] else { [13:31:16.606] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.606] info, version) [13:31:16.606] } [13:31:16.606] base::stop(msg) [13:31:16.606] } [13:31:16.606] }) [13:31:16.606] } [13:31:16.606] ...future.strategy.old <- future::plan("list") [13:31:16.606] options(future.plan = NULL) [13:31:16.606] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.606] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.606] } [13:31:16.606] ...future.workdir <- getwd() [13:31:16.606] } [13:31:16.606] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.606] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.606] } [13:31:16.606] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.606] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:16.606] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.606] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.606] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.606] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.606] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.606] base::names(...future.oldOptions)) [13:31:16.606] } [13:31:16.606] if (FALSE) { [13:31:16.606] } [13:31:16.606] else { [13:31:16.606] if (TRUE) { [13:31:16.606] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.606] open = "w") [13:31:16.606] } [13:31:16.606] else { [13:31:16.606] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.606] windows = "NUL", "/dev/null"), open = "w") [13:31:16.606] } [13:31:16.606] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.606] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.606] base::sink(type = "output", split = FALSE) [13:31:16.606] base::close(...future.stdout) [13:31:16.606] }, add = TRUE) [13:31:16.606] } [13:31:16.606] ...future.frame <- base::sys.nframe() [13:31:16.606] ...future.conditions <- base::list() [13:31:16.606] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.606] if (FALSE) { [13:31:16.606] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.606] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.606] } [13:31:16.606] ...future.result <- base::tryCatch({ [13:31:16.606] base::withCallingHandlers({ [13:31:16.606] ...future.value <- base::withVisible(base::local(NA)) [13:31:16.606] future::FutureResult(value = ...future.value$value, [13:31:16.606] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.606] ...future.rng), globalenv = if (FALSE) [13:31:16.606] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.606] ...future.globalenv.names)) [13:31:16.606] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.606] }, condition = base::local({ [13:31:16.606] c <- base::c [13:31:16.606] inherits <- base::inherits [13:31:16.606] invokeRestart <- base::invokeRestart [13:31:16.606] length <- base::length [13:31:16.606] list <- base::list [13:31:16.606] seq.int <- base::seq.int [13:31:16.606] signalCondition <- base::signalCondition [13:31:16.606] sys.calls <- base::sys.calls [13:31:16.606] `[[` <- base::`[[` [13:31:16.606] `+` <- base::`+` [13:31:16.606] `<<-` <- base::`<<-` [13:31:16.606] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.606] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.606] 3L)] [13:31:16.606] } [13:31:16.606] function(cond) { [13:31:16.606] is_error <- inherits(cond, "error") [13:31:16.606] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.606] NULL) [13:31:16.606] if (is_error) { [13:31:16.606] sessionInformation <- function() { [13:31:16.606] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.606] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.606] search = base::search(), system = base::Sys.info()) [13:31:16.606] } [13:31:16.606] ...future.conditions[[length(...future.conditions) + [13:31:16.606] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.606] cond$call), session = sessionInformation(), [13:31:16.606] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.606] signalCondition(cond) [13:31:16.606] } [13:31:16.606] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.606] signal <- FALSE && inherits(cond, character(0)) [13:31:16.606] ...future.conditions[[length(...future.conditions) + [13:31:16.606] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.606] if (FALSE && !signal) { [13:31:16.606] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.606] { [13:31:16.606] inherits <- base::inherits [13:31:16.606] invokeRestart <- base::invokeRestart [13:31:16.606] is.null <- base::is.null [13:31:16.606] muffled <- FALSE [13:31:16.606] if (inherits(cond, "message")) { [13:31:16.606] muffled <- grepl(pattern, "muffleMessage") [13:31:16.606] if (muffled) [13:31:16.606] invokeRestart("muffleMessage") [13:31:16.606] } [13:31:16.606] else if (inherits(cond, "warning")) { [13:31:16.606] muffled <- grepl(pattern, "muffleWarning") [13:31:16.606] if (muffled) [13:31:16.606] invokeRestart("muffleWarning") [13:31:16.606] } [13:31:16.606] else if (inherits(cond, "condition")) { [13:31:16.606] if (!is.null(pattern)) { [13:31:16.606] computeRestarts <- base::computeRestarts [13:31:16.606] grepl <- base::grepl [13:31:16.606] restarts <- computeRestarts(cond) [13:31:16.606] for (restart in restarts) { [13:31:16.606] name <- restart$name [13:31:16.606] if (is.null(name)) [13:31:16.606] next [13:31:16.606] if (!grepl(pattern, name)) [13:31:16.606] next [13:31:16.606] invokeRestart(restart) [13:31:16.606] muffled <- TRUE [13:31:16.606] break [13:31:16.606] } [13:31:16.606] } [13:31:16.606] } [13:31:16.606] invisible(muffled) [13:31:16.606] } [13:31:16.606] muffleCondition(cond, pattern = "^muffle") [13:31:16.606] } [13:31:16.606] } [13:31:16.606] else { [13:31:16.606] if (TRUE) { [13:31:16.606] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.606] { [13:31:16.606] inherits <- base::inherits [13:31:16.606] invokeRestart <- base::invokeRestart [13:31:16.606] is.null <- base::is.null [13:31:16.606] muffled <- FALSE [13:31:16.606] if (inherits(cond, "message")) { [13:31:16.606] muffled <- grepl(pattern, "muffleMessage") [13:31:16.606] if (muffled) [13:31:16.606] invokeRestart("muffleMessage") [13:31:16.606] } [13:31:16.606] else if (inherits(cond, "warning")) { [13:31:16.606] muffled <- grepl(pattern, "muffleWarning") [13:31:16.606] if (muffled) [13:31:16.606] invokeRestart("muffleWarning") [13:31:16.606] } [13:31:16.606] else if (inherits(cond, "condition")) { [13:31:16.606] if (!is.null(pattern)) { [13:31:16.606] computeRestarts <- base::computeRestarts [13:31:16.606] grepl <- base::grepl [13:31:16.606] restarts <- computeRestarts(cond) [13:31:16.606] for (restart in restarts) { [13:31:16.606] name <- restart$name [13:31:16.606] if (is.null(name)) [13:31:16.606] next [13:31:16.606] if (!grepl(pattern, name)) [13:31:16.606] next [13:31:16.606] invokeRestart(restart) [13:31:16.606] muffled <- TRUE [13:31:16.606] break [13:31:16.606] } [13:31:16.606] } [13:31:16.606] } [13:31:16.606] invisible(muffled) [13:31:16.606] } [13:31:16.606] muffleCondition(cond, pattern = "^muffle") [13:31:16.606] } [13:31:16.606] } [13:31:16.606] } [13:31:16.606] })) [13:31:16.606] }, error = function(ex) { [13:31:16.606] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.606] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.606] ...future.rng), started = ...future.startTime, [13:31:16.606] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.606] version = "1.8"), class = "FutureResult") [13:31:16.606] }, finally = { [13:31:16.606] if (!identical(...future.workdir, getwd())) [13:31:16.606] setwd(...future.workdir) [13:31:16.606] { [13:31:16.606] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.606] ...future.oldOptions$nwarnings <- NULL [13:31:16.606] } [13:31:16.606] base::options(...future.oldOptions) [13:31:16.606] if (.Platform$OS.type == "windows") { [13:31:16.606] old_names <- names(...future.oldEnvVars) [13:31:16.606] envs <- base::Sys.getenv() [13:31:16.606] names <- names(envs) [13:31:16.606] common <- intersect(names, old_names) [13:31:16.606] added <- setdiff(names, old_names) [13:31:16.606] removed <- setdiff(old_names, names) [13:31:16.606] changed <- common[...future.oldEnvVars[common] != [13:31:16.606] envs[common]] [13:31:16.606] NAMES <- toupper(changed) [13:31:16.606] args <- list() [13:31:16.606] for (kk in seq_along(NAMES)) { [13:31:16.606] name <- changed[[kk]] [13:31:16.606] NAME <- NAMES[[kk]] [13:31:16.606] if (name != NAME && is.element(NAME, old_names)) [13:31:16.606] next [13:31:16.606] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.606] } [13:31:16.606] NAMES <- toupper(added) [13:31:16.606] for (kk in seq_along(NAMES)) { [13:31:16.606] name <- added[[kk]] [13:31:16.606] NAME <- NAMES[[kk]] [13:31:16.606] if (name != NAME && is.element(NAME, old_names)) [13:31:16.606] next [13:31:16.606] args[[name]] <- "" [13:31:16.606] } [13:31:16.606] NAMES <- toupper(removed) [13:31:16.606] for (kk in seq_along(NAMES)) { [13:31:16.606] name <- removed[[kk]] [13:31:16.606] NAME <- NAMES[[kk]] [13:31:16.606] if (name != NAME && is.element(NAME, old_names)) [13:31:16.606] next [13:31:16.606] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.606] } [13:31:16.606] if (length(args) > 0) [13:31:16.606] base::do.call(base::Sys.setenv, args = args) [13:31:16.606] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.606] } [13:31:16.606] else { [13:31:16.606] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.606] } [13:31:16.606] { [13:31:16.606] if (base::length(...future.futureOptionsAdded) > [13:31:16.606] 0L) { [13:31:16.606] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.606] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.606] base::options(opts) [13:31:16.606] } [13:31:16.606] { [13:31:16.606] NULL [13:31:16.606] options(future.plan = NULL) [13:31:16.606] if (is.na(NA_character_)) [13:31:16.606] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.606] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.606] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.606] .init = FALSE) [13:31:16.606] } [13:31:16.606] } [13:31:16.606] } [13:31:16.606] }) [13:31:16.606] if (TRUE) { [13:31:16.606] base::sink(type = "output", split = FALSE) [13:31:16.606] if (TRUE) { [13:31:16.606] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.606] } [13:31:16.606] else { [13:31:16.606] ...future.result["stdout"] <- base::list(NULL) [13:31:16.606] } [13:31:16.606] base::close(...future.stdout) [13:31:16.606] ...future.stdout <- NULL [13:31:16.606] } [13:31:16.606] ...future.result$conditions <- ...future.conditions [13:31:16.606] ...future.result$finished <- base::Sys.time() [13:31:16.606] ...future.result [13:31:16.606] } [13:31:16.612] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:16.612] plan(): nbrOfWorkers() = 2 [13:31:16.612] future_lapply() ... [13:31:16.613] Number of chunks: 3 [13:31:16.613] getGlobalsAndPackagesXApply() ... [13:31:16.613] - future.globals: TRUE [13:31:16.613] getGlobalsAndPackages() ... [13:31:16.614] Searching for globals... [13:31:16.615] - globals found: [2] 'FUN', '.Internal' [13:31:16.615] Searching for globals ... DONE [13:31:16.615] Resolving globals: FALSE [13:31:16.616] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:31:16.616] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:31:16.616] - globals: [1] 'FUN' [13:31:16.617] [13:31:16.617] getGlobalsAndPackages() ... DONE [13:31:16.617] - globals found/used: [n=1] 'FUN' [13:31:16.617] - needed namespaces: [n=0] [13:31:16.617] Finding globals ... DONE [13:31:16.617] - use_args: TRUE [13:31:16.617] - Getting '...' globals ... [13:31:16.618] resolve() on list ... [13:31:16.618] recursive: 0 [13:31:16.618] length: 1 [13:31:16.618] elements: '...' [13:31:16.619] length: 0 (resolved future 1) [13:31:16.619] resolve() on list ... DONE [13:31:16.619] - '...' content: [n=1] 'length' [13:31:16.619] List of 1 [13:31:16.619] $ ...:List of 1 [13:31:16.619] ..$ length: int 2 [13:31:16.619] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.619] - attr(*, "where")=List of 1 [13:31:16.619] ..$ ...: [13:31:16.619] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.619] - attr(*, "resolved")= logi TRUE [13:31:16.619] - attr(*, "total_size")= num NA [13:31:16.623] - Getting '...' globals ... DONE [13:31:16.623] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:16.623] List of 2 [13:31:16.623] $ ...future.FUN:function (mode = "logical", length = 0L) [13:31:16.623] $ ... :List of 1 [13:31:16.623] ..$ length: int 2 [13:31:16.623] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.623] - attr(*, "where")=List of 2 [13:31:16.623] ..$ ...future.FUN: [13:31:16.623] ..$ ... : [13:31:16.623] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.623] - attr(*, "resolved")= logi FALSE [13:31:16.623] - attr(*, "total_size")= num 2240 [13:31:16.627] Packages to be attached in all futures: [n=0] [13:31:16.627] getGlobalsAndPackagesXApply() ... DONE [13:31:16.627] Number of futures (= number of chunks): 3 [13:31:16.627] Launching 3 futures (chunks) ... [13:31:16.627] Chunk #1 of 3 ... [13:31:16.628] - Finding globals in 'X' for chunk #1 ... [13:31:16.628] getGlobalsAndPackages() ... [13:31:16.628] Searching for globals... [13:31:16.628] [13:31:16.628] Searching for globals ... DONE [13:31:16.628] - globals: [0] [13:31:16.629] getGlobalsAndPackages() ... DONE [13:31:16.629] + additional globals found: [n=0] [13:31:16.629] + additional namespaces needed: [n=0] [13:31:16.630] - Finding globals in 'X' for chunk #1 ... DONE [13:31:16.630] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:16.630] - seeds: [13:31:16.630] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.631] getGlobalsAndPackages() ... [13:31:16.631] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.631] Resolving globals: FALSE [13:31:16.631] Tweak future expression to call with '...' arguments ... [13:31:16.631] { [13:31:16.631] do.call(function(...) { [13:31:16.631] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.631] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.631] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.631] on.exit(options(oopts), add = TRUE) [13:31:16.631] } [13:31:16.631] { [13:31:16.631] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.631] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.631] ...future.FUN(...future.X_jj, ...) [13:31:16.631] }) [13:31:16.631] } [13:31:16.631] }, args = future.call.arguments) [13:31:16.631] } [13:31:16.632] Tweak future expression to call with '...' arguments ... DONE [13:31:16.632] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.632] [13:31:16.632] getGlobalsAndPackages() ... DONE [13:31:16.633] run() for 'Future' ... [13:31:16.633] - state: 'created' [13:31:16.633] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.635] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.636] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.636] - Field: 'label' [13:31:16.636] - Field: 'local' [13:31:16.636] - Field: 'owner' [13:31:16.636] - Field: 'envir' [13:31:16.637] - Field: 'packages' [13:31:16.637] - Field: 'gc' [13:31:16.637] - Field: 'conditions' [13:31:16.637] - Field: 'expr' [13:31:16.637] - Field: 'uuid' [13:31:16.637] - Field: 'seed' [13:31:16.638] - Field: 'version' [13:31:16.638] - Field: 'result' [13:31:16.638] - Field: 'asynchronous' [13:31:16.638] - Field: 'calls' [13:31:16.638] - Field: 'globals' [13:31:16.638] - Field: 'stdout' [13:31:16.639] - Field: 'earlySignal' [13:31:16.639] - Field: 'lazy' [13:31:16.639] - Field: 'state' [13:31:16.639] - Field: '.cluster' [13:31:16.639] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.639] - Launch lazy future ... [13:31:16.640] Packages needed by the future expression (n = 0): [13:31:16.640] Packages needed by future strategies (n = 0): [13:31:16.640] { [13:31:16.640] { [13:31:16.640] { [13:31:16.640] ...future.startTime <- base::Sys.time() [13:31:16.640] { [13:31:16.640] { [13:31:16.640] { [13:31:16.640] base::local({ [13:31:16.640] has_future <- base::requireNamespace("future", [13:31:16.640] quietly = TRUE) [13:31:16.640] if (has_future) { [13:31:16.640] ns <- base::getNamespace("future") [13:31:16.640] version <- ns[[".package"]][["version"]] [13:31:16.640] if (is.null(version)) [13:31:16.640] version <- utils::packageVersion("future") [13:31:16.640] } [13:31:16.640] else { [13:31:16.640] version <- NULL [13:31:16.640] } [13:31:16.640] if (!has_future || version < "1.8.0") { [13:31:16.640] info <- base::c(r_version = base::gsub("R version ", [13:31:16.640] "", base::R.version$version.string), [13:31:16.640] platform = base::sprintf("%s (%s-bit)", [13:31:16.640] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.640] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.640] "release", "version")], collapse = " "), [13:31:16.640] hostname = base::Sys.info()[["nodename"]]) [13:31:16.640] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.640] info) [13:31:16.640] info <- base::paste(info, collapse = "; ") [13:31:16.640] if (!has_future) { [13:31:16.640] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.640] info) [13:31:16.640] } [13:31:16.640] else { [13:31:16.640] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.640] info, version) [13:31:16.640] } [13:31:16.640] base::stop(msg) [13:31:16.640] } [13:31:16.640] }) [13:31:16.640] } [13:31:16.640] ...future.strategy.old <- future::plan("list") [13:31:16.640] options(future.plan = NULL) [13:31:16.640] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.640] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.640] } [13:31:16.640] ...future.workdir <- getwd() [13:31:16.640] } [13:31:16.640] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.640] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.640] } [13:31:16.640] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.640] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:16.640] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.640] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.640] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.640] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.640] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.640] base::names(...future.oldOptions)) [13:31:16.640] } [13:31:16.640] if (FALSE) { [13:31:16.640] } [13:31:16.640] else { [13:31:16.640] if (TRUE) { [13:31:16.640] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.640] open = "w") [13:31:16.640] } [13:31:16.640] else { [13:31:16.640] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.640] windows = "NUL", "/dev/null"), open = "w") [13:31:16.640] } [13:31:16.640] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.640] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.640] base::sink(type = "output", split = FALSE) [13:31:16.640] base::close(...future.stdout) [13:31:16.640] }, add = TRUE) [13:31:16.640] } [13:31:16.640] ...future.frame <- base::sys.nframe() [13:31:16.640] ...future.conditions <- base::list() [13:31:16.640] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.640] if (FALSE) { [13:31:16.640] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.640] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.640] } [13:31:16.640] ...future.result <- base::tryCatch({ [13:31:16.640] base::withCallingHandlers({ [13:31:16.640] ...future.value <- base::withVisible(base::local({ [13:31:16.640] do.call(function(...) { [13:31:16.640] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.640] if (!identical(...future.globals.maxSize.org, [13:31:16.640] ...future.globals.maxSize)) { [13:31:16.640] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.640] on.exit(options(oopts), add = TRUE) [13:31:16.640] } [13:31:16.640] { [13:31:16.640] lapply(seq_along(...future.elements_ii), [13:31:16.640] FUN = function(jj) { [13:31:16.640] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.640] ...future.FUN(...future.X_jj, ...) [13:31:16.640] }) [13:31:16.640] } [13:31:16.640] }, args = future.call.arguments) [13:31:16.640] })) [13:31:16.640] future::FutureResult(value = ...future.value$value, [13:31:16.640] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.640] ...future.rng), globalenv = if (FALSE) [13:31:16.640] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.640] ...future.globalenv.names)) [13:31:16.640] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.640] }, condition = base::local({ [13:31:16.640] c <- base::c [13:31:16.640] inherits <- base::inherits [13:31:16.640] invokeRestart <- base::invokeRestart [13:31:16.640] length <- base::length [13:31:16.640] list <- base::list [13:31:16.640] seq.int <- base::seq.int [13:31:16.640] signalCondition <- base::signalCondition [13:31:16.640] sys.calls <- base::sys.calls [13:31:16.640] `[[` <- base::`[[` [13:31:16.640] `+` <- base::`+` [13:31:16.640] `<<-` <- base::`<<-` [13:31:16.640] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.640] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.640] 3L)] [13:31:16.640] } [13:31:16.640] function(cond) { [13:31:16.640] is_error <- inherits(cond, "error") [13:31:16.640] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.640] NULL) [13:31:16.640] if (is_error) { [13:31:16.640] sessionInformation <- function() { [13:31:16.640] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.640] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.640] search = base::search(), system = base::Sys.info()) [13:31:16.640] } [13:31:16.640] ...future.conditions[[length(...future.conditions) + [13:31:16.640] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.640] cond$call), session = sessionInformation(), [13:31:16.640] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.640] signalCondition(cond) [13:31:16.640] } [13:31:16.640] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.640] signal <- FALSE && inherits(cond, character(0)) [13:31:16.640] ...future.conditions[[length(...future.conditions) + [13:31:16.640] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.640] if (FALSE && !signal) { [13:31:16.640] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.640] { [13:31:16.640] inherits <- base::inherits [13:31:16.640] invokeRestart <- base::invokeRestart [13:31:16.640] is.null <- base::is.null [13:31:16.640] muffled <- FALSE [13:31:16.640] if (inherits(cond, "message")) { [13:31:16.640] muffled <- grepl(pattern, "muffleMessage") [13:31:16.640] if (muffled) [13:31:16.640] invokeRestart("muffleMessage") [13:31:16.640] } [13:31:16.640] else if (inherits(cond, "warning")) { [13:31:16.640] muffled <- grepl(pattern, "muffleWarning") [13:31:16.640] if (muffled) [13:31:16.640] invokeRestart("muffleWarning") [13:31:16.640] } [13:31:16.640] else if (inherits(cond, "condition")) { [13:31:16.640] if (!is.null(pattern)) { [13:31:16.640] computeRestarts <- base::computeRestarts [13:31:16.640] grepl <- base::grepl [13:31:16.640] restarts <- computeRestarts(cond) [13:31:16.640] for (restart in restarts) { [13:31:16.640] name <- restart$name [13:31:16.640] if (is.null(name)) [13:31:16.640] next [13:31:16.640] if (!grepl(pattern, name)) [13:31:16.640] next [13:31:16.640] invokeRestart(restart) [13:31:16.640] muffled <- TRUE [13:31:16.640] break [13:31:16.640] } [13:31:16.640] } [13:31:16.640] } [13:31:16.640] invisible(muffled) [13:31:16.640] } [13:31:16.640] muffleCondition(cond, pattern = "^muffle") [13:31:16.640] } [13:31:16.640] } [13:31:16.640] else { [13:31:16.640] if (TRUE) { [13:31:16.640] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.640] { [13:31:16.640] inherits <- base::inherits [13:31:16.640] invokeRestart <- base::invokeRestart [13:31:16.640] is.null <- base::is.null [13:31:16.640] muffled <- FALSE [13:31:16.640] if (inherits(cond, "message")) { [13:31:16.640] muffled <- grepl(pattern, "muffleMessage") [13:31:16.640] if (muffled) [13:31:16.640] invokeRestart("muffleMessage") [13:31:16.640] } [13:31:16.640] else if (inherits(cond, "warning")) { [13:31:16.640] muffled <- grepl(pattern, "muffleWarning") [13:31:16.640] if (muffled) [13:31:16.640] invokeRestart("muffleWarning") [13:31:16.640] } [13:31:16.640] else if (inherits(cond, "condition")) { [13:31:16.640] if (!is.null(pattern)) { [13:31:16.640] computeRestarts <- base::computeRestarts [13:31:16.640] grepl <- base::grepl [13:31:16.640] restarts <- computeRestarts(cond) [13:31:16.640] for (restart in restarts) { [13:31:16.640] name <- restart$name [13:31:16.640] if (is.null(name)) [13:31:16.640] next [13:31:16.640] if (!grepl(pattern, name)) [13:31:16.640] next [13:31:16.640] invokeRestart(restart) [13:31:16.640] muffled <- TRUE [13:31:16.640] break [13:31:16.640] } [13:31:16.640] } [13:31:16.640] } [13:31:16.640] invisible(muffled) [13:31:16.640] } [13:31:16.640] muffleCondition(cond, pattern = "^muffle") [13:31:16.640] } [13:31:16.640] } [13:31:16.640] } [13:31:16.640] })) [13:31:16.640] }, error = function(ex) { [13:31:16.640] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.640] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.640] ...future.rng), started = ...future.startTime, [13:31:16.640] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.640] version = "1.8"), class = "FutureResult") [13:31:16.640] }, finally = { [13:31:16.640] if (!identical(...future.workdir, getwd())) [13:31:16.640] setwd(...future.workdir) [13:31:16.640] { [13:31:16.640] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.640] ...future.oldOptions$nwarnings <- NULL [13:31:16.640] } [13:31:16.640] base::options(...future.oldOptions) [13:31:16.640] if (.Platform$OS.type == "windows") { [13:31:16.640] old_names <- names(...future.oldEnvVars) [13:31:16.640] envs <- base::Sys.getenv() [13:31:16.640] names <- names(envs) [13:31:16.640] common <- intersect(names, old_names) [13:31:16.640] added <- setdiff(names, old_names) [13:31:16.640] removed <- setdiff(old_names, names) [13:31:16.640] changed <- common[...future.oldEnvVars[common] != [13:31:16.640] envs[common]] [13:31:16.640] NAMES <- toupper(changed) [13:31:16.640] args <- list() [13:31:16.640] for (kk in seq_along(NAMES)) { [13:31:16.640] name <- changed[[kk]] [13:31:16.640] NAME <- NAMES[[kk]] [13:31:16.640] if (name != NAME && is.element(NAME, old_names)) [13:31:16.640] next [13:31:16.640] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.640] } [13:31:16.640] NAMES <- toupper(added) [13:31:16.640] for (kk in seq_along(NAMES)) { [13:31:16.640] name <- added[[kk]] [13:31:16.640] NAME <- NAMES[[kk]] [13:31:16.640] if (name != NAME && is.element(NAME, old_names)) [13:31:16.640] next [13:31:16.640] args[[name]] <- "" [13:31:16.640] } [13:31:16.640] NAMES <- toupper(removed) [13:31:16.640] for (kk in seq_along(NAMES)) { [13:31:16.640] name <- removed[[kk]] [13:31:16.640] NAME <- NAMES[[kk]] [13:31:16.640] if (name != NAME && is.element(NAME, old_names)) [13:31:16.640] next [13:31:16.640] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.640] } [13:31:16.640] if (length(args) > 0) [13:31:16.640] base::do.call(base::Sys.setenv, args = args) [13:31:16.640] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.640] } [13:31:16.640] else { [13:31:16.640] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.640] } [13:31:16.640] { [13:31:16.640] if (base::length(...future.futureOptionsAdded) > [13:31:16.640] 0L) { [13:31:16.640] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.640] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.640] base::options(opts) [13:31:16.640] } [13:31:16.640] { [13:31:16.640] NULL [13:31:16.640] options(future.plan = NULL) [13:31:16.640] if (is.na(NA_character_)) [13:31:16.640] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.640] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.640] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.640] .init = FALSE) [13:31:16.640] } [13:31:16.640] } [13:31:16.640] } [13:31:16.640] }) [13:31:16.640] if (TRUE) { [13:31:16.640] base::sink(type = "output", split = FALSE) [13:31:16.640] if (TRUE) { [13:31:16.640] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.640] } [13:31:16.640] else { [13:31:16.640] ...future.result["stdout"] <- base::list(NULL) [13:31:16.640] } [13:31:16.640] base::close(...future.stdout) [13:31:16.640] ...future.stdout <- NULL [13:31:16.640] } [13:31:16.640] ...future.result$conditions <- ...future.conditions [13:31:16.640] ...future.result$finished <- base::Sys.time() [13:31:16.640] ...future.result [13:31:16.640] } [13:31:16.644] - Launch lazy future ... done [13:31:16.644] run() for 'MiraiFuture' ... done [13:31:16.645] Created future: [13:31:16.646] resolved() for 'MiraiFuture' ... [13:31:16.646] - state: 'running' [13:31:16.646] - run: TRUE [13:31:16.646] - result: 'NULL' [13:31:16.647] - resolved: FALSE [13:31:16.647] resolved() for 'MiraiFuture' ... done [13:31:16.645] MiraiFuture: [13:31:16.645] Label: 'future_lapply-1' [13:31:16.645] Expression: [13:31:16.645] { [13:31:16.645] do.call(function(...) { [13:31:16.645] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.645] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.645] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.645] on.exit(options(oopts), add = TRUE) [13:31:16.645] } [13:31:16.645] { [13:31:16.645] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.645] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.645] ...future.FUN(...future.X_jj, ...) [13:31:16.645] }) [13:31:16.645] } [13:31:16.645] }, args = future.call.arguments) [13:31:16.645] } [13:31:16.645] Lazy evaluation: FALSE [13:31:16.645] Asynchronous evaluation: TRUE [13:31:16.645] Local evaluation: TRUE [13:31:16.645] Environment: R_GlobalEnv [13:31:16.645] Capture standard output: TRUE [13:31:16.645] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.645] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.645] Packages: [13:31:16.645] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.645] Resolved: TRUE [13:31:16.645] Value: [13:31:16.645] Conditions captured: [13:31:16.645] Early signaling: FALSE [13:31:16.645] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.645] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.647] Chunk #1 of 3 ... DONE [13:31:16.647] Chunk #2 of 3 ... [13:31:16.648] - Finding globals in 'X' for chunk #2 ... [13:31:16.648] getGlobalsAndPackages() ... [13:31:16.648] Searching for globals... [13:31:16.648] [13:31:16.648] Searching for globals ... DONE [13:31:16.648] - globals: [0] [13:31:16.649] getGlobalsAndPackages() ... DONE [13:31:16.649] + additional globals found: [n=0] [13:31:16.649] + additional namespaces needed: [n=0] [13:31:16.649] - Finding globals in 'X' for chunk #2 ... DONE [13:31:16.649] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:16.649] - seeds: [13:31:16.650] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.650] getGlobalsAndPackages() ... [13:31:16.650] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.650] Resolving globals: FALSE [13:31:16.650] Tweak future expression to call with '...' arguments ... [13:31:16.650] { [13:31:16.650] do.call(function(...) { [13:31:16.650] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.650] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.650] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.650] on.exit(options(oopts), add = TRUE) [13:31:16.650] } [13:31:16.650] { [13:31:16.650] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.650] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.650] ...future.FUN(...future.X_jj, ...) [13:31:16.650] }) [13:31:16.650] } [13:31:16.650] }, args = future.call.arguments) [13:31:16.650] } [13:31:16.651] Tweak future expression to call with '...' arguments ... DONE [13:31:16.651] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.651] [13:31:16.652] getGlobalsAndPackages() ... DONE [13:31:16.652] run() for 'Future' ... [13:31:16.652] - state: 'created' [13:31:16.652] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.655] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.655] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.655] - Field: 'label' [13:31:16.655] - Field: 'local' [13:31:16.655] - Field: 'owner' [13:31:16.655] - Field: 'envir' [13:31:16.656] - Field: 'packages' [13:31:16.656] - Field: 'gc' [13:31:16.656] - Field: 'conditions' [13:31:16.656] - Field: 'expr' [13:31:16.656] - Field: 'uuid' [13:31:16.656] - Field: 'seed' [13:31:16.657] - Field: 'version' [13:31:16.657] - Field: 'result' [13:31:16.657] - Field: 'asynchronous' [13:31:16.657] - Field: 'calls' [13:31:16.657] - Field: 'globals' [13:31:16.657] - Field: 'stdout' [13:31:16.658] - Field: 'earlySignal' [13:31:16.658] - Field: 'lazy' [13:31:16.658] - Field: 'state' [13:31:16.658] - Field: '.cluster' [13:31:16.658] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.659] - Launch lazy future ... [13:31:16.659] Packages needed by the future expression (n = 0): [13:31:16.659] Packages needed by future strategies (n = 0): [13:31:16.659] { [13:31:16.659] { [13:31:16.659] { [13:31:16.659] ...future.startTime <- base::Sys.time() [13:31:16.659] { [13:31:16.659] { [13:31:16.659] { [13:31:16.659] base::local({ [13:31:16.659] has_future <- base::requireNamespace("future", [13:31:16.659] quietly = TRUE) [13:31:16.659] if (has_future) { [13:31:16.659] ns <- base::getNamespace("future") [13:31:16.659] version <- ns[[".package"]][["version"]] [13:31:16.659] if (is.null(version)) [13:31:16.659] version <- utils::packageVersion("future") [13:31:16.659] } [13:31:16.659] else { [13:31:16.659] version <- NULL [13:31:16.659] } [13:31:16.659] if (!has_future || version < "1.8.0") { [13:31:16.659] info <- base::c(r_version = base::gsub("R version ", [13:31:16.659] "", base::R.version$version.string), [13:31:16.659] platform = base::sprintf("%s (%s-bit)", [13:31:16.659] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.659] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.659] "release", "version")], collapse = " "), [13:31:16.659] hostname = base::Sys.info()[["nodename"]]) [13:31:16.659] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.659] info) [13:31:16.659] info <- base::paste(info, collapse = "; ") [13:31:16.659] if (!has_future) { [13:31:16.659] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.659] info) [13:31:16.659] } [13:31:16.659] else { [13:31:16.659] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.659] info, version) [13:31:16.659] } [13:31:16.659] base::stop(msg) [13:31:16.659] } [13:31:16.659] }) [13:31:16.659] } [13:31:16.659] ...future.strategy.old <- future::plan("list") [13:31:16.659] options(future.plan = NULL) [13:31:16.659] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.659] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.659] } [13:31:16.659] ...future.workdir <- getwd() [13:31:16.659] } [13:31:16.659] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.659] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.659] } [13:31:16.659] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.659] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:16.659] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.659] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.659] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.659] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.659] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.659] base::names(...future.oldOptions)) [13:31:16.659] } [13:31:16.659] if (FALSE) { [13:31:16.659] } [13:31:16.659] else { [13:31:16.659] if (TRUE) { [13:31:16.659] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.659] open = "w") [13:31:16.659] } [13:31:16.659] else { [13:31:16.659] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.659] windows = "NUL", "/dev/null"), open = "w") [13:31:16.659] } [13:31:16.659] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.659] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.659] base::sink(type = "output", split = FALSE) [13:31:16.659] base::close(...future.stdout) [13:31:16.659] }, add = TRUE) [13:31:16.659] } [13:31:16.659] ...future.frame <- base::sys.nframe() [13:31:16.659] ...future.conditions <- base::list() [13:31:16.659] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.659] if (FALSE) { [13:31:16.659] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.659] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.659] } [13:31:16.659] ...future.result <- base::tryCatch({ [13:31:16.659] base::withCallingHandlers({ [13:31:16.659] ...future.value <- base::withVisible(base::local({ [13:31:16.659] do.call(function(...) { [13:31:16.659] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.659] if (!identical(...future.globals.maxSize.org, [13:31:16.659] ...future.globals.maxSize)) { [13:31:16.659] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.659] on.exit(options(oopts), add = TRUE) [13:31:16.659] } [13:31:16.659] { [13:31:16.659] lapply(seq_along(...future.elements_ii), [13:31:16.659] FUN = function(jj) { [13:31:16.659] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.659] ...future.FUN(...future.X_jj, ...) [13:31:16.659] }) [13:31:16.659] } [13:31:16.659] }, args = future.call.arguments) [13:31:16.659] })) [13:31:16.659] future::FutureResult(value = ...future.value$value, [13:31:16.659] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.659] ...future.rng), globalenv = if (FALSE) [13:31:16.659] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.659] ...future.globalenv.names)) [13:31:16.659] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.659] }, condition = base::local({ [13:31:16.659] c <- base::c [13:31:16.659] inherits <- base::inherits [13:31:16.659] invokeRestart <- base::invokeRestart [13:31:16.659] length <- base::length [13:31:16.659] list <- base::list [13:31:16.659] seq.int <- base::seq.int [13:31:16.659] signalCondition <- base::signalCondition [13:31:16.659] sys.calls <- base::sys.calls [13:31:16.659] `[[` <- base::`[[` [13:31:16.659] `+` <- base::`+` [13:31:16.659] `<<-` <- base::`<<-` [13:31:16.659] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.659] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.659] 3L)] [13:31:16.659] } [13:31:16.659] function(cond) { [13:31:16.659] is_error <- inherits(cond, "error") [13:31:16.659] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.659] NULL) [13:31:16.659] if (is_error) { [13:31:16.659] sessionInformation <- function() { [13:31:16.659] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.659] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.659] search = base::search(), system = base::Sys.info()) [13:31:16.659] } [13:31:16.659] ...future.conditions[[length(...future.conditions) + [13:31:16.659] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.659] cond$call), session = sessionInformation(), [13:31:16.659] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.659] signalCondition(cond) [13:31:16.659] } [13:31:16.659] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.659] signal <- FALSE && inherits(cond, character(0)) [13:31:16.659] ...future.conditions[[length(...future.conditions) + [13:31:16.659] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.659] if (FALSE && !signal) { [13:31:16.659] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.659] { [13:31:16.659] inherits <- base::inherits [13:31:16.659] invokeRestart <- base::invokeRestart [13:31:16.659] is.null <- base::is.null [13:31:16.659] muffled <- FALSE [13:31:16.659] if (inherits(cond, "message")) { [13:31:16.659] muffled <- grepl(pattern, "muffleMessage") [13:31:16.659] if (muffled) [13:31:16.659] invokeRestart("muffleMessage") [13:31:16.659] } [13:31:16.659] else if (inherits(cond, "warning")) { [13:31:16.659] muffled <- grepl(pattern, "muffleWarning") [13:31:16.659] if (muffled) [13:31:16.659] invokeRestart("muffleWarning") [13:31:16.659] } [13:31:16.659] else if (inherits(cond, "condition")) { [13:31:16.659] if (!is.null(pattern)) { [13:31:16.659] computeRestarts <- base::computeRestarts [13:31:16.659] grepl <- base::grepl [13:31:16.659] restarts <- computeRestarts(cond) [13:31:16.659] for (restart in restarts) { [13:31:16.659] name <- restart$name [13:31:16.659] if (is.null(name)) [13:31:16.659] next [13:31:16.659] if (!grepl(pattern, name)) [13:31:16.659] next [13:31:16.659] invokeRestart(restart) [13:31:16.659] muffled <- TRUE [13:31:16.659] break [13:31:16.659] } [13:31:16.659] } [13:31:16.659] } [13:31:16.659] invisible(muffled) [13:31:16.659] } [13:31:16.659] muffleCondition(cond, pattern = "^muffle") [13:31:16.659] } [13:31:16.659] } [13:31:16.659] else { [13:31:16.659] if (TRUE) { [13:31:16.659] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.659] { [13:31:16.659] inherits <- base::inherits [13:31:16.659] invokeRestart <- base::invokeRestart [13:31:16.659] is.null <- base::is.null [13:31:16.659] muffled <- FALSE [13:31:16.659] if (inherits(cond, "message")) { [13:31:16.659] muffled <- grepl(pattern, "muffleMessage") [13:31:16.659] if (muffled) [13:31:16.659] invokeRestart("muffleMessage") [13:31:16.659] } [13:31:16.659] else if (inherits(cond, "warning")) { [13:31:16.659] muffled <- grepl(pattern, "muffleWarning") [13:31:16.659] if (muffled) [13:31:16.659] invokeRestart("muffleWarning") [13:31:16.659] } [13:31:16.659] else if (inherits(cond, "condition")) { [13:31:16.659] if (!is.null(pattern)) { [13:31:16.659] computeRestarts <- base::computeRestarts [13:31:16.659] grepl <- base::grepl [13:31:16.659] restarts <- computeRestarts(cond) [13:31:16.659] for (restart in restarts) { [13:31:16.659] name <- restart$name [13:31:16.659] if (is.null(name)) [13:31:16.659] next [13:31:16.659] if (!grepl(pattern, name)) [13:31:16.659] next [13:31:16.659] invokeRestart(restart) [13:31:16.659] muffled <- TRUE [13:31:16.659] break [13:31:16.659] } [13:31:16.659] } [13:31:16.659] } [13:31:16.659] invisible(muffled) [13:31:16.659] } [13:31:16.659] muffleCondition(cond, pattern = "^muffle") [13:31:16.659] } [13:31:16.659] } [13:31:16.659] } [13:31:16.659] })) [13:31:16.659] }, error = function(ex) { [13:31:16.659] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.659] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.659] ...future.rng), started = ...future.startTime, [13:31:16.659] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.659] version = "1.8"), class = "FutureResult") [13:31:16.659] }, finally = { [13:31:16.659] if (!identical(...future.workdir, getwd())) [13:31:16.659] setwd(...future.workdir) [13:31:16.659] { [13:31:16.659] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.659] ...future.oldOptions$nwarnings <- NULL [13:31:16.659] } [13:31:16.659] base::options(...future.oldOptions) [13:31:16.659] if (.Platform$OS.type == "windows") { [13:31:16.659] old_names <- names(...future.oldEnvVars) [13:31:16.659] envs <- base::Sys.getenv() [13:31:16.659] names <- names(envs) [13:31:16.659] common <- intersect(names, old_names) [13:31:16.659] added <- setdiff(names, old_names) [13:31:16.659] removed <- setdiff(old_names, names) [13:31:16.659] changed <- common[...future.oldEnvVars[common] != [13:31:16.659] envs[common]] [13:31:16.659] NAMES <- toupper(changed) [13:31:16.659] args <- list() [13:31:16.659] for (kk in seq_along(NAMES)) { [13:31:16.659] name <- changed[[kk]] [13:31:16.659] NAME <- NAMES[[kk]] [13:31:16.659] if (name != NAME && is.element(NAME, old_names)) [13:31:16.659] next [13:31:16.659] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.659] } [13:31:16.659] NAMES <- toupper(added) [13:31:16.659] for (kk in seq_along(NAMES)) { [13:31:16.659] name <- added[[kk]] [13:31:16.659] NAME <- NAMES[[kk]] [13:31:16.659] if (name != NAME && is.element(NAME, old_names)) [13:31:16.659] next [13:31:16.659] args[[name]] <- "" [13:31:16.659] } [13:31:16.659] NAMES <- toupper(removed) [13:31:16.659] for (kk in seq_along(NAMES)) { [13:31:16.659] name <- removed[[kk]] [13:31:16.659] NAME <- NAMES[[kk]] [13:31:16.659] if (name != NAME && is.element(NAME, old_names)) [13:31:16.659] next [13:31:16.659] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.659] } [13:31:16.659] if (length(args) > 0) [13:31:16.659] base::do.call(base::Sys.setenv, args = args) [13:31:16.659] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.659] } [13:31:16.659] else { [13:31:16.659] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.659] } [13:31:16.659] { [13:31:16.659] if (base::length(...future.futureOptionsAdded) > [13:31:16.659] 0L) { [13:31:16.659] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.659] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.659] base::options(opts) [13:31:16.659] } [13:31:16.659] { [13:31:16.659] NULL [13:31:16.659] options(future.plan = NULL) [13:31:16.659] if (is.na(NA_character_)) [13:31:16.659] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.659] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.659] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.659] .init = FALSE) [13:31:16.659] } [13:31:16.659] } [13:31:16.659] } [13:31:16.659] }) [13:31:16.659] if (TRUE) { [13:31:16.659] base::sink(type = "output", split = FALSE) [13:31:16.659] if (TRUE) { [13:31:16.659] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.659] } [13:31:16.659] else { [13:31:16.659] ...future.result["stdout"] <- base::list(NULL) [13:31:16.659] } [13:31:16.659] base::close(...future.stdout) [13:31:16.659] ...future.stdout <- NULL [13:31:16.659] } [13:31:16.659] ...future.result$conditions <- ...future.conditions [13:31:16.659] ...future.result$finished <- base::Sys.time() [13:31:16.659] ...future.result [13:31:16.659] } [13:31:16.686] - Launch lazy future ... done [13:31:16.686] run() for 'MiraiFuture' ... done [13:31:16.686] Created future: [13:31:16.688] resolved() for 'MiraiFuture' ... [13:31:16.688] - state: 'running' [13:31:16.688] - run: TRUE [13:31:16.688] - result: 'NULL' [13:31:16.688] - resolved: FALSE [13:31:16.689] resolved() for 'MiraiFuture' ... done [13:31:16.686] MiraiFuture: [13:31:16.686] Label: 'future_lapply-2' [13:31:16.686] Expression: [13:31:16.686] { [13:31:16.686] do.call(function(...) { [13:31:16.686] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.686] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.686] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.686] on.exit(options(oopts), add = TRUE) [13:31:16.686] } [13:31:16.686] { [13:31:16.686] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.686] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.686] ...future.FUN(...future.X_jj, ...) [13:31:16.686] }) [13:31:16.686] } [13:31:16.686] }, args = future.call.arguments) [13:31:16.686] } [13:31:16.686] Lazy evaluation: FALSE [13:31:16.686] Asynchronous evaluation: TRUE [13:31:16.686] Local evaluation: TRUE [13:31:16.686] Environment: R_GlobalEnv [13:31:16.686] Capture standard output: TRUE [13:31:16.686] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.686] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.686] Packages: [13:31:16.686] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.686] Resolved: TRUE [13:31:16.686] Value: [13:31:16.686] Conditions captured: [13:31:16.686] Early signaling: FALSE [13:31:16.686] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.686] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.689] Chunk #2 of 3 ... DONE [13:31:16.689] Chunk #3 of 3 ... [13:31:16.689] - Finding globals in 'X' for chunk #3 ... [13:31:16.690] getGlobalsAndPackages() ... [13:31:16.690] Searching for globals... [13:31:16.690] [13:31:16.690] Searching for globals ... DONE [13:31:16.691] - globals: [0] [13:31:16.691] getGlobalsAndPackages() ... DONE [13:31:16.691] + additional globals found: [n=0] [13:31:16.691] + additional namespaces needed: [n=0] [13:31:16.691] - Finding globals in 'X' for chunk #3 ... DONE [13:31:16.691] - Adjusted option 'future.globals.maxSize': 524288000 -> 3 * 524288000 = 1572864000 (bytes) [13:31:16.692] - seeds: [13:31:16.692] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.692] getGlobalsAndPackages() ... [13:31:16.692] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.692] Resolving globals: FALSE [13:31:16.692] Tweak future expression to call with '...' arguments ... [13:31:16.693] { [13:31:16.693] do.call(function(...) { [13:31:16.693] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.693] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.693] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.693] on.exit(options(oopts), add = TRUE) [13:31:16.693] } [13:31:16.693] { [13:31:16.693] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.693] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.693] ...future.FUN(...future.X_jj, ...) [13:31:16.693] }) [13:31:16.693] } [13:31:16.693] }, args = future.call.arguments) [13:31:16.693] } [13:31:16.693] Tweak future expression to call with '...' arguments ... DONE [13:31:16.694] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.694] [13:31:16.694] getGlobalsAndPackages() ... DONE [13:31:16.694] run() for 'Future' ... [13:31:16.695] - state: 'created' [13:31:16.695] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.698] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.698] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.698] - Field: 'label' [13:31:16.698] - Field: 'local' [13:31:16.698] - Field: 'owner' [13:31:16.699] - Field: 'envir' [13:31:16.699] - Field: 'packages' [13:31:16.699] - Field: 'gc' [13:31:16.699] - Field: 'conditions' [13:31:16.699] - Field: 'expr' [13:31:16.700] - Field: 'uuid' [13:31:16.700] - Field: 'seed' [13:31:16.700] - Field: 'version' [13:31:16.700] - Field: 'result' [13:31:16.700] - Field: 'asynchronous' [13:31:16.701] - Field: 'calls' [13:31:16.701] - Field: 'globals' [13:31:16.701] - Field: 'stdout' [13:31:16.701] - Field: 'earlySignal' [13:31:16.701] - Field: 'lazy' [13:31:16.702] - Field: 'state' [13:31:16.702] - Field: '.cluster' [13:31:16.702] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.702] - Launch lazy future ... [13:31:16.702] Packages needed by the future expression (n = 0): [13:31:16.702] Packages needed by future strategies (n = 0): [13:31:16.703] { [13:31:16.703] { [13:31:16.703] { [13:31:16.703] ...future.startTime <- base::Sys.time() [13:31:16.703] { [13:31:16.703] { [13:31:16.703] { [13:31:16.703] base::local({ [13:31:16.703] has_future <- base::requireNamespace("future", [13:31:16.703] quietly = TRUE) [13:31:16.703] if (has_future) { [13:31:16.703] ns <- base::getNamespace("future") [13:31:16.703] version <- ns[[".package"]][["version"]] [13:31:16.703] if (is.null(version)) [13:31:16.703] version <- utils::packageVersion("future") [13:31:16.703] } [13:31:16.703] else { [13:31:16.703] version <- NULL [13:31:16.703] } [13:31:16.703] if (!has_future || version < "1.8.0") { [13:31:16.703] info <- base::c(r_version = base::gsub("R version ", [13:31:16.703] "", base::R.version$version.string), [13:31:16.703] platform = base::sprintf("%s (%s-bit)", [13:31:16.703] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.703] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.703] "release", "version")], collapse = " "), [13:31:16.703] hostname = base::Sys.info()[["nodename"]]) [13:31:16.703] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.703] info) [13:31:16.703] info <- base::paste(info, collapse = "; ") [13:31:16.703] if (!has_future) { [13:31:16.703] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.703] info) [13:31:16.703] } [13:31:16.703] else { [13:31:16.703] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.703] info, version) [13:31:16.703] } [13:31:16.703] base::stop(msg) [13:31:16.703] } [13:31:16.703] }) [13:31:16.703] } [13:31:16.703] ...future.strategy.old <- future::plan("list") [13:31:16.703] options(future.plan = NULL) [13:31:16.703] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.703] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.703] } [13:31:16.703] ...future.workdir <- getwd() [13:31:16.703] } [13:31:16.703] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.703] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.703] } [13:31:16.703] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.703] future.globals.maxSize = 1572864000, future.globals.method = NULL, [13:31:16.703] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.703] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.703] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.703] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.703] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.703] base::names(...future.oldOptions)) [13:31:16.703] } [13:31:16.703] if (FALSE) { [13:31:16.703] } [13:31:16.703] else { [13:31:16.703] if (TRUE) { [13:31:16.703] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.703] open = "w") [13:31:16.703] } [13:31:16.703] else { [13:31:16.703] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.703] windows = "NUL", "/dev/null"), open = "w") [13:31:16.703] } [13:31:16.703] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.703] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.703] base::sink(type = "output", split = FALSE) [13:31:16.703] base::close(...future.stdout) [13:31:16.703] }, add = TRUE) [13:31:16.703] } [13:31:16.703] ...future.frame <- base::sys.nframe() [13:31:16.703] ...future.conditions <- base::list() [13:31:16.703] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.703] if (FALSE) { [13:31:16.703] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.703] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.703] } [13:31:16.703] ...future.result <- base::tryCatch({ [13:31:16.703] base::withCallingHandlers({ [13:31:16.703] ...future.value <- base::withVisible(base::local({ [13:31:16.703] do.call(function(...) { [13:31:16.703] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.703] if (!identical(...future.globals.maxSize.org, [13:31:16.703] ...future.globals.maxSize)) { [13:31:16.703] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.703] on.exit(options(oopts), add = TRUE) [13:31:16.703] } [13:31:16.703] { [13:31:16.703] lapply(seq_along(...future.elements_ii), [13:31:16.703] FUN = function(jj) { [13:31:16.703] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.703] ...future.FUN(...future.X_jj, ...) [13:31:16.703] }) [13:31:16.703] } [13:31:16.703] }, args = future.call.arguments) [13:31:16.703] })) [13:31:16.703] future::FutureResult(value = ...future.value$value, [13:31:16.703] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.703] ...future.rng), globalenv = if (FALSE) [13:31:16.703] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.703] ...future.globalenv.names)) [13:31:16.703] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.703] }, condition = base::local({ [13:31:16.703] c <- base::c [13:31:16.703] inherits <- base::inherits [13:31:16.703] invokeRestart <- base::invokeRestart [13:31:16.703] length <- base::length [13:31:16.703] list <- base::list [13:31:16.703] seq.int <- base::seq.int [13:31:16.703] signalCondition <- base::signalCondition [13:31:16.703] sys.calls <- base::sys.calls [13:31:16.703] `[[` <- base::`[[` [13:31:16.703] `+` <- base::`+` [13:31:16.703] `<<-` <- base::`<<-` [13:31:16.703] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.703] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.703] 3L)] [13:31:16.703] } [13:31:16.703] function(cond) { [13:31:16.703] is_error <- inherits(cond, "error") [13:31:16.703] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.703] NULL) [13:31:16.703] if (is_error) { [13:31:16.703] sessionInformation <- function() { [13:31:16.703] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.703] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.703] search = base::search(), system = base::Sys.info()) [13:31:16.703] } [13:31:16.703] ...future.conditions[[length(...future.conditions) + [13:31:16.703] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.703] cond$call), session = sessionInformation(), [13:31:16.703] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.703] signalCondition(cond) [13:31:16.703] } [13:31:16.703] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.703] signal <- FALSE && inherits(cond, character(0)) [13:31:16.703] ...future.conditions[[length(...future.conditions) + [13:31:16.703] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.703] if (FALSE && !signal) { [13:31:16.703] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.703] { [13:31:16.703] inherits <- base::inherits [13:31:16.703] invokeRestart <- base::invokeRestart [13:31:16.703] is.null <- base::is.null [13:31:16.703] muffled <- FALSE [13:31:16.703] if (inherits(cond, "message")) { [13:31:16.703] muffled <- grepl(pattern, "muffleMessage") [13:31:16.703] if (muffled) [13:31:16.703] invokeRestart("muffleMessage") [13:31:16.703] } [13:31:16.703] else if (inherits(cond, "warning")) { [13:31:16.703] muffled <- grepl(pattern, "muffleWarning") [13:31:16.703] if (muffled) [13:31:16.703] invokeRestart("muffleWarning") [13:31:16.703] } [13:31:16.703] else if (inherits(cond, "condition")) { [13:31:16.703] if (!is.null(pattern)) { [13:31:16.703] computeRestarts <- base::computeRestarts [13:31:16.703] grepl <- base::grepl [13:31:16.703] restarts <- computeRestarts(cond) [13:31:16.703] for (restart in restarts) { [13:31:16.703] name <- restart$name [13:31:16.703] if (is.null(name)) [13:31:16.703] next [13:31:16.703] if (!grepl(pattern, name)) [13:31:16.703] next [13:31:16.703] invokeRestart(restart) [13:31:16.703] muffled <- TRUE [13:31:16.703] break [13:31:16.703] } [13:31:16.703] } [13:31:16.703] } [13:31:16.703] invisible(muffled) [13:31:16.703] } [13:31:16.703] muffleCondition(cond, pattern = "^muffle") [13:31:16.703] } [13:31:16.703] } [13:31:16.703] else { [13:31:16.703] if (TRUE) { [13:31:16.703] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.703] { [13:31:16.703] inherits <- base::inherits [13:31:16.703] invokeRestart <- base::invokeRestart [13:31:16.703] is.null <- base::is.null [13:31:16.703] muffled <- FALSE [13:31:16.703] if (inherits(cond, "message")) { [13:31:16.703] muffled <- grepl(pattern, "muffleMessage") [13:31:16.703] if (muffled) [13:31:16.703] invokeRestart("muffleMessage") [13:31:16.703] } [13:31:16.703] else if (inherits(cond, "warning")) { [13:31:16.703] muffled <- grepl(pattern, "muffleWarning") [13:31:16.703] if (muffled) [13:31:16.703] invokeRestart("muffleWarning") [13:31:16.703] } [13:31:16.703] else if (inherits(cond, "condition")) { [13:31:16.703] if (!is.null(pattern)) { [13:31:16.703] computeRestarts <- base::computeRestarts [13:31:16.703] grepl <- base::grepl [13:31:16.703] restarts <- computeRestarts(cond) [13:31:16.703] for (restart in restarts) { [13:31:16.703] name <- restart$name [13:31:16.703] if (is.null(name)) [13:31:16.703] next [13:31:16.703] if (!grepl(pattern, name)) [13:31:16.703] next [13:31:16.703] invokeRestart(restart) [13:31:16.703] muffled <- TRUE [13:31:16.703] break [13:31:16.703] } [13:31:16.703] } [13:31:16.703] } [13:31:16.703] invisible(muffled) [13:31:16.703] } [13:31:16.703] muffleCondition(cond, pattern = "^muffle") [13:31:16.703] } [13:31:16.703] } [13:31:16.703] } [13:31:16.703] })) [13:31:16.703] }, error = function(ex) { [13:31:16.703] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.703] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.703] ...future.rng), started = ...future.startTime, [13:31:16.703] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.703] version = "1.8"), class = "FutureResult") [13:31:16.703] }, finally = { [13:31:16.703] if (!identical(...future.workdir, getwd())) [13:31:16.703] setwd(...future.workdir) [13:31:16.703] { [13:31:16.703] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.703] ...future.oldOptions$nwarnings <- NULL [13:31:16.703] } [13:31:16.703] base::options(...future.oldOptions) [13:31:16.703] if (.Platform$OS.type == "windows") { [13:31:16.703] old_names <- names(...future.oldEnvVars) [13:31:16.703] envs <- base::Sys.getenv() [13:31:16.703] names <- names(envs) [13:31:16.703] common <- intersect(names, old_names) [13:31:16.703] added <- setdiff(names, old_names) [13:31:16.703] removed <- setdiff(old_names, names) [13:31:16.703] changed <- common[...future.oldEnvVars[common] != [13:31:16.703] envs[common]] [13:31:16.703] NAMES <- toupper(changed) [13:31:16.703] args <- list() [13:31:16.703] for (kk in seq_along(NAMES)) { [13:31:16.703] name <- changed[[kk]] [13:31:16.703] NAME <- NAMES[[kk]] [13:31:16.703] if (name != NAME && is.element(NAME, old_names)) [13:31:16.703] next [13:31:16.703] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.703] } [13:31:16.703] NAMES <- toupper(added) [13:31:16.703] for (kk in seq_along(NAMES)) { [13:31:16.703] name <- added[[kk]] [13:31:16.703] NAME <- NAMES[[kk]] [13:31:16.703] if (name != NAME && is.element(NAME, old_names)) [13:31:16.703] next [13:31:16.703] args[[name]] <- "" [13:31:16.703] } [13:31:16.703] NAMES <- toupper(removed) [13:31:16.703] for (kk in seq_along(NAMES)) { [13:31:16.703] name <- removed[[kk]] [13:31:16.703] NAME <- NAMES[[kk]] [13:31:16.703] if (name != NAME && is.element(NAME, old_names)) [13:31:16.703] next [13:31:16.703] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.703] } [13:31:16.703] if (length(args) > 0) [13:31:16.703] base::do.call(base::Sys.setenv, args = args) [13:31:16.703] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.703] } [13:31:16.703] else { [13:31:16.703] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.703] } [13:31:16.703] { [13:31:16.703] if (base::length(...future.futureOptionsAdded) > [13:31:16.703] 0L) { [13:31:16.703] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.703] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.703] base::options(opts) [13:31:16.703] } [13:31:16.703] { [13:31:16.703] NULL [13:31:16.703] options(future.plan = NULL) [13:31:16.703] if (is.na(NA_character_)) [13:31:16.703] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.703] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.703] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.703] .init = FALSE) [13:31:16.703] } [13:31:16.703] } [13:31:16.703] } [13:31:16.703] }) [13:31:16.703] if (TRUE) { [13:31:16.703] base::sink(type = "output", split = FALSE) [13:31:16.703] if (TRUE) { [13:31:16.703] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.703] } [13:31:16.703] else { [13:31:16.703] ...future.result["stdout"] <- base::list(NULL) [13:31:16.703] } [13:31:16.703] base::close(...future.stdout) [13:31:16.703] ...future.stdout <- NULL [13:31:16.703] } [13:31:16.703] ...future.result$conditions <- ...future.conditions [13:31:16.703] ...future.result$finished <- base::Sys.time() [13:31:16.703] ...future.result [13:31:16.703] } [13:31:16.707] - Launch lazy future ... done [13:31:16.708] run() for 'MiraiFuture' ... done [13:31:16.708] Created future: [13:31:16.709] resolved() for 'MiraiFuture' ... [13:31:16.709] - state: 'running' [13:31:16.709] - run: TRUE [13:31:16.710] - result: 'NULL' [13:31:16.710] - resolved: FALSE [13:31:16.710] resolved() for 'MiraiFuture' ... done [13:31:16.708] MiraiFuture: [13:31:16.708] Label: 'future_lapply-3' [13:31:16.708] Expression: [13:31:16.708] { [13:31:16.708] do.call(function(...) { [13:31:16.708] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.708] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.708] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.708] on.exit(options(oopts), add = TRUE) [13:31:16.708] } [13:31:16.708] { [13:31:16.708] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.708] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.708] ...future.FUN(...future.X_jj, ...) [13:31:16.708] }) [13:31:16.708] } [13:31:16.708] }, args = future.call.arguments) [13:31:16.708] } [13:31:16.708] Lazy evaluation: FALSE [13:31:16.708] Asynchronous evaluation: TRUE [13:31:16.708] Local evaluation: TRUE [13:31:16.708] Environment: R_GlobalEnv [13:31:16.708] Capture standard output: TRUE [13:31:16.708] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.708] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.708] Packages: [13:31:16.708] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.708] Resolved: TRUE [13:31:16.708] Value: [13:31:16.708] Conditions captured: [13:31:16.708] Early signaling: FALSE [13:31:16.708] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.708] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.710] Chunk #3 of 3 ... DONE [13:31:16.711] Launching 3 futures (chunks) ... DONE [13:31:16.711] Resolving 3 futures (chunks) ... [13:31:16.711] resolve() on list ... [13:31:16.711] recursive: 0 [13:31:16.711] length: 3 [13:31:16.711] [13:31:16.712] resolved() for 'MiraiFuture' ... [13:31:16.712] - state: 'running' [13:31:16.712] - run: TRUE [13:31:16.712] - result: 'NULL' [13:31:16.712] - resolved: FALSE [13:31:16.712] resolved() for 'MiraiFuture' ... done [13:31:16.713] Future #1 [13:31:16.713] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:16.713] - nx: 3 [13:31:16.713] - relay: TRUE [13:31:16.713] - stdout: TRUE [13:31:16.714] - signal: TRUE [13:31:16.714] - resignal: FALSE [13:31:16.714] - force: TRUE [13:31:16.714] - relayed: [n=3] FALSE, FALSE, FALSE [13:31:16.714] - queued futures: [n=3] FALSE, FALSE, FALSE [13:31:16.714] - until=1 [13:31:16.714] - relaying element #1 [13:31:16.715] - relayed: [n=3] TRUE, FALSE, FALSE [13:31:16.715] - queued futures: [n=3] TRUE, FALSE, FALSE [13:31:16.715] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:16.715] length: 2 (resolved future 1) [13:31:16.715] resolved() for 'MiraiFuture' ... [13:31:16.716] - state: 'running' [13:31:16.716] - run: TRUE [13:31:16.716] - result: 'NULL' [13:31:16.716] - resolved: FALSE [13:31:16.716] resolved() for 'MiraiFuture' ... done [13:31:16.716] Future #2 [13:31:16.717] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:16.717] - nx: 3 [13:31:16.717] - relay: TRUE [13:31:16.717] - stdout: TRUE [13:31:16.717] - signal: TRUE [13:31:16.717] - resignal: FALSE [13:31:16.718] - force: TRUE [13:31:16.718] - relayed: [n=3] TRUE, FALSE, FALSE [13:31:16.718] - queued futures: [n=3] TRUE, FALSE, FALSE [13:31:16.718] - until=2 [13:31:16.718] - relaying element #2 [13:31:16.719] - relayed: [n=3] TRUE, TRUE, FALSE [13:31:16.719] - queued futures: [n=3] TRUE, TRUE, FALSE [13:31:16.719] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:16.719] length: 1 (resolved future 2) [13:31:16.719] resolved() for 'MiraiFuture' ... [13:31:16.719] - state: 'running' [13:31:16.720] - run: TRUE [13:31:16.720] - result: 'NULL' [13:31:16.721] - resolved: FALSE [13:31:16.721] resolved() for 'MiraiFuture' ... done [13:31:16.721] Future #3 [13:31:16.722] signalConditionsASAP(MiraiFuture, pos=3) ... [13:31:16.722] - nx: 3 [13:31:16.722] - relay: TRUE [13:31:16.722] - stdout: TRUE [13:31:16.722] - signal: TRUE [13:31:16.722] - resignal: FALSE [13:31:16.722] - force: TRUE [13:31:16.723] - relayed: [n=3] TRUE, TRUE, FALSE [13:31:16.723] - queued futures: [n=3] TRUE, TRUE, FALSE [13:31:16.723] - until=3 [13:31:16.723] - relaying element #3 [13:31:16.723] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:16.724] - queued futures: [n=3] TRUE, TRUE, TRUE [13:31:16.724] signalConditionsASAP(MiraiFuture, pos=3) ... done [13:31:16.724] length: 0 (resolved future 3) [13:31:16.724] Relaying remaining futures [13:31:16.724] signalConditionsASAP(NULL, pos=0) ... [13:31:16.724] - nx: 3 [13:31:16.724] - relay: TRUE [13:31:16.725] - stdout: TRUE [13:31:16.725] - signal: TRUE [13:31:16.725] - resignal: FALSE [13:31:16.725] - force: TRUE [13:31:16.725] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:16.725] - queued futures: [n=3] TRUE, TRUE, TRUE - flush all [13:31:16.726] - relayed: [n=3] TRUE, TRUE, TRUE [13:31:16.726] - queued futures: [n=3] TRUE, TRUE, TRUE [13:31:16.726] signalConditionsASAP(NULL, pos=0) ... done [13:31:16.726] resolve() on list ... DONE [13:31:16.726] - Number of value chunks collected: 3 [13:31:16.727] Resolving 3 futures (chunks) ... DONE [13:31:16.727] Reducing values from 3 chunks ... [13:31:16.727] - Number of values collected after concatenation: 3 [13:31:16.727] - Number of values expected: 3 [13:31:16.727] Reducing values from 3 chunks ... DONE [13:31:16.727] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [13:31:16.730] future_lapply() ... [13:31:16.731] Number of chunks: 2 [13:31:16.731] getGlobalsAndPackagesXApply() ... [13:31:16.731] - future.globals: TRUE [13:31:16.731] getGlobalsAndPackages() ... [13:31:16.731] Searching for globals... [13:31:16.733] - globals found: [2] 'FUN', '.Internal' [13:31:16.733] Searching for globals ... DONE [13:31:16.733] Resolving globals: FALSE [13:31:16.733] The total size of the 1 globals is 2.13 KiB (2184 bytes) [13:31:16.734] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [13:31:16.734] - globals: [1] 'FUN' [13:31:16.734] [13:31:16.734] getGlobalsAndPackages() ... DONE [13:31:16.735] - globals found/used: [n=1] 'FUN' [13:31:16.735] - needed namespaces: [n=0] [13:31:16.735] Finding globals ... DONE [13:31:16.735] - use_args: TRUE [13:31:16.735] - Getting '...' globals ... [13:31:16.736] resolve() on list ... [13:31:16.736] recursive: 0 [13:31:16.736] length: 1 [13:31:16.736] elements: '...' [13:31:16.736] length: 0 (resolved future 1) [13:31:16.736] resolve() on list ... DONE [13:31:16.737] - '...' content: [n=1] 'length' [13:31:16.737] List of 1 [13:31:16.737] $ ...:List of 1 [13:31:16.737] ..$ length: int 2 [13:31:16.737] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.737] - attr(*, "where")=List of 1 [13:31:16.737] ..$ ...: [13:31:16.737] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.737] - attr(*, "resolved")= logi TRUE [13:31:16.737] - attr(*, "total_size")= num NA [13:31:16.740] - Getting '...' globals ... DONE [13:31:16.740] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:16.741] List of 2 [13:31:16.741] $ ...future.FUN:function (mode = "logical", length = 0L) [13:31:16.741] $ ... :List of 1 [13:31:16.741] ..$ length: int 2 [13:31:16.741] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.741] - attr(*, "where")=List of 2 [13:31:16.741] ..$ ...future.FUN: [13:31:16.741] ..$ ... : [13:31:16.741] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.741] - attr(*, "resolved")= logi FALSE [13:31:16.741] - attr(*, "total_size")= num 2240 [13:31:16.745] Packages to be attached in all futures: [n=0] [13:31:16.745] getGlobalsAndPackagesXApply() ... DONE [13:31:16.746] Number of futures (= number of chunks): 2 [13:31:16.746] Launching 2 futures (chunks) ... [13:31:16.746] Chunk #1 of 2 ... [13:31:16.746] - Finding globals in 'X' for chunk #1 ... [13:31:16.746] getGlobalsAndPackages() ... [13:31:16.746] Searching for globals... [13:31:16.747] [13:31:16.747] Searching for globals ... DONE [13:31:16.747] - globals: [0] [13:31:16.747] getGlobalsAndPackages() ... DONE [13:31:16.747] + additional globals found: [n=0] [13:31:16.748] + additional namespaces needed: [n=0] [13:31:16.748] - Finding globals in 'X' for chunk #1 ... DONE [13:31:16.748] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:16.748] - seeds: [13:31:16.748] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.748] getGlobalsAndPackages() ... [13:31:16.748] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.749] Resolving globals: FALSE [13:31:16.749] Tweak future expression to call with '...' arguments ... [13:31:16.749] { [13:31:16.749] do.call(function(...) { [13:31:16.749] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.749] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.749] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.749] on.exit(options(oopts), add = TRUE) [13:31:16.749] } [13:31:16.749] { [13:31:16.749] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.749] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.749] ...future.FUN(...future.X_jj, ...) [13:31:16.749] }) [13:31:16.749] } [13:31:16.749] }, args = future.call.arguments) [13:31:16.749] } [13:31:16.749] Tweak future expression to call with '...' arguments ... DONE [13:31:16.750] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.750] [13:31:16.750] getGlobalsAndPackages() ... DONE [13:31:16.751] run() for 'Future' ... [13:31:16.751] - state: 'created' [13:31:16.751] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.753] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.753] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.754] - Field: 'label' [13:31:16.754] - Field: 'local' [13:31:16.754] - Field: 'owner' [13:31:16.754] - Field: 'envir' [13:31:16.754] - Field: 'packages' [13:31:16.754] - Field: 'gc' [13:31:16.755] - Field: 'conditions' [13:31:16.755] - Field: 'expr' [13:31:16.755] - Field: 'uuid' [13:31:16.755] - Field: 'seed' [13:31:16.755] - Field: 'version' [13:31:16.755] - Field: 'result' [13:31:16.756] - Field: 'asynchronous' [13:31:16.756] - Field: 'calls' [13:31:16.756] - Field: 'globals' [13:31:16.756] - Field: 'stdout' [13:31:16.756] - Field: 'earlySignal' [13:31:16.756] - Field: 'lazy' [13:31:16.757] - Field: 'state' [13:31:16.757] - Field: '.cluster' [13:31:16.757] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.757] - Launch lazy future ... [13:31:16.757] Packages needed by the future expression (n = 0): [13:31:16.757] Packages needed by future strategies (n = 0): [13:31:16.758] { [13:31:16.758] { [13:31:16.758] { [13:31:16.758] ...future.startTime <- base::Sys.time() [13:31:16.758] { [13:31:16.758] { [13:31:16.758] { [13:31:16.758] base::local({ [13:31:16.758] has_future <- base::requireNamespace("future", [13:31:16.758] quietly = TRUE) [13:31:16.758] if (has_future) { [13:31:16.758] ns <- base::getNamespace("future") [13:31:16.758] version <- ns[[".package"]][["version"]] [13:31:16.758] if (is.null(version)) [13:31:16.758] version <- utils::packageVersion("future") [13:31:16.758] } [13:31:16.758] else { [13:31:16.758] version <- NULL [13:31:16.758] } [13:31:16.758] if (!has_future || version < "1.8.0") { [13:31:16.758] info <- base::c(r_version = base::gsub("R version ", [13:31:16.758] "", base::R.version$version.string), [13:31:16.758] platform = base::sprintf("%s (%s-bit)", [13:31:16.758] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.758] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.758] "release", "version")], collapse = " "), [13:31:16.758] hostname = base::Sys.info()[["nodename"]]) [13:31:16.758] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.758] info) [13:31:16.758] info <- base::paste(info, collapse = "; ") [13:31:16.758] if (!has_future) { [13:31:16.758] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.758] info) [13:31:16.758] } [13:31:16.758] else { [13:31:16.758] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.758] info, version) [13:31:16.758] } [13:31:16.758] base::stop(msg) [13:31:16.758] } [13:31:16.758] }) [13:31:16.758] } [13:31:16.758] ...future.strategy.old <- future::plan("list") [13:31:16.758] options(future.plan = NULL) [13:31:16.758] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.758] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.758] } [13:31:16.758] ...future.workdir <- getwd() [13:31:16.758] } [13:31:16.758] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.758] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.758] } [13:31:16.758] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.758] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:16.758] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.758] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.758] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.758] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.758] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.758] base::names(...future.oldOptions)) [13:31:16.758] } [13:31:16.758] if (FALSE) { [13:31:16.758] } [13:31:16.758] else { [13:31:16.758] if (TRUE) { [13:31:16.758] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.758] open = "w") [13:31:16.758] } [13:31:16.758] else { [13:31:16.758] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.758] windows = "NUL", "/dev/null"), open = "w") [13:31:16.758] } [13:31:16.758] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.758] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.758] base::sink(type = "output", split = FALSE) [13:31:16.758] base::close(...future.stdout) [13:31:16.758] }, add = TRUE) [13:31:16.758] } [13:31:16.758] ...future.frame <- base::sys.nframe() [13:31:16.758] ...future.conditions <- base::list() [13:31:16.758] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.758] if (FALSE) { [13:31:16.758] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.758] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.758] } [13:31:16.758] ...future.result <- base::tryCatch({ [13:31:16.758] base::withCallingHandlers({ [13:31:16.758] ...future.value <- base::withVisible(base::local({ [13:31:16.758] do.call(function(...) { [13:31:16.758] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.758] if (!identical(...future.globals.maxSize.org, [13:31:16.758] ...future.globals.maxSize)) { [13:31:16.758] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.758] on.exit(options(oopts), add = TRUE) [13:31:16.758] } [13:31:16.758] { [13:31:16.758] lapply(seq_along(...future.elements_ii), [13:31:16.758] FUN = function(jj) { [13:31:16.758] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.758] ...future.FUN(...future.X_jj, ...) [13:31:16.758] }) [13:31:16.758] } [13:31:16.758] }, args = future.call.arguments) [13:31:16.758] })) [13:31:16.758] future::FutureResult(value = ...future.value$value, [13:31:16.758] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.758] ...future.rng), globalenv = if (FALSE) [13:31:16.758] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.758] ...future.globalenv.names)) [13:31:16.758] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.758] }, condition = base::local({ [13:31:16.758] c <- base::c [13:31:16.758] inherits <- base::inherits [13:31:16.758] invokeRestart <- base::invokeRestart [13:31:16.758] length <- base::length [13:31:16.758] list <- base::list [13:31:16.758] seq.int <- base::seq.int [13:31:16.758] signalCondition <- base::signalCondition [13:31:16.758] sys.calls <- base::sys.calls [13:31:16.758] `[[` <- base::`[[` [13:31:16.758] `+` <- base::`+` [13:31:16.758] `<<-` <- base::`<<-` [13:31:16.758] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.758] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.758] 3L)] [13:31:16.758] } [13:31:16.758] function(cond) { [13:31:16.758] is_error <- inherits(cond, "error") [13:31:16.758] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.758] NULL) [13:31:16.758] if (is_error) { [13:31:16.758] sessionInformation <- function() { [13:31:16.758] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.758] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.758] search = base::search(), system = base::Sys.info()) [13:31:16.758] } [13:31:16.758] ...future.conditions[[length(...future.conditions) + [13:31:16.758] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.758] cond$call), session = sessionInformation(), [13:31:16.758] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.758] signalCondition(cond) [13:31:16.758] } [13:31:16.758] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.758] signal <- FALSE && inherits(cond, character(0)) [13:31:16.758] ...future.conditions[[length(...future.conditions) + [13:31:16.758] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.758] if (FALSE && !signal) { [13:31:16.758] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.758] { [13:31:16.758] inherits <- base::inherits [13:31:16.758] invokeRestart <- base::invokeRestart [13:31:16.758] is.null <- base::is.null [13:31:16.758] muffled <- FALSE [13:31:16.758] if (inherits(cond, "message")) { [13:31:16.758] muffled <- grepl(pattern, "muffleMessage") [13:31:16.758] if (muffled) [13:31:16.758] invokeRestart("muffleMessage") [13:31:16.758] } [13:31:16.758] else if (inherits(cond, "warning")) { [13:31:16.758] muffled <- grepl(pattern, "muffleWarning") [13:31:16.758] if (muffled) [13:31:16.758] invokeRestart("muffleWarning") [13:31:16.758] } [13:31:16.758] else if (inherits(cond, "condition")) { [13:31:16.758] if (!is.null(pattern)) { [13:31:16.758] computeRestarts <- base::computeRestarts [13:31:16.758] grepl <- base::grepl [13:31:16.758] restarts <- computeRestarts(cond) [13:31:16.758] for (restart in restarts) { [13:31:16.758] name <- restart$name [13:31:16.758] if (is.null(name)) [13:31:16.758] next [13:31:16.758] if (!grepl(pattern, name)) [13:31:16.758] next [13:31:16.758] invokeRestart(restart) [13:31:16.758] muffled <- TRUE [13:31:16.758] break [13:31:16.758] } [13:31:16.758] } [13:31:16.758] } [13:31:16.758] invisible(muffled) [13:31:16.758] } [13:31:16.758] muffleCondition(cond, pattern = "^muffle") [13:31:16.758] } [13:31:16.758] } [13:31:16.758] else { [13:31:16.758] if (TRUE) { [13:31:16.758] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.758] { [13:31:16.758] inherits <- base::inherits [13:31:16.758] invokeRestart <- base::invokeRestart [13:31:16.758] is.null <- base::is.null [13:31:16.758] muffled <- FALSE [13:31:16.758] if (inherits(cond, "message")) { [13:31:16.758] muffled <- grepl(pattern, "muffleMessage") [13:31:16.758] if (muffled) [13:31:16.758] invokeRestart("muffleMessage") [13:31:16.758] } [13:31:16.758] else if (inherits(cond, "warning")) { [13:31:16.758] muffled <- grepl(pattern, "muffleWarning") [13:31:16.758] if (muffled) [13:31:16.758] invokeRestart("muffleWarning") [13:31:16.758] } [13:31:16.758] else if (inherits(cond, "condition")) { [13:31:16.758] if (!is.null(pattern)) { [13:31:16.758] computeRestarts <- base::computeRestarts [13:31:16.758] grepl <- base::grepl [13:31:16.758] restarts <- computeRestarts(cond) [13:31:16.758] for (restart in restarts) { [13:31:16.758] name <- restart$name [13:31:16.758] if (is.null(name)) [13:31:16.758] next [13:31:16.758] if (!grepl(pattern, name)) [13:31:16.758] next [13:31:16.758] invokeRestart(restart) [13:31:16.758] muffled <- TRUE [13:31:16.758] break [13:31:16.758] } [13:31:16.758] } [13:31:16.758] } [13:31:16.758] invisible(muffled) [13:31:16.758] } [13:31:16.758] muffleCondition(cond, pattern = "^muffle") [13:31:16.758] } [13:31:16.758] } [13:31:16.758] } [13:31:16.758] })) [13:31:16.758] }, error = function(ex) { [13:31:16.758] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.758] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.758] ...future.rng), started = ...future.startTime, [13:31:16.758] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.758] version = "1.8"), class = "FutureResult") [13:31:16.758] }, finally = { [13:31:16.758] if (!identical(...future.workdir, getwd())) [13:31:16.758] setwd(...future.workdir) [13:31:16.758] { [13:31:16.758] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.758] ...future.oldOptions$nwarnings <- NULL [13:31:16.758] } [13:31:16.758] base::options(...future.oldOptions) [13:31:16.758] if (.Platform$OS.type == "windows") { [13:31:16.758] old_names <- names(...future.oldEnvVars) [13:31:16.758] envs <- base::Sys.getenv() [13:31:16.758] names <- names(envs) [13:31:16.758] common <- intersect(names, old_names) [13:31:16.758] added <- setdiff(names, old_names) [13:31:16.758] removed <- setdiff(old_names, names) [13:31:16.758] changed <- common[...future.oldEnvVars[common] != [13:31:16.758] envs[common]] [13:31:16.758] NAMES <- toupper(changed) [13:31:16.758] args <- list() [13:31:16.758] for (kk in seq_along(NAMES)) { [13:31:16.758] name <- changed[[kk]] [13:31:16.758] NAME <- NAMES[[kk]] [13:31:16.758] if (name != NAME && is.element(NAME, old_names)) [13:31:16.758] next [13:31:16.758] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.758] } [13:31:16.758] NAMES <- toupper(added) [13:31:16.758] for (kk in seq_along(NAMES)) { [13:31:16.758] name <- added[[kk]] [13:31:16.758] NAME <- NAMES[[kk]] [13:31:16.758] if (name != NAME && is.element(NAME, old_names)) [13:31:16.758] next [13:31:16.758] args[[name]] <- "" [13:31:16.758] } [13:31:16.758] NAMES <- toupper(removed) [13:31:16.758] for (kk in seq_along(NAMES)) { [13:31:16.758] name <- removed[[kk]] [13:31:16.758] NAME <- NAMES[[kk]] [13:31:16.758] if (name != NAME && is.element(NAME, old_names)) [13:31:16.758] next [13:31:16.758] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.758] } [13:31:16.758] if (length(args) > 0) [13:31:16.758] base::do.call(base::Sys.setenv, args = args) [13:31:16.758] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.758] } [13:31:16.758] else { [13:31:16.758] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.758] } [13:31:16.758] { [13:31:16.758] if (base::length(...future.futureOptionsAdded) > [13:31:16.758] 0L) { [13:31:16.758] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.758] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.758] base::options(opts) [13:31:16.758] } [13:31:16.758] { [13:31:16.758] NULL [13:31:16.758] options(future.plan = NULL) [13:31:16.758] if (is.na(NA_character_)) [13:31:16.758] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.758] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.758] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.758] .init = FALSE) [13:31:16.758] } [13:31:16.758] } [13:31:16.758] } [13:31:16.758] }) [13:31:16.758] if (TRUE) { [13:31:16.758] base::sink(type = "output", split = FALSE) [13:31:16.758] if (TRUE) { [13:31:16.758] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.758] } [13:31:16.758] else { [13:31:16.758] ...future.result["stdout"] <- base::list(NULL) [13:31:16.758] } [13:31:16.758] base::close(...future.stdout) [13:31:16.758] ...future.stdout <- NULL [13:31:16.758] } [13:31:16.758] ...future.result$conditions <- ...future.conditions [13:31:16.758] ...future.result$finished <- base::Sys.time() [13:31:16.758] ...future.result [13:31:16.758] } [13:31:16.762] - Launch lazy future ... done [13:31:16.762] run() for 'MiraiFuture' ... done [13:31:16.762] Created future: [13:31:16.764] resolved() for 'MiraiFuture' ... [13:31:16.764] - state: 'running' [13:31:16.764] - run: TRUE [13:31:16.764] - result: 'NULL' [13:31:16.764] - resolved: FALSE [13:31:16.764] resolved() for 'MiraiFuture' ... done [13:31:16.763] MiraiFuture: [13:31:16.763] Label: 'future_lapply-1' [13:31:16.763] Expression: [13:31:16.763] { [13:31:16.763] do.call(function(...) { [13:31:16.763] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.763] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.763] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.763] on.exit(options(oopts), add = TRUE) [13:31:16.763] } [13:31:16.763] { [13:31:16.763] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.763] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.763] ...future.FUN(...future.X_jj, ...) [13:31:16.763] }) [13:31:16.763] } [13:31:16.763] }, args = future.call.arguments) [13:31:16.763] } [13:31:16.763] Lazy evaluation: FALSE [13:31:16.763] Asynchronous evaluation: TRUE [13:31:16.763] Local evaluation: TRUE [13:31:16.763] Environment: R_GlobalEnv [13:31:16.763] Capture standard output: TRUE [13:31:16.763] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.763] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.763] Packages: [13:31:16.763] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.763] Resolved: TRUE [13:31:16.763] Value: [13:31:16.763] Conditions captured: [13:31:16.763] Early signaling: FALSE [13:31:16.763] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.763] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.765] Chunk #1 of 2 ... DONE [13:31:16.765] Chunk #2 of 2 ... [13:31:16.765] - Finding globals in 'X' for chunk #2 ... [13:31:16.765] getGlobalsAndPackages() ... [13:31:16.766] Searching for globals... [13:31:16.766] [13:31:16.766] Searching for globals ... DONE [13:31:16.766] - globals: [0] [13:31:16.766] getGlobalsAndPackages() ... DONE [13:31:16.767] + additional globals found: [n=0] [13:31:16.767] + additional namespaces needed: [n=0] [13:31:16.767] - Finding globals in 'X' for chunk #2 ... DONE [13:31:16.767] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:16.767] - seeds: [13:31:16.767] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.768] getGlobalsAndPackages() ... [13:31:16.768] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.768] Resolving globals: FALSE [13:31:16.768] Tweak future expression to call with '...' arguments ... [13:31:16.768] { [13:31:16.768] do.call(function(...) { [13:31:16.768] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.768] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.768] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.768] on.exit(options(oopts), add = TRUE) [13:31:16.768] } [13:31:16.768] { [13:31:16.768] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.768] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.768] ...future.FUN(...future.X_jj, ...) [13:31:16.768] }) [13:31:16.768] } [13:31:16.768] }, args = future.call.arguments) [13:31:16.768] } [13:31:16.769] Tweak future expression to call with '...' arguments ... DONE [13:31:16.769] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.769] [13:31:16.769] getGlobalsAndPackages() ... DONE [13:31:16.770] run() for 'Future' ... [13:31:16.770] - state: 'created' [13:31:16.770] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.772] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.773] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.773] - Field: 'label' [13:31:16.773] - Field: 'local' [13:31:16.773] - Field: 'owner' [13:31:16.773] - Field: 'envir' [13:31:16.773] - Field: 'packages' [13:31:16.774] - Field: 'gc' [13:31:16.774] - Field: 'conditions' [13:31:16.774] - Field: 'expr' [13:31:16.774] - Field: 'uuid' [13:31:16.774] - Field: 'seed' [13:31:16.775] - Field: 'version' [13:31:16.775] - Field: 'result' [13:31:16.775] - Field: 'asynchronous' [13:31:16.775] - Field: 'calls' [13:31:16.775] - Field: 'globals' [13:31:16.775] - Field: 'stdout' [13:31:16.776] - Field: 'earlySignal' [13:31:16.776] - Field: 'lazy' [13:31:16.776] - Field: 'state' [13:31:16.776] - Field: '.cluster' [13:31:16.777] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.777] - Launch lazy future ... [13:31:16.777] Packages needed by the future expression (n = 0): [13:31:16.778] Packages needed by future strategies (n = 0): [13:31:16.778] { [13:31:16.778] { [13:31:16.778] { [13:31:16.778] ...future.startTime <- base::Sys.time() [13:31:16.778] { [13:31:16.778] { [13:31:16.778] { [13:31:16.778] base::local({ [13:31:16.778] has_future <- base::requireNamespace("future", [13:31:16.778] quietly = TRUE) [13:31:16.778] if (has_future) { [13:31:16.778] ns <- base::getNamespace("future") [13:31:16.778] version <- ns[[".package"]][["version"]] [13:31:16.778] if (is.null(version)) [13:31:16.778] version <- utils::packageVersion("future") [13:31:16.778] } [13:31:16.778] else { [13:31:16.778] version <- NULL [13:31:16.778] } [13:31:16.778] if (!has_future || version < "1.8.0") { [13:31:16.778] info <- base::c(r_version = base::gsub("R version ", [13:31:16.778] "", base::R.version$version.string), [13:31:16.778] platform = base::sprintf("%s (%s-bit)", [13:31:16.778] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.778] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.778] "release", "version")], collapse = " "), [13:31:16.778] hostname = base::Sys.info()[["nodename"]]) [13:31:16.778] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.778] info) [13:31:16.778] info <- base::paste(info, collapse = "; ") [13:31:16.778] if (!has_future) { [13:31:16.778] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.778] info) [13:31:16.778] } [13:31:16.778] else { [13:31:16.778] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.778] info, version) [13:31:16.778] } [13:31:16.778] base::stop(msg) [13:31:16.778] } [13:31:16.778] }) [13:31:16.778] } [13:31:16.778] ...future.strategy.old <- future::plan("list") [13:31:16.778] options(future.plan = NULL) [13:31:16.778] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.778] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.778] } [13:31:16.778] ...future.workdir <- getwd() [13:31:16.778] } [13:31:16.778] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.778] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.778] } [13:31:16.778] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.778] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:16.778] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.778] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.778] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.778] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.778] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.778] base::names(...future.oldOptions)) [13:31:16.778] } [13:31:16.778] if (FALSE) { [13:31:16.778] } [13:31:16.778] else { [13:31:16.778] if (TRUE) { [13:31:16.778] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.778] open = "w") [13:31:16.778] } [13:31:16.778] else { [13:31:16.778] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.778] windows = "NUL", "/dev/null"), open = "w") [13:31:16.778] } [13:31:16.778] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.778] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.778] base::sink(type = "output", split = FALSE) [13:31:16.778] base::close(...future.stdout) [13:31:16.778] }, add = TRUE) [13:31:16.778] } [13:31:16.778] ...future.frame <- base::sys.nframe() [13:31:16.778] ...future.conditions <- base::list() [13:31:16.778] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.778] if (FALSE) { [13:31:16.778] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.778] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.778] } [13:31:16.778] ...future.result <- base::tryCatch({ [13:31:16.778] base::withCallingHandlers({ [13:31:16.778] ...future.value <- base::withVisible(base::local({ [13:31:16.778] do.call(function(...) { [13:31:16.778] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.778] if (!identical(...future.globals.maxSize.org, [13:31:16.778] ...future.globals.maxSize)) { [13:31:16.778] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.778] on.exit(options(oopts), add = TRUE) [13:31:16.778] } [13:31:16.778] { [13:31:16.778] lapply(seq_along(...future.elements_ii), [13:31:16.778] FUN = function(jj) { [13:31:16.778] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.778] ...future.FUN(...future.X_jj, ...) [13:31:16.778] }) [13:31:16.778] } [13:31:16.778] }, args = future.call.arguments) [13:31:16.778] })) [13:31:16.778] future::FutureResult(value = ...future.value$value, [13:31:16.778] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.778] ...future.rng), globalenv = if (FALSE) [13:31:16.778] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.778] ...future.globalenv.names)) [13:31:16.778] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.778] }, condition = base::local({ [13:31:16.778] c <- base::c [13:31:16.778] inherits <- base::inherits [13:31:16.778] invokeRestart <- base::invokeRestart [13:31:16.778] length <- base::length [13:31:16.778] list <- base::list [13:31:16.778] seq.int <- base::seq.int [13:31:16.778] signalCondition <- base::signalCondition [13:31:16.778] sys.calls <- base::sys.calls [13:31:16.778] `[[` <- base::`[[` [13:31:16.778] `+` <- base::`+` [13:31:16.778] `<<-` <- base::`<<-` [13:31:16.778] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.778] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.778] 3L)] [13:31:16.778] } [13:31:16.778] function(cond) { [13:31:16.778] is_error <- inherits(cond, "error") [13:31:16.778] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.778] NULL) [13:31:16.778] if (is_error) { [13:31:16.778] sessionInformation <- function() { [13:31:16.778] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.778] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.778] search = base::search(), system = base::Sys.info()) [13:31:16.778] } [13:31:16.778] ...future.conditions[[length(...future.conditions) + [13:31:16.778] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.778] cond$call), session = sessionInformation(), [13:31:16.778] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.778] signalCondition(cond) [13:31:16.778] } [13:31:16.778] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.778] signal <- FALSE && inherits(cond, character(0)) [13:31:16.778] ...future.conditions[[length(...future.conditions) + [13:31:16.778] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.778] if (FALSE && !signal) { [13:31:16.778] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.778] { [13:31:16.778] inherits <- base::inherits [13:31:16.778] invokeRestart <- base::invokeRestart [13:31:16.778] is.null <- base::is.null [13:31:16.778] muffled <- FALSE [13:31:16.778] if (inherits(cond, "message")) { [13:31:16.778] muffled <- grepl(pattern, "muffleMessage") [13:31:16.778] if (muffled) [13:31:16.778] invokeRestart("muffleMessage") [13:31:16.778] } [13:31:16.778] else if (inherits(cond, "warning")) { [13:31:16.778] muffled <- grepl(pattern, "muffleWarning") [13:31:16.778] if (muffled) [13:31:16.778] invokeRestart("muffleWarning") [13:31:16.778] } [13:31:16.778] else if (inherits(cond, "condition")) { [13:31:16.778] if (!is.null(pattern)) { [13:31:16.778] computeRestarts <- base::computeRestarts [13:31:16.778] grepl <- base::grepl [13:31:16.778] restarts <- computeRestarts(cond) [13:31:16.778] for (restart in restarts) { [13:31:16.778] name <- restart$name [13:31:16.778] if (is.null(name)) [13:31:16.778] next [13:31:16.778] if (!grepl(pattern, name)) [13:31:16.778] next [13:31:16.778] invokeRestart(restart) [13:31:16.778] muffled <- TRUE [13:31:16.778] break [13:31:16.778] } [13:31:16.778] } [13:31:16.778] } [13:31:16.778] invisible(muffled) [13:31:16.778] } [13:31:16.778] muffleCondition(cond, pattern = "^muffle") [13:31:16.778] } [13:31:16.778] } [13:31:16.778] else { [13:31:16.778] if (TRUE) { [13:31:16.778] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.778] { [13:31:16.778] inherits <- base::inherits [13:31:16.778] invokeRestart <- base::invokeRestart [13:31:16.778] is.null <- base::is.null [13:31:16.778] muffled <- FALSE [13:31:16.778] if (inherits(cond, "message")) { [13:31:16.778] muffled <- grepl(pattern, "muffleMessage") [13:31:16.778] if (muffled) [13:31:16.778] invokeRestart("muffleMessage") [13:31:16.778] } [13:31:16.778] else if (inherits(cond, "warning")) { [13:31:16.778] muffled <- grepl(pattern, "muffleWarning") [13:31:16.778] if (muffled) [13:31:16.778] invokeRestart("muffleWarning") [13:31:16.778] } [13:31:16.778] else if (inherits(cond, "condition")) { [13:31:16.778] if (!is.null(pattern)) { [13:31:16.778] computeRestarts <- base::computeRestarts [13:31:16.778] grepl <- base::grepl [13:31:16.778] restarts <- computeRestarts(cond) [13:31:16.778] for (restart in restarts) { [13:31:16.778] name <- restart$name [13:31:16.778] if (is.null(name)) [13:31:16.778] next [13:31:16.778] if (!grepl(pattern, name)) [13:31:16.778] next [13:31:16.778] invokeRestart(restart) [13:31:16.778] muffled <- TRUE [13:31:16.778] break [13:31:16.778] } [13:31:16.778] } [13:31:16.778] } [13:31:16.778] invisible(muffled) [13:31:16.778] } [13:31:16.778] muffleCondition(cond, pattern = "^muffle") [13:31:16.778] } [13:31:16.778] } [13:31:16.778] } [13:31:16.778] })) [13:31:16.778] }, error = function(ex) { [13:31:16.778] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.778] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.778] ...future.rng), started = ...future.startTime, [13:31:16.778] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.778] version = "1.8"), class = "FutureResult") [13:31:16.778] }, finally = { [13:31:16.778] if (!identical(...future.workdir, getwd())) [13:31:16.778] setwd(...future.workdir) [13:31:16.778] { [13:31:16.778] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.778] ...future.oldOptions$nwarnings <- NULL [13:31:16.778] } [13:31:16.778] base::options(...future.oldOptions) [13:31:16.778] if (.Platform$OS.type == "windows") { [13:31:16.778] old_names <- names(...future.oldEnvVars) [13:31:16.778] envs <- base::Sys.getenv() [13:31:16.778] names <- names(envs) [13:31:16.778] common <- intersect(names, old_names) [13:31:16.778] added <- setdiff(names, old_names) [13:31:16.778] removed <- setdiff(old_names, names) [13:31:16.778] changed <- common[...future.oldEnvVars[common] != [13:31:16.778] envs[common]] [13:31:16.778] NAMES <- toupper(changed) [13:31:16.778] args <- list() [13:31:16.778] for (kk in seq_along(NAMES)) { [13:31:16.778] name <- changed[[kk]] [13:31:16.778] NAME <- NAMES[[kk]] [13:31:16.778] if (name != NAME && is.element(NAME, old_names)) [13:31:16.778] next [13:31:16.778] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.778] } [13:31:16.778] NAMES <- toupper(added) [13:31:16.778] for (kk in seq_along(NAMES)) { [13:31:16.778] name <- added[[kk]] [13:31:16.778] NAME <- NAMES[[kk]] [13:31:16.778] if (name != NAME && is.element(NAME, old_names)) [13:31:16.778] next [13:31:16.778] args[[name]] <- "" [13:31:16.778] } [13:31:16.778] NAMES <- toupper(removed) [13:31:16.778] for (kk in seq_along(NAMES)) { [13:31:16.778] name <- removed[[kk]] [13:31:16.778] NAME <- NAMES[[kk]] [13:31:16.778] if (name != NAME && is.element(NAME, old_names)) [13:31:16.778] next [13:31:16.778] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.778] } [13:31:16.778] if (length(args) > 0) [13:31:16.778] base::do.call(base::Sys.setenv, args = args) [13:31:16.778] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.778] } [13:31:16.778] else { [13:31:16.778] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.778] } [13:31:16.778] { [13:31:16.778] if (base::length(...future.futureOptionsAdded) > [13:31:16.778] 0L) { [13:31:16.778] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.778] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.778] base::options(opts) [13:31:16.778] } [13:31:16.778] { [13:31:16.778] NULL [13:31:16.778] options(future.plan = NULL) [13:31:16.778] if (is.na(NA_character_)) [13:31:16.778] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.778] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.778] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.778] .init = FALSE) [13:31:16.778] } [13:31:16.778] } [13:31:16.778] } [13:31:16.778] }) [13:31:16.778] if (TRUE) { [13:31:16.778] base::sink(type = "output", split = FALSE) [13:31:16.778] if (TRUE) { [13:31:16.778] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.778] } [13:31:16.778] else { [13:31:16.778] ...future.result["stdout"] <- base::list(NULL) [13:31:16.778] } [13:31:16.778] base::close(...future.stdout) [13:31:16.778] ...future.stdout <- NULL [13:31:16.778] } [13:31:16.778] ...future.result$conditions <- ...future.conditions [13:31:16.778] ...future.result$finished <- base::Sys.time() [13:31:16.778] ...future.result [13:31:16.778] } [13:31:16.782] - Launch lazy future ... done [13:31:16.782] run() for 'MiraiFuture' ... done [13:31:16.783] Created future: [13:31:16.784] resolved() for 'MiraiFuture' ... [13:31:16.784] - state: 'running' [13:31:16.784] - run: TRUE [13:31:16.784] - result: 'NULL' [13:31:16.784] - resolved: FALSE [13:31:16.785] resolved() for 'MiraiFuture' ... done [13:31:16.783] MiraiFuture: [13:31:16.783] Label: 'future_lapply-2' [13:31:16.783] Expression: [13:31:16.783] { [13:31:16.783] do.call(function(...) { [13:31:16.783] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.783] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.783] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.783] on.exit(options(oopts), add = TRUE) [13:31:16.783] } [13:31:16.783] { [13:31:16.783] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.783] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.783] ...future.FUN(...future.X_jj, ...) [13:31:16.783] }) [13:31:16.783] } [13:31:16.783] }, args = future.call.arguments) [13:31:16.783] } [13:31:16.783] Lazy evaluation: FALSE [13:31:16.783] Asynchronous evaluation: TRUE [13:31:16.783] Local evaluation: TRUE [13:31:16.783] Environment: R_GlobalEnv [13:31:16.783] Capture standard output: TRUE [13:31:16.783] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.783] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.783] Packages: [13:31:16.783] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.783] Resolved: TRUE [13:31:16.783] Value: [13:31:16.783] Conditions captured: [13:31:16.783] Early signaling: FALSE [13:31:16.783] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.783] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.785] Chunk #2 of 2 ... DONE [13:31:16.785] Launching 2 futures (chunks) ... DONE [13:31:16.785] Resolving 2 futures (chunks) ... [13:31:16.786] resolve() on list ... [13:31:16.786] recursive: 0 [13:31:16.786] length: 2 [13:31:16.786] [13:31:16.786] resolved() for 'MiraiFuture' ... [13:31:16.786] - state: 'running' [13:31:16.787] - run: TRUE [13:31:16.787] - result: 'NULL' [13:31:16.787] - resolved: FALSE [13:31:16.787] resolved() for 'MiraiFuture' ... done [13:31:16.787] Future #1 [13:31:16.787] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:16.788] - nx: 2 [13:31:16.788] - relay: TRUE [13:31:16.788] - stdout: TRUE [13:31:16.788] - signal: TRUE [13:31:16.788] - resignal: FALSE [13:31:16.788] - force: TRUE [13:31:16.789] - relayed: [n=2] FALSE, FALSE [13:31:16.789] - queued futures: [n=2] FALSE, FALSE [13:31:16.789] - until=1 [13:31:16.789] - relaying element #1 [13:31:16.789] - relayed: [n=2] TRUE, FALSE [13:31:16.789] - queued futures: [n=2] TRUE, FALSE [13:31:16.790] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:16.790] length: 1 (resolved future 1) [13:31:16.790] resolved() for 'MiraiFuture' ... [13:31:16.790] - state: 'running' [13:31:16.790] - run: TRUE [13:31:16.790] - result: 'NULL' [13:31:16.791] - resolved: FALSE [13:31:16.791] resolved() for 'MiraiFuture' ... done [13:31:16.791] Future #2 [13:31:16.791] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:16.791] - nx: 2 [13:31:16.792] - relay: TRUE [13:31:16.792] - stdout: TRUE [13:31:16.792] - signal: TRUE [13:31:16.792] - resignal: FALSE [13:31:16.792] - force: TRUE [13:31:16.792] - relayed: [n=2] TRUE, FALSE [13:31:16.792] - queued futures: [n=2] TRUE, FALSE [13:31:16.793] - until=2 [13:31:16.793] - relaying element #2 [13:31:16.793] - relayed: [n=2] TRUE, TRUE [13:31:16.793] - queued futures: [n=2] TRUE, TRUE [13:31:16.793] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:16.793] length: 0 (resolved future 2) [13:31:16.794] Relaying remaining futures [13:31:16.794] signalConditionsASAP(NULL, pos=0) ... [13:31:16.794] - nx: 2 [13:31:16.794] - relay: TRUE [13:31:16.794] - stdout: TRUE [13:31:16.794] - signal: TRUE [13:31:16.795] - resignal: FALSE [13:31:16.795] - force: TRUE [13:31:16.795] - relayed: [n=2] TRUE, TRUE [13:31:16.795] - queued futures: [n=2] TRUE, TRUE - flush all [13:31:16.795] - relayed: [n=2] TRUE, TRUE [13:31:16.795] - queued futures: [n=2] TRUE, TRUE [13:31:16.795] signalConditionsASAP(NULL, pos=0) ... done [13:31:16.796] resolve() on list ... DONE [13:31:16.796] - Number of value chunks collected: 2 [13:31:16.796] Resolving 2 futures (chunks) ... DONE [13:31:16.796] Reducing values from 2 chunks ... [13:31:16.796] - Number of values collected after concatenation: 3 [13:31:16.797] - Number of values expected: 3 [13:31:16.797] Reducing values from 2 chunks ... DONE [13:31:16.797] future_lapply() ... DONE List of 1 $ y:List of 3 ..$ a: int [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... List of 1 $ x:List of 1 ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... List of 1 $ y0:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" [13:31:16.808] - plan('mirai_multisession') ...[13:31:16.808] plan(): Setting new future strategy stack: [13:31:16.808] List of future strategies: [13:31:16.808] 1. mirai_multisession: [13:31:16.808] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:16.808] - tweaked: FALSE [13:31:16.808] - call: plan(strategy) [13:31:16.808] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:16.809] < mirai | $data > [13:31:16.811] getGlobalsAndPackages() ... [13:31:16.811] Not searching for globals [13:31:16.811] - globals: [0] [13:31:16.811] getGlobalsAndPackages() ... DONE [13:31:16.811] getGlobalsAndPackages() ... [13:31:16.812] [13:31:16.812] - globals: [0] [13:31:16.812] getGlobalsAndPackages() ... DONE [13:31:16.812] Packages needed by the future expression (n = 0): [13:31:16.812] Packages needed by future strategies (n = 0): [13:31:16.813] { [13:31:16.813] { [13:31:16.813] { [13:31:16.813] ...future.startTime <- base::Sys.time() [13:31:16.813] { [13:31:16.813] { [13:31:16.813] { [13:31:16.813] base::local({ [13:31:16.813] has_future <- base::requireNamespace("future", [13:31:16.813] quietly = TRUE) [13:31:16.813] if (has_future) { [13:31:16.813] ns <- base::getNamespace("future") [13:31:16.813] version <- ns[[".package"]][["version"]] [13:31:16.813] if (is.null(version)) [13:31:16.813] version <- utils::packageVersion("future") [13:31:16.813] } [13:31:16.813] else { [13:31:16.813] version <- NULL [13:31:16.813] } [13:31:16.813] if (!has_future || version < "1.8.0") { [13:31:16.813] info <- base::c(r_version = base::gsub("R version ", [13:31:16.813] "", base::R.version$version.string), [13:31:16.813] platform = base::sprintf("%s (%s-bit)", [13:31:16.813] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.813] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.813] "release", "version")], collapse = " "), [13:31:16.813] hostname = base::Sys.info()[["nodename"]]) [13:31:16.813] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.813] info) [13:31:16.813] info <- base::paste(info, collapse = "; ") [13:31:16.813] if (!has_future) { [13:31:16.813] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.813] info) [13:31:16.813] } [13:31:16.813] else { [13:31:16.813] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.813] info, version) [13:31:16.813] } [13:31:16.813] base::stop(msg) [13:31:16.813] } [13:31:16.813] }) [13:31:16.813] } [13:31:16.813] ...future.strategy.old <- future::plan("list") [13:31:16.813] options(future.plan = NULL) [13:31:16.813] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.813] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.813] } [13:31:16.813] ...future.workdir <- getwd() [13:31:16.813] } [13:31:16.813] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.813] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.813] } [13:31:16.813] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.813] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:16.813] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.813] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.813] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.813] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.813] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.813] base::names(...future.oldOptions)) [13:31:16.813] } [13:31:16.813] if (FALSE) { [13:31:16.813] } [13:31:16.813] else { [13:31:16.813] if (TRUE) { [13:31:16.813] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.813] open = "w") [13:31:16.813] } [13:31:16.813] else { [13:31:16.813] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.813] windows = "NUL", "/dev/null"), open = "w") [13:31:16.813] } [13:31:16.813] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.813] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.813] base::sink(type = "output", split = FALSE) [13:31:16.813] base::close(...future.stdout) [13:31:16.813] }, add = TRUE) [13:31:16.813] } [13:31:16.813] ...future.frame <- base::sys.nframe() [13:31:16.813] ...future.conditions <- base::list() [13:31:16.813] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.813] if (FALSE) { [13:31:16.813] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.813] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.813] } [13:31:16.813] ...future.result <- base::tryCatch({ [13:31:16.813] base::withCallingHandlers({ [13:31:16.813] ...future.value <- base::withVisible(base::local(NA)) [13:31:16.813] future::FutureResult(value = ...future.value$value, [13:31:16.813] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.813] ...future.rng), globalenv = if (FALSE) [13:31:16.813] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.813] ...future.globalenv.names)) [13:31:16.813] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.813] }, condition = base::local({ [13:31:16.813] c <- base::c [13:31:16.813] inherits <- base::inherits [13:31:16.813] invokeRestart <- base::invokeRestart [13:31:16.813] length <- base::length [13:31:16.813] list <- base::list [13:31:16.813] seq.int <- base::seq.int [13:31:16.813] signalCondition <- base::signalCondition [13:31:16.813] sys.calls <- base::sys.calls [13:31:16.813] `[[` <- base::`[[` [13:31:16.813] `+` <- base::`+` [13:31:16.813] `<<-` <- base::`<<-` [13:31:16.813] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.813] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.813] 3L)] [13:31:16.813] } [13:31:16.813] function(cond) { [13:31:16.813] is_error <- inherits(cond, "error") [13:31:16.813] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.813] NULL) [13:31:16.813] if (is_error) { [13:31:16.813] sessionInformation <- function() { [13:31:16.813] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.813] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.813] search = base::search(), system = base::Sys.info()) [13:31:16.813] } [13:31:16.813] ...future.conditions[[length(...future.conditions) + [13:31:16.813] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.813] cond$call), session = sessionInformation(), [13:31:16.813] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.813] signalCondition(cond) [13:31:16.813] } [13:31:16.813] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.813] signal <- FALSE && inherits(cond, character(0)) [13:31:16.813] ...future.conditions[[length(...future.conditions) + [13:31:16.813] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.813] if (FALSE && !signal) { [13:31:16.813] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.813] { [13:31:16.813] inherits <- base::inherits [13:31:16.813] invokeRestart <- base::invokeRestart [13:31:16.813] is.null <- base::is.null [13:31:16.813] muffled <- FALSE [13:31:16.813] if (inherits(cond, "message")) { [13:31:16.813] muffled <- grepl(pattern, "muffleMessage") [13:31:16.813] if (muffled) [13:31:16.813] invokeRestart("muffleMessage") [13:31:16.813] } [13:31:16.813] else if (inherits(cond, "warning")) { [13:31:16.813] muffled <- grepl(pattern, "muffleWarning") [13:31:16.813] if (muffled) [13:31:16.813] invokeRestart("muffleWarning") [13:31:16.813] } [13:31:16.813] else if (inherits(cond, "condition")) { [13:31:16.813] if (!is.null(pattern)) { [13:31:16.813] computeRestarts <- base::computeRestarts [13:31:16.813] grepl <- base::grepl [13:31:16.813] restarts <- computeRestarts(cond) [13:31:16.813] for (restart in restarts) { [13:31:16.813] name <- restart$name [13:31:16.813] if (is.null(name)) [13:31:16.813] next [13:31:16.813] if (!grepl(pattern, name)) [13:31:16.813] next [13:31:16.813] invokeRestart(restart) [13:31:16.813] muffled <- TRUE [13:31:16.813] break [13:31:16.813] } [13:31:16.813] } [13:31:16.813] } [13:31:16.813] invisible(muffled) [13:31:16.813] } [13:31:16.813] muffleCondition(cond, pattern = "^muffle") [13:31:16.813] } [13:31:16.813] } [13:31:16.813] else { [13:31:16.813] if (TRUE) { [13:31:16.813] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.813] { [13:31:16.813] inherits <- base::inherits [13:31:16.813] invokeRestart <- base::invokeRestart [13:31:16.813] is.null <- base::is.null [13:31:16.813] muffled <- FALSE [13:31:16.813] if (inherits(cond, "message")) { [13:31:16.813] muffled <- grepl(pattern, "muffleMessage") [13:31:16.813] if (muffled) [13:31:16.813] invokeRestart("muffleMessage") [13:31:16.813] } [13:31:16.813] else if (inherits(cond, "warning")) { [13:31:16.813] muffled <- grepl(pattern, "muffleWarning") [13:31:16.813] if (muffled) [13:31:16.813] invokeRestart("muffleWarning") [13:31:16.813] } [13:31:16.813] else if (inherits(cond, "condition")) { [13:31:16.813] if (!is.null(pattern)) { [13:31:16.813] computeRestarts <- base::computeRestarts [13:31:16.813] grepl <- base::grepl [13:31:16.813] restarts <- computeRestarts(cond) [13:31:16.813] for (restart in restarts) { [13:31:16.813] name <- restart$name [13:31:16.813] if (is.null(name)) [13:31:16.813] next [13:31:16.813] if (!grepl(pattern, name)) [13:31:16.813] next [13:31:16.813] invokeRestart(restart) [13:31:16.813] muffled <- TRUE [13:31:16.813] break [13:31:16.813] } [13:31:16.813] } [13:31:16.813] } [13:31:16.813] invisible(muffled) [13:31:16.813] } [13:31:16.813] muffleCondition(cond, pattern = "^muffle") [13:31:16.813] } [13:31:16.813] } [13:31:16.813] } [13:31:16.813] })) [13:31:16.813] }, error = function(ex) { [13:31:16.813] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.813] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.813] ...future.rng), started = ...future.startTime, [13:31:16.813] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.813] version = "1.8"), class = "FutureResult") [13:31:16.813] }, finally = { [13:31:16.813] if (!identical(...future.workdir, getwd())) [13:31:16.813] setwd(...future.workdir) [13:31:16.813] { [13:31:16.813] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.813] ...future.oldOptions$nwarnings <- NULL [13:31:16.813] } [13:31:16.813] base::options(...future.oldOptions) [13:31:16.813] if (.Platform$OS.type == "windows") { [13:31:16.813] old_names <- names(...future.oldEnvVars) [13:31:16.813] envs <- base::Sys.getenv() [13:31:16.813] names <- names(envs) [13:31:16.813] common <- intersect(names, old_names) [13:31:16.813] added <- setdiff(names, old_names) [13:31:16.813] removed <- setdiff(old_names, names) [13:31:16.813] changed <- common[...future.oldEnvVars[common] != [13:31:16.813] envs[common]] [13:31:16.813] NAMES <- toupper(changed) [13:31:16.813] args <- list() [13:31:16.813] for (kk in seq_along(NAMES)) { [13:31:16.813] name <- changed[[kk]] [13:31:16.813] NAME <- NAMES[[kk]] [13:31:16.813] if (name != NAME && is.element(NAME, old_names)) [13:31:16.813] next [13:31:16.813] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.813] } [13:31:16.813] NAMES <- toupper(added) [13:31:16.813] for (kk in seq_along(NAMES)) { [13:31:16.813] name <- added[[kk]] [13:31:16.813] NAME <- NAMES[[kk]] [13:31:16.813] if (name != NAME && is.element(NAME, old_names)) [13:31:16.813] next [13:31:16.813] args[[name]] <- "" [13:31:16.813] } [13:31:16.813] NAMES <- toupper(removed) [13:31:16.813] for (kk in seq_along(NAMES)) { [13:31:16.813] name <- removed[[kk]] [13:31:16.813] NAME <- NAMES[[kk]] [13:31:16.813] if (name != NAME && is.element(NAME, old_names)) [13:31:16.813] next [13:31:16.813] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.813] } [13:31:16.813] if (length(args) > 0) [13:31:16.813] base::do.call(base::Sys.setenv, args = args) [13:31:16.813] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.813] } [13:31:16.813] else { [13:31:16.813] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.813] } [13:31:16.813] { [13:31:16.813] if (base::length(...future.futureOptionsAdded) > [13:31:16.813] 0L) { [13:31:16.813] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.813] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.813] base::options(opts) [13:31:16.813] } [13:31:16.813] { [13:31:16.813] NULL [13:31:16.813] options(future.plan = NULL) [13:31:16.813] if (is.na(NA_character_)) [13:31:16.813] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.813] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.813] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.813] .init = FALSE) [13:31:16.813] } [13:31:16.813] } [13:31:16.813] } [13:31:16.813] }) [13:31:16.813] if (TRUE) { [13:31:16.813] base::sink(type = "output", split = FALSE) [13:31:16.813] if (TRUE) { [13:31:16.813] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.813] } [13:31:16.813] else { [13:31:16.813] ...future.result["stdout"] <- base::list(NULL) [13:31:16.813] } [13:31:16.813] base::close(...future.stdout) [13:31:16.813] ...future.stdout <- NULL [13:31:16.813] } [13:31:16.813] ...future.result$conditions <- ...future.conditions [13:31:16.813] ...future.result$finished <- base::Sys.time() [13:31:16.813] ...future.result [13:31:16.813] } [13:31:16.819] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:16.819] plan(): nbrOfWorkers() = 2 [13:31:16.819] future_lapply() ... [13:31:16.831] Number of chunks: 1 [13:31:16.831] getGlobalsAndPackagesXApply() ... [13:31:16.831] - future.globals: TRUE [13:31:16.831] getGlobalsAndPackages() ... [13:31:16.831] Searching for globals... [13:31:16.840] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:31:16.841] Searching for globals ... DONE [13:31:16.841] Resolving globals: FALSE [13:31:16.842] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:31:16.842] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [13:31:16.843] - globals: [1] 'FUN' [13:31:16.843] - packages: [1] 'future' [13:31:16.843] getGlobalsAndPackages() ... DONE [13:31:16.843] - globals found/used: [n=1] 'FUN' [13:31:16.843] - needed namespaces: [n=1] 'future' [13:31:16.843] Finding globals ... DONE [13:31:16.843] - use_args: TRUE [13:31:16.844] - Getting '...' globals ... [13:31:16.844] resolve() on list ... [13:31:16.844] recursive: 0 [13:31:16.844] length: 1 [13:31:16.844] elements: '...' [13:31:16.845] length: 0 (resolved future 1) [13:31:16.845] resolve() on list ... DONE [13:31:16.845] - '...' content: [n=2] 'collapse', 'maxHead' [13:31:16.845] List of 1 [13:31:16.845] $ ...:List of 2 [13:31:16.845] ..$ collapse: chr "; " [13:31:16.845] ..$ maxHead : int 3 [13:31:16.845] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.845] - attr(*, "where")=List of 1 [13:31:16.845] ..$ ...: [13:31:16.845] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.845] - attr(*, "resolved")= logi TRUE [13:31:16.845] - attr(*, "total_size")= num NA [13:31:16.849] - Getting '...' globals ... DONE [13:31:16.850] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:16.850] List of 2 [13:31:16.850] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:31:16.850] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:31:16.850] $ ... :List of 2 [13:31:16.850] ..$ collapse: chr "; " [13:31:16.850] ..$ maxHead : int 3 [13:31:16.850] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.850] - attr(*, "where")=List of 2 [13:31:16.850] ..$ ...future.FUN: [13:31:16.850] ..$ ... : [13:31:16.850] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.850] - attr(*, "resolved")= logi FALSE [13:31:16.850] - attr(*, "total_size")= num 71456 [13:31:16.854] Packages to be attached in all futures: [n=1] 'future' [13:31:16.854] getGlobalsAndPackagesXApply() ... DONE [13:31:16.854] Number of futures (= number of chunks): 1 [13:31:16.855] Launching 1 futures (chunks) ... [13:31:16.855] Chunk #1 of 1 ... [13:31:16.855] - Finding globals in 'X' for chunk #1 ... [13:31:16.855] getGlobalsAndPackages() ... [13:31:16.855] Searching for globals... [13:31:16.856] [13:31:16.856] Searching for globals ... DONE [13:31:16.856] - globals: [0] [13:31:16.856] getGlobalsAndPackages() ... DONE [13:31:16.856] + additional globals found: [n=0] [13:31:16.856] + additional namespaces needed: [n=0] [13:31:16.856] - Finding globals in 'X' for chunk #1 ... DONE [13:31:16.857] - seeds: [13:31:16.857] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.857] getGlobalsAndPackages() ... [13:31:16.857] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.857] Resolving globals: FALSE [13:31:16.857] Tweak future expression to call with '...' arguments ... [13:31:16.858] { [13:31:16.858] do.call(function(...) { [13:31:16.858] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.858] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.858] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.858] on.exit(options(oopts), add = TRUE) [13:31:16.858] } [13:31:16.858] { [13:31:16.858] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.858] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.858] ...future.FUN(...future.X_jj, ...) [13:31:16.858] }) [13:31:16.858] } [13:31:16.858] }, args = future.call.arguments) [13:31:16.858] } [13:31:16.858] Tweak future expression to call with '...' arguments ... DONE [13:31:16.859] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.859] - packages: [1] 'future' [13:31:16.859] getGlobalsAndPackages() ... DONE [13:31:16.859] run() for 'Future' ... [13:31:16.859] - state: 'created' [13:31:16.860] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.862] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.862] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.862] - Field: 'label' [13:31:16.862] - Field: 'local' [13:31:16.863] - Field: 'owner' [13:31:16.863] - Field: 'envir' [13:31:16.863] - Field: 'packages' [13:31:16.863] - Field: 'gc' [13:31:16.863] - Field: 'conditions' [13:31:16.863] - Field: 'expr' [13:31:16.864] - Field: 'uuid' [13:31:16.864] - Field: 'seed' [13:31:16.864] - Field: 'version' [13:31:16.864] - Field: 'result' [13:31:16.864] - Field: 'asynchronous' [13:31:16.864] - Field: 'calls' [13:31:16.865] - Field: 'globals' [13:31:16.865] - Field: 'stdout' [13:31:16.865] - Field: 'earlySignal' [13:31:16.865] - Field: 'lazy' [13:31:16.865] - Field: 'state' [13:31:16.865] - Field: '.cluster' [13:31:16.866] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.866] - Launch lazy future ... [13:31:16.866] Packages needed by the future expression (n = 1): 'future' [13:31:16.866] Packages needed by future strategies (n = 0): [13:31:16.867] { [13:31:16.867] { [13:31:16.867] { [13:31:16.867] ...future.startTime <- base::Sys.time() [13:31:16.867] { [13:31:16.867] { [13:31:16.867] { [13:31:16.867] { [13:31:16.867] base::local({ [13:31:16.867] has_future <- base::requireNamespace("future", [13:31:16.867] quietly = TRUE) [13:31:16.867] if (has_future) { [13:31:16.867] ns <- base::getNamespace("future") [13:31:16.867] version <- ns[[".package"]][["version"]] [13:31:16.867] if (is.null(version)) [13:31:16.867] version <- utils::packageVersion("future") [13:31:16.867] } [13:31:16.867] else { [13:31:16.867] version <- NULL [13:31:16.867] } [13:31:16.867] if (!has_future || version < "1.8.0") { [13:31:16.867] info <- base::c(r_version = base::gsub("R version ", [13:31:16.867] "", base::R.version$version.string), [13:31:16.867] platform = base::sprintf("%s (%s-bit)", [13:31:16.867] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.867] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.867] "release", "version")], collapse = " "), [13:31:16.867] hostname = base::Sys.info()[["nodename"]]) [13:31:16.867] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.867] info) [13:31:16.867] info <- base::paste(info, collapse = "; ") [13:31:16.867] if (!has_future) { [13:31:16.867] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.867] info) [13:31:16.867] } [13:31:16.867] else { [13:31:16.867] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.867] info, version) [13:31:16.867] } [13:31:16.867] base::stop(msg) [13:31:16.867] } [13:31:16.867] }) [13:31:16.867] } [13:31:16.867] base::local({ [13:31:16.867] for (pkg in "future") { [13:31:16.867] base::loadNamespace(pkg) [13:31:16.867] base::library(pkg, character.only = TRUE) [13:31:16.867] } [13:31:16.867] }) [13:31:16.867] } [13:31:16.867] ...future.strategy.old <- future::plan("list") [13:31:16.867] options(future.plan = NULL) [13:31:16.867] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.867] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.867] } [13:31:16.867] ...future.workdir <- getwd() [13:31:16.867] } [13:31:16.867] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.867] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.867] } [13:31:16.867] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.867] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:16.867] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.867] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.867] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.867] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.867] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.867] base::names(...future.oldOptions)) [13:31:16.867] } [13:31:16.867] if (FALSE) { [13:31:16.867] } [13:31:16.867] else { [13:31:16.867] if (TRUE) { [13:31:16.867] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.867] open = "w") [13:31:16.867] } [13:31:16.867] else { [13:31:16.867] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.867] windows = "NUL", "/dev/null"), open = "w") [13:31:16.867] } [13:31:16.867] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.867] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.867] base::sink(type = "output", split = FALSE) [13:31:16.867] base::close(...future.stdout) [13:31:16.867] }, add = TRUE) [13:31:16.867] } [13:31:16.867] ...future.frame <- base::sys.nframe() [13:31:16.867] ...future.conditions <- base::list() [13:31:16.867] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.867] if (FALSE) { [13:31:16.867] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.867] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.867] } [13:31:16.867] ...future.result <- base::tryCatch({ [13:31:16.867] base::withCallingHandlers({ [13:31:16.867] ...future.value <- base::withVisible(base::local({ [13:31:16.867] do.call(function(...) { [13:31:16.867] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.867] if (!identical(...future.globals.maxSize.org, [13:31:16.867] ...future.globals.maxSize)) { [13:31:16.867] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.867] on.exit(options(oopts), add = TRUE) [13:31:16.867] } [13:31:16.867] { [13:31:16.867] lapply(seq_along(...future.elements_ii), [13:31:16.867] FUN = function(jj) { [13:31:16.867] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.867] ...future.FUN(...future.X_jj, ...) [13:31:16.867] }) [13:31:16.867] } [13:31:16.867] }, args = future.call.arguments) [13:31:16.867] })) [13:31:16.867] future::FutureResult(value = ...future.value$value, [13:31:16.867] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.867] ...future.rng), globalenv = if (FALSE) [13:31:16.867] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.867] ...future.globalenv.names)) [13:31:16.867] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.867] }, condition = base::local({ [13:31:16.867] c <- base::c [13:31:16.867] inherits <- base::inherits [13:31:16.867] invokeRestart <- base::invokeRestart [13:31:16.867] length <- base::length [13:31:16.867] list <- base::list [13:31:16.867] seq.int <- base::seq.int [13:31:16.867] signalCondition <- base::signalCondition [13:31:16.867] sys.calls <- base::sys.calls [13:31:16.867] `[[` <- base::`[[` [13:31:16.867] `+` <- base::`+` [13:31:16.867] `<<-` <- base::`<<-` [13:31:16.867] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.867] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.867] 3L)] [13:31:16.867] } [13:31:16.867] function(cond) { [13:31:16.867] is_error <- inherits(cond, "error") [13:31:16.867] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.867] NULL) [13:31:16.867] if (is_error) { [13:31:16.867] sessionInformation <- function() { [13:31:16.867] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.867] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.867] search = base::search(), system = base::Sys.info()) [13:31:16.867] } [13:31:16.867] ...future.conditions[[length(...future.conditions) + [13:31:16.867] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.867] cond$call), session = sessionInformation(), [13:31:16.867] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.867] signalCondition(cond) [13:31:16.867] } [13:31:16.867] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.867] signal <- FALSE && inherits(cond, character(0)) [13:31:16.867] ...future.conditions[[length(...future.conditions) + [13:31:16.867] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.867] if (FALSE && !signal) { [13:31:16.867] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.867] { [13:31:16.867] inherits <- base::inherits [13:31:16.867] invokeRestart <- base::invokeRestart [13:31:16.867] is.null <- base::is.null [13:31:16.867] muffled <- FALSE [13:31:16.867] if (inherits(cond, "message")) { [13:31:16.867] muffled <- grepl(pattern, "muffleMessage") [13:31:16.867] if (muffled) [13:31:16.867] invokeRestart("muffleMessage") [13:31:16.867] } [13:31:16.867] else if (inherits(cond, "warning")) { [13:31:16.867] muffled <- grepl(pattern, "muffleWarning") [13:31:16.867] if (muffled) [13:31:16.867] invokeRestart("muffleWarning") [13:31:16.867] } [13:31:16.867] else if (inherits(cond, "condition")) { [13:31:16.867] if (!is.null(pattern)) { [13:31:16.867] computeRestarts <- base::computeRestarts [13:31:16.867] grepl <- base::grepl [13:31:16.867] restarts <- computeRestarts(cond) [13:31:16.867] for (restart in restarts) { [13:31:16.867] name <- restart$name [13:31:16.867] if (is.null(name)) [13:31:16.867] next [13:31:16.867] if (!grepl(pattern, name)) [13:31:16.867] next [13:31:16.867] invokeRestart(restart) [13:31:16.867] muffled <- TRUE [13:31:16.867] break [13:31:16.867] } [13:31:16.867] } [13:31:16.867] } [13:31:16.867] invisible(muffled) [13:31:16.867] } [13:31:16.867] muffleCondition(cond, pattern = "^muffle") [13:31:16.867] } [13:31:16.867] } [13:31:16.867] else { [13:31:16.867] if (TRUE) { [13:31:16.867] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.867] { [13:31:16.867] inherits <- base::inherits [13:31:16.867] invokeRestart <- base::invokeRestart [13:31:16.867] is.null <- base::is.null [13:31:16.867] muffled <- FALSE [13:31:16.867] if (inherits(cond, "message")) { [13:31:16.867] muffled <- grepl(pattern, "muffleMessage") [13:31:16.867] if (muffled) [13:31:16.867] invokeRestart("muffleMessage") [13:31:16.867] } [13:31:16.867] else if (inherits(cond, "warning")) { [13:31:16.867] muffled <- grepl(pattern, "muffleWarning") [13:31:16.867] if (muffled) [13:31:16.867] invokeRestart("muffleWarning") [13:31:16.867] } [13:31:16.867] else if (inherits(cond, "condition")) { [13:31:16.867] if (!is.null(pattern)) { [13:31:16.867] computeRestarts <- base::computeRestarts [13:31:16.867] grepl <- base::grepl [13:31:16.867] restarts <- computeRestarts(cond) [13:31:16.867] for (restart in restarts) { [13:31:16.867] name <- restart$name [13:31:16.867] if (is.null(name)) [13:31:16.867] next [13:31:16.867] if (!grepl(pattern, name)) [13:31:16.867] next [13:31:16.867] invokeRestart(restart) [13:31:16.867] muffled <- TRUE [13:31:16.867] break [13:31:16.867] } [13:31:16.867] } [13:31:16.867] } [13:31:16.867] invisible(muffled) [13:31:16.867] } [13:31:16.867] muffleCondition(cond, pattern = "^muffle") [13:31:16.867] } [13:31:16.867] } [13:31:16.867] } [13:31:16.867] })) [13:31:16.867] }, error = function(ex) { [13:31:16.867] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.867] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.867] ...future.rng), started = ...future.startTime, [13:31:16.867] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.867] version = "1.8"), class = "FutureResult") [13:31:16.867] }, finally = { [13:31:16.867] if (!identical(...future.workdir, getwd())) [13:31:16.867] setwd(...future.workdir) [13:31:16.867] { [13:31:16.867] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.867] ...future.oldOptions$nwarnings <- NULL [13:31:16.867] } [13:31:16.867] base::options(...future.oldOptions) [13:31:16.867] if (.Platform$OS.type == "windows") { [13:31:16.867] old_names <- names(...future.oldEnvVars) [13:31:16.867] envs <- base::Sys.getenv() [13:31:16.867] names <- names(envs) [13:31:16.867] common <- intersect(names, old_names) [13:31:16.867] added <- setdiff(names, old_names) [13:31:16.867] removed <- setdiff(old_names, names) [13:31:16.867] changed <- common[...future.oldEnvVars[common] != [13:31:16.867] envs[common]] [13:31:16.867] NAMES <- toupper(changed) [13:31:16.867] args <- list() [13:31:16.867] for (kk in seq_along(NAMES)) { [13:31:16.867] name <- changed[[kk]] [13:31:16.867] NAME <- NAMES[[kk]] [13:31:16.867] if (name != NAME && is.element(NAME, old_names)) [13:31:16.867] next [13:31:16.867] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.867] } [13:31:16.867] NAMES <- toupper(added) [13:31:16.867] for (kk in seq_along(NAMES)) { [13:31:16.867] name <- added[[kk]] [13:31:16.867] NAME <- NAMES[[kk]] [13:31:16.867] if (name != NAME && is.element(NAME, old_names)) [13:31:16.867] next [13:31:16.867] args[[name]] <- "" [13:31:16.867] } [13:31:16.867] NAMES <- toupper(removed) [13:31:16.867] for (kk in seq_along(NAMES)) { [13:31:16.867] name <- removed[[kk]] [13:31:16.867] NAME <- NAMES[[kk]] [13:31:16.867] if (name != NAME && is.element(NAME, old_names)) [13:31:16.867] next [13:31:16.867] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.867] } [13:31:16.867] if (length(args) > 0) [13:31:16.867] base::do.call(base::Sys.setenv, args = args) [13:31:16.867] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.867] } [13:31:16.867] else { [13:31:16.867] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.867] } [13:31:16.867] { [13:31:16.867] if (base::length(...future.futureOptionsAdded) > [13:31:16.867] 0L) { [13:31:16.867] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.867] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.867] base::options(opts) [13:31:16.867] } [13:31:16.867] { [13:31:16.867] NULL [13:31:16.867] options(future.plan = NULL) [13:31:16.867] if (is.na(NA_character_)) [13:31:16.867] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.867] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.867] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.867] .init = FALSE) [13:31:16.867] } [13:31:16.867] } [13:31:16.867] } [13:31:16.867] }) [13:31:16.867] if (TRUE) { [13:31:16.867] base::sink(type = "output", split = FALSE) [13:31:16.867] if (TRUE) { [13:31:16.867] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.867] } [13:31:16.867] else { [13:31:16.867] ...future.result["stdout"] <- base::list(NULL) [13:31:16.867] } [13:31:16.867] base::close(...future.stdout) [13:31:16.867] ...future.stdout <- NULL [13:31:16.867] } [13:31:16.867] ...future.result$conditions <- ...future.conditions [13:31:16.867] ...future.result$finished <- base::Sys.time() [13:31:16.867] ...future.result [13:31:16.867] } [13:31:16.871] - Launch lazy future ... done [13:31:16.871] run() for 'MiraiFuture' ... done [13:31:16.871] Created future: [13:31:16.872] resolved() for 'MiraiFuture' ... [13:31:16.873] - state: 'running' [13:31:16.873] - run: TRUE [13:31:16.873] - result: 'NULL' [13:31:16.873] - resolved: FALSE [13:31:16.873] resolved() for 'MiraiFuture' ... done [13:31:16.871] MiraiFuture: [13:31:16.871] Label: 'future_lapply-1' [13:31:16.871] Expression: [13:31:16.871] { [13:31:16.871] do.call(function(...) { [13:31:16.871] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.871] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.871] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.871] on.exit(options(oopts), add = TRUE) [13:31:16.871] } [13:31:16.871] { [13:31:16.871] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.871] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.871] ...future.FUN(...future.X_jj, ...) [13:31:16.871] }) [13:31:16.871] } [13:31:16.871] }, args = future.call.arguments) [13:31:16.871] } [13:31:16.871] Lazy evaluation: FALSE [13:31:16.871] Asynchronous evaluation: TRUE [13:31:16.871] Local evaluation: TRUE [13:31:16.871] Environment: R_GlobalEnv [13:31:16.871] Capture standard output: TRUE [13:31:16.871] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.871] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.871] Packages: 1 packages ('future') [13:31:16.871] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.871] Resolved: FALSE [13:31:16.871] Value: [13:31:16.871] Conditions captured: [13:31:16.871] Early signaling: FALSE [13:31:16.871] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.871] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.874] Chunk #1 of 1 ... DONE [13:31:16.874] Launching 1 futures (chunks) ... DONE [13:31:16.874] Resolving 1 futures (chunks) ... [13:31:16.874] resolve() on list ... [13:31:16.874] recursive: 0 [13:31:16.875] length: 1 [13:31:16.875] [13:31:16.875] resolved() for 'MiraiFuture' ... [13:31:16.875] - state: 'running' [13:31:16.875] - run: TRUE [13:31:16.875] - result: 'NULL' [13:31:16.876] - resolved: FALSE [13:31:16.876] resolved() for 'MiraiFuture' ... done [13:31:16.900] resolved() for 'MiraiFuture' ... [13:31:16.900] - state: 'running' [13:31:16.900] - run: TRUE [13:31:16.900] - result: 'NULL' [13:31:16.901] - resolved: FALSE [13:31:16.901] resolved() for 'MiraiFuture' ... done [13:31:16.902] Future #1 [13:31:16.902] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:16.902] - nx: 1 [13:31:16.902] - relay: TRUE [13:31:16.903] - stdout: TRUE [13:31:16.903] - signal: TRUE [13:31:16.903] - resignal: FALSE [13:31:16.903] - force: TRUE [13:31:16.903] - relayed: [n=1] FALSE [13:31:16.903] - queued futures: [n=1] FALSE [13:31:16.903] - until=1 [13:31:16.904] - relaying element #1 [13:31:16.904] - relayed: [n=1] TRUE [13:31:16.904] - queued futures: [n=1] TRUE [13:31:16.904] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:16.904] length: 0 (resolved future 1) [13:31:16.905] Relaying remaining futures [13:31:16.905] signalConditionsASAP(NULL, pos=0) ... [13:31:16.905] - nx: 1 [13:31:16.905] - relay: TRUE [13:31:16.905] - stdout: TRUE [13:31:16.905] - signal: TRUE [13:31:16.905] - resignal: FALSE [13:31:16.906] - force: TRUE [13:31:16.906] - relayed: [n=1] TRUE [13:31:16.906] - queued futures: [n=1] TRUE - flush all [13:31:16.906] - relayed: [n=1] TRUE [13:31:16.906] - queued futures: [n=1] TRUE [13:31:16.906] signalConditionsASAP(NULL, pos=0) ... done [13:31:16.907] resolve() on list ... DONE [13:31:16.907] - Number of value chunks collected: 1 [13:31:16.907] Resolving 1 futures (chunks) ... DONE [13:31:16.907] Reducing values from 1 chunks ... [13:31:16.907] - Number of values collected after concatenation: 1 [13:31:16.907] - Number of values expected: 1 [13:31:16.908] Reducing values from 1 chunks ... DONE [13:31:16.908] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" [13:31:16.909] future_lapply() ... [13:31:16.917] Number of chunks: 1 [13:31:16.917] getGlobalsAndPackagesXApply() ... [13:31:16.917] - future.globals: TRUE [13:31:16.918] getGlobalsAndPackages() ... [13:31:16.918] Searching for globals... [13:31:16.928] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [13:31:16.928] Searching for globals ... DONE [13:31:16.928] Resolving globals: FALSE [13:31:16.929] The total size of the 1 globals is 69.62 KiB (71288 bytes) [13:31:16.929] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [13:31:16.930] - globals: [1] 'FUN' [13:31:16.930] - packages: [1] 'future' [13:31:16.930] getGlobalsAndPackages() ... DONE [13:31:16.930] - globals found/used: [n=1] 'FUN' [13:31:16.930] - needed namespaces: [n=1] 'future' [13:31:16.930] Finding globals ... DONE [13:31:16.931] - use_args: TRUE [13:31:16.931] - Getting '...' globals ... [13:31:16.931] resolve() on list ... [13:31:16.931] recursive: 0 [13:31:16.931] length: 1 [13:31:16.932] elements: '...' [13:31:16.932] length: 0 (resolved future 1) [13:31:16.932] resolve() on list ... DONE [13:31:16.932] - '...' content: [n=2] 'collapse', 'maxHead' [13:31:16.933] List of 1 [13:31:16.933] $ ...:List of 2 [13:31:16.933] ..$ collapse: chr "; " [13:31:16.933] ..$ maxHead : int 3 [13:31:16.933] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.933] - attr(*, "where")=List of 1 [13:31:16.933] ..$ ...: [13:31:16.933] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.933] - attr(*, "resolved")= logi TRUE [13:31:16.933] - attr(*, "total_size")= num NA [13:31:16.936] - Getting '...' globals ... DONE [13:31:16.937] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:16.937] List of 2 [13:31:16.937] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [13:31:16.937] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [13:31:16.937] $ ... :List of 2 [13:31:16.937] ..$ collapse: chr "; " [13:31:16.937] ..$ maxHead : int 3 [13:31:16.937] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:16.937] - attr(*, "where")=List of 2 [13:31:16.937] ..$ ...future.FUN: [13:31:16.937] ..$ ... : [13:31:16.937] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:16.937] - attr(*, "resolved")= logi FALSE [13:31:16.937] - attr(*, "total_size")= num 71456 [13:31:16.941] Packages to be attached in all futures: [n=1] 'future' [13:31:16.941] getGlobalsAndPackagesXApply() ... DONE [13:31:16.942] Number of futures (= number of chunks): 1 [13:31:16.942] Launching 1 futures (chunks) ... [13:31:16.943] Chunk #1 of 1 ... [13:31:16.943] - Finding globals in 'X' for chunk #1 ... [13:31:16.943] getGlobalsAndPackages() ... [13:31:16.943] Searching for globals... [13:31:16.944] [13:31:16.944] Searching for globals ... DONE [13:31:16.944] - globals: [0] [13:31:16.944] getGlobalsAndPackages() ... DONE [13:31:16.944] + additional globals found: [n=0] [13:31:16.944] + additional namespaces needed: [n=0] [13:31:16.944] - Finding globals in 'X' for chunk #1 ... DONE [13:31:16.945] - seeds: [13:31:16.945] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.945] getGlobalsAndPackages() ... [13:31:16.945] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.945] Resolving globals: FALSE [13:31:16.945] Tweak future expression to call with '...' arguments ... [13:31:16.946] { [13:31:16.946] do.call(function(...) { [13:31:16.946] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.946] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.946] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.946] on.exit(options(oopts), add = TRUE) [13:31:16.946] } [13:31:16.946] { [13:31:16.946] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.946] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.946] ...future.FUN(...future.X_jj, ...) [13:31:16.946] }) [13:31:16.946] } [13:31:16.946] }, args = future.call.arguments) [13:31:16.946] } [13:31:16.946] Tweak future expression to call with '...' arguments ... DONE [13:31:16.947] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:16.947] - packages: [1] 'future' [13:31:16.947] getGlobalsAndPackages() ... DONE [13:31:16.947] run() for 'Future' ... [13:31:16.947] - state: 'created' [13:31:16.948] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:16.950] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.950] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:16.950] - Field: 'label' [13:31:16.950] - Field: 'local' [13:31:16.951] - Field: 'owner' [13:31:16.951] - Field: 'envir' [13:31:16.951] - Field: 'packages' [13:31:16.951] - Field: 'gc' [13:31:16.951] - Field: 'conditions' [13:31:16.951] - Field: 'expr' [13:31:16.952] - Field: 'uuid' [13:31:16.952] - Field: 'seed' [13:31:16.952] - Field: 'version' [13:31:16.952] - Field: 'result' [13:31:16.952] - Field: 'asynchronous' [13:31:16.952] - Field: 'calls' [13:31:16.953] - Field: 'globals' [13:31:16.953] - Field: 'stdout' [13:31:16.953] - Field: 'earlySignal' [13:31:16.953] - Field: 'lazy' [13:31:16.953] - Field: 'state' [13:31:16.953] - Field: '.cluster' [13:31:16.954] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:16.954] - Launch lazy future ... [13:31:16.954] Packages needed by the future expression (n = 1): 'future' [13:31:16.954] Packages needed by future strategies (n = 0): [13:31:16.955] { [13:31:16.955] { [13:31:16.955] { [13:31:16.955] ...future.startTime <- base::Sys.time() [13:31:16.955] { [13:31:16.955] { [13:31:16.955] { [13:31:16.955] { [13:31:16.955] base::local({ [13:31:16.955] has_future <- base::requireNamespace("future", [13:31:16.955] quietly = TRUE) [13:31:16.955] if (has_future) { [13:31:16.955] ns <- base::getNamespace("future") [13:31:16.955] version <- ns[[".package"]][["version"]] [13:31:16.955] if (is.null(version)) [13:31:16.955] version <- utils::packageVersion("future") [13:31:16.955] } [13:31:16.955] else { [13:31:16.955] version <- NULL [13:31:16.955] } [13:31:16.955] if (!has_future || version < "1.8.0") { [13:31:16.955] info <- base::c(r_version = base::gsub("R version ", [13:31:16.955] "", base::R.version$version.string), [13:31:16.955] platform = base::sprintf("%s (%s-bit)", [13:31:16.955] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:16.955] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:16.955] "release", "version")], collapse = " "), [13:31:16.955] hostname = base::Sys.info()[["nodename"]]) [13:31:16.955] info <- base::sprintf("%s: %s", base::names(info), [13:31:16.955] info) [13:31:16.955] info <- base::paste(info, collapse = "; ") [13:31:16.955] if (!has_future) { [13:31:16.955] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:16.955] info) [13:31:16.955] } [13:31:16.955] else { [13:31:16.955] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:16.955] info, version) [13:31:16.955] } [13:31:16.955] base::stop(msg) [13:31:16.955] } [13:31:16.955] }) [13:31:16.955] } [13:31:16.955] base::local({ [13:31:16.955] for (pkg in "future") { [13:31:16.955] base::loadNamespace(pkg) [13:31:16.955] base::library(pkg, character.only = TRUE) [13:31:16.955] } [13:31:16.955] }) [13:31:16.955] } [13:31:16.955] ...future.strategy.old <- future::plan("list") [13:31:16.955] options(future.plan = NULL) [13:31:16.955] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.955] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:16.955] } [13:31:16.955] ...future.workdir <- getwd() [13:31:16.955] } [13:31:16.955] ...future.oldOptions <- base::as.list(base::.Options) [13:31:16.955] ...future.oldEnvVars <- base::Sys.getenv() [13:31:16.955] } [13:31:16.955] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:16.955] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:16.955] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:16.955] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:16.955] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:16.955] future.stdout.windows.reencode = NULL, width = 80L) [13:31:16.955] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:16.955] base::names(...future.oldOptions)) [13:31:16.955] } [13:31:16.955] if (FALSE) { [13:31:16.955] } [13:31:16.955] else { [13:31:16.955] if (TRUE) { [13:31:16.955] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:16.955] open = "w") [13:31:16.955] } [13:31:16.955] else { [13:31:16.955] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:16.955] windows = "NUL", "/dev/null"), open = "w") [13:31:16.955] } [13:31:16.955] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:16.955] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:16.955] base::sink(type = "output", split = FALSE) [13:31:16.955] base::close(...future.stdout) [13:31:16.955] }, add = TRUE) [13:31:16.955] } [13:31:16.955] ...future.frame <- base::sys.nframe() [13:31:16.955] ...future.conditions <- base::list() [13:31:16.955] ...future.rng <- base::globalenv()$.Random.seed [13:31:16.955] if (FALSE) { [13:31:16.955] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:16.955] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:16.955] } [13:31:16.955] ...future.result <- base::tryCatch({ [13:31:16.955] base::withCallingHandlers({ [13:31:16.955] ...future.value <- base::withVisible(base::local({ [13:31:16.955] do.call(function(...) { [13:31:16.955] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.955] if (!identical(...future.globals.maxSize.org, [13:31:16.955] ...future.globals.maxSize)) { [13:31:16.955] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.955] on.exit(options(oopts), add = TRUE) [13:31:16.955] } [13:31:16.955] { [13:31:16.955] lapply(seq_along(...future.elements_ii), [13:31:16.955] FUN = function(jj) { [13:31:16.955] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.955] ...future.FUN(...future.X_jj, ...) [13:31:16.955] }) [13:31:16.955] } [13:31:16.955] }, args = future.call.arguments) [13:31:16.955] })) [13:31:16.955] future::FutureResult(value = ...future.value$value, [13:31:16.955] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.955] ...future.rng), globalenv = if (FALSE) [13:31:16.955] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:16.955] ...future.globalenv.names)) [13:31:16.955] else NULL, started = ...future.startTime, version = "1.8") [13:31:16.955] }, condition = base::local({ [13:31:16.955] c <- base::c [13:31:16.955] inherits <- base::inherits [13:31:16.955] invokeRestart <- base::invokeRestart [13:31:16.955] length <- base::length [13:31:16.955] list <- base::list [13:31:16.955] seq.int <- base::seq.int [13:31:16.955] signalCondition <- base::signalCondition [13:31:16.955] sys.calls <- base::sys.calls [13:31:16.955] `[[` <- base::`[[` [13:31:16.955] `+` <- base::`+` [13:31:16.955] `<<-` <- base::`<<-` [13:31:16.955] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:16.955] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:16.955] 3L)] [13:31:16.955] } [13:31:16.955] function(cond) { [13:31:16.955] is_error <- inherits(cond, "error") [13:31:16.955] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:16.955] NULL) [13:31:16.955] if (is_error) { [13:31:16.955] sessionInformation <- function() { [13:31:16.955] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:16.955] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:16.955] search = base::search(), system = base::Sys.info()) [13:31:16.955] } [13:31:16.955] ...future.conditions[[length(...future.conditions) + [13:31:16.955] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:16.955] cond$call), session = sessionInformation(), [13:31:16.955] timestamp = base::Sys.time(), signaled = 0L) [13:31:16.955] signalCondition(cond) [13:31:16.955] } [13:31:16.955] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:16.955] signal <- FALSE && inherits(cond, character(0)) [13:31:16.955] ...future.conditions[[length(...future.conditions) + [13:31:16.955] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:16.955] if (FALSE && !signal) { [13:31:16.955] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.955] { [13:31:16.955] inherits <- base::inherits [13:31:16.955] invokeRestart <- base::invokeRestart [13:31:16.955] is.null <- base::is.null [13:31:16.955] muffled <- FALSE [13:31:16.955] if (inherits(cond, "message")) { [13:31:16.955] muffled <- grepl(pattern, "muffleMessage") [13:31:16.955] if (muffled) [13:31:16.955] invokeRestart("muffleMessage") [13:31:16.955] } [13:31:16.955] else if (inherits(cond, "warning")) { [13:31:16.955] muffled <- grepl(pattern, "muffleWarning") [13:31:16.955] if (muffled) [13:31:16.955] invokeRestart("muffleWarning") [13:31:16.955] } [13:31:16.955] else if (inherits(cond, "condition")) { [13:31:16.955] if (!is.null(pattern)) { [13:31:16.955] computeRestarts <- base::computeRestarts [13:31:16.955] grepl <- base::grepl [13:31:16.955] restarts <- computeRestarts(cond) [13:31:16.955] for (restart in restarts) { [13:31:16.955] name <- restart$name [13:31:16.955] if (is.null(name)) [13:31:16.955] next [13:31:16.955] if (!grepl(pattern, name)) [13:31:16.955] next [13:31:16.955] invokeRestart(restart) [13:31:16.955] muffled <- TRUE [13:31:16.955] break [13:31:16.955] } [13:31:16.955] } [13:31:16.955] } [13:31:16.955] invisible(muffled) [13:31:16.955] } [13:31:16.955] muffleCondition(cond, pattern = "^muffle") [13:31:16.955] } [13:31:16.955] } [13:31:16.955] else { [13:31:16.955] if (TRUE) { [13:31:16.955] muffleCondition <- function (cond, pattern = "^muffle") [13:31:16.955] { [13:31:16.955] inherits <- base::inherits [13:31:16.955] invokeRestart <- base::invokeRestart [13:31:16.955] is.null <- base::is.null [13:31:16.955] muffled <- FALSE [13:31:16.955] if (inherits(cond, "message")) { [13:31:16.955] muffled <- grepl(pattern, "muffleMessage") [13:31:16.955] if (muffled) [13:31:16.955] invokeRestart("muffleMessage") [13:31:16.955] } [13:31:16.955] else if (inherits(cond, "warning")) { [13:31:16.955] muffled <- grepl(pattern, "muffleWarning") [13:31:16.955] if (muffled) [13:31:16.955] invokeRestart("muffleWarning") [13:31:16.955] } [13:31:16.955] else if (inherits(cond, "condition")) { [13:31:16.955] if (!is.null(pattern)) { [13:31:16.955] computeRestarts <- base::computeRestarts [13:31:16.955] grepl <- base::grepl [13:31:16.955] restarts <- computeRestarts(cond) [13:31:16.955] for (restart in restarts) { [13:31:16.955] name <- restart$name [13:31:16.955] if (is.null(name)) [13:31:16.955] next [13:31:16.955] if (!grepl(pattern, name)) [13:31:16.955] next [13:31:16.955] invokeRestart(restart) [13:31:16.955] muffled <- TRUE [13:31:16.955] break [13:31:16.955] } [13:31:16.955] } [13:31:16.955] } [13:31:16.955] invisible(muffled) [13:31:16.955] } [13:31:16.955] muffleCondition(cond, pattern = "^muffle") [13:31:16.955] } [13:31:16.955] } [13:31:16.955] } [13:31:16.955] })) [13:31:16.955] }, error = function(ex) { [13:31:16.955] base::structure(base::list(value = NULL, visible = NULL, [13:31:16.955] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:16.955] ...future.rng), started = ...future.startTime, [13:31:16.955] finished = Sys.time(), session_uuid = NA_character_, [13:31:16.955] version = "1.8"), class = "FutureResult") [13:31:16.955] }, finally = { [13:31:16.955] if (!identical(...future.workdir, getwd())) [13:31:16.955] setwd(...future.workdir) [13:31:16.955] { [13:31:16.955] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:16.955] ...future.oldOptions$nwarnings <- NULL [13:31:16.955] } [13:31:16.955] base::options(...future.oldOptions) [13:31:16.955] if (.Platform$OS.type == "windows") { [13:31:16.955] old_names <- names(...future.oldEnvVars) [13:31:16.955] envs <- base::Sys.getenv() [13:31:16.955] names <- names(envs) [13:31:16.955] common <- intersect(names, old_names) [13:31:16.955] added <- setdiff(names, old_names) [13:31:16.955] removed <- setdiff(old_names, names) [13:31:16.955] changed <- common[...future.oldEnvVars[common] != [13:31:16.955] envs[common]] [13:31:16.955] NAMES <- toupper(changed) [13:31:16.955] args <- list() [13:31:16.955] for (kk in seq_along(NAMES)) { [13:31:16.955] name <- changed[[kk]] [13:31:16.955] NAME <- NAMES[[kk]] [13:31:16.955] if (name != NAME && is.element(NAME, old_names)) [13:31:16.955] next [13:31:16.955] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.955] } [13:31:16.955] NAMES <- toupper(added) [13:31:16.955] for (kk in seq_along(NAMES)) { [13:31:16.955] name <- added[[kk]] [13:31:16.955] NAME <- NAMES[[kk]] [13:31:16.955] if (name != NAME && is.element(NAME, old_names)) [13:31:16.955] next [13:31:16.955] args[[name]] <- "" [13:31:16.955] } [13:31:16.955] NAMES <- toupper(removed) [13:31:16.955] for (kk in seq_along(NAMES)) { [13:31:16.955] name <- removed[[kk]] [13:31:16.955] NAME <- NAMES[[kk]] [13:31:16.955] if (name != NAME && is.element(NAME, old_names)) [13:31:16.955] next [13:31:16.955] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:16.955] } [13:31:16.955] if (length(args) > 0) [13:31:16.955] base::do.call(base::Sys.setenv, args = args) [13:31:16.955] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:16.955] } [13:31:16.955] else { [13:31:16.955] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:16.955] } [13:31:16.955] { [13:31:16.955] if (base::length(...future.futureOptionsAdded) > [13:31:16.955] 0L) { [13:31:16.955] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:16.955] base::names(opts) <- ...future.futureOptionsAdded [13:31:16.955] base::options(opts) [13:31:16.955] } [13:31:16.955] { [13:31:16.955] NULL [13:31:16.955] options(future.plan = NULL) [13:31:16.955] if (is.na(NA_character_)) [13:31:16.955] Sys.unsetenv("R_FUTURE_PLAN") [13:31:16.955] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:16.955] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:16.955] .init = FALSE) [13:31:16.955] } [13:31:16.955] } [13:31:16.955] } [13:31:16.955] }) [13:31:16.955] if (TRUE) { [13:31:16.955] base::sink(type = "output", split = FALSE) [13:31:16.955] if (TRUE) { [13:31:16.955] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:16.955] } [13:31:16.955] else { [13:31:16.955] ...future.result["stdout"] <- base::list(NULL) [13:31:16.955] } [13:31:16.955] base::close(...future.stdout) [13:31:16.955] ...future.stdout <- NULL [13:31:16.955] } [13:31:16.955] ...future.result$conditions <- ...future.conditions [13:31:16.955] ...future.result$finished <- base::Sys.time() [13:31:16.955] ...future.result [13:31:16.955] } [13:31:16.959] - Launch lazy future ... done [13:31:16.959] run() for 'MiraiFuture' ... done [13:31:16.959] Created future: [13:31:16.960] resolved() for 'MiraiFuture' ... [13:31:16.961] - state: 'running' [13:31:16.961] - run: TRUE [13:31:16.961] - result: 'NULL' [13:31:16.961] - resolved: FALSE [13:31:16.961] resolved() for 'MiraiFuture' ... done [13:31:16.959] MiraiFuture: [13:31:16.959] Label: 'future_lapply-1' [13:31:16.959] Expression: [13:31:16.959] { [13:31:16.959] do.call(function(...) { [13:31:16.959] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:16.959] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:16.959] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:16.959] on.exit(options(oopts), add = TRUE) [13:31:16.959] } [13:31:16.959] { [13:31:16.959] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:16.959] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:16.959] ...future.FUN(...future.X_jj, ...) [13:31:16.959] }) [13:31:16.959] } [13:31:16.959] }, args = future.call.arguments) [13:31:16.959] } [13:31:16.959] Lazy evaluation: FALSE [13:31:16.959] Asynchronous evaluation: TRUE [13:31:16.959] Local evaluation: TRUE [13:31:16.959] Environment: R_GlobalEnv [13:31:16.959] Capture standard output: TRUE [13:31:16.959] Capture condition classes: 'condition' (excluding 'nothing') [13:31:16.959] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:16.959] Packages: 1 packages ('future') [13:31:16.959] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:16.959] Resolved: FALSE [13:31:16.959] Value: [13:31:16.959] Conditions captured: [13:31:16.959] Early signaling: FALSE [13:31:16.959] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:16.959] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:16.962] Chunk #1 of 1 ... DONE [13:31:16.962] Launching 1 futures (chunks) ... DONE [13:31:16.962] Resolving 1 futures (chunks) ... [13:31:16.962] resolve() on list ... [13:31:16.962] recursive: 0 [13:31:16.963] length: 1 [13:31:16.963] [13:31:16.963] resolved() for 'MiraiFuture' ... [13:31:16.963] - state: 'running' [13:31:16.963] - run: TRUE [13:31:16.963] - result: 'NULL' [13:31:16.964] - resolved: FALSE [13:31:16.964] resolved() for 'MiraiFuture' ... done [13:31:16.978] resolved() for 'MiraiFuture' ... [13:31:16.978] - state: 'running' [13:31:16.978] - run: TRUE [13:31:16.979] - result: 'NULL' [13:31:16.979] - resolved: FALSE [13:31:16.979] resolved() for 'MiraiFuture' ... done [13:31:16.979] Future #1 [13:31:16.979] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:16.980] - nx: 1 [13:31:16.980] - relay: TRUE [13:31:16.980] - stdout: TRUE [13:31:16.980] - signal: TRUE [13:31:16.980] - resignal: FALSE [13:31:16.980] - force: TRUE [13:31:16.980] - relayed: [n=1] FALSE [13:31:16.981] - queued futures: [n=1] FALSE [13:31:16.981] - until=1 [13:31:16.981] - relaying element #1 [13:31:16.981] - relayed: [n=1] TRUE [13:31:16.981] - queued futures: [n=1] TRUE [13:31:16.982] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:16.982] length: 0 (resolved future 1) [13:31:16.982] Relaying remaining futures [13:31:16.982] signalConditionsASAP(NULL, pos=0) ... [13:31:16.982] - nx: 1 [13:31:16.982] - relay: TRUE [13:31:16.982] - stdout: TRUE [13:31:16.983] - signal: TRUE [13:31:16.983] - resignal: FALSE [13:31:16.983] - force: TRUE [13:31:16.983] - relayed: [n=1] TRUE [13:31:16.983] - queued futures: [n=1] TRUE - flush all [13:31:16.983] - relayed: [n=1] TRUE [13:31:16.984] - queued futures: [n=1] TRUE [13:31:16.984] signalConditionsASAP(NULL, pos=0) ... done [13:31:16.984] resolve() on list ... DONE [13:31:16.984] - Number of value chunks collected: 1 [13:31:16.984] Resolving 1 futures (chunks) ... DONE [13:31:16.984] Reducing values from 1 chunks ... [13:31:16.985] - Number of values collected after concatenation: 1 [13:31:16.985] - Number of values expected: 1 [13:31:16.985] Reducing values from 1 chunks ... DONE [13:31:16.985] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... $a A 'listenv' vector with 1 element ('A'). $b A 'listenv' vector with 2 elements ('A', 'B'). List of 1 $ y0:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" [13:31:16.995] - plan('mirai_multisession') ...[13:31:16.995] plan(): Setting new future strategy stack: [13:31:16.995] List of future strategies: [13:31:16.995] 1. mirai_multisession: [13:31:16.995] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:16.995] - tweaked: FALSE [13:31:16.995] - call: plan(strategy) [13:31:16.996] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:16.996] < mirai | $data > [13:31:16.998] getGlobalsAndPackages() ... [13:31:16.998] Not searching for globals [13:31:16.998] - globals: [0] [13:31:16.998] getGlobalsAndPackages() ... DONE [13:31:16.999] getGlobalsAndPackages() ... [13:31:16.999] [13:31:16.999] - globals: [0] [13:31:16.999] getGlobalsAndPackages() ... DONE [13:31:16.999] Packages needed by the future expression (n = 0): [13:31:17.000] Packages needed by future strategies (n = 0): [13:31:17.000] { [13:31:17.000] { [13:31:17.000] { [13:31:17.000] ...future.startTime <- base::Sys.time() [13:31:17.000] { [13:31:17.000] { [13:31:17.000] { [13:31:17.000] base::local({ [13:31:17.000] has_future <- base::requireNamespace("future", [13:31:17.000] quietly = TRUE) [13:31:17.000] if (has_future) { [13:31:17.000] ns <- base::getNamespace("future") [13:31:17.000] version <- ns[[".package"]][["version"]] [13:31:17.000] if (is.null(version)) [13:31:17.000] version <- utils::packageVersion("future") [13:31:17.000] } [13:31:17.000] else { [13:31:17.000] version <- NULL [13:31:17.000] } [13:31:17.000] if (!has_future || version < "1.8.0") { [13:31:17.000] info <- base::c(r_version = base::gsub("R version ", [13:31:17.000] "", base::R.version$version.string), [13:31:17.000] platform = base::sprintf("%s (%s-bit)", [13:31:17.000] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:17.000] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:17.000] "release", "version")], collapse = " "), [13:31:17.000] hostname = base::Sys.info()[["nodename"]]) [13:31:17.000] info <- base::sprintf("%s: %s", base::names(info), [13:31:17.000] info) [13:31:17.000] info <- base::paste(info, collapse = "; ") [13:31:17.000] if (!has_future) { [13:31:17.000] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:17.000] info) [13:31:17.000] } [13:31:17.000] else { [13:31:17.000] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:17.000] info, version) [13:31:17.000] } [13:31:17.000] base::stop(msg) [13:31:17.000] } [13:31:17.000] }) [13:31:17.000] } [13:31:17.000] ...future.strategy.old <- future::plan("list") [13:31:17.000] options(future.plan = NULL) [13:31:17.000] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.000] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:17.000] } [13:31:17.000] ...future.workdir <- getwd() [13:31:17.000] } [13:31:17.000] ...future.oldOptions <- base::as.list(base::.Options) [13:31:17.000] ...future.oldEnvVars <- base::Sys.getenv() [13:31:17.000] } [13:31:17.000] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:17.000] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:17.000] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:17.000] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:17.000] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:17.000] future.stdout.windows.reencode = NULL, width = 80L) [13:31:17.000] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:17.000] base::names(...future.oldOptions)) [13:31:17.000] } [13:31:17.000] if (FALSE) { [13:31:17.000] } [13:31:17.000] else { [13:31:17.000] if (TRUE) { [13:31:17.000] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:17.000] open = "w") [13:31:17.000] } [13:31:17.000] else { [13:31:17.000] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:17.000] windows = "NUL", "/dev/null"), open = "w") [13:31:17.000] } [13:31:17.000] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:17.000] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:17.000] base::sink(type = "output", split = FALSE) [13:31:17.000] base::close(...future.stdout) [13:31:17.000] }, add = TRUE) [13:31:17.000] } [13:31:17.000] ...future.frame <- base::sys.nframe() [13:31:17.000] ...future.conditions <- base::list() [13:31:17.000] ...future.rng <- base::globalenv()$.Random.seed [13:31:17.000] if (FALSE) { [13:31:17.000] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:17.000] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:17.000] } [13:31:17.000] ...future.result <- base::tryCatch({ [13:31:17.000] base::withCallingHandlers({ [13:31:17.000] ...future.value <- base::withVisible(base::local(NA)) [13:31:17.000] future::FutureResult(value = ...future.value$value, [13:31:17.000] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.000] ...future.rng), globalenv = if (FALSE) [13:31:17.000] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:17.000] ...future.globalenv.names)) [13:31:17.000] else NULL, started = ...future.startTime, version = "1.8") [13:31:17.000] }, condition = base::local({ [13:31:17.000] c <- base::c [13:31:17.000] inherits <- base::inherits [13:31:17.000] invokeRestart <- base::invokeRestart [13:31:17.000] length <- base::length [13:31:17.000] list <- base::list [13:31:17.000] seq.int <- base::seq.int [13:31:17.000] signalCondition <- base::signalCondition [13:31:17.000] sys.calls <- base::sys.calls [13:31:17.000] `[[` <- base::`[[` [13:31:17.000] `+` <- base::`+` [13:31:17.000] `<<-` <- base::`<<-` [13:31:17.000] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:17.000] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:17.000] 3L)] [13:31:17.000] } [13:31:17.000] function(cond) { [13:31:17.000] is_error <- inherits(cond, "error") [13:31:17.000] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:17.000] NULL) [13:31:17.000] if (is_error) { [13:31:17.000] sessionInformation <- function() { [13:31:17.000] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:17.000] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:17.000] search = base::search(), system = base::Sys.info()) [13:31:17.000] } [13:31:17.000] ...future.conditions[[length(...future.conditions) + [13:31:17.000] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:17.000] cond$call), session = sessionInformation(), [13:31:17.000] timestamp = base::Sys.time(), signaled = 0L) [13:31:17.000] signalCondition(cond) [13:31:17.000] } [13:31:17.000] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:17.000] signal <- FALSE && inherits(cond, character(0)) [13:31:17.000] ...future.conditions[[length(...future.conditions) + [13:31:17.000] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:17.000] if (FALSE && !signal) { [13:31:17.000] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.000] { [13:31:17.000] inherits <- base::inherits [13:31:17.000] invokeRestart <- base::invokeRestart [13:31:17.000] is.null <- base::is.null [13:31:17.000] muffled <- FALSE [13:31:17.000] if (inherits(cond, "message")) { [13:31:17.000] muffled <- grepl(pattern, "muffleMessage") [13:31:17.000] if (muffled) [13:31:17.000] invokeRestart("muffleMessage") [13:31:17.000] } [13:31:17.000] else if (inherits(cond, "warning")) { [13:31:17.000] muffled <- grepl(pattern, "muffleWarning") [13:31:17.000] if (muffled) [13:31:17.000] invokeRestart("muffleWarning") [13:31:17.000] } [13:31:17.000] else if (inherits(cond, "condition")) { [13:31:17.000] if (!is.null(pattern)) { [13:31:17.000] computeRestarts <- base::computeRestarts [13:31:17.000] grepl <- base::grepl [13:31:17.000] restarts <- computeRestarts(cond) [13:31:17.000] for (restart in restarts) { [13:31:17.000] name <- restart$name [13:31:17.000] if (is.null(name)) [13:31:17.000] next [13:31:17.000] if (!grepl(pattern, name)) [13:31:17.000] next [13:31:17.000] invokeRestart(restart) [13:31:17.000] muffled <- TRUE [13:31:17.000] break [13:31:17.000] } [13:31:17.000] } [13:31:17.000] } [13:31:17.000] invisible(muffled) [13:31:17.000] } [13:31:17.000] muffleCondition(cond, pattern = "^muffle") [13:31:17.000] } [13:31:17.000] } [13:31:17.000] else { [13:31:17.000] if (TRUE) { [13:31:17.000] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.000] { [13:31:17.000] inherits <- base::inherits [13:31:17.000] invokeRestart <- base::invokeRestart [13:31:17.000] is.null <- base::is.null [13:31:17.000] muffled <- FALSE [13:31:17.000] if (inherits(cond, "message")) { [13:31:17.000] muffled <- grepl(pattern, "muffleMessage") [13:31:17.000] if (muffled) [13:31:17.000] invokeRestart("muffleMessage") [13:31:17.000] } [13:31:17.000] else if (inherits(cond, "warning")) { [13:31:17.000] muffled <- grepl(pattern, "muffleWarning") [13:31:17.000] if (muffled) [13:31:17.000] invokeRestart("muffleWarning") [13:31:17.000] } [13:31:17.000] else if (inherits(cond, "condition")) { [13:31:17.000] if (!is.null(pattern)) { [13:31:17.000] computeRestarts <- base::computeRestarts [13:31:17.000] grepl <- base::grepl [13:31:17.000] restarts <- computeRestarts(cond) [13:31:17.000] for (restart in restarts) { [13:31:17.000] name <- restart$name [13:31:17.000] if (is.null(name)) [13:31:17.000] next [13:31:17.000] if (!grepl(pattern, name)) [13:31:17.000] next [13:31:17.000] invokeRestart(restart) [13:31:17.000] muffled <- TRUE [13:31:17.000] break [13:31:17.000] } [13:31:17.000] } [13:31:17.000] } [13:31:17.000] invisible(muffled) [13:31:17.000] } [13:31:17.000] muffleCondition(cond, pattern = "^muffle") [13:31:17.000] } [13:31:17.000] } [13:31:17.000] } [13:31:17.000] })) [13:31:17.000] }, error = function(ex) { [13:31:17.000] base::structure(base::list(value = NULL, visible = NULL, [13:31:17.000] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.000] ...future.rng), started = ...future.startTime, [13:31:17.000] finished = Sys.time(), session_uuid = NA_character_, [13:31:17.000] version = "1.8"), class = "FutureResult") [13:31:17.000] }, finally = { [13:31:17.000] if (!identical(...future.workdir, getwd())) [13:31:17.000] setwd(...future.workdir) [13:31:17.000] { [13:31:17.000] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:17.000] ...future.oldOptions$nwarnings <- NULL [13:31:17.000] } [13:31:17.000] base::options(...future.oldOptions) [13:31:17.000] if (.Platform$OS.type == "windows") { [13:31:17.000] old_names <- names(...future.oldEnvVars) [13:31:17.000] envs <- base::Sys.getenv() [13:31:17.000] names <- names(envs) [13:31:17.000] common <- intersect(names, old_names) [13:31:17.000] added <- setdiff(names, old_names) [13:31:17.000] removed <- setdiff(old_names, names) [13:31:17.000] changed <- common[...future.oldEnvVars[common] != [13:31:17.000] envs[common]] [13:31:17.000] NAMES <- toupper(changed) [13:31:17.000] args <- list() [13:31:17.000] for (kk in seq_along(NAMES)) { [13:31:17.000] name <- changed[[kk]] [13:31:17.000] NAME <- NAMES[[kk]] [13:31:17.000] if (name != NAME && is.element(NAME, old_names)) [13:31:17.000] next [13:31:17.000] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.000] } [13:31:17.000] NAMES <- toupper(added) [13:31:17.000] for (kk in seq_along(NAMES)) { [13:31:17.000] name <- added[[kk]] [13:31:17.000] NAME <- NAMES[[kk]] [13:31:17.000] if (name != NAME && is.element(NAME, old_names)) [13:31:17.000] next [13:31:17.000] args[[name]] <- "" [13:31:17.000] } [13:31:17.000] NAMES <- toupper(removed) [13:31:17.000] for (kk in seq_along(NAMES)) { [13:31:17.000] name <- removed[[kk]] [13:31:17.000] NAME <- NAMES[[kk]] [13:31:17.000] if (name != NAME && is.element(NAME, old_names)) [13:31:17.000] next [13:31:17.000] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.000] } [13:31:17.000] if (length(args) > 0) [13:31:17.000] base::do.call(base::Sys.setenv, args = args) [13:31:17.000] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:17.000] } [13:31:17.000] else { [13:31:17.000] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:17.000] } [13:31:17.000] { [13:31:17.000] if (base::length(...future.futureOptionsAdded) > [13:31:17.000] 0L) { [13:31:17.000] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:17.000] base::names(opts) <- ...future.futureOptionsAdded [13:31:17.000] base::options(opts) [13:31:17.000] } [13:31:17.000] { [13:31:17.000] NULL [13:31:17.000] options(future.plan = NULL) [13:31:17.000] if (is.na(NA_character_)) [13:31:17.000] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.000] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:17.000] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:17.000] .init = FALSE) [13:31:17.000] } [13:31:17.000] } [13:31:17.000] } [13:31:17.000] }) [13:31:17.000] if (TRUE) { [13:31:17.000] base::sink(type = "output", split = FALSE) [13:31:17.000] if (TRUE) { [13:31:17.000] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:17.000] } [13:31:17.000] else { [13:31:17.000] ...future.result["stdout"] <- base::list(NULL) [13:31:17.000] } [13:31:17.000] base::close(...future.stdout) [13:31:17.000] ...future.stdout <- NULL [13:31:17.000] } [13:31:17.000] ...future.result$conditions <- ...future.conditions [13:31:17.000] ...future.result$finished <- base::Sys.time() [13:31:17.000] ...future.result [13:31:17.000] } [13:31:17.025] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:17.025] plan(): nbrOfWorkers() = 2 [13:31:17.025] future_lapply() ... [13:31:17.026] Number of chunks: 2 [13:31:17.026] getGlobalsAndPackagesXApply() ... [13:31:17.027] - future.globals: TRUE [13:31:17.027] getGlobalsAndPackages() ... [13:31:17.027] Searching for globals... [13:31:17.028] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:31:17.029] Searching for globals ... DONE [13:31:17.029] Resolving globals: FALSE [13:31:17.029] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:31:17.030] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [13:31:17.030] - globals: [1] 'FUN' [13:31:17.030] - packages: [1] 'listenv' [13:31:17.030] getGlobalsAndPackages() ... DONE [13:31:17.030] - globals found/used: [n=1] 'FUN' [13:31:17.031] - needed namespaces: [n=1] 'listenv' [13:31:17.031] Finding globals ... DONE [13:31:17.031] - use_args: TRUE [13:31:17.031] - Getting '...' globals ... [13:31:17.032] resolve() on list ... [13:31:17.032] recursive: 0 [13:31:17.033] length: 1 [13:31:17.033] elements: '...' [13:31:17.033] length: 0 (resolved future 1) [13:31:17.033] resolve() on list ... DONE [13:31:17.033] - '...' content: [n=0] [13:31:17.033] List of 1 [13:31:17.033] $ ...: list() [13:31:17.033] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:17.033] - attr(*, "where")=List of 1 [13:31:17.033] ..$ ...: [13:31:17.033] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:17.033] - attr(*, "resolved")= logi TRUE [13:31:17.033] - attr(*, "total_size")= num NA [13:31:17.036] - Getting '...' globals ... DONE [13:31:17.037] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:17.037] List of 2 [13:31:17.037] $ ...future.FUN:function (x, ...) [13:31:17.037] $ ... : list() [13:31:17.037] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:17.037] - attr(*, "where")=List of 2 [13:31:17.037] ..$ ...future.FUN: [13:31:17.037] ..$ ... : [13:31:17.037] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:17.037] - attr(*, "resolved")= logi FALSE [13:31:17.037] - attr(*, "total_size")= num 4968 [13:31:17.040] Packages to be attached in all futures: [n=1] 'listenv' [13:31:17.040] getGlobalsAndPackagesXApply() ... DONE [13:31:17.040] Number of futures (= number of chunks): 2 [13:31:17.040] Launching 2 futures (chunks) ... [13:31:17.041] Chunk #1 of 2 ... [13:31:17.041] - Finding globals in 'X' for chunk #1 ... [13:31:17.041] getGlobalsAndPackages() ... [13:31:17.041] Searching for globals... [13:31:17.042] [13:31:17.042] Searching for globals ... DONE [13:31:17.042] - globals: [0] [13:31:17.042] getGlobalsAndPackages() ... DONE [13:31:17.042] + additional globals found: [n=0] [13:31:17.042] + additional namespaces needed: [n=0] [13:31:17.043] - Finding globals in 'X' for chunk #1 ... DONE [13:31:17.043] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:17.043] - seeds: [13:31:17.043] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.043] getGlobalsAndPackages() ... [13:31:17.043] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.044] Resolving globals: FALSE [13:31:17.044] Tweak future expression to call with '...' arguments ... [13:31:17.044] { [13:31:17.044] do.call(function(...) { [13:31:17.044] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.044] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:17.044] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.044] on.exit(options(oopts), add = TRUE) [13:31:17.044] } [13:31:17.044] { [13:31:17.044] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:17.044] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.044] ...future.FUN(...future.X_jj, ...) [13:31:17.044] }) [13:31:17.044] } [13:31:17.044] }, args = future.call.arguments) [13:31:17.044] } [13:31:17.044] Tweak future expression to call with '...' arguments ... DONE [13:31:17.045] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.045] - packages: [1] 'listenv' [13:31:17.045] getGlobalsAndPackages() ... DONE [13:31:17.045] run() for 'Future' ... [13:31:17.046] - state: 'created' [13:31:17.046] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:17.048] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:17.048] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:17.048] - Field: 'label' [13:31:17.049] - Field: 'local' [13:31:17.049] - Field: 'owner' [13:31:17.049] - Field: 'envir' [13:31:17.049] - Field: 'packages' [13:31:17.049] - Field: 'gc' [13:31:17.050] - Field: 'conditions' [13:31:17.050] - Field: 'expr' [13:31:17.050] - Field: 'uuid' [13:31:17.050] - Field: 'seed' [13:31:17.050] - Field: 'version' [13:31:17.050] - Field: 'result' [13:31:17.051] - Field: 'asynchronous' [13:31:17.051] - Field: 'calls' [13:31:17.051] - Field: 'globals' [13:31:17.051] - Field: 'stdout' [13:31:17.051] - Field: 'earlySignal' [13:31:17.051] - Field: 'lazy' [13:31:17.052] - Field: 'state' [13:31:17.052] - Field: '.cluster' [13:31:17.052] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:17.052] - Launch lazy future ... [13:31:17.052] Packages needed by the future expression (n = 1): 'listenv' [13:31:17.052] Packages needed by future strategies (n = 0): [13:31:17.053] { [13:31:17.053] { [13:31:17.053] { [13:31:17.053] ...future.startTime <- base::Sys.time() [13:31:17.053] { [13:31:17.053] { [13:31:17.053] { [13:31:17.053] { [13:31:17.053] base::local({ [13:31:17.053] has_future <- base::requireNamespace("future", [13:31:17.053] quietly = TRUE) [13:31:17.053] if (has_future) { [13:31:17.053] ns <- base::getNamespace("future") [13:31:17.053] version <- ns[[".package"]][["version"]] [13:31:17.053] if (is.null(version)) [13:31:17.053] version <- utils::packageVersion("future") [13:31:17.053] } [13:31:17.053] else { [13:31:17.053] version <- NULL [13:31:17.053] } [13:31:17.053] if (!has_future || version < "1.8.0") { [13:31:17.053] info <- base::c(r_version = base::gsub("R version ", [13:31:17.053] "", base::R.version$version.string), [13:31:17.053] platform = base::sprintf("%s (%s-bit)", [13:31:17.053] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:17.053] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:17.053] "release", "version")], collapse = " "), [13:31:17.053] hostname = base::Sys.info()[["nodename"]]) [13:31:17.053] info <- base::sprintf("%s: %s", base::names(info), [13:31:17.053] info) [13:31:17.053] info <- base::paste(info, collapse = "; ") [13:31:17.053] if (!has_future) { [13:31:17.053] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:17.053] info) [13:31:17.053] } [13:31:17.053] else { [13:31:17.053] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:17.053] info, version) [13:31:17.053] } [13:31:17.053] base::stop(msg) [13:31:17.053] } [13:31:17.053] }) [13:31:17.053] } [13:31:17.053] base::local({ [13:31:17.053] for (pkg in "listenv") { [13:31:17.053] base::loadNamespace(pkg) [13:31:17.053] base::library(pkg, character.only = TRUE) [13:31:17.053] } [13:31:17.053] }) [13:31:17.053] } [13:31:17.053] ...future.strategy.old <- future::plan("list") [13:31:17.053] options(future.plan = NULL) [13:31:17.053] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.053] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:17.053] } [13:31:17.053] ...future.workdir <- getwd() [13:31:17.053] } [13:31:17.053] ...future.oldOptions <- base::as.list(base::.Options) [13:31:17.053] ...future.oldEnvVars <- base::Sys.getenv() [13:31:17.053] } [13:31:17.053] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:17.053] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:17.053] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:17.053] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:17.053] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:17.053] future.stdout.windows.reencode = NULL, width = 80L) [13:31:17.053] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:17.053] base::names(...future.oldOptions)) [13:31:17.053] } [13:31:17.053] if (FALSE) { [13:31:17.053] } [13:31:17.053] else { [13:31:17.053] if (TRUE) { [13:31:17.053] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:17.053] open = "w") [13:31:17.053] } [13:31:17.053] else { [13:31:17.053] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:17.053] windows = "NUL", "/dev/null"), open = "w") [13:31:17.053] } [13:31:17.053] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:17.053] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:17.053] base::sink(type = "output", split = FALSE) [13:31:17.053] base::close(...future.stdout) [13:31:17.053] }, add = TRUE) [13:31:17.053] } [13:31:17.053] ...future.frame <- base::sys.nframe() [13:31:17.053] ...future.conditions <- base::list() [13:31:17.053] ...future.rng <- base::globalenv()$.Random.seed [13:31:17.053] if (FALSE) { [13:31:17.053] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:17.053] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:17.053] } [13:31:17.053] ...future.result <- base::tryCatch({ [13:31:17.053] base::withCallingHandlers({ [13:31:17.053] ...future.value <- base::withVisible(base::local({ [13:31:17.053] do.call(function(...) { [13:31:17.053] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.053] if (!identical(...future.globals.maxSize.org, [13:31:17.053] ...future.globals.maxSize)) { [13:31:17.053] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.053] on.exit(options(oopts), add = TRUE) [13:31:17.053] } [13:31:17.053] { [13:31:17.053] lapply(seq_along(...future.elements_ii), [13:31:17.053] FUN = function(jj) { [13:31:17.053] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.053] ...future.FUN(...future.X_jj, ...) [13:31:17.053] }) [13:31:17.053] } [13:31:17.053] }, args = future.call.arguments) [13:31:17.053] })) [13:31:17.053] future::FutureResult(value = ...future.value$value, [13:31:17.053] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.053] ...future.rng), globalenv = if (FALSE) [13:31:17.053] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:17.053] ...future.globalenv.names)) [13:31:17.053] else NULL, started = ...future.startTime, version = "1.8") [13:31:17.053] }, condition = base::local({ [13:31:17.053] c <- base::c [13:31:17.053] inherits <- base::inherits [13:31:17.053] invokeRestart <- base::invokeRestart [13:31:17.053] length <- base::length [13:31:17.053] list <- base::list [13:31:17.053] seq.int <- base::seq.int [13:31:17.053] signalCondition <- base::signalCondition [13:31:17.053] sys.calls <- base::sys.calls [13:31:17.053] `[[` <- base::`[[` [13:31:17.053] `+` <- base::`+` [13:31:17.053] `<<-` <- base::`<<-` [13:31:17.053] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:17.053] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:17.053] 3L)] [13:31:17.053] } [13:31:17.053] function(cond) { [13:31:17.053] is_error <- inherits(cond, "error") [13:31:17.053] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:17.053] NULL) [13:31:17.053] if (is_error) { [13:31:17.053] sessionInformation <- function() { [13:31:17.053] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:17.053] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:17.053] search = base::search(), system = base::Sys.info()) [13:31:17.053] } [13:31:17.053] ...future.conditions[[length(...future.conditions) + [13:31:17.053] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:17.053] cond$call), session = sessionInformation(), [13:31:17.053] timestamp = base::Sys.time(), signaled = 0L) [13:31:17.053] signalCondition(cond) [13:31:17.053] } [13:31:17.053] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:17.053] signal <- FALSE && inherits(cond, character(0)) [13:31:17.053] ...future.conditions[[length(...future.conditions) + [13:31:17.053] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:17.053] if (FALSE && !signal) { [13:31:17.053] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.053] { [13:31:17.053] inherits <- base::inherits [13:31:17.053] invokeRestart <- base::invokeRestart [13:31:17.053] is.null <- base::is.null [13:31:17.053] muffled <- FALSE [13:31:17.053] if (inherits(cond, "message")) { [13:31:17.053] muffled <- grepl(pattern, "muffleMessage") [13:31:17.053] if (muffled) [13:31:17.053] invokeRestart("muffleMessage") [13:31:17.053] } [13:31:17.053] else if (inherits(cond, "warning")) { [13:31:17.053] muffled <- grepl(pattern, "muffleWarning") [13:31:17.053] if (muffled) [13:31:17.053] invokeRestart("muffleWarning") [13:31:17.053] } [13:31:17.053] else if (inherits(cond, "condition")) { [13:31:17.053] if (!is.null(pattern)) { [13:31:17.053] computeRestarts <- base::computeRestarts [13:31:17.053] grepl <- base::grepl [13:31:17.053] restarts <- computeRestarts(cond) [13:31:17.053] for (restart in restarts) { [13:31:17.053] name <- restart$name [13:31:17.053] if (is.null(name)) [13:31:17.053] next [13:31:17.053] if (!grepl(pattern, name)) [13:31:17.053] next [13:31:17.053] invokeRestart(restart) [13:31:17.053] muffled <- TRUE [13:31:17.053] break [13:31:17.053] } [13:31:17.053] } [13:31:17.053] } [13:31:17.053] invisible(muffled) [13:31:17.053] } [13:31:17.053] muffleCondition(cond, pattern = "^muffle") [13:31:17.053] } [13:31:17.053] } [13:31:17.053] else { [13:31:17.053] if (TRUE) { [13:31:17.053] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.053] { [13:31:17.053] inherits <- base::inherits [13:31:17.053] invokeRestart <- base::invokeRestart [13:31:17.053] is.null <- base::is.null [13:31:17.053] muffled <- FALSE [13:31:17.053] if (inherits(cond, "message")) { [13:31:17.053] muffled <- grepl(pattern, "muffleMessage") [13:31:17.053] if (muffled) [13:31:17.053] invokeRestart("muffleMessage") [13:31:17.053] } [13:31:17.053] else if (inherits(cond, "warning")) { [13:31:17.053] muffled <- grepl(pattern, "muffleWarning") [13:31:17.053] if (muffled) [13:31:17.053] invokeRestart("muffleWarning") [13:31:17.053] } [13:31:17.053] else if (inherits(cond, "condition")) { [13:31:17.053] if (!is.null(pattern)) { [13:31:17.053] computeRestarts <- base::computeRestarts [13:31:17.053] grepl <- base::grepl [13:31:17.053] restarts <- computeRestarts(cond) [13:31:17.053] for (restart in restarts) { [13:31:17.053] name <- restart$name [13:31:17.053] if (is.null(name)) [13:31:17.053] next [13:31:17.053] if (!grepl(pattern, name)) [13:31:17.053] next [13:31:17.053] invokeRestart(restart) [13:31:17.053] muffled <- TRUE [13:31:17.053] break [13:31:17.053] } [13:31:17.053] } [13:31:17.053] } [13:31:17.053] invisible(muffled) [13:31:17.053] } [13:31:17.053] muffleCondition(cond, pattern = "^muffle") [13:31:17.053] } [13:31:17.053] } [13:31:17.053] } [13:31:17.053] })) [13:31:17.053] }, error = function(ex) { [13:31:17.053] base::structure(base::list(value = NULL, visible = NULL, [13:31:17.053] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.053] ...future.rng), started = ...future.startTime, [13:31:17.053] finished = Sys.time(), session_uuid = NA_character_, [13:31:17.053] version = "1.8"), class = "FutureResult") [13:31:17.053] }, finally = { [13:31:17.053] if (!identical(...future.workdir, getwd())) [13:31:17.053] setwd(...future.workdir) [13:31:17.053] { [13:31:17.053] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:17.053] ...future.oldOptions$nwarnings <- NULL [13:31:17.053] } [13:31:17.053] base::options(...future.oldOptions) [13:31:17.053] if (.Platform$OS.type == "windows") { [13:31:17.053] old_names <- names(...future.oldEnvVars) [13:31:17.053] envs <- base::Sys.getenv() [13:31:17.053] names <- names(envs) [13:31:17.053] common <- intersect(names, old_names) [13:31:17.053] added <- setdiff(names, old_names) [13:31:17.053] removed <- setdiff(old_names, names) [13:31:17.053] changed <- common[...future.oldEnvVars[common] != [13:31:17.053] envs[common]] [13:31:17.053] NAMES <- toupper(changed) [13:31:17.053] args <- list() [13:31:17.053] for (kk in seq_along(NAMES)) { [13:31:17.053] name <- changed[[kk]] [13:31:17.053] NAME <- NAMES[[kk]] [13:31:17.053] if (name != NAME && is.element(NAME, old_names)) [13:31:17.053] next [13:31:17.053] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.053] } [13:31:17.053] NAMES <- toupper(added) [13:31:17.053] for (kk in seq_along(NAMES)) { [13:31:17.053] name <- added[[kk]] [13:31:17.053] NAME <- NAMES[[kk]] [13:31:17.053] if (name != NAME && is.element(NAME, old_names)) [13:31:17.053] next [13:31:17.053] args[[name]] <- "" [13:31:17.053] } [13:31:17.053] NAMES <- toupper(removed) [13:31:17.053] for (kk in seq_along(NAMES)) { [13:31:17.053] name <- removed[[kk]] [13:31:17.053] NAME <- NAMES[[kk]] [13:31:17.053] if (name != NAME && is.element(NAME, old_names)) [13:31:17.053] next [13:31:17.053] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.053] } [13:31:17.053] if (length(args) > 0) [13:31:17.053] base::do.call(base::Sys.setenv, args = args) [13:31:17.053] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:17.053] } [13:31:17.053] else { [13:31:17.053] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:17.053] } [13:31:17.053] { [13:31:17.053] if (base::length(...future.futureOptionsAdded) > [13:31:17.053] 0L) { [13:31:17.053] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:17.053] base::names(opts) <- ...future.futureOptionsAdded [13:31:17.053] base::options(opts) [13:31:17.053] } [13:31:17.053] { [13:31:17.053] NULL [13:31:17.053] options(future.plan = NULL) [13:31:17.053] if (is.na(NA_character_)) [13:31:17.053] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.053] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:17.053] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:17.053] .init = FALSE) [13:31:17.053] } [13:31:17.053] } [13:31:17.053] } [13:31:17.053] }) [13:31:17.053] if (TRUE) { [13:31:17.053] base::sink(type = "output", split = FALSE) [13:31:17.053] if (TRUE) { [13:31:17.053] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:17.053] } [13:31:17.053] else { [13:31:17.053] ...future.result["stdout"] <- base::list(NULL) [13:31:17.053] } [13:31:17.053] base::close(...future.stdout) [13:31:17.053] ...future.stdout <- NULL [13:31:17.053] } [13:31:17.053] ...future.result$conditions <- ...future.conditions [13:31:17.053] ...future.result$finished <- base::Sys.time() [13:31:17.053] ...future.result [13:31:17.053] } [13:31:17.057] - Launch lazy future ... done [13:31:17.057] run() for 'MiraiFuture' ... done [13:31:17.058] Created future: [13:31:17.060] resolved() for 'MiraiFuture' ... [13:31:17.060] - state: 'running' [13:31:17.060] - run: TRUE [13:31:17.060] - result: 'NULL' [13:31:17.060] - resolved: FALSE [13:31:17.061] resolved() for 'MiraiFuture' ... done [13:31:17.058] MiraiFuture: [13:31:17.058] Label: 'future_lapply-1' [13:31:17.058] Expression: [13:31:17.058] { [13:31:17.058] do.call(function(...) { [13:31:17.058] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.058] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:17.058] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.058] on.exit(options(oopts), add = TRUE) [13:31:17.058] } [13:31:17.058] { [13:31:17.058] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:17.058] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.058] ...future.FUN(...future.X_jj, ...) [13:31:17.058] }) [13:31:17.058] } [13:31:17.058] }, args = future.call.arguments) [13:31:17.058] } [13:31:17.058] Lazy evaluation: FALSE [13:31:17.058] Asynchronous evaluation: TRUE [13:31:17.058] Local evaluation: TRUE [13:31:17.058] Environment: R_GlobalEnv [13:31:17.058] Capture standard output: TRUE [13:31:17.058] Capture condition classes: 'condition' (excluding 'nothing') [13:31:17.058] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:17.058] Packages: 1 packages ('listenv') [13:31:17.058] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:17.058] Resolved: FALSE [13:31:17.058] Value: [13:31:17.058] Conditions captured: [13:31:17.058] Early signaling: FALSE [13:31:17.058] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:17.058] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:17.061] Chunk #1 of 2 ... DONE [13:31:17.061] Chunk #2 of 2 ... [13:31:17.061] - Finding globals in 'X' for chunk #2 ... [13:31:17.062] getGlobalsAndPackages() ... [13:31:17.062] Searching for globals... [13:31:17.062] [13:31:17.062] Searching for globals ... DONE [13:31:17.063] - globals: [0] [13:31:17.063] getGlobalsAndPackages() ... DONE [13:31:17.063] + additional globals found: [n=0] [13:31:17.063] + additional namespaces needed: [n=0] [13:31:17.063] - Finding globals in 'X' for chunk #2 ... DONE [13:31:17.063] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:17.063] - seeds: [13:31:17.064] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.064] getGlobalsAndPackages() ... [13:31:17.064] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.064] Resolving globals: FALSE [13:31:17.064] Tweak future expression to call with '...' arguments ... [13:31:17.064] { [13:31:17.064] do.call(function(...) { [13:31:17.064] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.064] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:17.064] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.064] on.exit(options(oopts), add = TRUE) [13:31:17.064] } [13:31:17.064] { [13:31:17.064] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:17.064] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.064] ...future.FUN(...future.X_jj, ...) [13:31:17.064] }) [13:31:17.064] } [13:31:17.064] }, args = future.call.arguments) [13:31:17.064] } [13:31:17.065] Tweak future expression to call with '...' arguments ... DONE [13:31:17.065] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.066] - packages: [1] 'listenv' [13:31:17.066] getGlobalsAndPackages() ... DONE [13:31:17.066] run() for 'Future' ... [13:31:17.066] - state: 'created' [13:31:17.066] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:17.069] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:17.069] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:17.069] - Field: 'label' [13:31:17.069] - Field: 'local' [13:31:17.069] - Field: 'owner' [13:31:17.070] - Field: 'envir' [13:31:17.070] - Field: 'packages' [13:31:17.070] - Field: 'gc' [13:31:17.070] - Field: 'conditions' [13:31:17.070] - Field: 'expr' [13:31:17.070] - Field: 'uuid' [13:31:17.071] - Field: 'seed' [13:31:17.071] - Field: 'version' [13:31:17.071] - Field: 'result' [13:31:17.071] - Field: 'asynchronous' [13:31:17.071] - Field: 'calls' [13:31:17.071] - Field: 'globals' [13:31:17.072] - Field: 'stdout' [13:31:17.072] - Field: 'earlySignal' [13:31:17.072] - Field: 'lazy' [13:31:17.072] - Field: 'state' [13:31:17.072] - Field: '.cluster' [13:31:17.073] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:17.073] - Launch lazy future ... [13:31:17.073] Packages needed by the future expression (n = 1): 'listenv' [13:31:17.073] Packages needed by future strategies (n = 0): [13:31:17.074] { [13:31:17.074] { [13:31:17.074] { [13:31:17.074] ...future.startTime <- base::Sys.time() [13:31:17.074] { [13:31:17.074] { [13:31:17.074] { [13:31:17.074] { [13:31:17.074] base::local({ [13:31:17.074] has_future <- base::requireNamespace("future", [13:31:17.074] quietly = TRUE) [13:31:17.074] if (has_future) { [13:31:17.074] ns <- base::getNamespace("future") [13:31:17.074] version <- ns[[".package"]][["version"]] [13:31:17.074] if (is.null(version)) [13:31:17.074] version <- utils::packageVersion("future") [13:31:17.074] } [13:31:17.074] else { [13:31:17.074] version <- NULL [13:31:17.074] } [13:31:17.074] if (!has_future || version < "1.8.0") { [13:31:17.074] info <- base::c(r_version = base::gsub("R version ", [13:31:17.074] "", base::R.version$version.string), [13:31:17.074] platform = base::sprintf("%s (%s-bit)", [13:31:17.074] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:17.074] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:17.074] "release", "version")], collapse = " "), [13:31:17.074] hostname = base::Sys.info()[["nodename"]]) [13:31:17.074] info <- base::sprintf("%s: %s", base::names(info), [13:31:17.074] info) [13:31:17.074] info <- base::paste(info, collapse = "; ") [13:31:17.074] if (!has_future) { [13:31:17.074] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:17.074] info) [13:31:17.074] } [13:31:17.074] else { [13:31:17.074] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:17.074] info, version) [13:31:17.074] } [13:31:17.074] base::stop(msg) [13:31:17.074] } [13:31:17.074] }) [13:31:17.074] } [13:31:17.074] base::local({ [13:31:17.074] for (pkg in "listenv") { [13:31:17.074] base::loadNamespace(pkg) [13:31:17.074] base::library(pkg, character.only = TRUE) [13:31:17.074] } [13:31:17.074] }) [13:31:17.074] } [13:31:17.074] ...future.strategy.old <- future::plan("list") [13:31:17.074] options(future.plan = NULL) [13:31:17.074] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.074] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:17.074] } [13:31:17.074] ...future.workdir <- getwd() [13:31:17.074] } [13:31:17.074] ...future.oldOptions <- base::as.list(base::.Options) [13:31:17.074] ...future.oldEnvVars <- base::Sys.getenv() [13:31:17.074] } [13:31:17.074] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:17.074] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:17.074] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:17.074] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:17.074] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:17.074] future.stdout.windows.reencode = NULL, width = 80L) [13:31:17.074] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:17.074] base::names(...future.oldOptions)) [13:31:17.074] } [13:31:17.074] if (FALSE) { [13:31:17.074] } [13:31:17.074] else { [13:31:17.074] if (TRUE) { [13:31:17.074] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:17.074] open = "w") [13:31:17.074] } [13:31:17.074] else { [13:31:17.074] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:17.074] windows = "NUL", "/dev/null"), open = "w") [13:31:17.074] } [13:31:17.074] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:17.074] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:17.074] base::sink(type = "output", split = FALSE) [13:31:17.074] base::close(...future.stdout) [13:31:17.074] }, add = TRUE) [13:31:17.074] } [13:31:17.074] ...future.frame <- base::sys.nframe() [13:31:17.074] ...future.conditions <- base::list() [13:31:17.074] ...future.rng <- base::globalenv()$.Random.seed [13:31:17.074] if (FALSE) { [13:31:17.074] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:17.074] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:17.074] } [13:31:17.074] ...future.result <- base::tryCatch({ [13:31:17.074] base::withCallingHandlers({ [13:31:17.074] ...future.value <- base::withVisible(base::local({ [13:31:17.074] do.call(function(...) { [13:31:17.074] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.074] if (!identical(...future.globals.maxSize.org, [13:31:17.074] ...future.globals.maxSize)) { [13:31:17.074] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.074] on.exit(options(oopts), add = TRUE) [13:31:17.074] } [13:31:17.074] { [13:31:17.074] lapply(seq_along(...future.elements_ii), [13:31:17.074] FUN = function(jj) { [13:31:17.074] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.074] ...future.FUN(...future.X_jj, ...) [13:31:17.074] }) [13:31:17.074] } [13:31:17.074] }, args = future.call.arguments) [13:31:17.074] })) [13:31:17.074] future::FutureResult(value = ...future.value$value, [13:31:17.074] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.074] ...future.rng), globalenv = if (FALSE) [13:31:17.074] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:17.074] ...future.globalenv.names)) [13:31:17.074] else NULL, started = ...future.startTime, version = "1.8") [13:31:17.074] }, condition = base::local({ [13:31:17.074] c <- base::c [13:31:17.074] inherits <- base::inherits [13:31:17.074] invokeRestart <- base::invokeRestart [13:31:17.074] length <- base::length [13:31:17.074] list <- base::list [13:31:17.074] seq.int <- base::seq.int [13:31:17.074] signalCondition <- base::signalCondition [13:31:17.074] sys.calls <- base::sys.calls [13:31:17.074] `[[` <- base::`[[` [13:31:17.074] `+` <- base::`+` [13:31:17.074] `<<-` <- base::`<<-` [13:31:17.074] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:17.074] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:17.074] 3L)] [13:31:17.074] } [13:31:17.074] function(cond) { [13:31:17.074] is_error <- inherits(cond, "error") [13:31:17.074] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:17.074] NULL) [13:31:17.074] if (is_error) { [13:31:17.074] sessionInformation <- function() { [13:31:17.074] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:17.074] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:17.074] search = base::search(), system = base::Sys.info()) [13:31:17.074] } [13:31:17.074] ...future.conditions[[length(...future.conditions) + [13:31:17.074] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:17.074] cond$call), session = sessionInformation(), [13:31:17.074] timestamp = base::Sys.time(), signaled = 0L) [13:31:17.074] signalCondition(cond) [13:31:17.074] } [13:31:17.074] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:17.074] signal <- FALSE && inherits(cond, character(0)) [13:31:17.074] ...future.conditions[[length(...future.conditions) + [13:31:17.074] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:17.074] if (FALSE && !signal) { [13:31:17.074] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.074] { [13:31:17.074] inherits <- base::inherits [13:31:17.074] invokeRestart <- base::invokeRestart [13:31:17.074] is.null <- base::is.null [13:31:17.074] muffled <- FALSE [13:31:17.074] if (inherits(cond, "message")) { [13:31:17.074] muffled <- grepl(pattern, "muffleMessage") [13:31:17.074] if (muffled) [13:31:17.074] invokeRestart("muffleMessage") [13:31:17.074] } [13:31:17.074] else if (inherits(cond, "warning")) { [13:31:17.074] muffled <- grepl(pattern, "muffleWarning") [13:31:17.074] if (muffled) [13:31:17.074] invokeRestart("muffleWarning") [13:31:17.074] } [13:31:17.074] else if (inherits(cond, "condition")) { [13:31:17.074] if (!is.null(pattern)) { [13:31:17.074] computeRestarts <- base::computeRestarts [13:31:17.074] grepl <- base::grepl [13:31:17.074] restarts <- computeRestarts(cond) [13:31:17.074] for (restart in restarts) { [13:31:17.074] name <- restart$name [13:31:17.074] if (is.null(name)) [13:31:17.074] next [13:31:17.074] if (!grepl(pattern, name)) [13:31:17.074] next [13:31:17.074] invokeRestart(restart) [13:31:17.074] muffled <- TRUE [13:31:17.074] break [13:31:17.074] } [13:31:17.074] } [13:31:17.074] } [13:31:17.074] invisible(muffled) [13:31:17.074] } [13:31:17.074] muffleCondition(cond, pattern = "^muffle") [13:31:17.074] } [13:31:17.074] } [13:31:17.074] else { [13:31:17.074] if (TRUE) { [13:31:17.074] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.074] { [13:31:17.074] inherits <- base::inherits [13:31:17.074] invokeRestart <- base::invokeRestart [13:31:17.074] is.null <- base::is.null [13:31:17.074] muffled <- FALSE [13:31:17.074] if (inherits(cond, "message")) { [13:31:17.074] muffled <- grepl(pattern, "muffleMessage") [13:31:17.074] if (muffled) [13:31:17.074] invokeRestart("muffleMessage") [13:31:17.074] } [13:31:17.074] else if (inherits(cond, "warning")) { [13:31:17.074] muffled <- grepl(pattern, "muffleWarning") [13:31:17.074] if (muffled) [13:31:17.074] invokeRestart("muffleWarning") [13:31:17.074] } [13:31:17.074] else if (inherits(cond, "condition")) { [13:31:17.074] if (!is.null(pattern)) { [13:31:17.074] computeRestarts <- base::computeRestarts [13:31:17.074] grepl <- base::grepl [13:31:17.074] restarts <- computeRestarts(cond) [13:31:17.074] for (restart in restarts) { [13:31:17.074] name <- restart$name [13:31:17.074] if (is.null(name)) [13:31:17.074] next [13:31:17.074] if (!grepl(pattern, name)) [13:31:17.074] next [13:31:17.074] invokeRestart(restart) [13:31:17.074] muffled <- TRUE [13:31:17.074] break [13:31:17.074] } [13:31:17.074] } [13:31:17.074] } [13:31:17.074] invisible(muffled) [13:31:17.074] } [13:31:17.074] muffleCondition(cond, pattern = "^muffle") [13:31:17.074] } [13:31:17.074] } [13:31:17.074] } [13:31:17.074] })) [13:31:17.074] }, error = function(ex) { [13:31:17.074] base::structure(base::list(value = NULL, visible = NULL, [13:31:17.074] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.074] ...future.rng), started = ...future.startTime, [13:31:17.074] finished = Sys.time(), session_uuid = NA_character_, [13:31:17.074] version = "1.8"), class = "FutureResult") [13:31:17.074] }, finally = { [13:31:17.074] if (!identical(...future.workdir, getwd())) [13:31:17.074] setwd(...future.workdir) [13:31:17.074] { [13:31:17.074] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:17.074] ...future.oldOptions$nwarnings <- NULL [13:31:17.074] } [13:31:17.074] base::options(...future.oldOptions) [13:31:17.074] if (.Platform$OS.type == "windows") { [13:31:17.074] old_names <- names(...future.oldEnvVars) [13:31:17.074] envs <- base::Sys.getenv() [13:31:17.074] names <- names(envs) [13:31:17.074] common <- intersect(names, old_names) [13:31:17.074] added <- setdiff(names, old_names) [13:31:17.074] removed <- setdiff(old_names, names) [13:31:17.074] changed <- common[...future.oldEnvVars[common] != [13:31:17.074] envs[common]] [13:31:17.074] NAMES <- toupper(changed) [13:31:17.074] args <- list() [13:31:17.074] for (kk in seq_along(NAMES)) { [13:31:17.074] name <- changed[[kk]] [13:31:17.074] NAME <- NAMES[[kk]] [13:31:17.074] if (name != NAME && is.element(NAME, old_names)) [13:31:17.074] next [13:31:17.074] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.074] } [13:31:17.074] NAMES <- toupper(added) [13:31:17.074] for (kk in seq_along(NAMES)) { [13:31:17.074] name <- added[[kk]] [13:31:17.074] NAME <- NAMES[[kk]] [13:31:17.074] if (name != NAME && is.element(NAME, old_names)) [13:31:17.074] next [13:31:17.074] args[[name]] <- "" [13:31:17.074] } [13:31:17.074] NAMES <- toupper(removed) [13:31:17.074] for (kk in seq_along(NAMES)) { [13:31:17.074] name <- removed[[kk]] [13:31:17.074] NAME <- NAMES[[kk]] [13:31:17.074] if (name != NAME && is.element(NAME, old_names)) [13:31:17.074] next [13:31:17.074] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.074] } [13:31:17.074] if (length(args) > 0) [13:31:17.074] base::do.call(base::Sys.setenv, args = args) [13:31:17.074] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:17.074] } [13:31:17.074] else { [13:31:17.074] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:17.074] } [13:31:17.074] { [13:31:17.074] if (base::length(...future.futureOptionsAdded) > [13:31:17.074] 0L) { [13:31:17.074] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:17.074] base::names(opts) <- ...future.futureOptionsAdded [13:31:17.074] base::options(opts) [13:31:17.074] } [13:31:17.074] { [13:31:17.074] NULL [13:31:17.074] options(future.plan = NULL) [13:31:17.074] if (is.na(NA_character_)) [13:31:17.074] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.074] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:17.074] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:17.074] .init = FALSE) [13:31:17.074] } [13:31:17.074] } [13:31:17.074] } [13:31:17.074] }) [13:31:17.074] if (TRUE) { [13:31:17.074] base::sink(type = "output", split = FALSE) [13:31:17.074] if (TRUE) { [13:31:17.074] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:17.074] } [13:31:17.074] else { [13:31:17.074] ...future.result["stdout"] <- base::list(NULL) [13:31:17.074] } [13:31:17.074] base::close(...future.stdout) [13:31:17.074] ...future.stdout <- NULL [13:31:17.074] } [13:31:17.074] ...future.result$conditions <- ...future.conditions [13:31:17.074] ...future.result$finished <- base::Sys.time() [13:31:17.074] ...future.result [13:31:17.074] } [13:31:17.078] - Launch lazy future ... done [13:31:17.078] run() for 'MiraiFuture' ... done [13:31:17.078] Created future: [13:31:17.079] resolved() for 'MiraiFuture' ... [13:31:17.080] - state: 'running' [13:31:17.080] - run: TRUE [13:31:17.080] - result: 'NULL' [13:31:17.080] - resolved: FALSE [13:31:17.080] resolved() for 'MiraiFuture' ... done [13:31:17.078] MiraiFuture: [13:31:17.078] Label: 'future_lapply-2' [13:31:17.078] Expression: [13:31:17.078] { [13:31:17.078] do.call(function(...) { [13:31:17.078] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.078] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:17.078] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.078] on.exit(options(oopts), add = TRUE) [13:31:17.078] } [13:31:17.078] { [13:31:17.078] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:17.078] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.078] ...future.FUN(...future.X_jj, ...) [13:31:17.078] }) [13:31:17.078] } [13:31:17.078] }, args = future.call.arguments) [13:31:17.078] } [13:31:17.078] Lazy evaluation: FALSE [13:31:17.078] Asynchronous evaluation: TRUE [13:31:17.078] Local evaluation: TRUE [13:31:17.078] Environment: R_GlobalEnv [13:31:17.078] Capture standard output: TRUE [13:31:17.078] Capture condition classes: 'condition' (excluding 'nothing') [13:31:17.078] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:17.078] Packages: 1 packages ('listenv') [13:31:17.078] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:17.078] Resolved: FALSE [13:31:17.078] Value: [13:31:17.078] Conditions captured: [13:31:17.078] Early signaling: FALSE [13:31:17.078] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:17.078] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:17.081] Chunk #2 of 2 ... DONE [13:31:17.081] Launching 2 futures (chunks) ... DONE [13:31:17.081] Resolving 2 futures (chunks) ... [13:31:17.081] resolve() on list ... [13:31:17.081] recursive: 0 [13:31:17.082] length: 2 [13:31:17.082] [13:31:17.082] resolved() for 'MiraiFuture' ... [13:31:17.082] - state: 'running' [13:31:17.082] - run: TRUE [13:31:17.082] - result: 'NULL' [13:31:17.083] - resolved: FALSE [13:31:17.083] resolved() for 'MiraiFuture' ... done [13:31:17.083] Future #1 [13:31:17.083] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:17.083] - nx: 2 [13:31:17.084] - relay: TRUE [13:31:17.084] - stdout: TRUE [13:31:17.084] - signal: TRUE [13:31:17.084] - resignal: FALSE [13:31:17.084] - force: TRUE [13:31:17.084] - relayed: [n=2] FALSE, FALSE [13:31:17.084] - queued futures: [n=2] FALSE, FALSE [13:31:17.085] - until=1 [13:31:17.085] - relaying element #1 [13:31:17.085] - relayed: [n=2] TRUE, FALSE [13:31:17.085] - queued futures: [n=2] TRUE, FALSE [13:31:17.085] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:17.085] length: 1 (resolved future 1) [13:31:17.086] resolved() for 'MiraiFuture' ... [13:31:17.086] - state: 'running' [13:31:17.086] - run: TRUE [13:31:17.086] - result: 'NULL' [13:31:17.086] - resolved: FALSE [13:31:17.087] resolved() for 'MiraiFuture' ... done [13:31:17.087] Future #2 [13:31:17.087] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:17.087] - nx: 2 [13:31:17.087] - relay: TRUE [13:31:17.087] - stdout: TRUE [13:31:17.088] - signal: TRUE [13:31:17.088] - resignal: FALSE [13:31:17.088] - force: TRUE [13:31:17.088] - relayed: [n=2] TRUE, FALSE [13:31:17.088] - queued futures: [n=2] TRUE, FALSE [13:31:17.088] - until=2 [13:31:17.089] - relaying element #2 [13:31:17.089] - relayed: [n=2] TRUE, TRUE [13:31:17.089] - queued futures: [n=2] TRUE, TRUE [13:31:17.089] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:17.089] length: 0 (resolved future 2) [13:31:17.090] Relaying remaining futures [13:31:17.090] signalConditionsASAP(NULL, pos=0) ... [13:31:17.091] - nx: 2 [13:31:17.091] - relay: TRUE [13:31:17.091] - stdout: TRUE [13:31:17.091] - signal: TRUE [13:31:17.091] - resignal: FALSE [13:31:17.091] - force: TRUE [13:31:17.091] - relayed: [n=2] TRUE, TRUE [13:31:17.092] - queued futures: [n=2] TRUE, TRUE - flush all [13:31:17.092] - relayed: [n=2] TRUE, TRUE [13:31:17.092] - queued futures: [n=2] TRUE, TRUE [13:31:17.092] signalConditionsASAP(NULL, pos=0) ... done [13:31:17.092] resolve() on list ... DONE [13:31:17.093] - Number of value chunks collected: 2 [13:31:17.093] Resolving 2 futures (chunks) ... DONE [13:31:17.093] Reducing values from 2 chunks ... [13:31:17.093] - Number of values collected after concatenation: 2 [13:31:17.093] - Number of values expected: 2 [13:31:17.093] Reducing values from 2 chunks ... DONE [13:31:17.094] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" [13:31:17.095] future_lapply() ... [13:31:17.096] Number of chunks: 2 [13:31:17.097] getGlobalsAndPackagesXApply() ... [13:31:17.097] - future.globals: TRUE [13:31:17.097] getGlobalsAndPackages() ... [13:31:17.097] Searching for globals... [13:31:17.099] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [13:31:17.099] Searching for globals ... DONE [13:31:17.099] Resolving globals: FALSE [13:31:17.099] The total size of the 1 globals is 4.85 KiB (4968 bytes) [13:31:17.100] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [13:31:17.100] - globals: [1] 'FUN' [13:31:17.100] - packages: [1] 'listenv' [13:31:17.100] getGlobalsAndPackages() ... DONE [13:31:17.101] - globals found/used: [n=1] 'FUN' [13:31:17.101] - needed namespaces: [n=1] 'listenv' [13:31:17.101] Finding globals ... DONE [13:31:17.101] - use_args: TRUE [13:31:17.101] - Getting '...' globals ... [13:31:17.102] resolve() on list ... [13:31:17.102] recursive: 0 [13:31:17.102] length: 1 [13:31:17.102] elements: '...' [13:31:17.102] length: 0 (resolved future 1) [13:31:17.102] resolve() on list ... DONE [13:31:17.103] - '...' content: [n=0] [13:31:17.103] List of 1 [13:31:17.103] $ ...: list() [13:31:17.103] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:17.103] - attr(*, "where")=List of 1 [13:31:17.103] ..$ ...: [13:31:17.103] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:17.103] - attr(*, "resolved")= logi TRUE [13:31:17.103] - attr(*, "total_size")= num NA [13:31:17.106] - Getting '...' globals ... DONE [13:31:17.106] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:17.106] List of 2 [13:31:17.106] $ ...future.FUN:function (x, ...) [13:31:17.106] $ ... : list() [13:31:17.106] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:17.106] - attr(*, "where")=List of 2 [13:31:17.106] ..$ ...future.FUN: [13:31:17.106] ..$ ... : [13:31:17.106] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:17.106] - attr(*, "resolved")= logi FALSE [13:31:17.106] - attr(*, "total_size")= num 4968 [13:31:17.109] Packages to be attached in all futures: [n=1] 'listenv' [13:31:17.109] getGlobalsAndPackagesXApply() ... DONE [13:31:17.110] Number of futures (= number of chunks): 2 [13:31:17.110] Launching 2 futures (chunks) ... [13:31:17.110] Chunk #1 of 2 ... [13:31:17.110] - Finding globals in 'X' for chunk #1 ... [13:31:17.110] getGlobalsAndPackages() ... [13:31:17.110] Searching for globals... [13:31:17.112] [13:31:17.112] Searching for globals ... DONE [13:31:17.112] - globals: [0] [13:31:17.112] getGlobalsAndPackages() ... DONE [13:31:17.112] + additional globals found: [n=0] [13:31:17.112] + additional namespaces needed: [n=0] [13:31:17.113] - Finding globals in 'X' for chunk #1 ... DONE [13:31:17.113] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:17.113] - seeds: [13:31:17.113] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.113] getGlobalsAndPackages() ... [13:31:17.113] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.114] Resolving globals: FALSE [13:31:17.114] Tweak future expression to call with '...' arguments ... [13:31:17.114] { [13:31:17.114] do.call(function(...) { [13:31:17.114] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.114] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:17.114] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.114] on.exit(options(oopts), add = TRUE) [13:31:17.114] } [13:31:17.114] { [13:31:17.114] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:17.114] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.114] ...future.FUN(...future.X_jj, ...) [13:31:17.114] }) [13:31:17.114] } [13:31:17.114] }, args = future.call.arguments) [13:31:17.114] } [13:31:17.114] Tweak future expression to call with '...' arguments ... DONE [13:31:17.115] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.115] - packages: [1] 'listenv' [13:31:17.115] getGlobalsAndPackages() ... DONE [13:31:17.116] run() for 'Future' ... [13:31:17.116] - state: 'created' [13:31:17.116] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:17.118] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:17.118] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:17.119] - Field: 'label' [13:31:17.119] - Field: 'local' [13:31:17.119] - Field: 'owner' [13:31:17.119] - Field: 'envir' [13:31:17.119] - Field: 'packages' [13:31:17.120] - Field: 'gc' [13:31:17.120] - Field: 'conditions' [13:31:17.120] - Field: 'expr' [13:31:17.120] - Field: 'uuid' [13:31:17.120] - Field: 'seed' [13:31:17.120] - Field: 'version' [13:31:17.121] - Field: 'result' [13:31:17.121] - Field: 'asynchronous' [13:31:17.121] - Field: 'calls' [13:31:17.121] - Field: 'globals' [13:31:17.121] - Field: 'stdout' [13:31:17.121] - Field: 'earlySignal' [13:31:17.122] - Field: 'lazy' [13:31:17.122] - Field: 'state' [13:31:17.122] - Field: '.cluster' [13:31:17.122] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:17.122] - Launch lazy future ... [13:31:17.122] Packages needed by the future expression (n = 1): 'listenv' [13:31:17.123] Packages needed by future strategies (n = 0): [13:31:17.123] { [13:31:17.123] { [13:31:17.123] { [13:31:17.123] ...future.startTime <- base::Sys.time() [13:31:17.123] { [13:31:17.123] { [13:31:17.123] { [13:31:17.123] { [13:31:17.123] base::local({ [13:31:17.123] has_future <- base::requireNamespace("future", [13:31:17.123] quietly = TRUE) [13:31:17.123] if (has_future) { [13:31:17.123] ns <- base::getNamespace("future") [13:31:17.123] version <- ns[[".package"]][["version"]] [13:31:17.123] if (is.null(version)) [13:31:17.123] version <- utils::packageVersion("future") [13:31:17.123] } [13:31:17.123] else { [13:31:17.123] version <- NULL [13:31:17.123] } [13:31:17.123] if (!has_future || version < "1.8.0") { [13:31:17.123] info <- base::c(r_version = base::gsub("R version ", [13:31:17.123] "", base::R.version$version.string), [13:31:17.123] platform = base::sprintf("%s (%s-bit)", [13:31:17.123] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:17.123] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:17.123] "release", "version")], collapse = " "), [13:31:17.123] hostname = base::Sys.info()[["nodename"]]) [13:31:17.123] info <- base::sprintf("%s: %s", base::names(info), [13:31:17.123] info) [13:31:17.123] info <- base::paste(info, collapse = "; ") [13:31:17.123] if (!has_future) { [13:31:17.123] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:17.123] info) [13:31:17.123] } [13:31:17.123] else { [13:31:17.123] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:17.123] info, version) [13:31:17.123] } [13:31:17.123] base::stop(msg) [13:31:17.123] } [13:31:17.123] }) [13:31:17.123] } [13:31:17.123] base::local({ [13:31:17.123] for (pkg in "listenv") { [13:31:17.123] base::loadNamespace(pkg) [13:31:17.123] base::library(pkg, character.only = TRUE) [13:31:17.123] } [13:31:17.123] }) [13:31:17.123] } [13:31:17.123] ...future.strategy.old <- future::plan("list") [13:31:17.123] options(future.plan = NULL) [13:31:17.123] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.123] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:17.123] } [13:31:17.123] ...future.workdir <- getwd() [13:31:17.123] } [13:31:17.123] ...future.oldOptions <- base::as.list(base::.Options) [13:31:17.123] ...future.oldEnvVars <- base::Sys.getenv() [13:31:17.123] } [13:31:17.123] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:17.123] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:17.123] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:17.123] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:17.123] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:17.123] future.stdout.windows.reencode = NULL, width = 80L) [13:31:17.123] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:17.123] base::names(...future.oldOptions)) [13:31:17.123] } [13:31:17.123] if (FALSE) { [13:31:17.123] } [13:31:17.123] else { [13:31:17.123] if (TRUE) { [13:31:17.123] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:17.123] open = "w") [13:31:17.123] } [13:31:17.123] else { [13:31:17.123] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:17.123] windows = "NUL", "/dev/null"), open = "w") [13:31:17.123] } [13:31:17.123] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:17.123] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:17.123] base::sink(type = "output", split = FALSE) [13:31:17.123] base::close(...future.stdout) [13:31:17.123] }, add = TRUE) [13:31:17.123] } [13:31:17.123] ...future.frame <- base::sys.nframe() [13:31:17.123] ...future.conditions <- base::list() [13:31:17.123] ...future.rng <- base::globalenv()$.Random.seed [13:31:17.123] if (FALSE) { [13:31:17.123] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:17.123] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:17.123] } [13:31:17.123] ...future.result <- base::tryCatch({ [13:31:17.123] base::withCallingHandlers({ [13:31:17.123] ...future.value <- base::withVisible(base::local({ [13:31:17.123] do.call(function(...) { [13:31:17.123] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.123] if (!identical(...future.globals.maxSize.org, [13:31:17.123] ...future.globals.maxSize)) { [13:31:17.123] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.123] on.exit(options(oopts), add = TRUE) [13:31:17.123] } [13:31:17.123] { [13:31:17.123] lapply(seq_along(...future.elements_ii), [13:31:17.123] FUN = function(jj) { [13:31:17.123] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.123] ...future.FUN(...future.X_jj, ...) [13:31:17.123] }) [13:31:17.123] } [13:31:17.123] }, args = future.call.arguments) [13:31:17.123] })) [13:31:17.123] future::FutureResult(value = ...future.value$value, [13:31:17.123] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.123] ...future.rng), globalenv = if (FALSE) [13:31:17.123] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:17.123] ...future.globalenv.names)) [13:31:17.123] else NULL, started = ...future.startTime, version = "1.8") [13:31:17.123] }, condition = base::local({ [13:31:17.123] c <- base::c [13:31:17.123] inherits <- base::inherits [13:31:17.123] invokeRestart <- base::invokeRestart [13:31:17.123] length <- base::length [13:31:17.123] list <- base::list [13:31:17.123] seq.int <- base::seq.int [13:31:17.123] signalCondition <- base::signalCondition [13:31:17.123] sys.calls <- base::sys.calls [13:31:17.123] `[[` <- base::`[[` [13:31:17.123] `+` <- base::`+` [13:31:17.123] `<<-` <- base::`<<-` [13:31:17.123] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:17.123] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:17.123] 3L)] [13:31:17.123] } [13:31:17.123] function(cond) { [13:31:17.123] is_error <- inherits(cond, "error") [13:31:17.123] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:17.123] NULL) [13:31:17.123] if (is_error) { [13:31:17.123] sessionInformation <- function() { [13:31:17.123] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:17.123] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:17.123] search = base::search(), system = base::Sys.info()) [13:31:17.123] } [13:31:17.123] ...future.conditions[[length(...future.conditions) + [13:31:17.123] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:17.123] cond$call), session = sessionInformation(), [13:31:17.123] timestamp = base::Sys.time(), signaled = 0L) [13:31:17.123] signalCondition(cond) [13:31:17.123] } [13:31:17.123] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:17.123] signal <- FALSE && inherits(cond, character(0)) [13:31:17.123] ...future.conditions[[length(...future.conditions) + [13:31:17.123] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:17.123] if (FALSE && !signal) { [13:31:17.123] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.123] { [13:31:17.123] inherits <- base::inherits [13:31:17.123] invokeRestart <- base::invokeRestart [13:31:17.123] is.null <- base::is.null [13:31:17.123] muffled <- FALSE [13:31:17.123] if (inherits(cond, "message")) { [13:31:17.123] muffled <- grepl(pattern, "muffleMessage") [13:31:17.123] if (muffled) [13:31:17.123] invokeRestart("muffleMessage") [13:31:17.123] } [13:31:17.123] else if (inherits(cond, "warning")) { [13:31:17.123] muffled <- grepl(pattern, "muffleWarning") [13:31:17.123] if (muffled) [13:31:17.123] invokeRestart("muffleWarning") [13:31:17.123] } [13:31:17.123] else if (inherits(cond, "condition")) { [13:31:17.123] if (!is.null(pattern)) { [13:31:17.123] computeRestarts <- base::computeRestarts [13:31:17.123] grepl <- base::grepl [13:31:17.123] restarts <- computeRestarts(cond) [13:31:17.123] for (restart in restarts) { [13:31:17.123] name <- restart$name [13:31:17.123] if (is.null(name)) [13:31:17.123] next [13:31:17.123] if (!grepl(pattern, name)) [13:31:17.123] next [13:31:17.123] invokeRestart(restart) [13:31:17.123] muffled <- TRUE [13:31:17.123] break [13:31:17.123] } [13:31:17.123] } [13:31:17.123] } [13:31:17.123] invisible(muffled) [13:31:17.123] } [13:31:17.123] muffleCondition(cond, pattern = "^muffle") [13:31:17.123] } [13:31:17.123] } [13:31:17.123] else { [13:31:17.123] if (TRUE) { [13:31:17.123] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.123] { [13:31:17.123] inherits <- base::inherits [13:31:17.123] invokeRestart <- base::invokeRestart [13:31:17.123] is.null <- base::is.null [13:31:17.123] muffled <- FALSE [13:31:17.123] if (inherits(cond, "message")) { [13:31:17.123] muffled <- grepl(pattern, "muffleMessage") [13:31:17.123] if (muffled) [13:31:17.123] invokeRestart("muffleMessage") [13:31:17.123] } [13:31:17.123] else if (inherits(cond, "warning")) { [13:31:17.123] muffled <- grepl(pattern, "muffleWarning") [13:31:17.123] if (muffled) [13:31:17.123] invokeRestart("muffleWarning") [13:31:17.123] } [13:31:17.123] else if (inherits(cond, "condition")) { [13:31:17.123] if (!is.null(pattern)) { [13:31:17.123] computeRestarts <- base::computeRestarts [13:31:17.123] grepl <- base::grepl [13:31:17.123] restarts <- computeRestarts(cond) [13:31:17.123] for (restart in restarts) { [13:31:17.123] name <- restart$name [13:31:17.123] if (is.null(name)) [13:31:17.123] next [13:31:17.123] if (!grepl(pattern, name)) [13:31:17.123] next [13:31:17.123] invokeRestart(restart) [13:31:17.123] muffled <- TRUE [13:31:17.123] break [13:31:17.123] } [13:31:17.123] } [13:31:17.123] } [13:31:17.123] invisible(muffled) [13:31:17.123] } [13:31:17.123] muffleCondition(cond, pattern = "^muffle") [13:31:17.123] } [13:31:17.123] } [13:31:17.123] } [13:31:17.123] })) [13:31:17.123] }, error = function(ex) { [13:31:17.123] base::structure(base::list(value = NULL, visible = NULL, [13:31:17.123] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.123] ...future.rng), started = ...future.startTime, [13:31:17.123] finished = Sys.time(), session_uuid = NA_character_, [13:31:17.123] version = "1.8"), class = "FutureResult") [13:31:17.123] }, finally = { [13:31:17.123] if (!identical(...future.workdir, getwd())) [13:31:17.123] setwd(...future.workdir) [13:31:17.123] { [13:31:17.123] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:17.123] ...future.oldOptions$nwarnings <- NULL [13:31:17.123] } [13:31:17.123] base::options(...future.oldOptions) [13:31:17.123] if (.Platform$OS.type == "windows") { [13:31:17.123] old_names <- names(...future.oldEnvVars) [13:31:17.123] envs <- base::Sys.getenv() [13:31:17.123] names <- names(envs) [13:31:17.123] common <- intersect(names, old_names) [13:31:17.123] added <- setdiff(names, old_names) [13:31:17.123] removed <- setdiff(old_names, names) [13:31:17.123] changed <- common[...future.oldEnvVars[common] != [13:31:17.123] envs[common]] [13:31:17.123] NAMES <- toupper(changed) [13:31:17.123] args <- list() [13:31:17.123] for (kk in seq_along(NAMES)) { [13:31:17.123] name <- changed[[kk]] [13:31:17.123] NAME <- NAMES[[kk]] [13:31:17.123] if (name != NAME && is.element(NAME, old_names)) [13:31:17.123] next [13:31:17.123] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.123] } [13:31:17.123] NAMES <- toupper(added) [13:31:17.123] for (kk in seq_along(NAMES)) { [13:31:17.123] name <- added[[kk]] [13:31:17.123] NAME <- NAMES[[kk]] [13:31:17.123] if (name != NAME && is.element(NAME, old_names)) [13:31:17.123] next [13:31:17.123] args[[name]] <- "" [13:31:17.123] } [13:31:17.123] NAMES <- toupper(removed) [13:31:17.123] for (kk in seq_along(NAMES)) { [13:31:17.123] name <- removed[[kk]] [13:31:17.123] NAME <- NAMES[[kk]] [13:31:17.123] if (name != NAME && is.element(NAME, old_names)) [13:31:17.123] next [13:31:17.123] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.123] } [13:31:17.123] if (length(args) > 0) [13:31:17.123] base::do.call(base::Sys.setenv, args = args) [13:31:17.123] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:17.123] } [13:31:17.123] else { [13:31:17.123] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:17.123] } [13:31:17.123] { [13:31:17.123] if (base::length(...future.futureOptionsAdded) > [13:31:17.123] 0L) { [13:31:17.123] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:17.123] base::names(opts) <- ...future.futureOptionsAdded [13:31:17.123] base::options(opts) [13:31:17.123] } [13:31:17.123] { [13:31:17.123] NULL [13:31:17.123] options(future.plan = NULL) [13:31:17.123] if (is.na(NA_character_)) [13:31:17.123] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.123] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:17.123] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:17.123] .init = FALSE) [13:31:17.123] } [13:31:17.123] } [13:31:17.123] } [13:31:17.123] }) [13:31:17.123] if (TRUE) { [13:31:17.123] base::sink(type = "output", split = FALSE) [13:31:17.123] if (TRUE) { [13:31:17.123] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:17.123] } [13:31:17.123] else { [13:31:17.123] ...future.result["stdout"] <- base::list(NULL) [13:31:17.123] } [13:31:17.123] base::close(...future.stdout) [13:31:17.123] ...future.stdout <- NULL [13:31:17.123] } [13:31:17.123] ...future.result$conditions <- ...future.conditions [13:31:17.123] ...future.result$finished <- base::Sys.time() [13:31:17.123] ...future.result [13:31:17.123] } [13:31:17.127] - Launch lazy future ... done [13:31:17.127] run() for 'MiraiFuture' ... done [13:31:17.128] Created future: [13:31:17.129] resolved() for 'MiraiFuture' ... [13:31:17.129] - state: 'running' [13:31:17.129] - run: TRUE [13:31:17.129] - result: 'NULL' [13:31:17.130] - resolved: FALSE [13:31:17.130] resolved() for 'MiraiFuture' ... done [13:31:17.128] MiraiFuture: [13:31:17.128] Label: 'future_lapply-1' [13:31:17.128] Expression: [13:31:17.128] { [13:31:17.128] do.call(function(...) { [13:31:17.128] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.128] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:17.128] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.128] on.exit(options(oopts), add = TRUE) [13:31:17.128] } [13:31:17.128] { [13:31:17.128] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:17.128] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.128] ...future.FUN(...future.X_jj, ...) [13:31:17.128] }) [13:31:17.128] } [13:31:17.128] }, args = future.call.arguments) [13:31:17.128] } [13:31:17.128] Lazy evaluation: FALSE [13:31:17.128] Asynchronous evaluation: TRUE [13:31:17.128] Local evaluation: TRUE [13:31:17.128] Environment: R_GlobalEnv [13:31:17.128] Capture standard output: TRUE [13:31:17.128] Capture condition classes: 'condition' (excluding 'nothing') [13:31:17.128] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:17.128] Packages: 1 packages ('listenv') [13:31:17.128] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:17.128] Resolved: FALSE [13:31:17.128] Value: [13:31:17.128] Conditions captured: [13:31:17.128] Early signaling: FALSE [13:31:17.128] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:17.128] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:17.130] Chunk #1 of 2 ... DONE [13:31:17.130] Chunk #2 of 2 ... [13:31:17.131] - Finding globals in 'X' for chunk #2 ... [13:31:17.131] getGlobalsAndPackages() ... [13:31:17.131] Searching for globals... [13:31:17.131] [13:31:17.132] Searching for globals ... DONE [13:31:17.132] - globals: [0] [13:31:17.132] getGlobalsAndPackages() ... DONE [13:31:17.132] + additional globals found: [n=0] [13:31:17.132] + additional namespaces needed: [n=0] [13:31:17.132] - Finding globals in 'X' for chunk #2 ... DONE [13:31:17.132] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:17.133] - seeds: [13:31:17.133] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.133] getGlobalsAndPackages() ... [13:31:17.133] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.133] Resolving globals: FALSE [13:31:17.133] Tweak future expression to call with '...' arguments ... [13:31:17.134] { [13:31:17.134] do.call(function(...) { [13:31:17.134] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.134] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:17.134] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.134] on.exit(options(oopts), add = TRUE) [13:31:17.134] } [13:31:17.134] { [13:31:17.134] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:17.134] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.134] ...future.FUN(...future.X_jj, ...) [13:31:17.134] }) [13:31:17.134] } [13:31:17.134] }, args = future.call.arguments) [13:31:17.134] } [13:31:17.134] Tweak future expression to call with '...' arguments ... DONE [13:31:17.135] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.135] - packages: [1] 'listenv' [13:31:17.135] getGlobalsAndPackages() ... DONE [13:31:17.135] run() for 'Future' ... [13:31:17.135] - state: 'created' [13:31:17.136] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:17.138] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:17.138] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:17.138] - Field: 'label' [13:31:17.138] - Field: 'local' [13:31:17.139] - Field: 'owner' [13:31:17.139] - Field: 'envir' [13:31:17.139] - Field: 'packages' [13:31:17.139] - Field: 'gc' [13:31:17.139] - Field: 'conditions' [13:31:17.140] - Field: 'expr' [13:31:17.140] - Field: 'uuid' [13:31:17.140] - Field: 'seed' [13:31:17.140] - Field: 'version' [13:31:17.140] - Field: 'result' [13:31:17.140] - Field: 'asynchronous' [13:31:17.141] - Field: 'calls' [13:31:17.141] - Field: 'globals' [13:31:17.141] - Field: 'stdout' [13:31:17.141] - Field: 'earlySignal' [13:31:17.141] - Field: 'lazy' [13:31:17.141] - Field: 'state' [13:31:17.142] - Field: '.cluster' [13:31:17.143] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:17.143] - Launch lazy future ... [13:31:17.143] Packages needed by the future expression (n = 1): 'listenv' [13:31:17.143] Packages needed by future strategies (n = 0): [13:31:17.144] { [13:31:17.144] { [13:31:17.144] { [13:31:17.144] ...future.startTime <- base::Sys.time() [13:31:17.144] { [13:31:17.144] { [13:31:17.144] { [13:31:17.144] { [13:31:17.144] base::local({ [13:31:17.144] has_future <- base::requireNamespace("future", [13:31:17.144] quietly = TRUE) [13:31:17.144] if (has_future) { [13:31:17.144] ns <- base::getNamespace("future") [13:31:17.144] version <- ns[[".package"]][["version"]] [13:31:17.144] if (is.null(version)) [13:31:17.144] version <- utils::packageVersion("future") [13:31:17.144] } [13:31:17.144] else { [13:31:17.144] version <- NULL [13:31:17.144] } [13:31:17.144] if (!has_future || version < "1.8.0") { [13:31:17.144] info <- base::c(r_version = base::gsub("R version ", [13:31:17.144] "", base::R.version$version.string), [13:31:17.144] platform = base::sprintf("%s (%s-bit)", [13:31:17.144] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:17.144] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:17.144] "release", "version")], collapse = " "), [13:31:17.144] hostname = base::Sys.info()[["nodename"]]) [13:31:17.144] info <- base::sprintf("%s: %s", base::names(info), [13:31:17.144] info) [13:31:17.144] info <- base::paste(info, collapse = "; ") [13:31:17.144] if (!has_future) { [13:31:17.144] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:17.144] info) [13:31:17.144] } [13:31:17.144] else { [13:31:17.144] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:17.144] info, version) [13:31:17.144] } [13:31:17.144] base::stop(msg) [13:31:17.144] } [13:31:17.144] }) [13:31:17.144] } [13:31:17.144] base::local({ [13:31:17.144] for (pkg in "listenv") { [13:31:17.144] base::loadNamespace(pkg) [13:31:17.144] base::library(pkg, character.only = TRUE) [13:31:17.144] } [13:31:17.144] }) [13:31:17.144] } [13:31:17.144] ...future.strategy.old <- future::plan("list") [13:31:17.144] options(future.plan = NULL) [13:31:17.144] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.144] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:17.144] } [13:31:17.144] ...future.workdir <- getwd() [13:31:17.144] } [13:31:17.144] ...future.oldOptions <- base::as.list(base::.Options) [13:31:17.144] ...future.oldEnvVars <- base::Sys.getenv() [13:31:17.144] } [13:31:17.144] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:17.144] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:17.144] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:17.144] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:17.144] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:17.144] future.stdout.windows.reencode = NULL, width = 80L) [13:31:17.144] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:17.144] base::names(...future.oldOptions)) [13:31:17.144] } [13:31:17.144] if (FALSE) { [13:31:17.144] } [13:31:17.144] else { [13:31:17.144] if (TRUE) { [13:31:17.144] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:17.144] open = "w") [13:31:17.144] } [13:31:17.144] else { [13:31:17.144] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:17.144] windows = "NUL", "/dev/null"), open = "w") [13:31:17.144] } [13:31:17.144] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:17.144] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:17.144] base::sink(type = "output", split = FALSE) [13:31:17.144] base::close(...future.stdout) [13:31:17.144] }, add = TRUE) [13:31:17.144] } [13:31:17.144] ...future.frame <- base::sys.nframe() [13:31:17.144] ...future.conditions <- base::list() [13:31:17.144] ...future.rng <- base::globalenv()$.Random.seed [13:31:17.144] if (FALSE) { [13:31:17.144] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:17.144] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:17.144] } [13:31:17.144] ...future.result <- base::tryCatch({ [13:31:17.144] base::withCallingHandlers({ [13:31:17.144] ...future.value <- base::withVisible(base::local({ [13:31:17.144] do.call(function(...) { [13:31:17.144] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.144] if (!identical(...future.globals.maxSize.org, [13:31:17.144] ...future.globals.maxSize)) { [13:31:17.144] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.144] on.exit(options(oopts), add = TRUE) [13:31:17.144] } [13:31:17.144] { [13:31:17.144] lapply(seq_along(...future.elements_ii), [13:31:17.144] FUN = function(jj) { [13:31:17.144] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.144] ...future.FUN(...future.X_jj, ...) [13:31:17.144] }) [13:31:17.144] } [13:31:17.144] }, args = future.call.arguments) [13:31:17.144] })) [13:31:17.144] future::FutureResult(value = ...future.value$value, [13:31:17.144] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.144] ...future.rng), globalenv = if (FALSE) [13:31:17.144] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:17.144] ...future.globalenv.names)) [13:31:17.144] else NULL, started = ...future.startTime, version = "1.8") [13:31:17.144] }, condition = base::local({ [13:31:17.144] c <- base::c [13:31:17.144] inherits <- base::inherits [13:31:17.144] invokeRestart <- base::invokeRestart [13:31:17.144] length <- base::length [13:31:17.144] list <- base::list [13:31:17.144] seq.int <- base::seq.int [13:31:17.144] signalCondition <- base::signalCondition [13:31:17.144] sys.calls <- base::sys.calls [13:31:17.144] `[[` <- base::`[[` [13:31:17.144] `+` <- base::`+` [13:31:17.144] `<<-` <- base::`<<-` [13:31:17.144] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:17.144] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:17.144] 3L)] [13:31:17.144] } [13:31:17.144] function(cond) { [13:31:17.144] is_error <- inherits(cond, "error") [13:31:17.144] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:17.144] NULL) [13:31:17.144] if (is_error) { [13:31:17.144] sessionInformation <- function() { [13:31:17.144] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:17.144] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:17.144] search = base::search(), system = base::Sys.info()) [13:31:17.144] } [13:31:17.144] ...future.conditions[[length(...future.conditions) + [13:31:17.144] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:17.144] cond$call), session = sessionInformation(), [13:31:17.144] timestamp = base::Sys.time(), signaled = 0L) [13:31:17.144] signalCondition(cond) [13:31:17.144] } [13:31:17.144] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:17.144] signal <- FALSE && inherits(cond, character(0)) [13:31:17.144] ...future.conditions[[length(...future.conditions) + [13:31:17.144] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:17.144] if (FALSE && !signal) { [13:31:17.144] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.144] { [13:31:17.144] inherits <- base::inherits [13:31:17.144] invokeRestart <- base::invokeRestart [13:31:17.144] is.null <- base::is.null [13:31:17.144] muffled <- FALSE [13:31:17.144] if (inherits(cond, "message")) { [13:31:17.144] muffled <- grepl(pattern, "muffleMessage") [13:31:17.144] if (muffled) [13:31:17.144] invokeRestart("muffleMessage") [13:31:17.144] } [13:31:17.144] else if (inherits(cond, "warning")) { [13:31:17.144] muffled <- grepl(pattern, "muffleWarning") [13:31:17.144] if (muffled) [13:31:17.144] invokeRestart("muffleWarning") [13:31:17.144] } [13:31:17.144] else if (inherits(cond, "condition")) { [13:31:17.144] if (!is.null(pattern)) { [13:31:17.144] computeRestarts <- base::computeRestarts [13:31:17.144] grepl <- base::grepl [13:31:17.144] restarts <- computeRestarts(cond) [13:31:17.144] for (restart in restarts) { [13:31:17.144] name <- restart$name [13:31:17.144] if (is.null(name)) [13:31:17.144] next [13:31:17.144] if (!grepl(pattern, name)) [13:31:17.144] next [13:31:17.144] invokeRestart(restart) [13:31:17.144] muffled <- TRUE [13:31:17.144] break [13:31:17.144] } [13:31:17.144] } [13:31:17.144] } [13:31:17.144] invisible(muffled) [13:31:17.144] } [13:31:17.144] muffleCondition(cond, pattern = "^muffle") [13:31:17.144] } [13:31:17.144] } [13:31:17.144] else { [13:31:17.144] if (TRUE) { [13:31:17.144] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.144] { [13:31:17.144] inherits <- base::inherits [13:31:17.144] invokeRestart <- base::invokeRestart [13:31:17.144] is.null <- base::is.null [13:31:17.144] muffled <- FALSE [13:31:17.144] if (inherits(cond, "message")) { [13:31:17.144] muffled <- grepl(pattern, "muffleMessage") [13:31:17.144] if (muffled) [13:31:17.144] invokeRestart("muffleMessage") [13:31:17.144] } [13:31:17.144] else if (inherits(cond, "warning")) { [13:31:17.144] muffled <- grepl(pattern, "muffleWarning") [13:31:17.144] if (muffled) [13:31:17.144] invokeRestart("muffleWarning") [13:31:17.144] } [13:31:17.144] else if (inherits(cond, "condition")) { [13:31:17.144] if (!is.null(pattern)) { [13:31:17.144] computeRestarts <- base::computeRestarts [13:31:17.144] grepl <- base::grepl [13:31:17.144] restarts <- computeRestarts(cond) [13:31:17.144] for (restart in restarts) { [13:31:17.144] name <- restart$name [13:31:17.144] if (is.null(name)) [13:31:17.144] next [13:31:17.144] if (!grepl(pattern, name)) [13:31:17.144] next [13:31:17.144] invokeRestart(restart) [13:31:17.144] muffled <- TRUE [13:31:17.144] break [13:31:17.144] } [13:31:17.144] } [13:31:17.144] } [13:31:17.144] invisible(muffled) [13:31:17.144] } [13:31:17.144] muffleCondition(cond, pattern = "^muffle") [13:31:17.144] } [13:31:17.144] } [13:31:17.144] } [13:31:17.144] })) [13:31:17.144] }, error = function(ex) { [13:31:17.144] base::structure(base::list(value = NULL, visible = NULL, [13:31:17.144] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.144] ...future.rng), started = ...future.startTime, [13:31:17.144] finished = Sys.time(), session_uuid = NA_character_, [13:31:17.144] version = "1.8"), class = "FutureResult") [13:31:17.144] }, finally = { [13:31:17.144] if (!identical(...future.workdir, getwd())) [13:31:17.144] setwd(...future.workdir) [13:31:17.144] { [13:31:17.144] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:17.144] ...future.oldOptions$nwarnings <- NULL [13:31:17.144] } [13:31:17.144] base::options(...future.oldOptions) [13:31:17.144] if (.Platform$OS.type == "windows") { [13:31:17.144] old_names <- names(...future.oldEnvVars) [13:31:17.144] envs <- base::Sys.getenv() [13:31:17.144] names <- names(envs) [13:31:17.144] common <- intersect(names, old_names) [13:31:17.144] added <- setdiff(names, old_names) [13:31:17.144] removed <- setdiff(old_names, names) [13:31:17.144] changed <- common[...future.oldEnvVars[common] != [13:31:17.144] envs[common]] [13:31:17.144] NAMES <- toupper(changed) [13:31:17.144] args <- list() [13:31:17.144] for (kk in seq_along(NAMES)) { [13:31:17.144] name <- changed[[kk]] [13:31:17.144] NAME <- NAMES[[kk]] [13:31:17.144] if (name != NAME && is.element(NAME, old_names)) [13:31:17.144] next [13:31:17.144] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.144] } [13:31:17.144] NAMES <- toupper(added) [13:31:17.144] for (kk in seq_along(NAMES)) { [13:31:17.144] name <- added[[kk]] [13:31:17.144] NAME <- NAMES[[kk]] [13:31:17.144] if (name != NAME && is.element(NAME, old_names)) [13:31:17.144] next [13:31:17.144] args[[name]] <- "" [13:31:17.144] } [13:31:17.144] NAMES <- toupper(removed) [13:31:17.144] for (kk in seq_along(NAMES)) { [13:31:17.144] name <- removed[[kk]] [13:31:17.144] NAME <- NAMES[[kk]] [13:31:17.144] if (name != NAME && is.element(NAME, old_names)) [13:31:17.144] next [13:31:17.144] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.144] } [13:31:17.144] if (length(args) > 0) [13:31:17.144] base::do.call(base::Sys.setenv, args = args) [13:31:17.144] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:17.144] } [13:31:17.144] else { [13:31:17.144] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:17.144] } [13:31:17.144] { [13:31:17.144] if (base::length(...future.futureOptionsAdded) > [13:31:17.144] 0L) { [13:31:17.144] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:17.144] base::names(opts) <- ...future.futureOptionsAdded [13:31:17.144] base::options(opts) [13:31:17.144] } [13:31:17.144] { [13:31:17.144] NULL [13:31:17.144] options(future.plan = NULL) [13:31:17.144] if (is.na(NA_character_)) [13:31:17.144] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.144] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:17.144] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:17.144] .init = FALSE) [13:31:17.144] } [13:31:17.144] } [13:31:17.144] } [13:31:17.144] }) [13:31:17.144] if (TRUE) { [13:31:17.144] base::sink(type = "output", split = FALSE) [13:31:17.144] if (TRUE) { [13:31:17.144] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:17.144] } [13:31:17.144] else { [13:31:17.144] ...future.result["stdout"] <- base::list(NULL) [13:31:17.144] } [13:31:17.144] base::close(...future.stdout) [13:31:17.144] ...future.stdout <- NULL [13:31:17.144] } [13:31:17.144] ...future.result$conditions <- ...future.conditions [13:31:17.144] ...future.result$finished <- base::Sys.time() [13:31:17.144] ...future.result [13:31:17.144] } [13:31:17.148] - Launch lazy future ... done [13:31:17.148] run() for 'MiraiFuture' ... done [13:31:17.148] Created future: [13:31:17.149] resolved() for 'MiraiFuture' ... [13:31:17.150] - state: 'running' [13:31:17.150] - run: TRUE [13:31:17.150] - result: 'NULL' [13:31:17.150] - resolved: FALSE [13:31:17.150] resolved() for 'MiraiFuture' ... done [13:31:17.148] MiraiFuture: [13:31:17.148] Label: 'future_lapply-2' [13:31:17.148] Expression: [13:31:17.148] { [13:31:17.148] do.call(function(...) { [13:31:17.148] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.148] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:17.148] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.148] on.exit(options(oopts), add = TRUE) [13:31:17.148] } [13:31:17.148] { [13:31:17.148] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:17.148] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.148] ...future.FUN(...future.X_jj, ...) [13:31:17.148] }) [13:31:17.148] } [13:31:17.148] }, args = future.call.arguments) [13:31:17.148] } [13:31:17.148] Lazy evaluation: FALSE [13:31:17.148] Asynchronous evaluation: TRUE [13:31:17.148] Local evaluation: TRUE [13:31:17.148] Environment: R_GlobalEnv [13:31:17.148] Capture standard output: TRUE [13:31:17.148] Capture condition classes: 'condition' (excluding 'nothing') [13:31:17.148] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:17.148] Packages: 1 packages ('listenv') [13:31:17.148] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:17.148] Resolved: FALSE [13:31:17.148] Value: [13:31:17.148] Conditions captured: [13:31:17.148] Early signaling: FALSE [13:31:17.148] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:17.148] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:17.151] Chunk #2 of 2 ... DONE [13:31:17.151] Launching 2 futures (chunks) ... DONE [13:31:17.151] Resolving 2 futures (chunks) ... [13:31:17.151] resolve() on list ... [13:31:17.151] recursive: 0 [13:31:17.152] length: 2 [13:31:17.152] [13:31:17.152] resolved() for 'MiraiFuture' ... [13:31:17.152] - state: 'running' [13:31:17.152] - run: TRUE [13:31:17.152] - result: 'NULL' [13:31:17.153] - resolved: FALSE [13:31:17.153] resolved() for 'MiraiFuture' ... done [13:31:17.153] Future #1 [13:31:17.153] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:17.153] - nx: 2 [13:31:17.153] - relay: TRUE [13:31:17.154] - stdout: TRUE [13:31:17.154] - signal: TRUE [13:31:17.154] - resignal: FALSE [13:31:17.154] - force: TRUE [13:31:17.154] - relayed: [n=2] FALSE, FALSE [13:31:17.154] - queued futures: [n=2] FALSE, FALSE [13:31:17.155] - until=1 [13:31:17.155] - relaying element #1 [13:31:17.155] - relayed: [n=2] TRUE, FALSE [13:31:17.155] - queued futures: [n=2] TRUE, FALSE [13:31:17.155] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:17.155] length: 1 (resolved future 1) [13:31:17.156] resolved() for 'MiraiFuture' ... [13:31:17.156] - state: 'running' [13:31:17.156] - run: TRUE [13:31:17.156] - result: 'NULL' [13:31:17.156] - resolved: FALSE [13:31:17.156] resolved() for 'MiraiFuture' ... done [13:31:17.157] Future #2 [13:31:17.157] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:17.157] - nx: 2 [13:31:17.157] - relay: TRUE [13:31:17.157] - stdout: TRUE [13:31:17.158] - signal: TRUE [13:31:17.158] - resignal: FALSE [13:31:17.158] - force: TRUE [13:31:17.158] - relayed: [n=2] TRUE, FALSE [13:31:17.158] - queued futures: [n=2] TRUE, FALSE [13:31:17.158] - until=2 [13:31:17.158] - relaying element #2 [13:31:17.159] - relayed: [n=2] TRUE, TRUE [13:31:17.159] - queued futures: [n=2] TRUE, TRUE [13:31:17.159] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:17.159] length: 0 (resolved future 2) [13:31:17.159] Relaying remaining futures [13:31:17.159] signalConditionsASAP(NULL, pos=0) ... [13:31:17.160] - nx: 2 [13:31:17.160] - relay: TRUE [13:31:17.160] - stdout: TRUE [13:31:17.160] - signal: TRUE [13:31:17.160] - resignal: FALSE [13:31:17.160] - force: TRUE [13:31:17.160] - relayed: [n=2] TRUE, TRUE [13:31:17.161] - queued futures: [n=2] TRUE, TRUE - flush all [13:31:17.161] - relayed: [n=2] TRUE, TRUE [13:31:17.161] - queued futures: [n=2] TRUE, TRUE [13:31:17.161] signalConditionsASAP(NULL, pos=0) ... done [13:31:17.161] resolve() on list ... DONE [13:31:17.162] - Number of value chunks collected: 2 [13:31:17.162] Resolving 2 futures (chunks) ... DONE [13:31:17.162] Reducing values from 2 chunks ... [13:31:17.162] - Number of values collected after concatenation: 2 [13:31:17.162] - Number of values expected: 2 [13:31:17.162] Reducing values from 2 chunks ... DONE [13:31:17.163] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN, ...) for large length(x) ... [13:31:17.165] future_lapply() ... [13:31:17.221] Number of chunks: 2 [13:31:17.222] getGlobalsAndPackagesXApply() ... [13:31:17.222] - future.globals: TRUE [13:31:17.222] getGlobalsAndPackages() ... [13:31:17.222] Searching for globals... [13:31:17.224] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [13:31:17.224] Searching for globals ... DONE [13:31:17.224] Resolving globals: FALSE [13:31:17.225] The total size of the 2 globals is 784 bytes (784 bytes) [13:31:17.226] The total size of the 2 globals exported for future expression ('FUN()') is 784 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'FUN' (728 bytes of class 'function') and 'a' (56 bytes of class 'numeric') [13:31:17.232] - globals: [2] 'FUN', 'a' [13:31:17.232] [13:31:17.232] getGlobalsAndPackages() ... DONE [13:31:17.232] - globals found/used: [n=2] 'FUN', 'a' [13:31:17.233] - needed namespaces: [n=0] [13:31:17.233] Finding globals ... DONE [13:31:17.233] - use_args: TRUE [13:31:17.233] - Getting '...' globals ... [13:31:17.234] resolve() on list ... [13:31:17.234] recursive: 0 [13:31:17.234] length: 1 [13:31:17.234] elements: '...' [13:31:17.234] length: 0 (resolved future 1) [13:31:17.235] resolve() on list ... DONE [13:31:17.235] - '...' content: [n=0] [13:31:17.235] List of 1 [13:31:17.235] $ ...: list() [13:31:17.235] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:17.235] - attr(*, "where")=List of 1 [13:31:17.235] ..$ ...: [13:31:17.235] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:17.235] - attr(*, "resolved")= logi TRUE [13:31:17.235] - attr(*, "total_size")= num NA [13:31:17.238] - Getting '...' globals ... DONE [13:31:17.238] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [13:31:17.239] List of 3 [13:31:17.239] $ ...future.FUN:function (z) [13:31:17.239] $ a : num 3.14 [13:31:17.239] $ ... : list() [13:31:17.239] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:17.239] - attr(*, "where")=List of 3 [13:31:17.239] ..$ ...future.FUN: [13:31:17.239] ..$ a : [13:31:17.239] ..$ ... : [13:31:17.239] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:17.239] - attr(*, "resolved")= logi FALSE [13:31:17.239] - attr(*, "total_size")= num 784 [13:31:17.243] Packages to be attached in all futures: [n=0] [13:31:17.243] getGlobalsAndPackagesXApply() ... DONE [13:31:17.243] Number of futures (= number of chunks): 2 [13:31:17.243] Launching 2 futures (chunks) ... [13:31:17.243] Chunk #1 of 2 ... [13:31:17.376] - Finding globals in 'X' for chunk #1 ... [13:31:17.377] getGlobalsAndPackages() ... [13:31:17.377] Searching for globals... [13:31:17.744] [13:31:17.745] Searching for globals ... DONE [13:31:17.745] - globals: [0] [13:31:17.745] getGlobalsAndPackages() ... DONE [13:31:17.745] + additional globals found: [n=0] [13:31:17.745] + additional namespaces needed: [n=0] [13:31:17.746] - Finding globals in 'X' for chunk #1 ... DONE [13:31:17.746] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:17.746] - seeds: [13:31:17.746] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.746] getGlobalsAndPackages() ... [13:31:17.746] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.747] Resolving globals: FALSE [13:31:17.747] Tweak future expression to call with '...' arguments ... [13:31:17.747] { [13:31:17.747] do.call(function(...) { [13:31:17.747] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.747] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:17.747] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.747] on.exit(options(oopts), add = TRUE) [13:31:17.747] } [13:31:17.747] { [13:31:17.747] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:17.747] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.747] ...future.FUN(...future.X_jj, ...) [13:31:17.747] }) [13:31:17.747] } [13:31:17.747] }, args = future.call.arguments) [13:31:17.747] } [13:31:17.748] Tweak future expression to call with '...' arguments ... DONE [13:31:17.748] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:17.748] [13:31:17.749] getGlobalsAndPackages() ... DONE [13:31:17.749] run() for 'Future' ... [13:31:17.749] - state: 'created' [13:31:17.749] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:17.752] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:17.752] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:17.752] - Field: 'label' [13:31:17.753] - Field: 'local' [13:31:17.753] - Field: 'owner' [13:31:17.753] - Field: 'envir' [13:31:17.753] - Field: 'packages' [13:31:17.753] - Field: 'gc' [13:31:17.753] - Field: 'conditions' [13:31:17.754] - Field: 'expr' [13:31:17.754] - Field: 'uuid' [13:31:17.754] - Field: 'seed' [13:31:17.754] - Field: 'version' [13:31:17.754] - Field: 'result' [13:31:17.754] - Field: 'asynchronous' [13:31:17.755] - Field: 'calls' [13:31:17.755] - Field: 'globals' [13:31:17.755] - Field: 'stdout' [13:31:17.755] - Field: 'earlySignal' [13:31:17.755] - Field: 'lazy' [13:31:17.756] - Field: 'state' [13:31:17.756] - Field: '.cluster' [13:31:17.756] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:17.756] - Launch lazy future ... [13:31:17.756] Packages needed by the future expression (n = 0): [13:31:17.756] Packages needed by future strategies (n = 0): [13:31:17.757] { [13:31:17.757] { [13:31:17.757] { [13:31:17.757] ...future.startTime <- base::Sys.time() [13:31:17.757] { [13:31:17.757] { [13:31:17.757] { [13:31:17.757] base::local({ [13:31:17.757] has_future <- base::requireNamespace("future", [13:31:17.757] quietly = TRUE) [13:31:17.757] if (has_future) { [13:31:17.757] ns <- base::getNamespace("future") [13:31:17.757] version <- ns[[".package"]][["version"]] [13:31:17.757] if (is.null(version)) [13:31:17.757] version <- utils::packageVersion("future") [13:31:17.757] } [13:31:17.757] else { [13:31:17.757] version <- NULL [13:31:17.757] } [13:31:17.757] if (!has_future || version < "1.8.0") { [13:31:17.757] info <- base::c(r_version = base::gsub("R version ", [13:31:17.757] "", base::R.version$version.string), [13:31:17.757] platform = base::sprintf("%s (%s-bit)", [13:31:17.757] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:17.757] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:17.757] "release", "version")], collapse = " "), [13:31:17.757] hostname = base::Sys.info()[["nodename"]]) [13:31:17.757] info <- base::sprintf("%s: %s", base::names(info), [13:31:17.757] info) [13:31:17.757] info <- base::paste(info, collapse = "; ") [13:31:17.757] if (!has_future) { [13:31:17.757] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:17.757] info) [13:31:17.757] } [13:31:17.757] else { [13:31:17.757] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:17.757] info, version) [13:31:17.757] } [13:31:17.757] base::stop(msg) [13:31:17.757] } [13:31:17.757] }) [13:31:17.757] } [13:31:17.757] ...future.strategy.old <- future::plan("list") [13:31:17.757] options(future.plan = NULL) [13:31:17.757] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.757] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:17.757] } [13:31:17.757] ...future.workdir <- getwd() [13:31:17.757] } [13:31:17.757] ...future.oldOptions <- base::as.list(base::.Options) [13:31:17.757] ...future.oldEnvVars <- base::Sys.getenv() [13:31:17.757] } [13:31:17.757] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:17.757] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:17.757] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:17.757] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:17.757] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:17.757] future.stdout.windows.reencode = NULL, width = 80L) [13:31:17.757] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:17.757] base::names(...future.oldOptions)) [13:31:17.757] } [13:31:17.757] if (FALSE) { [13:31:17.757] } [13:31:17.757] else { [13:31:17.757] if (TRUE) { [13:31:17.757] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:17.757] open = "w") [13:31:17.757] } [13:31:17.757] else { [13:31:17.757] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:17.757] windows = "NUL", "/dev/null"), open = "w") [13:31:17.757] } [13:31:17.757] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:17.757] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:17.757] base::sink(type = "output", split = FALSE) [13:31:17.757] base::close(...future.stdout) [13:31:17.757] }, add = TRUE) [13:31:17.757] } [13:31:17.757] ...future.frame <- base::sys.nframe() [13:31:17.757] ...future.conditions <- base::list() [13:31:17.757] ...future.rng <- base::globalenv()$.Random.seed [13:31:17.757] if (FALSE) { [13:31:17.757] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:17.757] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:17.757] } [13:31:17.757] ...future.result <- base::tryCatch({ [13:31:17.757] base::withCallingHandlers({ [13:31:17.757] ...future.value <- base::withVisible(base::local({ [13:31:17.757] do.call(function(...) { [13:31:17.757] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.757] if (!identical(...future.globals.maxSize.org, [13:31:17.757] ...future.globals.maxSize)) { [13:31:17.757] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.757] on.exit(options(oopts), add = TRUE) [13:31:17.757] } [13:31:17.757] { [13:31:17.757] lapply(seq_along(...future.elements_ii), [13:31:17.757] FUN = function(jj) { [13:31:17.757] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.757] ...future.FUN(...future.X_jj, ...) [13:31:17.757] }) [13:31:17.757] } [13:31:17.757] }, args = future.call.arguments) [13:31:17.757] })) [13:31:17.757] future::FutureResult(value = ...future.value$value, [13:31:17.757] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.757] ...future.rng), globalenv = if (FALSE) [13:31:17.757] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:17.757] ...future.globalenv.names)) [13:31:17.757] else NULL, started = ...future.startTime, version = "1.8") [13:31:17.757] }, condition = base::local({ [13:31:17.757] c <- base::c [13:31:17.757] inherits <- base::inherits [13:31:17.757] invokeRestart <- base::invokeRestart [13:31:17.757] length <- base::length [13:31:17.757] list <- base::list [13:31:17.757] seq.int <- base::seq.int [13:31:17.757] signalCondition <- base::signalCondition [13:31:17.757] sys.calls <- base::sys.calls [13:31:17.757] `[[` <- base::`[[` [13:31:17.757] `+` <- base::`+` [13:31:17.757] `<<-` <- base::`<<-` [13:31:17.757] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:17.757] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:17.757] 3L)] [13:31:17.757] } [13:31:17.757] function(cond) { [13:31:17.757] is_error <- inherits(cond, "error") [13:31:17.757] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:17.757] NULL) [13:31:17.757] if (is_error) { [13:31:17.757] sessionInformation <- function() { [13:31:17.757] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:17.757] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:17.757] search = base::search(), system = base::Sys.info()) [13:31:17.757] } [13:31:17.757] ...future.conditions[[length(...future.conditions) + [13:31:17.757] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:17.757] cond$call), session = sessionInformation(), [13:31:17.757] timestamp = base::Sys.time(), signaled = 0L) [13:31:17.757] signalCondition(cond) [13:31:17.757] } [13:31:17.757] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:17.757] signal <- FALSE && inherits(cond, character(0)) [13:31:17.757] ...future.conditions[[length(...future.conditions) + [13:31:17.757] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:17.757] if (FALSE && !signal) { [13:31:17.757] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.757] { [13:31:17.757] inherits <- base::inherits [13:31:17.757] invokeRestart <- base::invokeRestart [13:31:17.757] is.null <- base::is.null [13:31:17.757] muffled <- FALSE [13:31:17.757] if (inherits(cond, "message")) { [13:31:17.757] muffled <- grepl(pattern, "muffleMessage") [13:31:17.757] if (muffled) [13:31:17.757] invokeRestart("muffleMessage") [13:31:17.757] } [13:31:17.757] else if (inherits(cond, "warning")) { [13:31:17.757] muffled <- grepl(pattern, "muffleWarning") [13:31:17.757] if (muffled) [13:31:17.757] invokeRestart("muffleWarning") [13:31:17.757] } [13:31:17.757] else if (inherits(cond, "condition")) { [13:31:17.757] if (!is.null(pattern)) { [13:31:17.757] computeRestarts <- base::computeRestarts [13:31:17.757] grepl <- base::grepl [13:31:17.757] restarts <- computeRestarts(cond) [13:31:17.757] for (restart in restarts) { [13:31:17.757] name <- restart$name [13:31:17.757] if (is.null(name)) [13:31:17.757] next [13:31:17.757] if (!grepl(pattern, name)) [13:31:17.757] next [13:31:17.757] invokeRestart(restart) [13:31:17.757] muffled <- TRUE [13:31:17.757] break [13:31:17.757] } [13:31:17.757] } [13:31:17.757] } [13:31:17.757] invisible(muffled) [13:31:17.757] } [13:31:17.757] muffleCondition(cond, pattern = "^muffle") [13:31:17.757] } [13:31:17.757] } [13:31:17.757] else { [13:31:17.757] if (TRUE) { [13:31:17.757] muffleCondition <- function (cond, pattern = "^muffle") [13:31:17.757] { [13:31:17.757] inherits <- base::inherits [13:31:17.757] invokeRestart <- base::invokeRestart [13:31:17.757] is.null <- base::is.null [13:31:17.757] muffled <- FALSE [13:31:17.757] if (inherits(cond, "message")) { [13:31:17.757] muffled <- grepl(pattern, "muffleMessage") [13:31:17.757] if (muffled) [13:31:17.757] invokeRestart("muffleMessage") [13:31:17.757] } [13:31:17.757] else if (inherits(cond, "warning")) { [13:31:17.757] muffled <- grepl(pattern, "muffleWarning") [13:31:17.757] if (muffled) [13:31:17.757] invokeRestart("muffleWarning") [13:31:17.757] } [13:31:17.757] else if (inherits(cond, "condition")) { [13:31:17.757] if (!is.null(pattern)) { [13:31:17.757] computeRestarts <- base::computeRestarts [13:31:17.757] grepl <- base::grepl [13:31:17.757] restarts <- computeRestarts(cond) [13:31:17.757] for (restart in restarts) { [13:31:17.757] name <- restart$name [13:31:17.757] if (is.null(name)) [13:31:17.757] next [13:31:17.757] if (!grepl(pattern, name)) [13:31:17.757] next [13:31:17.757] invokeRestart(restart) [13:31:17.757] muffled <- TRUE [13:31:17.757] break [13:31:17.757] } [13:31:17.757] } [13:31:17.757] } [13:31:17.757] invisible(muffled) [13:31:17.757] } [13:31:17.757] muffleCondition(cond, pattern = "^muffle") [13:31:17.757] } [13:31:17.757] } [13:31:17.757] } [13:31:17.757] })) [13:31:17.757] }, error = function(ex) { [13:31:17.757] base::structure(base::list(value = NULL, visible = NULL, [13:31:17.757] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:17.757] ...future.rng), started = ...future.startTime, [13:31:17.757] finished = Sys.time(), session_uuid = NA_character_, [13:31:17.757] version = "1.8"), class = "FutureResult") [13:31:17.757] }, finally = { [13:31:17.757] if (!identical(...future.workdir, getwd())) [13:31:17.757] setwd(...future.workdir) [13:31:17.757] { [13:31:17.757] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:17.757] ...future.oldOptions$nwarnings <- NULL [13:31:17.757] } [13:31:17.757] base::options(...future.oldOptions) [13:31:17.757] if (.Platform$OS.type == "windows") { [13:31:17.757] old_names <- names(...future.oldEnvVars) [13:31:17.757] envs <- base::Sys.getenv() [13:31:17.757] names <- names(envs) [13:31:17.757] common <- intersect(names, old_names) [13:31:17.757] added <- setdiff(names, old_names) [13:31:17.757] removed <- setdiff(old_names, names) [13:31:17.757] changed <- common[...future.oldEnvVars[common] != [13:31:17.757] envs[common]] [13:31:17.757] NAMES <- toupper(changed) [13:31:17.757] args <- list() [13:31:17.757] for (kk in seq_along(NAMES)) { [13:31:17.757] name <- changed[[kk]] [13:31:17.757] NAME <- NAMES[[kk]] [13:31:17.757] if (name != NAME && is.element(NAME, old_names)) [13:31:17.757] next [13:31:17.757] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.757] } [13:31:17.757] NAMES <- toupper(added) [13:31:17.757] for (kk in seq_along(NAMES)) { [13:31:17.757] name <- added[[kk]] [13:31:17.757] NAME <- NAMES[[kk]] [13:31:17.757] if (name != NAME && is.element(NAME, old_names)) [13:31:17.757] next [13:31:17.757] args[[name]] <- "" [13:31:17.757] } [13:31:17.757] NAMES <- toupper(removed) [13:31:17.757] for (kk in seq_along(NAMES)) { [13:31:17.757] name <- removed[[kk]] [13:31:17.757] NAME <- NAMES[[kk]] [13:31:17.757] if (name != NAME && is.element(NAME, old_names)) [13:31:17.757] next [13:31:17.757] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:17.757] } [13:31:17.757] if (length(args) > 0) [13:31:17.757] base::do.call(base::Sys.setenv, args = args) [13:31:17.757] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:17.757] } [13:31:17.757] else { [13:31:17.757] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:17.757] } [13:31:17.757] { [13:31:17.757] if (base::length(...future.futureOptionsAdded) > [13:31:17.757] 0L) { [13:31:17.757] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:17.757] base::names(opts) <- ...future.futureOptionsAdded [13:31:17.757] base::options(opts) [13:31:17.757] } [13:31:17.757] { [13:31:17.757] NULL [13:31:17.757] options(future.plan = NULL) [13:31:17.757] if (is.na(NA_character_)) [13:31:17.757] Sys.unsetenv("R_FUTURE_PLAN") [13:31:17.757] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:17.757] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:17.757] .init = FALSE) [13:31:17.757] } [13:31:17.757] } [13:31:17.757] } [13:31:17.757] }) [13:31:17.757] if (TRUE) { [13:31:17.757] base::sink(type = "output", split = FALSE) [13:31:17.757] if (TRUE) { [13:31:17.757] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:17.757] } [13:31:17.757] else { [13:31:17.757] ...future.result["stdout"] <- base::list(NULL) [13:31:17.757] } [13:31:17.757] base::close(...future.stdout) [13:31:17.757] ...future.stdout <- NULL [13:31:17.757] } [13:31:17.757] ...future.result$conditions <- ...future.conditions [13:31:17.757] ...future.result$finished <- base::Sys.time() [13:31:17.757] ...future.result [13:31:17.757] } [13:31:17.792] - Launch lazy future ... done [13:31:17.792] run() for 'MiraiFuture' ... done [13:31:17.793] Created future: [13:31:20.258] resolved() for 'MiraiFuture' ... [13:31:20.258] - state: 'running' [13:31:20.259] - run: TRUE [13:31:20.259] - result: 'NULL' [13:31:20.259] - resolved: FALSE [13:31:20.259] resolved() for 'MiraiFuture' ... done [13:31:17.793] MiraiFuture: [13:31:17.793] Label: 'future_lapply-1' [13:31:17.793] Expression: [13:31:17.793] { [13:31:17.793] do.call(function(...) { [13:31:17.793] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:17.793] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:17.793] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:17.793] on.exit(options(oopts), add = TRUE) [13:31:17.793] } [13:31:17.793] { [13:31:17.793] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:17.793] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:17.793] ...future.FUN(...future.X_jj, ...) [13:31:17.793] }) [13:31:17.793] } [13:31:17.793] }, args = future.call.arguments) [13:31:17.793] } [13:31:17.793] Lazy evaluation: FALSE [13:31:17.793] Asynchronous evaluation: TRUE [13:31:17.793] Local evaluation: TRUE [13:31:17.793] Environment: R_GlobalEnv [13:31:17.793] Capture standard output: TRUE [13:31:17.793] Capture condition classes: 'condition' (excluding 'nothing') [13:31:17.793] Globals: 6 objects totaling 26.70 MiB (function '...future.FUN' of 728 bytes, numeric 'a' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 26.70 MiB, NULL '...future.seeds_ii' of 0 bytes, ...) [13:31:17.793] Packages: [13:31:17.793] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:17.793] Resolved: TRUE [13:31:17.793] Value: [13:31:17.793] Conditions captured: [13:31:17.793] Early signaling: FALSE [13:31:17.793] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:17.793] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.280] Chunk #1 of 2 ... DONE [13:31:20.280] Chunk #2 of 2 ... [13:31:20.468] - Finding globals in 'X' for chunk #2 ... [13:31:20.468] getGlobalsAndPackages() ... [13:31:20.468] Searching for globals... [13:31:20.730] [13:31:20.730] Searching for globals ... DONE [13:31:20.730] - globals: [0] [13:31:20.731] getGlobalsAndPackages() ... DONE [13:31:20.731] + additional globals found: [n=0] [13:31:20.731] + additional namespaces needed: [n=0] [13:31:20.731] - Finding globals in 'X' for chunk #2 ... DONE [13:31:20.731] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:31:20.731] - seeds: [13:31:20.731] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.732] getGlobalsAndPackages() ... [13:31:20.732] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.732] Resolving globals: FALSE [13:31:20.732] Tweak future expression to call with '...' arguments ... [13:31:20.732] { [13:31:20.732] do.call(function(...) { [13:31:20.732] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.732] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.732] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.732] on.exit(options(oopts), add = TRUE) [13:31:20.732] } [13:31:20.732] { [13:31:20.732] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.732] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.732] ...future.FUN(...future.X_jj, ...) [13:31:20.732] }) [13:31:20.732] } [13:31:20.732] }, args = future.call.arguments) [13:31:20.732] } [13:31:20.733] Tweak future expression to call with '...' arguments ... DONE [13:31:20.733] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:20.737] [13:31:20.737] getGlobalsAndPackages() ... DONE [13:31:20.737] run() for 'Future' ... [13:31:20.738] - state: 'created' [13:31:20.738] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:20.740] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:20.740] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:20.740] - Field: 'label' [13:31:20.740] - Field: 'local' [13:31:20.740] - Field: 'owner' [13:31:20.740] - Field: 'envir' [13:31:20.740] - Field: 'packages' [13:31:20.741] - Field: 'gc' [13:31:20.741] - Field: 'conditions' [13:31:20.741] - Field: 'expr' [13:31:20.741] - Field: 'uuid' [13:31:20.741] - Field: 'seed' [13:31:20.741] - Field: 'version' [13:31:20.741] - Field: 'result' [13:31:20.741] - Field: 'asynchronous' [13:31:20.742] - Field: 'calls' [13:31:20.742] - Field: 'globals' [13:31:20.742] - Field: 'stdout' [13:31:20.742] - Field: 'earlySignal' [13:31:20.742] - Field: 'lazy' [13:31:20.742] - Field: 'state' [13:31:20.742] - Field: '.cluster' [13:31:20.742] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:20.743] - Launch lazy future ... [13:31:20.743] Packages needed by the future expression (n = 0): [13:31:20.743] Packages needed by future strategies (n = 0): [13:31:20.743] { [13:31:20.743] { [13:31:20.743] { [13:31:20.743] ...future.startTime <- base::Sys.time() [13:31:20.743] { [13:31:20.743] { [13:31:20.743] { [13:31:20.743] base::local({ [13:31:20.743] has_future <- base::requireNamespace("future", [13:31:20.743] quietly = TRUE) [13:31:20.743] if (has_future) { [13:31:20.743] ns <- base::getNamespace("future") [13:31:20.743] version <- ns[[".package"]][["version"]] [13:31:20.743] if (is.null(version)) [13:31:20.743] version <- utils::packageVersion("future") [13:31:20.743] } [13:31:20.743] else { [13:31:20.743] version <- NULL [13:31:20.743] } [13:31:20.743] if (!has_future || version < "1.8.0") { [13:31:20.743] info <- base::c(r_version = base::gsub("R version ", [13:31:20.743] "", base::R.version$version.string), [13:31:20.743] platform = base::sprintf("%s (%s-bit)", [13:31:20.743] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:20.743] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:20.743] "release", "version")], collapse = " "), [13:31:20.743] hostname = base::Sys.info()[["nodename"]]) [13:31:20.743] info <- base::sprintf("%s: %s", base::names(info), [13:31:20.743] info) [13:31:20.743] info <- base::paste(info, collapse = "; ") [13:31:20.743] if (!has_future) { [13:31:20.743] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:20.743] info) [13:31:20.743] } [13:31:20.743] else { [13:31:20.743] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:20.743] info, version) [13:31:20.743] } [13:31:20.743] base::stop(msg) [13:31:20.743] } [13:31:20.743] }) [13:31:20.743] } [13:31:20.743] ...future.strategy.old <- future::plan("list") [13:31:20.743] options(future.plan = NULL) [13:31:20.743] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.743] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:20.743] } [13:31:20.743] ...future.workdir <- getwd() [13:31:20.743] } [13:31:20.743] ...future.oldOptions <- base::as.list(base::.Options) [13:31:20.743] ...future.oldEnvVars <- base::Sys.getenv() [13:31:20.743] } [13:31:20.743] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:20.743] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:31:20.743] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:20.743] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:20.743] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:20.743] future.stdout.windows.reencode = NULL, width = 80L) [13:31:20.743] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:20.743] base::names(...future.oldOptions)) [13:31:20.743] } [13:31:20.743] if (FALSE) { [13:31:20.743] } [13:31:20.743] else { [13:31:20.743] if (TRUE) { [13:31:20.743] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:20.743] open = "w") [13:31:20.743] } [13:31:20.743] else { [13:31:20.743] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:20.743] windows = "NUL", "/dev/null"), open = "w") [13:31:20.743] } [13:31:20.743] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:20.743] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:20.743] base::sink(type = "output", split = FALSE) [13:31:20.743] base::close(...future.stdout) [13:31:20.743] }, add = TRUE) [13:31:20.743] } [13:31:20.743] ...future.frame <- base::sys.nframe() [13:31:20.743] ...future.conditions <- base::list() [13:31:20.743] ...future.rng <- base::globalenv()$.Random.seed [13:31:20.743] if (FALSE) { [13:31:20.743] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:20.743] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:20.743] } [13:31:20.743] ...future.result <- base::tryCatch({ [13:31:20.743] base::withCallingHandlers({ [13:31:20.743] ...future.value <- base::withVisible(base::local({ [13:31:20.743] do.call(function(...) { [13:31:20.743] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.743] if (!identical(...future.globals.maxSize.org, [13:31:20.743] ...future.globals.maxSize)) { [13:31:20.743] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.743] on.exit(options(oopts), add = TRUE) [13:31:20.743] } [13:31:20.743] { [13:31:20.743] lapply(seq_along(...future.elements_ii), [13:31:20.743] FUN = function(jj) { [13:31:20.743] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.743] ...future.FUN(...future.X_jj, ...) [13:31:20.743] }) [13:31:20.743] } [13:31:20.743] }, args = future.call.arguments) [13:31:20.743] })) [13:31:20.743] future::FutureResult(value = ...future.value$value, [13:31:20.743] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.743] ...future.rng), globalenv = if (FALSE) [13:31:20.743] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:20.743] ...future.globalenv.names)) [13:31:20.743] else NULL, started = ...future.startTime, version = "1.8") [13:31:20.743] }, condition = base::local({ [13:31:20.743] c <- base::c [13:31:20.743] inherits <- base::inherits [13:31:20.743] invokeRestart <- base::invokeRestart [13:31:20.743] length <- base::length [13:31:20.743] list <- base::list [13:31:20.743] seq.int <- base::seq.int [13:31:20.743] signalCondition <- base::signalCondition [13:31:20.743] sys.calls <- base::sys.calls [13:31:20.743] `[[` <- base::`[[` [13:31:20.743] `+` <- base::`+` [13:31:20.743] `<<-` <- base::`<<-` [13:31:20.743] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:20.743] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:20.743] 3L)] [13:31:20.743] } [13:31:20.743] function(cond) { [13:31:20.743] is_error <- inherits(cond, "error") [13:31:20.743] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:20.743] NULL) [13:31:20.743] if (is_error) { [13:31:20.743] sessionInformation <- function() { [13:31:20.743] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:20.743] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:20.743] search = base::search(), system = base::Sys.info()) [13:31:20.743] } [13:31:20.743] ...future.conditions[[length(...future.conditions) + [13:31:20.743] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:20.743] cond$call), session = sessionInformation(), [13:31:20.743] timestamp = base::Sys.time(), signaled = 0L) [13:31:20.743] signalCondition(cond) [13:31:20.743] } [13:31:20.743] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:20.743] signal <- FALSE && inherits(cond, character(0)) [13:31:20.743] ...future.conditions[[length(...future.conditions) + [13:31:20.743] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:20.743] if (FALSE && !signal) { [13:31:20.743] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.743] { [13:31:20.743] inherits <- base::inherits [13:31:20.743] invokeRestart <- base::invokeRestart [13:31:20.743] is.null <- base::is.null [13:31:20.743] muffled <- FALSE [13:31:20.743] if (inherits(cond, "message")) { [13:31:20.743] muffled <- grepl(pattern, "muffleMessage") [13:31:20.743] if (muffled) [13:31:20.743] invokeRestart("muffleMessage") [13:31:20.743] } [13:31:20.743] else if (inherits(cond, "warning")) { [13:31:20.743] muffled <- grepl(pattern, "muffleWarning") [13:31:20.743] if (muffled) [13:31:20.743] invokeRestart("muffleWarning") [13:31:20.743] } [13:31:20.743] else if (inherits(cond, "condition")) { [13:31:20.743] if (!is.null(pattern)) { [13:31:20.743] computeRestarts <- base::computeRestarts [13:31:20.743] grepl <- base::grepl [13:31:20.743] restarts <- computeRestarts(cond) [13:31:20.743] for (restart in restarts) { [13:31:20.743] name <- restart$name [13:31:20.743] if (is.null(name)) [13:31:20.743] next [13:31:20.743] if (!grepl(pattern, name)) [13:31:20.743] next [13:31:20.743] invokeRestart(restart) [13:31:20.743] muffled <- TRUE [13:31:20.743] break [13:31:20.743] } [13:31:20.743] } [13:31:20.743] } [13:31:20.743] invisible(muffled) [13:31:20.743] } [13:31:20.743] muffleCondition(cond, pattern = "^muffle") [13:31:20.743] } [13:31:20.743] } [13:31:20.743] else { [13:31:20.743] if (TRUE) { [13:31:20.743] muffleCondition <- function (cond, pattern = "^muffle") [13:31:20.743] { [13:31:20.743] inherits <- base::inherits [13:31:20.743] invokeRestart <- base::invokeRestart [13:31:20.743] is.null <- base::is.null [13:31:20.743] muffled <- FALSE [13:31:20.743] if (inherits(cond, "message")) { [13:31:20.743] muffled <- grepl(pattern, "muffleMessage") [13:31:20.743] if (muffled) [13:31:20.743] invokeRestart("muffleMessage") [13:31:20.743] } [13:31:20.743] else if (inherits(cond, "warning")) { [13:31:20.743] muffled <- grepl(pattern, "muffleWarning") [13:31:20.743] if (muffled) [13:31:20.743] invokeRestart("muffleWarning") [13:31:20.743] } [13:31:20.743] else if (inherits(cond, "condition")) { [13:31:20.743] if (!is.null(pattern)) { [13:31:20.743] computeRestarts <- base::computeRestarts [13:31:20.743] grepl <- base::grepl [13:31:20.743] restarts <- computeRestarts(cond) [13:31:20.743] for (restart in restarts) { [13:31:20.743] name <- restart$name [13:31:20.743] if (is.null(name)) [13:31:20.743] next [13:31:20.743] if (!grepl(pattern, name)) [13:31:20.743] next [13:31:20.743] invokeRestart(restart) [13:31:20.743] muffled <- TRUE [13:31:20.743] break [13:31:20.743] } [13:31:20.743] } [13:31:20.743] } [13:31:20.743] invisible(muffled) [13:31:20.743] } [13:31:20.743] muffleCondition(cond, pattern = "^muffle") [13:31:20.743] } [13:31:20.743] } [13:31:20.743] } [13:31:20.743] })) [13:31:20.743] }, error = function(ex) { [13:31:20.743] base::structure(base::list(value = NULL, visible = NULL, [13:31:20.743] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:20.743] ...future.rng), started = ...future.startTime, [13:31:20.743] finished = Sys.time(), session_uuid = NA_character_, [13:31:20.743] version = "1.8"), class = "FutureResult") [13:31:20.743] }, finally = { [13:31:20.743] if (!identical(...future.workdir, getwd())) [13:31:20.743] setwd(...future.workdir) [13:31:20.743] { [13:31:20.743] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:20.743] ...future.oldOptions$nwarnings <- NULL [13:31:20.743] } [13:31:20.743] base::options(...future.oldOptions) [13:31:20.743] if (.Platform$OS.type == "windows") { [13:31:20.743] old_names <- names(...future.oldEnvVars) [13:31:20.743] envs <- base::Sys.getenv() [13:31:20.743] names <- names(envs) [13:31:20.743] common <- intersect(names, old_names) [13:31:20.743] added <- setdiff(names, old_names) [13:31:20.743] removed <- setdiff(old_names, names) [13:31:20.743] changed <- common[...future.oldEnvVars[common] != [13:31:20.743] envs[common]] [13:31:20.743] NAMES <- toupper(changed) [13:31:20.743] args <- list() [13:31:20.743] for (kk in seq_along(NAMES)) { [13:31:20.743] name <- changed[[kk]] [13:31:20.743] NAME <- NAMES[[kk]] [13:31:20.743] if (name != NAME && is.element(NAME, old_names)) [13:31:20.743] next [13:31:20.743] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.743] } [13:31:20.743] NAMES <- toupper(added) [13:31:20.743] for (kk in seq_along(NAMES)) { [13:31:20.743] name <- added[[kk]] [13:31:20.743] NAME <- NAMES[[kk]] [13:31:20.743] if (name != NAME && is.element(NAME, old_names)) [13:31:20.743] next [13:31:20.743] args[[name]] <- "" [13:31:20.743] } [13:31:20.743] NAMES <- toupper(removed) [13:31:20.743] for (kk in seq_along(NAMES)) { [13:31:20.743] name <- removed[[kk]] [13:31:20.743] NAME <- NAMES[[kk]] [13:31:20.743] if (name != NAME && is.element(NAME, old_names)) [13:31:20.743] next [13:31:20.743] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:20.743] } [13:31:20.743] if (length(args) > 0) [13:31:20.743] base::do.call(base::Sys.setenv, args = args) [13:31:20.743] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:20.743] } [13:31:20.743] else { [13:31:20.743] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:20.743] } [13:31:20.743] { [13:31:20.743] if (base::length(...future.futureOptionsAdded) > [13:31:20.743] 0L) { [13:31:20.743] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:20.743] base::names(opts) <- ...future.futureOptionsAdded [13:31:20.743] base::options(opts) [13:31:20.743] } [13:31:20.743] { [13:31:20.743] NULL [13:31:20.743] options(future.plan = NULL) [13:31:20.743] if (is.na(NA_character_)) [13:31:20.743] Sys.unsetenv("R_FUTURE_PLAN") [13:31:20.743] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:20.743] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:20.743] .init = FALSE) [13:31:20.743] } [13:31:20.743] } [13:31:20.743] } [13:31:20.743] }) [13:31:20.743] if (TRUE) { [13:31:20.743] base::sink(type = "output", split = FALSE) [13:31:20.743] if (TRUE) { [13:31:20.743] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:20.743] } [13:31:20.743] else { [13:31:20.743] ...future.result["stdout"] <- base::list(NULL) [13:31:20.743] } [13:31:20.743] base::close(...future.stdout) [13:31:20.743] ...future.stdout <- NULL [13:31:20.743] } [13:31:20.743] ...future.result$conditions <- ...future.conditions [13:31:20.743] ...future.result$finished <- base::Sys.time() [13:31:20.743] ...future.result [13:31:20.743] } [13:31:20.769] - Launch lazy future ... done [13:31:20.769] run() for 'MiraiFuture' ... done [13:31:20.769] Created future: [13:31:22.763] resolved() for 'MiraiFuture' ... [13:31:22.764] - state: 'running' [13:31:22.764] - run: TRUE [13:31:22.764] - result: 'NULL' [13:31:22.764] - resolved: FALSE [13:31:22.764] resolved() for 'MiraiFuture' ... done [13:31:20.769] MiraiFuture: [13:31:20.769] Label: 'future_lapply-2' [13:31:20.769] Expression: [13:31:20.769] { [13:31:20.769] do.call(function(...) { [13:31:20.769] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:20.769] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:20.769] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:20.769] on.exit(options(oopts), add = TRUE) [13:31:20.769] } [13:31:20.769] { [13:31:20.769] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:20.769] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:20.769] ...future.FUN(...future.X_jj, ...) [13:31:20.769] }) [13:31:20.769] } [13:31:20.769] }, args = future.call.arguments) [13:31:20.769] } [13:31:20.769] Lazy evaluation: FALSE [13:31:20.769] Asynchronous evaluation: TRUE [13:31:20.769] Local evaluation: TRUE [13:31:20.769] Environment: R_GlobalEnv [13:31:20.769] Capture standard output: TRUE [13:31:20.769] Capture condition classes: 'condition' (excluding 'nothing') [13:31:20.769] Globals: 6 objects totaling 26.70 MiB (function '...future.FUN' of 728 bytes, numeric 'a' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 26.70 MiB, NULL '...future.seeds_ii' of 0 bytes, ...) [13:31:20.769] Packages: [13:31:20.769] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:20.769] Resolved: TRUE [13:31:20.769] Value: [13:31:20.769] Conditions captured: [13:31:20.769] Early signaling: FALSE [13:31:20.769] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:20.769] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:22.795] Chunk #2 of 2 ... DONE [13:31:22.795] Launching 2 futures (chunks) ... DONE [13:31:22.796] Resolving 2 futures (chunks) ... [13:31:22.796] resolve() on list ... [13:31:22.796] recursive: 0 [13:31:22.796] length: 2 [13:31:22.796] [13:31:22.796] resolved() for 'MiraiFuture' ... [13:31:22.796] - state: 'running' [13:31:22.796] - run: TRUE [13:31:22.797] - result: 'NULL' [13:31:22.797] - resolved: FALSE [13:31:22.797] resolved() for 'MiraiFuture' ... done [13:31:22.797] Future #1 [13:31:22.797] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:22.797] - nx: 2 [13:31:22.797] - relay: TRUE [13:31:22.798] - stdout: TRUE [13:31:22.798] - signal: TRUE [13:31:22.798] - resignal: FALSE [13:31:22.798] - force: TRUE [13:31:22.798] - relayed: [n=2] FALSE, FALSE [13:31:22.798] - queued futures: [n=2] FALSE, FALSE [13:31:22.798] - until=1 [13:31:22.798] - relaying element #1 [13:31:22.799] - relayed: [n=2] TRUE, FALSE [13:31:22.799] - queued futures: [n=2] TRUE, FALSE [13:31:22.799] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:22.799] length: 1 (resolved future 1) [13:31:22.799] resolved() for 'MiraiFuture' ... [13:31:22.799] - state: 'running' [13:31:22.799] - run: TRUE [13:31:22.799] - result: 'NULL' [13:31:22.800] - resolved: FALSE [13:31:22.800] resolved() for 'MiraiFuture' ... done [13:31:22.800] Future #2 [13:31:22.800] signalConditionsASAP(MiraiFuture, pos=2) ... [13:31:22.800] - nx: 2 [13:31:22.800] - relay: TRUE [13:31:22.800] - stdout: TRUE [13:31:22.800] - signal: TRUE [13:31:22.801] - resignal: FALSE [13:31:22.801] - force: TRUE [13:31:22.801] - relayed: [n=2] TRUE, FALSE [13:31:22.801] - queued futures: [n=2] TRUE, FALSE [13:31:22.801] - until=2 [13:31:22.801] - relaying element #2 [13:31:22.801] - relayed: [n=2] TRUE, TRUE [13:31:22.801] - queued futures: [n=2] TRUE, TRUE [13:31:22.802] signalConditionsASAP(MiraiFuture, pos=2) ... done [13:31:22.802] length: 0 (resolved future 2) [13:31:22.802] Relaying remaining futures [13:31:22.802] signalConditionsASAP(NULL, pos=0) ... [13:31:22.802] - nx: 2 [13:31:22.802] - relay: TRUE [13:31:22.802] - stdout: TRUE [13:31:22.802] - signal: TRUE [13:31:22.802] - resignal: FALSE [13:31:22.802] - force: TRUE [13:31:22.803] - relayed: [n=2] TRUE, TRUE [13:31:22.803] - queued futures: [n=2] TRUE, TRUE - flush all [13:31:22.803] - relayed: [n=2] TRUE, TRUE [13:31:22.803] - queued futures: [n=2] TRUE, TRUE [13:31:22.803] signalConditionsASAP(NULL, pos=0) ... done [13:31:22.803] resolve() on list ... DONE [13:31:22.811] - Number of value chunks collected: 2 [13:31:22.811] Resolving 2 futures (chunks) ... DONE [13:31:22.811] Reducing values from 2 chunks ... [13:31:22.821] - Number of values collected after concatenation: 1000000 [13:31:22.821] - Number of values expected: 1000000 [13:31:22.821] Reducing values from 2 chunks ... DONE [13:31:22.829] future_lapply() ... DONE - future_lapply() with global in non-attached package ... [13:31:22.999] plan(): Setting new future strategy stack: [13:31:22.999] List of future strategies: [13:31:22.999] 1. mirai_multisession: [13:31:22.999] - args: function (expr, substitute = TRUE, envir = parent.frame(), ..., workers = availableCores()) [13:31:22.999] - tweaked: FALSE [13:31:22.999] - call: plan(strategy) [13:31:23.000] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... [13:31:23.000] < mirai | $data > [13:31:23.001] getGlobalsAndPackages() ... [13:31:23.002] Not searching for globals [13:31:23.002] - globals: [0] [13:31:23.002] getGlobalsAndPackages() ... DONE [13:31:23.002] getGlobalsAndPackages() ... [13:31:23.002] [13:31:23.002] - globals: [0] [13:31:23.002] getGlobalsAndPackages() ... DONE [13:31:23.003] Packages needed by the future expression (n = 0): [13:31:23.003] Packages needed by future strategies (n = 0): [13:31:23.003] { [13:31:23.003] { [13:31:23.003] { [13:31:23.003] ...future.startTime <- base::Sys.time() [13:31:23.003] { [13:31:23.003] { [13:31:23.003] { [13:31:23.003] base::local({ [13:31:23.003] has_future <- base::requireNamespace("future", [13:31:23.003] quietly = TRUE) [13:31:23.003] if (has_future) { [13:31:23.003] ns <- base::getNamespace("future") [13:31:23.003] version <- ns[[".package"]][["version"]] [13:31:23.003] if (is.null(version)) [13:31:23.003] version <- utils::packageVersion("future") [13:31:23.003] } [13:31:23.003] else { [13:31:23.003] version <- NULL [13:31:23.003] } [13:31:23.003] if (!has_future || version < "1.8.0") { [13:31:23.003] info <- base::c(r_version = base::gsub("R version ", [13:31:23.003] "", base::R.version$version.string), [13:31:23.003] platform = base::sprintf("%s (%s-bit)", [13:31:23.003] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:23.003] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:23.003] "release", "version")], collapse = " "), [13:31:23.003] hostname = base::Sys.info()[["nodename"]]) [13:31:23.003] info <- base::sprintf("%s: %s", base::names(info), [13:31:23.003] info) [13:31:23.003] info <- base::paste(info, collapse = "; ") [13:31:23.003] if (!has_future) { [13:31:23.003] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:23.003] info) [13:31:23.003] } [13:31:23.003] else { [13:31:23.003] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:23.003] info, version) [13:31:23.003] } [13:31:23.003] base::stop(msg) [13:31:23.003] } [13:31:23.003] }) [13:31:23.003] } [13:31:23.003] ...future.strategy.old <- future::plan("list") [13:31:23.003] options(future.plan = NULL) [13:31:23.003] Sys.unsetenv("R_FUTURE_PLAN") [13:31:23.003] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:23.003] } [13:31:23.003] ...future.workdir <- getwd() [13:31:23.003] } [13:31:23.003] ...future.oldOptions <- base::as.list(base::.Options) [13:31:23.003] ...future.oldEnvVars <- base::Sys.getenv() [13:31:23.003] } [13:31:23.003] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:23.003] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:23.003] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:23.003] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:23.003] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:23.003] future.stdout.windows.reencode = NULL, width = 80L) [13:31:23.003] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:23.003] base::names(...future.oldOptions)) [13:31:23.003] } [13:31:23.003] if (FALSE) { [13:31:23.003] } [13:31:23.003] else { [13:31:23.003] if (TRUE) { [13:31:23.003] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:23.003] open = "w") [13:31:23.003] } [13:31:23.003] else { [13:31:23.003] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:23.003] windows = "NUL", "/dev/null"), open = "w") [13:31:23.003] } [13:31:23.003] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:23.003] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:23.003] base::sink(type = "output", split = FALSE) [13:31:23.003] base::close(...future.stdout) [13:31:23.003] }, add = TRUE) [13:31:23.003] } [13:31:23.003] ...future.frame <- base::sys.nframe() [13:31:23.003] ...future.conditions <- base::list() [13:31:23.003] ...future.rng <- base::globalenv()$.Random.seed [13:31:23.003] if (FALSE) { [13:31:23.003] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:23.003] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:23.003] } [13:31:23.003] ...future.result <- base::tryCatch({ [13:31:23.003] base::withCallingHandlers({ [13:31:23.003] ...future.value <- base::withVisible(base::local(NA)) [13:31:23.003] future::FutureResult(value = ...future.value$value, [13:31:23.003] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:23.003] ...future.rng), globalenv = if (FALSE) [13:31:23.003] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:23.003] ...future.globalenv.names)) [13:31:23.003] else NULL, started = ...future.startTime, version = "1.8") [13:31:23.003] }, condition = base::local({ [13:31:23.003] c <- base::c [13:31:23.003] inherits <- base::inherits [13:31:23.003] invokeRestart <- base::invokeRestart [13:31:23.003] length <- base::length [13:31:23.003] list <- base::list [13:31:23.003] seq.int <- base::seq.int [13:31:23.003] signalCondition <- base::signalCondition [13:31:23.003] sys.calls <- base::sys.calls [13:31:23.003] `[[` <- base::`[[` [13:31:23.003] `+` <- base::`+` [13:31:23.003] `<<-` <- base::`<<-` [13:31:23.003] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:23.003] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:23.003] 3L)] [13:31:23.003] } [13:31:23.003] function(cond) { [13:31:23.003] is_error <- inherits(cond, "error") [13:31:23.003] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:23.003] NULL) [13:31:23.003] if (is_error) { [13:31:23.003] sessionInformation <- function() { [13:31:23.003] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:23.003] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:23.003] search = base::search(), system = base::Sys.info()) [13:31:23.003] } [13:31:23.003] ...future.conditions[[length(...future.conditions) + [13:31:23.003] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:23.003] cond$call), session = sessionInformation(), [13:31:23.003] timestamp = base::Sys.time(), signaled = 0L) [13:31:23.003] signalCondition(cond) [13:31:23.003] } [13:31:23.003] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:23.003] signal <- FALSE && inherits(cond, character(0)) [13:31:23.003] ...future.conditions[[length(...future.conditions) + [13:31:23.003] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:23.003] if (FALSE && !signal) { [13:31:23.003] muffleCondition <- function (cond, pattern = "^muffle") [13:31:23.003] { [13:31:23.003] inherits <- base::inherits [13:31:23.003] invokeRestart <- base::invokeRestart [13:31:23.003] is.null <- base::is.null [13:31:23.003] muffled <- FALSE [13:31:23.003] if (inherits(cond, "message")) { [13:31:23.003] muffled <- grepl(pattern, "muffleMessage") [13:31:23.003] if (muffled) [13:31:23.003] invokeRestart("muffleMessage") [13:31:23.003] } [13:31:23.003] else if (inherits(cond, "warning")) { [13:31:23.003] muffled <- grepl(pattern, "muffleWarning") [13:31:23.003] if (muffled) [13:31:23.003] invokeRestart("muffleWarning") [13:31:23.003] } [13:31:23.003] else if (inherits(cond, "condition")) { [13:31:23.003] if (!is.null(pattern)) { [13:31:23.003] computeRestarts <- base::computeRestarts [13:31:23.003] grepl <- base::grepl [13:31:23.003] restarts <- computeRestarts(cond) [13:31:23.003] for (restart in restarts) { [13:31:23.003] name <- restart$name [13:31:23.003] if (is.null(name)) [13:31:23.003] next [13:31:23.003] if (!grepl(pattern, name)) [13:31:23.003] next [13:31:23.003] invokeRestart(restart) [13:31:23.003] muffled <- TRUE [13:31:23.003] break [13:31:23.003] } [13:31:23.003] } [13:31:23.003] } [13:31:23.003] invisible(muffled) [13:31:23.003] } [13:31:23.003] muffleCondition(cond, pattern = "^muffle") [13:31:23.003] } [13:31:23.003] } [13:31:23.003] else { [13:31:23.003] if (TRUE) { [13:31:23.003] muffleCondition <- function (cond, pattern = "^muffle") [13:31:23.003] { [13:31:23.003] inherits <- base::inherits [13:31:23.003] invokeRestart <- base::invokeRestart [13:31:23.003] is.null <- base::is.null [13:31:23.003] muffled <- FALSE [13:31:23.003] if (inherits(cond, "message")) { [13:31:23.003] muffled <- grepl(pattern, "muffleMessage") [13:31:23.003] if (muffled) [13:31:23.003] invokeRestart("muffleMessage") [13:31:23.003] } [13:31:23.003] else if (inherits(cond, "warning")) { [13:31:23.003] muffled <- grepl(pattern, "muffleWarning") [13:31:23.003] if (muffled) [13:31:23.003] invokeRestart("muffleWarning") [13:31:23.003] } [13:31:23.003] else if (inherits(cond, "condition")) { [13:31:23.003] if (!is.null(pattern)) { [13:31:23.003] computeRestarts <- base::computeRestarts [13:31:23.003] grepl <- base::grepl [13:31:23.003] restarts <- computeRestarts(cond) [13:31:23.003] for (restart in restarts) { [13:31:23.003] name <- restart$name [13:31:23.003] if (is.null(name)) [13:31:23.003] next [13:31:23.003] if (!grepl(pattern, name)) [13:31:23.003] next [13:31:23.003] invokeRestart(restart) [13:31:23.003] muffled <- TRUE [13:31:23.003] break [13:31:23.003] } [13:31:23.003] } [13:31:23.003] } [13:31:23.003] invisible(muffled) [13:31:23.003] } [13:31:23.003] muffleCondition(cond, pattern = "^muffle") [13:31:23.003] } [13:31:23.003] } [13:31:23.003] } [13:31:23.003] })) [13:31:23.003] }, error = function(ex) { [13:31:23.003] base::structure(base::list(value = NULL, visible = NULL, [13:31:23.003] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:23.003] ...future.rng), started = ...future.startTime, [13:31:23.003] finished = Sys.time(), session_uuid = NA_character_, [13:31:23.003] version = "1.8"), class = "FutureResult") [13:31:23.003] }, finally = { [13:31:23.003] if (!identical(...future.workdir, getwd())) [13:31:23.003] setwd(...future.workdir) [13:31:23.003] { [13:31:23.003] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:23.003] ...future.oldOptions$nwarnings <- NULL [13:31:23.003] } [13:31:23.003] base::options(...future.oldOptions) [13:31:23.003] if (.Platform$OS.type == "windows") { [13:31:23.003] old_names <- names(...future.oldEnvVars) [13:31:23.003] envs <- base::Sys.getenv() [13:31:23.003] names <- names(envs) [13:31:23.003] common <- intersect(names, old_names) [13:31:23.003] added <- setdiff(names, old_names) [13:31:23.003] removed <- setdiff(old_names, names) [13:31:23.003] changed <- common[...future.oldEnvVars[common] != [13:31:23.003] envs[common]] [13:31:23.003] NAMES <- toupper(changed) [13:31:23.003] args <- list() [13:31:23.003] for (kk in seq_along(NAMES)) { [13:31:23.003] name <- changed[[kk]] [13:31:23.003] NAME <- NAMES[[kk]] [13:31:23.003] if (name != NAME && is.element(NAME, old_names)) [13:31:23.003] next [13:31:23.003] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:23.003] } [13:31:23.003] NAMES <- toupper(added) [13:31:23.003] for (kk in seq_along(NAMES)) { [13:31:23.003] name <- added[[kk]] [13:31:23.003] NAME <- NAMES[[kk]] [13:31:23.003] if (name != NAME && is.element(NAME, old_names)) [13:31:23.003] next [13:31:23.003] args[[name]] <- "" [13:31:23.003] } [13:31:23.003] NAMES <- toupper(removed) [13:31:23.003] for (kk in seq_along(NAMES)) { [13:31:23.003] name <- removed[[kk]] [13:31:23.003] NAME <- NAMES[[kk]] [13:31:23.003] if (name != NAME && is.element(NAME, old_names)) [13:31:23.003] next [13:31:23.003] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:23.003] } [13:31:23.003] if (length(args) > 0) [13:31:23.003] base::do.call(base::Sys.setenv, args = args) [13:31:23.003] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:23.003] } [13:31:23.003] else { [13:31:23.003] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:23.003] } [13:31:23.003] { [13:31:23.003] if (base::length(...future.futureOptionsAdded) > [13:31:23.003] 0L) { [13:31:23.003] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:23.003] base::names(opts) <- ...future.futureOptionsAdded [13:31:23.003] base::options(opts) [13:31:23.003] } [13:31:23.003] { [13:31:23.003] NULL [13:31:23.003] options(future.plan = NULL) [13:31:23.003] if (is.na(NA_character_)) [13:31:23.003] Sys.unsetenv("R_FUTURE_PLAN") [13:31:23.003] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:23.003] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:23.003] .init = FALSE) [13:31:23.003] } [13:31:23.003] } [13:31:23.003] } [13:31:23.003] }) [13:31:23.003] if (TRUE) { [13:31:23.003] base::sink(type = "output", split = FALSE) [13:31:23.003] if (TRUE) { [13:31:23.003] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:23.003] } [13:31:23.003] else { [13:31:23.003] ...future.result["stdout"] <- base::list(NULL) [13:31:23.003] } [13:31:23.003] base::close(...future.stdout) [13:31:23.003] ...future.stdout <- NULL [13:31:23.003] } [13:31:23.003] ...future.result$conditions <- ...future.conditions [13:31:23.003] ...future.result$finished <- base::Sys.time() [13:31:23.003] ...future.result [13:31:23.003] } [13:31:23.009] plan(): plan_init() of 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' ... DONE [13:31:23.009] plan(): nbrOfWorkers() = 2 [13:31:23.009] future_lapply() ... [13:31:23.010] Number of chunks: 1 [13:31:23.010] getGlobalsAndPackagesXApply() ... [13:31:23.010] - future.globals: TRUE [13:31:23.010] getGlobalsAndPackages() ... [13:31:23.011] Searching for globals... [13:31:23.012] - globals found: [2] 'FUN', 'file_ext' [13:31:23.012] Searching for globals ... DONE [13:31:23.012] Resolving globals: FALSE [13:31:23.012] The total size of the 1 globals is 448 bytes (448 bytes) [13:31:23.012] The total size of the 1 globals exported for future expression ('FUN()') is 448 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (448 bytes of class 'function') [13:31:23.013] - globals: [1] 'FUN' [13:31:23.013] - packages: [1] 'tools' [13:31:23.013] getGlobalsAndPackages() ... DONE [13:31:23.013] - globals found/used: [n=1] 'FUN' [13:31:23.013] - needed namespaces: [n=1] 'tools' [13:31:23.013] Finding globals ... DONE [13:31:23.013] - use_args: TRUE [13:31:23.014] - Getting '...' globals ... [13:31:23.014] resolve() on list ... [13:31:23.014] recursive: 0 [13:31:23.014] length: 1 [13:31:23.014] elements: '...' [13:31:23.014] length: 0 (resolved future 1) [13:31:23.014] resolve() on list ... DONE [13:31:23.015] - '...' content: [n=0] [13:31:23.015] List of 1 [13:31:23.015] $ ...: list() [13:31:23.015] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:23.015] - attr(*, "where")=List of 1 [13:31:23.015] ..$ ...: [13:31:23.015] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:23.015] - attr(*, "resolved")= logi TRUE [13:31:23.015] - attr(*, "total_size")= num NA [13:31:23.017] - Getting '...' globals ... DONE [13:31:23.017] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:31:23.017] List of 2 [13:31:23.017] $ ...future.FUN:function (x) [13:31:23.017] $ ... : list() [13:31:23.017] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:31:23.017] - attr(*, "where")=List of 2 [13:31:23.017] ..$ ...future.FUN: [13:31:23.017] ..$ ... : [13:31:23.017] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:31:23.017] - attr(*, "resolved")= logi FALSE [13:31:23.017] - attr(*, "total_size")= num 448 [13:31:23.020] Packages to be attached in all futures: [n=1] 'tools' [13:31:23.020] getGlobalsAndPackagesXApply() ... DONE [13:31:23.020] Number of futures (= number of chunks): 1 [13:31:23.020] Launching 1 futures (chunks) ... [13:31:23.020] Chunk #1 of 1 ... [13:31:23.020] - Finding globals in 'X' for chunk #1 ... [13:31:23.020] getGlobalsAndPackages() ... [13:31:23.020] Searching for globals... [13:31:23.021] [13:31:23.021] Searching for globals ... DONE [13:31:23.021] - globals: [0] [13:31:23.021] getGlobalsAndPackages() ... DONE [13:31:23.021] + additional globals found: [n=0] [13:31:23.021] + additional namespaces needed: [n=0] [13:31:23.021] - Finding globals in 'X' for chunk #1 ... DONE [13:31:23.021] - seeds: [13:31:23.022] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:23.022] getGlobalsAndPackages() ... [13:31:23.022] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:23.022] Resolving globals: FALSE [13:31:23.022] Tweak future expression to call with '...' arguments ... [13:31:23.022] { [13:31:23.022] do.call(function(...) { [13:31:23.022] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:23.022] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:23.022] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:23.022] on.exit(options(oopts), add = TRUE) [13:31:23.022] } [13:31:23.022] { [13:31:23.022] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:23.022] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:23.022] ...future.FUN(...future.X_jj, ...) [13:31:23.022] }) [13:31:23.022] } [13:31:23.022] }, args = future.call.arguments) [13:31:23.022] } [13:31:23.023] Tweak future expression to call with '...' arguments ... DONE [13:31:23.023] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:31:23.023] [13:31:23.023] getGlobalsAndPackages() ... DONE [13:31:23.023] run() for 'Future' ... [13:31:23.024] - state: 'created' [13:31:23.024] - Future backend: 'FutureStrategy', 'mirai_multisession', 'mirai_cluster', 'mirai', 'multiprocess', 'future', 'function' [13:31:23.025] - Future class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:23.026] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... [13:31:23.026] - Field: 'label' [13:31:23.026] - Field: 'local' [13:31:23.026] - Field: 'owner' [13:31:23.026] - Field: 'envir' [13:31:23.026] - Field: 'packages' [13:31:23.026] - Field: 'gc' [13:31:23.027] - Field: 'conditions' [13:31:23.027] - Field: 'expr' [13:31:23.027] - Field: 'uuid' [13:31:23.027] - Field: 'seed' [13:31:23.027] - Field: 'version' [13:31:23.027] - Field: 'result' [13:31:23.027] - Field: 'asynchronous' [13:31:23.027] - Field: 'calls' [13:31:23.028] - Field: 'globals' [13:31:23.028] - Field: 'stdout' [13:31:23.028] - Field: 'earlySignal' [13:31:23.028] - Field: 'lazy' [13:31:23.028] - Field: 'state' [13:31:23.028] - Field: '.cluster' [13:31:23.028] - Copy elements of temporary 'MiraiFuture' to final 'Future' object ... done [13:31:23.028] - Launch lazy future ... [13:31:23.029] Packages needed by the future expression (n = 1): 'tools' [13:31:23.029] Packages needed by future strategies (n = 0): [13:31:23.029] { [13:31:23.029] { [13:31:23.029] { [13:31:23.029] ...future.startTime <- base::Sys.time() [13:31:23.029] { [13:31:23.029] { [13:31:23.029] { [13:31:23.029] { [13:31:23.029] base::local({ [13:31:23.029] has_future <- base::requireNamespace("future", [13:31:23.029] quietly = TRUE) [13:31:23.029] if (has_future) { [13:31:23.029] ns <- base::getNamespace("future") [13:31:23.029] version <- ns[[".package"]][["version"]] [13:31:23.029] if (is.null(version)) [13:31:23.029] version <- utils::packageVersion("future") [13:31:23.029] } [13:31:23.029] else { [13:31:23.029] version <- NULL [13:31:23.029] } [13:31:23.029] if (!has_future || version < "1.8.0") { [13:31:23.029] info <- base::c(r_version = base::gsub("R version ", [13:31:23.029] "", base::R.version$version.string), [13:31:23.029] platform = base::sprintf("%s (%s-bit)", [13:31:23.029] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:31:23.029] os = base::paste(base::Sys.info()[base::c("sysname", [13:31:23.029] "release", "version")], collapse = " "), [13:31:23.029] hostname = base::Sys.info()[["nodename"]]) [13:31:23.029] info <- base::sprintf("%s: %s", base::names(info), [13:31:23.029] info) [13:31:23.029] info <- base::paste(info, collapse = "; ") [13:31:23.029] if (!has_future) { [13:31:23.029] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:31:23.029] info) [13:31:23.029] } [13:31:23.029] else { [13:31:23.029] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:31:23.029] info, version) [13:31:23.029] } [13:31:23.029] base::stop(msg) [13:31:23.029] } [13:31:23.029] }) [13:31:23.029] } [13:31:23.029] base::local({ [13:31:23.029] for (pkg in "tools") { [13:31:23.029] base::loadNamespace(pkg) [13:31:23.029] base::library(pkg, character.only = TRUE) [13:31:23.029] } [13:31:23.029] }) [13:31:23.029] } [13:31:23.029] ...future.strategy.old <- future::plan("list") [13:31:23.029] options(future.plan = NULL) [13:31:23.029] Sys.unsetenv("R_FUTURE_PLAN") [13:31:23.029] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:31:23.029] } [13:31:23.029] ...future.workdir <- getwd() [13:31:23.029] } [13:31:23.029] ...future.oldOptions <- base::as.list(base::.Options) [13:31:23.029] ...future.oldEnvVars <- base::Sys.getenv() [13:31:23.029] } [13:31:23.029] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:31:23.029] future.globals.maxSize = NULL, future.globals.method = NULL, [13:31:23.029] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:31:23.029] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:31:23.029] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:31:23.029] future.stdout.windows.reencode = NULL, width = 80L) [13:31:23.029] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:31:23.029] base::names(...future.oldOptions)) [13:31:23.029] } [13:31:23.029] if (FALSE) { [13:31:23.029] } [13:31:23.029] else { [13:31:23.029] if (TRUE) { [13:31:23.029] ...future.stdout <- base::rawConnection(base::raw(0L), [13:31:23.029] open = "w") [13:31:23.029] } [13:31:23.029] else { [13:31:23.029] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:31:23.029] windows = "NUL", "/dev/null"), open = "w") [13:31:23.029] } [13:31:23.029] base::sink(...future.stdout, type = "output", split = FALSE) [13:31:23.029] base::on.exit(if (!base::is.null(...future.stdout)) { [13:31:23.029] base::sink(type = "output", split = FALSE) [13:31:23.029] base::close(...future.stdout) [13:31:23.029] }, add = TRUE) [13:31:23.029] } [13:31:23.029] ...future.frame <- base::sys.nframe() [13:31:23.029] ...future.conditions <- base::list() [13:31:23.029] ...future.rng <- base::globalenv()$.Random.seed [13:31:23.029] if (FALSE) { [13:31:23.029] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:31:23.029] "...future.value", "...future.globalenv.names", ".Random.seed") [13:31:23.029] } [13:31:23.029] ...future.result <- base::tryCatch({ [13:31:23.029] base::withCallingHandlers({ [13:31:23.029] ...future.value <- base::withVisible(base::local({ [13:31:23.029] do.call(function(...) { [13:31:23.029] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:23.029] if (!identical(...future.globals.maxSize.org, [13:31:23.029] ...future.globals.maxSize)) { [13:31:23.029] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:23.029] on.exit(options(oopts), add = TRUE) [13:31:23.029] } [13:31:23.029] { [13:31:23.029] lapply(seq_along(...future.elements_ii), [13:31:23.029] FUN = function(jj) { [13:31:23.029] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:23.029] ...future.FUN(...future.X_jj, ...) [13:31:23.029] }) [13:31:23.029] } [13:31:23.029] }, args = future.call.arguments) [13:31:23.029] })) [13:31:23.029] future::FutureResult(value = ...future.value$value, [13:31:23.029] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:31:23.029] ...future.rng), globalenv = if (FALSE) [13:31:23.029] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:31:23.029] ...future.globalenv.names)) [13:31:23.029] else NULL, started = ...future.startTime, version = "1.8") [13:31:23.029] }, condition = base::local({ [13:31:23.029] c <- base::c [13:31:23.029] inherits <- base::inherits [13:31:23.029] invokeRestart <- base::invokeRestart [13:31:23.029] length <- base::length [13:31:23.029] list <- base::list [13:31:23.029] seq.int <- base::seq.int [13:31:23.029] signalCondition <- base::signalCondition [13:31:23.029] sys.calls <- base::sys.calls [13:31:23.029] `[[` <- base::`[[` [13:31:23.029] `+` <- base::`+` [13:31:23.029] `<<-` <- base::`<<-` [13:31:23.029] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:31:23.029] calls[seq.int(from = from + 12L, to = length(calls) - [13:31:23.029] 3L)] [13:31:23.029] } [13:31:23.029] function(cond) { [13:31:23.029] is_error <- inherits(cond, "error") [13:31:23.029] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:31:23.029] NULL) [13:31:23.029] if (is_error) { [13:31:23.029] sessionInformation <- function() { [13:31:23.029] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:31:23.029] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:31:23.029] search = base::search(), system = base::Sys.info()) [13:31:23.029] } [13:31:23.029] ...future.conditions[[length(...future.conditions) + [13:31:23.029] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:31:23.029] cond$call), session = sessionInformation(), [13:31:23.029] timestamp = base::Sys.time(), signaled = 0L) [13:31:23.029] signalCondition(cond) [13:31:23.029] } [13:31:23.029] else if (!ignore && TRUE && inherits(cond, "condition")) { [13:31:23.029] signal <- FALSE && inherits(cond, character(0)) [13:31:23.029] ...future.conditions[[length(...future.conditions) + [13:31:23.029] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:31:23.029] if (FALSE && !signal) { [13:31:23.029] muffleCondition <- function (cond, pattern = "^muffle") [13:31:23.029] { [13:31:23.029] inherits <- base::inherits [13:31:23.029] invokeRestart <- base::invokeRestart [13:31:23.029] is.null <- base::is.null [13:31:23.029] muffled <- FALSE [13:31:23.029] if (inherits(cond, "message")) { [13:31:23.029] muffled <- grepl(pattern, "muffleMessage") [13:31:23.029] if (muffled) [13:31:23.029] invokeRestart("muffleMessage") [13:31:23.029] } [13:31:23.029] else if (inherits(cond, "warning")) { [13:31:23.029] muffled <- grepl(pattern, "muffleWarning") [13:31:23.029] if (muffled) [13:31:23.029] invokeRestart("muffleWarning") [13:31:23.029] } [13:31:23.029] else if (inherits(cond, "condition")) { [13:31:23.029] if (!is.null(pattern)) { [13:31:23.029] computeRestarts <- base::computeRestarts [13:31:23.029] grepl <- base::grepl [13:31:23.029] restarts <- computeRestarts(cond) [13:31:23.029] for (restart in restarts) { [13:31:23.029] name <- restart$name [13:31:23.029] if (is.null(name)) [13:31:23.029] next [13:31:23.029] if (!grepl(pattern, name)) [13:31:23.029] next [13:31:23.029] invokeRestart(restart) [13:31:23.029] muffled <- TRUE [13:31:23.029] break [13:31:23.029] } [13:31:23.029] } [13:31:23.029] } [13:31:23.029] invisible(muffled) [13:31:23.029] } [13:31:23.029] muffleCondition(cond, pattern = "^muffle") [13:31:23.029] } [13:31:23.029] } [13:31:23.029] else { [13:31:23.029] if (TRUE) { [13:31:23.029] muffleCondition <- function (cond, pattern = "^muffle") [13:31:23.029] { [13:31:23.029] inherits <- base::inherits [13:31:23.029] invokeRestart <- base::invokeRestart [13:31:23.029] is.null <- base::is.null [13:31:23.029] muffled <- FALSE [13:31:23.029] if (inherits(cond, "message")) { [13:31:23.029] muffled <- grepl(pattern, "muffleMessage") [13:31:23.029] if (muffled) [13:31:23.029] invokeRestart("muffleMessage") [13:31:23.029] } [13:31:23.029] else if (inherits(cond, "warning")) { [13:31:23.029] muffled <- grepl(pattern, "muffleWarning") [13:31:23.029] if (muffled) [13:31:23.029] invokeRestart("muffleWarning") [13:31:23.029] } [13:31:23.029] else if (inherits(cond, "condition")) { [13:31:23.029] if (!is.null(pattern)) { [13:31:23.029] computeRestarts <- base::computeRestarts [13:31:23.029] grepl <- base::grepl [13:31:23.029] restarts <- computeRestarts(cond) [13:31:23.029] for (restart in restarts) { [13:31:23.029] name <- restart$name [13:31:23.029] if (is.null(name)) [13:31:23.029] next [13:31:23.029] if (!grepl(pattern, name)) [13:31:23.029] next [13:31:23.029] invokeRestart(restart) [13:31:23.029] muffled <- TRUE [13:31:23.029] break [13:31:23.029] } [13:31:23.029] } [13:31:23.029] } [13:31:23.029] invisible(muffled) [13:31:23.029] } [13:31:23.029] muffleCondition(cond, pattern = "^muffle") [13:31:23.029] } [13:31:23.029] } [13:31:23.029] } [13:31:23.029] })) [13:31:23.029] }, error = function(ex) { [13:31:23.029] base::structure(base::list(value = NULL, visible = NULL, [13:31:23.029] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:31:23.029] ...future.rng), started = ...future.startTime, [13:31:23.029] finished = Sys.time(), session_uuid = NA_character_, [13:31:23.029] version = "1.8"), class = "FutureResult") [13:31:23.029] }, finally = { [13:31:23.029] if (!identical(...future.workdir, getwd())) [13:31:23.029] setwd(...future.workdir) [13:31:23.029] { [13:31:23.029] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:31:23.029] ...future.oldOptions$nwarnings <- NULL [13:31:23.029] } [13:31:23.029] base::options(...future.oldOptions) [13:31:23.029] if (.Platform$OS.type == "windows") { [13:31:23.029] old_names <- names(...future.oldEnvVars) [13:31:23.029] envs <- base::Sys.getenv() [13:31:23.029] names <- names(envs) [13:31:23.029] common <- intersect(names, old_names) [13:31:23.029] added <- setdiff(names, old_names) [13:31:23.029] removed <- setdiff(old_names, names) [13:31:23.029] changed <- common[...future.oldEnvVars[common] != [13:31:23.029] envs[common]] [13:31:23.029] NAMES <- toupper(changed) [13:31:23.029] args <- list() [13:31:23.029] for (kk in seq_along(NAMES)) { [13:31:23.029] name <- changed[[kk]] [13:31:23.029] NAME <- NAMES[[kk]] [13:31:23.029] if (name != NAME && is.element(NAME, old_names)) [13:31:23.029] next [13:31:23.029] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:23.029] } [13:31:23.029] NAMES <- toupper(added) [13:31:23.029] for (kk in seq_along(NAMES)) { [13:31:23.029] name <- added[[kk]] [13:31:23.029] NAME <- NAMES[[kk]] [13:31:23.029] if (name != NAME && is.element(NAME, old_names)) [13:31:23.029] next [13:31:23.029] args[[name]] <- "" [13:31:23.029] } [13:31:23.029] NAMES <- toupper(removed) [13:31:23.029] for (kk in seq_along(NAMES)) { [13:31:23.029] name <- removed[[kk]] [13:31:23.029] NAME <- NAMES[[kk]] [13:31:23.029] if (name != NAME && is.element(NAME, old_names)) [13:31:23.029] next [13:31:23.029] args[[name]] <- ...future.oldEnvVars[[name]] [13:31:23.029] } [13:31:23.029] if (length(args) > 0) [13:31:23.029] base::do.call(base::Sys.setenv, args = args) [13:31:23.029] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:31:23.029] } [13:31:23.029] else { [13:31:23.029] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:31:23.029] } [13:31:23.029] { [13:31:23.029] if (base::length(...future.futureOptionsAdded) > [13:31:23.029] 0L) { [13:31:23.029] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:31:23.029] base::names(opts) <- ...future.futureOptionsAdded [13:31:23.029] base::options(opts) [13:31:23.029] } [13:31:23.029] { [13:31:23.029] NULL [13:31:23.029] options(future.plan = NULL) [13:31:23.029] if (is.na(NA_character_)) [13:31:23.029] Sys.unsetenv("R_FUTURE_PLAN") [13:31:23.029] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:31:23.029] future::plan(...future.strategy.old, .cleanup = FALSE, [13:31:23.029] .init = FALSE) [13:31:23.029] } [13:31:23.029] } [13:31:23.029] } [13:31:23.029] }) [13:31:23.029] if (TRUE) { [13:31:23.029] base::sink(type = "output", split = FALSE) [13:31:23.029] if (TRUE) { [13:31:23.029] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:31:23.029] } [13:31:23.029] else { [13:31:23.029] ...future.result["stdout"] <- base::list(NULL) [13:31:23.029] } [13:31:23.029] base::close(...future.stdout) [13:31:23.029] ...future.stdout <- NULL [13:31:23.029] } [13:31:23.029] ...future.result$conditions <- ...future.conditions [13:31:23.029] ...future.result$finished <- base::Sys.time() [13:31:23.029] ...future.result [13:31:23.029] } [13:31:23.032] - Launch lazy future ... done [13:31:23.032] run() for 'MiraiFuture' ... done [13:31:23.033] Created future: [13:31:23.033] resolved() for 'MiraiFuture' ... [13:31:23.034] - state: 'running' [13:31:23.034] - run: TRUE [13:31:23.034] - result: 'NULL' [13:31:23.034] - resolved: FALSE [13:31:23.034] resolved() for 'MiraiFuture' ... done [13:31:23.033] MiraiFuture: [13:31:23.033] Label: 'future_lapply-1' [13:31:23.033] Expression: [13:31:23.033] { [13:31:23.033] do.call(function(...) { [13:31:23.033] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:31:23.033] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:31:23.033] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:31:23.033] on.exit(options(oopts), add = TRUE) [13:31:23.033] } [13:31:23.033] { [13:31:23.033] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:31:23.033] ...future.X_jj <- ...future.elements_ii[[jj]] [13:31:23.033] ...future.FUN(...future.X_jj, ...) [13:31:23.033] }) [13:31:23.033] } [13:31:23.033] }, args = future.call.arguments) [13:31:23.033] } [13:31:23.033] Lazy evaluation: FALSE [13:31:23.033] Asynchronous evaluation: TRUE [13:31:23.033] Local evaluation: TRUE [13:31:23.033] Environment: R_GlobalEnv [13:31:23.033] Capture standard output: TRUE [13:31:23.033] Capture condition classes: 'condition' (excluding 'nothing') [13:31:23.033] Globals: 5 objects totaling 560 bytes (function '...future.FUN' of 448 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:31:23.033] Packages: 1 packages ('tools') [13:31:23.033] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:31:23.033] Resolved: FALSE [13:31:23.033] Value: [13:31:23.033] Conditions captured: [13:31:23.033] Early signaling: FALSE [13:31:23.033] Owner process: 00ed0708-b5b6-98ac-fe7a-65299776efe5 [13:31:23.033] Class: 'MiraiFuture', 'MultiprocessFuture', 'Future', 'environment' [13:31:23.035] Chunk #1 of 1 ... DONE [13:31:23.035] Launching 1 futures (chunks) ... DONE [13:31:23.035] Resolving 1 futures (chunks) ... [13:31:23.035] resolve() on list ... [13:31:23.035] recursive: 0 [13:31:23.035] length: 1 [13:31:23.035] [13:31:23.035] resolved() for 'MiraiFuture' ... [13:31:23.036] - state: 'running' [13:31:23.036] - run: TRUE [13:31:23.036] - result: 'NULL' [13:31:23.036] - resolved: FALSE [13:31:23.036] resolved() for 'MiraiFuture' ... done [13:31:23.057] resolved() for 'MiraiFuture' ... [13:31:23.057] - state: 'running' [13:31:23.057] - run: TRUE [13:31:23.057] - result: 'NULL' [13:31:23.057] - resolved: FALSE [13:31:23.058] resolved() for 'MiraiFuture' ... done [13:31:23.058] Future #1 [13:31:23.058] signalConditionsASAP(MiraiFuture, pos=1) ... [13:31:23.058] - nx: 1 [13:31:23.058] - relay: TRUE [13:31:23.058] - stdout: TRUE [13:31:23.059] - signal: TRUE [13:31:23.059] - resignal: FALSE [13:31:23.059] - force: TRUE [13:31:23.059] - relayed: [n=1] FALSE [13:31:23.059] - queued futures: [n=1] FALSE [13:31:23.059] - until=1 [13:31:23.059] - relaying element #1 [13:31:23.059] - relayed: [n=1] TRUE [13:31:23.060] - queued futures: [n=1] TRUE [13:31:23.060] signalConditionsASAP(MiraiFuture, pos=1) ... done [13:31:23.060] length: 0 (resolved future 1) [13:31:23.060] Relaying remaining futures [13:31:23.060] signalConditionsASAP(NULL, pos=0) ... [13:31:23.060] - nx: 1 [13:31:23.060] - relay: TRUE [13:31:23.061] - stdout: TRUE [13:31:23.061] - signal: TRUE [13:31:23.061] - resignal: FALSE [13:31:23.061] - force: TRUE [13:31:23.061] - relayed: [n=1] TRUE [13:31:23.061] - queued futures: [n=1] TRUE - flush all [13:31:23.061] - relayed: [n=1] TRUE [13:31:23.062] - queued futures: [n=1] TRUE [13:31:23.062] signalConditionsASAP(NULL, pos=0) ... done [13:31:23.062] resolve() on list ... DONE [13:31:23.062] - Number of value chunks collected: 1 [13:31:23.062] Resolving 1 futures (chunks) ... DONE [13:31:23.062] Reducing values from 1 chunks ... [13:31:23.063] - Number of values collected after concatenation: 1 [13:31:23.063] - Number of values expected: 1 [13:31:23.063] Reducing values from 1 chunks ... DONE [13:31:23.063] future_lapply() ... DONE *** future_lapply() ... DONE > > proc.time() user system elapsed 6.57 0.40 7.51