CRAN Package Check Results for Package logitr

Last updated on 2025-12-06 00:48:47 CET.

Flavor Version Tinstall Tcheck Ttotal Status Flags
r-devel-linux-x86_64-debian-clang 1.1.3 4.55 149.72 154.27 OK
r-devel-linux-x86_64-debian-gcc 1.1.3 3.52 59.19 62.71 WARN
r-devel-linux-x86_64-fedora-clang 1.1.3 10.00 230.13 240.13 OK
r-devel-linux-x86_64-fedora-gcc 1.1.3 10.00 244.67 254.67 OK
r-devel-windows-x86_64 1.1.3 8.00 202.00 210.00 OK
r-patched-linux-x86_64 1.1.3 6.06 140.71 146.77 OK
r-release-linux-x86_64 1.1.3 5.05 144.50 149.55 OK
r-release-macos-arm64 1.1.3 1.00 46.00 47.00 ERROR
r-release-macos-x86_64 1.1.3 5.00 178.00 183.00 OK
r-release-windows-x86_64 1.1.3 8.00 199.00 207.00 OK
r-oldrel-macos-arm64 1.1.3 1.00 51.00 52.00 OK
r-oldrel-macos-x86_64 1.1.3 7.00 202.00 209.00 OK
r-oldrel-windows-x86_64 1.1.3 10.00 260.00 270.00 OK

Check Details

Version: 1.1.3
Check: package dependencies
Result: WARN Cannot process vignettes Packages suggested but not available for checking: 'apollo', 'ggrepel', 'gtsummary', 'kableExtra', 'knitr', 'mixl', 'rmarkdown' VignetteBuilder package required for checking but not installed: ‘knitr’ Flavor: r-devel-linux-x86_64-debian-gcc

Version: 1.1.3
Check: package vignettes
Result: NOTE Package has ‘vignettes’ subdirectory but apparently no vignettes. Perhaps the ‘VignetteBuilder’ information is missing from the DESCRIPTION file? Flavor: r-devel-linux-x86_64-debian-gcc

Version: 1.1.3
Check: examples
Result: ERROR Running examples in ‘logitr-Ex.R’ failed The error most likely occurred in: > ### Name: logitr > ### Title: The main function for estimating logit models > ### Aliases: logitr > ### Keywords: logit logitr mixed mnl mxl willingness-to-pay wtp > > ### ** Examples > > # For more detailed examples, visit > # https://jhelvy.github.io/logitr/articles/ > > library(logitr) > > # Estimate a MNL model in the Preference space > mnl_pref <- logitr( + data = yogurt, + outcome = "choice", + obsID = "obsID", + pars = c("price", "feat", "brand") + ) Running model... Done! > > # Estimate a MNL model in the WTP space, using a 5-run multistart > mnl_wtp <- logitr( + data = yogurt, + outcome = "choice", + obsID = "obsID", + pars = c("feat", "brand"), + scalePar = "price", + numMultiStarts = 5 + ) Running multistart... Random starting point iterations: 5 Number of cores: 15 *** caught segfault *** address 0x110, cause 'invalid permissions' Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 5) An irrecoverable exception occurred. R is aborting now ... *** caught segfault *** address 0x110, cause 'invalid permissions' Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) *** caught segfault *** address 0x110, cause 'invalid permissions' 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { *** caught segfault *** cat(msg, file = outFile)address 0x110, cause 'invalid permissions' .Internal(printDeferredWarnings()) *** caught segfault *** address 0x110, cause 'invalid permissions' } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 5) An irrecoverable exception occurred. R is aborting now ... Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 5) Traceback: Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, An irrecoverable exception occurred. R is aborting now ... mi = mi, opts = mi$options) 1: 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]])tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e)) call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]]}) w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 5) An irrecoverable exception occurred. R is aborting now ... lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 5) An irrecoverable exception occurred. R is aborting now ... Error in names(x) <- value : 'names' attribute [3] must be the same length as the vector [0] Calls: logitr -> getMultistartSummary -> colnames<- Execution halted Flavor: r-release-macos-arm64

Version: 1.1.3
Check: re-building of vignette outputs
Result: ERROR Error(s) in re-building vignettes: --- re-building ‘basic_usage.Rmd’ using rmarkdown *** caught segfault *** address 0x110, cause 'invalid permissions' *** caught segfault *** address 0x110, cause 'invalid permissions' *** caught segfault *** address 0x110, cause 'invalid permissions' Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) Traceback: 1: 2: eval_f(x0, ...) Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler)eval_f(x0, ...) 3: 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, 5: mi = mi, opts = mi$options)tryCatchOne(expr, names, parentenv, handlers[[1L]]) 4: doTryCatch(return(expr), name, parentenv, handler) 5: 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({tryCatchOne(expr, names, parentenv, handlers[[1L]]) *** caught segfault *** address 0x110, cause 'invalid permissions' result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) mi = mi, opts = mi$options) }, error = function(e) { mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model}) 4: 8: system.time({ model <- mi$model result <- NULL result <- NULL tryCatch({ tryCatch({doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { 9: 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: FUN(X[[i]], ...) model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) {system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$message <- result$message }}) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler)FUN(X[[i]], ...) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L)14: tryCatch(expr, error = function(e) { dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], Traceback: call <- conditionCall(e)10: if (!is.null(call)) {lapply(X = S, FUN = FUN, ...) 1: if (identical(call[[1L]], quote(doTryCatch))) type = "b") call <- sys.call(-4L)mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) 11: doTryCatch(return(expr), name, parentenv, handler) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], 2: type = "b") if (w > LONG) if (w > LONG) *** caught segfault *** 12: prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) tryCatchOne(expr, names, parentenv, handlers[[1L]]) *** caught segfault *** address 0x110, cause 'invalid permissions' *** caught segfault *** eval_f(x0, ...) prefix <- paste0(prefix, "\n ") 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ")address 0x110, cause 'invalid permissions' address 0x110, cause 'invalid permissions' } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) {19: cat(msg, file = outFile)parallel::mclapply(miList, runModel, mc.cores = numCores) .Internal(printDeferredWarnings()) 3: }20: LONG <- 75LwithCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: sm <- strsplit(conditionMessage(e), "\n")[[1L]]suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") invisible(structure(msg, class = "try-error", condition = e)) if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: }) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE)nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, runMultistart(modelInputs) type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } *** caught segfault *** else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile)address 0x110, cause 'invalid permissions' mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) .Internal(printDeferredWarnings()) }25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", invisible(structure(msg, class = "try-error", condition = e)) "brand"), scalePar = "price", numMultiStarts = 10)}) 6: 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: 26: tryCatchList(expr, classes, parentenv, handlers)FUN(X[[i]], ...) 15: 7: try(lapply(X = S, FUN = FUN, ...), silent = TRUE)eval(expr, envir)18: 16: lapply(seq_len(cores), inner.do) 27: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE))19: tryCatch({ 17: FUN(X[[i]], ...)eval(expr, envir) result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)parallel::mclapply(miList, runModel, mc.cores = numCores) 28: 20: }, error = function(e) {withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd)18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores)withCallingHandlers(expr, warning = function(w) if (inherits(w, Traceback: classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 1: }) 20: 25: withCallingHandlers(expr, warning = function(w) if (inherits(w, }logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) "brand"), scalePar = "price", numMultiStarts = 10) if (on_message$silence) {22: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar)withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) Traceback: 8: invokeRestart("muffleMessage")system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } 2: Traceback: eval_f(x0, ...) 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: 26: 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, Traceback: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler)eval(expr, envir) 1: }27: 1: })eval(expr, envir)23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 9: 5: watcher$capture_plot_and_output()mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$modeltryCatchOne(expr, names, parentenv, handlers[[1L]]) 24: runMultistart(modelInputs) mi$logitFuncs$getMnlV(pars, d$X, d$scalePar)28: 25: if (on_warning$capture) {FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", tryCatchList(expr, classes, parentenv, handlers) cnd <- sanitize_call(cnd)withVisible(eval(expr, envir)) "brand"), scalePar = "price", numMultiStarts = 10) mi = mi, opts = mi$options) 6: result <- NULL 2: tryCatchList(expr, classes, parentenv, handlers) watcher$push(cnd)14: 26: 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } tryCatch({tryCatch(expr, error = function(e) { eval(expr, envir)eval_f(x0, ...) *** caught segfault *** 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL 7: } call <- conditionCall(e) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) tryCatch({ *** caught segfault *** address 0x110, cause 'invalid permissions' result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) {address 0x110, cause 'invalid permissions' if (!is.null(call)) { 5: if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) mi = mi, opts = mi$options) }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message 7: if (on_warning$silence) { invokeRestart("muffleWarning") tryCatch({}, error = function(e) {}) if (on_message$silence) { w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, 29: mi = mi, opts = mi$options) 8: if (is.na(w)) tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, invokeRestart("muffleMessage") }, error = function(e) { }) } } w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], }) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) mi = mi, opts = mi$options)11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: system.time({withCallingHandlers(code, message = function (cnd) } if (!is.null(result)) { Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function (cnd) { model$fail <- FALSE model$coefficients <- result$solution{ model <- mi$model watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), Traceback: result <- NULL tryCatch({}, warning = function (cnd) model$logLik <- as.numeric(-1 * result$objective) watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd){ 1: 4: tryCatch(expr, error = function(e) { result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, type = "b") mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective)}, error = function(e) { if (getOption("warn") >= 2 || getOption("warn") < 0) {doTryCatch(return(expr), name, parentenv, handler) call <- conditionCall(e) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ watcher$push(cnd)}) stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) if (w > LONG) if (!is.null(call)) { return() if (options$error && options$include) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, }mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 8: if (identical(call[[1L]], quote(doTryCatch))) 0L prefix <- paste0(prefix, "\n ") model$iterations <- result$iterations } mi = mi, opts = mi$options) dcall <- deparse(call, nlines = 1L) model$status <- result$status if (on_warning$silence) { call <- sys.call(-4L) prefix <- paste("Error in", dcall, ": ") 2: model$message <- result$messageeval_f(x0, ...) dcall <- deparse(call, nlines = 1L) watcher$capture_plot_and_output() invokeRestart("muffleWarning") if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) }}, error = function(e) { } 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, else 2L watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: }, output_handler = knit_handlers(options$render, options)))}) prefix <- paste("Error in", dcall, ": ") mi = mi, opts = mi$options) LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 9: }) } else prefix <- "Error : " LONG <- 75LFUN(X[[i]], ...)doWithOneRestart(return(expr), restart)44: system.time({ }, error = function (cnd) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) sm <- strsplit(conditionMessage(e), "\n")[[1L]] model <- mi$model msg <- paste0(prefix, conditionMessage(e), "\n") { result <- NULL w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) 8: 10: eng_r(options)system.time({37: .Internal(seterrmessage(msg[1L])) 6: watcher$capture_plot_and_output() if (!silent && isTRUE(getOption("show.error.messages"))) { model <- mi$model tryCatch({ prefix <- paste0(prefix, "\n ")tryCatchList(expr, classes, parentenv, handlers)24: cat(msg, file = outFile) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) } result <- NULLlapply(X = S, FUN = FUN, ...) cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) else prefix <- "Error : "withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts)15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 45: 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir))block_exec(params) 16: 30: msg <- paste0(prefix, conditionMessage(e), "\n")11: if (!is.null(call)) {doTryCatch(return(expr), name, parentenv, handler) .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile)sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) watcher$capture_plot_and_output() result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message } if (identical(call[[1L]], quote(doTryCatch))) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: .Internal(printDeferredWarnings()) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b")17: runMultistart(modelInputs) tryCatch({tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: }})tryCatchList(expr, classes, parentenv, handlers) watcher$print_value(ev$value, ev$visible, envir)eval(call) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc)12: result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, FUN(X[[i]], ...) 31: eval(call) 32: setwd(startdir)tryCatchOne(expr, names, parentenv, handlers[[1L]]) if (w > LONG) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L 25: mi = mi, opts = mi$options) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L]))with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) invisible(structure(msg, class = "try-error", condition = e)) }}) sm <- strsplit(conditionMessage(e), "\n")[[1L]] TRUE output <- find_vignette_product(name, by = "weave", engine = engine)15: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: }, error = function(e) { if (!have.makefile && vignette_is_tex(output)) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message "brand"), scalePar = "price", numMultiStarts = 10) 15: 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) texi2pdf(file = output, clean = FALSE, quiet = quiet)39: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))try(lapply(X = S, FUN = FUN, ...), silent = TRUE) w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w")}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings())18: lapply(seq_len(cores), inner.do)26: } } withRestarts(with_handlers({ output <- find_vignette_product(name, by = "texi2pdf", }) 9: FUN(X[[i]], ...) 10: eval(expr, envir) for (expr in tle$exprs) { invisible(structure(msg, class = "try-error", condition = e)) engine = engine) ev <- withVisible(eval(expr, envir)) 22: 16: 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) {19: })lapply(X = S, FUN = FUN, ...)sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) return() } watcher$capture_plot_and_output() }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("basic_usage.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "basic_usage", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7d3b81d2.rds") An irrecoverable exception occurred. R is aborting now ... withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage"))13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L watcher$capture_plot_and_output()40: watcher$print_value(ev$value, ev$visible, envir)evaluate::evaluate(...) if (on_warning$capture) {25: parallel::mclapply(miList, runModel, mc.cores = numCores)11: 23: cnd <- sanitize_call(cnd) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else {suppressMessages(suppressWarnings(parallel::mclapply(miList, 15: watcher$push(cnd)20: 41: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", } if (options$error && options$include) try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, if (on_warning$silence) {withCallingHandlers(expr, warning = function(w) if (inherits(w, runModel, mc.cores = numCores)))doTryCatch(return(expr), name, parentenv, handler) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10) invokeRestart("muffleWarning") classes)) tryInvokeRestart("muffleWarning"))16: "brand"), scalePar = "price", numMultiStarts = 10) keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) } keep_message = if (is.numeric(options$message)) TRUE else options$message, 26: 17: sm <- strsplit(conditionMessage(e), "\n")[[1L]] 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w")}, error = function (cnd) if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") }14: stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) eval(expr, envir)26: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) stop_on_error = if (is.numeric(options$error)) options$error else { else prefix <- "Error : "21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) dcall <- deparse(call, nlines = 1L) if (options$error && options$include) 0L prefix <- paste("Error in", dcall, ": ")eval(expr, envir) 0L else 2LFUN(X[[i]], ...)23: LONG <- 75L{ else 2L watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL) msg <- paste0(prefix, conditionMessage(e), "\n")suppressMessages(suppressWarnings(parallel::mclapply(miList, }) }, output_handler = knit_handlers(options$render, options))) runModel, mc.cores = numCores)))18: .Internal(seterrmessage(msg[1L])) }, output_handler = knit_handlers(options$render, options)))lapply(seq_len(cores), inner.do)27: 30: 44: eng_r(options)eval(call) 31: eval(call) eval(expr, envir)27: if (!silent && isTRUE(getOption("show.error.messages"))) {eval(expr, envir) 32: 45: block_exec(params) cat(msg, file = outFile) 44: 24: 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd)with_handlers({eng_r(options) } sm <- strsplit(conditionMessage(e), "\n")[[1L]] if (on_message$silence) {46: w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") for (expr in tle$exprs) {runMultistart(modelInputs)call_block(x) if (is.na(w)) 19: w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") ev <- withVisible(eval(expr, envir)) .Internal(printDeferredWarnings()) .Internal(seterrmessage(msg[1L])) invokeRestart("muffleMessage")45: watcher$capture_plot_and_output() }parallel::mclapply(miList, runModel, mc.cores = numCores)28: 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) block_exec(params)47: if (!silent && isTRUE(getOption("show.error.messages"))) { 46: call_block(x)22: process_group(group)25: withCallingHandlers(expr, message = function(c) if (inherits(c, logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() cat(msg, file = outFile)withVisible(eval(expr, envir)) invisible(structure(msg, class = "try-error", condition = e)) if (on_message$capture) { watcher$print_value(ev$value, ev$visible, envir)48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: }) .Internal(printDeferredWarnings()) watcher$push(cnd)29: 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) withCallingHandlers(code, message = function (cnd) classes)) tryInvokeRestart("muffleMessage")) pb$interrupt() 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, } runModel, mc.cores = numCores))) } pb$interrupt() invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage"))withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) if (on_message$silence) { if (xfun::pkg_available("rlang", "1.0.0")) { }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output()24: 23: if (xfun::pkg_available("rlang", "1.0.0")) {suppressMessages(suppressWarnings(parallel::mclapply(miList, watcher$print_value(ev$value, ev$visible, envir) runMultistart(modelInputs)15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", if (is_R_CMD_build() || is_R_CMD_check()) { } if (is_R_CMD_build() || is_R_CMD_check()) {41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { cnd = tryCatch(rlang::entrace(e), error = identity) {16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) TRUE cnd = tryCatch(rlang::entrace(e), error = identity) "brand"), scalePar = "price", numMultiStarts = 10) watcher$capture_plot_and_output() error <<- format(cnd)}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) error <<- format(cnd) if (options$error && options$include) 19: 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage")40: evaluate::evaluate(...) } invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) }parallel::mclapply(miList, runModel, mc.cores = numCores)26: if (on_warning$silence) { invokeRestart("muffleWarning")eval(expr, envir) } }25: }, warning = function (cnd) }, error = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() 41: 20: }withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: watcher$capture_plot_and_output() }evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", else { "brand"), scalePar = "price", numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() else { keep_message = if (is.numeric(options$message)) TRUE else options$message, 27: stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr){ if (on_warning$capture) { if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { cnd <- sanitize_call(cnd) watcher$push(cnd) watcher$capture_plot_and_output() invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd)eval(expr, envir)withVisible(eval(expr, envir)) 43: 46: rlang::entrace(e)29: withCallingHandlers(code, message = function (cnd) in_input_dir(evaluate(code, envir = env, new_device = FALSE, watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), }{call_block(x) 47: } rlang::entrace(e) } } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } if (on_warning$silence) {process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), }) watcher$capture_plot_and_output() else { cnd <- sanitize_call(cnd) stop = invokeRestart("eval_stop"), error = NULL) error = function(e) { keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, rlang::entrace(e) watcher$push(cnd) invokeRestart("muffleWarning") 49: }) if (on_message$capture) { switch(on_error, continue = invokeRestart("eval_continue"), }28: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() watcher$push(cnd) }}, error = function (cnd) } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) error = function(e) {{ watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: stop = invokeRestart("eval_stop"), error = NULL) if (on_message$capture) { if (progress && is.function(pb$interrupt)) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() if (progress && is.function(pb$interrupt)) keep_message = if (is.numeric(options$message)) TRUE else options$message, watcher$push(cnd) paste0("\n", rule(), error, "\n", rule())) } watcher$print_value(ev$value, ev$visible, envir) if (on_message$silence) { pb$interrupt() } pb$interrupt() stop_on_error = if (is.numeric(options$error)) options$error else { } invokeRestart("muffleMessage") if (xfun::pkg_available("rlang", "1.0.0")) { }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) {eval(call) if (xfun::pkg_available("rlang", "1.0.0")) {}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) TRUE watcher$capture_plot_and_output() if (on_message$silence) {}) if (is_R_CMD_build() || is_R_CMD_check()) { 30: if (options$error && options$include) cnd <- sanitize_call(cnd)eval(call)}, handlers) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 0L invokeRestart("muffleMessage") cnd = tryCatch(rlang::entrace(e), error = identity) watcher$push(cnd)36: switch(on_error, continue = invokeRestart("eval_continue"), } }, warning = function (cnd) if (is_R_CMD_build() || is_R_CMD_check()) { stop = invokeRestart("eval_stop"), error = NULL)50: doWithOneRestart(return(expr), restart)33: { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd)}) else 2LdoWithOneRestart(return(expr), restart) if (getOption("warn") >= 2 || getOption("warn") < 0) {process_file(text, output) } else { rlang::entrace(e) } } 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: 32: 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ }), function(loc) {30: }, output_handler = knit_handlers(options$render, options)))37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) }tryCatch({ return() error <<- format(cnd)eval(call) TRUE engine$weave(file, quiet = quiet, encoding = enc) } setwd(wd) for (expr in tle$exprs) { }}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) write_utf8(res, output %n% stdout())31: watcher$capture_plot_and_output()eval(call) 32: setwd(startdir)40: evaluate::evaluate(...) output <- find_vignette_product(name, by = "weave", engine = engine)with_handlers({ ev <- withVisible(eval(expr, envir)) if (!have.makefile && vignette_is_tex(output)) {with_handlers({41: if (on_warning$capture) { for (expr in tle$exprs) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", else { ev <- withVisible(eval(expr, envir)) watcher$print_value(ev$value, ev$visible, envir) engine = engine) } watcher$capture_plot_and_output() watcher$push(cnd) for (expr in tle$exprs) { watcher$print_value(ev$value, ev$visible, envir)}, error = function(e) { ev <- withVisible(eval(expr, envir))evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, watcher$capture_plot_and_output() keep_message = if (is.numeric(options$message)) TRUE else options$message, }44: } rlang::entrace(e) } } }) eng_r(options) stop_on_error = if (is.numeric(options$error)) options$error else { paste0("\nQuitting from ", loc, if (!is.null(error)) TRUE if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) paste0("\n", rule(), error, "\n", rule())) watcher$print_value(ev$value, ev$visible, envir) }}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) 42: if (progress && is.function(pb$interrupt)) } 50: OK <<- FALSE{ pb$interrupt() watcher$capture_plot_and_output() TRUEprocess_file(text, output) 40: if (xfun::pkg_available("rlang", "1.0.0")) { cnd <- sanitize_call(cnd) message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", 45: evaluate::evaluate(...) if (is_R_CMD_build() || is_R_CMD_check()) { watcher$push(cnd) file, conditionMessage(e))) TRUEin_dir(input_dir(), expr) cnd = tryCatch(rlang::entrace(e), error = identity)51: })knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ block_exec(params)}, handlers) 41: 43: switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) }, handlers)46: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, in_input_dir(evaluate(code, envir = env, new_device = FALSE, 31: call_block(x)33: 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) error <<- format(cnd) keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, engine$weave(file, quiet = quiet, encoding = enc) keep_message = if (is.numeric(options$message)) TRUE else options$message, eval(call)33: stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: keep_message = if (is.numeric(options$message)) TRUE else options$message, setwd(startdir)doWithOneRestart(return(expr), restart) output <- find_vignette_product(name, by = "weave", engine = engine)withRestartList(expr, restarts[-nr])59: keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, if (!have.makefile && vignette_is_tex(output)) { }49: tools:::.buildOneVignette("basic_usage.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", keep_message = if (is.numeric(options$message)) TRUE else options$message, texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { else { rlang::entrace(e) } } }), function(loc) { setwd(wd)xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), TRUE, FALSE, "basic_usage", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7d3b81d2.rds") stop_on_error = if (is.numeric(options$error)) options$error else {32: stop_on_error = if (is.numeric(options$error)) options$error else { error = function(e) { write_utf8(res, output %n% stdout()) OK <<- FALSE if (options$error && options$include) 34: with_handlers({An irrecoverable exception occurred. R is aborting now ... for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: paste0("\nQuitting from ", loc, if (!is.null(error)) if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else {36: withOneRestart(expr, restarts[[1L]])withRestartList(expr, restarts) paste0("\n", rule(), error, "\n", rule())) rlang::entrace(e)doWithOneRestart(return(expr), restart) 0L message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", 35: } if (options$error && options$include) withRestartList(expr, restarts[-nr]) file, conditionMessage(e))) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options)}) 59: tools:::.buildOneVignette("basic_usage.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", } 39: else 2L 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 45: }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) block_exec(params) 46: call_block(x) withRestarts(with_handlers({37: 38: }), function(loc) { for (expr in tle$exprs) {47: process_group(group) ev <- withVisible(eval(expr, envir)) setwd(wd) write_utf8(res, output %n% stdout()) TRUE, FALSE, "basic_usage", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7d3b81d2.rds")withRestartList(expr, restarts) 39: withRestarts(with_handlers({withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) pb$interrupt() An irrecoverable exception occurred. R is aborting now ... if (xfun::pkg_available("rlang", "1.0.0")) { watcher$capture_plot_and_output()48: for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) watcher$print_value(ev$value, ev$visible, envir)withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error = function(e) { if (progress && is.function(pb$interrupt)) 38: error <<- format(cnd)withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: } paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) pb$interrupt() }52: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } keep_message = if (is.numeric(options$message)) TRUE else options$message, 50: watcher$capture_plot_and_output() else {rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), process_file(text, output) stop_on_error = if (is.numeric(options$error)) options$error else { rlang::entrace(e) }) if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: } output_dir = getwd(), ...) 53: vweave_rmarkdown(...) } TRUE watcher$print_value(ev$value, ev$visible, envir)in_dir(input_dir(), expr) }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt()49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), }, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) } 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 51: error = function(e) {knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) if (xfun::pkg_available("rlang", "1.0.0")) {43: if (is_R_CMD_build() || is_R_CMD_check()) {54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L TRUE if (progress && is.function(pb$interrupt)) in_input_dir(evaluate(code, envir = env, new_device = FALSE, 52: pb$interrupt()rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), if (xfun::pkg_available("rlang", "1.0.0")) { cnd = tryCatch(rlang::entrace(e), error = identity)56: }, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) output_dir = getwd(), ...) keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, error <<- format(cnd)tryCatchOne(expr, names, parentenv, handlers[[1L]]) else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 57: keep_message = if (is.numeric(options$message)) TRUE else options$message, 45: 53: }tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ stop_on_error = if (is.numeric(options$error)) options$error else {block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) {40: engine$weave(file, quiet = quiet, encoding = enc) else { cnd = tryCatch(rlang::entrace(e), error = identity) rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule())) error <<- format(cnd)evaluate::evaluate(...) } if (is_R_CMD_build() || is_R_CMD_check()) { setwd(startdir)vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: output <- find_vignette_product(name, by = "weave", engine = engine)}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) cnd = tryCatch(rlang::entrace(e), error = identity) else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) tryCatchList(expr, classes, parentenv, handlers) rlang::entrace(e) if (!have.makefile && vignette_is_tex(output)) {50: }process_file(text, output) texi2pdf(file = output, clean = FALSE, quiet = quiet) 41: error <<- format(cnd) } })47: process_group(group) 48: 51: } else { rlang::entrace(e)58: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) output <- find_vignette_product(name, by = "texi2pdf", withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), engine = engine) error = function(e) {49: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }tryCatch({ if (progress && is.function(pb$interrupt)) xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("basic_usage.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "basic_usage", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7d3b81d2.rds") An irrecoverable exception occurred. R is aborting now ... error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { }, output_handler = knit_handlers(options$render, options)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) }55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) engine$weave(file, quiet = quiet, encoding = enc) } rlang::entrace(e) setwd(startdir) else { output <- find_vignette_product(name, by = "weave", engine = engine) rlang::entrace(e) } } }) if (!have.makefile && vignette_is_tex(output)) {42: texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("basic_usage.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "basic_usage", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7d3b81d2.rds") An irrecoverable exception occurred. R is aborting now ... }), function(loc) { }in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: setwd(startdir) keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("basic_usage.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "basic_usage", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7d3b81d2.rds") An irrecoverable exception occurred. R is aborting now ... } else { rlang::entrace(e) } } }) 49: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("basic_usage.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "basic_usage", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7d3b81d2.rds") An irrecoverable exception occurred. R is aborting now ... xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("basic_usage.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "basic_usage", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7d3b81d2.rds") An irrecoverable exception occurred. R is aborting now ... 59: tools:::.buildOneVignette("basic_usage.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "basic_usage", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7d3b81d2.rds") An irrecoverable exception occurred. R is aborting now ... setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("basic_usage.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "basic_usage", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7d3b81d2.rds") An irrecoverable exception occurred. R is aborting now ... Quitting from basic_usage.Rmd:82-91 [unnamed-chunk-7] ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ <error/rlang_error> Error in `names(x) <- value`: ! 'names' attribute [3] must be the same length as the vector [0] --- Backtrace: ▆ 1. └─logitr::logitr(...) 2. └─logitr:::getMultistartSummary(allModels) 3. └─base::`colnames<-`(...) ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ Error: processing vignette 'basic_usage.Rmd' failed with diagnostics: 'names' attribute [3] must be the same length as the vector [0] --- failed re-building ‘basic_usage.Rmd’ --- re-building ‘benchmark.Rmd’ using rmarkdown --- finished re-building ‘benchmark.Rmd’ --- re-building ‘convergence.Rmd’ using rmarkdown --- finished re-building ‘convergence.Rmd’ --- re-building ‘data_formatting.Rmd’ using rmarkdown --- finished re-building ‘data_formatting.Rmd’ --- re-building ‘interactions.Rmd’ using rmarkdown --- finished re-building ‘interactions.Rmd’ --- re-building ‘mnl_models.Rmd’ using rmarkdown *** caught segfault *** address 0x110, cause 'invalid permissions' *** caught segfault *** address 0x110, cause 'invalid permissions' *** caught segfault *** address 0x110, cause 'invalid permissions' Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10, startVals = wtp_mnl_pref$Estimate) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { *** caught segfault *** address 0x110, cause 'invalid permissions' watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) *** caught segfault *** address 0x110, cause 'invalid permissions' 45: block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea522da1f9.rds") An irrecoverable exception occurred. R is aborting now ... Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) if (!is.null(call)) { 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e)) model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) model$message <- result$message }}) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: doTryCatch(return(expr), name, parentenv, handler) 12: Traceback: *** caught segfault *** address 0x110, cause 'invalid permissions' 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar)tryCatchOne(expr, names, parentenv, handlers[[1L]]) suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) *** caught segfault *** 13: *** caught segfault *** address 0x110, cause 'invalid permissions' address 0x110, cause 'invalid permissions' tryCatchList(expr, classes, parentenv, handlers) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) *** caught segfault *** 5: address 0x110, cause 'invalid permissions' 22: 14: tryCatch(expr, error = function(e) { Traceback: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 1: call <- conditionCall(e) if (!is.null(call)) { 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL if (identical(call[[1L]], quote(doTryCatch))) tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, doTryCatch(return(expr), name, parentenv, handler) mi = mi, opts = mi$options) }, error = function(e) { }) 5: if (!is.null(result)) {withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message23: } call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L)})suppressMessages(suppressWarnings(parallel::mclapply(miList, 9: tryCatchOne(expr, names, parentenv, handlers[[1L]])FUN(X[[i]], ...) runModel, mc.cores = numCores))) prefix <- paste("Error in", dcall, ": ") 24: LONG <- 75LrunMultistart(modelInputs)10: 6: 25: lapply(X = S, FUN = FUN, ...)tryCatchList(expr, classes, parentenv, handlers) sm <- strsplit(conditionMessage(e), "\n")[[1L]]logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") "brand"), scalePar = "price", numMultiStarts = 10, startVals = wtp_mnl_pref$Estimate) 7: 11: tryCatch({ if (is.na(w)) doTryCatch(return(expr), name, parentenv, handler) result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, 26: w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], 12: mi = mi, opts = mi$options) Traceback: }, error = function(e) { type = "b")eval(expr, envir)tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { 1: if (w > LONG) prefix <- paste0(prefix, "\n ")})mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) } Traceback: 2: 8: system.time({ model <- mi$model result <- NULLeval_f(x0, ...) Traceback: 27: Traceback: eval(expr, envir) tryCatch({ if (identical(call[[1L]], quote(doTryCatch))) 28: 1: 1: withVisible(eval(expr, envir)) call <- sys.call(-4L)mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, dcall <- deparse(call, nlines = 1L) else prefix <- "Error : " 1: mi = mi, opts = mi$options)29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { }, error = function(e) {mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 3: prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) msg <- paste0(prefix, conditionMessage(e), "\n") 9: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: .Internal(seterrmessage(msg[1L])) 2: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) if (!silent && isTRUE(getOption("show.error.messages"))) {FUN(X[[i]], ...) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) eval_f(x0, ...) 2: 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L cat(msg, file = outFile) eval_f(x0, ...) watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() sm <- strsplit(conditionMessage(e), "\n")[[1L]] mi = mi, opts = mi$options) 2: 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, eval_f(x0, ...) if (on_warning$capture) { cnd <- sanitize_call(cnd) 3: 3: w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") watcher$push(cnd)nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, classes)) tryInvokeRestart("muffleWarning")) mi = mi, opts = mi$options) .Internal(printDeferredWarnings()) 4: }21: 4: 3: doTryCatch(return(expr), name, parentenv, handler) } invisible(structure(msg, class = "try-error", condition = e))suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))doTryCatch(return(expr), name, parentenv, handler)})nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) if (on_warning$silence) { 22: if (is.na(w)) 4: invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: 5: 5: w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], 4: doTryCatch(return(expr), name, parentenv, handler) withCallingHandlers(expr, message = function(c) if (inherits(c, 15: tryCatchOne(expr, names, parentenv, handlers[[1L]])eval(call) type = "b") 31: eval(call) 32: with_handlers({ classes)) tryInvokeRestart("muffleMessage"))tryCatchOne(expr, names, parentenv, handlers[[1L]]) for (expr in tle$exprs) { 5: ev <- withVisible(eval(expr, envir))tryCatchOne(expr, names, parentenv, handlers[[1L]]) *** caught segfault *** if (w > LONG) 6: watcher$capture_plot_and_output()tryCatchList(expr, classes, parentenv, handlers) address 0x110, cause 'invalid permissions' try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: 23: 7: tryCatch({sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE))suppressMessages(suppressWarnings(parallel::mclapply(miList, watcher$print_value(ev$value, ev$visible, envir) doTryCatch(return(expr), name, parentenv, handler) 6: tryCatchList(expr, classes, parentenv, handlers) 6: runModel, mc.cores = numCores)))17: 7: tryCatch({ prefix <- paste0(prefix, "\n ") } 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, tryCatchList(expr, classes, parentenv, handlers) 7: result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)tryCatchList(expr, classes, parentenv, handlers) }FUN(X[[i]], ...) }, error = function(e) { else prefix <- "Error : "24: msg <- paste0(prefix, conditionMessage(e), "\n")runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10, startVals = wtp_mnl_pref$Estimate) mi = mi, opts = mi$options)}) 26: }, error = function(e) { TRUEtryCatch({ 7: result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, tryCatch({}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: 18: }) .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) withRestartList(expr, restarts[-nr])16: eval(expr, envir) 8: result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 36: system.time({ 8: mi = mi, opts = mi$options)system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)lapply(seq_len(cores), inner.do)}, error = function(e) {27: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE))doWithOneRestart(return(expr), restart) Traceback: }, error = function(e) { model <- mi$model 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) result <- NULL}) 8: system.time({ model <- mi$model }, error = function(e) {}) tryCatch({ 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) }) 3: 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, eval(expr, envir)17: if (!is.null(result)) { result <- NULL model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) tryCatch({ watcher$capture_plot_and_output() mi = mi, opts = mi$options)FUN(X[[i]], ...) }, error = function(e) { watcher$print_value(ev$value, ev$visible, envir) })nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 18: lapply(seq_len(cores), inner.do) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))28: 4: doTryCatch(return(expr), name, parentenv, handler) 5: result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, 22: tryCatchOne(expr, names, parentenv, handlers[[1L]])13: mi = mi, opts = mi$options) if (!is.null(result)) {withCallingHandlers(expr, message = function(c) if (inherits(c, mi = mi, opts = mi$options) }, error = function(e) {19: 6: }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE classes)) tryInvokeRestart("muffleMessage"))tryCatchList(expr, classes, parentenv, handlers)withVisible(eval(expr, envir)) parallel::mclapply(miList, runModel, mc.cores = numCores) model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning"))29: 7: }) model$coefficients <- result$solution model$iterations <- result$iterations }23: tryCatch({ if (!is.null(result)) { model$logLik <- as.numeric(-1 * result$objective)tryCatchList(expr, classes, parentenv, handlers) TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) model$status <- result$status model$message <- result$messagesuppressMessages(suppressWarnings(parallel::mclapply(miList, result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, withCallingHandlers(code, message = function (cnd) mi = mi, opts = mi$options)}, error = function(e) { model$iterations <- result$iterations }{}) runModel, mc.cores = numCores))) model$fail <- FALSE model$status <- result$status14: 9: })21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10, startVals = wtp_mnl_pref$Estimate) 26: eval(expr, envir) 27: eval(expr, envir) 28: watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { model$coefficients <- result$solution model$message <- result$message 8: } model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations}) watcher$capture_plot_and_output()24: FUN(X[[i]], ...)40: evaluate::evaluate(...) 41: if (on_message$capture) { 10: } watcher$push(cnd)tryCatch(expr, error = function(e) { if (on_message$silence) { call <- conditionCall(e) model$status <- result$status model$message <- result$message invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) {system.time({ model <- mi$modelrunMultistart(modelInputs) result <- NULL } tryCatch({ if (!is.null(call)) {lapply(X = S, FUN = FUN, ...) result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, })evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, mi = mi, opts = mi$options) stop_on_error = if (is.numeric(options$error)) options$error else { if (identical(call[[1L]], quote(doTryCatch))) 9: if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 11: call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L }doTryCatch(return(expr), name, parentenv, handler) 9: if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) {12: 25: return() sm <- strsplit(conditionMessage(e), "\n")[[1L]]FUN(X[[i]], ...)tryCatchOne(expr, names, parentenv, handlers[[1L]])42: FUN(X[[i]], ...) } 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) }, error = function(e) { }) if (!is.null(result)) { w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") watcher$capture_plot_and_output()10: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10, startVals = wtp_mnl_pref$Estimate) 26: eval(expr, envir) 27: model$fail <- FALSEin_dir(input_dir(), expr) return() if (is.na(w)) if (!is.null(call)) { } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { if (on_warning$capture) { invokeRestart("muffleWarning") if (identical(call[[1L]], quote(doTryCatch))) model$coefficients <- result$solutionlapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) model$logLik <- as.numeric(-1 * result$objective) cnd <- sanitize_call(cnd) 10: call <- sys.call(-4L) model$iterations <- result$iterations12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { model$status <- result$status43: lapply(X = S, FUN = FUN, ...) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b")eval(expr, envir) } call <- conditionCall(e)}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) model$message <- result$message }}) in_input_dir(evaluate(code, envir = env, new_device = FALSE, if (!is.null(call)) { if (w > LONG) 28: withVisible(eval(expr, envir)) keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, watcher$push(cnd)11: prefix <- paste0(prefix, "\n ")doTryCatch(return(expr), name, parentenv, handler) type = "b") keep_message = if (is.numeric(options$message)) TRUE else options$message, 32: 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") stop_on_error = if (is.numeric(options$error)) options$error else { }29: LONG <- 75L12: tryCatchOne(expr, names, parentenv, handlers[[1L]])with_handlers({ else prefix <- "Error : " sm <- strsplit(conditionMessage(e), "\n")[[1L]]withCallingHandlers(code, message = function (cnd) if (identical(call[[1L]], quote(doTryCatch))) for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (options$error && options$include) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } 0L if (on_warning$silence) { invokeRestart("muffleWarning") } if (w > LONG) call <- sys.call(-4L) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { } TRUE}, handlers)13: if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (on_message$silence) { else 2L}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) invokeRestart("muffleMessage") watcher$push(cnd) msg <- paste0(prefix, conditionMessage(e), "\n") dcall <- deparse(call, nlines = 1L) }, output_handler = knit_handlers(options$render, options))) cat(msg, file = outFile)33: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]]doWithOneRestart(return(expr), restart) prefix <- paste("Error in", dcall, ": ") w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ")23: if (!silent && isTRUE(getOption("show.error.messages"))) { } LONG <- 75L } sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " .Internal(seterrmessage(msg[1L])) }, warning = function (cnd) cat(msg, file = outFile) else prefix <- "Error : "suppressMessages(suppressWarnings(parallel::mclapply(miList, switch(on_error, continue = invokeRestart("eval_continue"), 34: .Internal(printDeferredWarnings()) stop = invokeRestart("eval_stop"), error = NULL)withOneRestart(expr, restarts[[1L]]) msg <- paste0(prefix, conditionMessage(e), "\n") runModel, mc.cores = numCores))) .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) } if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) invisible(structure(msg, class = "try-error", condition = e))}) msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: .Internal(printDeferredWarnings())24: { })try(lapply(X = S, FUN = FUN, ...), silent = TRUE) if (getOption("warn") >= 2 || getOption("warn") < 0) {24: 30: eval(call) return()44: }31: 15: 16: runMultistart(modelInputs)sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } try(lapply(X = S, FUN = FUN, ...), silent = TRUE) }runMultistart(modelInputs)eng_r(options)eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() TRUE17: watcher$print_value(ev$value, ev$visible, envir) invisible(structure(msg, class = "try-error", condition = e))25: }, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE)16: 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10, startVals = wtp_mnl_pref$Estimate) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: 45: } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) block_exec(params) 46: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE))call_block(x) watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { eval(call)logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", 39: })FUN(X[[i]], ...) "brand"), scalePar = "price", numMultiStarts = 10, startVals = wtp_mnl_pref$Estimate) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { 17: 31: invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)})18: 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else {withRestarts(with_handlers({ eval(call)lapply(seq_len(cores), inner.do)FUN(X[[i]], ...) for (expr in tle$exprs) { invokeRestart("muffleWarning") ev <- withVisible(eval(expr, envir))15: 30: 32: 47: if (options$error && options$include) process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } }}, error = function (cnd) { watcher$capture_plot_and_output() watcher$capture_plot_and_output() cnd <- sanitize_call(cnd)try(lapply(X = S, FUN = FUN, ...), silent = TRUE)19: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUEeval(call) 18: lapply(seq_len(cores), inner.do) watcher$push(cnd) }31: })19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning"))parallel::mclapply(miList, runModel, mc.cores = numCores) switch(on_error, continue = invokeRestart("eval_continue"), 0L watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) stop = invokeRestart("eval_stop"), error = NULL) 16: 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, }, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 49: 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) else 2Lxfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) classes)) tryInvokeRestart("muffleMessage"))40: 43: rlang::entrace(e)23: 33: 17: }) }suppressMessages(suppressWarnings(parallel::mclapply(miList, eval(call)23: FUN(X[[i]], ...)evaluate::evaluate(...)in_input_dir(evaluate(code, envir = env, new_device = FALSE, runModel, mc.cores = numCores))) doWithOneRestart(return(expr), restart)32: } keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10, startVals = wtp_mnl_pref$Estimate) 26: eval(expr, envir) }), function(loc) { keep_message = if (is.numeric(options$message)) TRUE else options$message, 41: 27: 18: setwd(wd)with_handlers({eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE stop_on_error = if (is.numeric(options$error)) options$error else {evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, lapply(seq_len(cores), inner.do)24: 19: parallel::mclapply(miList, runModel, mc.cores = numCores) for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir)20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) keep_message = if (is.numeric(options$message)) TRUE else options$message, runMultistart(modelInputs) write_utf8(res, output %n% stdout()) }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) stop_on_error = if (is.numeric(options$error)) options$error else { TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: 34: paste0("\nQuitting from ", loc, if (!is.null(error)) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10, startVals = wtp_mnl_pref$Estimate) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { if (options$error && options$include) if (options$error && options$include) withOneRestart(expr, restarts[[1L]]) paste0("\n", rule(), error, "\n", rule()))withRestartList(expr, restarts[-nr]){ watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) 0L}, handlers) 0L watcher$capture_plot_and_output() }, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc)30: } else 2L35: 33: if (on_message$capture) {doWithOneRestart(return(expr), restart) 34: watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) withRestartList(expr, restarts[-nr]) else 2L50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea522da1f9.rds") An irrecoverable exception occurred. R is aborting now ... {eval(call) TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: 23: }, output_handler = knit_handlers(options$render, options)) evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: withOneRestart(expr, restarts[[1L]]) }, output_handler = knit_handlers(options$render, options))) 36: if (getOption("warn") >= 2 || getOption("warn") < 0) {eng_r(options) 42: 31: eval(call) 32: return()doWithOneRestart(return(expr), restart)with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) in_dir(input_dir(), expr) 44: suppressMessages(suppressWarnings(parallel::mclapply(miList, } eng_r(options) watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { 37: 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) invokeRestart("muffleWarning") }35: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]])40: runModel, mc.cores = numCores)))}, error = function (cnd) 43: 45: in_input_dir(evaluate(code, envir = env, new_device = FALSE, {block_exec(params) withRestartList(expr, restarts[-nr])24: runMultistart(modelInputs) evaluate::evaluate(...)38: keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, 45: 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 46: 25: 43: call_block(x) 47: process_group(group) keep_message = if (is.numeric(options$message)) TRUE else options$message, logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", watcher$capture_plot_and_output()withRestartList(expr, restarts)in_input_dir(evaluate(code, envir = env, new_device = FALSE, "brand"), scalePar = "price", numMultiStarts = 10, startVals = wtp_mnl_pref$Estimate)36: cnd <- sanitize_call(cnd) stop_on_error = if (is.numeric(options$error)) options$error else { keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, if (options$error && options$include) keep_message = if (is.numeric(options$message)) TRUE else options$message, 0L else 2Lblock_exec(params) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 26: }, output_handler = knit_handlers(options$render, options)))doWithOneRestart(return(expr), restart)48: stop = invokeRestart("eval_stop"), error = NULL)withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { eval(expr, envir)46: 44: if (progress && is.function(pb$interrupt)) 39: pb$interrupt()call_block(x) if (xfun::pkg_available("rlang", "1.0.0")) {eng_r(options) })withRestarts(with_handlers({27: eval(expr, envir) 28: if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) for (expr in tle$exprs) { 47: ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() } 37: else {withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]])process_group(group) 30: 45: block_exec(params) 46: withVisible(eval(expr, envir))eval(call) rlang::entrace(e) 44: 48: 38: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), call_block(x) watcher$print_value(ev$value, ev$visible, envir) error = function(e) {eng_r(options) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) if (progress && is.function(pb$interrupt)) withRestartList(expr, restarts) 39: 29: 40: }47: process_group(group) 31: eval(call) 32: with_handlers({withCallingHandlers(code, message = function (cnd) pb$interrupt() }48: if (xfun::pkg_available("rlang", "1.0.0")) {{45: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } })evaluate::evaluate(...) if (is_R_CMD_build() || is_R_CMD_check()) {withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), for (expr in tle$exprs) { TRUE watcher$capture_plot_and_output() error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { ev <- withVisible(eval(expr, envir))41: block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) if (on_message$capture) { watcher$push(cnd) if (progress && is.function(pb$interrupt)) }, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } if (on_message$silence) {evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, pb$interrupt()40: evaluate::evaluate(...) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) keep_message = if (is.numeric(options$message)) TRUE else options$message, invokeRestart("muffleMessage") if (xfun::pkg_available("rlang", "1.0.0")) { cnd = tryCatch(rlang::entrace(e), error = identity) if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { 36: } setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output)41: error <<- format(cnd) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet)}, warning = function (cnd) 52: stop_on_error = if (is.numeric(options$error)) options$error else {rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), } }doWithOneRestart(return(expr), restart) output_dir = getwd(), ...) if (options$error && options$include) 49: else {{37: if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]])xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, rlang::entrace(e) else { 0L if (xfun::pkg_available("rlang", "1.0.0")) {53: keep_message = if (is.numeric(options$message)) TRUE else options$message, 32: else 2L rlang::entrace(e)vweave_rmarkdown(...)38: stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: if (options$error && options$include) with_handlers({withRestartList(expr, restarts) }, output_handler = knit_handlers(options$render, options))knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) for (expr in tle$exprs) { 0L 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, else 2L if (is_R_CMD_build() || is_R_CMD_check()) { }, output_handler = knit_handlers(options$render, options))) keep_message = if (is.numeric(options$message)) TRUE else options$message, 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: cnd = tryCatch(rlang::entrace(e), error = identity) } stop_on_error = if (is.numeric(options$error)) options$error else {52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: 53: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }44: if (options$error && options$include) vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: error <<- format(cnd) } else { ev <- withVisible(eval(expr, envir))eng_r(options) rlang::entrace(e)}, error = function(e) { watcher$capture_plot_and_output()doTryCatch(return(expr), name, parentenv, handler)rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: } } 0L else 2L56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: 45: doWithOneRestart(return(expr), restart)39: OK <<- FALSEtryCatchList(expr, classes, parentenv, handlers) output_dir = getwd(), ...) }), function(loc) { withRestarts(with_handlers({ }, output_handler = knit_handlers(options$render, options)))block_exec(params) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) 47: process_group(group) setwd(wd) message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea522da1f9.rds") An irrecoverable exception occurred. R is aborting now ... 34: 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc)withOneRestart(expr, restarts[[1L]]) for (expr in tle$exprs) { 35: withRestartList(expr, restarts[-nr]) 46: call_block(x) setwd(startdir) ev <- withVisible(eval(expr, envir)) 36: 47: output <- find_vignette_product(name, by = "weave", engine = engine)48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) {doWithOneRestart(return(expr), restart)58: tryCatch({37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: if (!have.makefile && vignette_is_tex(output)) { engine$weave(file, quiet = quiet, encoding = enc) write_utf8(res, output %n% stdout()) watcher$capture_plot_and_output()evaluate::evaluate(...) watcher$print_value(ev$value, ev$visible, envir) } TRUE texi2pdf(file = output, clean = FALSE, quiet = quiet)process_group(group) cnd = tryCatch(rlang::entrace(e), error = identity) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else {}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 48: if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) error <<- format(cnd)withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), 40: output <- find_vignette_product(name, by = "texi2pdf", paste0("\nQuitting from ", loc, if (!is.null(error)) engine = engine) }evaluate::evaluate(...) else { setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) error = function(e) { paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) rlang::entrace(e) if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { }42: 41: 50: if (is_R_CMD_build() || is_R_CMD_check()) {in_dir(input_dir(), expr)evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, process_file(text, output) cnd = tryCatch(rlang::entrace(e), error = identity) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea522da1f9.rds") An irrecoverable exception occurred. R is aborting now ... 0L error <<- format(cnd) output <- find_vignette_product(name, by = "texi2pdf", } engine = engine) stop_on_error = if (is.numeric(options$error)) options$error else { }) if (options$error && options$include) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: 0LdoTryCatch(return(expr), name, parentenv, handler) else 2L else 2L49: } else {56: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), rlang::entrace(e) }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) error = function(e) { } }, output_handler = knit_handlers(options$render, options)))tryCatchOne(expr, names, parentenv, handlers[[1L]]) } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea522da1f9.rds") An irrecoverable exception occurred. R is aborting now ... 44: if (progress && is.function(pb$interrupt)) if (progress && is.function(pb$interrupt)) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, eng_r(options) keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } 46: else {call_block(x) rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd)process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: 45: } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 47: process_group(group)53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({tryCatch({block_exec(params) engine$weave(file, quiet = quiet, encoding = enc) engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { if (!have.makefile && vignette_is_tex(output)) { 46: call_block(x) 47: process_group(group) 48: texi2pdf(file = output, clean = FALSE, quiet = quiet)57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ texi2pdf(file = output, clean = FALSE, quiet = quiet) engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea522da1f9.rds") error = function(e) { output <- find_vignette_product(name, by = "texi2pdf", if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } }48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", }), function(loc) { }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: engine = engine) } pb$interrupt()}, error = function(e) { OK <<- FALSEAn irrecoverable exception occurred. R is aborting now ... message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: if (xfun::pkg_available("rlang", "1.0.0")) {tools:::.buildOneVignette("mnl_models.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea522da1f9.rds") if (is_R_CMD_build() || is_R_CMD_check()) { An irrecoverable exception occurred. R is aborting now ... cnd = tryCatch(rlang::entrace(e), error = identity) TRUE, FALSE, "mnl_models", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea522da1f9.rds") error <<- format(cnd) An irrecoverable exception occurred. R is aborting now ... doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: } else { rlang::entrace(e) } }tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))})50: process_file(text, output) 51: 59: tools:::.buildOneVignette("mnl_models.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea522da1f9.rds") An irrecoverable exception occurred. R is aborting now ... knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea522da1f9.rds") An irrecoverable exception occurred. R is aborting now ... Quitting from mnl_models.Rmd:85-98 [unnamed-chunk-9] ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ <error/rlang_error> Error in `names(x) <- value`: ! 'names' attribute [3] must be the same length as the vector [0] --- Backtrace: ▆ 1. └─logitr::logitr(...) 2. └─logitr:::getMultistartSummary(allModels) 3. └─base::`colnames<-`(...) ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ Error: processing vignette 'mnl_models.Rmd' failed with diagnostics: 'names' attribute [3] must be the same length as the vector [0] --- failed re-building ‘mnl_models.Rmd’ --- re-building ‘mnl_models_weighted.Rmd’ using rmarkdown *** caught segfault *** address 0x110, cause 'invalid permissions' Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = cars_us, outcome = "choice", obsID = "obsnum", pars = c("hev", "phev10", "phev20", "phev40", "bev75", "bev100", "bev150", "american", "japanese", "chinese", "skorean", "phevFastcharge", "bevFastcharge", "opCost", "accelTime"), scalePar = "price", robust = TRUE, numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) *** caught segfault *** address 0x110, cause 'invalid permissions' switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models_weighted.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models_weighted", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea3898bdc2.rds") An irrecoverable exception occurred. R is aborting now ... *** caught segfault *** address 0x110, cause 'invalid permissions' *** caught segfault *** address 0x110, cause 'invalid permissions' *** caught segfault *** address 0x110, cause 'invalid permissions' Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = cars_us, outcome = "choice", obsID = "obsnum", pars = c("hev", "phev10", "phev20", "phev40", "bev75", "bev100", "bev150", "american", "japanese", "chinese", "skorean", "phevFastcharge", "bevFastcharge", "opCost", "accelTime"), scalePar = "price", robust = TRUE, numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 45: block_exec(params) 46: call_block(x) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution 47: process_group(group) 48: Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) }nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) else { rlang::entrace(e) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message } } } }) }) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...)49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: 11: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout())tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) paste0("\nQuitting from ", loc, if (!is.null(error)) 3: doTryCatch(return(expr), name, parentenv, handler) nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 12: paste0("\n", rule(), error, "\n", rule()))tryCatchOne(expr, names, parentenv, handlers[[1L]]) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: 13: tryCatchList(expr, classes, parentenv, handlers)}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc)tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, 50: mi = mi, opts = mi$options)}, error = function(e) {}) 8: process_file(text, output)system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: if (is.na(w)) rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) output_dir = getwd(), ...) 10: 14: tryCatch(expr, error = function(e) {lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ")13: 53: vweave_rmarkdown(...) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) }tryCatchList(expr, classes, parentenv, handlers) invisible(structure(msg, class = "try-error", condition = e))54: LONG <- 75L 14: sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) }) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L)engine$weave(file, quiet = quiet, encoding = enc) prefix <- paste("Error in", dcall, ": ")15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) type = "b") if (w > LONG) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: LONG <- 75Lparallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: 55: doTryCatch(return(expr), name, parentenv, handler) sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") }suppressMessages(suppressWarnings(parallel::mclapply(miList, prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) tryCatchList(expr, classes, parentenv, handlers) .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = cars_us, outcome = "choice", obsID = "obsnum", }15: pars = c("hev", "phev10", "phev20", "phev40", "bev75", "bev100", invisible(structure(msg, class = "try-error", condition = e)) "bev150", "american", "japanese", "chinese", "skorean", "phevFastcharge", "bevFastcharge", "opCost", "accelTime"), scalePar = "price", robust = TRUE, numMultiStarts = 10) }) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 26: eval(expr, envir) try(lapply(X = S, FUN = FUN, ...), silent = TRUE)27: eval(expr, envir) 58: 16: 16: 28: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) withVisible(eval(expr, envir)) tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) {29: withCallingHandlers(code, message = function (cnd) {sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { watcher$capture_plot_and_output()18: lapply(seq_len(cores), inner.do) 19: 18: lapply(seq_len(cores), inner.do) 19: OK <<- FALSE if (on_message$capture) { watcher$push(cnd)parallel::mclapply(miList, runModel, mc.cores = numCores) message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", parallel::mclapply(miList, runModel, mc.cores = numCores) } if (on_message$silence) { invokeRestart("muffleMessage") file, conditionMessage(e))) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) }}) }, warning = function (cnd) {21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) if (getOption("warn") >= 2 || getOption("warn") < 0) {22: withCallingHandlers(expr, message = function(c) if (inherits(c, 59: tools:::.buildOneVignette("mnl_models_weighted.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", return() classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, TRUE, FALSE, "mnl_models_weighted", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea3898bdc2.rds") runModel, mc.cores = numCores))) }An irrecoverable exception occurred. R is aborting now ... watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage"))30: eval(call) 31: eval(call) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = cars_us, outcome = "choice", obsID = "obsnum", pars = c("hev", "phev10", "phev20", "phev40", "bev75", "bev100", 32: with_handlers({ for (expr in tle$exprs) { "bev150", "american", "japanese", "chinese", "skorean", "phevFastcharge", "bevFastcharge", "opCost", "accelTime"), scalePar = "price", robust = TRUE, numMultiStarts = 10) 26: eval(expr, envir) 27: 24: runMultistart(modelInputs) 25: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output()logitr(data = cars_us, outcome = "choice", obsID = "obsnum", pars = c("hev", "phev10", "phev20", "phev40", "bev75", "bev100", "bev150", "american", "japanese", "chinese", "skorean", "phevFastcharge", "bevFastcharge", "opCost", "accelTime"), scalePar = "price", robust = TRUE, numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) {28: withVisible(eval(expr, envir)) invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) {29: cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) watcher$print_value(ev$value, ev$visible, envir)withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } } TRUE}, handlers) 33: if (on_message$silence) { invokeRestart("muffleMessage")doWithOneRestart(return(expr), restart) 34: }}, warning = function (cnd) {{ if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output()withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 36: doWithOneRestart(return(expr), restart)31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: *** caught segfault *** withRestartList(expr, restarts)address 0x110, cause 'invalid permissions' ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE 30: eval(call) 31: eval(call) 32: }, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: 39: withRestarts(with_handlers({ for (expr in tle$exprs) {with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output()withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) }, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: 33: doWithOneRestart(return(expr), restart)evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L 34: withOneRestart(expr, restarts[[1L]]) }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, 40: evaluate::evaluate(...)35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else {withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: } TRUEeng_r(options) 45: block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { 46: rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt()call_block(x) if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity)47: process_group(group) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) {}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) else { rlang::entrace(e) } 53: block_exec(params) }vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: 46: call_block(x) 47: process_group(group) engine$weave(file, quiet = quiet, encoding = enc)48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models_weighted.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models_weighted", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea3898bdc2.rds") An irrecoverable exception occurred. R is aborting now ... rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) {engine$weave(file, quiet = quiet, encoding = enc) if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) }55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) else { rlang::entrace(e) } } if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models_weighted.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models_weighted", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea3898bdc2.rds") An irrecoverable exception occurred. R is aborting now ... }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() Traceback: if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models_weighted.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models_weighted", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea3898bdc2.rds") An irrecoverable exception occurred. R is aborting now ... 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) *** caught segfault *** address 0x110, cause 'invalid permissions' if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = cars_us, outcome = "choice", obsID = "obsnum", pars = c("hev", "phev10", "phev20", "phev40", "bev75", "bev100", "bev150", "american", "japanese", "chinese", "skorean", "phevFastcharge", "bevFastcharge", "opCost", "accelTime"), scalePar = "price", robust = TRUE, numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { *** caught segfault *** address 0x110, cause 'invalid permissions' cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models_weighted.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models_weighted", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea3898bdc2.rds") An irrecoverable exception occurred. R is aborting now ... Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = cars_us, outcome = "choice", obsID = "obsnum", pars = c("hev", "phev10", "phev20", "phev40", "bev75", "bev100", "bev150", "american", "japanese", "chinese", "skorean", "phevFastcharge", "bevFastcharge", "opCost", "accelTime"), scalePar = "price", robust = TRUE, numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ 2: eval_f(x0, ...) 3: for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUEnloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler)}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) }, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = cars_us, outcome = "choice", obsID = "obsnum", pars = c("hev", "phev10", "phev20", "phev40", "bev75", "bev100", "bev150", "american", "japanese", "chinese", "skorean", "phevFastcharge", "bevFastcharge", "opCost", "accelTime"), scalePar = "price", robust = TRUE, numMultiStarts = 10) 26: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0Leval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) else 2L 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) 47: process_group(group) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e)48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models_weighted.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models_weighted", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea3898bdc2.rds") An irrecoverable exception occurred. R is aborting now ... if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models_weighted.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models_weighted", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea3898bdc2.rds") An irrecoverable exception occurred. R is aborting now ... *** caught segfault *** address 0x110, cause 'invalid permissions' Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = cars_us, outcome = "choice", obsID = "obsnum", pars = c("hev", "phev10", "phev20", "phev40", "bev75", "bev100", "bev150", "american", "japanese", "chinese", "skorean", "phevFastcharge", "bevFastcharge", "opCost", "accelTime"), scalePar = "price", robust = TRUE, numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models_weighted.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models_weighted", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea3898bdc2.rds") An irrecoverable exception occurred. R is aborting now ... *** caught segfault *** address 0x110, cause 'invalid permissions' Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = cars_us, outcome = "choice", obsID = "obsnum", pars = c("hev", "phev10", "phev20", "phev40", "bev75", "bev100", "bev150", "american", "japanese", "chinese", "skorean", "phevFastcharge", "bevFastcharge", "opCost", "accelTime"), scalePar = "price", robust = TRUE, numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("mnl_models_weighted.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "mnl_models_weighted", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea3898bdc2.rds") An irrecoverable exception occurred. R is aborting now ... Quitting from mnl_models_weighted.Rmd:64-80 [unnamed-chunk-3] ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ <error/rlang_error> Error in `names(x) <- value`: ! 'names' attribute [3] must be the same length as the vector [0] --- Backtrace: ▆ 1. └─logitr::logitr(...) 2. └─logitr:::getMultistartSummary(allModels) 3. └─base::`colnames<-`(...) ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ Error: processing vignette 'mnl_models_weighted.Rmd' failed with diagnostics: 'names' attribute [3] must be the same length as the vector [0] --- failed re-building ‘mnl_models_weighted.Rmd’ --- re-building ‘mxl_models.Rmd’ using rmarkdown --- finished re-building ‘mxl_models.Rmd’ --- re-building ‘predict.Rmd’ using rmarkdown *** caught segfault *** address 0x110, cause 'invalid permissions' *** caught segfault *** address 0x110, cause 'invalid permissions' *** caught segfault *** address 0x110, cause 'invalid permissions' *** caught segfault *** address 0x110, cause 'invalid permissions' Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: Traceback: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) Traceback: 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: model$iterations <- result$iterations model$status <- result$status model$message <- result$message Traceback: withVisible(eval(expr, envir)) }}) doTryCatch(return(expr), name, parentenv, handler) 12: 29: 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 2: eval_f(x0, ...) 9: FUN(X[[i]], ...) withCallingHandlers(code, message = function (cnd) 10: lapply(X = S, FUN = FUN, ...) 11: { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) doTryCatch(return(expr), name, parentenv, handler) 12: 5: { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() }tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) tryCatchOne(expr, names, parentenv, handlers[[1L]])tryCatchOne(expr, names, parentenv, handlers[[1L]]) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") } prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b")13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { 10: lapply(X = S, FUN = FUN, ...) 11: call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) *** caught segfault *** address 0x110, cause 'invalid permissions' doTryCatch(return(expr), name, parentenv, handler)}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) if (w > LONG) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning"))30: 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: eval(call) 31: eval(call)withCallingHandlers(expr, message = function(c) if (inherits(c, 32: with_handlers({ for (expr in tle$exprs) {12: classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)))tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) ev <- withVisible(eval(expr, envir)) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] watcher$capture_plot_and_output() 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10) call <- sys.call(-4L) w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings())29: 33: withCallingHandlers(code, message = function (cnd) doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]){ watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) } invisible(structure(msg, class = "try-error", condition = e))}) 15: } *** caught segfault *** try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) cat(msg, file = outFile) .Internal(printDeferredWarnings())38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ 18: Traceback: } invisible(structure(msg, class = "try-error", condition = e))address 0x110, cause 'invalid permissions' 1: for (expr in tle$exprs) {}) 15: ev <- withVisible(eval(expr, envir))try(lapply(X = S, FUN = FUN, ...), silent = TRUE) if (on_message$silence) {lapply(seq_len(cores), inner.do) 19: 16: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir)sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) invokeRestart("muffleMessage") 17: } }}, warning = function (cnd) TRUE 2: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) }, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE)21: eval_f(x0, ...)suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) *** caught segfault *** FUN(X[[i]], ...){ 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } mi = mi, opts = mi$options) watcher$capture_plot_and_output()40: *** caught segfault *** address 0x110, cause 'invalid permissions' 4: doTryCatch(return(expr), name, parentenv, handler) if (on_warning$capture) { evaluate::evaluate(...) cnd <- sanitize_call(cnd)18: lapply(seq_len(cores), inner.do) watcher$push(cnd) }address 0x110, cause 'invalid permissions' 22: if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) { watcher$capture_plot_and_output()41: cnd <- sanitize_call(cnd)evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, watcher$push(cnd) withCallingHandlers(expr, message = function(c) if (inherits(c, 5: switch(on_error, continue = invokeRestart("eval_continue"), tryCatchOne(expr, names, parentenv, handlers[[1L]]) classes)) tryInvokeRestart("muffleMessage")) stop = invokeRestart("eval_stop"), error = NULL) keep_message = if (is.numeric(options$message)) TRUE else options$message, }) *** caught segfault *** stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) Traceback: address 0x110, cause 'invalid permissions' 19: 1: 6: tryCatchList(expr, classes, parentenv, handlers) parallel::mclapply(miList, runModel, mc.cores = numCores)mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 0L 23: 30: suppressMessages(suppressWarnings(parallel::mclapply(miList, 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) runModel, mc.cores = numCores)))20: }, error = function(e) {eval(call)withCallingHandlers(expr, warning = function(w) if (inherits(w, }) classes)) tryInvokeRestart("muffleWarning"))31: eval(call) 2: 24: 21: else 2L }, output_handler = knit_handlers(options$render, options))eval_f(x0, ...) 8: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) runMultistart(modelInputs) 3: 22: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, 32: withCallingHandlers(expr, message = function(c) if (inherits(c, 42: with_handlers({ mi = mi, opts = mi$options)system.time({ classes)) tryInvokeRestart("muffleMessage")) model <- mi$model Traceback: for (expr in tle$exprs) { 1: 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, result <- NULL25: in_dir(input_dir(), expr) runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: ev <- withVisible(eval(expr, envir))logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", 4: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) "brand"), scalePar = "price", numMultiStarts = 10) Traceback: }, error = function(e) { 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, "brand"), scalePar = "price", numMultiStarts = 10)26: eval(expr, envir) mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, 27: }) keep_message = if (is.numeric(options$message)) TRUE else options$message, watcher$capture_plot_and_output() stop_on_error = if (is.numeric(options$error)) options$error else { eval(expr, envir) if (!is.null(result)) { 2: watcher$print_value(ev$value, ev$visible, envir) 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar)26: if (options$error && options$include) model$fail <- FALSE } 28: eval(expr, envir) 2: TRUEwithVisible(eval(expr, envir))}, handlers) model$coefficients <- result$solutioneval_f(x0, ...) doTryCatch(return(expr), name, parentenv, handler) 5: model$logLik <- as.numeric(-1 * result$objective) 29: Traceback: tryCatchOne(expr, names, parentenv, handlers[[1L]])withCallingHandlers(code, message = function (cnd) 27: 1: eval_f(x0, ...) model$iterations <- result$iterations { watcher$capture_plot_and_output()33: model$status <- result$status mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 3: 0LdoWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 6: if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }}, error = function (cnd) else 2L tryCatchList(expr, classes, parentenv, handlers) }, output_handler = knit_handlers(options$render, options)))eval(expr, envir)36: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, doWithOneRestart(return(expr), restart) mi = mi, opts = mi$options) 3: 2: 7: model$message <- result$message28: eval_f(x0, ...)withVisible(eval(expr, envir)){nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, } 37: 44: tryCatch({ 4: doTryCatch(return(expr), name, parentenv, handler) 5: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 6: tryCatchList(expr, classes, parentenv, handlers) withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) watcher$capture_plot_and_output() mi = mi, opts = mi$options)29: }) *** caught segfault *** 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, withCallingHandlers(code, message = function (cnd) { 3: eng_r(options) cnd <- sanitize_call(cnd)38: watcher$capture_plot_and_output()address 0x110, cause 'invalid permissions' watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) doTryCatch(return(expr), name, parentenv, handler)nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {withRestartList(expr, restarts) 4: doTryCatch(return(expr), name, parentenv, handler) }) mi = mi, opts = mi$options) if (on_message$capture) { 5: 7: 30: 8: 45: tryCatchOne(expr, names, parentenv, handlers[[1L]]) tryCatch({ eval(call) result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)39: watcher$push(cnd)system.time({ 6: 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output()withRestarts(with_handlers({tryCatchList(expr, classes, parentenv, handlers)}, error = function(e) { 7: tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: block_exec(params) model$status <- result$status for (expr in tle$exprs) {doWithOneRestart(return(expr), restart) } 12: model$message <- result$message model <- mi$model}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: 34: } ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } if (on_message$silence) { 4: result <- NULL Traceback: invokeRestart("muffleMessage")FUN(X[[i]], ...)46: tryCatchOne(expr, names, parentenv, handlers[[1L]])withOneRestart(expr, restarts[[1L]])}) TRUE }, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) tryCatch({call_block(x)doTryCatch(return(expr), name, parentenv, handler) result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, 10: }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning")lapply(X = S, FUN = FUN, ...) 1: mi$logitFuncs$getMnlV(pars, d$X, d$scalePar) 9: 40: 11: doTryCatch(return(expr), name, parentenv, handler) 12: 47: process_group(group) mi = mi, opts = mi$options) 13: 2: FUN(X[[i]], ...)35: evaluate::evaluate(...) }tryCatchList(expr, classes, parentenv, handlers)tryCatchOne(expr, names, parentenv, handlers[[1L]]) eval_f(x0, ...) }, error = function (cnd) 41: 14: withRestartList(expr, restarts[-nr]) 5: {tryCatch(expr, error = function(e) { 3: nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) 4: doTryCatch(return(expr), name, parentenv, handler) call <- conditionCall(e) watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd)tryCatchOne(expr, names, parentenv, handlers[[1L]]) if (!is.null(call)) { }, error = function(e) { }) 5: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, 48: 36: doWithOneRestart(return(expr), restart) if (identical(call[[1L]], quote(doTryCatch))) switch(on_error, continue = invokeRestart("eval_continue"), 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { 6: 37: tryCatchOne(expr, names, parentenv, handlers[[1L]])10: call <- sys.call(-4L) stop = invokeRestart("eval_stop"), error = NULL)}) withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), lapply(X = S, FUN = FUN, ...)withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) call <- conditionCall(e) 38: withRestartList(expr, restarts) if (!is.null(result)) {tryCatchList(expr, classes, parentenv, handlers) error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L 6: tryCatchList(expr, classes, parentenv, handlers) 7: keep_message = if (is.numeric(options$message)) TRUE else options$message, model$fail <- FALSE11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) stop_on_error = if (is.numeric(options$error)) options$error else {xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), 39: error = function(e) {tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options)}, error = function(e) {}) if (options$error && options$include) 30: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) sm <- strsplit(conditionMessage(e), "\n")[[1L]] model$coefficients <- result$solution 7: dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") LONG <- 75L if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " else prefix <- "Error : " tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) if (progress && is.function(pb$interrupt)) 13: tryCatchList(expr, classes, parentenv, handlers) 14: model$logLik <- as.numeric(-1 * result$objective) msg <- paste0(prefix, conditionMessage(e), "\n")}, error = function(e) { 8: tryCatch(expr, error = function(e) { 0L msg <- paste0(prefix, conditionMessage(e), "\n")eval(call) 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ else 2L47: call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") pb$interrupt()process_group(group)system.time({ .Internal(seterrmessage(msg[1L]))}) 8: system.time({ model <- mi$model result <- NULL tryCatch({ result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, mi = mi, opts = mi$options) }, error = function(e) { }) if (!is.null(result)) { model$fail <- FALSE model$coefficients <- result$solution model$logLik <- as.numeric(-1 * result$objective) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 9: FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: .Internal(seterrmessage(msg[1L]))48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { }, output_handler = knit_handlers(options$render, options)) 42: if (!silent && isTRUE(getOption("show.error.messages"))) {evaluate::evaluate(...) .Internal(seterrmessage(msg[1L]))in_dir(input_dir(), expr) cnd = tryCatch(rlang::entrace(e), error = identity) if (!silent && isTRUE(getOption("show.error.messages"))) {41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) 43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 45: block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), model$iterations <- result$iterations model <- mi$model if (!silent && isTRUE(getOption("show.error.messages"))) { error = function(e) { cat(msg, file = outFile) model$status <- result$status .Internal(printDeferredWarnings()) model$message <- result$message cat(msg, file = outFile) } .Internal(printDeferredWarnings()) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], } invisible(structure(msg, class = "try-error", condition = e))43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, result <- NULL}) if (progress && is.function(pb$interrupt)) error <<- format(cnd) } else { 9: pb$interrupt() type = "b") rlang::entrace(e) }}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) tryCatch({ cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) keep_message = if (is.numeric(options$message)) TRUE else options$message, FUN(X[[i]], ...) 10: lapply(X = S, FUN = FUN, ...) 11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: if (w > LONG) 15: stop_on_error = if (is.numeric(options$error)) options$error else { if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { result <- nloptr::nloptr(x0 = mi$model$startVals, eval_f = mi$evalFuncs$objective, try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) mi = mi, opts = mi$options) rlang::entrace(e) } } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) {tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: if (is_R_CMD_build() || is_R_CMD_check()) { }, error = function(e) { if (options$error && options$include) sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) }) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e)) if (xfun::pkg_available("rlang", "1.0.0")) {18: 0L } 17: else 2Llapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, FUN(X[[i]], ...) invisible(structure(msg, class = "try-error", condition = e)) classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) cnd = tryCatch(rlang::entrace(e), error = identity) } if (!is.null(result)) { "brand"), scalePar = "price", numMultiStarts = 10) }, output_handler = knit_handlers(options$render, options))) if (is_R_CMD_build() || is_R_CMD_check()) { model$fail <- FALSE cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) }), function(loc) {}) } else { rlang::entrace(e)}) setwd(wd) 26: error <<- format(cnd) } model$coefficients <- result$solution 18: lapply(seq_len(cores), inner.do) write_utf8(res, output %n% stdout()) model$logLik <- as.numeric(-1 * result$objective) paste0("\nQuitting from ", loc, if (!is.null(error)) model$iterations <- result$iterations model$status <- result$status model$message <- result$message }}) 15: 9: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores)15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) } 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, }44: eng_r(options) 45: eval(expr, envir) 19: 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) 20: withCallingHandlers(expr, warning = function(w) if (inherits(w, classes)) tryInvokeRestart("muffleWarning")) 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage"))FUN(X[[i]], ...) 21: else { paste0("\n", rule(), error, "\n", rule()))10: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) lapply(X = S, FUN = FUN, ...) classes)) tryInvokeRestart("muffleMessage")) rlang::entrace(e)24: }, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) } block_exec(params)27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd)50: process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) } }), function(loc) {52: 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), runMultistart(modelInputs) }), function(loc) { setwd(wd) setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output)23: output_dir = getwd(), ...)suppressMessages(suppressWarnings(parallel::mclapply(miList, }11: doTryCatch(return(expr), name, parentenv, handler) 12: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 13: tryCatchList(expr, classes, parentenv, handlers) 14: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call, nlines = 1L) prefix <- paste("Error in", dcall, ": ") LONG <- 75L sm <- strsplit(conditionMessage(e), "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if (is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste0(prefix, "\n ") } else prefix <- "Error : " msg <- paste0(prefix, conditionMessage(e), "\n") .Internal(seterrmessage(msg[1L])) if (!silent && isTRUE(getOption("show.error.messages"))) { cat(msg, file = outFile) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error", condition = e))}) 15: try(lapply(X = S, FUN = FUN, ...), silent = TRUE) 16: sendMaster(try(lapply(X = S, FUN = FUN, ...), silent = TRUE)) 17: FUN(X[[i]], ...) 18: lapply(seq_len(cores), inner.do) 19: parallel::mclapply(miList, runModel, mc.cores = numCores) runModel, mc.cores = numCores)))parallel::mclapply(miList, runModel, mc.cores = numCores) if (on_warning$silence) { 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10) 26: 20: 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning") }23: withCallingHandlers(expr, warning = function(w) if (inherits(w, invokeRestart("muffleWarning") 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt()suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10) 26: eval(expr, envir) 27: if (xfun::pkg_available("rlang", "1.0.0")) { classes)) tryInvokeRestart("muffleWarning"))20: eval(expr, envir) write_utf8(res, output %n% stdout())}, error = function (cnd) if (is_R_CMD_build() || is_R_CMD_check()) {eval(expr, envir) cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } paste0("\nQuitting from ", loc, if (!is.null(error)) 53: 21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) 22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage")) 23: suppressMessages(suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores))) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10) 26: eval(expr, envir) 27: eval(expr, envir) 28: withVisible(eval(expr, envir)) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc)withCallingHandlers(expr, warning = function(w) if (inherits(w, vweave_rmarkdown(...)27: eval(expr, envir) 28: withVisible(eval(expr, envir)) 29: { } }) 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else { rlang::entrace(e) } } }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) withCallingHandlers(code, message = function (cnd) { watcher$capture_plot_and_output() if (on_message$capture) { watcher$push(cnd) } if (on_message$silence) { invokeRestart("muffleMessage") } paste0("\n", rule(), error, "\n", rule())) }50: watcher$capture_plot_and_output()28: 51: process_file(text, output) classes)) tryInvokeRestart("muffleWarning"))knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet)}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) 29: withCallingHandlers(code, message = function (cnd) {}, warning = function (cnd) cnd <- sanitize_call(cnd)50: if (!have.makefile && vignette_is_tex(output)) { watcher$capture_plot_and_output()}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) if (on_message$capture) { watcher$push(cnd) }21: suppressWarnings(parallel::mclapply(miList, runModel, mc.cores = numCores)) if (on_message$silence) { watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL) texi2pdf(file = output, clean = FALSE, quiet = quiet)withVisible(eval(expr, envir)){ switch(on_error, continue = invokeRestart("eval_continue"), })54: if (getOption("warn") >= 2 || getOption("warn") < 0) { return() }51: output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e))) }) 59: tools:::.buildOneVignette("predict.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "predict", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7fdbe4f7.rds") knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet)An irrecoverable exception occurred. R is aborting now ... watcher$capture_plot_and_output()30: process_file(text, output) invokeRestart("muffleMessage") }}, warning = function (cnd) { if (getOption("warn") >= 2 || getOption("warn") < 0) { return() } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) } if (on_warning$silence) { invokeRestart("muffleWarning")22: withCallingHandlers(expr, message = function(c) if (inherits(c, classes)) tryInvokeRestart("muffleMessage"))engine$weave(file, quiet = quiet, encoding = enc)29: eval(call)52: } if (on_warning$capture) { stop = invokeRestart("eval_stop"), error = NULL) withCallingHandlers(code, message = function (cnd) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), cnd <- sanitize_call(cnd)23: output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: suppressMessages(suppressWarnings(parallel::mclapply(miList, 31: engine$weave(file, quiet = quiet, encoding = enc)55: eval(call)}, error = function (cnd) output_dir = getwd(), ...)doTryCatch(return(expr), name, parentenv, handler) runModel, mc.cores = numCores)))}) watcher$push(cnd) 24: runMultistart(modelInputs) 25: logitr(data = yogurt, outcome = "choice", obsID = "obsID", pars = c("feat", "brand"), scalePar = "price", numMultiStarts = 10) } {26: { if (on_warning$silence) { watcher$capture_plot_and_output() watcher$capture_plot_and_output() cnd <- sanitize_call(cnd)eval(expr, envir)30: invokeRestart("muffleWarning")32: if (on_message$capture) {eval(call) }}, error = function (cnd) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output()56: 30: eval(call) 31: eval(call) watcher$print_value(ev$value, ev$visible, envir) 53: 55: watcher$push(cnd) watcher$push(cnd) }vweave_rmarkdown(...) TRUE 54: } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) 27: doTryCatch(return(expr), name, parentenv, handler){tryCatchOne(expr, names, parentenv, handlers[[1L]])31: 32: 57: tryCatchList(expr, classes, parentenv, handlers) if (getOption("warn") >= 2 || getOption("warn") < 0) {with_handlers({ engine$weave(file, quiet = quiet, encoding = enc)eval(call)56: return() switch(on_error, continue = invokeRestart("eval_continue"), stop = invokeRestart("eval_stop"), error = NULL)}) 30: eval(call) 31: } for (expr in tle$exprs) {}, handlers) ev <- withVisible(eval(expr, envir)) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: 32: eval(expr, envir)tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))})eval(call) watcher$capture_plot_and_output() 58: 55: doTryCatch(return(expr), name, parentenv, handler) watcher$capture_plot_and_output()tryCatch({ watcher$print_value(ev$value, ev$visible, envir)with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) 35: withRestartList(expr, restarts[-nr]) 36: doWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 38: withRestartList(expr, restarts) 39: withRestarts(with_handlers({ withRestartList(expr, restarts[-nr]) engine$weave(file, quiet = quiet, encoding = enc) for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 28: 59: 40: 32: 36: 56: tools:::.buildOneVignette("predict.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", tryCatchOne(expr, names, parentenv, handlers[[1L]]) if (on_warning$capture) { cnd <- sanitize_call(cnd) watcher$push(cnd) }withVisible(eval(expr, envir)) } TRUE, FALSE, "predict", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7fdbe4f7.rds")evaluate::evaluate(...)doWithOneRestart(return(expr), restart)29: TRUE if (on_warning$silence) {withCallingHandlers(code, message = function (cnd) }, handlers) with_handlers({ setwd(startdir){ 57: tryCatchList(expr, classes, parentenv, handlers) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 41: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { for (expr in tle$exprs) { invokeRestart("muffleWarning") ev <- withVisible(eval(expr, envir)) 38: withRestartList(expr, restarts) if (options$error && options$include) 0L else 2L 58: 33: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc)doWithOneRestart(return(expr), restart) output <- find_vignette_product(name, by = "weave", engine = engine) } An irrecoverable exception occurred. R is aborting now ... watcher$capture_plot_and_output()}, error = function (cnd) 34: 39: { setwd(startdir) watcher$capture_plot_and_output() if (!have.makefile && vignette_is_tex(output)) {withRestarts(with_handlers({ if (on_message$capture) { watcher$capture_plot_and_output() cnd <- sanitize_call(cnd)withOneRestart(expr, restarts[[1L]]) for (expr in tle$exprs) { watcher$push(cnd) }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) output <- find_vignette_product(name, by = "weave", engine = engine) ev <- withVisible(eval(expr, envir))35: watcher$push(cnd) watcher$print_value(ev$value, ev$visible, envir) } TRUE}, handlers) 33: doWithOneRestart(return(expr), restart) 34: withOneRestart(expr, restarts[[1L]]) switch(on_error, continue = invokeRestart("eval_continue"), watcher$capture_plot_and_output() } if (on_message$silence) { invokeRestart("muffleMessage") }}, warning = function (cnd) watcher$print_value(ev$value, ev$visible, envir)withRestartList(expr, restarts[-nr]) texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) stop = invokeRestart("eval_stop"), error = NULL) } }}) }, error = function(e) {43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, 36: keep_message = if (is.numeric(options$message)) TRUE else options$message, TRUEdoWithOneRestart(return(expr), restart) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) { stop_on_error = if (is.numeric(options$error)) options$error else {38: if (!have.makefile && vignette_is_tex(output)) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", withRestartList(expr, restarts) if (options$error && options$include) if (getOption("warn") >= 2 || getOption("warn") < 0) { 0L 39: return() file, conditionMessage(e)))30: }) } watcher$capture_plot_and_output() if (on_warning$capture) { cnd <- sanitize_call(cnd) texi2pdf(file = output, clean = FALSE, quiet = quiet)35: else 2LwithRestarts(with_handlers({ }, output_handler = knit_handlers(options$render, options))) watcher$push(cnd) }eval(call) 59: }, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE)tools:::.buildOneVignette("predict.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", if (on_warning$silence) { output <- find_vignette_product(name, by = "texi2pdf", TRUE, FALSE, "predict", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7fdbe4f7.rds") invokeRestart("muffleWarning")40: withRestartList(expr, restarts[-nr])31: for (expr in tle$exprs) {evaluate::evaluate(...) }}, error = function (cnd) { watcher$capture_plot_and_output() ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() cnd <- sanitize_call(cnd) watcher$push(cnd) engine = engine)36: eval(call) watcher$print_value(ev$value, ev$visible, envir) }doWithOneRestart(return(expr), restart) } TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) 40: evaluate::evaluate(...)}, error = function(e) { OK <<- FALSE switch(on_error, continue = invokeRestart("eval_continue"), An irrecoverable exception occurred. R is aborting now ... 32: 37: 41: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]])evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, 44: with_handlers({ stop = invokeRestart("eval_stop"), error = NULL) message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", stop_on_error = if (is.numeric(options$error)) options$error else {}) 30: eval(call) 38: eng_r(options) file, conditionMessage(e)))}) 59: for (expr in tle$exprs) {tools:::.buildOneVignette("predict.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", withRestartList(expr, restarts) TRUE, FALSE, "predict", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7fdbe4f7.rds") An irrecoverable exception occurred. R is aborting now ... 45: block_exec(params) 46: 31: eval(call) 32: with_handlers({ for (expr in tle$exprs) { if (options$error && options$include) 0L else 2L }, output_handler = knit_handlers(options$render, options)) 42: in_dir(input_dir(), expr) ev <- withVisible(eval(expr, envir)) ev <- withVisible(eval(expr, envir))41: watcher$capture_plot_and_output()call_block(x) evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, 43: keep_message = if (is.numeric(options$message)) TRUE else options$message, in_input_dir(evaluate(code, envir = env, new_device = FALSE, 39: stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) watcher$print_value(ev$value, ev$visible, envir) keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, }withRestarts(with_handlers({ watcher$capture_plot_and_output() 47: process_group(group) watcher$print_value(ev$value, ev$visible, envir) for (expr in tle$exprs) { keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { 0L } else 2L48: if (options$error && options$include) TRUEwithCallingHandlers(if (tangle) process_tangle(group) else process_group(group), }, handlers) 0L ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir) error = function(e) { TRUE else 2L }33: }, handlers)doWithOneRestart(return(expr), restart) }, output_handler = knit_handlers(options$render, options)) TRUE}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) }, output_handler = knit_handlers(options$render, options))) if (progress && is.function(pb$interrupt)) 33: 40: evaluate::evaluate(...)42: 44: 41: eng_r(options)34: withOneRestart(expr, restarts[[1L]]) 35: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { keep_message = if (is.numeric(options$message)) TRUE else options$message, stop_on_error = if (is.numeric(options$error)) options$error else { if (is_R_CMD_build() || is_R_CMD_check()) {withRestartList(expr, restarts[-nr]) if (options$error && options$include) doWithOneRestart(return(expr), restart) 36: cnd = tryCatch(rlang::entrace(e), error = identity)34: 45: block_exec(params)doWithOneRestart(return(expr), restart)in_dir(input_dir(), expr)withOneRestart(expr, restarts[[1L]]) 37: withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) 46: call_block(x) 47: 0L43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, 38: error <<- format(cnd) } else { rlang::entrace(e) } } }) 49: withRestartList(expr, restarts) 35: stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) 0L39: else 2Lprocess_group(group) }, output_handler = knit_handlers(options$render, options))) 44: eng_r(options) 48: withRestarts(with_handlers({45: block_exec(params)withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { for (expr in tle$exprs) { error = function(e) { ev <- withVisible(eval(expr, envir))46: watcher$capture_plot_and_output() watcher$print_value(ev$value, ev$visible, envir)call_block(x) if (progress && is.function(pb$interrupt)) else 2L if (progress && is.function(pb$interrupt)) } }, output_handler = knit_handlers(options$render, options)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) {47: withRestartList(expr, restarts[-nr])process_group(group)42: if (is_R_CMD_build() || is_R_CMD_check()) { 48: pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) {in_dir(input_dir(), expr) if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity)36: cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } doWithOneRestart(return(expr), restart)43: in_input_dir(evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, keep_message = if (is.numeric(options$message)) TRUE else options$message, TRUE stop_on_error = if (is.numeric(options$error)) options$error else { if (options$error && options$include) error <<- format(cnd) } else { rlang::entrace(e) 0L37: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) else 2L else { } }, output_handler = knit_handlers(options$render, options))) pb$interrupt() rlang::entrace(e)withOneRestart(withRestartList(expr, restarts[-nr]), restarts[[nr]]) if (xfun::pkg_available("rlang", "1.0.0")) { } if (is_R_CMD_build() || is_R_CMD_check()) {}, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE) } cnd = tryCatch(rlang::entrace(e), error = identity)44: eng_r(options) 45: 38: }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) } error <<- format(cnd)block_exec(params) }withRestartList(expr, restarts) 39: withRestarts(with_handlers({ for (expr in tle$exprs) { ev <- withVisible(eval(expr, envir)) watcher$capture_plot_and_output() paste0("\nQuitting from ", loc, if (!is.null(error)) 40: evaluate::evaluate(...) watcher$print_value(ev$value, ev$visible, envir) else { rlang::entrace(e) paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) }50: process_file(text, output)46: 41: }evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, }) TRUE } keep_message = if (is.numeric(options$message)) TRUE else options$message, }, handlers), eval_continue = function() TRUE, eval_stop = function() FALSE)call_block(x) stop_on_error = if (is.numeric(options$error)) options$error else {51: if (options$error && options$include) 0L 40: evaluate::evaluate(...) }) else 2L 49: 41: }, output_handler = knit_handlers(options$render, options))knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 49: 47: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), 42: process_group(group) error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity)xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), in_dir(input_dir(), expr) error = function(e) { 55: error <<- format(cnd) } else { rlang::entrace(e) }doTryCatch(return(expr), name, parentenv, handler) } }), function(loc) { setwd(wd)43: 56: tryCatchOne(expr, names, parentenv, handlers[[1L]])48: evaluate(code, envir = env, new_device = FALSE, keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { keep_message = if (is.numeric(options$message)) TRUE else options$message, cnd = tryCatch(rlang::entrace(e), error = identity) if (progress && is.function(pb$interrupt)) in_input_dir(evaluate(code, envir = env, new_device = FALSE, stop_on_error = if (is.numeric(options$error)) options$error else { error <<- format(cnd) if (options$error && options$include) pb$interrupt() 57: keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ keep_message = if (is.numeric(options$message)) TRUE else options$message, write_utf8(res, output %n% stdout()) } else { stop_on_error = if (is.numeric(options$error)) options$error else { engine$weave(file, quiet = quiet, encoding = enc) 0L paste0("\nQuitting from ", loc, if (!is.null(error)) if (xfun::pkg_available("rlang", "1.0.0")) { else 2L setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { }, output_handler = knit_handlers(options$render, options)) texi2pdf(file = output, clean = FALSE, quiet = quiet) rlang::entrace(e) } } }) paste0("\n", rule(), error, "\n", rule())) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) if (options$error && options$include) if (is_R_CMD_build() || is_R_CMD_check()) { 0L }, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) cnd = tryCatch(rlang::entrace(e), error = identity) } error <<- format(cnd)49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), }50: 42: in_dir(input_dir(), expr) error = function(e) {process_file(text, output) 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 43: 52: else 2Lin_input_dir(evaluate(code, envir = env, new_device = FALSE, }, error = function(e) { keep_warning = if (is.numeric(options$warning)) TRUE else options$warning, }, output_handler = knit_handlers(options$render, options))) keep_message = if (is.numeric(options$message)) TRUE else options$message, 44: eng_r(options)rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), 45: output_dir = getwd(), ...) stop_on_error = if (is.numeric(options$error)) options$error else {block_exec(params) else { if (progress && is.function(pb$interrupt)) if (options$error && options$include) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) { if (is_R_CMD_build() || is_R_CMD_check()) { 0L rlang::entrace(e) OK <<- FALSE53: 46: else 2Lvweave_rmarkdown(...) cnd = tryCatch(rlang::entrace(e), error = identity) } }, output_handler = knit_handlers(options$render, options)))call_block(x) 47: error <<- format(cnd) 54: message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", engine$weave(file, quiet = quiet, encoding = enc)process_group(group)44: } else { rlang::entrace(e) file, conditionMessage(e)))})48: 55: doTryCatch(return(expr), name, parentenv, handler)59: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), eng_r(options) } }45: tools:::.buildOneVignette("predict.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", }), function(loc) { setwd(wd) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) paste0("\n", rule(), error, "\n", rule()))56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) TRUE, FALSE, "predict", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7fdbe4f7.rds") } }), function(loc) { error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) {}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc)block_exec(params) 46: call_block(x) 47: process_group(group) 48: withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) {50: process_file(text, output)57: if (is_R_CMD_build() || is_R_CMD_check()) {51: if (progress && is.function(pb$interrupt)) knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) cnd = tryCatch(rlang::entrace(e), error = identity) setwd(wd) 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) write_utf8(res, output %n% stdout()) paste0("\nQuitting from ", loc, if (!is.null(error)) error <<- format(cnd) pb$interrupt()tryCatchList(expr, classes, parentenv, handlers)An irrecoverable exception occurred. R is aborting now ... if (xfun::pkg_available("rlang", "1.0.0")) { } else {53: vweave_rmarkdown(...) rlang::entrace(e) } } paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) 50: process_file(text, output) }) if (is_R_CMD_build() || is_R_CMD_check()) { 49: xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) {54: cnd = tryCatch(rlang::entrace(e), error = identity)engine$weave(file, quiet = quiet, encoding = enc) error <<- format(cnd) if (is_R_CMD_build() || is_R_CMD_check()) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd)55: } } else { else {58: tryCatch({ rlang::entrace(e) } }51: rlang::entrace(e) engine$weave(file, quiet = quiet, encoding = enc)knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) }), function(loc) { } setwd(wd)doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) write_utf8(res, output %n% stdout())52: } }) 49: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), 57: setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", tryCatchList(expr, classes, parentenv, handlers) paste0("\nQuitting from ", loc, if (!is.null(error)) output_dir = getwd(), ...) 53: paste0("\n", rule(), error, "\n", rule()))58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir)}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc)xfun:::handle_error(withCallingHandlers(if (tangle) process_tangle(group) else process_group(group), error = function(e) { if (progress && is.function(pb$interrupt)) pb$interrupt() if (xfun::pkg_available("rlang", "1.0.0")) {vweave_rmarkdown(...) if (is_R_CMD_build() || is_R_CMD_check()) { engine = engine) }}, error = function(e) { cnd = tryCatch(rlang::entrace(e), error = identity) error <<- format(cnd) } else {50: process_file(text, output) OK <<- FALSE rlang::entrace(e) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet)51: output <- find_vignette_product(name, by = "texi2pdf", } }knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 52: message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", 54: file, conditionMessage(e)))engine$weave(file, quiet = quiet, encoding = enc) engine = engine) }}, error = function(e) { }), function(loc) { 55: }) OK <<- FALSErmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) 53: doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) setwd(wd)57: message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))59: tryCatchList(expr, classes, parentenv, handlers)vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) }) 59: tools:::.buildOneVignette("predict.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "predict", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7fdbe4f7.rds") An irrecoverable exception occurred. R is aborting now ... 55: tools:::.buildOneVignette("predict.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", doTryCatch(return(expr), name, parentenv, handler)58: write_utf8(res, output %n% stdout())tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { paste0("\nQuitting from ", loc, if (!is.null(error)) texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e))) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: paste0("\n", rule(), error, "\n", rule()))}, if (labels[i] != "") sprintf(" [%s]", labels[i]), get_loc) }) TRUE, FALSE, "predict", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7fdbe4f7.rds") An irrecoverable exception occurred. R is aborting now ... 50: tryCatchList(expr, classes, parentenv, handlers)process_file(text, output)59: tools:::.buildOneVignette("predict.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "predict", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7fdbe4f7.rds") 51: knitr::knit(knit_input, knit_output, envir = envir, quiet = quiet) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) {An irrecoverable exception occurred. R is aborting now ... 52: rmarkdown::render(file, encoding = encoding, quiet = quiet, envir = globalenv(), output_dir = getwd(), ...) texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) } 53: }, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) vweave_rmarkdown(...) 54: engine$weave(file, quiet = quiet, encoding = enc) 55: 59: tools:::.buildOneVignette("predict.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "predict", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7fdbe4f7.rds") An irrecoverable exception occurred. R is aborting now ... doTryCatch(return(expr), name, parentenv, handler) 56: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 57: tryCatchList(expr, classes, parentenv, handlers) 58: tryCatch({ engine$weave(file, quiet = quiet, encoding = enc) setwd(startdir) output <- find_vignette_product(name, by = "weave", engine = engine) if (!have.makefile && vignette_is_tex(output)) { texi2pdf(file = output, clean = FALSE, quiet = quiet) output <- find_vignette_product(name, by = "texi2pdf", engine = engine) }}, error = function(e) { OK <<- FALSE message(gettextf("Error: processing vignette '%s' failed with diagnostics:\n%s", file, conditionMessage(e)))}) 59: tools:::.buildOneVignette("predict.Rmd", "/Volumes/Builds/packages/big-sur-arm64/results/4.5/logitr.Rcheck/vign_test/logitr", TRUE, FALSE, "predict", "UTF-8", "/Volumes/Temp/tmp/RtmpD1iFVK/file46ea7fdbe4f7.rds") An irrecoverable exception occurred. R is aborting now ... Quitting from predict.Rmd:91-109 [unnamed-chunk-5] ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ <error/rlang_error> Error in `names(x) <- value`: ! 'names' attribute [3] must be the same length as the vector [0] --- Backtrace: ▆ 1. └─logitr::logitr(...) 2. └─logitr:::getMultistartSummary(allModels) 3. └─base::`colnames<-`(...) ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ Error: processing vignette 'predict.Rmd' failed with diagnostics: 'names' attribute [3] must be the same length as the vector [0] --- failed re-building ‘predict.Rmd’ --- re-building ‘summarizing_results.Rmd’ using rmarkdown --- finished re-building ‘summarizing_results.Rmd’ --- re-building ‘utility_models.Rmd’ using rmarkdown --- finished re-building ‘utility_models.Rmd’ SUMMARY: processing the following files failed: ‘basic_usage.Rmd’ ‘mnl_models.Rmd’ ‘mnl_models_weighted.Rmd’ ‘predict.Rmd’ Error: Vignette re-building failed. Execution halted Flavor: r-release-macos-arm64