From 1750b4adf9b4ecb09d20261893036a7a22811755 Mon Sep 17 00:00:00 2001 From: Hadley Wickham Date: Tue, 29 Oct 2024 16:25:50 -0500 Subject: [PATCH] Deprecate `with_mock()` and `local_mock()` Fixes #1999 Deprecate old mocking functions Fix news More news fixes Merge merge problem Check revdeps --- NEWS.md | 57 + R/mock.R | 118 +- revdep/README.md | 269 +- revdep/cran.md | 389 +- revdep/failures.md | 11465 ++++++++++++++++++++++++++++++- revdep/problems.md | 3765 +++++++++- src/init.c | 4 - src/reassign.c | 24 - tests/testthat/_snaps/mock.md | 13 +- tests/testthat/test-examples.R | 2 - tests/testthat/test-mock.R | 8 +- 11 files changed, 15814 insertions(+), 300 deletions(-) delete mode 100644 src/reassign.c diff --git a/NEWS.md b/NEWS.md index 5c6efc566..f21b2e811 100644 --- a/NEWS.md +++ b/NEWS.md @@ -4,6 +4,7 @@ * Fixed an issue where calling `skip()` outside of an active test could cause an unexpected error (@kevinushey, #2039). +* `local_mock()` and `with_mock()` have been deprecated because they are no longer permitted in R 4.5. # testthat 3.2.2 @@ -49,6 +50,62 @@ * `with_mock()` and `local_mock()` have been unconditionally deprecated as they will no longer work in future versions of R (#1999). +* `with_mock()` and `local_mock()` have been unconditionally deprecated as they will no longer work in future versions of R (#1999). +* `expect_condition()` and friends now include the `class` of the expected condition in the failure mesage, if used (#1987). +* `LANGUAGE` is now set to `"C"` in reprocucible environments (i.e. + `test_that()` blocks) to disable translations. This fixes warnings + about being unable to set the language to `"en"` (#1925). +* Fixed an issue where `expect_no_error(1)` was failing (#2037). + +* Fixed an issue where calling `skip()` outside of an active test could + cause an unexpected error (@kevinushey, #2039). + +# testthat 3.2.2 + +## New expectations + +* `expect_s7_class()` tests if an object is an S7 class (#1580). + +* `expect_no_failure()`, `expect_no_success()` and `expect_snapshot_failure()` + provide more options for testing expectations. + +## Bug fixes and minor improvements + +* testthat now requires waldo 0.6.0 or later to access the latest features + (#1955). + +* `expect_condition()` and related functions now include the `class` of the + expected condition in the failure message, if provided (#1987). + +* `expect_error()` and friends now error if you supply `...` but not `pattern` + (#1932). They no longer give an uninformative error if they fail inside + a magrittr pipe (#1994). + +* `expect_no_*()` expectations no longer incorrectly emit a passing test result + if they in fact fail (#1997). + +* `expect_setequal()` correctly identifies what is missing where (#1962). + +* `expect_snapshot()` now strips line breaks in test descriptions + (@LDSamson, #1900), and errors when called from a `test_that()` that has an + empty description (@kevinushey, #1980). + +* `expect_true()` and `expect_false()` give better errors if `actual` isn't a + vector (#1996). + +* `expect_visible()` and `expect_invisible()` have clearer failure messages + (#1966). +* `local_reproducible_output()` (used in `test_that()` blocks) now sets + `LANGUAGE` to `"C"` instead of `"en"` to disable translations, + avoiding warnings on some platforms (#1925). + +* `skip_if_not_installed()` generates a clearer message that sorts better + (@MichaelChirico, #1959). + +* `with_mock()` and `local_mock()` have been unconditionally deprecated as + they will no longer work in future versions of R (#1999). + +* `local_mock()` and `with_mock()` have been deprecated because they are no longer permitted in R 4.5. # testthat 3.2.1 diff --git a/R/mock.R b/R/mock.R index c81ba7a2d..88920169c 100644 --- a/R/mock.R +++ b/R/mock.R @@ -1,15 +1,18 @@ #' Mock functions in a package. #' #' @description -#' `r lifecycle::badge("deprecated")` -#' #' `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 +#' function _in place_. This was an abuse of R's internals and it is no longer #' permitted. #' +#' @section 3rd edition: +#' `r lifecycle::badge("deprecated")` +#' +#' `with_mock()` and `local_mock()` are deprecated in the third edition. +#' #' @param ... named parameters redefine mocked functions, unnamed parameters #' will be evaluated after mocking the functions #' @param .env the environment in which to patch the functions, @@ -21,116 +24,11 @@ #' @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.3.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.3.0", "local_mock()", "local_mocked_bindings()") } diff --git a/revdep/README.md b/revdep/README.md index 676ce3701..c5f05fb45 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -1,13 +1,262 @@ # 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 (173) + +|package |version |error |warning |note | +|:-------------------|:----------|:-----|:-------|:----| +|adjustedCurves |? | | | | +|ai |? | | | | +|apollo |0.3.4 |1 | | | +|arealDB |0.6.3 |1 | | | +|assessor |1.1.0 |1 | | | +|atom4R |0.3-3 |1 | | | +|BANAM |0.2.2 |1 | | | +|bayesCT |0.99.3 |1 | | | +|bayesDP |1.3.6 |1 | | | +|BayesFactor |0.9.12-4.7 |1 | | | +|bbknnR |1.1.1 |1 | | | +|BCClong |1.0.3 |1 | | | +|BFpack |1.4.0 |1 | | | +|BGGM |2.1.5 |1 | | | +|bnnSurvival |? | | | | +|BSTZINB |1.0.1 |1 | | | +|BuyseTest |? | | | | +|CACIMAR |1.0.0 |1 | | | +|censored |? | | | | +|Certara.VPCResults |3.0.2 |1 | | | +|CGPfunctions |0.6.3 |1 | | | +|chipPCR |1.0-2 |1 | | | +|cia |? | | | | +|clustermq |? | | | | +|cmmr |? | | | | +|COMBO |1.2.0 |1 | | | +|contsurvplot |? | | | | +|counterfactuals |? | | | | +|CRMetrics |0.3.2 |1 | | | +|ctsem |3.10.1 |1 | | | +|dartR.base |? | | | | +|dataone |2.2.2 |1 | | | +|datapack |1.4.1 |1 | | | +|deeptrafo |? | | | | +|DepthProc |2.1.5 |1 | | | +|dibble |? | | | | +|drtmle |1.1.2 |1 | | | +|dscoreMSM |? | | | | +|DWLS |0.1.0 |1 | | | +|easybgm |0.2.1 |1 | | | +|EcoEnsemble |1.1.0 |1 | | | +|ecolottery |1.0.0 |1 | | | +|EdSurvey |4.0.7 |1 | | | +|emplik |1.3-2 |1 | | | +|EpiEstim |2.2-4 |1 | | | +|epizootic |1.0.0 |1 | | | +|erah |2.0.1 |1 | | | +|evolqg |0.3-4 |1 | | | +|EWSmethods |? | | | | +|ezECM |1.0.0 |1 | | | +|FAIRmaterials |0.4.2.1 |1 | | | +|FastJM |? | | | | +|fdaPDE |1.1-21 |1 | | | +|ForecastComb |1.3.1 |1 | | | +|FoReco |1.0.0 |1 | | | +|frechet |0.3.0 |1 | | | +|FREEtree |0.1.0 |1 | | | +|gapfill |0.9.6-1 |1 | |1 | +|genekitr |? | | | | +|GeneSelectR |? | | | | +|GeomComb |1.0 |1 | | | +|geomorph |? | | | | +|GeoTox |? | | | | +|gllvm |2.0 |1 | | | +|gmoTree |? | | | | +|gpuR |2.0.6 |1 | | | +|hettx |0.1.3 |1 | | | +|Hmsc |3.0-13 |1 | | | +|IDLFM |? | | | | +|invivoPKfit |2.0.0 |1 | | | +|iNZightPlots |2.15.3 |1 | | | +|iNZightRegression |1.3.4 |1 | | | +|IVCor |0.1.0 |1 | | | +|JMH |? | | | | +|joineRML |0.4.6 |1 | | | +|jsmodule |? | | | | +|kmc |0.4-2 |1 | | | +|KMunicate |? | | | | +|Landmarking |? | | | | +|lavaSearch2 |? | | | | +|lnmixsurv |? | | | | +|locpolExpectile |0.1.1 |1 | | | +|loon.shiny |? | | | | +|loon.tourr |? | | | | +|lsirm12pl |1.3.3 |1 | | | +|marlod |0.1.2 |1 | | | +|mbsts |3.0 |1 | | | +|metajam |0.3.1 |1 | | | +|mHMMbayes |1.1.0 |1 | | | +|midasr |0.8 |1 | | | +|miWQS |0.4.4 |1 | | | +|mixAR |0.22.8 |1 | | | +|mlmts |1.1.2 |1 | | | +|mlr |? | | | | +|modeLLtest |1.0.4 |1 | | | +|multilevelmediation |0.4.1 |1 | | | +|multilevelTools |0.1.1 |1 | | | +|multinma |0.7.2 |1 | | | +|multvardiv |? | | | | +|NCA |4.0.2 |1 | | | +|netcmc |1.0.2 |1 | | | +|newIMVC |0.1.0 |1 | | | +|nlpred |1.0.1 |1 | | | +|NMADiagT |0.1.2 |1 | | | +|nse |1.21 |1 | | | +|OasisR |? | | | | +|OlinkAnalyze |? | | | | +|paleopop |2.1.7 |1 | | | +|pammtools |? | | | | +|PathwaySpace |? | | | | +|pathwayTMB |? | | | | +|pcvr |1.1.1.0 |1 | | | +|poems |1.3.1 |1 | | | +|popEpi |? | | | | +|popstudy |1.0.1 |1 | | | +|powerly |1.8.6 |1 | | | +|pre |1.0.7 |1 | | | +|pscore |0.4.0 |1 | | | +|Publish |? | | | | +|qris |1.1.1 |1 | | | +|QTOCen |0.1.1 |1 | | | +|quantspec |1.2-4 |1 | | | +|quid |0.0.1 |1 | | | +|rddtools |1.6.0 |1 | | | +|rdflib |0.2.9 |1 | | | +|redland |1.0.17-18 |1 | | | +|RGraphSpace |? | | | | +|riskRegression |? | | | | +|rlme |0.5 |1 | | | +|rmlnomogram |? | | | | +|robber |? | | | | +|robmed |1.2.0 |1 | | | +|RQdeltaCT |1.3.0 |1 | | | +|RRPP |? | | | | +|rstanarm |2.32.1 |1 | | | +|scAnnotate |0.3 |1 | | | +|SCIntRuler |0.99.6 |1 | | | +|scMappR |1.0.11 |1 | | | +|scperturbR |0.1.0 |1 | | | +|scpi |2.2.6 |1 | | | +|SCpubr |? | | | | +|SCRIP |1.0.0 |1 | | | +|SensIAT |? | | | | +|SensMap |0.7 |1 | | | +|Seurat |5.1.0 |1 | | | +|shinyTempSignal |0.0.8 |1 | | | +|Signac |1.14.0 |1 | | | +|SimplyAgree |0.2.0 |1 | | | +|SNPassoc |? | | | | +|snplinkage |? | | | | +|ssdGSA |? | | | | +|stabiliser |1.0.6 |1 | | | +|statsr |0.3.0 |1 | | | +|stR |0.7 |1 | | | +|survcompare |? | | | | +|survex |? | | | | +|survHE |? | | | | +|TDA |1.9.1 |1 | | | +|TestAnaAPP |? | | | | +|tidyEdSurvey |0.1.3 |1 | | | +|tidyseurat |0.8.0 |1 | | | +|tidyvpc |1.5.2 |1 | | | +|tinyarray |? | | | | +|tramicp |? | | | | +|tramvs |? | | | | +|treeclim |2.0.7.1 |1 | | | +|TriDimRegression |1.0.2 |1 | | | +|TSrepr |1.1.0 |1 | | | +|vcfppR |0.7.1 |1 | | | +|VecDep |? | | | | +|visa |0.1.0 |1 | | | +|wally |? | | | | +|zen4R |0.10 |1 | | | + +## New problems (77) + +|package |version |error |warning |note | +|:-------------------|:-------|:--------|:-------|:------| +|[aws.comprehend](problems.md#awscomprehend)|0.2.1 |__+1__ | | | +|[bindr](problems.md#bindr)|0.1.2 |__+1__ | | | +|[civis](problems.md#civis)|3.1.2 |1 __+1__ | |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__ | | | +|[crossmap](problems.md#crossmap)|0.4.0 |__+1__ | | | +|[crplyr](problems.md#crplyr)|0.4.0 |__+1__ | | | +|[crunch](problems.md#crunch)|1.30.4 |1 __+1__ | |1 | +|[crunchy](problems.md#crunchy)|0.3.3 |__+1__ | | | +|[cyphr](problems.md#cyphr)|1.1.4 |__+1__ | | | +|[datarobot](problems.md#datarobot)|2.18.6 |__+1__ | | | +|[dendextend](problems.md#dendextend)|1.19.0 |1 __+1__ | |3 | +|[digitize](problems.md#digitize)|0.0.4 |__+1__ | | | +|[distro](problems.md#distro)|0.1.0 |__+1__ | |1 | +|[dRiftDM](problems.md#driftdm)|0.2.1 |__+1__ | | | +|[DSMolgenisArmadillo](problems.md#dsmolgenisarmadillo)|2.0.9 |__+1__ | | | +|[gbfs](problems.md#gbfs)|1.3.9 |__+1__ | | | +|[gen3sis](problems.md#gen3sis)|1.5.11 |1 __+1__ | |1 | +|[graphhopper](problems.md#graphhopper)|0.1.2 |__+1__ | |1 | +|[gwasrapidd](problems.md#gwasrapidd)|0.99.17 |1 __+1__ | | | +|[hereR](problems.md#herer)|1.0.1 |__+1__ | | | +|[humanize](problems.md#humanize)|0.2.0 |__+1__ | |1 | +|[ieegio](problems.md#ieegio)|0.0.2 |__+1__ | | | +|[ipaddress](problems.md#ipaddress)|1.0.2 |__+1__ | |1 | +|[isotracer](problems.md#isotracer)|1.1.7 |__+1__ |1 |3 | +|[JAGStree](problems.md#jagstree)|1.0.1 |__+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__ | |1 | +|[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__ | |__+1__ | +|[moexer](problems.md#moexer)|0.3.0 |__+1__ | | | +|[MolgenisArmadillo](problems.md#molgenisarmadillo)|2.7.0 |__+1__ | | | +|[MolgenisAuth](problems.md#molgenisauth)|0.0.25 |__+1__ | | | +|[NasdaqDataLink](problems.md#nasdaqdatalink)|1.0.0 |__+1__ | | | +|[nhlapi](problems.md#nhlapi)|0.1.4 |1 __+1__ | |1 | +|[odin](problems.md#odin)|1.2.6 |__+1__ | | | +|[opendatatoronto](problems.md#opendatatoronto)|0.1.5 |__+1__ | | | +|[overture](problems.md#overture)|0.4-0 |__+1__ | |1 | +|[owmr](problems.md#owmr)|0.8.2 |__+1__ | | | +|[oxcAAR](problems.md#oxcaar)|1.1.1 |1 __+1__ | |1 | +|[passport](problems.md#passport)|0.3.0 |__+1__ | | | +|[patrick](problems.md#patrick)|0.2.0 |__+1__ | | | +|[plumber](problems.md#plumber)|1.2.2 |__+1__ | | | +|[pocketapi](problems.md#pocketapi)|0.1 |__+1__ | |2 | +|[projmgr](problems.md#projmgr)|0.1.1 |__+1__ | | | +|[Quandl](problems.md#quandl)|2.11.0 |__+1__ | | | +|[regmedint](problems.md#regmedint)|1.0.1 |__+1__ | |1 | +|[rentrez](problems.md#rentrez)|1.2.3 |__+1__ | | | +|[reportr](problems.md#reportr)|1.3.0 |__+1__ | | | +|[restez](problems.md#restez)|2.1.4 |__+1__ | | | +|[Rexperigen](problems.md#rexperigen)|0.2.1 |__+1__ | |1 | +|[rnbp](problems.md#rnbp)|0.2.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 __+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__ | |2 | +|[starwarsdb](problems.md#starwarsdb)|0.1.2 |__+1__ | |1 | +|[taxonomizr](problems.md#taxonomizr)|0.10.7 |__+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 | +|[tuneRanger](problems.md#tuneranger)|0.7 |__+1__ | |1 | +|[uptasticsearch](problems.md#uptasticsearch)|0.4.0 |__+1__ | |1 | +|[WhatIf](problems.md#whatif)|1.5-10 |__+1__ | | | +|[ZillowR](problems.md#zillowr)|1.0.0 |__+1__ | | | +|[zoltr](problems.md#zoltr)|1.0.1 |1 __+1__ | | | diff --git a/revdep/cran.md b/revdep/cran.md index 7ee9f21e1..0a31ba35b 100644 --- a/revdep/cran.md +++ b/revdep/cran.md @@ -1,30 +1,403 @@ ## revdepcheck results -We checked 38 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. +We checked 9017 reverse dependencies (8999 from CRAN + 18 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 77 new problems + * We failed to check 155 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 +* bindr + checking tests ... ERROR + +* civis + checking tests ... ERROR + +* conflr + checking tests ... ERROR + +* countdown + checking tests ... ERROR + +* covr + checking tests ... ERROR + +* crossmap + checking tests ... ERROR + +* crplyr + checking tests ... ERROR + +* crunch + checking tests ... ERROR + +* crunchy + checking tests ... ERROR + +* cyphr + checking tests ... ERROR + +* datarobot + checking tests ... ERROR + +* dendextend + checking tests ... ERROR + +* digitize + checking tests ... ERROR + +* distro + checking tests ... ERROR + +* dRiftDM + checking tests ... ERROR + +* DSMolgenisArmadillo + checking tests ... ERROR + +* gbfs + checking tests ... ERROR + +* gen3sis + checking tests ... ERROR + +* graphhopper + checking tests ... ERROR + +* gwasrapidd + checking tests ... ERROR + +* hereR + checking tests ... ERROR + +* humanize checking tests ... ERROR * ieegio checking examples ... ERROR -* madrat +* ipaddress + checking tests ... ERROR + +* isotracer + checking tests ... ERROR + +* JAGStree + 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 running R code from vignettes ... ERROR + checking re-building of vignette outputs ... NOTE + +* moexer checking tests ... ERROR -* vines +* MolgenisArmadillo checking tests ... ERROR -* xpose +* MolgenisAuth checking tests ... ERROR +* NasdaqDataLink + checking tests ... ERROR + +* nhlapi + checking tests ... ERROR + +* odin + checking tests ... ERROR + +* opendatatoronto + checking tests ... ERROR + +* overture + checking tests ... ERROR + +* owmr + checking tests ... ERROR + +* oxcAAR + checking tests ... ERROR + +* passport + checking tests ... ERROR + +* patrick + checking tests ... ERROR + +* plumber + checking tests ... ERROR + +* pocketapi + checking tests ... ERROR + +* projmgr + checking tests ... ERROR + +* Quandl + checking tests ... ERROR + +* regmedint + checking tests ... ERROR + +* rentrez + checking running R code from vignettes ... ERROR + +* reportr + checking tests ... ERROR + +* restez + checking tests ... ERROR + +* Rexperigen + checking tests ... ERROR + +* rnbp + 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 + +* taxonomizr + checking tests ... ERROR + +* texreg + checking tests ... ERROR + +* ThankYouStars + checking tests ... ERROR + +* tinyProject + checking tests ... ERROR + +* tryCatchLog + checking tests ... ERROR + +* tuneRanger + checking tests ... ERROR + +* uptasticsearch + checking tests ... ERROR + +* WhatIf + checking tests ... ERROR + +* ZillowR + checking tests ... ERROR + +* zoltr + checking tests ... ERROR + +### Failed to check + +* adjustedCurves (NA) +* apollo (NA) +* arealDB (NA) +* assessor (NA) +* atom4R (NA) +* BANAM (NA) +* bayesCT (NA) +* bayesDP (NA) +* BayesFactor (NA) +* bbknnR (NA) +* BCClong (NA) +* BFpack (NA) +* BGGM (NA) +* bnnSurvival (NA) +* BSTZINB (NA) +* BuyseTest (NA) +* CACIMAR (NA) +* censored (NA) +* Certara.VPCResults (NA) +* CGPfunctions (NA) +* chipPCR (NA) +* COMBO (NA) +* contsurvplot (NA) +* counterfactuals (NA) +* CRMetrics (NA) +* ctsem (NA) +* dartR.base (NA) +* dataone (NA) +* datapack (NA) +* deeptrafo (NA) +* DepthProc (NA) +* drtmle (NA) +* dscoreMSM (NA) +* DWLS (NA) +* easybgm (NA) +* EcoEnsemble (NA) +* ecolottery (NA) +* EdSurvey (NA) +* emplik (NA) +* EpiEstim (NA) +* epizootic (NA) +* erah (NA) +* evolqg (NA) +* ezECM (NA) +* FAIRmaterials (NA) +* FastJM (NA) +* fdaPDE (NA) +* ForecastComb (NA) +* FoReco (NA) +* frechet (NA) +* FREEtree (NA) +* gapfill (NA) +* genekitr (NA) +* GeneSelectR (NA) +* GeomComb (NA) +* gllvm (NA) +* gpuR (NA) +* hettx (NA) +* Hmsc (NA) +* invivoPKfit (NA) +* iNZightPlots (NA) +* iNZightRegression (NA) +* IVCor (NA) +* JMH (NA) +* joineRML (NA) +* jsmodule (NA) +* kmc (NA) +* KMunicate (NA) +* Landmarking (NA) +* lavaSearch2 (NA) +* lnmixsurv (NA) +* locpolExpectile (NA) +* loon.shiny (NA) +* loon.tourr (NA) +* lsirm12pl (NA) +* marlod (NA) +* mbsts (NA) +* metajam (NA) +* mHMMbayes (NA) +* midasr (NA) +* miWQS (NA) +* mixAR (NA) +* mlmts (NA) +* mlr (NA) +* modeLLtest (NA) +* multilevelmediation (NA) +* multilevelTools (NA) +* multinma (NA) +* NCA (NA) +* netcmc (NA) +* newIMVC (NA) +* nlpred (NA) +* NMADiagT (NA) +* nse (NA) +* OlinkAnalyze (NA) +* paleopop (NA) +* pammtools (NA) +* pathwayTMB (NA) +* pcvr (NA) +* poems (NA) +* popEpi (NA) +* popstudy (NA) +* powerly (NA) +* pre (NA) +* pscore (NA) +* Publish (NA) +* qris (NA) +* QTOCen (NA) +* quantspec (NA) +* quid (NA) +* rddtools (NA) +* rdflib (NA) +* redland (NA) +* riskRegression (NA) +* rlme (NA) +* robber (NA) +* robmed (NA) +* RQdeltaCT (NA) +* rstanarm (NA) +* scAnnotate (NA) +* SCIntRuler (NA) +* scMappR (NA) +* scperturbR (NA) +* scpi (NA) +* SCpubr (NA) +* SCRIP (NA) +* SensMap (NA) +* Seurat (NA) +* shinyTempSignal (NA) +* Signac (NA) +* SimplyAgree (NA) +* SNPassoc (NA) +* snplinkage (NA) +* ssdGSA (NA) +* stabiliser (NA) +* statsr (NA) +* stR (NA) +* survcompare (NA) +* survex (NA) +* survHE (NA) +* TDA (NA) +* TestAnaAPP (NA) +* tidyEdSurvey (NA) +* tidyseurat (NA) +* tidyvpc (NA) +* tinyarray (NA) +* tramicp (NA) +* tramvs (NA) +* treeclim (NA) +* TriDimRegression (NA) +* TSrepr (NA) +* vcfppR (NA) +* visa (NA) +* wally (NA) +* zen4R (NA) diff --git a/revdep/failures.md b/revdep/failures.md index 9a2073633..05b9511ff 100644 --- a/revdep/failures.md +++ b/revdep/failures.md @@ -1 +1,11464 @@ -*Wow, no problems at all. :)* \ No newline at end of file +# adjustedCurves + +
+ +* Version: 0.11.2 +* GitHub: https://github.com/RobinDenz1/adjustedCurves +* Source code: https://github.com/cran/adjustedCurves +* Date/Publication: 2024-07-29 14:30:02 UTC +* Number of recursive dependencies: 174 + +Run `revdepcheck::cloud_details(, "adjustedCurves")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/adjustedCurves/new/adjustedCurves.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘adjustedCurves/DESCRIPTION’ ... OK +... +--- finished re-building ‘plot_customization.rmd’ + +SUMMARY: processing the following file failed: + ‘introduction.Rmd’ + +Error: Vignette re-building failed. +Execution halted + +* DONE +Status: 2 ERRORs, 1 WARNING, 3 NOTEs + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/adjustedCurves/old/adjustedCurves.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘adjustedCurves/DESCRIPTION’ ... OK +... +--- finished re-building ‘plot_customization.rmd’ + +SUMMARY: processing the following file failed: + ‘introduction.Rmd’ + +Error: Vignette re-building failed. +Execution halted + +* DONE +Status: 2 ERRORs, 1 WARNING, 3 NOTEs + + + + + +``` +# ai + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/ai +* Number of recursive dependencies: 44 + +Run `revdepcheck::cloud_details(, "ai")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# apollo + +
+ +* Version: 0.3.4 +* GitHub: NA +* Source code: https://github.com/cran/apollo +* Date/Publication: 2024-10-01 21:30:08 UTC +* Number of recursive dependencies: 78 + +Run `revdepcheck::cloud_details(, "apollo")` for more info + +
+ +## In both + +* checking whether package ‘apollo’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/apollo/new/apollo.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘apollo’ ... +** package ‘apollo’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.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/RcppEigen/include/RcppEigenForward.h:28, + from /usr/local/lib/R/site-library/RcppEigen/include/RcppEigen.h:25, +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘apollo’ +* removing ‘/tmp/workdir/apollo/new/apollo.Rcheck/apollo’ + + +``` +### CRAN + +``` +* installing *source* package ‘apollo’ ... +** package ‘apollo’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.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/RcppEigen/include/RcppEigenForward.h:28, + from /usr/local/lib/R/site-library/RcppEigen/include/RcppEigen.h:25, +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘apollo’ +* removing ‘/tmp/workdir/apollo/old/apollo.Rcheck/apollo’ + + +``` +# arealDB + +
+ +* Version: 0.6.3 +* GitHub: https://github.com/luckinet/arealDB +* Source code: https://github.com/cran/arealDB +* Date/Publication: 2023-07-03 10:00:02 UTC +* Number of recursive dependencies: 109 + +Run `revdepcheck::cloud_details(, "arealDB")` for more info + +
+ +## 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 +** 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: ... 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 +** 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: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘arealDB’ +* removing ‘/tmp/workdir/arealDB/old/arealDB.Rcheck/arealDB’ + + +``` +# assessor + +
+ +* Version: 1.1.0 +* GitHub: https://github.com/jhlee1408/assessor +* Source code: https://github.com/cran/assessor +* Date/Publication: 2024-04-03 04:23:02 UTC +* Number of recursive dependencies: 106 + +Run `revdepcheck::cloud_details(, "assessor")` for more info + +
+ +## In both + +* checking whether package ‘assessor’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/assessor/new/assessor.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘assessor’ ... +** package ‘assessor’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘assessor’ +* removing ‘/tmp/workdir/assessor/new/assessor.Rcheck/assessor’ + + +``` +### CRAN + +``` +* installing *source* package ‘assessor’ ... +** package ‘assessor’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘assessor’ +* removing ‘/tmp/workdir/assessor/old/assessor.Rcheck/assessor’ + + +``` +# atom4R + +
+ +* 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: 70 + +Run `revdepcheck::cloud_details(, "atom4R")` for more info + +
+ +## 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: ... 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: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘atom4R’ +* removing ‘/tmp/workdir/atom4R/old/atom4R.Rcheck/atom4R’ + + +``` +# BANAM + +
+ +* Version: 0.2.2 +* GitHub: NA +* Source code: https://github.com/cran/BANAM +* Date/Publication: 2024-12-03 10:30:02 UTC +* Number of recursive dependencies: 127 + +Run `revdepcheck::cloud_details(, "BANAM")` for more info + +
+ +## In both + +* checking whether package ‘BANAM’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/BANAM/new/BANAM.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘BANAM’ ... +** package ‘BANAM’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘BFpack’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘BANAM’ +* removing ‘/tmp/workdir/BANAM/new/BANAM.Rcheck/BANAM’ + + +``` +### CRAN + +``` +* installing *source* package ‘BANAM’ ... +** package ‘BANAM’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘BFpack’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘BANAM’ +* removing ‘/tmp/workdir/BANAM/old/BANAM.Rcheck/BANAM’ + + +``` +# bayesCT + +
+ +* Version: 0.99.3 +* GitHub: https://github.com/thevaachandereng/bayesCT +* Source code: https://github.com/cran/bayesCT +* Date/Publication: 2020-07-01 09:30:02 UTC +* Number of recursive dependencies: 121 + +Run `revdepcheck::cloud_details(, "bayesCT")` for more info + +
+ +## In both + +* checking whether package ‘bayesCT’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/bayesCT/new/bayesCT.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘bayesCT’ ... +** package ‘bayesCT’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘bayesCT’ +* removing ‘/tmp/workdir/bayesCT/new/bayesCT.Rcheck/bayesCT’ + + +``` +### CRAN + +``` +* installing *source* package ‘bayesCT’ ... +** package ‘bayesCT’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘bayesCT’ +* removing ‘/tmp/workdir/bayesCT/old/bayesCT.Rcheck/bayesCT’ + + +``` +# bayesDP + +
+ +* Version: 1.3.6 +* GitHub: https://github.com/graemeleehickey/bayesDP +* Source code: https://github.com/cran/bayesDP +* Date/Publication: 2022-01-30 22:20:02 UTC +* Number of recursive dependencies: 79 + +Run `revdepcheck::cloud_details(, "bayesDP")` for more info + +
+ +## In both + +* checking whether package ‘bayesDP’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/bayesDP/new/bayesDP.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘bayesDP’ ... +** package ‘bayesDP’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c bdplm.cpp -o bdplm.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c ppexp.cpp -o ppexp.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o bayesDP.so RcppExports.o bdplm.o ppexp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/bayesDP/new/bayesDP.Rcheck/00LOCK-bayesDP/00new/bayesDP/libs +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘bayesDP’ +* removing ‘/tmp/workdir/bayesDP/new/bayesDP.Rcheck/bayesDP’ + + +``` +### CRAN + +``` +* installing *source* package ‘bayesDP’ ... +** package ‘bayesDP’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c bdplm.cpp -o bdplm.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c ppexp.cpp -o ppexp.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o bayesDP.so RcppExports.o bdplm.o ppexp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/bayesDP/old/bayesDP.Rcheck/00LOCK-bayesDP/00new/bayesDP/libs +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘bayesDP’ +* removing ‘/tmp/workdir/bayesDP/old/bayesDP.Rcheck/bayesDP’ + + +``` +# BayesFactor + +
+ +* Version: 0.9.12-4.7 +* GitHub: https://github.com/richarddmorey/BayesFactor +* Source code: https://github.com/cran/BayesFactor +* Date/Publication: 2024-01-24 15:02:50 UTC +* Number of recursive dependencies: 72 + +Run `revdepcheck::cloud_details(, "BayesFactor")` for more info + +
+ +## In both + +* checking whether package ‘BayesFactor’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/BayesFactor/new/BayesFactor.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘BayesFactor’ ... +** package ‘BayesFactor’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fpic -g -O2 -c RcppCallback.cpp -o RcppCallback.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/RcppEigen/include/RcppEigenForward.h:28, + from /usr/local/lib/R/site-library/RcppEigen/include/RcppEigen.h:25, +... +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘BayesFactor’ +* removing ‘/tmp/workdir/BayesFactor/new/BayesFactor.Rcheck/BayesFactor’ + + +``` +### CRAN + +``` +* installing *source* package ‘BayesFactor’ ... +** package ‘BayesFactor’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fpic -g -O2 -c RcppCallback.cpp -o RcppCallback.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/RcppEigen/include/RcppEigenForward.h:28, + from /usr/local/lib/R/site-library/RcppEigen/include/RcppEigen.h:25, +... +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘BayesFactor’ +* removing ‘/tmp/workdir/BayesFactor/old/BayesFactor.Rcheck/BayesFactor’ + + +``` +# bbknnR + +
+ +* Version: 1.1.1 +* GitHub: https://github.com/ycli1995/bbknnR +* Source code: https://github.com/cran/bbknnR +* Date/Publication: 2024-02-13 10:20:03 UTC +* Number of recursive dependencies: 162 + +Run `revdepcheck::cloud_details(, "bbknnR")` for more info + +
+ +## In both + +* checking whether package ‘bbknnR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/bbknnR/new/bbknnR.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘bbknnR’ ... +** package ‘bbknnR’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c data_manipulation.cpp -o data_manipulation.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o bbknnR.so RcppExports.o data_manipulation.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/bbknnR/new/bbknnR.Rcheck/00LOCK-bbknnR/00new/bbknnR/libs +** R +... +Warning: namespace ‘Seurat’ is not available and has been replaced +by .GlobalEnv when processing object ‘panc8_small’ +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘bbknnR’ +* removing ‘/tmp/workdir/bbknnR/new/bbknnR.Rcheck/bbknnR’ + + +``` +### CRAN + +``` +* installing *source* package ‘bbknnR’ ... +** package ‘bbknnR’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c data_manipulation.cpp -o data_manipulation.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o bbknnR.so RcppExports.o data_manipulation.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/bbknnR/old/bbknnR.Rcheck/00LOCK-bbknnR/00new/bbknnR/libs +** R +... +Warning: namespace ‘Seurat’ is not available and has been replaced +by .GlobalEnv when processing object ‘panc8_small’ +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘bbknnR’ +* removing ‘/tmp/workdir/bbknnR/old/bbknnR.Rcheck/bbknnR’ + + +``` +# BCClong + +
+ +* Version: 1.0.3 +* GitHub: NA +* Source code: https://github.com/cran/BCClong +* Date/Publication: 2024-06-24 00:00:02 UTC +* Number of recursive dependencies: 145 + +Run `revdepcheck::cloud_details(, "BCClong")` for more info + +
+ +## In both + +* checking whether package ‘BCClong’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/BCClong/new/BCClong.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘BCClong’ ... +** package ‘BCClong’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c BCC.cpp -o BCC.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Likelihood.cpp -o Likelihood.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c c_which.cpp -o c_which.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o BCClong.so BCC.o Likelihood.o RcppExports.o c_which.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +... +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘BCClong’ +* removing ‘/tmp/workdir/BCClong/new/BCClong.Rcheck/BCClong’ + + +``` +### CRAN + +``` +* installing *source* package ‘BCClong’ ... +** package ‘BCClong’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c BCC.cpp -o BCC.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Likelihood.cpp -o Likelihood.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c c_which.cpp -o c_which.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o BCClong.so BCC.o Likelihood.o RcppExports.o c_which.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +... +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘BCClong’ +* removing ‘/tmp/workdir/BCClong/old/BCClong.Rcheck/BCClong’ + + +``` +# BFpack + +
+ +* Version: 1.4.0 +* GitHub: https://github.com/jomulder/BFpack +* Source code: https://github.com/cran/BFpack +* Date/Publication: 2024-12-03 07:40:01 UTC +* Number of recursive dependencies: 137 + +Run `revdepcheck::cloud_details(, "BFpack")` for more info + +
+ +## In both + +* checking whether package ‘BFpack’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/BFpack/new/BFpack.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘BFpack’ ... +** package ‘BFpack’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using Fortran compiler: ‘GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c BFpack_init.c -o BFpack_init.o +gfortran -fpic -g -O2 -c bct_mixedordinal.f90 -o bct_mixedordinal.o +gfortran -fpic -g -O2 -c bct_prior.f90 -o bct_prior.o +gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o BFpack.so BFpack_init.o bct_mixedordinal.o bct_prior.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘BFpack’ +* removing ‘/tmp/workdir/BFpack/new/BFpack.Rcheck/BFpack’ + + +``` +### CRAN + +``` +* installing *source* package ‘BFpack’ ... +** package ‘BFpack’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using Fortran compiler: ‘GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c BFpack_init.c -o BFpack_init.o +gfortran -fpic -g -O2 -c bct_mixedordinal.f90 -o bct_mixedordinal.o +gfortran -fpic -g -O2 -c bct_prior.f90 -o bct_prior.o +gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o BFpack.so BFpack_init.o bct_mixedordinal.o bct_prior.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘BFpack’ +* removing ‘/tmp/workdir/BFpack/old/BFpack.Rcheck/BFpack’ + + +``` +# BGGM + +
+ +* Version: 2.1.5 +* GitHub: https://github.com/donaldRwilliams/BGGM +* Source code: https://github.com/cran/BGGM +* Date/Publication: 2024-12-22 21:40:02 UTC +* Number of recursive dependencies: 210 + +Run `revdepcheck::cloud_details(, "BGGM")` for more info + +
+ +## In both + +* checking whether package ‘BGGM’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/BGGM/new/BGGM.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘BGGM’ ... +** package ‘BGGM’ successfully unpacked and MD5 sums checked +** using staged installation +configure: creating ./config.status +config.status: creating src/Makevars +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c bggm_fast.cpp -o bggm_fast.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘BGGM’ +* removing ‘/tmp/workdir/BGGM/new/BGGM.Rcheck/BGGM’ + + +``` +### CRAN + +``` +* installing *source* package ‘BGGM’ ... +** package ‘BGGM’ successfully unpacked and MD5 sums checked +** using staged installation +configure: creating ./config.status +config.status: creating src/Makevars +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c bggm_fast.cpp -o bggm_fast.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘BGGM’ +* removing ‘/tmp/workdir/BGGM/old/BGGM.Rcheck/BGGM’ + + +``` +# bnnSurvival + +
+ +* Version: 0.1.5 +* GitHub: NA +* Source code: https://github.com/cran/bnnSurvival +* Date/Publication: 2017-05-10 15:37:49 UTC +* Number of recursive dependencies: 117 + +Run `revdepcheck::cloud_details(, "bnnSurvival")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/bnnSurvival/new/bnnSurvival.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘bnnSurvival/DESCRIPTION’ ... OK +... + 5. └─base::loadNamespace(x) + 6. └─base::withRestarts(stop(cond), retry_loadNamespace = function() NULL) + 7. └─base (local) withOneRestart(expr, restarts[[1L]]) + 8. └─base (local) doWithOneRestart(return(expr), restart) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 5 ] + Error: Test failures + Execution halted +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/bnnSurvival/old/bnnSurvival.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘bnnSurvival/DESCRIPTION’ ... OK +... + 5. └─base::loadNamespace(x) + 6. └─base::withRestarts(stop(cond), retry_loadNamespace = function() NULL) + 7. └─base (local) withOneRestart(expr, restarts[[1L]]) + 8. └─base (local) doWithOneRestart(return(expr), restart) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 5 ] + Error: Test failures + Execution halted +* DONE +Status: 1 ERROR + + + + + +``` +# BSTZINB + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/SumanM47/BSTZINB +* Source code: https://github.com/cran/BSTZINB +* Date/Publication: 2024-10-31 22:50:02 UTC +* Number of recursive dependencies: 110 + +Run `revdepcheck::cloud_details(, "BSTZINB")` for more info + +
+ +## In both + +* checking whether package ‘BSTZINB’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/BSTZINB/new/BSTZINB.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘BSTZINB’ ... +** package ‘BSTZINB’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘BSTZINB’ +* removing ‘/tmp/workdir/BSTZINB/new/BSTZINB.Rcheck/BSTZINB’ + + +``` +### CRAN + +``` +* installing *source* package ‘BSTZINB’ ... +** package ‘BSTZINB’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘BSTZINB’ +* removing ‘/tmp/workdir/BSTZINB/old/BSTZINB.Rcheck/BSTZINB’ + + +``` +# BuyseTest + +
+ +* Version: 3.0.5 +* GitHub: https://github.com/bozenne/BuyseTest +* Source code: https://github.com/cran/BuyseTest +* Date/Publication: 2024-10-13 21:40:02 UTC +* Number of recursive dependencies: 132 + +Run `revdepcheck::cloud_details(, "BuyseTest")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/BuyseTest/new/BuyseTest.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘BuyseTest/DESCRIPTION’ ... OK +... +* this is package ‘BuyseTest’ version ‘3.0.5’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/BuyseTest/old/BuyseTest.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘BuyseTest/DESCRIPTION’ ... OK +... +* this is package ‘BuyseTest’ version ‘3.0.5’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# CACIMAR + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/jiang-junyao/CACIMAR +* Source code: https://github.com/cran/CACIMAR +* Date/Publication: 2022-05-18 08:20:02 UTC +* Number of recursive dependencies: 161 + +Run `revdepcheck::cloud_details(, "CACIMAR")` for more info + +
+ +## In both + +* checking whether package ‘CACIMAR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/CACIMAR/new/CACIMAR.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘CACIMAR’ ... +** package ‘CACIMAR’ 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: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Execution halted +ERROR: lazy loading failed for package ‘CACIMAR’ +* removing ‘/tmp/workdir/CACIMAR/new/CACIMAR.Rcheck/CACIMAR’ + + +``` +### CRAN + +``` +* installing *source* package ‘CACIMAR’ ... +** package ‘CACIMAR’ 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: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Execution halted +ERROR: lazy loading failed for package ‘CACIMAR’ +* removing ‘/tmp/workdir/CACIMAR/old/CACIMAR.Rcheck/CACIMAR’ + + +``` +# censored + +
+ +* Version: 0.3.2 +* GitHub: https://github.com/tidymodels/censored +* Source code: https://github.com/cran/censored +* Date/Publication: 2024-06-11 18:10:02 UTC +* Number of recursive dependencies: 163 + +Run `revdepcheck::cloud_details(, "censored")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/censored/new/censored.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘censored/DESCRIPTION’ ... OK +... +* this is package ‘censored’ version ‘0.3.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘survival’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/censored/old/censored.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘censored/DESCRIPTION’ ... OK +... +* this is package ‘censored’ version ‘0.3.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required and available but unsuitable version: ‘survival’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# Certara.VPCResults + +
+ +* Version: 3.0.2 +* GitHub: NA +* Source code: https://github.com/cran/Certara.VPCResults +* Date/Publication: 2024-12-02 15:30:02 UTC +* Number of recursive dependencies: 141 + +Run `revdepcheck::cloud_details(, "Certara.VPCResults")` for more info + +
+ +## In both + +* checking whether package ‘Certara.VPCResults’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/Certara.VPCResults/new/Certara.VPCResults.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘Certara.VPCResults’ ... +** package ‘Certara.VPCResults’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Certara.VPCResults’ +* removing ‘/tmp/workdir/Certara.VPCResults/new/Certara.VPCResults.Rcheck/Certara.VPCResults’ + + +``` +### CRAN + +``` +* installing *source* package ‘Certara.VPCResults’ ... +** package ‘Certara.VPCResults’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Certara.VPCResults’ +* removing ‘/tmp/workdir/Certara.VPCResults/old/Certara.VPCResults.Rcheck/Certara.VPCResults’ + + +``` +# CGPfunctions + +
+ +* Version: 0.6.3 +* GitHub: https://github.com/ibecav/CGPfunctions +* Source code: https://github.com/cran/CGPfunctions +* Date/Publication: 2020-11-12 14:50:09 UTC +* Number of recursive dependencies: 155 + +Run `revdepcheck::cloud_details(, "CGPfunctions")` for more info + +
+ +## In both + +* checking whether package ‘CGPfunctions’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/CGPfunctions/new/CGPfunctions.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘CGPfunctions’ ... +** package ‘CGPfunctions’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘CGPfunctions’ +* removing ‘/tmp/workdir/CGPfunctions/new/CGPfunctions.Rcheck/CGPfunctions’ + + +``` +### CRAN + +``` +* installing *source* package ‘CGPfunctions’ ... +** package ‘CGPfunctions’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘CGPfunctions’ +* removing ‘/tmp/workdir/CGPfunctions/old/CGPfunctions.Rcheck/CGPfunctions’ + + +``` +# chipPCR + +
+ +* Version: 1.0-2 +* GitHub: https://github.com/PCRuniversum/chipPCR +* Source code: https://github.com/cran/chipPCR +* Date/Publication: 2021-03-05 07:50:03 UTC +* Number of recursive dependencies: 141 + +Run `revdepcheck::cloud_details(, "chipPCR")` for more info + +
+ +## In both + +* checking whether package ‘chipPCR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/chipPCR/new/chipPCR.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘chipPCR’ ... +** package ‘chipPCR’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘chipPCR’ +* removing ‘/tmp/workdir/chipPCR/new/chipPCR.Rcheck/chipPCR’ + + +``` +### CRAN + +``` +* installing *source* package ‘chipPCR’ ... +** package ‘chipPCR’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘chipPCR’ +* removing ‘/tmp/workdir/chipPCR/old/chipPCR.Rcheck/chipPCR’ + + +``` +# cia + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/cia +* Number of recursive dependencies: 122 + +Run `revdepcheck::cloud_details(, "cia")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# clustermq + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/clustermq +* Number of recursive dependencies: 108 + +Run `revdepcheck::cloud_details(, "clustermq")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# cmmr + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/cmmr +* Number of recursive dependencies: 36 + +Run `revdepcheck::cloud_details(, "cmmr")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# COMBO + +
+ +* Version: 1.2.0 +* GitHub: NA +* Source code: https://github.com/cran/COMBO +* Date/Publication: 2024-10-30 15:50:02 UTC +* Number of recursive dependencies: 122 + +Run `revdepcheck::cloud_details(, "COMBO")` for more info + +
+ +## In both + +* checking whether package ‘COMBO’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/COMBO/new/COMBO.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘COMBO’ ... +** package ‘COMBO’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘COMBO’ +* removing ‘/tmp/workdir/COMBO/new/COMBO.Rcheck/COMBO’ + + +``` +### CRAN + +``` +* installing *source* package ‘COMBO’ ... +** package ‘COMBO’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘COMBO’ +* removing ‘/tmp/workdir/COMBO/old/COMBO.Rcheck/COMBO’ + + +``` +# contsurvplot + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/RobinDenz1/contsurvplot +* Source code: https://github.com/cran/contsurvplot +* Date/Publication: 2023-08-15 08:00:03 UTC +* Number of recursive dependencies: 156 + +Run `revdepcheck::cloud_details(, "contsurvplot")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/contsurvplot/new/contsurvplot.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘contsurvplot/DESCRIPTION’ ... OK +... +* this is package ‘contsurvplot’ version ‘0.2.1’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/contsurvplot/old/contsurvplot.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘contsurvplot/DESCRIPTION’ ... OK +... +* this is package ‘contsurvplot’ version ‘0.2.1’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# counterfactuals + +
+ +* Version: 0.1.6 +* GitHub: https://github.com/dandls/counterfactuals +* Source code: https://github.com/cran/counterfactuals +* Date/Publication: 2024-10-17 12:00:06 UTC +* Number of recursive dependencies: 217 + +Run `revdepcheck::cloud_details(, "counterfactuals")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/counterfactuals/new/counterfactuals.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘counterfactuals/DESCRIPTION’ ... OK +... +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... NONE + ‘how-to-add-new-cf-methods.html.asis’ using ‘UTF-8’... OK + ‘introduction.html.asis’ using ‘UTF-8’... OK + ‘other_models.html.asis’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/counterfactuals/old/counterfactuals.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘counterfactuals/DESCRIPTION’ ... OK +... +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... NONE + ‘how-to-add-new-cf-methods.html.asis’ using ‘UTF-8’... OK + ‘introduction.html.asis’ using ‘UTF-8’... OK + ‘other_models.html.asis’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 NOTE + + + + + +``` +# CRMetrics + +
+ +* Version: 0.3.2 +* GitHub: https://github.com/khodosevichlab/CRMetrics +* Source code: https://github.com/cran/CRMetrics +* Date/Publication: 2024-11-08 00:20:06 UTC +* Number of recursive dependencies: 239 + +Run `revdepcheck::cloud_details(, "CRMetrics")` for more info + +
+ +## In both + +* checking whether package ‘CRMetrics’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/CRMetrics/new/CRMetrics.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘CRMetrics’ ... +** package ‘CRMetrics’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘CRMetrics’ +* removing ‘/tmp/workdir/CRMetrics/new/CRMetrics.Rcheck/CRMetrics’ + + +``` +### CRAN + +``` +* installing *source* package ‘CRMetrics’ ... +** package ‘CRMetrics’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘CRMetrics’ +* removing ‘/tmp/workdir/CRMetrics/old/CRMetrics.Rcheck/CRMetrics’ + + +``` +# ctsem + +
+ +* Version: 3.10.1 +* GitHub: https://github.com/cdriveraus/ctsem +* Source code: https://github.com/cran/ctsem +* Date/Publication: 2024-08-19 14:40:06 UTC +* Number of recursive dependencies: 157 + +Run `revdepcheck::cloud_details(, "ctsem")` for more info + +
+ +## In both + +* checking whether package ‘ctsem’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ctsem/new/ctsem.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘ctsem’ ... +** package ‘ctsem’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.3.1/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::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/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::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: 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.2.0-23ubuntu4) 13.2.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.3.1/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::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/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::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ctsm.o] Error 1 +ERROR: compilation failed for package ‘ctsem’ +* removing ‘/tmp/workdir/ctsem/old/ctsem.Rcheck/ctsem’ + + +``` +# dartR.base + +
+ +* Version: 0.98 +* GitHub: NA +* Source code: https://github.com/cran/dartR.base +* Date/Publication: 2024-09-19 13:20:02 UTC +* Number of recursive dependencies: 285 + +Run `revdepcheck::cloud_details(, "dartR.base")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/dartR.base/new/dartR.base.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.base/DESCRIPTION’ ... OK +... +* this is package ‘dartR.base’ version ‘0.98’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘SNPassoc’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/dartR.base/old/dartR.base.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.base/DESCRIPTION’ ... OK +... +* this is package ‘dartR.base’ version ‘0.98’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘SNPassoc’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# dataone + +
+ +* 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 + +
+ +## 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: ... 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: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘dataone’ +* removing ‘/tmp/workdir/dataone/old/dataone.Rcheck/dataone’ + + +``` +# datapack + +
+ +* 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 + +
+ +## 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: ... 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: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘datapack’ +* removing ‘/tmp/workdir/datapack/old/datapack.Rcheck/datapack’ + + +``` +# deeptrafo + +
+ +* Version: 1.0-0 +* GitHub: https://github.com/neural-structured-additive-learning/deeptrafo +* Source code: https://github.com/cran/deeptrafo +* Date/Publication: 2024-12-03 18:40:02 UTC +* Number of recursive dependencies: 109 + +Run `revdepcheck::cloud_details(, "deeptrafo")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/deeptrafo/new/deeptrafo.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘deeptrafo/DESCRIPTION’ ... OK +... +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘mlt’ + +Packages suggested but not available for checking: 'tram', 'cotram' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/deeptrafo/old/deeptrafo.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘deeptrafo/DESCRIPTION’ ... OK +... +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘mlt’ + +Packages suggested but not available for checking: 'tram', 'cotram' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# DepthProc + +
+ +* Version: 2.1.5 +* GitHub: https://github.com/zzawadz/DepthProc +* Source code: https://github.com/cran/DepthProc +* Date/Publication: 2022-02-03 20:30:02 UTC +* Number of recursive dependencies: 133 + +Run `revdepcheck::cloud_details(, "DepthProc")` for more info + +
+ +## In both + +* checking whether package ‘DepthProc’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/DepthProc/new/DepthProc.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘DepthProc’ ... +** package ‘DepthProc’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Depth.cpp -o Depth.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationEstimators.cpp -o LocationEstimators.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepth.cpp -o LocationScaleDepth.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepthCPP.cpp -o LocationScaleDepthCPP.o +... +installing to /tmp/workdir/DepthProc/new/DepthProc.Rcheck/00LOCK-DepthProc/00new/DepthProc/libs +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘DepthProc’ +* removing ‘/tmp/workdir/DepthProc/new/DepthProc.Rcheck/DepthProc’ + + +``` +### CRAN + +``` +* installing *source* package ‘DepthProc’ ... +** package ‘DepthProc’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Depth.cpp -o Depth.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationEstimators.cpp -o LocationEstimators.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepth.cpp -o LocationScaleDepth.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepthCPP.cpp -o LocationScaleDepthCPP.o +... +installing to /tmp/workdir/DepthProc/old/DepthProc.Rcheck/00LOCK-DepthProc/00new/DepthProc/libs +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘DepthProc’ +* removing ‘/tmp/workdir/DepthProc/old/DepthProc.Rcheck/DepthProc’ + + +``` +# dibble + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/dibble +* Number of recursive dependencies: 51 + +Run `revdepcheck::cloud_details(, "dibble")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# drtmle + +
+ +* Version: 1.1.2 +* GitHub: https://github.com/benkeser/drtmle +* Source code: https://github.com/cran/drtmle +* Date/Publication: 2023-01-05 19:50:02 UTC +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "drtmle")` for more info + +
+ +## In both + +* checking whether package ‘drtmle’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/drtmle/new/drtmle.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘drtmle’ ... +** package ‘drtmle’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘drtmle’ +* removing ‘/tmp/workdir/drtmle/new/drtmle.Rcheck/drtmle’ + + +``` +### CRAN + +``` +* installing *source* package ‘drtmle’ ... +** package ‘drtmle’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘drtmle’ +* removing ‘/tmp/workdir/drtmle/old/drtmle.Rcheck/drtmle’ + + +``` +# dscoreMSM + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/dscoreMSM +* Date/Publication: 2024-12-13 16:40:02 UTC +* Number of recursive dependencies: 121 + +Run `revdepcheck::cloud_details(, "dscoreMSM")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/dscoreMSM/new/dscoreMSM.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dscoreMSM/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘dscoreMSM.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/dscoreMSM/old/dscoreMSM.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dscoreMSM/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘dscoreMSM.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +# DWLS + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/sistia01/DWLS +* Source code: https://github.com/cran/DWLS +* Date/Publication: 2022-05-24 09:20:01 UTC +* Number of recursive dependencies: 183 + +Run `revdepcheck::cloud_details(, "DWLS")` for more info + +
+ +## In both + +* checking whether package ‘DWLS’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/DWLS/new/DWLS.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘DWLS’ ... +** package ‘DWLS’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘DWLS’ +* removing ‘/tmp/workdir/DWLS/new/DWLS.Rcheck/DWLS’ + + +``` +### CRAN + +``` +* installing *source* package ‘DWLS’ ... +** package ‘DWLS’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘DWLS’ +* removing ‘/tmp/workdir/DWLS/old/DWLS.Rcheck/DWLS’ + + +``` +# easybgm + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/KarolineHuth/easybgm +* Source code: https://github.com/cran/easybgm +* Date/Publication: 2024-10-17 08:30:02 UTC +* Number of recursive dependencies: 179 + +Run `revdepcheck::cloud_details(, "easybgm")` for more info + +
+ +## In both + +* checking whether package ‘easybgm’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/easybgm/new/easybgm.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘easybgm’ ... +** package ‘easybgm’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘easybgm’ +* removing ‘/tmp/workdir/easybgm/new/easybgm.Rcheck/easybgm’ + + +``` +### CRAN + +``` +* installing *source* package ‘easybgm’ ... +** package ‘easybgm’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘easybgm’ +* removing ‘/tmp/workdir/easybgm/old/easybgm.Rcheck/easybgm’ + + +``` +# EcoEnsemble + +
+ +* Version: 1.1.0 +* GitHub: https://github.com/CefasRepRes/EcoEnsemble +* Source code: https://github.com/cran/EcoEnsemble +* Date/Publication: 2024-08-19 17:20:06 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "EcoEnsemble")` for more info + +
+ +## 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.2.0-23ubuntu4) 13.2.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.3.1/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::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 >]’ +/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::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: 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.2.0-23ubuntu4) 13.2.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.3.1/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::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 >]’ +/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::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ensemble_model_hierarchical.o] Error 1 +ERROR: compilation failed for package ‘EcoEnsemble’ +* removing ‘/tmp/workdir/EcoEnsemble/old/EcoEnsemble.Rcheck/EcoEnsemble’ + + +``` +# ecolottery + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/frmunoz/ecolottery +* Source code: https://github.com/cran/ecolottery +* Date/Publication: 2017-07-03 11:01:29 UTC +* Number of recursive dependencies: 87 + +Run `revdepcheck::cloud_details(, "ecolottery")` for more info + +
+ +## In both + +* checking whether package ‘ecolottery’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘ecolottery’ ... +** package ‘ecolottery’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘ecolottery’ +* removing ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/ecolottery’ + + +``` +### CRAN + +``` +* installing *source* package ‘ecolottery’ ... +** package ‘ecolottery’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘ecolottery’ +* removing ‘/tmp/workdir/ecolottery/old/ecolottery.Rcheck/ecolottery’ + + +``` +# EdSurvey + +
+ +* Version: 4.0.7 +* GitHub: https://github.com/American-Institutes-for-Research/EdSurvey +* Source code: https://github.com/cran/EdSurvey +* Date/Publication: 2024-06-27 14:50:14 UTC +* Number of recursive dependencies: 127 + +Run `revdepcheck::cloud_details(, "EdSurvey")` for more info + +
+ +## In both + +* checking whether package ‘EdSurvey’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/EdSurvey/new/EdSurvey.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘EdSurvey’ ... +** package ‘EdSurvey’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘EdSurvey’ +* removing ‘/tmp/workdir/EdSurvey/new/EdSurvey.Rcheck/EdSurvey’ + + +``` +### CRAN + +``` +* installing *source* package ‘EdSurvey’ ... +** package ‘EdSurvey’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘EdSurvey’ +* removing ‘/tmp/workdir/EdSurvey/old/EdSurvey.Rcheck/EdSurvey’ + + +``` +# emplik + +
+ +* Version: 1.3-2 +* GitHub: NA +* Source code: https://github.com/cran/emplik +* Date/Publication: 2024-12-06 10:30:06 UTC +* Number of recursive dependencies: 33 + +Run `revdepcheck::cloud_details(, "emplik")` for more info + +
+ +## In both + +* checking whether package ‘emplik’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/emplik/new/emplik.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘emplik’ ... +** package ‘emplik’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c cumsumsurv.c -o cumsumsurv.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c init.c -o init.o +gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o emplik.so cumsumsurv.o init.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/emplik/new/emplik.Rcheck/00LOCK-emplik/00new/emplik/libs +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘emplik’ +* removing ‘/tmp/workdir/emplik/new/emplik.Rcheck/emplik’ + + +``` +### CRAN + +``` +* installing *source* package ‘emplik’ ... +** package ‘emplik’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c cumsumsurv.c -o cumsumsurv.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c init.c -o init.o +gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o emplik.so cumsumsurv.o init.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/emplik/old/emplik.Rcheck/00LOCK-emplik/00new/emplik/libs +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘emplik’ +* removing ‘/tmp/workdir/emplik/old/emplik.Rcheck/emplik’ + + +``` +# EpiEstim + +
+ +* Version: 2.2-4 +* GitHub: https://github.com/mrc-ide/EpiEstim +* Source code: https://github.com/cran/EpiEstim +* Date/Publication: 2021-01-07 16:20:10 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "EpiEstim")` for more info + +
+ +## In both + +* checking whether package ‘EpiEstim’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/EpiEstim/new/EpiEstim.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘EpiEstim’ ... +** package ‘EpiEstim’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘EpiEstim’ +* removing ‘/tmp/workdir/EpiEstim/new/EpiEstim.Rcheck/EpiEstim’ + + +``` +### CRAN + +``` +* installing *source* package ‘EpiEstim’ ... +** package ‘EpiEstim’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘EpiEstim’ +* removing ‘/tmp/workdir/EpiEstim/old/EpiEstim.Rcheck/EpiEstim’ + + +``` +# epizootic + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/viralemergence/epizootic +* Source code: https://github.com/cran/epizootic +* Date/Publication: 2024-10-02 13:10:05 UTC +* Number of recursive dependencies: 93 + +Run `revdepcheck::cloud_details(, "epizootic")` for more info + +
+ +## In both + +* checking whether package ‘epizootic’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/epizootic/new/epizootic.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘epizootic’ ... +** package ‘epizootic’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c aspatial_siri.cpp -o aspatial_siri.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o epizootic.so RcppExports.o aspatial_siri.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/epizootic/new/epizootic.Rcheck/00LOCK-epizootic/00new/epizootic/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘epizootic’ +* removing ‘/tmp/workdir/epizootic/new/epizootic.Rcheck/epizootic’ + + +``` +### CRAN + +``` +* installing *source* package ‘epizootic’ ... +** package ‘epizootic’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c aspatial_siri.cpp -o aspatial_siri.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o epizootic.so RcppExports.o aspatial_siri.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/epizootic/old/epizootic.Rcheck/00LOCK-epizootic/00new/epizootic/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘epizootic’ +* removing ‘/tmp/workdir/epizootic/old/epizootic.Rcheck/epizootic’ + + +``` +# erah + +
+ +* Version: 2.0.1 +* GitHub: https://github.com/xdomingoal/erah-devel +* Source code: https://github.com/cran/erah +* Date/Publication: 2023-12-20 10:10:02 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "erah")` for more info + +
+ +## In both + +* checking whether package ‘erah’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/erah/new/erah.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘erah’ ... +** package ‘erah’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c registerDynamicSymbol.c -o registerDynamicSymbol.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c runfunc.c -o runfunc.o +gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o erah.so registerDynamicSymbol.o runfunc.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/erah/new/erah.Rcheck/00LOCK-erah/00new/erah/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘erah’ +* removing ‘/tmp/workdir/erah/new/erah.Rcheck/erah’ + + +``` +### CRAN + +``` +* installing *source* package ‘erah’ ... +** package ‘erah’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c registerDynamicSymbol.c -o registerDynamicSymbol.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c runfunc.c -o runfunc.o +gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o erah.so registerDynamicSymbol.o runfunc.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/erah/old/erah.Rcheck/00LOCK-erah/00new/erah/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘erah’ +* removing ‘/tmp/workdir/erah/old/erah.Rcheck/erah’ + + +``` +# evolqg + +
+ +* Version: 0.3-4 +* GitHub: https://github.com/lem-usp/evolqg +* Source code: https://github.com/cran/evolqg +* Date/Publication: 2023-12-05 15:20:12 UTC +* Number of recursive dependencies: 110 + +Run `revdepcheck::cloud_details(, "evolqg")` for more info + +
+ +## In both + +* checking whether package ‘evolqg’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/evolqg/new/evolqg.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘evolqg’ ... +** package ‘evolqg’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c fast_RS.cpp -o fast_RS.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o evolqg.so RcppExports.o fast_RS.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/evolqg/new/evolqg.Rcheck/00LOCK-evolqg/00new/evolqg/libs +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘evolqg’ +* removing ‘/tmp/workdir/evolqg/new/evolqg.Rcheck/evolqg’ + + +``` +### CRAN + +``` +* installing *source* package ‘evolqg’ ... +** package ‘evolqg’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c fast_RS.cpp -o fast_RS.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o evolqg.so RcppExports.o fast_RS.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/evolqg/old/evolqg.Rcheck/00LOCK-evolqg/00new/evolqg/libs +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘evolqg’ +* removing ‘/tmp/workdir/evolqg/old/evolqg.Rcheck/evolqg’ + + +``` +# EWSmethods + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/EWSmethods +* Number of recursive dependencies: 139 + +Run `revdepcheck::cloud_details(, "EWSmethods")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# ezECM + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/lanl/ezECM +* Source code: https://github.com/cran/ezECM +* Date/Publication: 2024-10-17 17:10:01 UTC +* Number of recursive dependencies: 119 + +Run `revdepcheck::cloud_details(, "ezECM")` for more info + +
+ +## In both + +* checking whether package ‘ezECM’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ezECM/new/ezECM.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘ezECM’ ... +** package ‘ezECM’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘ezECM’ +* removing ‘/tmp/workdir/ezECM/new/ezECM.Rcheck/ezECM’ + + +``` +### CRAN + +``` +* installing *source* package ‘ezECM’ ... +** package ‘ezECM’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘ezECM’ +* removing ‘/tmp/workdir/ezECM/old/ezECM.Rcheck/ezECM’ + + +``` +# FAIRmaterials + +
+ +* 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: 93 + +Run `revdepcheck::cloud_details(, "FAIRmaterials")` for more info + +
+ +## 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: ... 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: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘FAIRmaterials’ +* removing ‘/tmp/workdir/FAIRmaterials/old/FAIRmaterials.Rcheck/FAIRmaterials’ + + +``` +# FastJM + +
+ +* Version: 1.4.2 +* GitHub: NA +* Source code: https://github.com/cran/FastJM +* Date/Publication: 2024-03-01 00:12:34 UTC +* Number of recursive dependencies: 146 + +Run `revdepcheck::cloud_details(, "FastJM")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/FastJM/new/FastJM.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘FastJM/DESCRIPTION’ ... OK +... +* checking for portable use of $(BLAS_LIBS) and $(LAPACK_LIBS) ... OK +* checking use of PKG_*FLAGS in Makefiles ... OK +* checking compiled code ... OK +* checking examples ... OK +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘spelling.R’ + Running ‘testthat.R’ +* DONE +Status: 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/FastJM/old/FastJM.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘FastJM/DESCRIPTION’ ... OK +... +* checking for portable use of $(BLAS_LIBS) and $(LAPACK_LIBS) ... OK +* checking use of PKG_*FLAGS in Makefiles ... OK +* checking compiled code ... OK +* checking examples ... OK +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘spelling.R’ + Running ‘testthat.R’ +* DONE +Status: 1 NOTE + + + + + +``` +# fdaPDE + +
+ +* 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 + +
+ +## 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.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/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&) [with OtherDerived = Eigen::CwiseBinaryOp, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::CwiseBinaryOp, const Eigen::Solve >, Eigen::CwiseNullaryOp, Eigen::Matrix > >, const Eigen::Solve >, Eigen::Product >, Eigen::Matrix, 0>, Eigen::Transpose >, 0>, Eigen::Matrix, 0>, Eigen::Solve >, Eigen::CwiseNullaryOp, Eigen::Matrix > >, 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::compute_V() [with InputHandler = RegressionData; MatrixType = Eigen::Matrix]’ +Regression/Source/../../Skeletons/Include/../../Inference/Include/Wald_imp.h:123:5: required from ‘VectorXr Wald_Base::compute_beta_pvalue() [with InputHandler = RegressionData; MatrixType = Eigen::Matrix; VectorXr = Eigen::Matrix]’ +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::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:200: 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.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/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&) [with OtherDerived = Eigen::CwiseBinaryOp, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::CwiseBinaryOp, const Eigen::Solve >, Eigen::CwiseNullaryOp, Eigen::Matrix > >, const Eigen::Solve >, Eigen::Product >, Eigen::Matrix, 0>, Eigen::Transpose >, 0>, Eigen::Matrix, 0>, Eigen::Solve >, Eigen::CwiseNullaryOp, Eigen::Matrix > >, 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::compute_V() [with InputHandler = RegressionData; MatrixType = Eigen::Matrix]’ +Regression/Source/../../Skeletons/Include/../../Inference/Include/Wald_imp.h:123:5: required from ‘VectorXr Wald_Base::compute_beta_pvalue() [with InputHandler = RegressionData; MatrixType = Eigen::Matrix; VectorXr = Eigen::Matrix]’ +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::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:200: Regression/Source/Rfun_Regression_Laplace.o] Error 1 +ERROR: compilation failed for package ‘fdaPDE’ +* removing ‘/tmp/workdir/fdaPDE/old/fdaPDE.Rcheck/fdaPDE’ + + +``` +# ForecastComb + +
+ +* Version: 1.3.1 +* GitHub: https://github.com/ceweiss/ForecastComb +* Source code: https://github.com/cran/ForecastComb +* Date/Publication: 2018-08-07 13:50:08 UTC +* Number of recursive dependencies: 73 + +Run `revdepcheck::cloud_details(, "ForecastComb")` for more info + +
+ +## In both + +* checking whether package ‘ForecastComb’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ForecastComb/new/ForecastComb.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘ForecastComb’ ... +** package ‘ForecastComb’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘ForecastComb’ +* removing ‘/tmp/workdir/ForecastComb/new/ForecastComb.Rcheck/ForecastComb’ + + +``` +### CRAN + +``` +* installing *source* package ‘ForecastComb’ ... +** package ‘ForecastComb’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘ForecastComb’ +* removing ‘/tmp/workdir/ForecastComb/old/ForecastComb.Rcheck/ForecastComb’ + + +``` +# FoReco + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/daniGiro/FoReco +* Source code: https://github.com/cran/FoReco +* Date/Publication: 2024-08-20 22:20:05 UTC +* Number of recursive dependencies: 28 + +Run `revdepcheck::cloud_details(, "FoReco")` for more info + +
+ +## In both + +* checking whether package ‘FoReco’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/FoReco/new/FoReco.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘FoReco’ ... +** package ‘FoReco’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘FoReco’ +* removing ‘/tmp/workdir/FoReco/new/FoReco.Rcheck/FoReco’ + + +``` +### CRAN + +``` +* installing *source* package ‘FoReco’ ... +** package ‘FoReco’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘FoReco’ +* removing ‘/tmp/workdir/FoReco/old/FoReco.Rcheck/FoReco’ + + +``` +# frechet + +
+ +* Version: 0.3.0 +* GitHub: https://github.com/functionaldata/tFrechet +* Source code: https://github.com/cran/frechet +* Date/Publication: 2023-12-09 15:50:08 UTC +* Number of recursive dependencies: 110 + +Run `revdepcheck::cloud_details(, "frechet")` for more info + +
+ +## In both + +* checking whether package ‘frechet’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/frechet/new/frechet.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘frechet’ ... +** package ‘frechet’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘frechet’ +* removing ‘/tmp/workdir/frechet/new/frechet.Rcheck/frechet’ + + +``` +### CRAN + +``` +* installing *source* package ‘frechet’ ... +** package ‘frechet’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘frechet’ +* removing ‘/tmp/workdir/frechet/old/frechet.Rcheck/frechet’ + + +``` +# FREEtree + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/FREEtree +* Date/Publication: 2020-06-25 15:00:03 UTC +* Number of recursive dependencies: 133 + +Run `revdepcheck::cloud_details(, "FREEtree")` for more info + +
+ +## In both + +* checking whether package ‘FREEtree’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/FREEtree/new/FREEtree.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘FREEtree’ ... +** package ‘FREEtree’ 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 +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘FREEtree’ +* removing ‘/tmp/workdir/FREEtree/new/FREEtree.Rcheck/FREEtree’ + + +``` +### CRAN + +``` +* installing *source* package ‘FREEtree’ ... +** package ‘FREEtree’ 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 +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘FREEtree’ +* removing ‘/tmp/workdir/FREEtree/old/FREEtree.Rcheck/FREEtree’ + + +``` +# gapfill + +
+ +* Version: 0.9.6-1 +* GitHub: https://github.com/florafauna/gapfill +* Source code: https://github.com/cran/gapfill +* Date/Publication: 2021-02-12 10:10:05 UTC +* Number of recursive dependencies: 70 + +Run `revdepcheck::cloud_details(, "gapfill")` for more info + +
+ +## In both + +* checking whether package ‘gapfill’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/gapfill/new/gapfill.Rcheck/00install.out’ for details. + ``` + +* checking package dependencies ... NOTE + ``` + Packages which this enhances but not available for checking: + 'raster', 'doParallel', 'doMPI' + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘gapfill’ ... +** package ‘gapfill’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c gapfill.cpp -o gapfill.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o gapfill.so RcppExports.o gapfill.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/gapfill/new/gapfill.Rcheck/00LOCK-gapfill/00new/gapfill/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘gapfill’ +* removing ‘/tmp/workdir/gapfill/new/gapfill.Rcheck/gapfill’ + + +``` +### CRAN + +``` +* installing *source* package ‘gapfill’ ... +** package ‘gapfill’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c gapfill.cpp -o gapfill.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o gapfill.so RcppExports.o gapfill.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/gapfill/old/gapfill.Rcheck/00LOCK-gapfill/00new/gapfill/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘gapfill’ +* removing ‘/tmp/workdir/gapfill/old/gapfill.Rcheck/gapfill’ + + +``` +# genekitr + +
+ +* Version: 1.2.8 +* GitHub: https://github.com/GangLiLab/genekitr +* Source code: https://github.com/cran/genekitr +* Date/Publication: 2024-09-06 13:00:06 UTC +* Number of recursive dependencies: 199 + +Run `revdepcheck::cloud_details(, "genekitr")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/genekitr/new/genekitr.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘genekitr/DESCRIPTION’ ... OK +... +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +Package suggested but not available for checking: ‘fgsea’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/genekitr/old/genekitr.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘genekitr/DESCRIPTION’ ... OK +... +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +Package suggested but not available for checking: ‘fgsea’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# GeneSelectR + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/dzhakparov/GeneSelectR +* Source code: https://github.com/cran/GeneSelectR +* Date/Publication: 2024-02-03 14:00:05 UTC +* Number of recursive dependencies: 183 + +Run `revdepcheck::cloud_details(, "GeneSelectR")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/GeneSelectR/new/GeneSelectR.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘GeneSelectR/DESCRIPTION’ ... OK +... ++ build_vignettes = FALSE) + + When sourcing ‘example.R’: +Error: there is no package called ‘devtools’ +Execution halted + + ‘example.Rmd’ using ‘UTF-8’... failed +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 WARNING, 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/GeneSelectR/old/GeneSelectR.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘GeneSelectR/DESCRIPTION’ ... OK +... ++ build_vignettes = FALSE) + + When sourcing ‘example.R’: +Error: there is no package called ‘devtools’ +Execution halted + + ‘example.Rmd’ using ‘UTF-8’... failed +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 WARNING, 1 NOTE + + + + + +``` +# GeomComb + +
+ +* Version: 1.0 +* GitHub: https://github.com/ceweiss/GeomComb +* Source code: https://github.com/cran/GeomComb +* Date/Publication: 2016-11-27 16:02:26 +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "GeomComb")` for more info + +
+ +## In both + +* checking whether package ‘GeomComb’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/GeomComb/new/GeomComb.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘GeomComb’ ... +** package ‘GeomComb’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘GeomComb’ +* removing ‘/tmp/workdir/GeomComb/new/GeomComb.Rcheck/GeomComb’ + + +``` +### CRAN + +``` +* installing *source* package ‘GeomComb’ ... +** package ‘GeomComb’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘GeomComb’ +* removing ‘/tmp/workdir/GeomComb/old/GeomComb.Rcheck/GeomComb’ + + +``` +# geomorph + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/geomorph +* Number of recursive dependencies: 71 + +Run `revdepcheck::cloud_details(, "geomorph")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# GeoTox + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/GeoTox +* Number of recursive dependencies: 142 + +Run `revdepcheck::cloud_details(, "GeoTox")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# gllvm + +
+ +* Version: 2.0 +* GitHub: https://github.com/JenniNiku/gllvm +* Source code: https://github.com/cran/gllvm +* Date/Publication: 2024-11-26 19:40:01 UTC +* Number of recursive dependencies: 61 + +Run `revdepcheck::cloud_details(, "gllvm")` for more info + +
+ +## 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.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/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::reverse(TMBad::ReverseArgs&) [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::reverse(TMBad::ReverseArgs&) [with Type = double; OperatorBase = TMBad::global::AddIncrementDecrement > > >]’ +/usr/local/lib/R/site-library/TMB/include/TMBad/global.hpp:2134:57: required from ‘void TMBad::global::Complete::reverse(TMBad::ReverseArgs&) [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::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:200: 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.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/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::reverse(TMBad::ReverseArgs&) [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::reverse(TMBad::ReverseArgs&) [with Type = double; OperatorBase = TMBad::global::AddIncrementDecrement > > >]’ +/usr/local/lib/R/site-library/TMB/include/TMBad/global.hpp:2134:57: required from ‘void TMBad::global::Complete::reverse(TMBad::ReverseArgs&) [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::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:200: gllvm.o] Error 1 +ERROR: compilation failed for package ‘gllvm’ +* removing ‘/tmp/workdir/gllvm/old/gllvm.Rcheck/gllvm’ + + +``` +# gmoTree + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/gmoTree +* Number of recursive dependencies: 60 + +Run `revdepcheck::cloud_details(, "gmoTree")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# gpuR + +
+ +* 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 + +
+ +## 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::operator=(const Eigen::DenseBase&) [with OtherDerived = Eigen::Matrix; Derived = Eigen::Block, 0, Eigen::OuterStride<> >, -1, 1, true>]’ +../inst/include/gpuR/dynEigenMat.hpp:192:30: required from ‘void dynEigenMat::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::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/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.3.1/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.3.1/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::operator=(const Eigen::DenseBase&) [with OtherDerived = Eigen::Matrix; Derived = Eigen::Block, 0, Eigen::OuterStride<> >, -1, 1, true>]’ +../inst/include/gpuR/dynEigenMat.hpp:192:30: required from ‘void dynEigenMat::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::type’ {aka ‘__m128d’} [-Wignored-attributes] +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/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.3.1/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.3.1/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’ + + +``` +# hettx + +
+ +* Version: 0.1.3 +* GitHub: https://github.com/bfifield/hettx +* Source code: https://github.com/cran/hettx +* Date/Publication: 2023-08-19 22:22:34 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "hettx")` for more info + +
+ +## In both + +* checking whether package ‘hettx’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/hettx/new/hettx.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘hettx’ ... +** package ‘hettx’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘hettx’ +* removing ‘/tmp/workdir/hettx/new/hettx.Rcheck/hettx’ + + +``` +### CRAN + +``` +* installing *source* package ‘hettx’ ... +** package ‘hettx’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘hettx’ +* removing ‘/tmp/workdir/hettx/old/hettx.Rcheck/hettx’ + + +``` +# Hmsc + +
+ +* Version: 3.0-13 +* GitHub: https://github.com/hmsc-r/HMSC +* Source code: https://github.com/cran/Hmsc +* Date/Publication: 2022-08-11 14:10:14 UTC +* Number of recursive dependencies: 75 + +Run `revdepcheck::cloud_details(, "Hmsc")` for more info + +
+ +## In both + +* checking whether package ‘Hmsc’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/Hmsc/new/Hmsc.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘Hmsc’ ... +** package ‘Hmsc’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Hmsc’ +* removing ‘/tmp/workdir/Hmsc/new/Hmsc.Rcheck/Hmsc’ + + +``` +### CRAN + +``` +* installing *source* package ‘Hmsc’ ... +** package ‘Hmsc’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Hmsc’ +* removing ‘/tmp/workdir/Hmsc/old/Hmsc.Rcheck/Hmsc’ + + +``` +# IDLFM + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/IDLFM +* Number of recursive dependencies: 36 + +Run `revdepcheck::cloud_details(, "IDLFM")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# invivoPKfit + +
+ +* Version: 2.0.0 +* GitHub: NA +* Source code: https://github.com/cran/invivoPKfit +* Date/Publication: 2025-01-09 14:30:02 UTC +* Number of recursive dependencies: 172 + +Run `revdepcheck::cloud_details(, "invivoPKfit")` for more info + +
+ +## In both + +* checking whether package ‘invivoPKfit’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/invivoPKfit/new/invivoPKfit.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘invivoPKfit’ ... +** package ‘invivoPKfit’ 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: object ‘expand1’ is not exported by 'namespace:Matrix' +Execution halted +ERROR: lazy loading failed for package ‘invivoPKfit’ +* removing ‘/tmp/workdir/invivoPKfit/new/invivoPKfit.Rcheck/invivoPKfit’ + + +``` +### CRAN + +``` +* installing *source* package ‘invivoPKfit’ ... +** package ‘invivoPKfit’ 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: object ‘expand1’ is not exported by 'namespace:Matrix' +Execution halted +ERROR: lazy loading failed for package ‘invivoPKfit’ +* removing ‘/tmp/workdir/invivoPKfit/old/invivoPKfit.Rcheck/invivoPKfit’ + + +``` +# iNZightPlots + +
+ +* Version: 2.15.3 +* GitHub: https://github.com/iNZightVIT/iNZightPlots +* Source code: https://github.com/cran/iNZightPlots +* Date/Publication: 2023-10-14 05:00:02 UTC +* Number of recursive dependencies: 161 + +Run `revdepcheck::cloud_details(, "iNZightPlots")` for more info + +
+ +## In both + +* checking whether package ‘iNZightPlots’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/iNZightPlots/new/iNZightPlots.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘iNZightPlots’ ... +** package ‘iNZightPlots’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘iNZightPlots’ +* removing ‘/tmp/workdir/iNZightPlots/new/iNZightPlots.Rcheck/iNZightPlots’ + + +``` +### CRAN + +``` +* installing *source* package ‘iNZightPlots’ ... +** package ‘iNZightPlots’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘iNZightPlots’ +* removing ‘/tmp/workdir/iNZightPlots/old/iNZightPlots.Rcheck/iNZightPlots’ + + +``` +# iNZightRegression + +
+ +* Version: 1.3.4 +* GitHub: https://github.com/iNZightVIT/iNZightRegression +* Source code: https://github.com/cran/iNZightRegression +* Date/Publication: 2024-04-05 02:32:59 UTC +* Number of recursive dependencies: 159 + +Run `revdepcheck::cloud_details(, "iNZightRegression")` for more info + +
+ +## In both + +* checking whether package ‘iNZightRegression’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/iNZightRegression/new/iNZightRegression.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘iNZightRegression’ ... +** package ‘iNZightRegression’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘iNZightRegression’ +* removing ‘/tmp/workdir/iNZightRegression/new/iNZightRegression.Rcheck/iNZightRegression’ + + +``` +### CRAN + +``` +* installing *source* package ‘iNZightRegression’ ... +** package ‘iNZightRegression’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘iNZightRegression’ +* removing ‘/tmp/workdir/iNZightRegression/old/iNZightRegression.Rcheck/iNZightRegression’ + + +``` +# IVCor + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/IVCor +* Date/Publication: 2025-01-09 18:00:02 UTC +* Number of recursive dependencies: 54 + +Run `revdepcheck::cloud_details(, "IVCor")` for more info + +
+ +## In both + +* checking whether package ‘IVCor’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/IVCor/new/IVCor.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘IVCor’ ... +** package ‘IVCor’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘IVCor’ +* removing ‘/tmp/workdir/IVCor/new/IVCor.Rcheck/IVCor’ + + +``` +### CRAN + +``` +* installing *source* package ‘IVCor’ ... +** package ‘IVCor’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘IVCor’ +* removing ‘/tmp/workdir/IVCor/old/IVCor.Rcheck/IVCor’ + + +``` +# JMH + +
+ +* Version: 1.0.3 +* GitHub: NA +* Source code: https://github.com/cran/JMH +* Date/Publication: 2024-02-20 06:40:02 UTC +* Number of recursive dependencies: 146 + +Run `revdepcheck::cloud_details(, "JMH")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/JMH/new/JMH.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘JMH/DESCRIPTION’ ... OK +... +* checking line endings in C/C++/Fortran sources/headers ... OK +* checking line endings in Makefiles ... OK +* checking compilation flags in Makevars ... OK +* checking for GNU extensions in Makefiles ... OK +* checking for portable use of $(BLAS_LIBS) and $(LAPACK_LIBS) ... OK +* checking use of PKG_*FLAGS in Makefiles ... OK +* checking compiled code ... OK +* checking examples ... OK +* DONE +Status: 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/JMH/old/JMH.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘JMH/DESCRIPTION’ ... OK +... +* checking line endings in C/C++/Fortran sources/headers ... OK +* checking line endings in Makefiles ... OK +* checking compilation flags in Makevars ... OK +* checking for GNU extensions in Makefiles ... OK +* checking for portable use of $(BLAS_LIBS) and $(LAPACK_LIBS) ... OK +* checking use of PKG_*FLAGS in Makefiles ... OK +* checking compiled code ... OK +* checking examples ... OK +* DONE +Status: 1 NOTE + + + + + +``` +# joineRML + +
+ +* Version: 0.4.6 +* GitHub: https://github.com/graemeleehickey/joineRML +* Source code: https://github.com/cran/joineRML +* Date/Publication: 2023-01-20 04:50:02 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "joineRML")` for more info + +
+ +## In both + +* checking whether package ‘joineRML’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/joineRML/new/joineRML.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘joineRML’ ... +** package ‘joineRML’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c expW.cpp -o expW.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gammaUpdate.cpp -o gammaUpdate.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘joineRML’ +* removing ‘/tmp/workdir/joineRML/new/joineRML.Rcheck/joineRML’ + + +``` +### CRAN + +``` +* installing *source* package ‘joineRML’ ... +** package ‘joineRML’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c expW.cpp -o expW.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gammaUpdate.cpp -o gammaUpdate.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘joineRML’ +* removing ‘/tmp/workdir/joineRML/old/joineRML.Rcheck/joineRML’ + + +``` +# jsmodule + +
+ +* Version: 1.6.1 +* GitHub: https://github.com/jinseob2kim/jsmodule +* Source code: https://github.com/cran/jsmodule +* Date/Publication: 2025-01-08 13:10:02 UTC +* Number of recursive dependencies: 238 + +Run `revdepcheck::cloud_details(, "jsmodule")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/jsmodule/new/jsmodule.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘jsmodule/DESCRIPTION’ ... OK +... +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘jsmodule.Rmd’ using ‘UTF-8’... OK + ‘jsmodule_subgroup_cmprsk.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/jsmodule/old/jsmodule.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘jsmodule/DESCRIPTION’ ... OK +... +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘jsmodule.Rmd’ using ‘UTF-8’... OK + ‘jsmodule_subgroup_cmprsk.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +# kmc + +
+ +* Version: 0.4-2 +* GitHub: https://github.com/yfyang86/kmc +* Source code: https://github.com/cran/kmc +* Date/Publication: 2022-11-22 08:30:02 UTC +* Number of recursive dependencies: 60 + +Run `revdepcheck::cloud_details(, "kmc")` for more info + +
+ +## In both + +* checking whether package ‘kmc’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/kmc/new/kmc.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘kmc’ ... +** package ‘kmc’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExport.cpp -o RcppExport.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc.cpp -o kmc.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc_init.c -o kmc_init.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c surv2.c -o surv2.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o kmc.so RcppExport.o kmc.o kmc_init.o surv2.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/kmc/new/kmc.Rcheck/00LOCK-kmc/00new/kmc/libs +** R +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘emplik’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘kmc’ +* removing ‘/tmp/workdir/kmc/new/kmc.Rcheck/kmc’ + + +``` +### CRAN + +``` +* installing *source* package ‘kmc’ ... +** package ‘kmc’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExport.cpp -o RcppExport.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc.cpp -o kmc.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc_init.c -o kmc_init.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c surv2.c -o surv2.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o kmc.so RcppExport.o kmc.o kmc_init.o surv2.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/kmc/old/kmc.Rcheck/00LOCK-kmc/00new/kmc/libs +** R +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘emplik’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘kmc’ +* removing ‘/tmp/workdir/kmc/old/kmc.Rcheck/kmc’ + + +``` +# KMunicate + +
+ +* Version: 0.2.5 +* GitHub: https://github.com/ellessenne/KMunicate-package +* Source code: https://github.com/cran/KMunicate +* Date/Publication: 2024-05-16 11:50:08 UTC +* Number of recursive dependencies: 171 + +Run `revdepcheck::cloud_details(, "KMunicate")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/KMunicate/new/KMunicate.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘KMunicate/DESCRIPTION’ ... OK +... +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘KMunicate.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/KMunicate/old/KMunicate.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘KMunicate/DESCRIPTION’ ... OK +... +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘KMunicate.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +# Landmarking + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/isobelbarrott/Landmarking +* Source code: https://github.com/cran/Landmarking +* Date/Publication: 2022-02-15 20:00:07 UTC +* Number of recursive dependencies: 122 + +Run `revdepcheck::cloud_details(, "Landmarking")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/Landmarking/new/Landmarking.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘Landmarking/DESCRIPTION’ ... OK +... +* this is package ‘Landmarking’ version ‘1.0.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/Landmarking/old/Landmarking.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘Landmarking/DESCRIPTION’ ... OK +... +* this is package ‘Landmarking’ version ‘1.0.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# lavaSearch2 + +
+ +* Version: 2.0.3 +* GitHub: https://github.com/bozenne/lavaSearch2 +* Source code: https://github.com/cran/lavaSearch2 +* Date/Publication: 2024-02-23 09:10:02 UTC +* Number of recursive dependencies: 146 + +Run `revdepcheck::cloud_details(, "lavaSearch2")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/lavaSearch2/new/lavaSearch2.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘lavaSearch2/DESCRIPTION’ ... OK +... + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 266 ] + Error: Test failures + Execution halted +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... NONE + ‘overview.pdf.asis’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 ERROR, 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/lavaSearch2/old/lavaSearch2.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘lavaSearch2/DESCRIPTION’ ... OK +... + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 266 ] + Error: Test failures + Execution halted +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... NONE + ‘overview.pdf.asis’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 ERROR, 1 NOTE + + + + + +``` +# lnmixsurv + +
+ +* Version: 3.1.6 +* GitHub: NA +* Source code: https://github.com/cran/lnmixsurv +* Date/Publication: 2024-09-03 15:20:08 UTC +* Number of recursive dependencies: 195 + +Run `revdepcheck::cloud_details(, "lnmixsurv")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/lnmixsurv/new/lnmixsurv.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘lnmixsurv/DESCRIPTION’ ... OK +... +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘compare.Rmd’ using ‘UTF-8’... OK + ‘expectation_maximization.Rmd’ using ‘UTF-8’... OK + ‘intercept_only.Rmd’ using ‘UTF-8’... OK + ‘lnmixsurv.Rmd’ using ‘UTF-8’... OK + ‘parallel_computation.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 4 NOTEs + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/lnmixsurv/old/lnmixsurv.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘lnmixsurv/DESCRIPTION’ ... OK +... +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘compare.Rmd’ using ‘UTF-8’... OK + ‘expectation_maximization.Rmd’ using ‘UTF-8’... OK + ‘intercept_only.Rmd’ using ‘UTF-8’... OK + ‘lnmixsurv.Rmd’ using ‘UTF-8’... OK + ‘parallel_computation.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 4 NOTEs + + + + + +``` +# locpolExpectile + +
+ +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/locpolExpectile +* Date/Publication: 2021-08-03 09:50:05 UTC +* Number of recursive dependencies: 70 + +Run `revdepcheck::cloud_details(, "locpolExpectile")` for more info + +
+ +## In both + +* checking whether package ‘locpolExpectile’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/locpolExpectile/new/locpolExpectile.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘locpolExpectile’ ... +** package ‘locpolExpectile’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘locpolExpectile’ +* removing ‘/tmp/workdir/locpolExpectile/new/locpolExpectile.Rcheck/locpolExpectile’ + + +``` +### CRAN + +``` +* installing *source* package ‘locpolExpectile’ ... +** package ‘locpolExpectile’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘locpolExpectile’ +* removing ‘/tmp/workdir/locpolExpectile/old/locpolExpectile.Rcheck/locpolExpectile’ + + +``` +# loon.shiny + +
+ +* 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: 136 + +Run `revdepcheck::cloud_details(, "loon.shiny")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/loon.shiny/new/loon.shiny.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 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.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 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 + +
+ +* 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: 127 + +Run `revdepcheck::cloud_details(, "loon.tourr")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/loon.tourr/new/loon.tourr.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 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.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 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 + + + + + +``` +# lsirm12pl + +
+ +* Version: 1.3.3 +* GitHub: NA +* Source code: https://github.com/cran/lsirm12pl +* Date/Publication: 2024-08-28 23:00:02 UTC +* Number of recursive dependencies: 123 + +Run `revdepcheck::cloud_details(, "lsirm12pl")` for more info + +
+ +## In both + +* checking whether package ‘lsirm12pl’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/lsirm12pl/new/lsirm12pl.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘lsirm12pl’ ... +** package ‘lsirm12pl’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl.cpp -o lsirm1pl.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm2pl.cpp -o lsirm2pl.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsm.cpp -o lsm.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c utility_cpp.cpp -o utility_cpp.o +... +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘lsirm12pl’ +* removing ‘/tmp/workdir/lsirm12pl/new/lsirm12pl.Rcheck/lsirm12pl’ + + +``` +### CRAN + +``` +* installing *source* package ‘lsirm12pl’ ... +** package ‘lsirm12pl’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl.cpp -o lsirm1pl.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm2pl.cpp -o lsirm2pl.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsm.cpp -o lsm.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c utility_cpp.cpp -o utility_cpp.o +... +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘lsirm12pl’ +* removing ‘/tmp/workdir/lsirm12pl/old/lsirm12pl.Rcheck/lsirm12pl’ + + +``` +# marlod + +
+ +* Version: 0.1.2 +* GitHub: NA +* Source code: https://github.com/cran/marlod +* Date/Publication: 2024-11-29 21:40:02 UTC +* Number of recursive dependencies: 106 + +Run `revdepcheck::cloud_details(, "marlod")` for more info + +
+ +## In both + +* checking whether package ‘marlod’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/marlod/new/marlod.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘marlod’ ... +** package ‘marlod’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘marlod’ +* removing ‘/tmp/workdir/marlod/new/marlod.Rcheck/marlod’ + + +``` +### CRAN + +``` +* installing *source* package ‘marlod’ ... +** package ‘marlod’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘marlod’ +* removing ‘/tmp/workdir/marlod/old/marlod.Rcheck/marlod’ + + +``` +# mbsts + +
+ +* Version: 3.0 +* GitHub: NA +* Source code: https://github.com/cran/mbsts +* Date/Publication: 2023-01-07 01:10:02 UTC +* Number of recursive dependencies: 81 + +Run `revdepcheck::cloud_details(, "mbsts")` for more info + +
+ +## In both + +* checking whether package ‘mbsts’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/mbsts/new/mbsts.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘mbsts’ ... +** package ‘mbsts’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘mbsts’ +* removing ‘/tmp/workdir/mbsts/new/mbsts.Rcheck/mbsts’ + + +``` +### CRAN + +``` +* installing *source* package ‘mbsts’ ... +** package ‘mbsts’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘mbsts’ +* removing ‘/tmp/workdir/mbsts/old/mbsts.Rcheck/mbsts’ + + +``` +# metajam + +
+ +* 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: 90 + +Run `revdepcheck::cloud_details(, "metajam")` for more info + +
+ +## 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: ... 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: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘metajam’ +* removing ‘/tmp/workdir/metajam/old/metajam.Rcheck/metajam’ + + +``` +# mHMMbayes + +
+ +* Version: 1.1.0 +* GitHub: https://github.com/emmekeaarts/mHMMbayes +* Source code: https://github.com/cran/mHMMbayes +* Date/Publication: 2024-04-01 12:20:02 UTC +* Number of recursive dependencies: 57 + +Run `revdepcheck::cloud_details(, "mHMMbayes")` for more info + +
+ +## In both + +* checking whether package ‘mHMMbayes’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/mHMMbayes/new/mHMMbayes.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘mHMMbayes’ ... +** package ‘mHMMbayes’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c cat_mult_fw_cpp.cpp -o cat_mult_fw_cpp.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o mHMMbayes.so RcppExports.o cat_mult_fw_cpp.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/mHMMbayes/new/mHMMbayes.Rcheck/00LOCK-mHMMbayes/00new/mHMMbayes/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘mHMMbayes’ +* removing ‘/tmp/workdir/mHMMbayes/new/mHMMbayes.Rcheck/mHMMbayes’ + + +``` +### CRAN + +``` +* installing *source* package ‘mHMMbayes’ ... +** package ‘mHMMbayes’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c cat_mult_fw_cpp.cpp -o cat_mult_fw_cpp.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o mHMMbayes.so RcppExports.o cat_mult_fw_cpp.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/mHMMbayes/old/mHMMbayes.Rcheck/00LOCK-mHMMbayes/00new/mHMMbayes/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘mHMMbayes’ +* removing ‘/tmp/workdir/mHMMbayes/old/mHMMbayes.Rcheck/mHMMbayes’ + + +``` +# midasr + +
+ +* Version: 0.8 +* GitHub: https://github.com/mpiktas/midasr +* Source code: https://github.com/cran/midasr +* Date/Publication: 2021-02-23 09:40:05 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "midasr")` for more info + +
+ +## In both + +* checking whether package ‘midasr’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/midasr/new/midasr.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘midasr’ ... +** package ‘midasr’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** demo +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘quantreg’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘midasr’ +* removing ‘/tmp/workdir/midasr/new/midasr.Rcheck/midasr’ + + +``` +### CRAN + +``` +* installing *source* package ‘midasr’ ... +** package ‘midasr’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** demo +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘quantreg’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘midasr’ +* removing ‘/tmp/workdir/midasr/old/midasr.Rcheck/midasr’ + + +``` +# miWQS + +
+ +* Version: 0.4.4 +* GitHub: https://github.com/phargarten2/miWQS +* Source code: https://github.com/cran/miWQS +* Date/Publication: 2021-04-02 21:50:02 UTC +* Number of recursive dependencies: 148 + +Run `revdepcheck::cloud_details(, "miWQS")` for more info + +
+ +## In both + +* checking whether package ‘miWQS’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/miWQS/new/miWQS.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘miWQS’ ... +** package ‘miWQS’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘miWQS’ +* removing ‘/tmp/workdir/miWQS/new/miWQS.Rcheck/miWQS’ + + +``` +### CRAN + +``` +* installing *source* package ‘miWQS’ ... +** package ‘miWQS’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘miWQS’ +* removing ‘/tmp/workdir/miWQS/old/miWQS.Rcheck/miWQS’ + + +``` +# mixAR + +
+ +* Version: 0.22.8 +* GitHub: https://github.com/GeoBosh/mixAR +* Source code: https://github.com/cran/mixAR +* Date/Publication: 2023-12-19 01:40:02 UTC +* Number of recursive dependencies: 96 + +Run `revdepcheck::cloud_details(, "mixAR")` for more info + +
+ +## In both + +* checking whether package ‘mixAR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/mixAR/new/mixAR.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘mixAR’ ... +** package ‘mixAR’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘mixAR’ +* removing ‘/tmp/workdir/mixAR/new/mixAR.Rcheck/mixAR’ + + +``` +### CRAN + +``` +* installing *source* package ‘mixAR’ ... +** package ‘mixAR’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘mixAR’ +* removing ‘/tmp/workdir/mixAR/old/mixAR.Rcheck/mixAR’ + + +``` +# mlmts + +
+ +* Version: 1.1.2 +* GitHub: NA +* Source code: https://github.com/cran/mlmts +* Date/Publication: 2024-08-18 08:40:06 UTC +* Number of recursive dependencies: 243 + +Run `revdepcheck::cloud_details(, "mlmts")` for more info + +
+ +## In both + +* checking whether package ‘mlmts’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/mlmts/new/mlmts.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘mlmts’ ... +** package ‘mlmts’ 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 : package or namespace load failed for ‘quantspec’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Error: unable to load R code in package ‘mlmts’ +Execution halted +ERROR: lazy loading failed for package ‘mlmts’ +* removing ‘/tmp/workdir/mlmts/new/mlmts.Rcheck/mlmts’ + + +``` +### CRAN + +``` +* installing *source* package ‘mlmts’ ... +** package ‘mlmts’ 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 : package or namespace load failed for ‘quantspec’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Error: unable to load R code in package ‘mlmts’ +Execution halted +ERROR: lazy loading failed for package ‘mlmts’ +* removing ‘/tmp/workdir/mlmts/old/mlmts.Rcheck/mlmts’ + + +``` +# mlr + +
+ +* Version: 2.19.2 +* GitHub: https://github.com/mlr-org/mlr +* Source code: https://github.com/cran/mlr +* Date/Publication: 2024-06-12 10:50:02 UTC +* Number of recursive dependencies: 362 + +Run `revdepcheck::cloud_details(, "mlr")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/mlr/new/mlr.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘mlr/DESCRIPTION’ ... OK +... +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘mlr.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 2 NOTEs + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/mlr/old/mlr.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘mlr/DESCRIPTION’ ... OK +... +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘mlr.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 2 NOTEs + + + + + +``` +# modeLLtest + +
+ +* Version: 1.0.4 +* GitHub: https://github.com/ShanaScogin/modeLLtest +* Source code: https://github.com/cran/modeLLtest +* Date/Publication: 2022-05-05 23:20:17 UTC +* Number of recursive dependencies: 51 + +Run `revdepcheck::cloud_details(, "modeLLtest")` for more info + +
+ +## In both + +* checking whether package ‘modeLLtest’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/modeLLtest/new/modeLLtest.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘modeLLtest’ ... +** package ‘modeLLtest’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_mr.cpp -o cvll_mr.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_ols.cpp -o cvll_ols.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_rlm_m.cpp -o cvll_rlm_m.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘modeLLtest’ +* removing ‘/tmp/workdir/modeLLtest/new/modeLLtest.Rcheck/modeLLtest’ + + +``` +### CRAN + +``` +* installing *source* package ‘modeLLtest’ ... +** package ‘modeLLtest’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_mr.cpp -o cvll_mr.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_ols.cpp -o cvll_ols.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_rlm_m.cpp -o cvll_rlm_m.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘modeLLtest’ +* removing ‘/tmp/workdir/modeLLtest/old/modeLLtest.Rcheck/modeLLtest’ + + +``` +# multilevelmediation + +
+ +* Version: 0.4.1 +* GitHub: https://github.com/falkcarl/multilevelmediation +* Source code: https://github.com/cran/multilevelmediation +* Date/Publication: 2025-01-10 12:10:02 UTC +* Number of recursive dependencies: 105 + +Run `revdepcheck::cloud_details(, "multilevelmediation")` for more info + +
+ +## In both + +* checking whether package ‘multilevelmediation’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/multilevelmediation/new/multilevelmediation.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘multilevelmediation’ ... +** package ‘multilevelmediation’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘multilevelmediation’ +* removing ‘/tmp/workdir/multilevelmediation/new/multilevelmediation.Rcheck/multilevelmediation’ + + +``` +### CRAN + +``` +* installing *source* package ‘multilevelmediation’ ... +** package ‘multilevelmediation’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘multilevelmediation’ +* removing ‘/tmp/workdir/multilevelmediation/old/multilevelmediation.Rcheck/multilevelmediation’ + + +``` +# multilevelTools + +
+ +* Version: 0.1.1 +* GitHub: https://github.com/JWiley/multilevelTools +* Source code: https://github.com/cran/multilevelTools +* Date/Publication: 2020-03-04 09:50:02 UTC +* Number of recursive dependencies: 167 + +Run `revdepcheck::cloud_details(, "multilevelTools")` for more info + +
+ +## In both + +* checking whether package ‘multilevelTools’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/multilevelTools/new/multilevelTools.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘multilevelTools’ ... +** package ‘multilevelTools’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘multilevelTools’ +* removing ‘/tmp/workdir/multilevelTools/new/multilevelTools.Rcheck/multilevelTools’ + + +``` +### CRAN + +``` +* installing *source* package ‘multilevelTools’ ... +** package ‘multilevelTools’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘multilevelTools’ +* removing ‘/tmp/workdir/multilevelTools/old/multilevelTools.Rcheck/multilevelTools’ + + +``` +# multinma + +
+ +* Version: 0.7.2 +* GitHub: https://github.com/dmphillippo/multinma +* Source code: https://github.com/cran/multinma +* Date/Publication: 2024-09-16 12:20:02 UTC +* Number of recursive dependencies: 151 + +Run `revdepcheck::cloud_details(, "multinma")` for more info + +
+ +## 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.2.0-23ubuntu4) 13.2.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.3.1/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::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 >]’ +/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::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: 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.2.0-23ubuntu4) 13.2.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.3.1/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::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 >]’ +/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::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_survival_param.o] Error 1 +ERROR: compilation failed for package ‘multinma’ +* removing ‘/tmp/workdir/multinma/old/multinma.Rcheck/multinma’ + + +``` +# multvardiv + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/multvardiv +* Number of recursive dependencies: 45 + +Run `revdepcheck::cloud_details(, "multvardiv")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# NCA + +
+ +* Version: 4.0.2 +* GitHub: NA +* Source code: https://github.com/cran/NCA +* Date/Publication: 2024-11-09 18:10:02 UTC +* Number of recursive dependencies: 98 + +Run `revdepcheck::cloud_details(, "NCA")` for more info + +
+ +## In both + +* checking whether package ‘NCA’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/NCA/new/NCA.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘NCA’ ... +** package ‘NCA’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘NCA’ +* removing ‘/tmp/workdir/NCA/new/NCA.Rcheck/NCA’ + + +``` +### CRAN + +``` +* installing *source* package ‘NCA’ ... +** package ‘NCA’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘NCA’ +* removing ‘/tmp/workdir/NCA/old/NCA.Rcheck/NCA’ + + +``` +# netcmc + +
+ +* Version: 1.0.2 +* GitHub: NA +* Source code: https://github.com/cran/netcmc +* Date/Publication: 2022-11-08 22:30:15 UTC +* Number of recursive dependencies: 60 + +Run `revdepcheck::cloud_details(, "netcmc")` for more info + +
+ +## In both + +* checking whether package ‘netcmc’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/netcmc/new/netcmc.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘netcmc’ ... +** package ‘netcmc’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c choleskyDecompositionRcppConversion.cpp -o choleskyDecompositionRcppConversion.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleMatrixMultiplicationRcpp.cpp -o doubleMatrixMultiplicationRcpp.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleVectorMultiplicationRcpp.cpp -o doubleVectorMultiplicationRcpp.o +... +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c vectorVectorTransposeMultiplicationRcpp.cpp -o vectorVectorTransposeMultiplicationRcpp.o +g++ -std=gnu++11 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o netcmc.so RcppExports.o choleskyDecompositionRcppConversion.o doubleMatrixMultiplicationRcpp.o doubleVectorMultiplicationRcpp.o eigenValuesRcppConversion.o getDiagonalMatrix.o getExp.o getExpDividedByOnePlusExp.o getMeanCenteredRandomEffects.o getMultivariateBinomialNetworkLerouxDIC.o getMultivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariateGaussianNetworkLerouxDIC.o getMultivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariatePoissonNetworkLerouxDIC.o getMultivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getNonZeroEntries.o getSubvector.o getSubvectorIndecies.o getSumExpNetwork.o getSumExpNetworkIndecies.o getSumExpNetworkLeroux.o getSumExpNetworkLerouxIndecies.o getSumLogExp.o getSumLogExpIndecies.o getSumVector.o getTripletForm.o getUnivariateBinomialNetworkLerouxDIC.o getUnivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariateGaussianNetworkLerouxDIC.o getUnivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkDIC.o getUnivariatePoissonNetworkFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkLerouxDIC.o getUnivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getVectorMean.o matrixInverseRcppConversion.o matrixMatrixAdditionRcpp.o matrixMatrixSubtractionRcpp.o matrixVectorMultiplicationRcpp.o multivariateBinomialNetworkLerouxAllUpdate.o multivariateBinomialNetworkLerouxBetaUpdate.o multivariateBinomialNetworkLerouxRhoUpdate.o multivariateBinomialNetworkLerouxSingleUpdate.o multivariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o multivariateBinomialNetworkLerouxTauSquaredUpdate.o multivariateBinomialNetworkLerouxURandomEffectsUpdate.o multivariateBinomialNetworkLerouxVRandomEffectsUpdate.o multivariateBinomialNetworkLerouxVarianceCovarianceUUpdate.o multivariateBinomialNetworkRandAllUpdate.o multivariateBinomialNetworkRandSingleUpdate.o multivariateGaussianNetworkLerouxAllMHUpdate.o multivariateGaussianNetworkLerouxBetaUpdate.o multivariateGaussianNetworkLerouxRhoUpdate.o multivariateGaussianNetworkLerouxSigmaSquaredEUpdate.o multivariateGaussianNetworkLerouxSingleMHUpdate.o multivariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o multivariateGaussianNetworkLerouxTauSquaredUpdate.o multivariateGaussianNetworkLerouxURandomEffectsUpdate.o multivariateGaussianNetworkLerouxVarianceCovarianceUUpdate.o multivariateGaussianNetworkRandAllUpdate.o multivariateGaussianNetworkRandSingleUpdate.o multivariateGaussianNetworkRandVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxAllUpdate.o multivariatePoissonNetworkLerouxBetaUpdate.o multivariatePoissonNetworkLerouxRhoUpdate.o multivariatePoissonNetworkLerouxSingleUpdate.o multivariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o multivariatePoissonNetworkLerouxTauSquaredUpdate.o multivariatePoissonNetworkLerouxURandomEffectsUpdate.o multivariatePoissonNetworkLerouxVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxVarianceCovarianceUUpdate.o multivariatePoissonNetworkRandAllUpdate.o multivariatePoissonNetworkRandSingleUpdate.o sumMatrix.o univariateBinomialNetworkLerouxAllUpdate.o univariateBinomialNetworkLerouxBetaUpdate.o univariateBinomialNetworkLerouxRhoUpdate.o univariateBinomialNetworkLerouxSigmaSquaredUpdate.o univariateBinomialNetworkLerouxSingleUpdate.o univariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o univariateBinomialNetworkLerouxTauSquaredUpdate.o univariateBinomialNetworkLerouxURandomEffectsUpdate.o univariateGaussianNetworkLerouxAllMHUpdate.o univariateGaussianNetworkLerouxBetaUpdate.o univariateGaussianNetworkLerouxRhoUpdate.o univariateGaussianNetworkLerouxSigmaSquaredEUpdate.o univariateGaussianNetworkLerouxSigmaSquaredUUpdate.o univariateGaussianNetworkLerouxSingleMHUpdate.o univariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o univariateGaussianNetworkLerouxTauSquaredUpdate.o univariateGaussianNetworkLerouxURandomEffectsUpdate.o univariatePoissonNetworkLerouxAllUpdate.o univariatePoissonNetworkLerouxBetaUpdate.o univariatePoissonNetworkLerouxRhoUpdate.o univariatePoissonNetworkLerouxSigmaSquaredUpdate.o univariatePoissonNetworkLerouxSingleUpdate.o univariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o univariatePoissonNetworkLerouxTauSquaredUpdate.o univariatePoissonNetworkLerouxURandomEffectsUpdate.o vectorTransposeVectorMultiplicationRcpp.o vectorVectorTransposeMultiplicationRcpp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/netcmc/new/netcmc.Rcheck/00LOCK-netcmc/00new/netcmc/libs +** R +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘MCMCpack’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘netcmc’ +* removing ‘/tmp/workdir/netcmc/new/netcmc.Rcheck/netcmc’ + + +``` +### CRAN + +``` +* installing *source* package ‘netcmc’ ... +** package ‘netcmc’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c choleskyDecompositionRcppConversion.cpp -o choleskyDecompositionRcppConversion.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleMatrixMultiplicationRcpp.cpp -o doubleMatrixMultiplicationRcpp.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleVectorMultiplicationRcpp.cpp -o doubleVectorMultiplicationRcpp.o +... +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c vectorVectorTransposeMultiplicationRcpp.cpp -o vectorVectorTransposeMultiplicationRcpp.o +g++ -std=gnu++11 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o netcmc.so RcppExports.o choleskyDecompositionRcppConversion.o doubleMatrixMultiplicationRcpp.o doubleVectorMultiplicationRcpp.o eigenValuesRcppConversion.o getDiagonalMatrix.o getExp.o getExpDividedByOnePlusExp.o getMeanCenteredRandomEffects.o getMultivariateBinomialNetworkLerouxDIC.o getMultivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariateGaussianNetworkLerouxDIC.o getMultivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariatePoissonNetworkLerouxDIC.o getMultivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getNonZeroEntries.o getSubvector.o getSubvectorIndecies.o getSumExpNetwork.o getSumExpNetworkIndecies.o getSumExpNetworkLeroux.o getSumExpNetworkLerouxIndecies.o getSumLogExp.o getSumLogExpIndecies.o getSumVector.o getTripletForm.o getUnivariateBinomialNetworkLerouxDIC.o getUnivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariateGaussianNetworkLerouxDIC.o getUnivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkDIC.o getUnivariatePoissonNetworkFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkLerouxDIC.o getUnivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getVectorMean.o matrixInverseRcppConversion.o matrixMatrixAdditionRcpp.o matrixMatrixSubtractionRcpp.o matrixVectorMultiplicationRcpp.o multivariateBinomialNetworkLerouxAllUpdate.o multivariateBinomialNetworkLerouxBetaUpdate.o multivariateBinomialNetworkLerouxRhoUpdate.o multivariateBinomialNetworkLerouxSingleUpdate.o multivariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o multivariateBinomialNetworkLerouxTauSquaredUpdate.o multivariateBinomialNetworkLerouxURandomEffectsUpdate.o multivariateBinomialNetworkLerouxVRandomEffectsUpdate.o multivariateBinomialNetworkLerouxVarianceCovarianceUUpdate.o multivariateBinomialNetworkRandAllUpdate.o multivariateBinomialNetworkRandSingleUpdate.o multivariateGaussianNetworkLerouxAllMHUpdate.o multivariateGaussianNetworkLerouxBetaUpdate.o multivariateGaussianNetworkLerouxRhoUpdate.o multivariateGaussianNetworkLerouxSigmaSquaredEUpdate.o multivariateGaussianNetworkLerouxSingleMHUpdate.o multivariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o multivariateGaussianNetworkLerouxTauSquaredUpdate.o multivariateGaussianNetworkLerouxURandomEffectsUpdate.o multivariateGaussianNetworkLerouxVarianceCovarianceUUpdate.o multivariateGaussianNetworkRandAllUpdate.o multivariateGaussianNetworkRandSingleUpdate.o multivariateGaussianNetworkRandVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxAllUpdate.o multivariatePoissonNetworkLerouxBetaUpdate.o multivariatePoissonNetworkLerouxRhoUpdate.o multivariatePoissonNetworkLerouxSingleUpdate.o multivariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o multivariatePoissonNetworkLerouxTauSquaredUpdate.o multivariatePoissonNetworkLerouxURandomEffectsUpdate.o multivariatePoissonNetworkLerouxVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxVarianceCovarianceUUpdate.o multivariatePoissonNetworkRandAllUpdate.o multivariatePoissonNetworkRandSingleUpdate.o sumMatrix.o univariateBinomialNetworkLerouxAllUpdate.o univariateBinomialNetworkLerouxBetaUpdate.o univariateBinomialNetworkLerouxRhoUpdate.o univariateBinomialNetworkLerouxSigmaSquaredUpdate.o univariateBinomialNetworkLerouxSingleUpdate.o univariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o univariateBinomialNetworkLerouxTauSquaredUpdate.o univariateBinomialNetworkLerouxURandomEffectsUpdate.o univariateGaussianNetworkLerouxAllMHUpdate.o univariateGaussianNetworkLerouxBetaUpdate.o univariateGaussianNetworkLerouxRhoUpdate.o univariateGaussianNetworkLerouxSigmaSquaredEUpdate.o univariateGaussianNetworkLerouxSigmaSquaredUUpdate.o univariateGaussianNetworkLerouxSingleMHUpdate.o univariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o univariateGaussianNetworkLerouxTauSquaredUpdate.o univariateGaussianNetworkLerouxURandomEffectsUpdate.o univariatePoissonNetworkLerouxAllUpdate.o univariatePoissonNetworkLerouxBetaUpdate.o univariatePoissonNetworkLerouxRhoUpdate.o univariatePoissonNetworkLerouxSigmaSquaredUpdate.o univariatePoissonNetworkLerouxSingleUpdate.o univariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o univariatePoissonNetworkLerouxTauSquaredUpdate.o univariatePoissonNetworkLerouxURandomEffectsUpdate.o vectorTransposeVectorMultiplicationRcpp.o vectorVectorTransposeMultiplicationRcpp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/netcmc/old/netcmc.Rcheck/00LOCK-netcmc/00new/netcmc/libs +** R +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘MCMCpack’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘netcmc’ +* removing ‘/tmp/workdir/netcmc/old/netcmc.Rcheck/netcmc’ + + +``` +# newIMVC + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/newIMVC +* Date/Publication: 2024-04-16 14:50:13 UTC +* Number of recursive dependencies: 54 + +Run `revdepcheck::cloud_details(, "newIMVC")` for more info + +
+ +## In both + +* checking whether package ‘newIMVC’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/newIMVC/new/newIMVC.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘newIMVC’ ... +** package ‘newIMVC’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘newIMVC’ +* removing ‘/tmp/workdir/newIMVC/new/newIMVC.Rcheck/newIMVC’ + + +``` +### CRAN + +``` +* installing *source* package ‘newIMVC’ ... +** package ‘newIMVC’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘newIMVC’ +* removing ‘/tmp/workdir/newIMVC/old/newIMVC.Rcheck/newIMVC’ + + +``` +# nlpred + +
+ +* Version: 1.0.1 +* GitHub: NA +* Source code: https://github.com/cran/nlpred +* Date/Publication: 2020-02-23 17:30:05 UTC +* Number of recursive dependencies: 103 + +Run `revdepcheck::cloud_details(, "nlpred")` for more info + +
+ +## In both + +* checking whether package ‘nlpred’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/nlpred/new/nlpred.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘nlpred’ ... +** package ‘nlpred’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘nlpred’ +* removing ‘/tmp/workdir/nlpred/new/nlpred.Rcheck/nlpred’ + + +``` +### CRAN + +``` +* installing *source* package ‘nlpred’ ... +** package ‘nlpred’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘nlpred’ +* removing ‘/tmp/workdir/nlpred/old/nlpred.Rcheck/nlpred’ + + +``` +# NMADiagT + +
+ +* Version: 0.1.2 +* GitHub: NA +* Source code: https://github.com/cran/NMADiagT +* Date/Publication: 2020-02-26 07:00:02 UTC +* Number of recursive dependencies: 78 + +Run `revdepcheck::cloud_details(, "NMADiagT")` for more info + +
+ +## In both + +* checking whether package ‘NMADiagT’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/NMADiagT/new/NMADiagT.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘NMADiagT’ ... +** package ‘NMADiagT’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘NMADiagT’ +* removing ‘/tmp/workdir/NMADiagT/new/NMADiagT.Rcheck/NMADiagT’ + + +``` +### CRAN + +``` +* installing *source* package ‘NMADiagT’ ... +** package ‘NMADiagT’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘NMADiagT’ +* removing ‘/tmp/workdir/NMADiagT/old/NMADiagT.Rcheck/NMADiagT’ + + +``` +# nse + +
+ +* Version: 1.21 +* GitHub: https://github.com/keblu/nse +* Source code: https://github.com/cran/nse +* Date/Publication: 2022-11-10 13:20:02 UTC +* Number of recursive dependencies: 44 + +Run `revdepcheck::cloud_details(, "nse")` for more info + +
+ +## In both + +* checking whether package ‘nse’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/nse/new/nse.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘nse’ ... +** package ‘nse’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c f_boot.cpp -o f_boot.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o nse.so RcppExports.o f_boot.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/nse/new/nse.Rcheck/00LOCK-nse/00new/nse/libs +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘nse’ +* removing ‘/tmp/workdir/nse/new/nse.Rcheck/nse’ + + +``` +### CRAN + +``` +* installing *source* package ‘nse’ ... +** package ‘nse’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c f_boot.cpp -o f_boot.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o nse.so RcppExports.o f_boot.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/nse/old/nse.Rcheck/00LOCK-nse/00new/nse/libs +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘nse’ +* removing ‘/tmp/workdir/nse/old/nse.Rcheck/nse’ + + +``` +# OasisR + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/OasisR +* Number of recursive dependencies: 44 + +Run `revdepcheck::cloud_details(, "OasisR")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# OlinkAnalyze + +
+ +* Version: 4.0.2 +* GitHub: https://github.com/Olink-Proteomics/OlinkRPackage +* Source code: https://github.com/cran/OlinkAnalyze +* Date/Publication: 2024-11-22 16:20:02 UTC +* Number of recursive dependencies: 207 + +Run `revdepcheck::cloud_details(, "OlinkAnalyze")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/OlinkAnalyze/new/OlinkAnalyze.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘OlinkAnalyze/DESCRIPTION’ ... OK +... +--- finished re-building ‘plate_randomizer.Rmd’ + +SUMMARY: processing the following file failed: + ‘Vignett.Rmd’ + +Error: Vignette re-building failed. +Execution halted + +* DONE +Status: 1 ERROR, 2 NOTEs + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/OlinkAnalyze/old/OlinkAnalyze.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘OlinkAnalyze/DESCRIPTION’ ... OK +... +--- finished re-building ‘plate_randomizer.Rmd’ + +SUMMARY: processing the following file failed: + ‘Vignett.Rmd’ + +Error: Vignette re-building failed. +Execution halted + +* DONE +Status: 1 ERROR, 2 NOTEs + + + + + +``` +# paleopop + +
+ +* Version: 2.1.7 +* GitHub: https://github.com/GlobalEcologyLab/paleopop +* Source code: https://github.com/cran/paleopop +* Date/Publication: 2025-01-07 16:20:02 UTC +* Number of recursive dependencies: 102 + +Run `revdepcheck::cloud_details(, "paleopop")` for more info + +
+ +## In both + +* checking whether package ‘paleopop’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/paleopop/new/paleopop.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘paleopop’ ... +** package ‘paleopop’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘paleopop’ +* removing ‘/tmp/workdir/paleopop/new/paleopop.Rcheck/paleopop’ + + +``` +### CRAN + +``` +* installing *source* package ‘paleopop’ ... +** package ‘paleopop’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘paleopop’ +* removing ‘/tmp/workdir/paleopop/old/paleopop.Rcheck/paleopop’ + + +``` +# pammtools + +
+ +* Version: 0.5.93 +* GitHub: https://github.com/adibender/pammtools +* Source code: https://github.com/cran/pammtools +* Date/Publication: 2024-02-25 10:10:02 UTC +* Number of recursive dependencies: 124 + +Run `revdepcheck::cloud_details(, "pammtools")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/pammtools/new/pammtools.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘pammtools/DESCRIPTION’ ... OK +... +* checking data for non-ASCII characters ... OK +* checking LazyData ... OK +* checking data for ASCII and uncompressed saves ... OK +* checking R/sysdata.rda ... OK +* checking examples ... OK +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* DONE +Status: OK + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/pammtools/old/pammtools.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘pammtools/DESCRIPTION’ ... OK +... +* checking data for non-ASCII characters ... OK +* checking LazyData ... OK +* checking data for ASCII and uncompressed saves ... OK +* checking R/sysdata.rda ... OK +* checking examples ... OK +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* DONE +Status: OK + + + + + +``` +# PathwaySpace + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/PathwaySpace +* Number of recursive dependencies: 69 + +Run `revdepcheck::cloud_details(, "PathwaySpace")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# pathwayTMB + +
+ +* Version: 0.1.3 +* GitHub: NA +* Source code: https://github.com/cran/pathwayTMB +* Date/Publication: 2022-08-09 13:50:02 UTC +* Number of recursive dependencies: 223 + +Run `revdepcheck::cloud_details(, "pathwayTMB")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/pathwayTMB/new/pathwayTMB.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘pathwayTMB/DESCRIPTION’ ... OK +... +* this is package ‘pathwayTMB’ version ‘0.1.3’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/pathwayTMB/old/pathwayTMB.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘pathwayTMB/DESCRIPTION’ ... OK +... +* this is package ‘pathwayTMB’ version ‘0.1.3’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# pcvr + +
+ +* Version: 1.1.1.0 +* GitHub: https://github.com/danforthcenter/pcvr +* Source code: https://github.com/cran/pcvr +* Date/Publication: 2024-11-06 20:50:02 UTC +* Number of recursive dependencies: 189 + +Run `revdepcheck::cloud_details(, "pcvr")` for more info + +
+ +## In both + +* checking whether package ‘pcvr’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/pcvr/new/pcvr.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘pcvr’ ... +** package ‘pcvr’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘pcvr’ +* removing ‘/tmp/workdir/pcvr/new/pcvr.Rcheck/pcvr’ + + +``` +### CRAN + +``` +* installing *source* package ‘pcvr’ ... +** package ‘pcvr’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘pcvr’ +* removing ‘/tmp/workdir/pcvr/old/pcvr.Rcheck/pcvr’ + + +``` +# poems + +
+ +* Version: 1.3.1 +* GitHub: https://github.com/GlobalEcologyLab/poems +* Source code: https://github.com/cran/poems +* Date/Publication: 2024-09-19 20:40:03 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "poems")` for more info + +
+ +## In both + +* checking whether package ‘poems’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/poems/new/poems.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘poems’ ... +** package ‘poems’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘poems’ +* removing ‘/tmp/workdir/poems/new/poems.Rcheck/poems’ + + +``` +### CRAN + +``` +* installing *source* package ‘poems’ ... +** package ‘poems’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘poems’ +* removing ‘/tmp/workdir/poems/old/poems.Rcheck/poems’ + + +``` +# popEpi + +
+ +* Version: 0.4.12 +* GitHub: https://github.com/FinnishCancerRegistry/popEpi +* Source code: https://github.com/cran/popEpi +* Date/Publication: 2024-05-10 09:00:02 UTC +* Number of recursive dependencies: 142 + +Run `revdepcheck::cloud_details(, "popEpi")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/popEpi/new/popEpi.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘popEpi/DESCRIPTION’ ... OK +... + Error: Test failures + Execution halted +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘sir.Rmd’ using ‘UTF-8’... OK + ‘survtab_examples.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/popEpi/old/popEpi.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘popEpi/DESCRIPTION’ ... OK +... + Error: Test failures + Execution halted +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘sir.Rmd’ using ‘UTF-8’... OK + ‘survtab_examples.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 ERROR + + + + + +``` +# popstudy + +
+ +* Version: 1.0.1 +* GitHub: NA +* Source code: https://github.com/cran/popstudy +* Date/Publication: 2023-10-17 23:50:02 UTC +* Number of recursive dependencies: 241 + +Run `revdepcheck::cloud_details(, "popstudy")` for more info + +
+ +## In both + +* checking whether package ‘popstudy’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/popstudy/new/popstudy.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘popstudy’ ... +** package ‘popstudy’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘popstudy’ +* removing ‘/tmp/workdir/popstudy/new/popstudy.Rcheck/popstudy’ + + +``` +### CRAN + +``` +* installing *source* package ‘popstudy’ ... +** package ‘popstudy’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘popstudy’ +* removing ‘/tmp/workdir/popstudy/old/popstudy.Rcheck/popstudy’ + + +``` +# powerly + +
+ +* Version: 1.8.6 +* GitHub: https://github.com/mihaiconstantin/powerly +* Source code: https://github.com/cran/powerly +* Date/Publication: 2022-09-09 14:10:01 UTC +* Number of recursive dependencies: 166 + +Run `revdepcheck::cloud_details(, "powerly")` for more info + +
+ +## In both + +* checking whether package ‘powerly’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/powerly/new/powerly.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘powerly’ ... +** package ‘powerly’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘powerly’ +* removing ‘/tmp/workdir/powerly/new/powerly.Rcheck/powerly’ + + +``` +### CRAN + +``` +* installing *source* package ‘powerly’ ... +** package ‘powerly’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘powerly’ +* removing ‘/tmp/workdir/powerly/old/powerly.Rcheck/powerly’ + + +``` +# pre + +
+ +* Version: 1.0.7 +* GitHub: https://github.com/marjoleinF/pre +* Source code: https://github.com/cran/pre +* Date/Publication: 2024-01-12 19:30:02 UTC +* Number of recursive dependencies: 150 + +Run `revdepcheck::cloud_details(, "pre")` for more info + +
+ +## In both + +* checking whether package ‘pre’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/pre/new/pre.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘pre’ ... +** package ‘pre’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘pre’ +* removing ‘/tmp/workdir/pre/new/pre.Rcheck/pre’ + + +``` +### CRAN + +``` +* installing *source* package ‘pre’ ... +** package ‘pre’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘pre’ +* removing ‘/tmp/workdir/pre/old/pre.Rcheck/pre’ + + +``` +# pscore + +
+ +* Version: 0.4.0 +* GitHub: https://github.com/JWiley/score-project +* Source code: https://github.com/cran/pscore +* Date/Publication: 2022-05-13 22:30:02 UTC +* Number of recursive dependencies: 168 + +Run `revdepcheck::cloud_details(, "pscore")` for more info + +
+ +## In both + +* checking whether package ‘pscore’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/pscore/new/pscore.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘pscore’ ... +** package ‘pscore’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘pscore’ +* removing ‘/tmp/workdir/pscore/new/pscore.Rcheck/pscore’ + + +``` +### CRAN + +``` +* installing *source* package ‘pscore’ ... +** package ‘pscore’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘pscore’ +* removing ‘/tmp/workdir/pscore/old/pscore.Rcheck/pscore’ + + +``` +# Publish + +
+ +* Version: 2023.01.17 +* GitHub: NA +* Source code: https://github.com/cran/Publish +* Date/Publication: 2023-01-17 17:40:09 UTC +* Number of recursive dependencies: 122 + +Run `revdepcheck::cloud_details(, "Publish")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/Publish/new/Publish.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘Publish/DESCRIPTION’ ... OK +... + > library(Publish) + Loading required package: prodlim + > library(mitools) + > library(smcfcs) + > library(riskRegression) + Error in library(riskRegression) : + there is no package called 'riskRegression' + Execution halted +* DONE +Status: 2 ERRORs, 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/Publish/old/Publish.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘Publish/DESCRIPTION’ ... OK +... + > library(Publish) + Loading required package: prodlim + > library(mitools) + > library(smcfcs) + > library(riskRegression) + Error in library(riskRegression) : + there is no package called 'riskRegression' + Execution halted +* DONE +Status: 2 ERRORs, 1 NOTE + + + + + +``` +# qris + +
+ +* Version: 1.1.1 +* GitHub: https://github.com/Kyuhyun07/qris +* Source code: https://github.com/cran/qris +* Date/Publication: 2024-03-05 14:40:03 UTC +* Number of recursive dependencies: 54 + +Run `revdepcheck::cloud_details(, "qris")` for more info + +
+ +## In both + +* checking whether package ‘qris’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/qris/new/qris.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘qris’ ... +** package ‘qris’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Amat.cpp -o Amat.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c ghat.cpp -o ghat.o +... +installing to /tmp/workdir/qris/new/qris.Rcheck/00LOCK-qris/00new/qris/libs +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘qris’ +* removing ‘/tmp/workdir/qris/new/qris.Rcheck/qris’ + + +``` +### CRAN + +``` +* installing *source* package ‘qris’ ... +** package ‘qris’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Amat.cpp -o Amat.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c ghat.cpp -o ghat.o +... +installing to /tmp/workdir/qris/old/qris.Rcheck/00LOCK-qris/00new/qris/libs +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘qris’ +* removing ‘/tmp/workdir/qris/old/qris.Rcheck/qris’ + + +``` +# QTOCen + +
+ +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/QTOCen +* Date/Publication: 2019-06-04 12:10:10 UTC +* Number of recursive dependencies: 112 + +Run `revdepcheck::cloud_details(, "QTOCen")` for more info + +
+ +## In both + +* checking whether package ‘QTOCen’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/QTOCen/new/QTOCen.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘QTOCen’ ... +** package ‘QTOCen’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘QTOCen’ +* removing ‘/tmp/workdir/QTOCen/new/QTOCen.Rcheck/QTOCen’ + + +``` +### CRAN + +``` +* installing *source* package ‘QTOCen’ ... +** package ‘QTOCen’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘QTOCen’ +* removing ‘/tmp/workdir/QTOCen/old/QTOCen.Rcheck/QTOCen’ + + +``` +# quantspec + +
+ +* Version: 1.2-4 +* GitHub: https://github.com/tobiaskley/quantspec +* Source code: https://github.com/cran/quantspec +* Date/Publication: 2024-07-11 12:50:02 UTC +* Number of recursive dependencies: 36 + +Run `revdepcheck::cloud_details(, "quantspec")` for more info + +
+ +## In both + +* checking whether package ‘quantspec’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/quantspec/new/quantspec.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘quantspec’ ... +** package ‘quantspec’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c computeCoherency.cpp -o computeCoherency.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c computeSdNaive.cpp -o computeSdNaive.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o quantspec.so RcppExports.o computeCoherency.o computeSdNaive.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/quantspec/new/quantspec.Rcheck/00LOCK-quantspec/00new/quantspec/libs +... +*** moving datasets to lazyload DB +** demo +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘quantspec’ +* removing ‘/tmp/workdir/quantspec/new/quantspec.Rcheck/quantspec’ + + +``` +### CRAN + +``` +* installing *source* package ‘quantspec’ ... +** package ‘quantspec’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c computeCoherency.cpp -o computeCoherency.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c computeSdNaive.cpp -o computeSdNaive.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o quantspec.so RcppExports.o computeCoherency.o computeSdNaive.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/quantspec/old/quantspec.Rcheck/00LOCK-quantspec/00new/quantspec/libs +... +*** moving datasets to lazyload DB +** demo +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘quantspec’ +* removing ‘/tmp/workdir/quantspec/old/quantspec.Rcheck/quantspec’ + + +``` +# quid + +
+ +* Version: 0.0.1 +* GitHub: NA +* Source code: https://github.com/cran/quid +* Date/Publication: 2021-12-09 09:00:02 UTC +* Number of recursive dependencies: 94 + +Run `revdepcheck::cloud_details(, "quid")` for more info + +
+ +## In both + +* checking whether package ‘quid’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/quid/new/quid.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘quid’ ... +** package ‘quid’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘quid’ +* removing ‘/tmp/workdir/quid/new/quid.Rcheck/quid’ + + +``` +### CRAN + +``` +* installing *source* package ‘quid’ ... +** package ‘quid’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘quid’ +* removing ‘/tmp/workdir/quid/old/quid.Rcheck/quid’ + + +``` +# rddtools + +
+ +* Version: 1.6.0 +* GitHub: https://github.com/bquast/rddtools +* Source code: https://github.com/cran/rddtools +* Date/Publication: 2022-01-10 12:42:49 UTC +* Number of recursive dependencies: 105 + +Run `revdepcheck::cloud_details(, "rddtools")` for more info + +
+ +## In both + +* checking whether package ‘rddtools’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/rddtools/new/rddtools.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘rddtools’ ... +** package ‘rddtools’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘rddtools’ +* removing ‘/tmp/workdir/rddtools/new/rddtools.Rcheck/rddtools’ + + +``` +### CRAN + +``` +* installing *source* package ‘rddtools’ ... +** package ‘rddtools’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘rddtools’ +* removing ‘/tmp/workdir/rddtools/old/rddtools.Rcheck/rddtools’ + + +``` +# rdflib + +
+ +* 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: 93 + +Run `revdepcheck::cloud_details(, "rdflib")` for more info + +
+ +## 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: ... 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: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘rdflib’ +* removing ‘/tmp/workdir/rdflib/old/rdflib.Rcheck/rdflib’ + + +``` +# redland + +
+ +* 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 + +
+ +## 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’ + + +``` +# RGraphSpace + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/RGraphSpace +* Number of recursive dependencies: 64 + +Run `revdepcheck::cloud_details(, "RGraphSpace")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# riskRegression + +
+ +* Version: 2023.12.21 +* GitHub: https://github.com/tagteam/riskRegression +* Source code: https://github.com/cran/riskRegression +* Date/Publication: 2023-12-19 17:00:02 UTC +* Number of recursive dependencies: 185 + +Run `revdepcheck::cloud_details(, "riskRegression")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/riskRegression/new/riskRegression.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘riskRegression/DESCRIPTION’ ... OK +... +* this is package ‘riskRegression’ version ‘2023.12.21’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘rms’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/riskRegression/old/riskRegression.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘riskRegression/DESCRIPTION’ ... OK +... +* this is package ‘riskRegression’ version ‘2023.12.21’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘rms’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# rlme + +
+ +* Version: 0.5 +* GitHub: NA +* Source code: https://github.com/cran/rlme +* Date/Publication: 2018-01-09 17:35:55 UTC +* Number of recursive dependencies: 41 + +Run `revdepcheck::cloud_details(, "rlme")` for more info + +
+ +## In both + +* checking whether package ‘rlme’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/rlme/new/rlme.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘rlme’ ... +** package ‘rlme’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c bmat.cpp -o bmat.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c pairup.cpp -o pairup.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c remove_k_smallest.cpp -o remove_k_smallest.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c rhosch.cpp -o rhosch.o +... +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘rlme’ +* removing ‘/tmp/workdir/rlme/new/rlme.Rcheck/rlme’ + + +``` +### CRAN + +``` +* installing *source* package ‘rlme’ ... +** package ‘rlme’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c bmat.cpp -o bmat.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c pairup.cpp -o pairup.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c remove_k_smallest.cpp -o remove_k_smallest.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c rhosch.cpp -o rhosch.o +... +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘rlme’ +* removing ‘/tmp/workdir/rlme/old/rlme.Rcheck/rlme’ + + +``` +# rmlnomogram + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/rmlnomogram +* Number of recursive dependencies: 178 + +Run `revdepcheck::cloud_details(, "rmlnomogram")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# robber + +
+ +* Version: 0.2.4 +* GitHub: https://github.com/Chabert-Liddell/robber +* Source code: https://github.com/cran/robber +* Date/Publication: 2024-02-07 13:50:02 UTC +* Number of recursive dependencies: 143 + +Run `revdepcheck::cloud_details(, "robber")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/robber/new/robber.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘robber/DESCRIPTION’ ... OK +... +* checking tests ... OK + Running ‘spelling.R’ + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘topological-analysis.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/robber/old/robber.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘robber/DESCRIPTION’ ... OK +... +* checking tests ... OK + Running ‘spelling.R’ + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘topological-analysis.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +# robmed + +
+ +* Version: 1.2.0 +* GitHub: https://github.com/aalfons/robmed +* Source code: https://github.com/cran/robmed +* Date/Publication: 2024-12-10 00:00:02 UTC +* Number of recursive dependencies: 59 + +Run `revdepcheck::cloud_details(, "robmed")` for more info + +
+ +## In both + +* checking whether package ‘robmed’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/robmed/new/robmed.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘robmed’ ... +** package ‘robmed’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘robmed’ +* removing ‘/tmp/workdir/robmed/new/robmed.Rcheck/robmed’ + + +``` +### CRAN + +``` +* installing *source* package ‘robmed’ ... +** package ‘robmed’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘robmed’ +* removing ‘/tmp/workdir/robmed/old/robmed.Rcheck/robmed’ + + +``` +# RQdeltaCT + +
+ +* Version: 1.3.0 +* GitHub: NA +* Source code: https://github.com/cran/RQdeltaCT +* Date/Publication: 2024-04-17 15:50:02 UTC +* Number of recursive dependencies: 163 + +Run `revdepcheck::cloud_details(, "RQdeltaCT")` for more info + +
+ +## In both + +* checking whether package ‘RQdeltaCT’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/RQdeltaCT/new/RQdeltaCT.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘RQdeltaCT’ ... +** package ‘RQdeltaCT’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘RQdeltaCT’ +* removing ‘/tmp/workdir/RQdeltaCT/new/RQdeltaCT.Rcheck/RQdeltaCT’ + + +``` +### CRAN + +``` +* installing *source* package ‘RQdeltaCT’ ... +** package ‘RQdeltaCT’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘RQdeltaCT’ +* removing ‘/tmp/workdir/RQdeltaCT/old/RQdeltaCT.Rcheck/RQdeltaCT’ + + +``` +# RRPP + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/RRPP +* Number of recursive dependencies: 67 + +Run `revdepcheck::cloud_details(, "RRPP")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# rstanarm + +
+ +* 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: 137 + +Run `revdepcheck::cloud_details(, "rstanarm")` for more info + +
+ +## 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.2.0-23ubuntu4) 13.2.0’ +using C++17 +"/opt/R/4.3.1/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::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: 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.2.0-23ubuntu4) 13.2.0’ +using C++17 +"/opt/R/4.3.1/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::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: 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’ + + +``` +# scAnnotate + +
+ +* Version: 0.3 +* GitHub: NA +* Source code: https://github.com/cran/scAnnotate +* Date/Publication: 2024-03-14 00:00:02 UTC +* Number of recursive dependencies: 163 + +Run `revdepcheck::cloud_details(, "scAnnotate")` for more info + +
+ +## In both + +* checking whether package ‘scAnnotate’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/scAnnotate/new/scAnnotate.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘scAnnotate’ ... +** package ‘scAnnotate’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘scAnnotate’ +* removing ‘/tmp/workdir/scAnnotate/new/scAnnotate.Rcheck/scAnnotate’ + + +``` +### CRAN + +``` +* installing *source* package ‘scAnnotate’ ... +** package ‘scAnnotate’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘scAnnotate’ +* removing ‘/tmp/workdir/scAnnotate/old/scAnnotate.Rcheck/scAnnotate’ + + +``` +# SCIntRuler + +
+ +* Version: 0.99.6 +* GitHub: https://github.com/yuelyu21/SCIntRuler +* Source code: https://github.com/cran/SCIntRuler +* Date/Publication: 2024-07-12 15:20:08 UTC +* Number of recursive dependencies: 202 + +Run `revdepcheck::cloud_details(, "SCIntRuler")` for more info + +
+ +## In both + +* checking whether package ‘SCIntRuler’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/SCIntRuler/new/SCIntRuler.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘SCIntRuler’ ... +** package ‘SCIntRuler’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c crossdist.cpp -o crossdist.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o SCIntRuler.so RcppExports.o crossdist.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/SCIntRuler/new/SCIntRuler.Rcheck/00LOCK-SCIntRuler/00new/SCIntRuler/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘SCIntRuler’ +* removing ‘/tmp/workdir/SCIntRuler/new/SCIntRuler.Rcheck/SCIntRuler’ + + +``` +### CRAN + +``` +* installing *source* package ‘SCIntRuler’ ... +** package ‘SCIntRuler’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c crossdist.cpp -o crossdist.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o SCIntRuler.so RcppExports.o crossdist.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/SCIntRuler/old/SCIntRuler.Rcheck/00LOCK-SCIntRuler/00new/SCIntRuler/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘SCIntRuler’ +* removing ‘/tmp/workdir/SCIntRuler/old/SCIntRuler.Rcheck/SCIntRuler’ + + +``` +# scMappR + +
+ +* Version: 1.0.11 +* GitHub: NA +* Source code: https://github.com/cran/scMappR +* Date/Publication: 2023-06-30 08:40:08 UTC +* Number of recursive dependencies: 241 + +Run `revdepcheck::cloud_details(, "scMappR")` for more info + +
+ +## In both + +* checking whether package ‘scMappR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/scMappR/new/scMappR.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘scMappR’ ... +** package ‘scMappR’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘scMappR’ +* removing ‘/tmp/workdir/scMappR/new/scMappR.Rcheck/scMappR’ + + +``` +### CRAN + +``` +* installing *source* package ‘scMappR’ ... +** package ‘scMappR’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘scMappR’ +* removing ‘/tmp/workdir/scMappR/old/scMappR.Rcheck/scMappR’ + + +``` +# scperturbR + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/sanderlab/scPerturb +* Source code: https://github.com/cran/scperturbR +* Date/Publication: 2023-03-01 20:10:02 UTC +* Number of recursive dependencies: 161 + +Run `revdepcheck::cloud_details(, "scperturbR")` for more info + +
+ +## In both + +* checking whether package ‘scperturbR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/scperturbR/new/scperturbR.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘scperturbR’ ... +** package ‘scperturbR’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘scperturbR’ +* removing ‘/tmp/workdir/scperturbR/new/scperturbR.Rcheck/scperturbR’ + + +``` +### CRAN + +``` +* installing *source* package ‘scperturbR’ ... +** package ‘scperturbR’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘scperturbR’ +* removing ‘/tmp/workdir/scperturbR/old/scperturbR.Rcheck/scperturbR’ + + +``` +# scpi + +
+ +* Version: 2.2.6 +* GitHub: NA +* Source code: https://github.com/cran/scpi +* Date/Publication: 2024-11-11 23:40:02 UTC +* Number of recursive dependencies: 96 + +Run `revdepcheck::cloud_details(, "scpi")` for more info + +
+ +## In both + +* checking whether package ‘scpi’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/scpi/new/scpi.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘scpi’ ... +** package ‘scpi’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Warning in .recacheSubclasses(def@className, def, env) : + undefined subclass "pcorMatrix" of class "ConstVal"; definition not updated +Warning in .recacheSubclasses(def@className, def, env) : +... +Warning in .recacheSubclasses(def@className, def, env) : + undefined subclass "pcorMatrix" of class "ConstValORExpr"; definition not updated +Warning in .recacheSubclasses(def@className, def, env) : + undefined subclass "pcorMatrix" of class "ConstValORNULL"; definition not updated +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘scpi’ +* removing ‘/tmp/workdir/scpi/new/scpi.Rcheck/scpi’ + + +``` +### CRAN + +``` +* installing *source* package ‘scpi’ ... +** package ‘scpi’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Warning in .recacheSubclasses(def@className, def, env) : + undefined subclass "pcorMatrix" of class "ConstVal"; definition not updated +Warning in .recacheSubclasses(def@className, def, env) : +... +Warning in .recacheSubclasses(def@className, def, env) : + undefined subclass "pcorMatrix" of class "ConstValORExpr"; definition not updated +Warning in .recacheSubclasses(def@className, def, env) : + undefined subclass "pcorMatrix" of class "ConstValORNULL"; definition not updated +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘scpi’ +* removing ‘/tmp/workdir/scpi/old/scpi.Rcheck/scpi’ + + +``` +# SCpubr + +
+ +* Version: 2.0.2 +* GitHub: https://github.com/enblacar/SCpubr +* Source code: https://github.com/cran/SCpubr +* Date/Publication: 2023-10-11 09:50:02 UTC +* Number of recursive dependencies: 301 + +Run `revdepcheck::cloud_details(, "SCpubr")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/SCpubr/new/SCpubr.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘SCpubr/DESCRIPTION’ ... OK +... +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... NONE + ‘reference_manual.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 2 NOTEs + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/SCpubr/old/SCpubr.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘SCpubr/DESCRIPTION’ ... OK +... +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... NONE + ‘reference_manual.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 2 NOTEs + + + + + +``` +# SCRIP + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/thecailab/SCRIP +* Source code: https://github.com/cran/SCRIP +* Date/Publication: 2021-11-19 07:50:02 UTC +* Number of recursive dependencies: 190 + +Run `revdepcheck::cloud_details(, "SCRIP")` for more info + +
+ +## In both + +* checking whether package ‘SCRIP’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/SCRIP/new/SCRIP.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘SCRIP’ ... +** package ‘SCRIP’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘SCRIP’ +* removing ‘/tmp/workdir/SCRIP/new/SCRIP.Rcheck/SCRIP’ + + +``` +### CRAN + +``` +* installing *source* package ‘SCRIP’ ... +** package ‘SCRIP’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘SCRIP’ +* removing ‘/tmp/workdir/SCRIP/old/SCRIP.Rcheck/SCRIP’ + + +``` +# SensIAT + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/SensIAT +* Number of recursive dependencies: 60 + +Run `revdepcheck::cloud_details(, "SensIAT")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# SensMap + +
+ +* Version: 0.7 +* GitHub: https://github.com/IbtihelRebhi/SensMap +* Source code: https://github.com/cran/SensMap +* Date/Publication: 2022-07-04 19:00:02 UTC +* Number of recursive dependencies: 145 + +Run `revdepcheck::cloud_details(, "SensMap")` for more info + +
+ +## In both + +* checking whether package ‘SensMap’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/SensMap/new/SensMap.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘SensMap’ ... +** package ‘SensMap’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘SensMap’ +* removing ‘/tmp/workdir/SensMap/new/SensMap.Rcheck/SensMap’ + + +``` +### CRAN + +``` +* installing *source* package ‘SensMap’ ... +** package ‘SensMap’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘SensMap’ +* removing ‘/tmp/workdir/SensMap/old/SensMap.Rcheck/SensMap’ + + +``` +# Seurat + +
+ +* Version: 5.1.0 +* GitHub: https://github.com/satijalab/seurat +* Source code: https://github.com/cran/Seurat +* Date/Publication: 2024-05-10 17:23:17 UTC +* Number of recursive dependencies: 265 + +Run `revdepcheck::cloud_details(, "Seurat")` for more info + +
+ +## In both + +* checking whether package ‘Seurat’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/Seurat/new/Seurat.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘Seurat’ ... +** package ‘Seurat’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -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/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c ModularityOptimizer.cpp -o ModularityOptimizer.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -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/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RModularityOptimizer.cpp -o RModularityOptimizer.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Execution halted +ERROR: lazy loading failed for package ‘Seurat’ +* removing ‘/tmp/workdir/Seurat/new/Seurat.Rcheck/Seurat’ + + +``` +### CRAN + +``` +* installing *source* package ‘Seurat’ ... +** package ‘Seurat’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -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/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c ModularityOptimizer.cpp -o ModularityOptimizer.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -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/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RModularityOptimizer.cpp -o RModularityOptimizer.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Execution halted +ERROR: lazy loading failed for package ‘Seurat’ +* removing ‘/tmp/workdir/Seurat/old/Seurat.Rcheck/Seurat’ + + +``` +# shinyTempSignal + +
+ +* Version: 0.0.8 +* GitHub: https://github.com/YuLab-SMU/shinyTempSignal +* Source code: https://github.com/cran/shinyTempSignal +* Date/Publication: 2024-03-06 08:00:02 UTC +* Number of recursive dependencies: 134 + +Run `revdepcheck::cloud_details(, "shinyTempSignal")` for more info + +
+ +## In both + +* checking whether package ‘shinyTempSignal’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/shinyTempSignal/new/shinyTempSignal.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘shinyTempSignal’ ... +** package ‘shinyTempSignal’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘shinyTempSignal’ +* removing ‘/tmp/workdir/shinyTempSignal/new/shinyTempSignal.Rcheck/shinyTempSignal’ + + +``` +### CRAN + +``` +* installing *source* package ‘shinyTempSignal’ ... +** package ‘shinyTempSignal’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘shinyTempSignal’ +* removing ‘/tmp/workdir/shinyTempSignal/old/shinyTempSignal.Rcheck/shinyTempSignal’ + + +``` +# Signac + +
+ +* Version: 1.14.0 +* GitHub: https://github.com/stuart-lab/signac +* Source code: https://github.com/cran/Signac +* Date/Publication: 2024-08-21 07:40:02 UTC +* Number of recursive dependencies: 246 + +Run `revdepcheck::cloud_details(, "Signac")` for more info + +
+ +## In both + +* checking whether package ‘Signac’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/Signac/new/Signac.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘Signac’ ... +** package ‘Signac’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c filter.cpp -o filter.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c group.cpp -o group.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c split.cpp -o split.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c validate.cpp -o validate.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Signac’ +* removing ‘/tmp/workdir/Signac/new/Signac.Rcheck/Signac’ + + +``` +### CRAN + +``` +* installing *source* package ‘Signac’ ... +** package ‘Signac’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c filter.cpp -o filter.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c group.cpp -o group.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c split.cpp -o split.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c validate.cpp -o validate.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Signac’ +* removing ‘/tmp/workdir/Signac/old/Signac.Rcheck/Signac’ + + +``` +# SimplyAgree + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/arcaldwell49/SimplyAgree +* Source code: https://github.com/cran/SimplyAgree +* Date/Publication: 2024-03-21 14:20:06 UTC +* Number of recursive dependencies: 115 + +Run `revdepcheck::cloud_details(, "SimplyAgree")` for more info + +
+ +## In both + +* checking whether package ‘SimplyAgree’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/SimplyAgree/new/SimplyAgree.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘SimplyAgree’ ... +** package ‘SimplyAgree’ 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 +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘SimplyAgree’ +* removing ‘/tmp/workdir/SimplyAgree/new/SimplyAgree.Rcheck/SimplyAgree’ + + +``` +### CRAN + +``` +* installing *source* package ‘SimplyAgree’ ... +** package ‘SimplyAgree’ 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 +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘SimplyAgree’ +* removing ‘/tmp/workdir/SimplyAgree/old/SimplyAgree.Rcheck/SimplyAgree’ + + +``` +# SNPassoc + +
+ +* Version: 2.1-2 +* GitHub: https://github.com/isglobal-brge/SNPassoc +* Source code: https://github.com/cran/SNPassoc +* Date/Publication: 2024-10-28 17:30:02 UTC +* Number of recursive dependencies: 164 + +Run `revdepcheck::cloud_details(, "SNPassoc")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/SNPassoc/new/SNPassoc.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘SNPassoc/DESCRIPTION’ ... OK +... +* this is package ‘SNPassoc’ version ‘2.1-2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘haplo.stats’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/SNPassoc/old/SNPassoc.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘SNPassoc/DESCRIPTION’ ... OK +... +* this is package ‘SNPassoc’ version ‘2.1-2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘haplo.stats’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# snplinkage + +
+ +* Version: 1.2.0 +* GitHub: NA +* Source code: https://github.com/cran/snplinkage +* Date/Publication: 2024-09-09 19:10:02 UTC +* Number of recursive dependencies: 152 + +Run `revdepcheck::cloud_details(, "snplinkage")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/snplinkage/new/snplinkage.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘snplinkage/DESCRIPTION’ ... OK +... +* this is package ‘snplinkage’ version ‘1.2.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘GWASTools’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/snplinkage/old/snplinkage.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘snplinkage/DESCRIPTION’ ... OK +... +* this is package ‘snplinkage’ version ‘1.2.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘GWASTools’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# ssdGSA + +
+ +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/ssdGSA +* Date/Publication: 2024-07-26 23:10:02 UTC +* Number of recursive dependencies: 174 + +Run `revdepcheck::cloud_details(, "ssdGSA")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/ssdGSA/new/ssdGSA.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘ssdGSA/DESCRIPTION’ ... OK +... +* this is package ‘ssdGSA’ version ‘0.1.1’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/ssdGSA/old/ssdGSA.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘ssdGSA/DESCRIPTION’ ... OK +... +* this is package ‘ssdGSA’ version ‘0.1.1’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# stabiliser + +
+ +* Version: 1.0.6 +* GitHub: NA +* Source code: https://github.com/cran/stabiliser +* Date/Publication: 2023-05-17 11:00:05 UTC +* Number of recursive dependencies: 148 + +Run `revdepcheck::cloud_details(, "stabiliser")` for more info + +
+ +## In both + +* checking whether package ‘stabiliser’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/stabiliser/new/stabiliser.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘stabiliser’ ... +** package ‘stabiliser’ 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 loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘maditr’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: lazy loading failed for package ‘stabiliser’ +* removing ‘/tmp/workdir/stabiliser/new/stabiliser.Rcheck/stabiliser’ + + +``` +### CRAN + +``` +* installing *source* package ‘stabiliser’ ... +** package ‘stabiliser’ 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 loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘maditr’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: lazy loading failed for package ‘stabiliser’ +* removing ‘/tmp/workdir/stabiliser/old/stabiliser.Rcheck/stabiliser’ + + +``` +# statsr + +
+ +* Version: 0.3.0 +* GitHub: https://github.com/StatsWithR/statsr +* Source code: https://github.com/cran/statsr +* Date/Publication: 2021-01-22 20:40:03 UTC +* Number of recursive dependencies: 96 + +Run `revdepcheck::cloud_details(, "statsr")` for more info + +
+ +## In both + +* checking whether package ‘statsr’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/statsr/new/statsr.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘statsr’ ... +** package ‘statsr’ 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: package or namespace load failed for ‘BayesFactor’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘statsr’ +* removing ‘/tmp/workdir/statsr/new/statsr.Rcheck/statsr’ + + +``` +### CRAN + +``` +* installing *source* package ‘statsr’ ... +** package ‘statsr’ 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: package or namespace load failed for ‘BayesFactor’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘statsr’ +* removing ‘/tmp/workdir/statsr/old/statsr.Rcheck/statsr’ + + +``` +# stR + +
+ +* Version: 0.7 +* GitHub: https://github.com/robjhyndman/stR +* Source code: https://github.com/cran/stR +* Date/Publication: 2024-07-28 13:30:01 UTC +* Number of recursive dependencies: 190 + +Run `revdepcheck::cloud_details(, "stR")` for more info + +
+ +## In both + +* checking whether package ‘stR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/stR/new/stR.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘stR’ ... +** package ‘stR’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘stR’ +* removing ‘/tmp/workdir/stR/new/stR.Rcheck/stR’ + + +``` +### CRAN + +``` +* installing *source* package ‘stR’ ... +** package ‘stR’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘stR’ +* removing ‘/tmp/workdir/stR/old/stR.Rcheck/stR’ + + +``` +# survcompare + +
+ +* Version: 0.2.0 +* GitHub: NA +* Source code: https://github.com/cran/survcompare +* Date/Publication: 2024-10-05 17:00:01 UTC +* Number of recursive dependencies: 155 + +Run `revdepcheck::cloud_details(, "survcompare")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/survcompare/new/survcompare.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘survcompare/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘survcompare_application.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/survcompare/old/survcompare.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘survcompare/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘survcompare_application.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +# survex + +
+ +* Version: 1.2.0 +* GitHub: https://github.com/ModelOriented/survex +* Source code: https://github.com/cran/survex +* Date/Publication: 2023-10-24 18:50:07 UTC +* Number of recursive dependencies: 182 + +Run `revdepcheck::cloud_details(, "survex")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/survex/new/survex.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘survex/DESCRIPTION’ ... OK +... +  A new explainer has been created!  +> +> y <- cph_exp$y +> times <- cph_exp$times +> surv <- cph_exp$predict_survival_function(cph, cph_exp$data, times) +Error in loadNamespace(x) : there is no package called ‘riskRegression’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +* DONE +Status: 1 ERROR, 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/survex/old/survex.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘survex/DESCRIPTION’ ... OK +... +  A new explainer has been created!  +> +> y <- cph_exp$y +> times <- cph_exp$times +> surv <- cph_exp$predict_survival_function(cph, cph_exp$data, times) +Error in loadNamespace(x) : there is no package called ‘riskRegression’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +* DONE +Status: 1 ERROR, 1 NOTE + + + + + +``` +# survHE + +
+ +* Version: 2.0.2 +* GitHub: https://github.com/giabaio/survHE +* Source code: https://github.com/cran/survHE +* Date/Publication: 2024-10-04 09:50:02 UTC +* Number of recursive dependencies: 129 + +Run `revdepcheck::cloud_details(, "survHE")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/survHE/new/survHE.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘survHE/DESCRIPTION’ ... OK +... +* checking package dependencies ... ERROR +Package required but not available: ‘rms’ + +Packages suggested but not available for checking: + 'survHEinla', 'survHEhmc' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/survHE/old/survHE.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘survHE/DESCRIPTION’ ... OK +... +* checking package dependencies ... ERROR +Package required but not available: ‘rms’ + +Packages suggested but not available for checking: + 'survHEinla', 'survHEhmc' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# TDA + +
+ +* Version: 1.9.1 +* GitHub: NA +* Source code: https://github.com/cran/TDA +* Date/Publication: 2024-01-24 15:42:47 UTC +* Number of recursive dependencies: 54 + +Run `revdepcheck::cloud_details(, "TDA")` for more info + +
+ +## In both + +* checking whether package ‘TDA’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/TDA/new/TDA.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘TDA’ ... +** package ‘TDA’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +/bin/sh: 1: clang++: not found +expr: syntax error: unexpected argument ‘50000’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +/bin/sh: 1: clang++: not found +expr: syntax error: unexpected argument ‘50000’ +... +./CGAL/NewKernel_d/Kernel_d_interface.h:167:94: required from ‘CGAL::Kernel_d_interface::FT CGAL::Kernel_d_interface::Compute_squared_radius_d::operator()(I, I) const [with I = __gnu_cxx::__normal_iterator >*, std::vector >, std::allocator > > > >; Base_ = CGAL::Cartesian_wrap, CGAL::Epick_d >; CGAL::Kernel_d_interface::FT = double]’ +./gudhi/Alpha_complex/Alpha_kernel_d.h:73:53: required from ‘Gudhi::alpha_complex::Alpha_kernel_d::FT Gudhi::alpha_complex::Alpha_kernel_d::get_squared_radius(PointIterator, PointIterator) const [with PointIterator = __gnu_cxx::__normal_iterator >*, std::vector >, std::allocator > > > >; Kernel = CGAL::Epick_d; FT = double]’ +./gudhi/Alpha_complex.h:339:38: required from ‘auto Gudhi::alpha_complex::Alpha_complex::radius(SimplicialComplexForAlpha&, typename SimplicialComplexForAlpha::Simplex_handle) [with SimplicialComplexForAlpha = Gudhi::Simplex_tree<>; Kernel = CGAL::Epick_d; bool Weighted = false; typename SimplicialComplexForAlpha::Simplex_handle = boost::container::vec_iterator > >*, false>]’ +./gudhi/Alpha_complex.h:438:43: required from ‘bool Gudhi::alpha_complex::Alpha_complex::create_complex(SimplicialComplexForAlpha&, Filtration_value, bool, bool) [with SimplicialComplexForAlpha = Gudhi::Simplex_tree<>; Filtration_value = double; Kernel = CGAL::Epick_d; bool Weighted = false]’ +./tdautils/gudhiUtils.h:390:45: required from ‘SimplexTree AlphaComplexFiltrationGudhi(const RealMatrix&, bool, Print&) [with SimplexTree = Gudhi::Simplex_tree<>; RealMatrix = Rcpp::Matrix<14>; Print = void(const char*, ...)]’ +diag.cpp:492:59: 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::type’ {aka ‘__m128d’} [-Wignored-attributes] +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:200: diag.o] Error 1 +ERROR: compilation failed for package ‘TDA’ +* removing ‘/tmp/workdir/TDA/new/TDA.Rcheck/TDA’ + + +``` +### CRAN + +``` +* installing *source* package ‘TDA’ ... +** package ‘TDA’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +/bin/sh: 1: clang++: not found +expr: syntax error: unexpected argument ‘50000’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +/bin/sh: 1: clang++: not found +expr: syntax error: unexpected argument ‘50000’ +... +./CGAL/NewKernel_d/Kernel_d_interface.h:167:94: required from ‘CGAL::Kernel_d_interface::FT CGAL::Kernel_d_interface::Compute_squared_radius_d::operator()(I, I) const [with I = __gnu_cxx::__normal_iterator >*, std::vector >, std::allocator > > > >; Base_ = CGAL::Cartesian_wrap, CGAL::Epick_d >; CGAL::Kernel_d_interface::FT = double]’ +./gudhi/Alpha_complex/Alpha_kernel_d.h:73:53: required from ‘Gudhi::alpha_complex::Alpha_kernel_d::FT Gudhi::alpha_complex::Alpha_kernel_d::get_squared_radius(PointIterator, PointIterator) const [with PointIterator = __gnu_cxx::__normal_iterator >*, std::vector >, std::allocator > > > >; Kernel = CGAL::Epick_d; FT = double]’ +./gudhi/Alpha_complex.h:339:38: required from ‘auto Gudhi::alpha_complex::Alpha_complex::radius(SimplicialComplexForAlpha&, typename SimplicialComplexForAlpha::Simplex_handle) [with SimplicialComplexForAlpha = Gudhi::Simplex_tree<>; Kernel = CGAL::Epick_d; bool Weighted = false; typename SimplicialComplexForAlpha::Simplex_handle = boost::container::vec_iterator > >*, false>]’ +./gudhi/Alpha_complex.h:438:43: required from ‘bool Gudhi::alpha_complex::Alpha_complex::create_complex(SimplicialComplexForAlpha&, Filtration_value, bool, bool) [with SimplicialComplexForAlpha = Gudhi::Simplex_tree<>; Filtration_value = double; Kernel = CGAL::Epick_d; bool Weighted = false]’ +./tdautils/gudhiUtils.h:390:45: required from ‘SimplexTree AlphaComplexFiltrationGudhi(const RealMatrix&, bool, Print&) [with SimplexTree = Gudhi::Simplex_tree<>; RealMatrix = Rcpp::Matrix<14>; Print = void(const char*, ...)]’ +diag.cpp:492:59: 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::type’ {aka ‘__m128d’} [-Wignored-attributes] +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:200: diag.o] Error 1 +ERROR: compilation failed for package ‘TDA’ +* removing ‘/tmp/workdir/TDA/old/TDA.Rcheck/TDA’ + + +``` +# TestAnaAPP + +
+ +* 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: 252 + +Run `revdepcheck::cloud_details(, "TestAnaAPP")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/TestAnaAPP/new/TestAnaAPP.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘TestAnaAPP/DESCRIPTION’ ... OK +... +* this is package ‘TestAnaAPP’ version ‘1.1.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘lordif’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/TestAnaAPP/old/TestAnaAPP.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘TestAnaAPP/DESCRIPTION’ ... OK +... +* this is package ‘TestAnaAPP’ version ‘1.1.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘lordif’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# tidyEdSurvey + +
+ +* Version: 0.1.3 +* GitHub: NA +* Source code: https://github.com/cran/tidyEdSurvey +* Date/Publication: 2024-05-14 20:20:03 UTC +* Number of recursive dependencies: 110 + +Run `revdepcheck::cloud_details(, "tidyEdSurvey")` for more info + +
+ +## In both + +* checking whether package ‘tidyEdSurvey’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/tidyEdSurvey/new/tidyEdSurvey.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘tidyEdSurvey’ ... +** package ‘tidyEdSurvey’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘EdSurvey’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +In addition: Warning message: +In check_dep_version() : ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Execution halted +ERROR: lazy loading failed for package ‘tidyEdSurvey’ +* removing ‘/tmp/workdir/tidyEdSurvey/new/tidyEdSurvey.Rcheck/tidyEdSurvey’ + + +``` +### CRAN + +``` +* installing *source* package ‘tidyEdSurvey’ ... +** package ‘tidyEdSurvey’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘EdSurvey’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +In addition: Warning message: +In check_dep_version() : ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Execution halted +ERROR: lazy loading failed for package ‘tidyEdSurvey’ +* removing ‘/tmp/workdir/tidyEdSurvey/old/tidyEdSurvey.Rcheck/tidyEdSurvey’ + + +``` +# tidyseurat + +
+ +* Version: 0.8.0 +* GitHub: https://github.com/stemangiola/tidyseurat +* Source code: https://github.com/cran/tidyseurat +* Date/Publication: 2024-01-10 04:50:02 UTC +* Number of recursive dependencies: 196 + +Run `revdepcheck::cloud_details(, "tidyseurat")` for more info + +
+ +## In both + +* checking whether package ‘tidyseurat’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/tidyseurat/new/tidyseurat.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘tidyseurat’ ... +** package ‘tidyseurat’ 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: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Execution halted +ERROR: lazy loading failed for package ‘tidyseurat’ +* removing ‘/tmp/workdir/tidyseurat/new/tidyseurat.Rcheck/tidyseurat’ + + +``` +### CRAN + +``` +* installing *source* package ‘tidyseurat’ ... +** package ‘tidyseurat’ 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: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Execution halted +ERROR: lazy loading failed for package ‘tidyseurat’ +* removing ‘/tmp/workdir/tidyseurat/old/tidyseurat.Rcheck/tidyseurat’ + + +``` +# tidyvpc + +
+ +* Version: 1.5.2 +* GitHub: https://github.com/certara/tidyvpc +* Source code: https://github.com/cran/tidyvpc +* Date/Publication: 2024-11-21 23:10:02 UTC +* Number of recursive dependencies: 180 + +Run `revdepcheck::cloud_details(, "tidyvpc")` for more info + +
+ +## In both + +* checking whether package ‘tidyvpc’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/tidyvpc/new/tidyvpc.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘tidyvpc’ ... +** package ‘tidyvpc’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘tidyvpc’ +* removing ‘/tmp/workdir/tidyvpc/new/tidyvpc.Rcheck/tidyvpc’ + + +``` +### CRAN + +``` +* installing *source* package ‘tidyvpc’ ... +** package ‘tidyvpc’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘tidyvpc’ +* removing ‘/tmp/workdir/tidyvpc/old/tidyvpc.Rcheck/tidyvpc’ + + +``` +# tinyarray + +
+ +* Version: 2.4.2 +* GitHub: https://github.com/xjsun1221/tinyarray +* Source code: https://github.com/cran/tinyarray +* Date/Publication: 2024-06-13 14:20:02 UTC +* Number of recursive dependencies: 247 + +Run `revdepcheck::cloud_details(, "tinyarray")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/tinyarray/new/tinyarray.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘tinyarray/DESCRIPTION’ ... OK +... +* this is package ‘tinyarray’ version ‘2.4.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/tinyarray/old/tinyarray.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘tinyarray/DESCRIPTION’ ... OK +... +* this is package ‘tinyarray’ version ‘2.4.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# tramicp + +
+ +* Version: 0.0-2 +* GitHub: NA +* Source code: https://github.com/cran/tramicp +* Date/Publication: 2024-03-14 15:30:02 UTC +* Number of recursive dependencies: 58 + +Run `revdepcheck::cloud_details(, "tramicp")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/tramicp/new/tramicp.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘tramicp/DESCRIPTION’ ... OK +... +* this is package ‘tramicp’ version ‘0.0-2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'tram', 'mlt', 'cotram' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/tramicp/old/tramicp.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘tramicp/DESCRIPTION’ ... OK +... +* this is package ‘tramicp’ version ‘0.0-2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'tram', 'mlt', 'cotram' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# tramvs + +
+ +* Version: 0.0-6 +* GitHub: NA +* Source code: https://github.com/cran/tramvs +* Date/Publication: 2024-09-04 13:50:02 UTC +* Number of recursive dependencies: 104 + +Run `revdepcheck::cloud_details(, "tramvs")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/tramvs/new/tramvs.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘tramvs/DESCRIPTION’ ... OK +... +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'tram', 'cotram' + +Package suggested but not available for checking: ‘mlt’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/tramvs/old/tramvs.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘tramvs/DESCRIPTION’ ... OK +... +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'tram', 'cotram' + +Package suggested but not available for checking: ‘mlt’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# treeclim + +
+ +* Version: 2.0.7.1 +* GitHub: https://github.com/cszang/treeclim +* Source code: https://github.com/cran/treeclim +* Date/Publication: 2024-12-16 16:20:02 UTC +* Number of recursive dependencies: 60 + +Run `revdepcheck::cloud_details(, "treeclim")` for more info + +
+ +## In both + +* checking whether package ‘treeclim’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/treeclim/new/treeclim.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘treeclim’ ... +** package ‘treeclim’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun.cpp -o corfun.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_exact.cpp -o corfun_exact.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_noboot.cpp -o corfun_noboot.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c pcor.cpp -o pcor.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘treeclim’ +* removing ‘/tmp/workdir/treeclim/new/treeclim.Rcheck/treeclim’ + + +``` +### CRAN + +``` +* installing *source* package ‘treeclim’ ... +** package ‘treeclim’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun.cpp -o corfun.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_exact.cpp -o corfun_exact.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_noboot.cpp -o corfun_noboot.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c pcor.cpp -o pcor.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘treeclim’ +* removing ‘/tmp/workdir/treeclim/old/treeclim.Rcheck/treeclim’ + + +``` +# TriDimRegression + +
+ +* 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: 98 + +Run `revdepcheck::cloud_details(, "TriDimRegression")` for more info + +
+ +## 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’ + + +``` +# TSrepr + +
+ +* Version: 1.1.0 +* GitHub: https://github.com/PetoLau/TSrepr +* Source code: https://github.com/cran/TSrepr +* Date/Publication: 2020-07-13 06:50:15 UTC +* Number of recursive dependencies: 71 + +Run `revdepcheck::cloud_details(, "TSrepr")` for more info + +
+ +## In both + +* checking whether package ‘TSrepr’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/TSrepr/new/TSrepr.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘TSrepr’ ... +** package ‘TSrepr’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c FeatureClippingTrending.cpp -o FeatureClippingTrending.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c helpers.cpp -o helpers.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c measures.cpp -o measures.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c normalizations.cpp -o normalizations.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘TSrepr’ +* removing ‘/tmp/workdir/TSrepr/new/TSrepr.Rcheck/TSrepr’ + + +``` +### CRAN + +``` +* installing *source* package ‘TSrepr’ ... +** package ‘TSrepr’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c FeatureClippingTrending.cpp -o FeatureClippingTrending.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c helpers.cpp -o helpers.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c measures.cpp -o measures.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c normalizations.cpp -o normalizations.o +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘TSrepr’ +* removing ‘/tmp/workdir/TSrepr/old/TSrepr.Rcheck/TSrepr’ + + +``` +# vcfppR + +
+ +* Version: 0.7.1 +* GitHub: https://github.com/Zilong-Li/vcfppR +* Source code: https://github.com/cran/vcfppR +* Date/Publication: 2024-12-26 12:20:02 UTC +* Number of recursive dependencies: 42 + +Run `revdepcheck::cloud_details(, "vcfppR")` for more info + +
+ +## In both + +* checking whether package ‘vcfppR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/vcfppR/new/vcfppR.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘vcfppR’ ... +** package ‘vcfppR’ successfully unpacked and MD5 sums checked +** using staged installation +Configuring HTSlib in src/htslib-1.21 +checking for gcc... gcc +checking whether the C compiler works... yes +checking for C compiler default output file name... a.out +checking for suffix of executables... +checking whether we are cross compiling... no +checking for suffix of object files... o +... +** building package indices +** installing vignettes +** testing if installed package can be loaded from temporary location +Error: package or namespace load failed for ‘vcfppR’ in dyn.load(file, DLLpath = DLLpath, ...): + unable to load shared object '/tmp/workdir/vcfppR/new/vcfppR.Rcheck/00LOCK-vcfppR/00new/vcfppR/libs/vcfppR.so': + /tmp/workdir/vcfppR/new/vcfppR.Rcheck/00LOCK-vcfppR/00new/vcfppR/libs/vcfppR.so: undefined symbol: libdeflate_free_compressor +Error: loading failed +Execution halted +ERROR: loading failed +* removing ‘/tmp/workdir/vcfppR/new/vcfppR.Rcheck/vcfppR’ + + +``` +### CRAN + +``` +* installing *source* package ‘vcfppR’ ... +** package ‘vcfppR’ successfully unpacked and MD5 sums checked +** using staged installation +Configuring HTSlib in src/htslib-1.21 +checking for gcc... gcc +checking whether the C compiler works... yes +checking for C compiler default output file name... a.out +checking for suffix of executables... +checking whether we are cross compiling... no +checking for suffix of object files... o +... +** building package indices +** installing vignettes +** testing if installed package can be loaded from temporary location +Error: package or namespace load failed for ‘vcfppR’ in dyn.load(file, DLLpath = DLLpath, ...): + unable to load shared object '/tmp/workdir/vcfppR/old/vcfppR.Rcheck/00LOCK-vcfppR/00new/vcfppR/libs/vcfppR.so': + /tmp/workdir/vcfppR/old/vcfppR.Rcheck/00LOCK-vcfppR/00new/vcfppR/libs/vcfppR.so: undefined symbol: libdeflate_free_compressor +Error: loading failed +Execution halted +ERROR: loading failed +* removing ‘/tmp/workdir/vcfppR/old/vcfppR.Rcheck/vcfppR’ + + +``` +# VecDep + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/VecDep +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "VecDep")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# visa + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/kang-yu/visa +* Source code: https://github.com/cran/visa +* Date/Publication: 2021-04-20 07:20:02 UTC +* Number of recursive dependencies: 139 + +Run `revdepcheck::cloud_details(, "visa")` for more info + +
+ +## In both + +* checking whether package ‘visa’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/visa/new/visa.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘visa’ ... +** package ‘visa’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘visa’ +* removing ‘/tmp/workdir/visa/new/visa.Rcheck/visa’ + + +``` +### CRAN + +``` +* installing *source* package ‘visa’ ... +** package ‘visa’ 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 loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘visa’ +* removing ‘/tmp/workdir/visa/old/visa.Rcheck/visa’ + + +``` +# wally + +
+ +* Version: 1.0.10 +* GitHub: NA +* Source code: https://github.com/cran/wally +* Date/Publication: 2019-10-30 14:40:02 UTC +* Number of recursive dependencies: 116 + +Run `revdepcheck::cloud_details(, "wally")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/wally/new/wally.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘wally/DESCRIPTION’ ... OK +... +* checking extension type ... Package +* this is package ‘wally’ version ‘1.0.10’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/wally/old/wally.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘wally/DESCRIPTION’ ... OK +... +* checking extension type ... Package +* this is package ‘wally’ version ‘1.0.10’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# zen4R + +
+ +* Version: 0.10 +* GitHub: https://github.com/eblondel/zen4R +* Source code: https://github.com/cran/zen4R +* Date/Publication: 2024-06-05 16:50:02 UTC +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "zen4R")` for more info + +
+ +## 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: ... 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: ... 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..7a0825a9a 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -1,14 +1,14 @@ -# arrow +# aws.comprehend
-* 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
@@ -19,52 +19,152 @@ 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.3.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 + ``` + +# bindr + +
+ +* 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 + +
+ +## 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 ════════════════════════════════════════════════════════════════ ... - `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-error.R:9:3 + 2. └─lifecycle::deprecate_stop("3.3.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 + ``` + +# civis + +
+ +* Version: 3.1.2 +* GitHub: https://github.com/civisanalytics/civis-r +* Source code: https://github.com/cran/civis +* Date/Publication: 2023-03-31 08:00:03 UTC +* Number of recursive dependencies: 88 + +Run `revdepcheck::cloud_details(, "civis")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(civis) + > + > test_check("civis") + [ FAIL 139 | WARN 2 | SKIP 0 | PASS 370 ] - `actual` is an R6 object of class - `expected` is a logical vector (TRUE) + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test_utils.R:53:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) - [ FAIL 5 | WARN 0 | SKIP 84 | PASS 6663 ] + [ FAIL 139 | WARN 2 | SKIP 0 | PASS 370 ] Error: Test failures Execution halted ``` ## In both -* checking installed package size ... NOTE +* checking running R code from vignettes ... ERROR ``` - installed size is 124.1Mb - sub-directories of 1Mb or more: - R 7.5Mb - libs 115.9Mb + Errors in running code in vignettes: + when running code in ‘civis_scripts.Rmd’ + ... + + > knitr::opts_chunk$set(collapse = TRUE, comment = "#>", + + eval = FALSE) + + > script <- scripts_post_containers(required_resources = list(cpu = 1024, + + memory = 50, diskSpace = 15), docker_command = "cd /package_dir && Rs ..." ... [TRUNCATED] + + When sourcing ‘civis_scripts.R’: + Error: could not find function "scripts_post_containers" + Execution halted + + ‘civis_ml.Rmd’ using ‘UTF-8’... OK + ‘civis_scripts.Rmd’ using ‘UTF-8’... failed + ‘concurrency.Rmd’ using ‘UTF-8’... OK + ‘data_import_and_export.Rmd’ using ‘UTF-8’... OK + ‘quick_start.Rmd’ using ‘UTF-8’... OK ``` -* checking Rd cross-references ... NOTE +* checking installed package size ... NOTE ``` - Package unavailable to check Rd xrefs: ‘readr’ + installed size is 5.8Mb + sub-directories of 1Mb or more: + R 1.5Mb + help 3.6Mb ``` -# epiCo +# conflr
-* 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.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(, "epiCo")` for more info +Run `revdepcheck::cloud_details(, "conflr")` for more info
@@ -75,88 +175,139 @@ 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. + > # Copyright (C) 2019 LINE Corporation > # - > # 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 + > # 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::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-utils.R:93:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) - [ FAIL 1 | WARN 8 | SKIP 0 | PASS 114 ] + [ FAIL 14 | WARN 0 | SKIP 4 | PASS 92 ] Error: Test failures Execution halted ``` ## In both -* checking installed package size ... NOTE +* checking dependencies in R code ... NOTE ``` - installed size is 6.2Mb - sub-directories of 1Mb or more: - data 2.0Mb - extdata 2.9Mb + Namespace in Imports field not imported from: ‘R6’ + All declared Imports should be used. ``` -# ieegio +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# countdown
-* 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: 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(, "ieegio")` for more info +Run `revdepcheck::cloud_details(, "countdown")` for more info
## Newly broken -* checking examples ... ERROR +* checking tests ... ERROR ``` - Running examples in ‘ieegio-Ex.R’ failed - The error most likely occurred in: - - > ### 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 + 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) ═══════════════════════════════════════════════════════════ ... - + # clean up - + unlink(f) - + unlink(f2) - + - + } - - Warning in check_forbidden_install("Conda Environments") : - cannot install Conda Environments during R CMD check - Error: Unable to find conda binary. Is Anaconda installed? - Execution halted + Backtrace: + ▆ + 1. └─testthat::with_mock(requireNamespace = function(...) FALSE, expect_error(countdown_app())) at test-shiny.R:7:5 + 2. └─lifecycle::deprecate_stop("3.3.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’ ``` -# madrat +# covr
* 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 +* 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 + +
+ +## Newly broken -Run `revdepcheck::cloud_details(, "madrat")` for more info +* 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.3.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 + ``` + +# crossmap + +
+ +* Version: 0.4.0 +* GitHub: https://github.com/rossellhayes/crossmap +* Source code: https://github.com/cran/crossmap +* Date/Publication: 2023-01-12 21:50:02 UTC +* Number of recursive dependencies: 60 + +Run `revdepcheck::cloud_details(, "crossmap")` for more info
@@ -168,36 +319,77 @@ 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(crossmap) > - > test_check("madrat") - [ FAIL 3 | WARN 2 | SKIP 8 | PASS 581 ] + > test_check("crossmap") + [ FAIL 4 | WARN 2 | SKIP 0 | PASS 379 ] + ══ Failed tests ════════════════════════════════════════════════════════════════ ... + Backtrace: + ▆ + 1. └─testthat::local_mock(...) at test-errors.R:24:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "local_mock()", "local_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 4 | WARN 2 | SKIP 0 | PASS 379 ] + Error: Test failures + Execution halted + ``` + +# crplyr + +
+ +* Version: 0.4.0 +* GitHub: https://github.com/Crunch-io/crplyr +* Source code: https://github.com/cran/crplyr +* Date/Publication: 2023-03-21 21:50:02 UTC +* Number of recursive dependencies: 87 + +Run `revdepcheck::cloud_details(, "crplyr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(httptest) + Loading required package: testthat + > test_check("crplyr") + Loading required package: crplyr + Loading required package: crunch - `dimnames(actual)` is a list - `dimnames(expected)` is absent + ... + 8. │ └─base::eval(expr, p) + 9. └─crplyr:::with_POST(...) at test-as-tibble.R:76:5 + 10. └─testthat::with_mock(`crunch::crPOST` = function(...) resp, eval.parent(expr)) + 11. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 12. └─lifecycle:::deprecate_stop0(msg) + 13. └─rlang::cnd_signal(...) - [ FAIL 3 | WARN 2 | SKIP 8 | PASS 581 ] + [ FAIL 1 | WARN 1 | SKIP 1 | PASS 154 ] Error: Test failures Execution halted ``` -# vines +# crunch
-* 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.30.4 +* GitHub: https://github.com/Crunch-io/rcrunch +* Source code: https://github.com/cran/crunch +* Date/Publication: 2024-01-17 09:00:02 UTC +* Number of recursive dependencies: 124 -Run `revdepcheck::cloud_details(, "vines")` for more info +Run `revdepcheck::cloud_details(, "crunch")` for more info
@@ -205,40 +397,158 @@ Run `revdepcheck::cloud_details(, "vines")` for more info * checking tests ... ERROR ``` + Running ‘spelling.R’ Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: - > library("testthat") - > library("vines") - Loading required package: copula + > library(httptest) + Loading required package: testthat + > if (nchar(Sys.getenv("JENKINS_HOME"))) { + + tt_read_lines <- function(path, n = -1L, encoding = "UTF-8") { + + base::readLines(path, n = n, encoding = encoding, warn = FALSE) + + } + ... +  8. │ └─base::eval(expr, p) +  9. └─testthat::with_mock(...) at test-share.R:90:5 +  10.  └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") +  11.  └─lifecycle:::deprecate_stop0(msg) +  12.  └─rlang::cnd_signal(...) + + [ FAIL 21 | WARN 1 | SKIP 11 | PASS 3387 ] + Error: Test failures + Total teardown: Time difference of 4.053116e-05 secs + Execution halted + ``` + +## In both + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘deck-cookbook.Rmd’ + ... + + library(crunch) + + }) + + > options(crunch.show.progress = FALSE) + + > ds <- newExampleDataset() + + ... + ‘crunch.Rmd’ using ‘UTF-8’... OK + ‘deck-cookbook.Rmd’ using ‘UTF-8’... failed + ‘derive.Rmd’ using ‘UTF-8’... OK + ‘export.Rmd’ using ‘UTF-8’... OK + ‘filters.Rmd’ using ‘UTF-8’... OK + ‘fork-and-merge.Rmd’ using ‘UTF-8’... OK + ‘projects.Rmd’ using ‘UTF-8’... OK + ‘subtotals.Rmd’ using ‘UTF-8’... OK + ‘variable-order.Rmd’ using ‘UTF-8’... OK + ‘variables.Rmd’ using ‘UTF-8’... OK + ``` + +* checking installed package size ... NOTE + ``` + installed size is 6.6Mb + sub-directories of 1Mb or more: + R 3.5Mb + doc 1.0Mb + help 1.6Mb + ``` + +# crunchy + +
+ +* Version: 0.3.3 +* GitHub: https://github.com/Crunch-io/crunchy +* Source code: https://github.com/cran/crunchy +* Date/Publication: 2021-01-13 21:20:06 UTC +* Number of recursive dependencies: 76 + +Run `revdepcheck::cloud_details(, "crunchy")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > test_check("crunchy") + Loading required package: crunchy + Loading required package: crunch + + Attaching package: 'crunch' + ... + 1. ├─withr::with_options(...) at test-crunchy-server.R:5:1 + 2. │ └─base::force(code) + 3. └─testthat::with_mock(...) + 4. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 5. └─lifecycle:::deprecate_stop0(msg) + 6. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 2 | PASS 23 ] + Error: Test failures + Execution halted + ``` + +# cyphr + +
+ +* Version: 1.1.4 +* GitHub: https://github.com/ropensci/cyphr +* Source code: https://github.com/cran/cyphr +* Date/Publication: 2022-06-20 11:30:02 UTC +* Number of recursive dependencies: 47 + +Run `revdepcheck::cloud_details(, "cyphr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(cyphr) > - > test_check("vines", reporter = "summary") - h: - h: 1 + > test_check("cyphr") + [ FAIL 6 | WARN 0 | SKIP 4 | PASS 272 ] + + ══ Skipped tests (4) ═══════════════════════════════════════════════════════════ ... - ── 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-zzz-data.R:216:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) - ══ DONE ════════════════════════════════════════════════════════════════════════ + [ FAIL 6 | WARN 0 | SKIP 4 | PASS 272 ] Error: Test failures Execution halted ``` -# xpose +# datarobot
-* 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: 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: 99 -Run `revdepcheck::cloud_details(, "xpose")` for more info +Run `revdepcheck::cloud_details(, "datarobot")` for more info
@@ -250,22 +560,3217 @@ 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(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.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) - Attaching package: 'xpose' + [ FAIL 9 | WARN 0 | SKIP 32 | PASS 98 ] + Error: Test failures + Execution halted + ``` + +# dendextend + +
+ +* Version: 1.19.0 +* GitHub: https://github.com/talgalili/dendextend +* Source code: https://github.com/cran/dendextend +* Date/Publication: 2024-11-15 10:40:06 UTC +* Number of recursive dependencies: 130 + +Run `revdepcheck::cloud_details(, "dendextend")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > + > library(dendextend) - The following object is masked from 'package:stats': + --------------------- + Welcome to dendextend version 1.19.0 + Type citation('dendextend') for how to cite the package. ... - 8. │ └─base::do.call(...) at tests/testthat/helper-test_that_for_all.R:20:7 - 9. ├─testthat (local) ``(...) - 10. └─base::.handleSimpleError(...) - 11. └─purrr (local) h(simpleError(msg, call)) - 12. └─cli::cli_abort(...) - 13. └─rlang::abort(...) + 8. │ │ └─base::withVisible(code) + 9. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 10. └─testthat::with_mock(...) + 11. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 12. └─lifecycle:::deprecate_stop0(msg) + 13. └─rlang::cnd_signal(...) - [ FAIL 1 | WARN 0 | SKIP 8 | PASS 377 ] + [ FAIL 10 | WARN 1 | SKIP 0 | PASS 858 ] Error: Test failures Execution halted ``` +## In both + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘FAQ.Rmd’ + ... + > dend <- dend %>% color_branches(k = 4) %>% color_labels + + > par(mar = rep(0, 4)) + + > circlize_dendrogram(dend, labels_track_height = NA, + + dend_track_height = 0.3) + + When sourcing ‘FAQ.R’: + Error: not enough space for cells at track index '2'. + Execution halted + + ‘Cluster_Analysis.Rmd’ using ‘UTF-8’... OK + ‘FAQ.Rmd’ using ‘UTF-8’... failed + ‘Quick_Introduction.Rmd’ using ‘UTF-8’... OK + ‘dendextend.Rmd’ using ‘UTF-8’... OK + ``` + +* checking package dependencies ... NOTE + ``` + Packages which this enhances but not available for checking: + 'ggdendro', 'dendroextras', 'Hmisc', 'WGCNA', 'moduleColor', + 'distory', 'phangorn', 'zoo' + ``` + +* checking installed package size ... NOTE + ``` + installed size is 6.9Mb + sub-directories of 1Mb or more: + doc 5.8Mb + ``` + +* checking Rd cross-references ... NOTE + ``` + Packages unavailable to check Rd xrefs: ‘WGCNA’, ‘dendroextras’, ‘moduleColor’, ‘distory’, ‘phangorn’, ‘ggdendro’, ‘zoo’ + ``` + +# digitize + +
+ +* 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 + +
+ +## 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.3.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 + +
+ +* 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 + +
+ +## 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.3.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 + ``` + +# dRiftDM + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/bucky2177/dRiftDM +* Source code: https://github.com/cran/dRiftDM +* Date/Publication: 2025-01-08 16:30:05 UTC +* Number of recursive dependencies: 70 + +Run `revdepcheck::cloud_details(, "dRiftDM")` for more info + +
+ +## 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 + ... + 7. └─lifecycle:::deprecate_stop0(msg) + 8. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 14 | PASS 670 ] + Deleting unused snapshots: + • plotting/cond-prms-hist.svg + • plotting/one-traces.svg + • plotting/plot-model.svg + Error: Test failures + Execution halted + ``` + +# DSMolgenisArmadillo + +
+ +* 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: 75 + +Run `revdepcheck::cloud_details(, "DSMolgenisArmadillo")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(DSMolgenisArmadillo) + Loading required package: DSI + Loading required package: progress + Loading required package: R6 + Loading required package: MolgenisAuth + > library(tibble) + ... + 7. │ │ └─base::withVisible(code) + 8. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 9. └─testthat::with_mock(...) + 10. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 11. └─lifecycle:::deprecate_stop0(msg) + 12. └─rlang::cnd_signal(...) + + [ FAIL 55 | WARN 0 | SKIP 1 | PASS 9 ] + Error: Test failures + Execution halted + ``` + +# gbfs + +
+ +* Version: 1.3.9 +* GitHub: https://github.com/simonpcouch/gbfs +* Source code: https://github.com/cran/gbfs +* Date/Publication: 2024-01-25 22:10:06 UTC +* Number of recursive dependencies: 73 + +Run `revdepcheck::cloud_details(, "gbfs")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(gbfs) + > + > test_check("gbfs") + [ FAIL 1 | WARN 0 | SKIP 8 | PASS 5 ] + + ══ Skipped tests (8) ═══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-utils.R:105:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 8 | PASS 5 ] + Error: Test failures + Execution halted + ``` + +# gen3sis + +
+ +* 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: 58 + +Run `revdepcheck::cloud_details(, "gen3sis")` for more info + +
+ +## 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.3.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 running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘create_input_landscape.Rmd’ + ... + > library(gen3sis) + + > library(raster) + Loading required package: sp + + > knitr::include_graphics("../inst/extdata/SouthAmerica/images/const_cost.png") + + ... + > knitr::include_graphics("../inst/logo/gen3sis_logo.png") + + When sourcing ‘introduction.R’: + Error: Cannot find the file(s): "../inst/logo/gen3sis_logo.png" + Execution halted + + ‘create_config.Rmd’ using ‘UTF-8’... OK + ‘create_input_landscape.Rmd’ using ‘UTF-8’... failed + ‘design_landscape.Rmd’ using ‘UTF-8’... failed + ‘introduction.Rmd’ using ‘UTF-8’... failed + ``` + +* 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 + ``` + +# graphhopper + +
+ +* 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: 71 + +Run `revdepcheck::cloud_details(, "graphhopper")` for more info + +
+ +## 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.3.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 + ``` + +# gwasrapidd + +
+ +* Version: 0.99.17 +* GitHub: https://github.com/ramiromagno/gwasrapidd +* Source code: https://github.com/cran/gwasrapidd +* Date/Publication: 2023-12-15 21:50:08 UTC +* Number of recursive dependencies: 82 + +Run `revdepcheck::cloud_details(, "gwasrapidd")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(gwasrapidd) + > + > test_check("gwasrapidd") + [ FAIL 34 | WARN 2 | SKIP 1 | PASS 649 ] + + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(`testthat::skip` = function(...) FALSE, expect_false(skip_if_testing_is_fast())) at test-tests.R:30:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 34 | WARN 2 | SKIP 1 | PASS 649 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘gwasrapidd.Rmd’ + ... + + > knitr::include_graphics("../man/figures/get_fns.png") + + When sourcing ‘gwasrapidd.R’: + Error: Cannot find the file(s): "../man/figures/get_fns.png" + Execution halted + + ‘bmi_variants.Rmd’ using ‘UTF-8’... OK + ‘faq.Rmd’ using ‘UTF-8’... OK + ‘gwasrapidd.Rmd’ using ‘UTF-8’... failed + ``` + +# hereR + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/munterfi/hereR +* Source code: https://github.com/cran/hereR +* Date/Publication: 2024-11-27 22:20:02 UTC +* Number of recursive dependencies: 117 + +Run `revdepcheck::cloud_details(, "hereR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(hereR) + > + > test_check("hereR") + [ FAIL 15 | WARN 0 | SKIP 0 | PASS 107 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-weather_observation.R:9:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 15 | WARN 0 | SKIP 0 | PASS 107 ] + Error: Test failures + Execution halted + ``` + +# humanize + +
+ +* 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 + +
+ +## 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.3.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 + ``` + +# ieegio + +
+ +* 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: 87 + +Run `revdepcheck::cloud_details(, "ieegio")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ieegio-Ex.R’ failed + The error most likely occurred in: + + > ### 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) + + + + } + + Warning in check_forbidden_install("Conda Environments") : + cannot install Conda Environments during R CMD check + Error: Unable to find conda binary. Is Anaconda installed? + Execution halted + ``` + +# ipaddress + +
+ +* 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: 65 + +Run `revdepcheck::cloud_details(, "ipaddress")` for more info + +
+ +## 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.3.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 + ``` + +# isotracer + +
+ +* Version: 1.1.7 +* GitHub: NA +* Source code: https://github.com/cran/isotracer +* Date/Publication: 2024-11-05 03:20:02 UTC +* Number of recursive dependencies: 126 + +Run `revdepcheck::cloud_details(, "isotracer")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(isotracer) + To automatically run isotracer in parallel on a multicore CPU, you can call: + options(mc.cores = parallel::detectCores()) + + + Attaching package: 'isotracer' + ... + 1. ├─testthat::expect_error(plot(p), NA) at test-integration.R:207:13 + 2. │ └─testthat:::quasi_capture(...) + 3. │ ├─testthat (local) .capture(...) + 4. │ │ └─base::withCallingHandlers(...) + 5. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 6. └─base::plot(p) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 581 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking whether package ‘isotracer’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: namespace ‘lubridate’ is not available and has been replaced + See ‘/tmp/workdir/isotracer/new/isotracer.Rcheck/00install.out’ for details. + ``` + +* checking installed package size ... NOTE + ``` + installed size is 93.4Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 4.0Mb + doc 2.3Mb + libs 85.1Mb + ``` + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘rstantools’ + All declared Imports should be used. + ``` + +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. + ``` + +# JAGStree + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/malfly/JAGStree +* Source code: https://github.com/cran/JAGStree +* Date/Publication: 2024-11-11 12:00:13 UTC +* Number of recursive dependencies: 131 + +Run `revdepcheck::cloud_details(, "JAGStree")` for more info + +
+ +## 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 + ... + 2. │ └─testthat::quasi_label(enquo(object), arg = "object") + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. └─testthat::with_mock(...) + 5. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 6. └─lifecycle:::deprecate_stop0(msg) + 7. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘DiagrammeR’ + All declared Imports should be used. + ``` + +# leaflet.minicharts + +
+ +* 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: 87 + +Run `revdepcheck::cloud_details(, "leaflet.minicharts")` for more info + +
+ +## 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.3.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 + +
+ +* 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: 85 + +Run `revdepcheck::cloud_details(, "learnr")` for more info + +
+ +## 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.3.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 + +
+ +* 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 + +
+ +## 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.3.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 + +
+ +* 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: 103 + +Run `revdepcheck::cloud_details(, "manipulateWidget")` for more info + +
+ +## 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.3.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 data for non-ASCII characters ... NOTE + ``` + Note: found 55 marked UTF-8 strings + ``` + +# mbbe + +
+ +* 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: 85 + +Run `revdepcheck::cloud_details(, "mbbe")` for more info + +
+ +## 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.3.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 + +
+ +* 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 + +
+ +## 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.3.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 + +
+ +* 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 + +
+ +## 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.3.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 + +
+ +* 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 + +
+ +## 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.3.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.3.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.3.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 running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘mocks-and-testthat.Rmd’ + ... + > f <- function(x) summary(x) + + > with_mock(f = m, { + + expect_equal(f(iris), 1) + + }) + + When sourcing ‘mocks-and-testthat.R’: + Error: `with_mock()` was deprecated in testthat 3.3.0 and is now defunct. + ℹ Please use `with_mocked_bindings()` instead. + Execution halted + + ‘mocks-and-testthat.Rmd’ using ‘UTF-8’... failed + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘mocks-and-testthat.Rmd’ using rmarkdown + + Quitting from lines 137-144 [with_mock] (mocks-and-testthat.Rmd) + Error: processing vignette 'mocks-and-testthat.Rmd' failed with diagnostics: + `with_mock()` was deprecated in testthat 3.3.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 + +
+ +* 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: 86 + +Run `revdepcheck::cloud_details(, "moexer")` for more info + +
+ +## 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.3.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 + +
+ +* Version: 2.7.0 +* GitHub: https://github.com/molgenis/molgenis-r-armadillo +* Source code: https://github.com/cran/MolgenisArmadillo +* Date/Publication: 2024-10-14 13:00:03 UTC +* Number of recursive dependencies: 85 + +Run `revdepcheck::cloud_details(, "MolgenisArmadillo")` for more info + +
+ +## 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") + CrulAdapter enabled! + ... + ▆ + 1. └─testthat::with_mock(...) at test-utils.R:11:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 24 | WARN 0 | SKIP 0 | PASS 130 ] + Error: Test failures + Execution halted + Ran 1/1 deferred expressions + ``` + +# MolgenisAuth + +
+ +* Version: 0.0.25 +* GitHub: https://github.com/molgenis/molgenis-r-auth +* Source code: https://github.com/cran/MolgenisAuth +* Date/Publication: 2023-02-20 11:00:09 UTC +* Number of recursive dependencies: 34 + +Run `revdepcheck::cloud_details(, "MolgenisAuth")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(MolgenisAuth) + > + > test_check("MolgenisAuth") + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 0 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-auth.R:61:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted + ``` + +# NasdaqDataLink + +
+ +* 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 + +
+ +## 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.3.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 + +
+ +* 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 + +
+ +## 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.3.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 running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘nhl_players_api.Rmd’ + ... + 17:08:21 | W | nhl_from_json https://statsapi.web.nhl.com/api/v1/people/8451101 error for attempt no: 2 cannot open the connection to 'https://statsapi.web.nhl.com/api/v1/people/8451101' + 17:08:21 | E | The following 2 of 2 url retrievals errored:$ https://statsapi.web.nhl.com/api/v1/people/made up player$ https://statsapi.web.nhl.com/api/v1/people/8451101 + data frame with 0 columns and 0 rows + + > nhl_players(playerIds = playerIds) %>% select(fullName, + + nationality, shootsCatches, primaryPosition.code) + + ... + > roster_devils <- rosters %>% filter(name == "New Jersey Devils") %>% + + pull(roster.roster) %>% first() + + When sourcing ‘nhl_teams_api.R’: + Error: could not find function "%>%" + Execution halted + + ‘low_level_api.Rmd’ using ‘UTF-8’... OK + ‘nhl_players_api.Rmd’ using ‘UTF-8’... failed + ‘nhl_teams_api.Rmd’ using ‘UTF-8’... failed + ``` + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# odin + +
+ +* Version: 1.2.6 +* GitHub: https://github.com/mrc-ide/odin +* Source code: https://github.com/cran/odin +* Date/Publication: 2024-09-23 16:10:02 UTC +* Number of recursive dependencies: 50 + +Run `revdepcheck::cloud_details(, "odin")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(odin) + > + > test_check("odin") + [ FAIL 1 | WARN 0 | SKIP 23 | PASS 1053 ] + + ══ Skipped tests (23) ══════════════════════════════════════════════════════════ + ... + 1. ├─withr::with_envvar(...) at test-util.R:148:3 + 2. │ └─base::force(code) + 3. └─testthat::with_mock(...) + 4. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 5. └─lifecycle:::deprecate_stop0(msg) + 6. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 23 | PASS 1053 ] + Error: Test failures + Execution halted + ``` + +# opendatatoronto + +
+ +* Version: 0.1.5 +* GitHub: https://github.com/sharlagelfand/opendatatoronto +* Source code: https://github.com/cran/opendatatoronto +* Date/Publication: 2022-04-13 11:30:05 UTC +* Number of recursive dependencies: 107 + +Run `revdepcheck::cloud_details(, "opendatatoronto")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(opendatatoronto) + > + > test_check("opendatatoronto") + [ FAIL 7 | WARN 0 | SKIP 13 | PASS 44 ] + + ══ Skipped tests (13) ══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-utils.R:139:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 7 | WARN 0 | SKIP 13 | PASS 44 ] + Error: Test failures + Execution halted + ``` + +# overture + +
+ +* Version: 0.4-0 +* GitHub: https://github.com/kurtis-s/overture +* Source code: https://github.com/cran/overture +* Date/Publication: 2019-08-10 22:30:02 UTC +* Number of recursive dependencies: 40 + +Run `revdepcheck::cloud_details(, "overture")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(overture) + > + > test_check("overture") + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 100 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + 6. └─testthat::with_mock(...) + 7. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 8. └─lifecycle:::deprecate_stop0(msg) + 9. └─rlang::cnd_signal(...) + ── Failure ('test-mcmc.R:403:5'): Error message given if backing file can't be removed ── + mock object has not been called 1 time + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 100 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# owmr + +
+ +* 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: 82 + +Run `revdepcheck::cloud_details(, "owmr")` for more info + +
+ +## 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.3.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 + +
+ +* 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: 65 + +Run `revdepcheck::cloud_details(, "oxcAAR")` for more info + +
+ +## 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.3.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 running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘basic-usage.Rmd’ + ... + Oxcal doesn't seem to be installed. Downloading it now: + trying URL 'https://c14.arch.ox.ac.uk/OxCalDistribution.zip' + Error Downloading OxCalDistribution.zip: + URL 'https://c14.arch.ox.ac.uk/OxCalDistribution.zip': Timeout of 60 seconds was reached + No internet connection or data source broken? + The Oxcal executable path could not be set: + + When sourcing ‘basic-usage.R’: + Error: No file at given location + Execution halted + + ‘basic-usage.Rmd’ using ‘UTF-8’... failed + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + 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 lines 24-31 [unnamed-chunk-1] (basic-usage.Rmd) + 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 + ``` + +# passport + +
+ +* 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: 87 + +Run `revdepcheck::cloud_details(, "passport")` for more info + +
+ +## 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.3.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 + ``` + +# patrick + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/google/patrick +* Source code: https://github.com/cran/patrick +* Date/Publication: 2022-10-13 18:20:02 UTC +* Number of recursive dependencies: 34 + +Run `revdepcheck::cloud_details(, "patrick")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # Copyright 2018 Google LLC + > # + > # Licensed 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 + > # + > # http://www.apache.org/licenses/LICENSE-2.0 + ... + Backtrace: + ▆ + 1. └─testthat::local_mock(...) at test-with_parameters.R:100:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "local_mock()", "local_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 18 ] + Error: Test failures + Execution halted + ``` + +# plumber + +
+ +* Version: 1.2.2 +* GitHub: https://github.com/rstudio/plumber +* Source code: https://github.com/cran/plumber +* Date/Publication: 2024-03-26 00:00:06 UTC +* Number of recursive dependencies: 103 + +Run `revdepcheck::cloud_details(, "plumber")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(plumber) + > + > test_check("plumber") + [ FAIL 2 | WARN 0 | SKIP 15 | PASS 1997 ] + + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-plumber-run.R:105:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 0 | SKIP 15 | PASS 1997 ] + Error: Test failures + Execution halted + ``` + +# pocketapi + +
+ +* 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: 87 + +Run `revdepcheck::cloud_details(, "pocketapi")` for more info + +
+ +## 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.3.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 + +
+ +* 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: 85 + +Run `revdepcheck::cloud_details(, "projmgr")` for more info + +
+ +## 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.3.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 + ``` + +# Quandl + +
+ +* 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 + +
+ +## 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.3.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 + ``` + +# regmedint + +
+ +* 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 + +
+ +## 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.3.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. + ``` + +# rentrez + +
+ +* Version: 1.2.3 +* GitHub: https://github.com/ropensci/rentrez +* Source code: https://github.com/cran/rentrez +* Date/Publication: 2020-11-10 21:10:02 UTC +* Number of recursive dependencies: 47 + +Run `revdepcheck::cloud_details(, "rentrez")` for more info + +
+ +## Newly broken + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘rentrez_tutorial.Rmd’ + ... + > all_the_links <- entrez_link(dbfrom = "gene", id = 351, + + db = "all") + Warning in check_xml_errors(x) : + NCBI C++ Exception: + Error: TXCLIENT(CException::eUnknown) "/pubmed_gen/rbuild/version/20240724/entrez/2.19/src/internal/txclient/TxClient.cpp", line 1045: ncbi::CTxRawClientImpl::readAll() --- Read failed: EOF (the other side has unexpectedly closed connection), peer: 130.14.22.29:8064 + + + When sourcing ‘rentrez_tutorial.R’: + Error: subscript out of bounds + Execution halted + + ‘rentrez_tutorial.Rmd’ using ‘UTF-8’... failed + ``` + +# reportr + +
+ +* Version: 1.3.0 +* GitHub: https://github.com/jonclayden/reportr +* Source code: https://github.com/cran/reportr +* Date/Publication: 2018-10-26 15:20:03 UTC +* Number of recursive dependencies: 25 + +Run `revdepcheck::cloud_details(, "reportr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(reportr) + > + > test_check("reportr") + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 17 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-10-ask.R:7:5 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 17 ] + Error: Test failures + Execution halted + ``` + +# restez + +
+ +* Version: 2.1.4 +* GitHub: https://github.com/ropensci/restez +* Source code: https://github.com/cran/restez +* Date/Publication: 2023-10-25 10:30:02 UTC +* Number of recursive dependencies: 61 + +Run `revdepcheck::cloud_details(, "restez")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘test-all.R’ + Running the tests in ‘tests/test-all.R’ failed. + Complete output: + > library(testthat) + > test_check("restez") + Loading required package: restez + ... Creating 'test_db_fldr/restez' + ... Creating 'test_db_fldr/restez/downloads' + ... Creating 'test_db_fldr/restez' + ... Creating 'test_db_fldr/restez/downloads' + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-rentrez-wrappers.R:28:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 5 | WARN 0 | SKIP 2 | PASS 128 ] + Error: Test failures + Execution halted + ``` + +# Rexperigen + +
+ +* 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 + +
+ +## 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 + ``` + +# rnbp + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/szymanskir/rnbp +* Source code: https://github.com/cran/rnbp +* Date/Publication: 2021-06-07 07:30:02 UTC +* Number of recursive dependencies: 71 + +Run `revdepcheck::cloud_details(, "rnbp")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(rnbp) + > + > test_check("rnbp") + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 25 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + 2. │ └─base::eval.parent(expr) + 3. │ └─base::eval(expr, p) + 4. └─testthat::with_mock(...) at test-endpoint_tables.R:11:3 + 5. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 6. └─lifecycle:::deprecate_stop0(msg) + 7. └─rlang::cnd_signal(...) + + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 25 ] + Error: Test failures + Execution halted + ``` + +# rosetteApi + +
+ +* 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 + +
+ +## 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.3.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 + +
+ +* 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 + +
+ +## 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.3.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 + +
+ +* 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: 70 + +Run `revdepcheck::cloud_details(, "RPresto")` for more info + +
+ +## 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.3.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 + ``` + +## In both + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘common-table-expressions.Rmd’ + ... + > packageVersion("RPresto") + [1] ‘1.4.7’ + + > con <- DBI::dbConnect(drv = RPresto::Presto(), host = "http://localhost", + + port = 8080, user = Sys.getenv("USER"), catalog = "memory", + + .... [TRUNCATED] + + ... + + port = 8080, user = Sys.getenv("USER"), catalog = "memory", + + .... [TRUNCATED] + + When sourcing ‘primitive-types.R’: + Error: Couldn't connect to server [localhost]: Failed to connect to localhost port 8080 after 0 ms: Couldn't connect to server + Execution halted + + ‘common-table-expressions.Rmd’ using ‘UTF-8’... failed + ‘complex-types.Rmd’ using ‘UTF-8’... failed + ‘primitive-types.Rmd’ using ‘UTF-8’... failed + ``` + +# RTD + +
+ +* 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: 115 + +Run `revdepcheck::cloud_details(, "RTD")` for more info + +
+ +## 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 ] + + ... + ▆ + 1. └─testthat::with_mock(...) at test-td.R:32:3 + 2. └─lifecycle::deprecate_stop("3.3.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 + Ran 2/2 deferred expressions + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# Ryacas0 + +
+ +* 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 + +
+ +## 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 ] + + ══ 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.3.0", "with_mock()", "with_mocked_bindings()") + 8. └─lifecycle:::deprecate_stop0(msg) + 9. └─rlang::cnd_signal(...) + + [ 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 12.9Mb + sub-directories of 1Mb or more: + libs 11.0Mb + yacas 1.4Mb + ``` + +# shiny.benchmark + +
+ +* 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: 108 + +Run `revdepcheck::cloud_details(, "shiny.benchmark")` for more info + +
+ +## 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.3.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 + +
+ +* 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 + +
+ +## 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.3.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 + +
+ +* 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: 82 + +Run `revdepcheck::cloud_details(, "skimr")` for more info + +
+ +## 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.3.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 + +
+ +* 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: 104 + +Run `revdepcheck::cloud_details(, "spaero")` for more info + +
+ +## 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 2 | SKIP 8 | PASS 41 ] + + ══ Skipped tests (8) ═══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-simulator.R:6:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 2 | SKIP 8 | PASS 41 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘utils’ + All declared Imports should be used. + ``` + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# starwarsdb + +
+ +* 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: 50 + +Run `revdepcheck::cloud_details(, "starwarsdb")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(starwarsdb) + > + > test_check("starwarsdb") + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 31 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-dm.R:56:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 31 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 14 marked UTF-8 strings + ``` + +# taxonomizr + +
+ +* Version: 0.10.7 +* GitHub: https://github.com/sherrillmix/taxonomizr +* Source code: https://github.com/cran/taxonomizr +* Date/Publication: 2025-01-08 16:50:02 UTC +* Number of recursive dependencies: 55 + +Run `revdepcheck::cloud_details(, "taxonomizr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(taxonomizr) + > library(data.table) + > library(RSQLite) + > test_check("taxonomizr") + + Download status: 0 done; 1 in progress (0 b/s). Total size: 359 b (100%)... + ... + 4. │ │ └─base::withCallingHandlers(...) + 5. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 6. └─testthat::with_mock(...) + 7. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 8. └─lifecycle:::deprecate_stop0(msg) + 9. └─rlang::cnd_signal(...) + + [ FAIL 13 | WARN 0 | SKIP 0 | PASS 354 ] + Error: Test failures + Execution halted + ``` + +# texreg + +
+ +* 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: 108 + +Run `revdepcheck::cloud_details(, "texreg")` for more info + +
+ +## 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.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 2 | WARN 1 | SKIP 34 | PASS 199 ] + 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 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’, ‘maxLik’, ‘mhurdle’, ‘mlogit’, ‘oglmx’, ‘plm’, ‘pglm’, ‘relevent’, ‘remstimate’, ‘simex’, ‘speedglm’, ‘truncreg’, ‘VGAM’, ‘metaSEM’ + Unknown package ‘rms’ in Rd xrefs + ``` + +# ThankYouStars + +
+ +* 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 + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ThankYouStars) + > + > 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.3.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 + ``` + +# tinyProject + +
+ +* 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 + +
+ +## 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 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-commandArgs.R:3:1 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 5 | SKIP 0 | PASS 73 ] + Error: Test failures + Execution halted + ``` + +# tryCatchLog + +
+ +* 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(, "tryCatchLog")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(tryCatchLog) + Using futile.logger for logging... + > + > + > + > # 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" + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test_platform_functions.R:37:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 436 ] + Error: Test failures + Execution halted + ``` + +## 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’ + ``` + +# tuneRanger + +
+ +* Version: 0.7 +* GitHub: NA +* Source code: https://github.com/cran/tuneRanger +* Date/Publication: 2024-03-20 22:20:02 UTC +* Number of recursive dependencies: 64 + +Run `revdepcheck::cloud_details(, "tuneRanger")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(tuneRanger) + Loading required package: ranger + Loading required package: mlrMBO + Loading required package: mlr + Loading required package: ParamHelpers + Loading required package: smoof + ... + 6. ├─base (local) fun3(do.call(trainLearner, pars)) + 7. ├─base::do.call(trainLearner, pars) + 8. ├─mlr (local) ``(.learner = ``, .task = ``, .subset = NULL) + 9. └─tuneRanger:::trainLearner.surv.tuneMtryFast(...) + 10. └─tuneRanger::tuneMtryFast(...) + 11. └─ranger::ranger(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 6 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘randomForest’ + ``` + +# uptasticsearch + +
+ +* Version: 0.4.0 +* GitHub: https://github.com/uptake/uptasticsearch +* Source code: https://github.com/cran/uptasticsearch +* Date/Publication: 2019-09-11 18:30:03 UTC +* Number of recursive dependencies: 57 + +Run `revdepcheck::cloud_details(, "uptasticsearch")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # Note that you would never run this file directly. This is used by tools::testInstallPackages() + > # and other packages like covr. + > # To actually run the tests, you need to set the working directory then run + > # devtools::test('r-pkg/uptasticsearch') + > + > # This line ensures that R CMD check can run tests. + > # See https://github.com/hadley/testthat/issues/144 + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-get_fields.R:33:19 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 17 | PASS 288 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# WhatIf + +
+ +* 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(, "WhatIf")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(WhatIf) + > + > test_check("WhatIf") + + | + | | 0% + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-whatif_convexhull.R:16:5 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 1 | WARN 0 | SKIP 4 | PASS 2 ] + Error: Test failures + Execution halted + ``` + +# ZillowR + +
+ +* 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 + +
+ +## 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 ] + + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-GetZestimate.R:7:5 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 9 | WARN 0 | SKIP 0 | PASS 125 ] + Error: Test failures + Execution halted + ``` + +# zoltr + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/reichlab/zoltr +* Source code: https://github.com/cran/zoltr +* Date/Publication: 2024-06-27 17:00:02 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "zoltr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(zoltr) + > + > test_check("zoltr") + [ FAIL 46 | WARN 0 | SKIP 0 | PASS 24 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─testthat::with_mock(...) at test-project.R:500:3 + 2. └─lifecycle::deprecate_stop("3.3.0", "with_mock()", "with_mocked_bindings()") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + + [ FAIL 46 | WARN 0 | SKIP 0 | PASS 24 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘getting-started.Rmd’ + ... + + > zoltar_connection <- new_connection(host = Sys.getenv("Z_HOST")) + + > zoltar_authenticate(zoltar_connection, Sys.getenv("Z_USERNAME"), + + Sys.getenv("Z_PASSWORD")) + get_token(): POST: /api-token-auth/ + + ... + > zoltar_authenticate(zoltar_connection, Sys.getenv("Z_USERNAME"), + + Sys.getenv("Z_PASSWORD")) + get_token(): POST: /api-token-auth/ + + When sourcing ‘project-owners.R’: + Error: URL using bad/illegal format or missing URL: URL rejected: No host part in the URL + Execution halted + + ‘getting-started.Rmd’ using ‘UTF-8’... failed + ‘project-owners.Rmd’ using ‘UTF-8’... failed + ``` + 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 /* .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 -#include -#include - - -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..9c0e84894 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.3.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.3.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) + }) })