LucyMcGowan / writing-positivity-continous-ps

0 stars 0 forks source link

Weird targets error #7

Open LucyMcGowan opened 1 year ago

LucyMcGowan commented 1 year ago

@malcolmbarrett I get this weird error when I run targets::tar_make() -- I installed the latest versions of the packages listed in the DESCRIPTION so I don't think it's that 🤔 have you seen anything like this?

✔ skip target parameters
• start target data_path
-
 *** caught illegal operation ***
address 0x11623ac1f, cause 'illegal opcode'
\
Traceback:
 1: Array__GetScalar(Array$create(x, type = type), 0)
 2: Scalar$create(object)
 3: FUN(X[[i]], ...)
 4: lapply(arrays[is_scalar], repeat_value_as_array, max_array_len)
 5: recycle_scalars(dots)
 6: arrow_table(y = .y, x = .x, c = .c, n = .n, a = .a, b = .b, p = .p,     id = .id)
 7: .f(.n = .l[[1L]][[i]], .a = .l[[2L]][[i]], .b = .l[[3L]][[i]],     .p = .l[[4L]][[i]], .id = .l[[5L]][[i]], ...)
 8: pmap(parameters, simulate_data)
 9: simulate_arrow_dataset(parameters)
10: eval(expr = expr, envir = envir)
11: eval(expr = expr, envir = envir)
12: build_eval_fce17be7(expr, envir)
13: with_preserve_seed({    set_seed(list(seed = seed, rng_kind = rng_kind))    code})
14: withr::with_seed(seed, build_eval_fce17be7(expr, envir))
15: if_any(anyNA(seed), build_eval_fce17be7(expr, envir), withr::with_seed(seed,     build_eval_fce17be7(expr, envir)))
16: force(code)
17: withr::with_dir(getwd(), if_any(anyNA(seed), build_eval_fce17be7(expr,     envir), withr::with_seed(seed, build_eval_fce17be7(expr,     envir))))
18: build_run_expr(expr, envir, seed, packages, library)
19: withCallingHandlers(build_run_expr(expr, envir, seed, packages,     library), error = capture_error, warning = capture_warning,     tar_condition_cancel = capture_cancel)
20: doTryCatch(return(expr), name, parentenv, handler)
21: tryCatchOne(expr, names, parentenv, handlers[[1L]])
22: tryCatchList(expr, classes, parentenv, handlers)
23: tryCatch(withCallingHandlers(build_run_expr(expr, envir, seed,     packages, library), error = capture_error, warning = capture_warning,     tar_condition_cancel = capture_cancel), error = function(condition) {})
24: build_init(expr = command$expr, envir = envir, seed = command$seed,     packages = command$packages, library = command$library)
25: command_produce_build(target$command, envir)
26: builder_update_build(target, frames_get_envir(frames))
27: target_run.tar_builder(target = target, envir = self$envir, path_store = self$meta$get_path_store())
un(target = target, envir = self$envir, path_store = self$meta$get_path_store())
29: self$run_target(name)
30: if_any(target_should_run(target, self$meta), self$run_target(name),     self$skip_target(target))
31: self$process_target(self$scheduler$queue$dequeue())
32: self$process_next()
33: local_init(pipeline = pipeline, meta = meta_init(path_store = path_store),     names = names, shortcut = shortcut, queue = queue, reporter = reporter,     envir = tar_option_get("envir"))$run()
34: (function (pipeline, path_store, names_quosure, shortcut, reporter) {    pipeline_reset_deployments(pipeline)    names <- tar_tidyselect_eval(names_quosure, pipeline_get_names(pipeline))    queue <- if_any(pipeline_uses_priorities(pipeline), "parallel",         "sequential")    local_init(pipeline = pipeline, meta = meta_init(path_store = path_store),         names = names, shortcut = shortcut, queue = queue, reporter = reporter,         envir = tar_option_get("envir"))$run()    invisible()})(path_store = "_targets", names_quosure = ~NULL, shortcut = FALSE,     reporter = "verbose", pipeline = <environment>)
35: do.call(targets_function, targets_arguments)
36: targets::tar_callr_inner_try(targets_function = targets_function,     targets_arguments = targets_arguments, options = options,     envir = envir, parent = parent, script = script, store = store,     fun = fun)
37: doTryCatch(return(expr), name, parentenv, handler)
38: tryCatchOne(expr, names, parentenv, handlers[[1L]])
39: tryCatchList(expr, classes, parentenv, handlers)
40: tryCatch(targets::tar_callr_inner_try(targets_function = targets_function,     targets_arguments = targets_arguments, options = options,     envir = envir, parent = parent, script = script, store = store,     fun = fun), error = function(condition) condition)
n = targets_function,         targets_arguments = targets_arguments, options = options,         envir = envir, parent = parent, script = script, store = store,         fun = fun), error = function(condition) condition)})(targets_function = base::quote(function (pipeline, path_store,     names_quosure, shortcut, reporter) {    pipeline_reset_deployments(pipeline)    names <- tar_tidyselect_eval(names_quosure, pipeline_get_names(pipeline))    queue <- if_any(pipeline_uses_priorities(pipeline), "parallel",         "sequential")    local_init(pipeline = pipeline, meta = meta_init(path_store = path_store),         names = names, shortcut = shortcut, queue = queue, reporter = reporter,         envir = tar_option_get("envir"))$run()    invisible()}), targets_arguments = base::quote(list(path_store = "_targets",     names_quosure = ~NULL, shortcut = FALSE, reporter = "verbose")),     options = base::quote(list(crayon.enabled = TRUE)), script = base::quote("_targets.R"),     store = base::quote("_targets"), fun = base::quote("tar_make"))
         "sequential")    local_init(pipeline = pipeline, meta = meta_init(path_store = path_store),         names = names, shortcut = shortcut, queue = queue, reporter = reporter,         envir = tar_option_get("envir"))$run()    invisible()}, targets_arguments = list(path_store = "_targets", names_quosure = ~NULL,     shortcut = FALSE, reporter = "verbose"), options = list(crayon.enabled = TRUE),     script = "_targets.R", store = "_targets", fun = "tar_make")),     envir = base::quote(<environment>), quote = base::quote(TRUE))  envir = envir, parent = parent, script = script, store = store,         fun = fun), error = function(condition) condition)}), base::quote(list(targets_function = function (pipeline, path_store,     names_quosure, shortcut, reporter) {    pipeline_reset_deployments(pipeline)    names <- tar_tidyselect_eval(names_quosure, pipeline_get_names(pipeline))    queue <- if_any(pipeline_uses_priorities(pipeline), "parallel",
43: do.call(do.call, c(readRDS("/var/folders/mr/lk15_b411zb85y6q_wwbd_k00000gn/T//Rtmpc7DfkZ/callr-fun-15a2837419ef7"),     list(envir = .GlobalEnv, quote = TRUE)), envir = .GlobalEnv,     quote = TRUE)
44: saveRDS(do.call(do.call, c(readRDS("/var/folders/mr/lk15_b411zb85y6q_wwbd_k00000gn/T//Rtmpc7DfkZ/callr-fun-15a2837419ef7"),     list(envir = .GlobalEnv, quote = TRUE)), envir = .GlobalEnv,     quote = TRUE), file = "/var/folders/mr/lk15_b411zb85y6q_wwbd_k00000gn/T//Rtmpc7DfkZ/callr-res-15a28352b8678")
error <- e        calls <- sys.calls()        dcframe <- which(vapply(calls, function(x) length(x) >=             1 && identical(x[[1]], quote(do.call)), logical(1)))[1]        if (!is.na(dcframe))             e2$`_ignore` <- list(c(1, dcframe + 1L))        e2$`_pid` <- Sys.getpid()        e2$`_timestamp` <- Sys.time()        if (inherits(e, "rlib_error_2_0"))             e2$parent <- e$parent        e2 <- err$add_trace_back(e2, embed = FALSE)        saveRDS(list("error", e2), file = paste0("/var/folders/mr/lk15_b411zb85y6q_wwbd_k00000gn/T//Rtmpc7DfkZ/callr-res-15a28352b8678",             ".error"))    }}, interrupt = function(e) {    {        callr_data <- as.environment("tools:callr")$`__callr_data__`        err <- callr_data$err        assign(".Traceback", .traceback(4), envir = callr_data)        dump.frames("__callr_dump__")        assign(".Last.dump", .GlobalEnv$`__callr_dump__`, envir = callr_data)        rm("__callr_dump__", envir = .GlobalEnv)        e$call <- deparse(conditionCall(e), nlines = 6)        e2 <- err$new_error(conditionMessage(e), call. = conditionCall(e))        class(e2) <- c("callr_remote_error", class(e2))        e2$error <- e        calls <- sys.calls()        dcframe <- which(vapply(calls, function(x) length(x) >=             1 && identical(x[[1]], quote(do.call)), logical(1)))[1]        if (!is.na(dcframe))             e2$`_ignore` <- list(c(1, dcframe + 1L))        e2$`_pid` <- Sys.getpid()        e2$`_timestamp` <- Sys.time()        if (inherits(e, "rlib_error_2_0"))             e2$parent <- e$parent        e2 <- err$add_trace_back(e2, embed = FALSE)        saveRDS(list("error", e2), file = paste0("/var/folders/mr/lk15_b411zb85y6q_wwbd_k00000gn/T//Rtmpc7DfkZ/callr-res-15a28352b8678",             ".error"))    }}, callr_message = function(e) {    try(signalCondition(e))})
46: doTryCatch(return(expr), name, parentenv, handler)
47: tryCatchOne(expr, names, parentenv, handlers[[1L]])
48: tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
49: doTryCatch(return(expr), name, parentenv, handler)
50: tryCatchOne(tryCatchList(expr, names[-nh], parentenv, handlers[-nh]),     names[nh], parentenv, handlers[[nh]])
51: tryCatchList(expr, classes, parentenv, handlers)
52: tryCatch(withCallingHandlers({    NULL    saveRDS(do.call(do.call, c(readRDS("/var/folders/mr/lk15_b411zb85y6q_wwbd_k00000gn/T//Rtmpc7DfkZ/callr-fun-15a2837419ef7"),         list(envir = .GlobalEnv, quote = TRUE)), envir = .GlobalEnv,         quote = TRUE), file = "/var/folders/mr/lk15_b411zb85y6q_wwbd_k00000gn/T//Rtmpc7DfkZ/callr-res-15a28352b8678")    flush(stdout())    flush(stderr())    NULL    invisible()}, error = function(e) {    {        callr_data <- as.environment("tools:callr")$`__callr_data__`        err <- callr_data$err        assign(".Traceback", .traceback(4), envir = callr_data)        dump.frames("__callr_dump__")        assign(".Last.dump", .GlobalEnv$`__callr_dump__`, envir = callr_data)        rm("__callr_dump__", envir = .GlobalEnv)        e$call <- deparse(conditionCall(e), nlines = 6)        e2 <- err$new_error(conditionMessage(e), call. = conditionCall(e))        class(e2) <- c("callr_remote_error", class(e2))        e2$error <- e        calls <- sys.calls()        dcframe <- which(vapply(calls, function(x) length(x) >=             1 && identical(x[[1]], quote(do.call)), logical(1)))[1]        if (!is.na(dcframe))             e2$`_ignore` <- list(c(1, dcframe + 1L))        e2$`_pid` <- Sys.getpid()        e2$`_timestamp` <- Sys.time()        if (inherits(e, "rlib_error_2_0"))             e2$parent <- e$parent        e2 <- err$add_trace_back(e2, embed = FALSE)        saveRDS(list("error", e2), file = paste0("/var/folders/mr/lk15_b411zb85y6q_wwbd_k00000gn/T//Rtmpc7DfkZ/callr-res-15a28352b8678",             ".error"))    }}, interrupt = function(e) {    {        callr_data <- as.environment("tools:callr")$`__callr_data__`        err <- callr_data$err        assign(".Traceback", .traceback(4), envir = callr_data)        dump.frames("__callr_dump__")        assign(".Last.dump", .GlobalEnv$`__callr_dump__`, envir = callr_data)        rm("__callr_dump__", envir = .GlobalEnv)        e$call <- deparse(conditionCall(e), nlines = 6)        e2 <- err$new_error(conditionMessage(e), call. = conditionCall(e))        class(e2) <- c("callr_remote_error", class(e2))        e2$error <- e        calls <- sys.calls()        dcframe <- which(vapply(calls, function(x) length(x) >=             1 && identical(x[[1]], quote(do.call)), logical(1)))[1]        if (!is.na(dcframe))             e2$`_ignore` <- list(c(1, dcframe + 1L))        e2$`_pid` <- Sys.getpid()        e2$`_timestamp` <- Sys.time()        if (inherits(e, "rlib_error_2_0"))             e2$parent <- e$parent        e2 <- err$add_trace_back(e2, embed = FALSE)        saveRDS(list("error", e2), file = paste0("/var/folders/mr/lk15_b411zb85y6q_wwbd_k00000gn/T//Rtmpc7DfkZ/callr-res-15a28352b8678",             ".error"))    }}, callr_message = function(e) {    try(signalCondition(e))}), error = function(e) {    NULL    try(stop(e))}, interrupt = function(e) {    NULL    e})
An irrecoverable exception occurred. R is aborting now ...
Error in get_result(output = out, options) : 
  callr subprocess failed: could not start R, exited with non-zero status, has crashed or was killed
Type .Last.error.trace to see where the error occurred
malcolmbarrett commented 1 year ago

Whoa! Definitely not. But this is an arrow error. Maybe try installing the dev version?