diff --git a/NEWS.md b/NEWS.md index 7545448b7..ea5e6e176 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,5 +1,6 @@ # testthat (development version) +* `local_mock()` and `with_mock()` have been deprecated because they are no longer permitted in R 4.5. * Fixed an issue preventing compilation from succeeding due to deprecation / removal of `std::uncaught_exception()` (@kevinushey, #2047). # testthat 3.2.3 diff --git a/R/mock.R b/R/mock.R index c81ba7a2d..e904bdde5 100644 --- a/R/mock.R +++ b/R/mock.R @@ -1,14 +1,11 @@ #' Mock functions in a package. #' #' @description -#' `r lifecycle::badge("deprecated")` +#' `r lifecycle::badge("defunct")` #' -#' `with_mock()` and `local_mock()` are deprecated in favour of -#' [with_mocked_bindings()] and [local_mocked_bindings()]. -#' -#' These functions worked by using some C code to temporarily modify the mocked -#' function _in place_. This was an abuse of R's internals and it is no longer -#' permitted. +#' `with_mock()` and `local_mock()` are now defunct, and can be replaced by +#' [with_mocked_bindings()] and [local_mocked_bindings()]. These functions only +#' worked by abusing of R's internals. #' #' @param ... named parameters redefine mocked functions, unnamed parameters #' will be evaluated after mocking the functions @@ -18,119 +15,13 @@ #' @param .local_envir Environment in which to add exit handler. #' For expert use only. #' @keywords internal -#' @return The result of the last unnamed parameter #' @export with_mock <- function(..., .env = topenv()) { - lifecycle::deprecate_warn("3.3.0", "with_mock()", "with_mocked_bindings()") - - dots <- eval(substitute(alist(...))) - mock_qual_names <- names(dots) - - if (all(mock_qual_names == "")) { - warning( - "Not mocking anything. Please use named parameters to specify the functions you want to mock.", - call. = FALSE - ) - code_pos <- rep(TRUE, length(dots)) - } else { - code_pos <- (mock_qual_names == "") - } - code <- dots[code_pos] - - mock_funs <- lapply(dots[!code_pos], eval, parent.frame()) - mocks <- extract_mocks(mock_funs, .env = .env) - - on.exit(lapply(mocks, reset_mock), add = TRUE) - lapply(mocks, set_mock) - - # Evaluate the code - if (length(code) > 0) { - for (expression in code[-length(code)]) { - eval(expression, parent.frame()) - } - # Isolate last item for visibility - eval(code[[length(code)]], parent.frame()) - } + lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") } #' @export #' @rdname with_mock local_mock <- function(..., .env = topenv(), .local_envir = parent.frame()) { - lifecycle::deprecate_warn("3.3.0", "local_mock()", "local_mocked_bindings()") - - mocks <- extract_mocks(list(...), .env = .env) - on_exit <- bquote( - on.exit(lapply(.(mocks), .(reset_mock)), add = TRUE), - ) - - lapply(mocks, set_mock) - eval_bare(on_exit, .local_envir) - invisible() -} - -pkg_rx <- ".*[^:]" -colons_rx <- "::(?:[:]?)" -name_rx <- ".*" -pkg_and_name_rx <- sprintf("^(?:(%s)%s)?(%s)$", pkg_rx, colons_rx, name_rx) - -extract_mocks <- function(funs, .env) { - if (is.environment(.env)) { - .env <- environmentName(.env) - } - mock_qual_names <- names(funs) - - lapply( - stats::setNames(nm = mock_qual_names), - function(qual_name) { - pkg_name <- gsub(pkg_and_name_rx, "\\1", qual_name) - - if (is_base_pkg(pkg_name)) { - stop( - "Can't mock functions in base packages (", pkg_name, ")", - call. = FALSE - ) - } - - name <- gsub(pkg_and_name_rx, "\\2", qual_name) - - if (pkg_name == "") { - pkg_name <- .env - } - - env <- asNamespace(pkg_name) - - if (!exists(name, envir = env, mode = "function")) { - stop("Function ", name, " not found in environment ", - environmentName(env), ".", - call. = FALSE - ) - } - mock(name = name, env = env, new = funs[[qual_name]]) - } - ) -} - -mock <- function(name, env, new) { - target_value <- get(name, envir = env, mode = "function") - structure( - list( - env = env, - name = as.name(name), - orig_value = .Call(duplicate_, target_value), target_value = target_value, - new_value = new - ), - class = "mock" - ) -} - -set_mock <- function(mock) { - .Call(reassign_function, mock$name, mock$env, mock$target_value, mock$new_value) -} - -reset_mock <- function(mock) { - .Call(reassign_function, mock$name, mock$env, mock$target_value, mock$orig_value) -} - -is_base_pkg <- function(x) { - x %in% rownames(utils::installed.packages(priority = "base")) + lifecycle::deprecate_stop("3.2.0", "local_mock()", "local_mocked_bindings()") } diff --git a/man/with_mock.Rd b/man/with_mock.Rd index 0ce31120d..f2a0dfd16 100644 --- a/man/with_mock.Rd +++ b/man/with_mock.Rd @@ -20,17 +20,11 @@ package name.} \item{.local_envir}{Environment in which to add exit handler. For expert use only.} } -\value{ -The result of the last unnamed parameter -} \description{ -\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#deprecated}{\figure{lifecycle-deprecated.svg}{options: alt='[Deprecated]'}}}{\strong{[Deprecated]}} - -\code{with_mock()} and \code{local_mock()} are deprecated in favour of -\code{\link[=with_mocked_bindings]{with_mocked_bindings()}} and \code{\link[=local_mocked_bindings]{local_mocked_bindings()}}. +\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#defunct}{\figure{lifecycle-defunct.svg}{options: alt='[Defunct]'}}}{\strong{[Defunct]}} -These functions worked by using some C code to temporarily modify the mocked -function \emph{in place}. This was an abuse of R's internals and it is no longer -permitted. +\code{with_mock()} and \code{local_mock()} are now defunct, and can be replaced by +\code{\link[=with_mocked_bindings]{with_mocked_bindings()}} and \code{\link[=local_mocked_bindings]{local_mocked_bindings()}}. These functions only +worked by abusing of R's internals. } \keyword{internal} diff --git a/revdep/README.md b/revdep/README.md index 676ce3701..c8aaff235 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -1,13 +1,102 @@ # Revdeps -## New problems (6) - -|package |version |error |warning |note | -|:-------|:--------|:------|:-------|:----| -|[arrow](problems.md#arrow)|17.0.0.1 |__+1__ | |2 | -|[epiCo](problems.md#epico)|1.0.0 |__+1__ | |1 | -|[ieegio](problems.md#ieegio)|0.0.2 |__+1__ | | | -|[madrat](problems.md#madrat)|3.6.4 |__+1__ | | | -|[vines](problems.md#vines)|1.1.5 |__+1__ | | | -|[xpose](problems.md#xpose)|0.4.18 |__+1__ | | | +## Failed to check (34) + +|package |version |error |warning |note | +|:-------------------|:---------|:-----|:-------|:----| +|arealDB |0.9.4 |1 | | | +|arules |? | | | | +|atom4R |0.3-3 |1 | | | +|bayesdfa |1.3.4 |1 | | | +|ctsem |3.10.4 |1 | |1 | +|dataone |2.2.2 |1 | | | +|datapack |1.4.1 |1 | | | +|DSMolgenisArmadillo |? | | | | +|dsTidyverse |? | | | | +|dsTidyverseClient |? | | | | +|EcoEnsemble |1.1.2 |1 | | | +|FAfA |0.3 |1 | | | +|FAIRmaterials |0.4.2.1 |1 | | | +|fdaPDE |1.1-21 |1 | | | +|fio |0.1.6 |1 | | | +|geess |? | | | | +|gllvm |2.0.5 |1 | | | +|gpboost |1.6.1 |1 | | | +|gpuR |2.0.6 |1 | | | +|loon.shiny |? | | | | +|loon.tourr |? | | | | +|metajam |0.3.1 |1 | | | +|multinma |0.8.1 |1 | | | +|OpenMx |? | | | | +|rdflib |0.2.9 |1 | | | +|recommenderlab |? | | | | +|redland |1.0.17-18 |1 | | | +|rstanarm |2.32.1 |1 | | | +|SQLFormatteR |0.0.2 |1 | | | +|string2path |0.2.2 |1 | | | +|TestAnaAPP |1.1.2 |1 | | | +|TriDimRegression |1.0.2 |1 | | | +|xactonomial |1.0.3 |1 | | | +|zen4R |0.10.2 |1 | | | + +## New problems (56) + +|package |version |error |warning |note | +|:------------------|:-------|:--------|:-------|:------| +|[aws.comprehend](problems.md#awscomprehend)|0.2.1 |__+1__ | | | +|[bcRP](problems.md#bcrp)|1.0.1 |__+1__ | | | +|[bindr](problems.md#bindr)|0.1.2 |__+1__ | | | +|[conflr](problems.md#conflr)|0.1.1 |__+1__ | |2 | +|[countdown](problems.md#countdown)|0.4.0 |__+1__ | |1 | +|[covr](problems.md#covr)|3.6.4 |__+1__ | | | +|[datarobot](problems.md#datarobot)|2.18.6 |__+1__ | | | +|[digitize](problems.md#digitize)|0.0.4 |__+1__ | | | +|[distro](problems.md#distro)|0.1.0 |__+1__ | |1 | +|[esci](problems.md#esci)|1.0.7 | | |__+1__ | +|[gen3sis](problems.md#gen3sis)|1.5.11 |__+1__ | |1 | +|[geomorph](problems.md#geomorph)|4.0.10 | | |__+1__ | +|[graphhopper](problems.md#graphhopper)|0.1.2 |__+1__ | |1 | +|[handwriterRF](problems.md#handwriterrf)|1.1.1 |__+1__ | | | +|[humanize](problems.md#humanize)|0.2.0 |__+1__ | |1 | +|[ipaddress](problems.md#ipaddress)|1.0.2 |__+1__ | |1 | +|[leaflet.minicharts](problems.md#leafletminicharts)|0.6.2 |__+1__ | | | +|[learnr](problems.md#learnr)|0.11.5 |__+1__ | | | +|[MakefileR](problems.md#makefiler)|1.0 |__+1__ | |1 | +|[manipulateWidget](problems.md#manipulatewidget)|0.11.1 |__+1__ | |2 | +|[mbbe](problems.md#mbbe)|0.1.0 |__+1__ | | | +|[metaDigitise](problems.md#metadigitise)|1.0.1 |__+1__ | |1 | +|[mknapsack](problems.md#mknapsack)|0.1.0 |__+1__ | | | +|[mockery](problems.md#mockery)|0.4.4 |__+3__ | | | +|[moexer](problems.md#moexer)|0.3.0 |__+1__ | | | +|[MolgenisArmadillo](problems.md#molgenisarmadillo)|2.9.1 |__+1__ | | | +|[NasdaqDataLink](problems.md#nasdaqdatalink)|1.0.0 |__+1__ | | | +|[nhlapi](problems.md#nhlapi)|0.1.4 |__+1__ | |1 | +|[owmr](problems.md#owmr)|0.8.2 |__+1__ | | | +|[oxcAAR](problems.md#oxcaar)|1.1.1 |1 __+1__ | | | +|[parameters](problems.md#parameters)|0.27.0 | | |__+1__ | +|[passport](problems.md#passport)|0.3.0 |__+1__ | | | +|[pocketapi](problems.md#pocketapi)|0.1 |__+1__ | |2 | +|[projmgr](problems.md#projmgr)|0.1.1 |__+1__ | | | +|[PubChemR](problems.md#pubchemr)|2.1.4 |1 __+1__ | |1 | +|[Quandl](problems.md#quandl)|2.11.0 |__+1__ | | | +|[REddyProc](problems.md#reddyproc)|1.3.3 | | |__+1__ | +|[regmedint](problems.md#regmedint)|1.0.1 |__+1__ | |1 | +|[Rexperigen](problems.md#rexperigen)|0.2.1 |__+1__ | |1 | +|[rosetteApi](problems.md#rosetteapi)|1.14.4 |__+1__ | | | +|[Rpolyhedra](problems.md#rpolyhedra)|0.5.6 |__+1__ | | | +|[RPresto](problems.md#rpresto)|1.4.7 |__+1__ | | | +|[RTD](problems.md#rtd)|0.4.1 |__+1__ | |1 | +|[Ryacas0](problems.md#ryacas0)|0.4.4 |__+1__ | |2 | +|[shiny.benchmark](problems.md#shinybenchmark)|0.1.1 |__+1__ | | | +|[shinyShortcut](problems.md#shinyshortcut)|0.1.0 |__+1__ | |1 | +|[skimr](problems.md#skimr)|2.1.5 |__+1__ | | | +|[spaero](problems.md#spaero)|0.6.0 |__+1__ | |4 | +|[starwarsdb](problems.md#starwarsdb)|0.1.2 |__+1__ | |1 | +|[tangles](problems.md#tangles)|2.0.1 |__+1__ | | | +|[texreg](problems.md#texreg)|1.39.4 |__+1__ |1 |2 | +|[ThankYouStars](problems.md#thankyoustars)|0.2.0 |__+1__ | |1 | +|[tinyProject](problems.md#tinyproject)|0.6.1 |__+1__ | | | +|[tryCatchLog](problems.md#trycatchlog)|1.3.1 |__+1__ | |1 | +|[WhatIf](problems.md#whatif)|1.5-10 |__+1__ | | | +|[ZillowR](problems.md#zillowr)|1.0.0 |__+1__ | | | diff --git a/revdep/cran.md b/revdep/cran.md index 7ee9f21e1..9e785ba56 100644 --- a/revdep/cran.md +++ b/revdep/cran.md @@ -1,30 +1,214 @@ ## revdepcheck results -We checked 38 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. +We checked 9592 reverse dependencies (9588 from CRAN + 4 from Bioconductor), comparing R CMD check results across CRAN and dev versions of this package. - * We saw 6 new problems - * We failed to check 0 packages + * We saw 56 new problems + * We failed to check 30 packages Issues with CRAN packages are summarised below. ### New problems (This reports the first line of each new failure) -* arrow +* aws.comprehend checking tests ... ERROR -* epiCo +* bcRP + checking examples ... ERROR + +* bindr + checking tests ... ERROR + +* conflr checking tests ... ERROR -* ieegio +* countdown + checking tests ... ERROR + +* covr + checking tests ... ERROR + +* datarobot + checking tests ... ERROR + +* digitize + checking tests ... ERROR + +* distro + checking tests ... ERROR + +* esci + checking installed package size ... NOTE + +* gen3sis + checking tests ... ERROR + +* geomorph + checking installed package size ... NOTE + +* graphhopper + checking tests ... ERROR + +* handwriterRF + checking tests ... ERROR + +* humanize + checking tests ... ERROR + +* ipaddress + checking tests ... ERROR + +* leaflet.minicharts + checking tests ... ERROR + +* learnr + checking tests ... ERROR + +* MakefileR + checking tests ... ERROR + +* manipulateWidget + checking tests ... ERROR + +* mbbe + checking tests ... ERROR + +* metaDigitise + checking tests ... ERROR + +* mknapsack + checking tests ... ERROR + +* mockery checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* moexer + checking tests ... ERROR -* madrat +* MolgenisArmadillo checking tests ... ERROR -* vines +* NasdaqDataLink checking tests ... ERROR -* xpose +* nhlapi checking tests ... ERROR +* owmr + checking tests ... ERROR + +* oxcAAR + checking tests ... ERROR + +* parameters + checking installed package size ... NOTE + +* passport + checking tests ... ERROR + +* pocketapi + checking tests ... ERROR + +* projmgr + checking tests ... ERROR + +* PubChemR + checking examples ... ERROR + +* Quandl + checking tests ... ERROR + +* REddyProc + checking installed package size ... NOTE + +* regmedint + checking tests ... ERROR + +* Rexperigen + checking tests ... ERROR + +* rosetteApi + checking tests ... ERROR + +* Rpolyhedra + checking tests ... ERROR + +* RPresto + checking tests ... ERROR + +* RTD + checking tests ... ERROR + +* Ryacas0 + checking tests ... ERROR + +* shiny.benchmark + checking tests ... ERROR + +* shinyShortcut + checking tests ... ERROR + +* skimr + checking tests ... ERROR + +* spaero + checking tests ... ERROR + +* starwarsdb + checking tests ... ERROR + +* tangles + checking re-building of vignette outputs ... ERROR + +* texreg + checking tests ... ERROR + +* ThankYouStars + checking tests ... ERROR + +* tinyProject + checking tests ... ERROR + +* tryCatchLog + checking tests ... ERROR + +* WhatIf + checking tests ... ERROR + +* ZillowR + checking tests ... ERROR + +### Failed to check + +* arealDB (NA) +* atom4R (NA) +* bayesdfa (NA) +* ctsem (NA) +* dataone (NA) +* datapack (NA) +* DSMolgenisArmadillo (NA) +* dsTidyverse (NA) +* dsTidyverseClient (NA) +* EcoEnsemble (NA) +* FAfA (NA) +* FAIRmaterials (NA) +* fdaPDE (NA) +* fio (NA) +* gllvm (NA) +* gpboost (NA) +* gpuR (NA) +* loon.shiny (NA) +* loon.tourr (NA) +* metajam (NA) +* multinma (NA) +* rdflib (NA) +* redland (NA) +* rstanarm (NA) +* SQLFormatteR (NA) +* string2path (NA) +* TestAnaAPP (NA) +* TriDimRegression (NA) +* xactonomial (NA) +* zen4R (NA) diff --git a/revdep/failures.md b/revdep/failures.md index 9a2073633..abbb92bf9 100644 --- a/revdep/failures.md +++ b/revdep/failures.md @@ -1 +1,2211 @@ -*Wow, no problems at all. :)* \ No newline at end of file +# arealDB + +<details> + +* Version: 0.9.4 +* GitHub: https://github.com/luckinet/arealDB +* Source code: https://github.com/cran/arealDB +* Date/Publication: 2025-01-20 13:40:05 UTC +* Number of recursive dependencies: 109 + +Run `revdepcheck::cloud_details(, "arealDB")` for more info + +</details> + +## In both + +* checking whether package ‘arealDB’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/arealDB/new/arealDB.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘arealDB’ ... +** package ‘arealDB’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘arealDB’ +* removing ‘/tmp/workdir/arealDB/new/arealDB.Rcheck/arealDB’ + + +``` +### CRAN + +``` +* installing *source* package ‘arealDB’ ... +** package ‘arealDB’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘arealDB’ +* removing ‘/tmp/workdir/arealDB/old/arealDB.Rcheck/arealDB’ + + +``` +# arules + +<details> + +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/arules +* Number of recursive dependencies: 122 + +Run `revdepcheck::cloud_details(, "arules")` for more info + +</details> + +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# atom4R + +<details> + +* Version: 0.3-3 +* GitHub: https://github.com/eblondel/atom4R +* Source code: https://github.com/cran/atom4R +* Date/Publication: 2022-11-18 14:40:15 UTC +* Number of recursive dependencies: 66 + +Run `revdepcheck::cloud_details(, "atom4R")` for more info + +</details> + +## In both + +* checking whether package ‘atom4R’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/atom4R/new/atom4R.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘atom4R’ ... +** package ‘atom4R’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘atom4R’ +* removing ‘/tmp/workdir/atom4R/new/atom4R.Rcheck/atom4R’ + + +``` +### CRAN + +``` +* installing *source* package ‘atom4R’ ... +** package ‘atom4R’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘atom4R’ +* removing ‘/tmp/workdir/atom4R/old/atom4R.Rcheck/atom4R’ + + +``` +# bayesdfa + +<details> + +* Version: 1.3.4 +* GitHub: https://github.com/fate-ewi/bayesdfa +* Source code: https://github.com/cran/bayesdfa +* Date/Publication: 2025-03-22 20:30:21 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "bayesdfa")` for more info + +</details> + +## In both + +* checking whether package ‘bayesdfa’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/bayesdfa/new/bayesdfa.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘bayesdfa’ ... +** package ‘bayesdfa’ successfully unpacked and MD5 sums checked +** using staged installation +Error in loadNamespace(x) : there is no package called ‘rstantools’ +Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: configuration failed for package ‘bayesdfa’ +* removing ‘/tmp/workdir/bayesdfa/new/bayesdfa.Rcheck/bayesdfa’ + + +``` +### CRAN + +``` +* installing *source* package ‘bayesdfa’ ... +** package ‘bayesdfa’ successfully unpacked and MD5 sums checked +** using staged installation +Error in loadNamespace(x) : there is no package called ‘rstantools’ +Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: configuration failed for package ‘bayesdfa’ +* removing ‘/tmp/workdir/bayesdfa/old/bayesdfa.Rcheck/bayesdfa’ + + +``` +# ctsem + +<details> + +* Version: 3.10.4 +* GitHub: https://github.com/cdriveraus/ctsem +* Source code: https://github.com/cran/ctsem +* Date/Publication: 2025-06-30 16:40:11 UTC +* Number of recursive dependencies: 164 + +Run `revdepcheck::cloud_details(, "ctsem")` for more info + +</details> + +## In both + +* checking whether package ‘ctsem’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ctsem/new/ctsem.Rcheck/00install.out’ for details. + ``` + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘arules’ + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘ctsem’ ... +** package ‘ctsem’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric<Model, BaseRNG>::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine<boost::random::linear_congruential_engine<unsigned int, 40014, 0, 2147483563>, boost::random::linear_congruential_engine<unsigned int, 40692, 0, 2147483399> >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned<int(unpacket_traits<DefaultPacketType>::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:202: stanExports_ctsm.o] Error 1 +ERROR: compilation failed for package ‘ctsem’ +* removing ‘/tmp/workdir/ctsem/new/ctsem.Rcheck/ctsem’ + + +``` +### CRAN + +``` +* installing *source* package ‘ctsem’ ... +** package ‘ctsem’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric<Model, BaseRNG>::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine<boost::random::linear_congruential_engine<unsigned int, 40014, 0, 2147483563>, boost::random::linear_congruential_engine<unsigned int, 40692, 0, 2147483399> >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned<int(unpacket_traits<DefaultPacketType>::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:202: stanExports_ctsm.o] Error 1 +ERROR: compilation failed for package ‘ctsem’ +* removing ‘/tmp/workdir/ctsem/old/ctsem.Rcheck/ctsem’ + + +``` +# dataone + +<details> + +* Version: 2.2.2 +* GitHub: https://github.com/DataONEorg/rdataone +* Source code: https://github.com/cran/dataone +* Date/Publication: 2022-06-10 19:30:02 UTC +* Number of recursive dependencies: 63 + +Run `revdepcheck::cloud_details(, "dataone")` for more info + +</details> + +## In both + +* checking whether package ‘dataone’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/dataone/new/dataone.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘dataone’ ... +** package ‘dataone’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘dataone’ +* removing ‘/tmp/workdir/dataone/new/dataone.Rcheck/dataone’ + + +``` +### CRAN + +``` +* installing *source* package ‘dataone’ ... +** package ‘dataone’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘dataone’ +* removing ‘/tmp/workdir/dataone/old/dataone.Rcheck/dataone’ + + +``` +# datapack + +<details> + +* Version: 1.4.1 +* GitHub: https://github.com/ropensci/datapack +* Source code: https://github.com/cran/datapack +* Date/Publication: 2022-06-10 19:40:01 UTC +* Number of recursive dependencies: 63 + +Run `revdepcheck::cloud_details(, "datapack")` for more info + +</details> + +## In both + +* checking whether package ‘datapack’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/datapack/new/datapack.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘datapack’ ... +** package ‘datapack’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘datapack’ +* removing ‘/tmp/workdir/datapack/new/datapack.Rcheck/datapack’ + + +``` +### CRAN + +``` +* installing *source* package ‘datapack’ ... +** package ‘datapack’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘datapack’ +* removing ‘/tmp/workdir/datapack/old/datapack.Rcheck/datapack’ + + +``` +# DSMolgenisArmadillo + +<details> + +* Version: 2.0.9 +* GitHub: https://github.com/molgenis/molgenis-r-datashield +* Source code: https://github.com/cran/DSMolgenisArmadillo +* Date/Publication: 2024-07-09 07:50:08 UTC +* Number of recursive dependencies: 76 + +Run `revdepcheck::cloud_details(, "DSMolgenisArmadillo")` for more info + +</details> + +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/DSMolgenisArmadillo/new/DSMolgenisArmadillo.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘DSMolgenisArmadillo/DESCRIPTION’ ... OK +... + 12. └─rlang::cnd_signal(...) + + [ FAIL 55 | WARN 0 | SKIP 1 | PASS 9 ] + Error: Test failures + Execution halted +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes ... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 ERROR, 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/DSMolgenisArmadillo/old/DSMolgenisArmadillo.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘DSMolgenisArmadillo/DESCRIPTION’ ... OK +... +* checking files in ‘vignettes’ ... OK +* checking examples ... NONE +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes ... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 NOTE + + + + + +``` +# dsTidyverse + +<details> + +* Version: 1.0.4 +* GitHub: NA +* Source code: https://github.com/cran/dsTidyverse +* Date/Publication: 2025-02-27 09:40:06 UTC +* Number of recursive dependencies: 134 + +Run `revdepcheck::cloud_details(, "dsTidyverse")` for more info + +</details> + +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/dsTidyverse/new/dsTidyverse.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dsTidyverse/DESCRIPTION’ ... OK +... +* checking for code/documentation mismatches ... OK +* checking Rd \usage sections ... OK +* checking Rd contents ... OK +* checking for unstated dependencies in examples ... OK +* checking examples ... NONE +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* DONE +Status: 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/dsTidyverse/old/dsTidyverse.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dsTidyverse/DESCRIPTION’ ... OK +... +* checking for code/documentation mismatches ... OK +* checking Rd \usage sections ... OK +* checking Rd contents ... OK +* checking for unstated dependencies in examples ... OK +* checking examples ... NONE +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* DONE +Status: 1 NOTE + + + + + +``` +# dsTidyverseClient + +<details> + +* Version: 1.0.2 +* GitHub: NA +* Source code: https://github.com/cran/dsTidyverseClient +* Date/Publication: 2025-02-27 09:30:06 UTC +* Number of recursive dependencies: 151 + +Run `revdepcheck::cloud_details(, "dsTidyverseClient")` for more info + +</details> + +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/dsTidyverseClient/new/dsTidyverseClient.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dsTidyverseClient/DESCRIPTION’ ... OK +... +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes ... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/dsTidyverseClient/old/dsTidyverseClient.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dsTidyverseClient/DESCRIPTION’ ... OK +... +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes ... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 NOTE + + + + + +``` +# EcoEnsemble + +<details> + +* Version: 1.1.2 +* GitHub: https://github.com/CefasRepRes/EcoEnsemble +* Source code: https://github.com/cran/EcoEnsemble +* Date/Publication: 2025-03-18 18:20:02 UTC +* Number of recursive dependencies: 87 + +Run `revdepcheck::cloud_details(, "EcoEnsemble")` for more info + +</details> + +## In both + +* checking whether package ‘EcoEnsemble’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘EcoEnsemble’ ... +** package ‘EcoEnsemble’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric<Model, BaseRNG>::T(stan::mcmc::dense_e_point&) [with Model = model_ensemble_model_hierarchical_namespace::model_ensemble_model_hierarchical; BaseRNG = boost::random::additive_combine_engine<boost::random::linear_congruential_engine<unsigned int, 40014, 0, 2147483563>, boost::random::linear_congruential_engine<unsigned int, 40692, 0, 2147483399> >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned<int(unpacket_traits<DefaultPacketType>::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:202: stanExports_ensemble_model_hierarchical.o] Error 1 +ERROR: compilation failed for package ‘EcoEnsemble’ +* removing ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/EcoEnsemble’ + + +``` +### CRAN + +``` +* installing *source* package ‘EcoEnsemble’ ... +** package ‘EcoEnsemble’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric<Model, BaseRNG>::T(stan::mcmc::dense_e_point&) [with Model = model_ensemble_model_hierarchical_namespace::model_ensemble_model_hierarchical; BaseRNG = boost::random::additive_combine_engine<boost::random::linear_congruential_engine<unsigned int, 40014, 0, 2147483563>, boost::random::linear_congruential_engine<unsigned int, 40692, 0, 2147483399> >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned<int(unpacket_traits<DefaultPacketType>::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:202: stanExports_ensemble_model_hierarchical.o] Error 1 +ERROR: compilation failed for package ‘EcoEnsemble’ +* removing ‘/tmp/workdir/EcoEnsemble/old/EcoEnsemble.Rcheck/EcoEnsemble’ + + +``` +# FAfA + +<details> + +* Version: 0.3 +* GitHub: NA +* Source code: https://github.com/cran/FAfA +* Date/Publication: 2025-05-23 19:42:09 UTC +* Number of recursive dependencies: 253 + +Run `revdepcheck::cloud_details(, "FAfA")` for more info + +</details> + +## In both + +* checking whether package ‘FAfA’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/FAfA/new/FAfA.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘FAfA’ ... +** package ‘FAfA’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘OpenMx’ +Calls: <Anonymous> ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: lazy loading failed for package ‘FAfA’ +* removing ‘/tmp/workdir/FAfA/new/FAfA.Rcheck/FAfA’ + + +``` +### CRAN + +``` +* installing *source* package ‘FAfA’ ... +** package ‘FAfA’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘OpenMx’ +Calls: <Anonymous> ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: lazy loading failed for package ‘FAfA’ +* removing ‘/tmp/workdir/FAfA/old/FAfA.Rcheck/FAfA’ + + +``` +# FAIRmaterials + +<details> + +* Version: 0.4.2.1 +* GitHub: NA +* Source code: https://github.com/cran/FAIRmaterials +* Date/Publication: 2024-06-27 15:40:02 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "FAIRmaterials")` for more info + +</details> + +## In both + +* checking whether package ‘FAIRmaterials’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/FAIRmaterials/new/FAIRmaterials.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘FAIRmaterials’ ... +** package ‘FAIRmaterials’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘FAIRmaterials’ +* removing ‘/tmp/workdir/FAIRmaterials/new/FAIRmaterials.Rcheck/FAIRmaterials’ + + +``` +### CRAN + +``` +* installing *source* package ‘FAIRmaterials’ ... +** package ‘FAIRmaterials’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘FAIRmaterials’ +* removing ‘/tmp/workdir/FAIRmaterials/old/FAIRmaterials.Rcheck/FAIRmaterials’ + + +``` +# fdaPDE + +<details> + +* Version: 1.1-21 +* GitHub: NA +* Source code: https://github.com/cran/fdaPDE +* Date/Publication: 2025-01-08 18:00:02 UTC +* Number of recursive dependencies: 50 + +Run `revdepcheck::cloud_details(, "fdaPDE")` for more info + +</details> + +## In both + +* checking whether package ‘fdaPDE’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/fdaPDE/new/fdaPDE.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘fdaPDE’ ... +** package ‘fdaPDE’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c Density_Estimation/Source/Rfun_Density_Estimation.cpp -o Density_Estimation/Source/Rfun_Density_Estimation.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, + from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/StdVector:14, +... +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Matrix.h:225:24: required from ‘Eigen::Matrix<_Scalar, _Rows, _Cols, _Options, _MaxRows, _MaxCols>& Eigen::Matrix<_Scalar, _Rows, _Cols, _Options, _MaxRows, _MaxCols>::operator=(const Eigen::DenseBase<OtherDerived>&) [with OtherDerived = Eigen::CwiseBinaryOp<Eigen::internal::scalar_product_op<double, double>, const Eigen::CwiseNullaryOp<Eigen::internal::scalar_constant_op<double>, const Eigen::Matrix<double, -1, -1> >, const Eigen::CwiseBinaryOp<Eigen::internal::scalar_sum_op<double, double>, const Eigen::Solve<Eigen::PartialPivLU<Eigen::Matrix<double, -1, -1> >, Eigen::CwiseNullaryOp<Eigen::internal::scalar_identity_op<double>, Eigen::Matrix<double, -1, -1> > >, const Eigen::Solve<Eigen::PartialPivLU<Eigen::Matrix<double, -1, -1> >, Eigen::Product<Eigen::Product<Eigen::Product<Eigen::Product<Eigen::Transpose<const Eigen::Matrix<double, -1, -1> >, Eigen::Matrix<double, -1, -1>, 0>, Eigen::Transpose<Eigen::Matrix<double, -1, -1> >, 0>, Eigen::Matrix<double, -1, -1>, 0>, Eigen::Solve<Eigen::PartialPivLU<Eigen::Matrix<double, -1, -1> >, Eigen::CwiseNullaryOp<Eigen::internal::scalar_identity_op<double>, Eigen::Matrix<double, -1, -1> > >, 0> > > >; _Scalar = double; int _Rows = -1; int _Cols = -1; int _Options = 0; int _MaxRows = -1; int _MaxCols = -1]’ +Regression/Source/../../Skeletons/Include/../../Inference/Include/Wald_imp.h:54:5: required from ‘void Wald_Base<InputHandler, MatrixType>::compute_V() [with InputHandler = RegressionData; MatrixType = Eigen::Matrix<double, -1, -1>]’ +Regression/Source/../../Skeletons/Include/../../Inference/Include/Wald_imp.h:123:5: required from ‘VectorXr Wald_Base<InputHandler, MatrixType>::compute_beta_pvalue() [with InputHandler = RegressionData; MatrixType = Eigen::Matrix<double, -1, -1>; VectorXr = Eigen::Matrix<double, -1, 1>]’ +Regression/Source/../../Skeletons/Include/../../Inference/Include/Wald_imp.h:104:10: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:56:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:204: Regression/Source/Rfun_Regression_Laplace.o] Error 1 +ERROR: compilation failed for package ‘fdaPDE’ +* removing ‘/tmp/workdir/fdaPDE/new/fdaPDE.Rcheck/fdaPDE’ + + +``` +### CRAN + +``` +* installing *source* package ‘fdaPDE’ ... +** package ‘fdaPDE’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c Density_Estimation/Source/Rfun_Density_Estimation.cpp -o Density_Estimation/Source/Rfun_Density_Estimation.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, + from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/StdVector:14, +... +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Matrix.h:225:24: required from ‘Eigen::Matrix<_Scalar, _Rows, _Cols, _Options, _MaxRows, _MaxCols>& Eigen::Matrix<_Scalar, _Rows, _Cols, _Options, _MaxRows, _MaxCols>::operator=(const Eigen::DenseBase<OtherDerived>&) [with OtherDerived = Eigen::CwiseBinaryOp<Eigen::internal::scalar_product_op<double, double>, const Eigen::CwiseNullaryOp<Eigen::internal::scalar_constant_op<double>, const Eigen::Matrix<double, -1, -1> >, const Eigen::CwiseBinaryOp<Eigen::internal::scalar_sum_op<double, double>, const Eigen::Solve<Eigen::PartialPivLU<Eigen::Matrix<double, -1, -1> >, Eigen::CwiseNullaryOp<Eigen::internal::scalar_identity_op<double>, Eigen::Matrix<double, -1, -1> > >, const Eigen::Solve<Eigen::PartialPivLU<Eigen::Matrix<double, -1, -1> >, Eigen::Product<Eigen::Product<Eigen::Product<Eigen::Product<Eigen::Transpose<const Eigen::Matrix<double, -1, -1> >, Eigen::Matrix<double, -1, -1>, 0>, Eigen::Transpose<Eigen::Matrix<double, -1, -1> >, 0>, Eigen::Matrix<double, -1, -1>, 0>, Eigen::Solve<Eigen::PartialPivLU<Eigen::Matrix<double, -1, -1> >, Eigen::CwiseNullaryOp<Eigen::internal::scalar_identity_op<double>, Eigen::Matrix<double, -1, -1> > >, 0> > > >; _Scalar = double; int _Rows = -1; int _Cols = -1; int _Options = 0; int _MaxRows = -1; int _MaxCols = -1]’ +Regression/Source/../../Skeletons/Include/../../Inference/Include/Wald_imp.h:54:5: required from ‘void Wald_Base<InputHandler, MatrixType>::compute_V() [with InputHandler = RegressionData; MatrixType = Eigen::Matrix<double, -1, -1>]’ +Regression/Source/../../Skeletons/Include/../../Inference/Include/Wald_imp.h:123:5: required from ‘VectorXr Wald_Base<InputHandler, MatrixType>::compute_beta_pvalue() [with InputHandler = RegressionData; MatrixType = Eigen::Matrix<double, -1, -1>; VectorXr = Eigen::Matrix<double, -1, 1>]’ +Regression/Source/../../Skeletons/Include/../../Inference/Include/Wald_imp.h:104:10: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:56:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:204: Regression/Source/Rfun_Regression_Laplace.o] Error 1 +ERROR: compilation failed for package ‘fdaPDE’ +* removing ‘/tmp/workdir/fdaPDE/old/fdaPDE.Rcheck/fdaPDE’ + + +``` +# fio + +<details> + +* Version: 0.1.6 +* GitHub: https://github.com/albersonmiranda/fio +* Source code: https://github.com/cran/fio +* Date/Publication: 2025-04-06 07:50:02 UTC +* Number of recursive dependencies: 87 + +Run `revdepcheck::cloud_details(, "fio")` for more info + +</details> + +## In both + +* checking whether package ‘fio’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/fio/new/fio.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘fio’ ... +** package ‘fio’ successfully unpacked and MD5 sums checked +** using staged installation +Error in eval(ei, envir) : +------------------ [UNSUPPORTED RUST VERSION]------------------ +- Minimum supported Rust version is 1.77. +- Installed Rust version is 1.75.0. +--------------------------------------------------------------- +Calls: source -> withVisible -> eval -> eval +Execution halted +ERROR: configuration failed for package ‘fio’ +* removing ‘/tmp/workdir/fio/new/fio.Rcheck/fio’ + + +``` +### CRAN + +``` +* installing *source* package ‘fio’ ... +** package ‘fio’ successfully unpacked and MD5 sums checked +** using staged installation +Error in eval(ei, envir) : +------------------ [UNSUPPORTED RUST VERSION]------------------ +- Minimum supported Rust version is 1.77. +- Installed Rust version is 1.75.0. +--------------------------------------------------------------- +Calls: source -> withVisible -> eval -> eval +Execution halted +ERROR: configuration failed for package ‘fio’ +* removing ‘/tmp/workdir/fio/old/fio.Rcheck/fio’ + + +``` +# geess + +<details> + +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/geess +* Number of recursive dependencies: 25 + +Run `revdepcheck::cloud_details(, "geess")` for more info + +</details> + +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# gllvm + +<details> + +* Version: 2.0.5 +* GitHub: https://github.com/JenniNiku/gllvm +* Source code: https://github.com/cran/gllvm +* Date/Publication: 2025-07-13 08:20:02 UTC +* Number of recursive dependencies: 61 + +Run `revdepcheck::cloud_details(, "gllvm")` for more info + +</details> + +## In both + +* checking whether package ‘gllvm’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/gllvm/new/gllvm.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘gllvm’ ... +** package ‘gllvm’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -DTMBAD_FRAMEWORK -I'/usr/local/lib/R/site-library/TMB/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gllvm.cpp -o gllvm.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, + from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, + from /usr/local/lib/R/site-library/TMB/include/TMB.hpp:92, + from gllvm.cpp:3: +... +/usr/local/lib/R/site-library/TMB/include/tiny_ad/atomic.hpp:30:1: required from ‘void atomic::bessel_kOp<order, ninput, noutput, mask>::reverse(TMBad::ReverseArgs<Type>&) [with Type = double; int order = 3; int ninput = 2; int noutput = 8; long int mask = 9]’ +/usr/local/lib/R/site-library/TMB/include/TMBad/global.hpp:1721:28: required from ‘void TMBad::global::AddForwardMarkReverseMark<OperatorBase>::reverse(TMBad::ReverseArgs<Type>&) [with Type = double; OperatorBase = TMBad::global::AddIncrementDecrement<TMBad::global::AddDependencies<TMBad::global::AddInputSizeOutputSize<atomic::bessel_kOp<3, 2, 8, 9> > > >]’ +/usr/local/lib/R/site-library/TMB/include/TMBad/global.hpp:2134:57: required from ‘void TMBad::global::Complete<OperatorBase>::reverse(TMBad::ReverseArgs<double>&) [with OperatorBase = atomic::bessel_kOp<3, 2, 8, 9>]’ +/usr/local/lib/R/site-library/TMB/include/TMBad/global.hpp:2134:10: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:56:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:204: gllvm.o] Error 1 +ERROR: compilation failed for package ‘gllvm’ +* removing ‘/tmp/workdir/gllvm/new/gllvm.Rcheck/gllvm’ + + +``` +### CRAN + +``` +* installing *source* package ‘gllvm’ ... +** package ‘gllvm’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -DTMBAD_FRAMEWORK -I'/usr/local/lib/R/site-library/TMB/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gllvm.cpp -o gllvm.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, + from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, + from /usr/local/lib/R/site-library/TMB/include/TMB.hpp:92, + from gllvm.cpp:3: +... +/usr/local/lib/R/site-library/TMB/include/tiny_ad/atomic.hpp:30:1: required from ‘void atomic::bessel_kOp<order, ninput, noutput, mask>::reverse(TMBad::ReverseArgs<Type>&) [with Type = double; int order = 3; int ninput = 2; int noutput = 8; long int mask = 9]’ +/usr/local/lib/R/site-library/TMB/include/TMBad/global.hpp:1721:28: required from ‘void TMBad::global::AddForwardMarkReverseMark<OperatorBase>::reverse(TMBad::ReverseArgs<Type>&) [with Type = double; OperatorBase = TMBad::global::AddIncrementDecrement<TMBad::global::AddDependencies<TMBad::global::AddInputSizeOutputSize<atomic::bessel_kOp<3, 2, 8, 9> > > >]’ +/usr/local/lib/R/site-library/TMB/include/TMBad/global.hpp:2134:57: required from ‘void TMBad::global::Complete<OperatorBase>::reverse(TMBad::ReverseArgs<double>&) [with OperatorBase = atomic::bessel_kOp<3, 2, 8, 9>]’ +/usr/local/lib/R/site-library/TMB/include/TMBad/global.hpp:2134:10: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:56:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:204: gllvm.o] Error 1 +ERROR: compilation failed for package ‘gllvm’ +* removing ‘/tmp/workdir/gllvm/old/gllvm.Rcheck/gllvm’ + + +``` +# gpboost + +<details> + +* Version: 1.6.1 +* GitHub: https://github.com/fabsig/GPBoost +* Source code: https://github.com/cran/gpboost +* Date/Publication: 2025-07-23 08:30:02 UTC +* Number of recursive dependencies: 28 + +Run `revdepcheck::cloud_details(, "gpboost")` for more info + +</details> + +## In both + +* checking whether package ‘gpboost’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/gpboost/new/gpboost.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘gpboost’ ... +** package ‘gpboost’ successfully unpacked and MD5 sums checked +** using staged installation +checking location of R... /opt/R/4.4.0/lib/R +checking whether MM_PREFETCH works... yes +checking whether MM_MALLOC works... yes +configure: creating ./config.status +config.status: creating src/Makevars +** libs +using C compiler: ‘gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +... +./include/GPBoost/re_model_template.h:1456:6: required from ‘void GPBoost::REModelTemplate<T_mat, T_chol>::OptimLinRegrCoefCovPar(const double*, const double*, int, double*, double*, int&, double*, double*, double*, double*, bool, const double*, bool, bool, bool, bool, bool) [with T_mat = Eigen::SparseMatrix<double>; T_chol = Eigen::SimplicialLLT<Eigen::SparseMatrix<double>, 1, Eigen::AMDOrdering<int> >]’ +re_model.cpp:312:40: required from here +./include/Eigen/src/Core/CoreEvaluators.h:1064:54: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] + 1064 | PacketAlignment = unpacket_traits<PacketScalar>::alignment, + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:204: re_model.o] Error 1 +ERROR: compilation failed for package ‘gpboost’ +* removing ‘/tmp/workdir/gpboost/new/gpboost.Rcheck/gpboost’ + + +``` +### CRAN + +``` +* installing *source* package ‘gpboost’ ... +** package ‘gpboost’ successfully unpacked and MD5 sums checked +** using staged installation +checking location of R... /opt/R/4.4.0/lib/R +checking whether MM_PREFETCH works... yes +checking whether MM_MALLOC works... yes +configure: creating ./config.status +config.status: creating src/Makevars +** libs +using C compiler: ‘gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +... +./include/GPBoost/re_model_template.h:1456:6: required from ‘void GPBoost::REModelTemplate<T_mat, T_chol>::OptimLinRegrCoefCovPar(const double*, const double*, int, double*, double*, int&, double*, double*, double*, double*, bool, const double*, bool, bool, bool, bool, bool) [with T_mat = Eigen::SparseMatrix<double>; T_chol = Eigen::SimplicialLLT<Eigen::SparseMatrix<double>, 1, Eigen::AMDOrdering<int> >]’ +re_model.cpp:312:40: required from here +./include/Eigen/src/Core/CoreEvaluators.h:1064:54: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] + 1064 | PacketAlignment = unpacket_traits<PacketScalar>::alignment, + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:204: re_model.o] Error 1 +ERROR: compilation failed for package ‘gpboost’ +* removing ‘/tmp/workdir/gpboost/old/gpboost.Rcheck/gpboost’ + + +``` +# gpuR + +<details> + +* Version: 2.0.6 +* GitHub: https://github.com/cdeterman/gpuR +* Source code: https://github.com/cran/gpuR +* Date/Publication: 2024-05-23 16:00:02 UTC +* Number of recursive dependencies: 32 + +Run `revdepcheck::cloud_details(, "gpuR")` for more info + +</details> + +## In both + +* checking whether package ‘gpuR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/gpuR/new/gpuR.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘gpuR’ ... +** package ‘gpuR’ successfully unpacked and MD5 sums checked +** using staged installation +OPENCL_FLAGS not set, using default -DCL_HPP_MINIMUM_OPENCL_VERSION=110 -DCL_USE_DEPRECATED_OPENCL_1_2_APIS -DCL_HPP_TARGET_OPENCL_VERSION=120 +Linux OS +found OpenCL library +Checking OpenCL C++ API +OPENCL_INC not set, using default include directory /usr/include +No OpenCL C++ API found, will use the headers contained in the package + +... +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Assign.h:66:28: required from ‘Derived& Eigen::MatrixBase<Derived>::operator=(const Eigen::DenseBase<OtherDerived>&) [with OtherDerived = Eigen::Matrix<double, -1, 1>; Derived = Eigen::Block<Eigen::Ref<Eigen::Matrix<double, -1, -1>, 0, Eigen::OuterStride<> >, -1, 1, true>]’ +../inst/include/gpuR/dynEigenMat.hpp:192:30: required from ‘void dynEigenMat<T>::setCol(SEXP, int) [with T = double; SEXP = SEXPREC*]’ +../inst/include/gpuR/dynEigenMat.hpp:383:16: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/CoreEvaluators.h:1071:54: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++ -std=gnu++17 -shared -L/opt/R/4.4.0/lib/R/lib -L/usr/local/lib -o gpuR.so RcppExports.o chol.o context.o custom_math.o device.o gpuEigenPtr.o gpuMatrix_igemm.o norm.o platform.o set_row_order.o solve.o synchronize.o trunc_gpuMat.o utils-vcl.o utils.o vclPtr.o vienna_blas1.o vienna_blas2.o vienna_blas3.o vienna_eigen.o vienna_qr.o vienna_stats.o vienna_svd.o -lOpenCL -L/opt/R/4.4.0/lib/R/lib -lR +/usr/bin/ld: cannot find -lOpenCL: No such file or directory +collect2: error: ld returned 1 exit status +make: *** [/opt/R/4.4.0/lib/R/share/make/shlib.mk:10: gpuR.so] Error 1 +ERROR: compilation failed for package ‘gpuR’ +* removing ‘/tmp/workdir/gpuR/new/gpuR.Rcheck/gpuR’ + + +``` +### CRAN + +``` +* installing *source* package ‘gpuR’ ... +** package ‘gpuR’ successfully unpacked and MD5 sums checked +** using staged installation +OPENCL_FLAGS not set, using default -DCL_HPP_MINIMUM_OPENCL_VERSION=110 -DCL_USE_DEPRECATED_OPENCL_1_2_APIS -DCL_HPP_TARGET_OPENCL_VERSION=120 +Linux OS +found OpenCL library +Checking OpenCL C++ API +OPENCL_INC not set, using default include directory /usr/include +No OpenCL C++ API found, will use the headers contained in the package + +... +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Assign.h:66:28: required from ‘Derived& Eigen::MatrixBase<Derived>::operator=(const Eigen::DenseBase<OtherDerived>&) [with OtherDerived = Eigen::Matrix<double, -1, 1>; Derived = Eigen::Block<Eigen::Ref<Eigen::Matrix<double, -1, -1>, 0, Eigen::OuterStride<> >, -1, 1, true>]’ +../inst/include/gpuR/dynEigenMat.hpp:192:30: required from ‘void dynEigenMat<T>::setCol(SEXP, int) [with T = double; SEXP = SEXPREC*]’ +../inst/include/gpuR/dynEigenMat.hpp:383:16: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/CoreEvaluators.h:1071:54: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++ -std=gnu++17 -shared -L/opt/R/4.4.0/lib/R/lib -L/usr/local/lib -o gpuR.so RcppExports.o chol.o context.o custom_math.o device.o gpuEigenPtr.o gpuMatrix_igemm.o norm.o platform.o set_row_order.o solve.o synchronize.o trunc_gpuMat.o utils-vcl.o utils.o vclPtr.o vienna_blas1.o vienna_blas2.o vienna_blas3.o vienna_eigen.o vienna_qr.o vienna_stats.o vienna_svd.o -lOpenCL -L/opt/R/4.4.0/lib/R/lib -lR +/usr/bin/ld: cannot find -lOpenCL: No such file or directory +collect2: error: ld returned 1 exit status +make: *** [/opt/R/4.4.0/lib/R/share/make/shlib.mk:10: gpuR.so] Error 1 +ERROR: compilation failed for package ‘gpuR’ +* removing ‘/tmp/workdir/gpuR/old/gpuR.Rcheck/gpuR’ + + +``` +# loon.shiny + +<details> + +* Version: 1.0.3 +* GitHub: NA +* Source code: https://github.com/cran/loon.shiny +* Date/Publication: 2022-10-08 15:30:02 UTC +* Number of recursive dependencies: 133 + +Run `revdepcheck::cloud_details(, "loon.shiny")` for more info + +</details> + +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/loon.shiny/new/loon.shiny.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘loon.shiny/DESCRIPTION’ ... OK +... +* this is package ‘loon.shiny’ version ‘1.0.3’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'loon', 'loon.ggplot' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/loon.shiny/old/loon.shiny.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘loon.shiny/DESCRIPTION’ ... OK +... +* this is package ‘loon.shiny’ version ‘1.0.3’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'loon', 'loon.ggplot' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# loon.tourr + +<details> + +* Version: 0.1.4 +* GitHub: https://github.com/z267xu/loon.tourr +* Source code: https://github.com/cran/loon.tourr +* Date/Publication: 2024-04-09 09:40:02 UTC +* Number of recursive dependencies: 152 + +Run `revdepcheck::cloud_details(, "loon.tourr")` for more info + +</details> + +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/loon.tourr/new/loon.tourr.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘loon.tourr/DESCRIPTION’ ... OK +... +* this is package ‘loon.tourr’ version ‘0.1.4’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'loon', 'loon.ggplot' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/loon.tourr/old/loon.tourr.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘loon.tourr/DESCRIPTION’ ... OK +... +* this is package ‘loon.tourr’ version ‘0.1.4’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'loon', 'loon.ggplot' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# metajam + +<details> + +* Version: 0.3.1 +* GitHub: https://github.com/NCEAS/metajam +* Source code: https://github.com/cran/metajam +* Date/Publication: 2024-08-16 17:50:02 UTC +* Number of recursive dependencies: 89 + +Run `revdepcheck::cloud_details(, "metajam")` for more info + +</details> + +## In both + +* checking whether package ‘metajam’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/metajam/new/metajam.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘metajam’ ... +** package ‘metajam’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘metajam’ +* removing ‘/tmp/workdir/metajam/new/metajam.Rcheck/metajam’ + + +``` +### CRAN + +``` +* installing *source* package ‘metajam’ ... +** package ‘metajam’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘metajam’ +* removing ‘/tmp/workdir/metajam/old/metajam.Rcheck/metajam’ + + +``` +# multinma + +<details> + +* Version: 0.8.1 +* GitHub: https://github.com/dmphillippo/multinma +* Source code: https://github.com/cran/multinma +* Date/Publication: 2025-05-31 00:00:02 UTC +* Number of recursive dependencies: 149 + +Run `revdepcheck::cloud_details(, "multinma")` for more info + +</details> + +## In both + +* checking whether package ‘multinma’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/multinma/new/multinma.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘multinma’ ... +** package ‘multinma’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric<Model, BaseRNG>::T(stan::mcmc::dense_e_point&) [with Model = model_survival_param_namespace::model_survival_param; BaseRNG = boost::random::additive_combine_engine<boost::random::linear_congruential_engine<unsigned int, 40014, 0, 2147483563>, boost::random::linear_congruential_engine<unsigned int, 40692, 0, 2147483399> >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned<int(unpacket_traits<DefaultPacketType>::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:202: stanExports_survival_param.o] Error 1 +ERROR: compilation failed for package ‘multinma’ +* removing ‘/tmp/workdir/multinma/new/multinma.Rcheck/multinma’ + + +``` +### CRAN + +``` +* installing *source* package ‘multinma’ ... +** package ‘multinma’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric<Model, BaseRNG>::T(stan::mcmc::dense_e_point&) [with Model = model_survival_param_namespace::model_survival_param; BaseRNG = boost::random::additive_combine_engine<boost::random::linear_congruential_engine<unsigned int, 40014, 0, 2147483563>, boost::random::linear_congruential_engine<unsigned int, 40692, 0, 2147483399> >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned<int(unpacket_traits<DefaultPacketType>::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:202: stanExports_survival_param.o] Error 1 +ERROR: compilation failed for package ‘multinma’ +* removing ‘/tmp/workdir/multinma/old/multinma.Rcheck/multinma’ + + +``` +# OpenMx + +<details> + +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/OpenMx +* Number of recursive dependencies: 159 + +Run `revdepcheck::cloud_details(, "OpenMx")` for more info + +</details> + +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# rdflib + +<details> + +* Version: 0.2.9 +* GitHub: https://github.com/ropensci/rdflib +* Source code: https://github.com/cran/rdflib +* Date/Publication: 2024-08-17 06:00:05 UTC +* Number of recursive dependencies: 92 + +Run `revdepcheck::cloud_details(, "rdflib")` for more info + +</details> + +## In both + +* checking whether package ‘rdflib’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/rdflib/new/rdflib.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘rdflib’ ... +** package ‘rdflib’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘rdflib’ +* removing ‘/tmp/workdir/rdflib/new/rdflib.Rcheck/rdflib’ + + +``` +### CRAN + +``` +* installing *source* package ‘rdflib’ ... +** package ‘rdflib’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘rdflib’ +* removing ‘/tmp/workdir/rdflib/old/rdflib.Rcheck/rdflib’ + + +``` +# recommenderlab + +<details> + +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/recommenderlab +* Number of recursive dependencies: 36 + +Run `revdepcheck::cloud_details(, "recommenderlab")` for more info + +</details> + +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# redland + +<details> + +* Version: 1.0.17-18 +* GitHub: https://github.com/ropensci/redland-bindings +* Source code: https://github.com/cran/redland +* Date/Publication: 2024-02-24 01:10:02 UTC +* Number of recursive dependencies: 53 + +Run `revdepcheck::cloud_details(, "redland")` for more info + +</details> + +## In both + +* checking whether package ‘redland’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/redland/new/redland.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘redland’ ... +** package ‘redland’ successfully unpacked and MD5 sums checked +** using staged installation +Using PKG_CFLAGS= +Using PKG_LIBS=-lrdf +------------------------- ANTICONF ERROR --------------------------- +Configuration failed because redland was not found. Try installing: + * deb: librdf0-dev (Debian, Ubuntu, etc) + * rpm: redland-devel (Fedora, EPEL) + * brew: redland (OSX) +If redland is already installed, check that 'pkg-config' is in your +PATH and PKG_CONFIG_PATH contains a redland.pc file. If pkg-config +is unavailable you can set INCLUDE_DIR and LIB_DIR manually via: +R CMD INSTALL --configure-vars='INCLUDE_DIR=... LIB_DIR=...' +-------------------------------------------------------------------- +ERROR: configuration failed for package ‘redland’ +* removing ‘/tmp/workdir/redland/new/redland.Rcheck/redland’ + + +``` +### CRAN + +``` +* installing *source* package ‘redland’ ... +** package ‘redland’ successfully unpacked and MD5 sums checked +** using staged installation +Using PKG_CFLAGS= +Using PKG_LIBS=-lrdf +------------------------- ANTICONF ERROR --------------------------- +Configuration failed because redland was not found. Try installing: + * deb: librdf0-dev (Debian, Ubuntu, etc) + * rpm: redland-devel (Fedora, EPEL) + * brew: redland (OSX) +If redland is already installed, check that 'pkg-config' is in your +PATH and PKG_CONFIG_PATH contains a redland.pc file. If pkg-config +is unavailable you can set INCLUDE_DIR and LIB_DIR manually via: +R CMD INSTALL --configure-vars='INCLUDE_DIR=... LIB_DIR=...' +-------------------------------------------------------------------- +ERROR: configuration failed for package ‘redland’ +* removing ‘/tmp/workdir/redland/old/redland.Rcheck/redland’ + + +``` +# rstanarm + +<details> + +* Version: 2.32.1 +* GitHub: https://github.com/stan-dev/rstanarm +* Source code: https://github.com/cran/rstanarm +* Date/Publication: 2024-01-18 23:00:03 UTC +* Number of recursive dependencies: 139 + +Run `revdepcheck::cloud_details(, "rstanarm")` for more info + +</details> + +## In both + +* checking whether package ‘rstanarm’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘rstanarm’ ... +** package ‘rstanarm’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 +"/opt/R/4.4.0/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan +Wrote C++ file "stan_files/bernoulli.cc" + + +... +/usr/local/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned<int(unpacket_traits<DefaultPacketType>::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:202: stan_files/continuous.o] Error 1 +rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc +ERROR: compilation failed for package ‘rstanarm’ +* removing ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/rstanarm’ + + +``` +### CRAN + +``` +* installing *source* package ‘rstanarm’ ... +** package ‘rstanarm’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 +"/opt/R/4.4.0/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan +Wrote C++ file "stan_files/bernoulli.cc" + + +... +/usr/local/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits<double>::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned<int(unpacket_traits<DefaultPacketType>::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:202: stan_files/continuous.o] Error 1 +rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc +ERROR: compilation failed for package ‘rstanarm’ +* removing ‘/tmp/workdir/rstanarm/old/rstanarm.Rcheck/rstanarm’ + + +``` +# SQLFormatteR + +<details> + +* Version: 0.0.2 +* GitHub: https://github.com/dataupsurge/SQLFormatteR +* Source code: https://github.com/cran/SQLFormatteR +* Date/Publication: 2025-04-13 06:30:01 UTC +* Number of recursive dependencies: 70 + +Run `revdepcheck::cloud_details(, "SQLFormatteR")` for more info + +</details> + +## In both + +* checking whether package ‘SQLFormatteR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/SQLFormatteR/new/SQLFormatteR.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘SQLFormatteR’ ... +** package ‘SQLFormatteR’ successfully unpacked and MD5 sums checked +** using staged installation +Error in eval(ei, envir) : +------------------ [UNSUPPORTED RUST VERSION]------------------ +- Minimum supported Rust version is 1.78.0. +- Installed Rust version is 1.75.0. +--------------------------------------------------------------- +Calls: source -> withVisible -> eval -> eval +Execution halted +ERROR: configuration failed for package ‘SQLFormatteR’ +* removing ‘/tmp/workdir/SQLFormatteR/new/SQLFormatteR.Rcheck/SQLFormatteR’ + + +``` +### CRAN + +``` +* installing *source* package ‘SQLFormatteR’ ... +** package ‘SQLFormatteR’ successfully unpacked and MD5 sums checked +** using staged installation +Error in eval(ei, envir) : +------------------ [UNSUPPORTED RUST VERSION]------------------ +- Minimum supported Rust version is 1.78.0. +- Installed Rust version is 1.75.0. +--------------------------------------------------------------- +Calls: source -> withVisible -> eval -> eval +Execution halted +ERROR: configuration failed for package ‘SQLFormatteR’ +* removing ‘/tmp/workdir/SQLFormatteR/old/SQLFormatteR.Rcheck/SQLFormatteR’ + + +``` +# string2path + +<details> + +* Version: 0.2.2 +* GitHub: https://github.com/yutannihilation/string2path +* Source code: https://github.com/cran/string2path +* Date/Publication: 2025-03-25 23:20:02 UTC +* Number of recursive dependencies: 35 + +Run `revdepcheck::cloud_details(, "string2path")` for more info + +</details> + +## In both + +* checking whether package ‘string2path’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/string2path/new/string2path.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘string2path’ ... +** package ‘string2path’ successfully unpacked and MD5 sums checked +** using staged installation +*** Checking if cargo is installed +*** Checking if cargo is newer than the required version + +-------------- ERROR: CONFIGURATION FAILED -------------------- + +[cargo check result] +The installed version of cargo (1.75.0) is older than the requirement (1.78.0) + +Please refer to <https://www.rust-lang.org/tools/install> to install Rust. + +--------------------------------------------------------------- + +ERROR: configuration failed for package ‘string2path’ +* removing ‘/tmp/workdir/string2path/new/string2path.Rcheck/string2path’ + + +``` +### CRAN + +``` +* installing *source* package ‘string2path’ ... +** package ‘string2path’ successfully unpacked and MD5 sums checked +** using staged installation +*** Checking if cargo is installed +*** Checking if cargo is newer than the required version + +-------------- ERROR: CONFIGURATION FAILED -------------------- + +[cargo check result] +The installed version of cargo (1.75.0) is older than the requirement (1.78.0) + +Please refer to <https://www.rust-lang.org/tools/install> to install Rust. + +--------------------------------------------------------------- + +ERROR: configuration failed for package ‘string2path’ +* removing ‘/tmp/workdir/string2path/old/string2path.Rcheck/string2path’ + + +``` +# TestAnaAPP + +<details> + +* Version: 1.1.2 +* GitHub: https://github.com/jiangyouxiang/TestAnaAPP +* Source code: https://github.com/cran/TestAnaAPP +* Date/Publication: 2024-11-09 04:00:02 UTC +* Number of recursive dependencies: 263 + +Run `revdepcheck::cloud_details(, "TestAnaAPP")` for more info + +</details> + +## In both + +* checking whether package ‘TestAnaAPP’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/TestAnaAPP/new/TestAnaAPP.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘TestAnaAPP’ ... +** package ‘TestAnaAPP’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘OpenMx’ +Calls: <Anonymous> ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: lazy loading failed for package ‘TestAnaAPP’ +* removing ‘/tmp/workdir/TestAnaAPP/new/TestAnaAPP.Rcheck/TestAnaAPP’ + + +``` +### CRAN + +``` +* installing *source* package ‘TestAnaAPP’ ... +** package ‘TestAnaAPP’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘OpenMx’ +Calls: <Anonymous> ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: lazy loading failed for package ‘TestAnaAPP’ +* removing ‘/tmp/workdir/TestAnaAPP/old/TestAnaAPP.Rcheck/TestAnaAPP’ + + +``` +# TriDimRegression + +<details> + +* Version: 1.0.2 +* GitHub: https://github.com/alexander-pastukhov/tridim-regression +* Source code: https://github.com/cran/TriDimRegression +* Date/Publication: 2023-09-13 14:10:03 UTC +* Number of recursive dependencies: 95 + +Run `revdepcheck::cloud_details(, "TriDimRegression")` for more info + +</details> + +## In both + +* checking whether package ‘TriDimRegression’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/TriDimRegression/new/TriDimRegression.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘TriDimRegression’ ... +** package ‘TriDimRegression’ successfully unpacked and MD5 sums checked +** using staged installation +Error in loadNamespace(x) : there is no package called ‘rstantools’ +Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: configuration failed for package ‘TriDimRegression’ +* removing ‘/tmp/workdir/TriDimRegression/new/TriDimRegression.Rcheck/TriDimRegression’ + + +``` +### CRAN + +``` +* installing *source* package ‘TriDimRegression’ ... +** package ‘TriDimRegression’ successfully unpacked and MD5 sums checked +** using staged installation +Error in loadNamespace(x) : there is no package called ‘rstantools’ +Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: configuration failed for package ‘TriDimRegression’ +* removing ‘/tmp/workdir/TriDimRegression/old/TriDimRegression.Rcheck/TriDimRegression’ + + +``` +# xactonomial + +<details> + +* Version: 1.0.3 +* GitHub: https://github.com/sachsmc/xactonomial +* Source code: https://github.com/cran/xactonomial +* Date/Publication: 2025-04-28 13:50:02 UTC +* Number of recursive dependencies: 41 + +Run `revdepcheck::cloud_details(, "xactonomial")` for more info + +</details> + +## In both + +* checking whether package ‘xactonomial’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/xactonomial/new/xactonomial.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘xactonomial’ ... +** package ‘xactonomial’ successfully unpacked and MD5 sums checked +** using staged installation +Using cargo 1.75.0 +Using rustc 1.75.0 (82e1608df 2023-12-21) (built from a source tarball) +Building for CRAN. +Writing `src/Makevars`. +`tools/config.R` has finished. +** libs +using C compiler: ‘gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +... +106 | [::std::mem::offset_of!(R_CallMethodDef, numArgs) - 16usize]; + | ^^^^^^^^^^^^^^^^^^^^^ + | + = note: see issue #106655 <https://github.com/rust-lang/rust/issues/106655> for more information + +For more information about this error, try `rustc --explain E0658`. +error: could not compile `xactonomial` (lib) due to 7 previous errors +make: *** [Makevars:28: rust/target/release/libxactonomial.a] Error 101 +ERROR: compilation failed for package ‘xactonomial’ +* removing ‘/tmp/workdir/xactonomial/new/xactonomial.Rcheck/xactonomial’ + + +``` +### CRAN + +``` +* installing *source* package ‘xactonomial’ ... +** package ‘xactonomial’ successfully unpacked and MD5 sums checked +** using staged installation +Using cargo 1.75.0 +Using rustc 1.75.0 (82e1608df 2023-12-21) (built from a source tarball) +Building for CRAN. +Writing `src/Makevars`. +`tools/config.R` has finished. +** libs +using C compiler: ‘gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +... +106 | [::std::mem::offset_of!(R_CallMethodDef, numArgs) - 16usize]; + | ^^^^^^^^^^^^^^^^^^^^^ + | + = note: see issue #106655 <https://github.com/rust-lang/rust/issues/106655> for more information + +For more information about this error, try `rustc --explain E0658`. +error: could not compile `xactonomial` (lib) due to 7 previous errors +make: *** [Makevars:28: rust/target/release/libxactonomial.a] Error 101 +ERROR: compilation failed for package ‘xactonomial’ +* removing ‘/tmp/workdir/xactonomial/old/xactonomial.Rcheck/xactonomial’ + + +``` +# zen4R + +<details> + +* Version: 0.10.2 +* GitHub: https://github.com/eblondel/zen4R +* Source code: https://github.com/cran/zen4R +* Date/Publication: 2025-06-18 00:50:02 UTC +* Number of recursive dependencies: 71 + +Run `revdepcheck::cloud_details(, "zen4R")` for more info + +</details> + +## In both + +* checking whether package ‘zen4R’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/zen4R/new/zen4R.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘zen4R’ ... +** package ‘zen4R’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘zen4R’ +* removing ‘/tmp/workdir/zen4R/new/zen4R.Rcheck/zen4R’ + + +``` +### CRAN + +``` +* installing *source* package ‘zen4R’ ... +** package ‘zen4R’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: <Anonymous> ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘zen4R’ +* removing ‘/tmp/workdir/zen4R/old/zen4R.Rcheck/zen4R’ + + +``` diff --git a/revdep/problems.md b/revdep/problems.md index 6d4cd27bb..826564899 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -1,14 +1,14 @@ -# arrow +# aws.comprehend <details> -* Version: 17.0.0.1 -* GitHub: https://github.com/apache/arrow -* Source code: https://github.com/cran/arrow -* Date/Publication: 2024-08-21 12:20:06 UTC -* Number of recursive dependencies: 77 +* Version: 0.2.1 +* GitHub: https://github.com/cloudyr/aws.comprehend +* Source code: https://github.com/cran/aws.comprehend +* Date/Publication: 2020-03-18 14:30:06 UTC +* Number of recursive dependencies: 32 -Run `revdepcheck::cloud_details(, "arrow")` for more info +Run `revdepcheck::cloud_details(, "aws.comprehend")` for more info </details> @@ -19,52 +19,2178 @@ Run `revdepcheck::cloud_details(, "arrow")` for more info Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: - > # Licensed to the Apache Software Foundation (ASF) under one - > # or more contributor license agreements. See the NOTICE file - > # distributed with this work for additional information - > # regarding copyright ownership. The ASF licenses this file - > # to you under the Apache License, Version 2.0 (the - > # "License"); you may not use this file except in compliance - > # with the License. You may obtain a copy of the License at + > library(testthat) + > library(aws.comprehend) + > + > test_check("aws.comprehend") + [ FAIL 13 | WARN 0 | SKIP 0 | PASS 10 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-detect_syntax.R:27:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 13 | WARN 0 | SKIP 0 | PASS 10 ] + Error: Test failures + Execution halted + ``` + +# bcRP + +<details> + +* Version: 1.0.1 +* GitHub: https://github.com/JulioCollazos64/bcRP +* Source code: https://github.com/cran/bcRP +* Date/Publication: 2025-07-22 12:10:12 UTC +* Number of recursive dependencies: 47 + +Run `revdepcheck::cloud_details(, "bcRP")` for more info + +</details> + +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘bcRP-Ex.R’ failed + The error most likely occurred in: + + > ### Name: get_bcrp_data + > ### Title: Perform an API request to BCRPData + > ### Aliases: get_bcrp_data + > + > ### ** Examples + > + > codes <- c("PN00009MM", "PN00002MM", "PN01270PM", "PD39557DA") + ... + 10 Mar.2024 -6059.647797 Cuentas monetarias de las sociedades creado… PN00… + # ℹ 82 more rows + > + > # You can also provide the range of dates + > # through the `from` and `to` arguments. + > get_bcrp_data(codes = codes, from = "2015-01", to = "2020-01") + Error in perform_req_strategy(requests = list_of_requests, strategy = request_strategy) : + Error(s) at: PN00002MM + Calls: get_bcrp_data -> perform_req_strategy + Execution halted + ``` + +# bindr + +<details> + +* Version: 0.1.2 +* GitHub: https://github.com/krlmlr/bindr +* Source code: https://github.com/cran/bindr +* Date/Publication: 2024-11-21 21:30:14 UTC +* Number of recursive dependencies: 24 + +Run `revdepcheck::cloud_details(, "bindr")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(bindr) + > + > test_check("bindr") + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 41 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-error.R:9:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 41 ] + Error: Test failures + Execution halted + ``` + +# conflr + +<details> + +* Version: 0.1.1 +* GitHub: https://github.com/line/conflr +* Source code: https://github.com/cran/conflr +* Date/Publication: 2020-04-08 12:50:02 UTC +* Number of recursive dependencies: 61 + +Run `revdepcheck::cloud_details(, "conflr")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # Copyright (C) 2019 LINE Corporation + > # + > # conflr is free software; you can redistribute it and/or modify it under the + > # terms of the GNU General Public License as published by the Free Software + > # Foundation, version 3. + > # + > # conflr is distributed in the hope that it will be useful, but WITHOUT ANY + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-utils.R:93:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 14 | WARN 0 | SKIP 4 | PASS 92 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘R6’ + All declared Imports should be used. + ``` + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# countdown + +<details> + +* Version: 0.4.0 +* GitHub: https://github.com/gadenbuie/countdown +* Source code: https://github.com/cran/countdown +* Date/Publication: 2022-08-16 09:00:08 UTC +* Number of recursive dependencies: 52 + +Run `revdepcheck::cloud_details(, "countdown")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(countdown) + > + > test_check("countdown") + [ FAIL 1 | WARN 0 | SKIP 1 | PASS 43 ] + + ══ Skipped tests (1) ═══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(requireNamespace = function(...) FALSE, expect_error(countdown_app())) at test-shiny.R:7:5 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 1 | PASS 43 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd cross-references ... NOTE + ``` + Packages unavailable to check Rd xrefs: ‘xaringan’, ‘beepr’ + ``` + +# covr + +<details> + +* Version: 3.6.4 +* GitHub: https://github.com/r-lib/covr +* Source code: https://github.com/cran/covr +* Date/Publication: 2023-11-09 08:10:06 UTC +* Number of recursive dependencies: 58 + +Run `revdepcheck::cloud_details(, "covr")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > ops <- options("crayon.enabled" = FALSE, warn = 1) + > library(testthat) + > library("covr") + > + > # Skip tests on Solaris as gcc is not in the PATH and I do not have an easy way + > # to mimic the CRAN build environment + > if (!tolower(Sys.info()[["sysname"]]) == "sunos") { + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-utils.R:27:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 22 | WARN 0 | SKIP 10 | PASS 185 ] + Error: Test failures + Execution halted + ``` + +# datarobot + +<details> + +* Version: 2.18.6 +* GitHub: NA +* Source code: https://github.com/cran/datarobot +* Date/Publication: 2024-03-13 20:40:02 UTC +* Number of recursive dependencies: 94 + +Run `revdepcheck::cloud_details(, "datarobot")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(datarobot) + Did not connect to DataRobot on package startup. Use `ConnectToDataRobot`. + To connect by default on startup, you can put a config file at: /root/.config/datarobot/drconfig.yaml + > + > test_check("datarobot") + [ FAIL 9 | WARN 0 | SKIP 32 | PASS 98 ] + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-StartAutopilot.R:461:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 9 | WARN 0 | SKIP 32 | PASS 98 ] + Error: Test failures + Execution halted + ``` + +# digitize + +<details> + +* Version: 0.0.4 +* GitHub: https://github.com/tpoisot/digitize +* Source code: https://github.com/cran/digitize +* Date/Publication: 2016-08-27 07:52:45 +* Number of recursive dependencies: 29 + +Run `revdepcheck::cloud_details(, "digitize")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(digitize) + > + > test_check("digitize") + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 1 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-unit.r:9:13 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 1 ] + Error: Test failures + Execution halted + ``` + +# distro + +<details> + +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/distro +* Date/Publication: 2020-11-09 09:50:02 UTC +* Number of recursive dependencies: 24 + +Run `revdepcheck::cloud_details(, "distro")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(distro) + > + > test_check("distro") + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 1 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. └─distro (local) with_mock_system_release(...) + 5. └─testthat::with_mock(...) at test-system-release.R:2:3 + 6. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 7. └─lifecycle:::deprecate_stop0(msg) + 8. └─rlang::cnd_signal(...) + + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 1 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# esci + +<details> + +* Version: 1.0.7 +* GitHub: https://github.com/rcalinjageman/esci +* Source code: https://github.com/cran/esci +* Date/Publication: 2025-02-22 03:20:02 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "esci")` for more info + +</details> + +## Newly broken + +* checking installed package size ... NOTE + ``` + installed size is 6.7Mb + sub-directories of 1Mb or more: + R 6.0Mb + ``` + +# gen3sis + +<details> + +* Version: 1.5.11 +* GitHub: https://github.com/project-Gen3sis/R-package +* Source code: https://github.com/cran/gen3sis +* Date/Publication: 2023-11-22 15:20:06 UTC +* Number of recursive dependencies: 59 + +Run `revdepcheck::cloud_details(, "gen3sis")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # Copyright (c) 2020, ETH Zurich + > + > library(testthat) + > library(gen3sis) + > + > test_check("gen3sis") + [ FAIL 1 | WARN 0 | SKIP 11 | PASS 23 ] + ... + Backtrace: + ▆ + 1. └─testthat::local_mock(...) at test-input_creation.R:16:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "local_mock()", "local_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 11 | PASS 23 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.7Mb + sub-directories of 1Mb or more: + doc 1.5Mb + extdata 3.5Mb + libs 2.3Mb + ``` + +# geomorph + +<details> + +* Version: 4.0.10 +* GitHub: https://github.com/geomorphR/geomorph +* Source code: https://github.com/cran/geomorph +* Date/Publication: 2025-02-05 19:10:07 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "geomorph")` for more info + +</details> + +## Newly broken + +* checking installed package size ... NOTE + ``` + installed size is 5.5Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 2.0Mb + doc 1.5Mb + ``` + +# graphhopper + +<details> + +* Version: 0.1.2 +* GitHub: https://github.com/crazycapivara/graphhopper-r +* Source code: https://github.com/cran/graphhopper +* Date/Publication: 2021-02-06 16:50:02 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "graphhopper")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(graphhopper) + > + > test_check("graphhopper") + [ FAIL 1 | WARN 0 | SKIP 2 | PASS 6 ] + + ══ Skipped tests (2) ═══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test_route.R:9:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 2 | PASS 6 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# handwriterRF + +<details> + +* Version: 1.1.1 +* GitHub: https://github.com/CSAFE-ISU/handwriterRF +* Source code: https://github.com/cran/handwriterRF +* Date/Publication: 2025-01-29 00:20:01 UTC +* Number of recursive dependencies: 123 + +Run `revdepcheck::cloud_details(, "handwriterRF")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + 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/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + Calculating similarity score... + Calculating distance between samples... + Calculating similarity score... + Calculating distance between samples... + Calculating similarity score... + Calculating SLR... + Calculating distance between samples... + Calculating similarity score... + Calculating SLR... + Killed + ``` + +# humanize + +<details> + +* Version: 0.2.0 +* GitHub: https://github.com/newtux/humanize +* Source code: https://github.com/cran/humanize +* Date/Publication: 2018-04-04 04:16:58 UTC +* Number of recursive dependencies: 31 + +Run `revdepcheck::cloud_details(, "humanize")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(humanize) + > + > test_check("humanize") + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 96 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test_time.R:214:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 96 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# ipaddress + +<details> + +* Version: 1.0.2 +* GitHub: https://github.com/davidchall/ipaddress +* Source code: https://github.com/cran/ipaddress +* Date/Publication: 2023-12-01 23:10:02 UTC +* Number of recursive dependencies: 64 + +Run `revdepcheck::cloud_details(, "ipaddress")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ipaddress) + > + > test_check("ipaddress") + [ FAIL 1 | WARN 0 | SKIP 42 | PASS 596 ] + + ══ Skipped tests (42) ══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::local_mock(`ipaddress:::is_offline` = function() TRUE) at test-ip_to_hostname.R:49:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "local_mock()", "local_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 42 | PASS 596 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 13.1Mb + sub-directories of 1Mb or more: + libs 12.5Mb + ``` + +# leaflet.minicharts + +<details> + +* Version: 0.6.2 +* GitHub: NA +* Source code: https://github.com/cran/leaflet.minicharts +* Date/Publication: 2021-05-11 09:20:10 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "leaflet.minicharts")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(leaflet.minicharts) + > + > test_check("leaflet.minicharts") + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 106 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-minicharts.R:12:1 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 106 ] + Error: Test failures + Execution halted + ``` + +# learnr + +<details> + +* Version: 0.11.5 +* GitHub: https://github.com/rstudio/learnr +* Source code: https://github.com/cran/learnr +* Date/Publication: 2023-09-28 05:00:02 UTC +* Number of recursive dependencies: 87 + +Run `revdepcheck::cloud_details(, "learnr")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > + > if (requireNamespace("testthat")) { + + library(testthat) + + library(learnr) + + + + test_check("learnr") + + } + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-exercise.R:246:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 20 | PASS 803 ] + Error: Test failures + Execution halted + ``` + +# MakefileR + +<details> + +* Version: 1.0 +* GitHub: https://github.com/krlmlr/MakefileR +* Source code: https://github.com/cran/MakefileR +* Date/Publication: 2016-01-08 15:55:12 +* Number of recursive dependencies: 41 + +Run `revdepcheck::cloud_details(, "MakefileR")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(MakefileR) + > + > test_check("MakefileR") + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 31 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-rule.R:30:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 31 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# manipulateWidget + +<details> + +* Version: 0.11.1 +* GitHub: https://github.com/rte-antares-rpackage/manipulateWidget +* Source code: https://github.com/cran/manipulateWidget +* Date/Publication: 2021-10-05 08:50:09 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "manipulateWidget")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(manipulateWidget) + > + > test_check("manipulateWidget") + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 650 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + 1. ├─base::suppressWarnings(...) at test-on_done.R:24:5 + 2. │ └─base::withCallingHandlers(...) + 3. └─testthat::with_mock(...) at test-on_done.R:24:23 + 4. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 5. └─lifecycle:::deprecate_stop0(msg) + 6. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 650 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) manipulateWidget.Rd:113-117: Lost braces in \itemize; meant \describe ? + checkRd: (-1) manipulateWidget.Rd:118-120: Lost braces in \itemize; meant \describe ? + checkRd: (-1) manipulateWidget.Rd:121-123: Lost braces in \itemize; meant \describe ? + checkRd: (-1) manipulateWidget.Rd:124-127: Lost braces in \itemize; meant \describe ? + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 55 marked UTF-8 strings + ``` + +# mbbe + +<details> + +* Version: 0.1.0 +* GitHub: https://github.com/certara/mbbe +* Source code: https://github.com/cran/mbbe +* Date/Publication: 2024-02-03 11:20:02 UTC +* Number of recursive dependencies: 82 + +Run `revdepcheck::cloud_details(, "mbbe")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + 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/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-check_requirements.R:39:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 11 ] + Error: Test failures + Execution halted + ``` + +# metaDigitise + +<details> + +* Version: 1.0.1 +* GitHub: https://github.com/daniel1noble/metaDigitise +* Source code: https://github.com/cran/metaDigitise +* Date/Publication: 2020-03-13 06:10:02 UTC +* Number of recursive dependencies: 47 + +Run `revdepcheck::cloud_details(, "metaDigitise")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > + > library(testthat) + > library(metaDigitise) + > library(mockery) + > + > testthat::test_check("metaDigitise") + [ FAIL 14 | WARN 0 | SKIP 0 | PASS 35 ] + ... + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. └─metaDigitise (local) point_extraction_tester_func(object = list(plot_type = "mean_error")) + 5. └─testthat::with_mock(...) at test-point_extraction.R:9:9 + 6. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 7. └─lifecycle:::deprecate_stop0(msg) + 8. └─rlang::cnd_signal(...) + + [ FAIL 14 | WARN 0 | SKIP 0 | PASS 35 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# mknapsack + +<details> + +* Version: 0.1.0 +* GitHub: https://github.com/madedotcom/mknapsack +* Source code: https://github.com/cran/mknapsack +* Date/Publication: 2018-04-10 12:45:53 UTC +* Number of recursive dependencies: 35 + +Run `revdepcheck::cloud_details(, "mknapsack")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > suppressPackageStartupMessages({ + + library(testthat) + + library(data.table) + + }) + > + > test_check("mknapsack") + Loading required package: mknapsack + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-packing.R:146:5 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 21 ] + Error: Test failures + Execution halted + ``` + +# mockery + +<details> + +* Version: 0.4.4 +* GitHub: https://github.com/r-lib/mockery +* Source code: https://github.com/cran/mockery +* Date/Publication: 2023-09-26 18:50:02 UTC +* Number of recursive dependencies: 41 + +Run `revdepcheck::cloud_details(, "mockery")` for more info + +</details> + +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘mockery-Ex.R’ failed + The error most likely occurred in: + + > ### Name: call-expectations + > ### Title: Expectation: does the given call match the expected? + > ### Aliases: call-expectations expect_call expect_args expect_called + > + > ### ** Examples + > + > library(testthat) + ... + Error: + ! `with_mock()` was deprecated in testthat 3.2.0 and is now defunct. + ℹ Please use `with_mocked_bindings()` instead. + Backtrace: + ▆ + 1. └─testthat::with_mock(summary = m, summary(iris)) + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(mockery) + > + > test_check("mockery") + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 90 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-mock-object.R:153:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 90 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘mocks-and-testthat.Rmd’ using rmarkdown + + Quitting from mocks-and-testthat.Rmd:136-144 [with_mock] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'mocks-and-testthat.Rmd' failed with diagnostics: + `with_mock()` was deprecated in testthat 3.2.0 and is now defunct. + ℹ Please use `with_mocked_bindings()` instead. + --- failed re-building ‘mocks-and-testthat.Rmd’ + + SUMMARY: processing the following file failed: + ‘mocks-and-testthat.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# moexer + +<details> + +* Version: 0.3.0 +* GitHub: https://github.com/x1o/moexer +* Source code: https://github.com/cran/moexer +* Date/Publication: 2024-03-12 12:30:03 UTC +* Number of recursive dependencies: 83 + +Run `revdepcheck::cloud_details(, "moexer")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(moexer) + > + > test_check("moexer") + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 0 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-iss.R:3:5 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted + ``` + +# MolgenisArmadillo + +<details> + +* Version: 2.9.1 +* GitHub: https://github.com/molgenis/molgenis-r-armadillo +* Source code: https://github.com/cran/MolgenisArmadillo +* Date/Publication: 2025-06-13 13:10:02 UTC +* Number of recursive dependencies: 83 + +Run `revdepcheck::cloud_details(, "MolgenisArmadillo")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(tibble) + > library(MolgenisArmadillo) + > library(webmockr) + > + > test_check("MolgenisArmadillo") + crul not installed, skipping enable + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-utils.R:11:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 237 ] + Error: Test failures + Execution halted + ``` + +# NasdaqDataLink + +<details> + +* Version: 1.0.0 +* GitHub: https://github.com/nasdaq/data-link-r +* Source code: https://github.com/cran/NasdaqDataLink +* Date/Publication: 2022-06-22 07:50:05 UTC +* Number of recursive dependencies: 48 + +Run `revdepcheck::cloud_details(, "NasdaqDataLink")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > test_check("NasdaqDataLink") + Loading required package: NasdaqDataLink + Loading required package: xts + Loading required package: zoo + + Attaching package: 'zoo' + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-search.r:4:1 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 6 | WARN 0 | SKIP 0 | PASS 4 ] + Error: Test failures + Execution halted + ``` + +# nhlapi + +<details> + +* Version: 0.1.4 +* GitHub: https://github.com/jozefhajnala/nhlapi +* Source code: https://github.com/cran/nhlapi +* Date/Publication: 2021-02-20 01:20:05 UTC +* Number of recursive dependencies: 50 + +Run `revdepcheck::cloud_details(, "nhlapi")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(nhlapi) + > + > test_check("nhlapi") + [ FAIL 17 | WARN 0 | SKIP 38 | PASS 147 ] + + ══ Skipped tests (38) ══════════════════════════════════════════════════════════ + ... + 2. │ └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. └─testthat::with_mock(...) + 5. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 6. └─lifecycle:::deprecate_stop0(msg) + 7. └─rlang::cnd_signal(...) + + [ FAIL 17 | WARN 0 | SKIP 38 | PASS 147 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# owmr + +<details> + +* Version: 0.8.2 +* GitHub: https://github.com/crazycapivara/owmr +* Source code: https://github.com/cran/owmr +* Date/Publication: 2020-01-11 14:30:02 UTC +* Number of recursive dependencies: 79 + +Run `revdepcheck::cloud_details(, "owmr")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(owmr) + owmr 0.8.2 + another crazy way to talk to OpenWeatherMap's API + Documentation: type ?owmr or https://crazycapivara.github.io/owmr/ + Issues, notes and bleeding edge: https://github.com/crazycapivara/owmr/ + + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test_forecast.R:8:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 3 | SKIP 0 | PASS 28 ] + Error: Test failures + Execution halted + ``` + +# oxcAAR + +<details> + +* Version: 1.1.1 +* GitHub: NA +* Source code: https://github.com/cran/oxcAAR +* Date/Publication: 2021-07-05 17:20:02 UTC +* Number of recursive dependencies: 62 + +Run `revdepcheck::cloud_details(, "oxcAAR")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(oxcAAR) + > + > test_check("oxcAAR") + [ FAIL 6 | WARN 1 | SKIP 1 | PASS 50 ] + + ══ Skipped tests (1) ═══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test_simulate.R:12:1 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 6 | WARN 1 | SKIP 1 | PASS 50 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘basic-usage.Rmd’ using rmarkdown + trying URL 'https://c14.arch.ox.ac.uk/OxCalDistribution.zip' + + Quitting from basic-usage.Rmd:23-31 [unnamed-chunk-1] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + <error/rlang_error> + Error in `invokeRestart()`: + ! no 'restart' 'muffleWarning' found + --- + ... + + Error: processing vignette 'basic-usage.Rmd' failed with diagnostics: + no 'restart' 'muffleWarning' found + --- failed re-building ‘basic-usage.Rmd’ + + SUMMARY: processing the following file failed: + ‘basic-usage.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# parameters + +<details> + +* Version: 0.27.0 +* GitHub: https://github.com/easystats/parameters +* Source code: https://github.com/cran/parameters +* Date/Publication: 2025-07-09 09:30:05 UTC +* Number of recursive dependencies: 477 + +Run `revdepcheck::cloud_details(, "parameters")` for more info + +</details> + +## Newly broken + +* checking installed package size ... NOTE + ``` + installed size is 5.4Mb + sub-directories of 1Mb or more: + R 3.5Mb + help 1.7Mb + ``` + +# passport + +<details> + +* Version: 0.3.0 +* GitHub: https://github.com/alistaire47/passport +* Source code: https://github.com/cran/passport +* Date/Publication: 2020-11-07 07:30:03 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "passport")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(passport) + > + > test_check("passport") + [ FAIL 1 | WARN 4 | SKIP 1 | PASS 37 ] + + ══ Skipped tests (1) ═══════════════════════════════════════════════════════════ + ... + 4. │ │ └─base::withCallingHandlers(...) + 5. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 6. └─testthat::with_mock(...) + 7. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 8. └─lifecycle:::deprecate_stop0(msg) + 9. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 4 | SKIP 1 | PASS 37 ] + Error: Test failures + Execution halted + ``` + +# pocketapi + +<details> + +* Version: 0.1 +* GitHub: https://github.com/CorrelAid/pocketapi +* Source code: https://github.com/cran/pocketapi +* Date/Publication: 2020-11-20 10:20:02 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "pocketapi")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(pocketapi) + > + > test_check("pocketapi") + [ FAIL 13 | WARN 0 | SKIP 0 | PASS 45 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test_pocket_unfavorite.R:22:5 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 13 | WARN 0 | SKIP 0 | PASS 45 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘dplyr’ + All declared Imports should be used. + ``` + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# projmgr + +<details> + +* Version: 0.1.1 +* GitHub: https://github.com/emilyriederer/projmgr +* Source code: https://github.com/cran/projmgr +* Date/Publication: 2024-01-24 05:10:02 UTC +* Number of recursive dependencies: 82 + +Run `revdepcheck::cloud_details(, "projmgr")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(projmgr) + > + > test_check("projmgr") + [ FAIL 4 | WARN 1 | SKIP 3 | PASS 106 ] + + ══ Skipped tests (3) ═══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 4 | WARN 1 | SKIP 3 | PASS 106 ] + Error: Test failures + Execution halted + ``` + +# PubChemR + +<details> + +* Version: 2.1.4 +* GitHub: https://github.com/selcukorkmaz/PubChemR +* Source code: https://github.com/cran/PubChemR +* Date/Publication: 2025-03-07 13:10:02 UTC +* Number of recursive dependencies: 66 + +Run `revdepcheck::cloud_details(, "PubChemR")` for more info + +</details> + +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘PubChemR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: get_all_sources + > ### Title: Retrieve All Sources from PubChem + > ### Aliases: get_all_sources + > + > ### ** Examples + > + > get_all_sources( + + domain = 'substance' + + ) + Error in value[[3L]](cond) : + Failed to retrieve sources for the specified domain: c(Code = "PUGREST.ServerBusy", Message = "Too many requests or server too busy") + Calls: get_all_sources ... tryCatch -> tryCatchList -> tryCatchOne -> <Anonymous> + Execution halted + ``` + +## In both + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + 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/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-get_sids.R:20:5'): pulling sids via 'cid' is succesfull ────── + allSuccess(object) is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 169 ] + Error: Test failures + Execution halted + ``` + +* checking installed package size ... NOTE + ``` + installed size is 5.0Mb + sub-directories of 1Mb or more: + doc 4.7Mb + ``` + +# Quandl + +<details> + +* Version: 2.11.0 +* GitHub: https://github.com/quandl/quandl-r +* Source code: https://github.com/cran/Quandl +* Date/Publication: 2021-08-11 16:00:02 UTC +* Number of recursive dependencies: 48 + +Run `revdepcheck::cloud_details(, "Quandl")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > test_check("Quandl") + Loading required package: Quandl + Loading required package: xts + Loading required package: zoo + + Attaching package: 'zoo' + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-search.r:4:1 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 6 | WARN 0 | SKIP 0 | PASS 4 ] + Error: Test failures + Execution halted + ``` + +# REddyProc + +<details> + +* Version: 1.3.3 +* GitHub: https://github.com/bgctw/REddyProc +* Source code: https://github.com/cran/REddyProc +* Date/Publication: 2024-01-25 15:30:02 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "REddyProc")` for more info + +</details> + +## Newly broken + +* checking installed package size ... NOTE + ``` + installed size is 5.9Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 2.0Mb + libs 1.3Mb + ``` + +# regmedint + +<details> + +* Version: 1.0.1 +* GitHub: https://github.com/kaz-yos/regmedint +* Source code: https://github.com/cran/regmedint +* Date/Publication: 2024-01-13 00:50:02 UTC +* Number of recursive dependencies: 153 + +Run `revdepcheck::cloud_details(, "regmedint")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(regmedint) + > + > test_check("regmedint") + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 4128 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-05_calc_myreg.R:235:9 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 4128 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘Deriv’ + All declared Imports should be used. + ``` + +# Rexperigen + +<details> + +* Version: 0.2.1 +* GitHub: https://github.com/aquincum/Rexperigen +* Source code: https://github.com/cran/Rexperigen +* Date/Publication: 2016-08-26 02:48:12 +* Number of recursive dependencies: 26 + +Run `revdepcheck::cloud_details(, "Rexperigen")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(Rexperigen) + > + > test_check("Rexperigen") + [ FAIL 17 | WARN 0 | SKIP 0 | PASS 23 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + y[1]: "" + ── Failure ('test-zzz.R:8:3'): initialization is okay ────────────────────────── + getOption("Rexperigen.password") not equal to "". + 1/1 mismatches + x[1]: "korte" + y[1]: "" + + [ FAIL 17 | WARN 0 | SKIP 0 | PASS 23 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# rosetteApi + +<details> + +* Version: 1.14.4 +* GitHub: NA +* Source code: https://github.com/cran/rosetteApi +* Date/Publication: 2020-06-17 23:00:02 UTC +* Number of recursive dependencies: 46 + +Run `revdepcheck::cloud_details(, "rosetteApi")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(rosetteApi) + > + > test_check("rosetteApi") + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 13 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test_api.R:14:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 13 ] + Error: Test failures + Execution halted + ``` + +# Rpolyhedra + +<details> + +* Version: 0.5.6 +* GitHub: https://github.com/ropensci/Rpolyhedra +* Source code: https://github.com/cran/Rpolyhedra +* Date/Publication: 2024-11-06 15:10:02 UTC +* Number of recursive dependencies: 98 + +Run `revdepcheck::cloud_details(, "Rpolyhedra")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(Rpolyhedra) + > library(stringr) + > library(lgr) + > library(rgl) + > library(geometry) + > library(testthat) + > + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test_package_lib.R:22:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 646 ] + Error: Test failures + Execution halted + ``` + +# RPresto + +<details> + +* Version: 1.4.7 +* GitHub: https://github.com/prestodb/RPresto +* Source code: https://github.com/cran/RPresto +* Date/Publication: 2025-01-08 05:40:17 UTC +* Number of recursive dependencies: 69 + +Run `revdepcheck::cloud_details(, "RPresto")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # Copyright (c) Meta Platforms, Inc. and affiliates. + > # All rights reserved. + > # + > # This source code is licensed under the BSD-style license found in the + > # LICENSE file in the root directory of this source tree. + > + > library("testthat") + ... + ▆ + 1. └─RPresto:::setup_mock_connection() at test-fetch.R:26:3 + 2. └─testthat::with_mock(...) at tests/testthat/helper-mock_connection.R:8:3 + 3. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 4. └─lifecycle:::deprecate_stop0(msg) + 5. └─rlang::cnd_signal(...) + + [ FAIL 30 | WARN 0 | SKIP 83 | PASS 36 ] + Error: Test failures + Execution halted + ``` + +# RTD + +<details> + +* Version: 0.4.1 +* GitHub: https://github.com/treasure-data/RTD +* Source code: https://github.com/cran/RTD +* Date/Publication: 2020-07-26 23:10:22 UTC +* Number of recursive dependencies: 114 + +Run `revdepcheck::cloud_details(, "RTD")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(mockery) + > library(RTD) + > + > test_check("RTD") + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 10 ] + ... - `expected` is a logical vector (TRUE) - ── Failure ('test-parquet.R:458:3'): deprecated int96 timestamp unit can be specified when reading Parquet files ── - result$some_datetime == table$some_datetime is not TRUE + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-td.R:32:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 10 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# Ryacas0 + +<details> + +* Version: 0.4.4 +* GitHub: https://github.com/r-cas/ryacas0 +* Source code: https://github.com/cran/Ryacas0 +* Date/Publication: 2023-01-12 09:50:05 UTC +* Number of recursive dependencies: 99 + +Run `revdepcheck::cloud_details(, "Ryacas0")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘test-all.R’ + Running the tests in ‘tests/test-all.R’ failed. + Complete output: + > library(testthat) + > test_check('Ryacas0') + Loading required package: Ryacas0 + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 44 ] - `actual` is an R6 object of class <ChunkedArray/ArrowDatum/ArrowObject> - `expected` is a logical vector (TRUE) + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Error ('test-simple.R:38:3'): Yacas mode ──────────────────────────────────── + ... + 4. ├─utils::capture.output(...) + 5. │ └─base::withVisible(...elt(i)) + 6. └─testthat::with_mock(...) + 7. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 8. └─lifecycle:::deprecate_stop0(msg) + 9. └─rlang::cnd_signal(...) - [ FAIL 5 | WARN 0 | SKIP 84 | PASS 6663 ] + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 44 ] Error: Test failures Execution halted ``` ## In both +* checking C++ specification ... NOTE + ``` + Specified C++11: please drop specification unless essential + ``` + * checking installed package size ... NOTE ``` - installed size is 124.1Mb + installed size is 12.9Mb sub-directories of 1Mb or more: - R 7.5Mb - libs 115.9Mb + libs 11.0Mb + yacas 1.4Mb + ``` + +# shiny.benchmark + +<details> + +* Version: 0.1.1 +* GitHub: https://github.com/Appsilon/shiny.benchmark +* Source code: https://github.com/cran/shiny.benchmark +* Date/Publication: 2023-01-20 09:50:02 UTC +* Number of recursive dependencies: 104 + +Run `revdepcheck::cloud_details(, "shiny.benchmark")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(shiny.benchmark) + > + > test_check("shiny.benchmark") + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 7 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + 1. └─base::eval(...) + 2. └─base::eval(...) + 3. └─testthat::local_mock(menu = function(...) 2) at test-load_example.R:74:5 + 4. └─lifecycle::deprecate_stop("3.2.0", "local_mock()", "local_mocked_bindings()") + 5. └─lifecycle:::deprecate_stop0(msg) + 6. └─rlang::cnd_signal(...) + + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 7 ] + Error: Test failures + Execution halted + ``` + +# shinyShortcut + +<details> + +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/shinyShortcut +* Date/Publication: 2017-03-19 18:13:08 UTC +* Number of recursive dependencies: 34 + +Run `revdepcheck::cloud_details(, "shinyShortcut")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(shinyShortcut) + > + > test_check("shinyShortcut") + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 0 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-shinyShortcut.R:5:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# skimr + +<details> + +* Version: 2.1.5 +* GitHub: https://github.com/ropensci/skimr +* Source code: https://github.com/cran/skimr +* Date/Publication: 2022-12-23 11:10:02 UTC +* Number of recursive dependencies: 81 + +Run `revdepcheck::cloud_details(, "skimr")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(skimr) + + Attaching package: 'skimr' + + The following object is masked from 'package:testthat': + + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-skim_with.R:138:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 25 | PASS 630 ] + Error: Test failures + Execution halted + ``` + +# spaero + +<details> + +* Version: 0.6.0 +* GitHub: https://github.com/e3bo/spaero +* Source code: https://github.com/cran/spaero +* Date/Publication: 2020-09-26 23:50:03 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "spaero")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(spaero) + > + > test_check("spaero") + [ FAIL 1 | WARN 4 | SKIP 7 | PASS 47 ] + + ══ Skipped tests (7) ═══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-simulator.R:6:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 4 | SKIP 7 | PASS 47 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘earlywarnings’ + ``` + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘utils’ + All declared Imports should be used. ``` * checking Rd cross-references ... NOTE ``` - Package unavailable to check Rd xrefs: ‘readr’ + Unknown package ‘earlywarnings’ in Rd xrefs ``` -# epiCo +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# starwarsdb <details> -* Version: 1.0.0 -* GitHub: https://github.com/epiverse-trace/epiCo -* Source code: https://github.com/cran/epiCo -* Date/Publication: 2024-06-28 09:40:05 UTC -* Number of recursive dependencies: 128 +* Version: 0.1.2 +* GitHub: https://github.com/gadenbuie/starwarsdb +* Source code: https://github.com/cran/starwarsdb +* Date/Publication: 2020-11-02 23:50:02 UTC +* Number of recursive dependencies: 49 -Run `revdepcheck::cloud_details(, "epiCo")` for more info +Run `revdepcheck::cloud_details(, "starwarsdb")` for more info </details> @@ -75,88 +2201,172 @@ Run `revdepcheck::cloud_details(, "epiCo")` for more info Running ‘testthat.R’ 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(starwarsdb) + > + > test_check("starwarsdb") + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 31 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ ... + Backtrace: ▆ - 1. └─testthat::expect_message(...) at test-spatiotemporal.R:78:3 - 2. └─testthat:::expect_condition_matching(...) - 3. └─testthat:::cnd_matcher(...) - 4. └─cli::cli_abort(...) - 5. └─rlang::abort(...) + 1. └─testthat::with_mock(...) at test-dm.R:56:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) - [ FAIL 1 | WARN 8 | SKIP 0 | PASS 114 ] + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 31 ] Error: Test failures Execution halted ``` ## In both -* checking installed package size ... NOTE +* checking data for non-ASCII characters ... NOTE ``` - installed size is 6.2Mb - sub-directories of 1Mb or more: - data 2.0Mb - extdata 2.9Mb + Note: found 14 marked UTF-8 strings ``` -# ieegio +# tangles <details> -* Version: 0.0.2 -* GitHub: https://github.com/dipterix/ieegio -* Source code: https://github.com/cran/ieegio -* Date/Publication: 2024-10-31 23:20:02 UTC -* Number of recursive dependencies: 88 +* Version: 2.0.1 +* GitHub: NA +* Source code: https://github.com/cran/tangles +* Date/Publication: 2025-06-02 07:50:02 UTC +* Number of recursive dependencies: 54 -Run `revdepcheck::cloud_details(, "ieegio")` for more info +Run `revdepcheck::cloud_details(, "tangles")` for more info </details> ## Newly broken -* checking examples ... ERROR +* checking re-building of vignette outputs ... ERROR ``` - Running examples in ‘ieegio-Ex.R’ failed - The error most likely occurred in: + Error(s) in re-building vignettes: + --- re-building ‘deidentification.Rmd’ using rmarkdown + + Quitting from deidentification.Rmd:124-156 [tangling-together] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + <error/rlang_error> + Error: + ! [cannot make matrix with 1396964956570098 rows] + --- + Backtrace: + ... + + Error: processing vignette 'deidentification.Rmd' failed with diagnostics: + [cannot make matrix with 1396964956570098 rows] + --- failed re-building ‘deidentification.Rmd’ - > ### Name: imaging-volume - > ### Title: Read and write volume data - > ### Aliases: imaging-volume read_volume write_volume io_read_mgz - > ### io_write_mgz io_write_mgz.ieegio_volume io_write_mgz.ieegio_mgh - > ### io_write_mgz.nifti io_write_mgz.niftiImage - > ### io_write_mgz.ants.core.ants_image.ANTsImage io_write_mgz.array - > ### io_read_nii io_write_nii io_write_nii.ieegio_nifti - ... - + # clean up - + unlink(f) - + unlink(f2) - + - + } - <simpleWarning in check_forbidden_install("Miniconda"): cannot install Miniconda during R CMD check> - Warning in check_forbidden_install("Conda Environments") : - cannot install Conda Environments during R CMD check - Error: Unable to find conda binary. Is Anaconda installed? + SUMMARY: processing the following file failed: + ‘deidentification.Rmd’ + + Error: Vignette re-building failed. Execution halted ``` -# madrat +# texreg <details> -* Version: 3.6.4 -* GitHub: https://github.com/pik-piam/madrat -* Source code: https://github.com/cran/madrat -* Date/Publication: 2023-08-23 14:30:08 UTC -* Number of recursive dependencies: 79 +* Version: 1.39.4 +* GitHub: https://github.com/leifeld/texreg +* Source code: https://github.com/cran/texreg +* Date/Publication: 2024-07-24 12:20:01 UTC +* Number of recursive dependencies: 109 + +Run `revdepcheck::cloud_details(, "texreg")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library("testthat") + > library("texreg") + Version: 1.39.4 + Date: 2024-07-23 + Author: Philip Leifeld (University of Manchester) + + Consider submitting praise using the praise or praise_interactive functions. + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-texreg.R:319:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 1 | SKIP 33 | PASS 201 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘texreg.Rnw’ using Sweave + Error: processing vignette 'texreg.Rnw' failed with diagnostics: + Running 'texi2dvi' on 'texreg.tex' failed. + LaTeX errors: + ! LaTeX Error: File `thumbpdf.sty' not found. + + Type X to quit or <RETURN> to proceed, + or enter new name. (Default extension: sty) + ... + l.8 ^^M + + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘texreg.Rnw’ + + SUMMARY: processing the following file failed: + ‘texreg.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +* checking package dependencies ... NOTE + ``` + Packages which this enhances but not available for checking: + 'AER', 'alpaca', 'betareg', 'Bergm', 'bife', 'biglm', 'brglm', + 'brms', 'btergm', 'dynlm', 'eha', 'ergm', 'feisr', 'fGarch', + 'fixest', 'forecast', 'gamlss', 'gamlss.inf', 'gee', 'glmmTMB', + 'gmm', 'gnm', 'h2o', 'latentnet', 'lfe', 'logitr', 'lqmm', 'maxLik', + 'metaSEM', 'mfx', 'mhurdle', 'miceadds', 'mlogit', 'MuMIn', 'oglmx', + 'ordinal', 'pglm', 'plm', 'relevent', 'remify', 'remstats', + 'remstimate', 'rms', 'robust', 'simex', 'spatialreg', 'spdep', + 'speedglm', 'truncreg', 'VGAM' + ``` + +* checking Rd cross-references ... NOTE + ``` + Packages unavailable to check Rd xrefs: ‘h2o’, ‘spatialreg’, ‘eha’, ‘MuMIn’, ‘Bergm’, ‘mfx’, ‘betareg’, ‘bife’, ‘biglm’, ‘brglm’, ‘brms’, ‘btergm’, ‘ordinal’, ‘dynlm’, ‘ergm’, ‘latentnet’, ‘forecast’, ‘fGarch’, ‘alpaca’, ‘feisr’, ‘lfe’, ‘fixest’, ‘gamlss’, ‘gamlss.inf’, ‘gee’, ‘gmm’, ‘miceadds’, ‘glmmTMB’, ‘gnm’, ‘AER’, ‘robust’, ‘lqmm’, ‘rms’, ‘maxLik’, ‘mhurdle’, ‘mlogit’, ‘plm’, ‘pglm’, ‘relevent’, ‘remstimate’, ‘simex’, ‘speedglm’, ‘truncreg’, ‘VGAM’, ‘metaSEM’ + Unknown package ‘oglmx’ in Rd xrefs + ``` -Run `revdepcheck::cloud_details(, "madrat")` for more info +# ThankYouStars + +<details> + +* Version: 0.2.0 +* GitHub: https://github.com/ksmzn/ThankYouStars +* Source code: https://github.com/cran/ThankYouStars +* Date/Publication: 2017-11-12 04:21:17 UTC +* Number of recursive dependencies: 30 + +Run `revdepcheck::cloud_details(, "ThankYouStars")` for more info </details> @@ -168,36 +2378,84 @@ Run `revdepcheck::cloud_details(, "madrat")` for more info Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > library(madrat) - Loading required package: magclass + > library(ThankYouStars) > - > test_check("madrat") - [ FAIL 3 | WARN 2 | SKIP 8 | PASS 581 ] + > test_check("ThankYouStars") + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 0 ] + ══ Failed tests ════════════════════════════════════════════════════════════════ ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-starring.R:3:1 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) - `dim(actual)` is an integer vector (1, 1, 1) - `dim(expected)` is absent + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# tinyProject + +<details> + +* Version: 0.6.1 +* GitHub: NA +* Source code: https://github.com/cran/tinyProject +* Date/Publication: 2019-06-14 11:40:03 UTC +* Number of recursive dependencies: 39 + +Run `revdepcheck::cloud_details(, "tinyProject")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(tinyProject) + > + > test_check("tinyProject") + [ FAIL 1 | WARN 5 | SKIP 0 | PASS 73 ] - `dimnames(actual)` is a list - `dimnames(expected)` is absent + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-commandArgs.R:3:1 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) - [ FAIL 3 | WARN 2 | SKIP 8 | PASS 581 ] + [ FAIL 1 | WARN 5 | SKIP 0 | PASS 73 ] Error: Test failures Execution halted ``` -# vines +# tryCatchLog <details> -* Version: 1.1.5 -* GitHub: https://github.com/yasserglez/vines -* Source code: https://github.com/cran/vines -* Date/Publication: 2016-07-28 11:49:43 -* Number of recursive dependencies: 41 +* Version: 1.3.1 +* GitHub: https://github.com/aryoda/tryCatchLog +* Source code: https://github.com/cran/tryCatchLog +* Date/Publication: 2021-10-25 07:10:07 UTC +* Number of recursive dependencies: 53 -Run `revdepcheck::cloud_details(, "vines")` for more info +Run `revdepcheck::cloud_details(, "tryCatchLog")` for more info </details> @@ -208,37 +2466,46 @@ Run `revdepcheck::cloud_details(, "vines")` for more info Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: - > library("testthat") - > library("vines") - Loading required package: copula + > library(testthat) + > library(tryCatchLog) + Using futile.logger for logging... + > > - > test_check("vines", reporter = "summary") - h: - h: 1 + > + > # Set to something like [1] "en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/de_DE.UTF-8" ... - ── 2. Error ('test-hinverse.R:3:1'): (code run outside of `test_that()`) ─────── - Error in `testthat:::test_code(new_desc, substitute(code), env = env)`: argument "reporter" is missing, with no default Backtrace: ▆ - 1. └─vines:::test_that_for_each_copula(...) at test-hinverse.R:3:1 - 2. └─testthat:::test_code(new_desc, substitute(code), env = env) at tests/testthat/helper-copulas.R:37:13 + 1. └─testthat::with_mock(...) at test_platform_functions.R:37:3 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) - ══ DONE ════════════════════════════════════════════════════════════════════════ + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 436 ] Error: Test failures Execution halted ``` -# xpose +## In both + +* checking dependencies in R code ... NOTE + ``` + There are ::: calls to the package's namespace in its code. A package + almost never needs to use ::: for its own objects: + ‘log2console’ + ``` + +# WhatIf <details> -* Version: 0.4.18 -* GitHub: https://github.com/UUPharmacometrics/xpose -* Source code: https://github.com/cran/xpose -* Date/Publication: 2024-02-01 16:20:02 UTC -* Number of recursive dependencies: 108 +* Version: 1.5-10 +* GitHub: https://github.com/IQSS/WhatIf +* Source code: https://github.com/cran/WhatIf +* Date/Publication: 2020-11-14 14:20:06 UTC +* Number of recursive dependencies: 26 -Run `revdepcheck::cloud_details(, "xpose")` for more info +Run `revdepcheck::cloud_details(, "WhatIf")` for more info </details> @@ -250,21 +2517,62 @@ Run `revdepcheck::cloud_details(, "xpose")` for more info Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > library(xpose) - Loading required package: ggplot2 + > library(WhatIf) + > + > test_check("WhatIf") + + | + | | 0% + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-whatif_convexhull.R:16:5 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) - Attaching package: 'xpose' + [ FAIL 1 | WARN 0 | SKIP 4 | PASS 2 ] + Error: Test failures + Execution halted + ``` + +# ZillowR + +<details> + +* Version: 1.0.0 +* GitHub: NA +* Source code: https://github.com/cran/ZillowR +* Date/Publication: 2022-05-05 02:10:02 UTC +* Number of recursive dependencies: 64 + +Run `revdepcheck::cloud_details(, "ZillowR")` for more info + +</details> + +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ZillowR) + > + > test_check("ZillowR") + [ FAIL 9 | WARN 0 | SKIP 0 | PASS 125 ] - The following object is masked from 'package:stats': ... - 8. │ └─base::do.call(...) at tests/testthat/helper-test_that_for_all.R:20:7 - 9. ├─testthat (local) `<fn>`(...) - 10. └─base::.handleSimpleError(...) - 11. └─purrr (local) h(simpleError(msg, call)) - 12. └─cli::cli_abort(...) - 13. └─rlang::abort(...) + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-GetZestimate.R:7:5 + 2. └─lifecycle::deprecate_stop("3.2.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) - [ FAIL 1 | WARN 0 | SKIP 8 | PASS 377 ] + [ FAIL 9 | WARN 0 | SKIP 0 | PASS 125 ] Error: Test failures Execution halted ``` diff --git a/src/init.c b/src/init.c index 5b91a2b5f..83fbba899 100644 --- a/src/init.c +++ b/src/init.c @@ -4,13 +4,9 @@ #include <R_ext/Rdynload.h> /* .Call calls */ -extern SEXP duplicate_(SEXP); -extern SEXP reassign_function(SEXP, SEXP, SEXP, SEXP); extern SEXP run_testthat_tests(SEXP); static const R_CallMethodDef CallEntries[] = { - {"duplicate_", (DL_FUNC) &duplicate_, 1}, - {"reassign_function", (DL_FUNC) &reassign_function, 4}, {"run_testthat_tests", (DL_FUNC) &run_testthat_tests, 1}, {NULL, NULL, 0} }; diff --git a/src/reassign.c b/src/reassign.c deleted file mode 100644 index f2fdf3456..000000000 --- a/src/reassign.c +++ /dev/null @@ -1,24 +0,0 @@ -#define USE_RINTERNALS -#include <R.h> -#include <Rdefines.h> -#include <R_ext/Error.h> - - -SEXP reassign_function(SEXP name, SEXP env, SEXP old_fun, SEXP new_fun) -{ - if (TYPEOF(name) != SYMSXP) error("name must be a symbol"); - if (TYPEOF(env) != ENVSXP) error("env must be an environment"); - if (TYPEOF(old_fun) != CLOSXP) error("old_fun must be a function"); - if (TYPEOF(new_fun) != CLOSXP) error("new_fun must be a function"); - - SET_FORMALS(old_fun, FORMALS(new_fun)); - SET_BODY(old_fun, BODY(new_fun)); - SET_CLOENV(old_fun, CLOENV(new_fun)); - DUPLICATE_ATTRIB(old_fun, new_fun); - - return R_NilValue; -} - -SEXP duplicate_(SEXP x) { - return duplicate(x); -} diff --git a/tests/testthat/_snaps/mock.md b/tests/testthat/_snaps/mock.md index 05f6e79af..d3612e4b0 100644 --- a/tests/testthat/_snaps/mock.md +++ b/tests/testthat/_snaps/mock.md @@ -1,18 +1,15 @@ -# deprecated +# now defunct Code local_mock() Condition - Warning: - `local_mock()` was deprecated in testthat 3.3.0. + Error: + ! `local_mock()` was deprecated in testthat 3.2.0 and is now defunct. i Please use `local_mocked_bindings()` instead. - ---- - Code with_mock(is_testing = function() FALSE) Condition - Warning: - `with_mock()` was deprecated in testthat 3.3.0. + Error: + ! `with_mock()` was deprecated in testthat 3.2.0 and is now defunct. i Please use `with_mocked_bindings()` instead. diff --git a/tests/testthat/test-examples.R b/tests/testthat/test-examples.R index b584857c5..0fca910bb 100644 --- a/tests/testthat/test-examples.R +++ b/tests/testthat/test-examples.R @@ -1,6 +1,4 @@ test_that("test_examples works with installed packages", { - local_edition(2) - local_mocked_bindings(test_rd = identity) expect_true(length(test_examples()) > 1) }) diff --git a/tests/testthat/test-mock.R b/tests/testthat/test-mock.R index dda947021..9035ea47c 100644 --- a/tests/testthat/test-mock.R +++ b/tests/testthat/test-mock.R @@ -1,4 +1,6 @@ -test_that("deprecated", { - expect_snapshot(local_mock()) - expect_snapshot(with_mock(is_testing = function() FALSE)) +test_that("now defunct", { + expect_snapshot(error = TRUE, { + local_mock() + with_mock(is_testing = function() FALSE) + }) })