CRAN Package Check Results for Package bvpSolve

Last updated on 2020-07-02 02:09:44 CEST.

Flavor Version Tinstall Tcheck Ttotal Status Flags
r-devel-linux-x86_64-debian-clang 1.4 30.76 102.82 133.58 OK
r-devel-linux-x86_64-debian-gcc 1.4 26.10 72.55 98.65 OK
r-devel-linux-x86_64-fedora-clang 1.4 165.17 OK
r-devel-linux-x86_64-fedora-gcc 1.4 161.08 OK
r-devel-windows-ix86+x86_64 1.4 86.00 147.00 233.00 OK
r-patched-linux-x86_64 1.4 30.76 99.42 130.18 OK
r-patched-solaris-x86 1.4 192.70 OK
r-release-linux-x86_64 1.4 30.60 98.47 129.07 OK
r-release-osx-x86_64 1.4 ERROR
r-release-windows-ix86+x86_64 1.4 66.00 120.00 186.00 OK
r-oldrel-osx-x86_64 1.4 ERROR
r-oldrel-windows-ix86+x86_64 1.4 76.00 167.00 243.00 OK

Check Details

Version: 1.4
Check: examples
Result: ERROR
    Running examples in ‘bvpSolve-Ex.R’ failed
    The error most likely occurred in:
    
    > ### Name: bvpcol
    > ### Title: Solves multipoint boundary value problems of ordinary
    > ### differential equations or differential algebraic equations, using a
    > ### collocation method.
    > ### Aliases: bvpcol
    > ### Keywords: math
    >
    > ### ** Examples
    >
    > ## =============================================================================
    > ## Example 1: simple standard problem
    > ## solve the BVP ODE:
    > ## d2y/dt^2=-3py/(p+t^2)^2
    > ## y(t= -0.1)=-0.1/sqrt(p+0.01)
    > ## y(t= 0.1)= 0.1/sqrt(p+0.01)
    > ## where p = 1e-5
    > ##
    > ## analytical solution y(t) = t/sqrt(p + t^2).
    > ##
    > ## The problem is rewritten as a system of 2 ODEs:
    > ## dy=y2
    > ## dy2=-3p*y/(p+t^2)^2
    > ## =============================================================================
    >
    > #--------------------------------
    > # Derivative function
    > #--------------------------------
    > fun <- function(t, y, pars) {
    + dy1 <- y[2]
    + dy2 <- - 3 * p * y[1] / (p+t*t)^2
    + return(list(c(dy1,
    + dy2))) }
    >
    > # parameter value
    > p <- 1e-5
    >
    > # initial and final condition; second conditions unknown
    > init <- c(-0.1 / sqrt(p+0.01), NA)
    > end <- c( 0.1 / sqrt(p+0.01), NA)
    >
    > # Solve bvp
    > sol <- bvpcol(yini = init, yend = end,
    + x = seq(-0.1, 0.1, by = 0.001), func = fun)
    
     *** caught segfault ***
    address 0x0, cause 'memory not mapped'
    
    Traceback:
     1: bvpsolver(2, yini, x, func, yend, parms, order, ynames, xguess, yguess, jacfunc, bound, jacbound, leftbc, posbound, islin, nmax, ncomp, atol, dllname, initfunc, rpar, ipar, nout, outnames, forcings, initforc, fcontrol, verbose, cond = FALSE, lobatto = FALSE, allpoints = TRUE, colp = colp, fullOut = fullOut, bspline = bspline, eps = NULL, epsini = NULL, dae = dae, ...)
     2: bvpcol(yini = init, yend = end, x = seq(-0.1, 0.1, by = 0.001), func = fun)
    An irrecoverable exception occurred. R is aborting now ...
Flavors: r-release-osx-x86_64, r-oldrel-osx-x86_64

Version: 1.4
Check: running R code from vignettes
Result: ERROR
    Errors in running code in vignettes:
    when running code in ‘bvpSolve.Rnw’
     ...
     7: withVisible(eval(ei, envir))
     8: source(output, echo = TRUE)
     9: doTryCatch(return(expr), name, parentenv, handler)
    10: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    11: tryCatchList(expr, classes, parentenv, handlers)
    12: tryCatch({ source(output, echo = TRUE)}, error = function(e) { cat("\n When sourcing ", sQuote(output), ":\n", sep = "") stop(conditionMessage(e), call. = FALSE, domain = NA)})
    13: tools:::.run_one_vignette("bvpSolve.Rnw", "/Volumes/Builds/packages/high-sierra-x86_64/results/4.0/bvpSolve.Rcheck/00_pkg_src/bvpSolve/vignettes", encoding = "latin1", pkgdir = "/Volumes/Builds/packages/high-sierra-x86_64/results/4.0/bvpSolve.Rcheck/00_pkg_src/bvpSolve")
    An irrecoverable exception occurred. R is aborting now ...
    
    ... incomplete output. Crash?
    when running code in ‘bvpTests.Rnw’
     ...
     7: withVisible(eval(ei, envir))
     8: source(output, echo = TRUE)
     9: doTryCatch(return(expr), name, parentenv, handler)
    10: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    11: tryCatchList(expr, classes, parentenv, handlers)
    12: tryCatch({ source(output, echo = TRUE)}, error = function(e) { cat("\n When sourcing ", sQuote(output), ":\n", sep = "") stop(conditionMessage(e), call. = FALSE, domain = NA)})
    13: tools:::.run_one_vignette("bvpTests.Rnw", "/Volumes/Builds/packages/high-sierra-x86_64/results/4.0/bvpSolve.Rcheck/00_pkg_src/bvpSolve/vignettes", encoding = "latin1", pkgdir = "/Volumes/Builds/packages/high-sierra-x86_64/results/4.0/bvpSolve.Rcheck/00_pkg_src/bvpSolve")
    An irrecoverable exception occurred. R is aborting now ...
    
    ... incomplete output. Crash?
    
     ‘bvpSolve.Rnw’ using ‘latin1’... failed to complete the test
     ‘bvpTests.Rnw’ using ‘latin1’... failed to complete the test
Flavor: r-release-osx-x86_64

Version: 1.4
Check: re-building of vignette outputs
Result: NOTE
    Error(s) in re-building vignettes:
    sh: line 1: 92628 Segmentation fault: 11 '/Library/Frameworks/R.framework/Resources/bin/R' --vanilla --no-echo > '/Volumes/Temp/tmp/RtmpMS9s76/file168f96f89d57e' 2>&1 < '/Volumes/Temp/tmp/RtmpMS9s76/file168f9421f7c67'
    --- re-building ‘bvpSolve.Rnw’ using Sweave
    Loading required package: deSolve
    
    Attaching package: ‘bvpSolve’
    
    The following object is masked from ‘package:stats’:
    
     approx
    
    
     *** caught segfault ***
    address 0x0, cause 'memory not mapped'
    
    Traceback:
     1: bvpsolver(1, yini, x, func, yend, parms, order, ynames, xguess, yguess, jacfunc, bound, jacbound, leftbc, posbound, islin, nmax, ncomp, atol, dllname, initfunc, rpar, ipar, nout, outnames, forcings, initforc, fcontrol, verbose, cond, lobatto, allpoints, colp = NULL, fullOut = TRUE, bspline = TRUE, eps = NULL, epsini = NULL, dae = NULL, ...)
     2: bvptwp(yini = c(-1, NA), yend = c(1, NA), x = x, func = fun)
     3: system.time(sol2 <- bvptwp(yini = c(-1, NA), yend = c(1, NA), x = x, func = fun))
     4: print(system.time(sol2 <- bvptwp(yini = c(-1, NA), yend = c(1, NA), x = x, func = fun)))
     5: eval(expr, .GlobalEnv)
     6: eval(expr, .GlobalEnv)
     7: withVisible(eval(expr, .GlobalEnv))
     8: doTryCatch(return(expr), name, parentenv, handler)
     9: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    10: tryCatchList(expr, classes, parentenv, handlers)
    11: 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)[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))})
    12: try(withVisible(eval(expr, .GlobalEnv)), silent = TRUE)
    13: evalFunc(ce, options)
    14: tryCatchList(expr, classes, parentenv, handlers)
    15: tryCatch(evalFunc(ce, options), finally = { cat("\n") sink()})
    16: driver$runcode(drobj, chunk, chunkopts)
    17: utils::Sweave(...)
    18: engine$weave(file, quiet = quiet, encoding = enc)
    19: doTryCatch(return(expr), name, parentenv, handler)
    20: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    21: tryCatchList(expr, classes, parentenv, handlers)
    22: 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)))})
    23: tools:::.buildOneVignette("bvpSolve.Rnw", "/Volumes/Builds/packages/high-sierra-x86_64/results/4.0/bvpSolve.Rcheck/vign_test/bvpSolve", TRUE, FALSE, "bvpSolve", "latin1", "/Volumes/Temp/tmp/RtmpMS9s76/file168f97a53635.rds")
    An irrecoverable exception occurred. R is aborting now ...
    sh: line 1: 92900 Segmentation fault: 11 '/Library/Frameworks/R.framework/Resources/bin/R' --vanilla --no-echo > '/Volumes/Temp/tmp/RtmpMS9s76/file168f958a00d9a' 2>&1 < '/Volumes/Temp/tmp/RtmpMS9s76/file168f973dd26ea'
    --- re-building ‘bvpTests.Rnw’ using Sweave
    Loading required package: deSolve
    
    Attaching package: ‘bvpSolve’
    
    The following object is masked from ‘package:stats’:
    
     approx
    
    
     *** caught segfault ***
    address 0x0, cause 'memory not mapped'
    
    Traceback:
     1: bvpsolver(1, yini, x, func, yend, parms, order, ynames, xguess, yguess, jacfunc, bound, jacbound, leftbc, posbound, islin, nmax, ncomp, atol, dllname, initfunc, rpar, ipar, nout, outnames, forcings, initforc, fcontrol, verbose, cond, lobatto, allpoints, colp = NULL, fullOut = TRUE, bspline = TRUE, eps = NULL, epsini = NULL, dae = NULL, ...)
     2: bvptwp(yini = c(1, NA), yend = c(0, NA), x = seq(0, 1, by = 0.01), func = Prob1)
     3: system.time(mod1 <- bvptwp(yini = c(1, NA), yend = c(0, NA), x = seq(0, 1, by = 0.01), func = Prob1))
     4: print(system.time(mod1 <- bvptwp(yini = c(1, NA), yend = c(0, NA), x = seq(0, 1, by = 0.01), func = Prob1)))
     5: eval(expr, .GlobalEnv)
     6: eval(expr, .GlobalEnv)
     7: withVisible(eval(expr, .GlobalEnv))
     8: doTryCatch(return(expr), name, parentenv, handler)
     9: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    10: tryCatchList(expr, classes, parentenv, handlers)
    11: 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)[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))})
    12: try(withVisible(eval(expr, .GlobalEnv)), silent = TRUE)
    13: evalFunc(ce, options)
    14: tryCatchList(expr, classes, parentenv, handlers)
    15: tryCatch(evalFunc(ce, options), finally = { cat("\n") sink()})
    16: driver$runcode(drobj, chunk, chunkopts)
    17: utils::Sweave(...)
    18: engine$weave(file, quiet = quiet, encoding = enc)
    19: doTryCatch(return(expr), name, parentenv, handler)
    20: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    21: tryCatchList(expr, classes, parentenv, handlers)
    22: 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)))})
    23: tools:::.buildOneVignette("bvpTests.Rnw", "/Volumes/Builds/packages/high-sierra-x86_64/results/4.0/bvpSolve.Rcheck/vign_test/bvpSolve", TRUE, FALSE, "bvpTests", "latin1", "/Volumes/Temp/tmp/RtmpMS9s76/file168f92120701b.rds")
    An irrecoverable exception occurred. R is aborting now ...
    SUMMARY: processing the following files failed:
     ‘bvpSolve.Rnw’ ‘bvpTests.Rnw’
    
    Error: Vignette re-building failed.
    Execution halted
Flavor: r-release-osx-x86_64

Version: 1.4
Check: running R code from vignettes
Result: ERROR
    Errors in running code in vignettes:
    when running code in ‘bvpSolve.Rnw’
     ...
     7: withVisible(eval(ei, envir))
     8: source(output, echo = TRUE)
     9: doTryCatch(return(expr), name, parentenv, handler)
    10: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    11: tryCatchList(expr, classes, parentenv, handlers)
    12: tryCatch({ source(output, echo = TRUE)}, error = function(e) { cat("\n When sourcing ", sQuote(output), ":\n", sep = "") stop(conditionMessage(e), call. = FALSE, domain = NA)})
    13: tools:::.run_one_vignette("bvpSolve.Rnw", "/Volumes/SSD-Data/Builds/R-dev-web/QA/Simon/packages/el-capitan-x86_64/results/3.6/bvpSolve.Rcheck/00_pkg_src/bvpSolve/vignettes", encoding = "latin1", pkgdir = "/Volumes/SSD-Data/Builds/R-dev-web/QA/Simon/packages/el-capitan-x86_64/results/3.6/bvpSolve.Rcheck/00_pkg_src/bvpSolve")
    An irrecoverable exception occurred. R is aborting now ...
    
    ... incomplete output. Crash?
    when running code in ‘bvpTests.Rnw’
     ...
     7: withVisible(eval(ei, envir))
     8: source(output, echo = TRUE)
     9: doTryCatch(return(expr), name, parentenv, handler)
    10: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    11: tryCatchList(expr, classes, parentenv, handlers)
    12: tryCatch({ source(output, echo = TRUE)}, error = function(e) { cat("\n When sourcing ", sQuote(output), ":\n", sep = "") stop(conditionMessage(e), call. = FALSE, domain = NA)})
    13: tools:::.run_one_vignette("bvpTests.Rnw", "/Volumes/SSD-Data/Builds/R-dev-web/QA/Simon/packages/el-capitan-x86_64/results/3.6/bvpSolve.Rcheck/00_pkg_src/bvpSolve/vignettes", encoding = "latin1", pkgdir = "/Volumes/SSD-Data/Builds/R-dev-web/QA/Simon/packages/el-capitan-x86_64/results/3.6/bvpSolve.Rcheck/00_pkg_src/bvpSolve")
    An irrecoverable exception occurred. R is aborting now ...
    
    ... incomplete output. Crash?
    
     ‘bvpSolve.Rnw’using ‘latin1’... failed to complete the test
     ‘bvpTests.Rnw’using ‘latin1’... failed to complete the test
Flavor: r-oldrel-osx-x86_64

Version: 1.4
Check: re-building of vignette outputs
Result: NOTE
    Error(s) in re-building vignettes:
    sh: line 1: 98295 Segmentation fault: 11 '/Library/Frameworks/R.framework/Resources/bin/R' --vanilla --slave > '/tmp/Rtmp24zWqe/file17ff27f689a4f' 2>&1 < '/tmp/Rtmp24zWqe/file17ff22c6af9e2'
    --- re-building ‘bvpSolve.Rnw’ using Sweave
    Loading required package: deSolve
    
    Attaching package: ‘bvpSolve’
    
    The following object is masked from ‘package:stats’:
    
     approx
    
    
     *** caught segfault ***
    address 0x0, cause 'memory not mapped'
    
    Traceback:
     1: bvpsolver(1, yini, x, func, yend, parms, order, ynames, xguess, yguess, jacfunc, bound, jacbound, leftbc, posbound, islin, nmax, ncomp, atol, dllname, initfunc, rpar, ipar, nout, outnames, forcings, initforc, fcontrol, verbose, cond, lobatto, allpoints, colp = NULL, fullOut = TRUE, bspline = TRUE, eps = NULL, epsini = NULL, dae = NULL, ...)
     2: bvptwp(yini = c(-1, NA), yend = c(1, NA), x = x, func = fun)
     3: system.time(sol2 <- bvptwp(yini = c(-1, NA), yend = c(1, NA), x = x, func = fun))
     4: print(system.time(sol2 <- bvptwp(yini = c(-1, NA), yend = c(1, NA), x = x, func = fun)))
     5: eval(expr, .GlobalEnv)
     6: eval(expr, .GlobalEnv)
     7: withVisible(eval(expr, .GlobalEnv))
     8: doTryCatch(return(expr), name, parentenv, handler)
     9: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    10: tryCatchList(expr, classes, parentenv, handlers)
    11: 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)[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))})
    12: try(withVisible(eval(expr, .GlobalEnv)), silent = TRUE)
    13: evalFunc(ce, options)
    14: tryCatchList(expr, classes, parentenv, handlers)
    15: tryCatch(evalFunc(ce, options), finally = { cat("\n") sink()})
    16: driver$runcode(drobj, chunk, chunkopts)
    17: utils::Sweave(...)
    18: engine$weave(file, quiet = quiet, encoding = enc)
    19: doTryCatch(return(expr), name, parentenv, handler)
    20: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    21: tryCatchList(expr, classes, parentenv, handlers)
    22: 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)))})
    23: tools:::.buildOneVignette("bvpSolve.Rnw", "/Volumes/SSD-Data/Builds/R-dev-web/QA/Simon/packages/el-capitan-x86_64/results/3.6/bvpSolve.Rcheck/vign_test/bvpSolve", TRUE, FALSE, "bvpSolve", "latin1", "/tmp/Rtmp24zWqe/file17ff217efc8cf.rds")
    An irrecoverable exception occurred. R is aborting now ...
    sh: line 1: 98301 Segmentation fault: 11 '/Library/Frameworks/R.framework/Resources/bin/R' --vanilla --slave > '/tmp/Rtmp24zWqe/file17ff21616284c' 2>&1 < '/tmp/Rtmp24zWqe/file17ff28afa0e8'
    --- re-building ‘bvpTests.Rnw’ using Sweave
    Loading required package: deSolve
    
    Attaching package: ‘bvpSolve’
    
    The following object is masked from ‘package:stats’:
    
     approx
    
    
     *** caught segfault ***
    address 0x0, cause 'memory not mapped'
    
    Traceback:
     1: bvpsolver(1, yini, x, func, yend, parms, order, ynames, xguess, yguess, jacfunc, bound, jacbound, leftbc, posbound, islin, nmax, ncomp, atol, dllname, initfunc, rpar, ipar, nout, outnames, forcings, initforc, fcontrol, verbose, cond, lobatto, allpoints, colp = NULL, fullOut = TRUE, bspline = TRUE, eps = NULL, epsini = NULL, dae = NULL, ...)
     2: bvptwp(yini = c(1, NA), yend = c(0, NA), x = seq(0, 1, by = 0.01), func = Prob1)
     3: system.time(mod1 <- bvptwp(yini = c(1, NA), yend = c(0, NA), x = seq(0, 1, by = 0.01), func = Prob1))
     4: print(system.time(mod1 <- bvptwp(yini = c(1, NA), yend = c(0, NA), x = seq(0, 1, by = 0.01), func = Prob1)))
     5: eval(expr, .GlobalEnv)
     6: eval(expr, .GlobalEnv)
     7: withVisible(eval(expr, .GlobalEnv))
     8: doTryCatch(return(expr), name, parentenv, handler)
     9: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    10: tryCatchList(expr, classes, parentenv, handlers)
    11: 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)[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))})
    12: try(withVisible(eval(expr, .GlobalEnv)), silent = TRUE)
    13: evalFunc(ce, options)
    14: tryCatchList(expr, classes, parentenv, handlers)
    15: tryCatch(evalFunc(ce, options), finally = { cat("\n") sink()})
    16: driver$runcode(drobj, chunk, chunkopts)
    17: utils::Sweave(...)
    18: engine$weave(file, quiet = quiet, encoding = enc)
    19: doTryCatch(return(expr), name, parentenv, handler)
    20: tryCatchOne(expr, names, parentenv, handlers[[1L]])
    21: tryCatchList(expr, classes, parentenv, handlers)
    22: 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)))})
    23: tools:::.buildOneVignette("bvpTests.Rnw", "/Volumes/SSD-Data/Builds/R-dev-web/QA/Simon/packages/el-capitan-x86_64/results/3.6/bvpSolve.Rcheck/vign_test/bvpSolve", TRUE, FALSE, "bvpTests", "latin1", "/tmp/Rtmp24zWqe/file17ff2233b7b36.rds")
    An irrecoverable exception occurred. R is aborting now ...
    SUMMARY: processing the following files failed:
     ‘bvpSolve.Rnw’ ‘bvpTests.Rnw’
    
    Error: Vignette re-building failed.
    Execution halted
Flavor: r-oldrel-osx-x86_64