[Date Prev][Date Next] [Thread Prev][Thread Next] [Date Index] [Thread Index]

Bug#972074: r-cran-bayestestr: autopkgtest regression



Source: r-cran-bayestestr
Version: 0.7.2-1
Severity: serious
Tags: sid bullseye
X-Debbugs-CC: debian-ci@lists.debian.org
User: debian-ci@lists.debian.org
Usertags: regression

Hi Maintainer

Since the removal of r-cran-rstanarm from testing on 2020-07-22,
r-cran-bayestestr's autopkgtests have been failing there [1].

However, r-cran-bayestestr's tests currently also fail in unstable
[2], where r-cran-rstanarm is still available.

I've copied what I hope is the relevant part of the log below.

Regards
Graham


[1] https://ci.debian.net/packages/r/r-cran-bayestestr/testing/amd64/
[2] https://ci.debian.net/packages/r/r-cran-bayestestr/unstable/amd64/


> library(testthat)
> library(bayestestR)
>
> if (length(strsplit(packageDescription("bayestestR")$Version, "\\.")[[1]]) > 3) {
+   Sys.setenv("RunAllbayestestRTests" = "yes")
+ } else {
+   Sys.setenv("RunAllbayestestRTests" = "no")
+ }
>
> test_check("bayestestR")

 *** caught segfault ***
address 0x7f4dcabb7008, cause 'invalid permissions'

Traceback:
 1: dyn.load(file, DLLpath = DLLpath, ...)
 2: library.dynam(lib, package, package.lib)
 3: loadNamespace(package, lib.loc)
 4: doTryCatch(return(expr), name, parentenv, handler)
 5: tryCatchOne(expr, names, parentenv, handlers[[1L]])
 6: tryCatchList(expr, classes, parentenv, handlers)
 7: tryCatch({    attr(package, "LibPath") <- which.lib.loc    ns <-
loadNamespace(package, lib.loc)    env <- attachNamespace(ns, pos =
pos, deps, exclude, include.only)}, error = function(e) {    P <- if
(!is.null(cc <- conditionCall(e)))         paste(" in",
deparse(cc)[1L])    else ""    msg <- gettextf("package or namespace
load failed for %s%s:\n %s",         sQuote(package), P,
conditionMessage(e))    if (logical.return)
message(paste("Error:", msg), domain = NA)    else stop(msg, call. =
FALSE, domain = NA)})
 8: library(package, lib.loc = lib.loc, character.only = TRUE,
logical.return = TRUE,     warn.conflicts = warn.conflicts, quietly =
quietly, mask.ok = mask.ok,     exclude = exclude, include.only =
include.only, attach.required = attach.required)
 9: doTryCatch(return(expr), name, parentenv, handler)
10: tryCatchOne(expr, names, parentenv, handlers[[1L]])
11: tryCatchList(expr, classes, parentenv, handlers)
12: tryCatch(library(package, lib.loc = lib.loc, character.only =
TRUE,     logical.return = TRUE, warn.conflicts = warn.conflicts,
quietly = quietly,     mask.ok = mask.ok, exclude = exclude,
include.only = include.only,     attach.required = attach.required),
error = function(e) e)
13: require("rstanarm")
14: eval(code, test_env)
15: eval(code, test_env)
16: withCallingHandlers({    eval(code, test_env)    if (!handled &&
!is.null(test)) {        skip_empty()    }}, expectation =
handle_expectation, skip = handle_skip, warning = handle_warning,
message = handle_message, error = handle_error)
17: doTryCatch(return(expr), name, parentenv, handler)
18: tryCatchOne(expr, names, parentenv, handlers[[1L]])
19: tryCatchList(expr, names[-nh], parentenv, handlers[-nh])
20: doTryCatch(return(expr), name, parentenv, handler)
21: tryCatchOne(tryCatchList(expr, names[-nh], parentenv,
handlers[-nh]),     names[nh], parentenv, handlers[[nh]])
22: tryCatchList(expr, classes, parentenv, handlers)
23: tryCatch(withCallingHandlers({    eval(code, test_env)    if
(!handled && !is.null(test)) {        skip_empty()    }}, expectation
= handle_expectation, skip = handle_skip, warning = handle_warning,
 message = handle_message, error = handle_error), error =
handle_fatal,     skip = function(e) {    })
24: test_code(NULL, exprs, env)
25: source_file(path, new.env(parent = env), chdir = TRUE, wrap = wrap)
26: force(code)
27: doWithOneRestart(return(expr), restart)
28: withOneRestart(expr, restarts[[1L]])
29: withRestarts(testthat_abort_reporter = function() NULL, force(code))
30: with_reporter(reporter = reporter, start_end_reporter =
start_end_reporter,     {        reporter$start_file(basename(path))
     lister$start_file(basename(path))        source_file(path,
new.env(parent = env), chdir = TRUE,             wrap = wrap)
reporter$.end_context()        reporter$end_file()    })
31: FUN(X[[i]], ...)
32: lapply(paths, test_file, env = env, reporter = current_reporter,
  start_end_reporter = FALSE, load_helpers = FALSE, wrap = wrap)
33: force(code)
34: doWithOneRestart(return(expr), restart)
35: withOneRestart(expr, restarts[[1L]])
36: withRestarts(testthat_abort_reporter = function() NULL, force(code))
37: with_reporter(reporter = current_reporter, results <-
lapply(paths,     test_file, env = env, reporter = current_reporter,
start_end_reporter = FALSE,     load_helpers = FALSE, wrap = wrap))
38: test_files(paths, reporter = reporter, env = env, stop_on_failure
= stop_on_failure,     stop_on_warning = stop_on_warning, wrap = wrap)
39: test_dir(path = test_path, reporter = reporter, env = env, filter
= filter,     ..., stop_on_failure = stop_on_failure, stop_on_warning
= stop_on_warning,     wrap = wrap)
40: test_package_dir(package = package, test_path = test_path, filter
= filter,     reporter = reporter, ..., stop_on_failure =
stop_on_failure,     stop_on_warning = stop_on_warning, wrap = wrap)
41: test_check("bayestestR")
An irrecoverable exception occurred. R is aborting now ...
Segmentation fault
autopkgtest [17:56:48]: test run-unit-test: -----------------------]
autopkgtest [17:56:48]: test run-unit-test:  - - - - - - - - - -
results - - - - -
- - - - -
run-unit-test        FAIL non-zero exit status 139


Reply to: