Last updated on 2025-12-03 05:50:59 CET.
| Package | ERROR | NOTE | OK |
|---|---|---|---|
| manifold | 1 | 1 | 9 |
Current CRAN status: ERROR: 1, NOTE: 1, OK: 9
Version: 0.1.1
Check: C++ specification
Result: NOTE
Specified C++11: please drop specification unless essential
Flavor: r-patched-linux-x86_64
Version: 0.1.2
Check: tests
Result: ERROR
Running ‘testthat.R’ [1s/2s]
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
> # This file is part of the standard setup for testthat.
> # It is recommended that you do not modify it.
> #
> # Where should you do additional test configuration?
> # Learn more about the roles of various files in:
> # * https://r-pkgs.org/tests.html
> # * https://testthat.r-lib.org/reference/test_package.html#special-files
>
> library(testthat)
> library(manifold)
Attaching package: 'manifold'
The following object is masked from 'package:base':
norm
>
> test_check("manifold")
*** caught segfault ***
address 0x3a5f6953c, cause 'invalid permissions'
Traceback:
1: LogM(matrix(x, d, d))
2: logmvec(p, d)
3: matrix(logmvec(p, d), length(p), n)
4: rieExp.LogEu(mfd, p, V)
5: rieExp(mfd, p, V)
6: rmfd.default(mfd, 100, d, p = samp[, 1], totalVar = 0.1)
7: rmfd(mfd, 100, d, p = samp[, 1], totalVar = 0.1)
8: eval(code, test_env)
9: eval(code, test_env)
10: withCallingHandlers({ eval(code, test_env) new_expectations <- the$test_expectations > starting_expectations if (snapshot_skipped) { skip("On CRAN") } else if (!new_expectations && skip_on_empty) { skip_empty() }}, expectation = handle_expectation, packageNotFoundError = function(e) { if (on_cran()) { skip(paste0("{", e$package, "} is not installed.")) }}, snapshot_on_cran = function(cnd) { snapshot_skipped <<- TRUE invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error, interrupt = handle_interrupt)
11: doTryCatch(return(expr), name, parentenv, handler)
12: tryCatchOne(expr, names, parentenv, handlers[[1L]])
13: tryCatchList(expr, classes, parentenv, handlers)
14: tryCatch(withCallingHandlers({ eval(code, test_env) new_expectations <- the$test_expectations > starting_expectations if (snapshot_skipped) { skip("On CRAN") } else if (!new_expectations && skip_on_empty) { skip_empty() }}, expectation = handle_expectation, packageNotFoundError = function(e) { if (on_cran()) { skip(paste0("{", e$package, "} is not installed.")) }}, snapshot_on_cran = function(cnd) { snapshot_skipped <<- TRUE invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error, interrupt = handle_interrupt), error = handle_fatal)
15: doWithOneRestart(return(expr), restart)
16: withOneRestart(expr, restarts[[1L]])
17: withRestarts(tryCatch(withCallingHandlers({ eval(code, test_env) new_expectations <- the$test_expectations > starting_expectations if (snapshot_skipped) { skip("On CRAN") } else if (!new_expectations && skip_on_empty) { skip_empty() }}, expectation = handle_expectation, packageNotFoundError = function(e) { if (on_cran()) { skip(paste0("{", e$package, "} is not installed.")) }}, snapshot_on_cran = function(cnd) { snapshot_skipped <<- TRUE invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error, interrupt = handle_interrupt), error = handle_fatal), end_test = function() { })
18: test_code(code, parent.frame())
19: test_that("random variable generation works", { set.seed(2) for (n in 1:3) { for (p in 2:4) { for (mm in mfdFinite) { mfd <- createM(mm) d <- calcIntDim(mfd, geomPar = p) samp <- rmfd(mfd, n, d) samp1 <- rmfd(mfd, 100, d, p = samp[, 1], totalVar = 0.1) expect_identical(dim(samp), c(calcAmbDim(mfd, dimIntrinsic = d), as.integer(n))) expect_equal(distance(mfd, samp, samp), rep(0, n), scale = 1, tolerance = 1e-06) expect_equal(distance(mfd, frechetMean(mfd, samp1, mu0 = samp[, 1]), samp[, 1, drop = FALSE]), 0, scale = 1, tolerance = 0.1) } } }})
20: eval(code, test_env)
21: eval(code, test_env)
22: withCallingHandlers({ eval(code, test_env) new_expectations <- the$test_expectations > starting_expectations if (snapshot_skipped) { skip("On CRAN") } else if (!new_expectations && skip_on_empty) { skip_empty() }}, expectation = handle_expectation, packageNotFoundError = function(e) { if (on_cran()) { skip(paste0("{", e$package, "} is not installed.")) }}, snapshot_on_cran = function(cnd) { snapshot_skipped <<- TRUE invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error, interrupt = handle_interrupt)
23: doTryCatch(return(expr), name, parentenv, handler)
24: tryCatchOne(expr, names, parentenv, handlers[[1L]])
25: tryCatchList(expr, classes, parentenv, handlers)
26: tryCatch(withCallingHandlers({ eval(code, test_env) new_expectations <- the$test_expectations > starting_expectations if (snapshot_skipped) { skip("On CRAN") } else if (!new_expectations && skip_on_empty) { skip_empty() }}, expectation = handle_expectation, packageNotFoundError = function(e) { if (on_cran()) { skip(paste0("{", e$package, "} is not installed.")) }}, snapshot_on_cran = function(cnd) { snapshot_skipped <<- TRUE invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error, interrupt = handle_interrupt), error = handle_fatal)
27: doWithOneRestart(return(expr), restart)
28: withOneRestart(expr, restarts[[1L]])
29: withRestarts(tryCatch(withCallingHandlers({ eval(code, test_env) new_expectations <- the$test_expectations > starting_expectations if (snapshot_skipped) { skip("On CRAN") } else if (!new_expectations && skip_on_empty) { skip_empty() }}, expectation = handle_expectation, packageNotFoundError = function(e) { if (on_cran()) { skip(paste0("{", e$package, "} is not installed.")) }}, snapshot_on_cran = function(cnd) { snapshot_skipped <<- TRUE invokeRestart("muffle_cran_snapshot")}, skip = handle_skip, warning = handle_warning, message = handle_message, error = handle_error, interrupt = handle_interrupt), error = handle_fatal), end_test = function() { })
30: test_code(code = exprs, env = env, reporter = get_reporter() %||% StopReporter$new())
31: source_file(path, env = env(env), desc = desc, shuffle = shuffle, error_call = error_call)
32: FUN(X[[i]], ...)
33: lapply(test_paths, test_one_file, env = env, desc = desc, shuffle = shuffle, error_call = error_call)
34: doTryCatch(return(expr), name, parentenv, handler)
35: tryCatchOne(expr, names, parentenv, handlers[[1L]])
36: tryCatchList(expr, classes, parentenv, handlers)
37: tryCatch(code, testthat_abort_reporter = function(cnd) { cat(conditionMessage(cnd), "\n") NULL})
38: with_reporter(reporters$multi, lapply(test_paths, test_one_file, env = env, desc = desc, shuffle = shuffle, error_call = error_call))
39: test_files_serial(test_dir = test_dir, test_package = test_package, test_paths = test_paths, load_helpers = load_helpers, reporter = reporter, env = env, stop_on_failure = stop_on_failure, stop_on_warning = stop_on_warning, desc = desc, load_package = load_package, shuffle = shuffle, error_call = error_call)
40: test_files(test_dir = path, test_paths = test_paths, test_package = package, reporter = reporter, load_helpers = load_helpers, env = env, stop_on_failure = stop_on_failure, stop_on_warning = stop_on_warning, load_package = load_package, parallel = parallel, shuffle = shuffle)
41: test_dir("testthat", package = package, reporter = reporter, ..., load_package = "installed")
42: test_check("manifold")
An irrecoverable exception occurred. R is aborting now ...
Flavor: r-release-macos-arm64