From 88254bba297dc9deb90bee170bdde1323c91e217 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 21 Jul 2021 06:24:19 +0200 Subject: [PATCH 1/9] Provide rbind() and cbind() methods --- NAMESPACE | 3 +++ R/class-tbl_df.R | 20 ++++++++++++++++++++ R/tibble-package.R | 1 + tests/testthat/test-class-tbl_df.R | 16 ++++++++++++++++ 4 files changed, 40 insertions(+) diff --git a/NAMESPACE b/NAMESPACE index c71e6db5f..ec6c88b31 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -70,6 +70,8 @@ export(type_sum) export(validate_tibble) export(view) exportClasses(tbl_df) +if (getRversion() >= "4.0.0") S3method(cbind, tbl_df) +if (getRversion() >= "4.0.0") S3method(rbind, tbl_df) import(ellipsis) import(lifecycle) import(rlang) @@ -96,6 +98,7 @@ importFrom(vctrs,vec_as_names_legacy) importFrom(vctrs,vec_as_subscript2) importFrom(vctrs,vec_assign) importFrom(vctrs,vec_c) +importFrom(vctrs,vec_cbind) importFrom(vctrs,vec_is) importFrom(vctrs,vec_names2) importFrom(vctrs,vec_ptype_abbr) diff --git a/R/class-tbl_df.R b/R/class-tbl_df.R index 14861cf69..197d9f07a 100644 --- a/R/class-tbl_df.R +++ b/R/class-tbl_df.R @@ -135,6 +135,26 @@ cnd_names_non_na <- function(name) { } } +#' @rawNamespace if (getRversion() >= "4.0.0") S3method(rbind, tbl_df) +if (getRversion() >= "4.0.0") rbind.tbl_df <- function(..., deparse.level = NULL) { + if (!is.null(deparse.level)) { + deprecate_soft("3.1.3", "tibble::rbind(deparse.level =)", + details = "This argument is ignored with rbind() for tibbles.") + } + + vec_rbind(...) +} + +#' @rawNamespace if (getRversion() >= "4.0.0") S3method(cbind, tbl_df) +if (getRversion() >= "4.0.0") cbind.tbl_df <- function(..., deparse.level = NULL) { + if (!is.null(deparse.level)) { + deprecate_soft("3.1.3", "tibble::cbind(deparse.level =)", + details = "This argument is ignored with cbind() for tibbles.") + } + + vec_cbind(...) +} + # Errors ------------------------------------------------------------------ error_names_must_be_non_null <- function() { diff --git a/R/tibble-package.R b/R/tibble-package.R index ab597a14d..7966588cf 100644 --- a/R/tibble-package.R +++ b/R/tibble-package.R @@ -6,6 +6,7 @@ #' @import ellipsis #' @importFrom vctrs vec_as_location vec_as_location2 vec_as_names vec_as_names_legacy vec_c #' @importFrom vctrs vec_is vec_rbind vec_recycle vec_size vec_slice vec_assign +#' @importFrom vctrs vec_cbind #' @importFrom vctrs unspecified vec_as_subscript2 num_as_location vec_ptype_abbr #' @importFrom vctrs vec_names2 vec_set_names #' @aliases NULL tibble-package diff --git a/tests/testthat/test-class-tbl_df.R b/tests/testthat/test-class-tbl_df.R index 3b4291aec..bf1e1906b 100644 --- a/tests/testthat/test-class-tbl_df.R +++ b/tests/testthat/test-class-tbl_df.R @@ -48,6 +48,22 @@ test_that("names<-()", { ) }) +test_that("rbind()", { + skip_if_not(getRversion() >= "4.0.0") + expect_equal(rbind(tibble(a = 1)), tibble(a = 1)) + expect_equal(rbind(tibble(a = 1), data.frame(a = 2)), tibble(a = 1:2)) + expect_equal(rbind(tibble(a = 1), data.frame(b = 2)), tibble(a = c(1, NA), b = c(NA, 2))) + expect_equal(rbind(data.frame(a = 1), tibble(a = 2)), data.frame(a = 1:2)) +}) + +test_that("cbind()", { + skip_if_not(getRversion() >= "4.0.0") + expect_equal(cbind(tibble(a = 1)), tibble(a = 1)) + expect_equal(cbind(tibble(a = 1), data.frame(b = 2)), tibble(a = 1, b = 2)) + expect_equal(cbind(tibble(a = 1), data.frame(b = 2:3)), tibble(a = c(1, 1), b = 2:3)) + expect_equal(cbind(data.frame(a = 1), tibble(b = 2)), data.frame(a = 1, b = 2)) +}) + test_that("output test", { skip_if_not_installed("testthat", "3.0.0.9000") skip_if_not_installed("lifecycle", "0.2.0.9000") From 6b882db8d2e1d0b88307f04db19f9a0d58cb07f4 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 21 Jul 2021 13:47:02 +0200 Subject: [PATCH 2/9] Simplify --- R/class-tbl_df.R | 15 ++++----------- 1 file changed, 4 insertions(+), 11 deletions(-) diff --git a/R/class-tbl_df.R b/R/class-tbl_df.R index 197d9f07a..b2676d53d 100644 --- a/R/class-tbl_df.R +++ b/R/class-tbl_df.R @@ -136,22 +136,15 @@ cnd_names_non_na <- function(name) { } #' @rawNamespace if (getRversion() >= "4.0.0") S3method(rbind, tbl_df) -if (getRversion() >= "4.0.0") rbind.tbl_df <- function(..., deparse.level = NULL) { - if (!is.null(deparse.level)) { - deprecate_soft("3.1.3", "tibble::rbind(deparse.level =)", - details = "This argument is ignored with rbind() for tibbles.") - } +if (getRversion() >= "4.0.0") rbind.tbl_df <- function(...) { + # deparse.level is part of the interface of the generic but not passed along + # for data frame methods vec_rbind(...) } #' @rawNamespace if (getRversion() >= "4.0.0") S3method(cbind, tbl_df) -if (getRversion() >= "4.0.0") cbind.tbl_df <- function(..., deparse.level = NULL) { - if (!is.null(deparse.level)) { - deprecate_soft("3.1.3", "tibble::cbind(deparse.level =)", - details = "This argument is ignored with cbind() for tibbles.") - } - +if (getRversion() >= "4.0.0") cbind.tbl_df <- function(...) { vec_cbind(...) } From 357ea7b76ccaf4dc3a8e167f0009fe7fdb3d3208 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Sat, 24 Jul 2021 05:41:03 +0200 Subject: [PATCH 3/9] Splice all arguments into the ellipsis in vec_rbind() and vec_cbind() --- R/class-tbl_df.R | 4 ++-- tests/testthat/test-class-tbl_df.R | 8 ++++++++ 2 files changed, 10 insertions(+), 2 deletions(-) diff --git a/R/class-tbl_df.R b/R/class-tbl_df.R index b2676d53d..d107d404f 100644 --- a/R/class-tbl_df.R +++ b/R/class-tbl_df.R @@ -140,12 +140,12 @@ if (getRversion() >= "4.0.0") rbind.tbl_df <- function(...) { # deparse.level is part of the interface of the generic but not passed along # for data frame methods - vec_rbind(...) + vec_rbind(!!!list(...)) } #' @rawNamespace if (getRversion() >= "4.0.0") S3method(cbind, tbl_df) if (getRversion() >= "4.0.0") cbind.tbl_df <- function(...) { - vec_cbind(...) + vec_cbind(!!!list(...)) } # Errors ------------------------------------------------------------------ diff --git a/tests/testthat/test-class-tbl_df.R b/tests/testthat/test-class-tbl_df.R index bf1e1906b..23d3c669a 100644 --- a/tests/testthat/test-class-tbl_df.R +++ b/tests/testthat/test-class-tbl_df.R @@ -53,6 +53,10 @@ test_that("rbind()", { expect_equal(rbind(tibble(a = 1)), tibble(a = 1)) expect_equal(rbind(tibble(a = 1), data.frame(a = 2)), tibble(a = 1:2)) expect_equal(rbind(tibble(a = 1), data.frame(b = 2)), tibble(a = c(1, NA), b = c(NA, 2))) + expect_equal( + rbind(tibble(a = 1), .name_repair = "universal"), + tibble(a = c(1, NA), ...1 = c(NA, "universal")) + ) expect_equal(rbind(data.frame(a = 1), tibble(a = 2)), data.frame(a = 1:2)) }) @@ -61,6 +65,10 @@ test_that("cbind()", { expect_equal(cbind(tibble(a = 1)), tibble(a = 1)) expect_equal(cbind(tibble(a = 1), data.frame(b = 2)), tibble(a = 1, b = 2)) expect_equal(cbind(tibble(a = 1), data.frame(b = 2:3)), tibble(a = c(1, 1), b = 2:3)) + expect_equal( + cbind(tibble(a = 1), .name_repair = "universal"), + tibble(a = 1, .name_repair := "universal") + ) expect_equal(cbind(data.frame(a = 1), tibble(b = 2)), data.frame(a = 1, b = 2)) }) From 513ae36b6399f4a94c2361f91a4f7693b941c02e Mon Sep 17 00:00:00 2001 From: Hadley Wickham Date: Mon, 2 Aug 2021 13:44:26 -0500 Subject: [PATCH 4/9] Run revdeps --- revdep/README.md | 173 +-- revdep/cran.md | 233 ++- revdep/failures.md | 1425 +++++++++++++++---- revdep/problems.md | 3384 +++++++++++++++++++++++++++++--------------- 4 files changed, 3727 insertions(+), 1488 deletions(-) diff --git a/revdep/README.md b/revdep/README.md index ec93a70f6..926586c1b 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -1,88 +1,97 @@ -# Platform - -|field |value | -|:--------|:----------------------------| -|version |R version 3.6.2 (2019-12-12) | -|os |Debian GNU/Linux 10 (buster) | -|system |x86_64, linux-gnu | -|ui |RStudio | -|language |(EN) | -|collate |en_US.UTF-8 | -|ctype |en_US.UTF-8 | -|tz |Etc/UTC | -|date |2020-03-29 | - -# Dependencies - -|package |old |new |Δ | -|:-------|:-----|:------------|:--| -|tibble |2.1.3 |2.99.99.9015 |* | - # Revdeps -## Failed to check (22) +## Failed to check (24) -|package |version |error |warning |note | -|:----------------|:-------|:-----|:-------|:----| -|apaTables |? | | | | -|broom |? | | | | -|broom.mixed |? | | | | -|CNVScope |? | | | | -|codebook |? | | | | -|codemetar |0.1.8 |1 | |1 | -|embed |? | | | | -|ggstatsplot |? | | | | -|healthcareai |2.4.0 |1 | | | -|holodeck |? | | | | -|mcp |? | | | | -|obfuscatoR |? | | | | -|oolong |0.3.4 |1 | | | -|statsExpressions |? | | | | -|STRMPS |? | | | | -|TestDimorph |? | | | | -|tidybayes |? | | | | -|tidyBF |? | | | | -|tidycomm |? | | | | -|tidymodels |? | | | | -|ToxicoGx |? | | | | -|trialr |0.1.3 |1 | | | +|package |version |error |warning |note | +|:--------------|:-------|:-----|:-------|:----| +|bayesdfa |1.1.0 |1 | | | +|CB2 |? | | | | +|cbar |? | | | | +|diceR |? | | | | +|dimRed |? | | | | +|do |1.9.0.0 |1 | | | +|ggmsa |? | | | | +|glmmfields |0.1.4 |1 | | | +|loon.shiny |? | | | | +|loon.tourr |? | | | | +|MarketMatching |? | | | | +|metagam |? | | | | +|pencal |? | | | | +|phylopath |? | | | | +|rabhit |? | | | | +|raw |? | | | | +|rmdcev |1.2.4 |1 | | | +|rstap |1.0.3 |1 | | | +|scoper |? | | | | +|SynthETIC |? | | | | +|tigger |? | | | | +|trackr |? | | | | +|vivid |? | | | | +|wrswoR |? | | | | -## New problems (34) +## New problems (61) -|package |version |error |warning |note | -|:------------------------------------------------|:-------|:------|:-------|:----| -|[autocogs](problems.md#autocogs) |0.1.2 |2 |__+1__ |1 | -|[basket](problems.md#basket) |0.10.1 |__+1__ | | | -|[beadplexr](problems.md#beadplexr) |0.3.0 |__+1__ | | | -|[casen](problems.md#casen) |0.1.3 |__+1__ | |2 | -|[CGPfunctions](problems.md#cgpfunctions) |0.5.9 |__+1__ | | | -|[concurve](problems.md#concurve) |2.3.0 |__+1__ | |1 | -|[convergEU](problems.md#convergeu) |0.4.1 |__+2__ | |2 | -|[cutpointr](problems.md#cutpointr) |1.0.1 |__+1__ | | | -|[cvms](problems.md#cvms) |0.3.2 |__+1__ | | | -|[epikit](problems.md#epikit) |0.1.0 |__+1__ | |1 | -|[evaluator](problems.md#evaluator) |0.4.1 |__+2__ | | | -|[forestmangr](problems.md#forestmangr) |0.9.1 |__+1__ | | | -|[gratia](problems.md#gratia) |0.3.0 |__+1__ | | | -|[heemod](problems.md#heemod) |0.11.0 |__+2__ | |1 | -|[INDperform](problems.md#indperform) |0.2.2 |__+2__ | |1 | -|[janitor](problems.md#janitor) |1.2.1 |__+2__ | | | -|[jstor](problems.md#jstor) |0.3.7 |__+1__ | | | -|[metacoder](problems.md#metacoder) |0.3.3 |__+1__ | |1 | -|[micropan](problems.md#micropan) |2.0 |__+1__ | | | -|[modeltests](problems.md#modeltests) |0.1.0 |__+1__ | | | -|[poio](problems.md#poio) |0.0-3 | |__+1__ |2 | -|[portalr](problems.md#portalr) |0.3.1 |__+1__ | | | -|[REDCapR](problems.md#redcapr) |0.10.2 |__+1__ | | | -|[rematch2](problems.md#rematch2) |2.1.1 |__+1__ | | | -|[RmarineHeatWaves](problems.md#rmarineheatwaves) |0.17.0 |__+1__ | | | -|[rsample](problems.md#rsample) |0.0.5 |__+1__ | | | -|[RSDA](problems.md#rsda) |3.0.1 |__+1__ | | | -|[rubias](problems.md#rubias) |0.3.0 |__+1__ | |2 | -|[SanzCircos](problems.md#sanzcircos) |0.1.0 |__+1__ | |1 | -|[simrel](problems.md#simrel) |2.0 |__+1__ | | | -|[tidytransit](problems.md#tidytransit) |0.7.0 |__+1__ | |2 | -|[tidytree](problems.md#tidytree) |0.3.2 | |__+1__ |1 | -|[viafr](problems.md#viafr) |0.1.0 |__+1__ | |1 | -|[vip](problems.md#vip) |0.2.1 |__+1__ | | | +|package |version |error |warning |note | +|:--------------------------------------------------|:-------|:------|:-------|:----| +|[AGread](problems.md#agread) |1.1.1 |__+1__ | |1 | +|[comparer](problems.md#comparer) |0.2.2 |__+1__ | |1 | +|[crosstable](problems.md#crosstable) |0.2.1 |__+1__ | | | +|[dat](problems.md#dat) |0.5.0 |__+1__ | | | +|[designr](problems.md#designr) |0.1.12 |__+1__ | |1 | +|[drake](problems.md#drake) |7.13.2 |__+1__ | | | +|[EFAtools](problems.md#efatools) |0.3.1 |__+1__ | |2 | +|[egor](problems.md#egor) |1.21.7 |__+2__ | | | +|[ExpertChoice](problems.md#expertchoice) |0.2.0 |__+1__ | | | +|[fgeo.tool](problems.md#fgeotool) |1.2.7 |__+1__ | | | +|[finetune](problems.md#finetune) |0.1.0 |__+1__ | |1 | +|[geonet](problems.md#geonet) |0.1.1 |__+1__ | | | +|[ggiraph](problems.md#ggiraph) |0.7.10 |__+2__ | |1 | +|[ggiraphExtra](problems.md#ggiraphextra) |0.3.0 |__+1__ | | | +|[ggspatial](problems.md#ggspatial) |1.1.5 |__+1__ | | | +|[graphicalVAR](problems.md#graphicalvar) |0.2.4 |__+1__ | | | +|[grobblR](problems.md#grobblr) |0.2.0 |__+2__ | | | +|[groupr](problems.md#groupr) |0.1.0 |__+1__ | | | +|[heatwaveR](problems.md#heatwaver) |0.4.5 |__+1__ | | | +|[HEDA](problems.md#heda) |0.1.5 |__+1__ | | | +|[heemod](problems.md#heemod) |0.14.2 |__+1__ | | | +|[htmlTable](problems.md#htmltable) |2.2.1 |__+2__ | | | +|[hurricaneexposure](problems.md#hurricaneexposure) |0.1.1 |__+1__ | |1 | +|[impactr](problems.md#impactr) |0.1.0 |__+2__ | | | +|[isoreader](problems.md#isoreader) |1.3.0 |__+1__ | | | +|[ITNr](problems.md#itnr) |0.6.0 |__+1__ | | | +|[LexisNexisTools](problems.md#lexisnexistools) |0.3.4 |__+1__ | | | +|[lvmisc](problems.md#lvmisc) |0.1.1 |__+1__ | | | +|[mfGARCH](problems.md#mfgarch) |0.2.1 |__+1__ | | | +|[mortAAR](problems.md#mortaar) |1.1.1 |__+1__ | | | +|[msigdbr](problems.md#msigdbr) |7.4.1 |__+1__ | |1 | +|[neonstore](problems.md#neonstore) |0.4.3 |__+2__ | |1 | +|[OncoBayes2](problems.md#oncobayes2) |0.7-0 |__+1__ | |2 | +|[optimall](problems.md#optimall) |0.1.0 |__+2__ | | | +|[phenofit](problems.md#phenofit) |0.2.7 |__+2__ | |1 | +|[pitchRx](problems.md#pitchrx) |1.8.2 |__+1__ | |1 | +|[PKNCA](problems.md#pknca) |0.9.4 |__+1__ | | | +|[prettyglm](problems.md#prettyglm) |0.1.0 |__+1__ | |1 | +|[psychmeta](problems.md#psychmeta) |2.6.0 |__+2__ | |1 | +|[REddyProc](problems.md#reddyproc) |1.2.2 |__+1__ | | | +|[reproducer](problems.md#reproducer) |0.4.2 |__+1__ | | | +|[RKorAPClient](problems.md#rkorapclient) |0.6.1 |__+1__ | | | +|[rubias](problems.md#rubias) |0.3.2 |__+1__ | |2 | +|[sapfluxnetr](problems.md#sapfluxnetr) |0.1.1 |__+2__ | |1 | +|[sim2Dpredictr](problems.md#sim2dpredictr) |0.1.0 |__+2__ | |1 | +|[SMMT](problems.md#smmt) |1.0.7 |__+1__ | | | +|[stacks](problems.md#stacks) |0.2.1 |__+1__ | |2 | +|[stevemisc](problems.md#stevemisc) |1.2.0 |__+1__ | |1 | +|[tablet](problems.md#tablet) |0.3.2 |__+1__ | | | +|[textrecipes](problems.md#textrecipes) |0.4.1 |__+1__ | | | +|[tidypredict](problems.md#tidypredict) |0.4.8 |__+1__ | | | +|[tune](problems.md#tune) |0.1.6 |__+1__ | | | +|[twoxtwo](problems.md#twoxtwo) |0.1.0 |__+1__ | | | +|[VarBundle](problems.md#varbundle) |0.3.0 |__+1__ | | | +|[visR](problems.md#visr) |0.2.0 |__+2__ | |1 | +|[vlda](problems.md#vlda) |1.1.5 |__+1__ | | | +|[workflowsets](problems.md#workflowsets) |0.1.0 |__+1__ | | | +|[wpa](problems.md#wpa) |1.6.0 |__+1__ | | | +|[xpose4](problems.md#xpose4) |4.7.1 |__+2__ | | | +|[xrf](problems.md#xrf) |0.2.0 |__+1__ | | | +|[ypr](problems.md#ypr) |0.5.2 |__+1__ | | | diff --git a/revdep/cran.md b/revdep/cran.md index d2524b579..31e99be29 100644 --- a/revdep/cran.md +++ b/revdep/cran.md @@ -1,7 +1,234 @@ ## revdepcheck results -We checked 303 reverse dependencies (300 from CRAN + 3 from BioConductor), comparing R CMD check results across CRAN and dev versions of this package. +We checked 2993 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. - * We saw 0 new problems - * We failed to check 0 packages + * We saw 61 new problems + * We failed to check 24 packages +Issues with CRAN packages are summarised below. + +### New problems +(This reports the first line of each new failure) + +* AGread + checking tests ... ERROR + +* comparer + checking tests ... ERROR + +* crosstable + checking tests ... ERROR + +* dat + checking tests ... ERROR + +* designr + checking examples ... ERROR + +* drake + checking tests ... ERROR + +* EFAtools + checking examples ... ERROR + +* egor + checking examples ... ERROR + checking tests ... ERROR + +* ExpertChoice + checking examples ... ERROR + +* fgeo.tool + checking tests ... ERROR + +* finetune + checking tests ... ERROR + +* geonet + checking examples ... ERROR + +* ggiraph + checking examples ... ERROR + checking tests ... ERROR + +* ggiraphExtra + checking examples ... ERROR + +* ggspatial + checking tests ... ERROR + +* graphicalVAR + checking examples ... ERROR + +* grobblR + checking examples ... ERROR + checking tests ... ERROR + +* groupr + checking tests ... ERROR + +* heatwaveR + checking tests ... ERROR + +* HEDA + checking examples ... ERROR + +* heemod + checking tests ... ERROR + +* htmlTable + checking examples ... ERROR + checking tests ... ERROR + +* hurricaneexposure + checking examples ... ERROR + +* impactr + checking examples ... ERROR + checking tests ... ERROR + +* isoreader + checking tests ... ERROR + +* ITNr + checking examples ... ERROR + +* LexisNexisTools + checking tests ... ERROR + +* lvmisc + checking examples ... ERROR + +* mfGARCH + checking tests ... ERROR + +* mortAAR + checking examples ... ERROR + +* msigdbr + checking tests ... ERROR + +* neonstore + checking examples ... ERROR + checking tests ... ERROR + +* OncoBayes2 + checking examples ... ERROR + +* optimall + checking examples ... ERROR + checking tests ... ERROR + +* phenofit + checking examples ... ERROR + checking tests ... ERROR + +* pitchRx + checking examples ... ERROR + +* PKNCA + checking tests ... ERROR + +* prettyglm + checking examples ... ERROR + +* psychmeta + checking examples ... ERROR + checking tests ... ERROR + +* REddyProc + checking tests ... ERROR + +* reproducer + checking examples ... ERROR + +* RKorAPClient + checking tests ... ERROR + +* rubias + checking examples ... ERROR + +* sapfluxnetr + checking examples ... ERROR + checking tests ... ERROR + +* sim2Dpredictr + checking examples ... ERROR + checking tests ... ERROR + +* SMMT + checking tests ... ERROR + +* stacks + checking tests ... ERROR + +* stevemisc + checking examples ... ERROR + +* tablet + checking tests ... ERROR + +* textrecipes + checking tests ... ERROR + +* tidypredict + checking tests ... ERROR + +* tune + checking examples ... ERROR + +* twoxtwo + checking tests ... ERROR + +* VarBundle + checking tests ... ERROR + +* visR + checking examples ... ERROR + checking tests ... ERROR + +* vlda + checking examples ... ERROR + +* workflowsets + checking tests ... ERROR + +* wpa + checking examples ... ERROR + +* xpose4 + checking examples ... ERROR + checking tests ... ERROR + +* xrf + checking tests ... ERROR + +* ypr + checking tests ... ERROR + +### Failed to check + +* bayesdfa (NA) +* CB2 (NA) +* cbar (NA) +* diceR (NA) +* dimRed (NA) +* do (NA) +* ggmsa (NA) +* glmmfields (NA) +* loon.shiny (NA) +* loon.tourr (NA) +* MarketMatching (NA) +* metagam (NA) +* pencal (NA) +* phylopath (NA) +* rabhit (NA) +* raw (NA) +* rmdcev (NA) +* rstap (NA) +* scoper (NA) +* SynthETIC (NA) +* tigger (NA) +* trackr (NA) +* vivid (NA) +* wrswoR (NA) diff --git a/revdep/failures.md b/revdep/failures.md index dcd90cd11..16cab6fd2 100644 --- a/revdep/failures.md +++ b/revdep/failures.md @@ -1,50 +1,92 @@ -# apaTables +# bayesdfa
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 1.1.0 +* GitHub: https://github.com/fate-ewi/bayesdfa +* Source code: https://github.com/cran/bayesdfa +* Date/Publication: 2021-05-28 18:10:05 UTC +* Number of recursive dependencies: 81 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "bayesdfa")` for more info
-## Error before installation +## In both -### Devel +* checking whether package ‘bayesdfa’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/bayesdfa/new/bayesdfa.Rcheck/00install.out’ for details. + ``` -``` +## Installation +### Devel +``` +* installing *source* package ‘bayesdfa’ ... +** package ‘bayesdfa’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, + from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, + from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/RcppEigenForward.h:30, +... +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/ProductEvaluators.h:35:90: required from ‘Eigen::internal::evaluator >::evaluator(const XprType&) [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Options = 0; Eigen::internal::evaluator >::XprType = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>, Eigen::Matrix, 0>]’ +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_dfa_namespace::model_dfa; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stanExports_dfa.o] Error 1 +ERROR: compilation failed for package ‘bayesdfa’ +* removing ‘/tmp/workdir/bayesdfa/new/bayesdfa.Rcheck/bayesdfa’ ``` ### CRAN ``` +* installing *source* package ‘bayesdfa’ ... +** package ‘bayesdfa’ successfully unpacked and MD5 sums checked +** using staged installation +** libs - - +g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, + from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, + from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/RcppEigenForward.h:30, +... +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/ProductEvaluators.h:35:90: required from ‘Eigen::internal::evaluator >::evaluator(const XprType&) [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Options = 0; Eigen::internal::evaluator >::XprType = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>, Eigen::Matrix, 0>]’ +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_dfa_namespace::model_dfa; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stanExports_dfa.o] Error 1 +ERROR: compilation failed for package ‘bayesdfa’ +* removing ‘/tmp/workdir/bayesdfa/old/bayesdfa.Rcheck/bayesdfa’ ``` -# broom +# CB2
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 1.3.4 +* GitHub: NA +* Source code: https://github.com/cran/CB2 +* Date/Publication: 2020-07-24 09:42:24 UTC +* Number of recursive dependencies: 105 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "CB2")` for more info
@@ -53,7 +95,23 @@ Run `revdep_details(,"")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/CB2/new/CB2.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘CB2/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘CB2’ version ‘1.3.4’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘metap’ +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -63,24 +121,40 @@ Run `revdep_details(,"")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/CB2/old/CB2.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘CB2/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘CB2’ version ‘1.3.4’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘metap’ +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# broom.mixed +# cbar
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 0.1.3 +* GitHub: https://github.com/zedoul/cbar +* Source code: https://github.com/cran/cbar +* Date/Publication: 2017-10-24 13:20:22 UTC +* Number of recursive dependencies: 63 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "cbar")` for more info
@@ -89,7 +163,22 @@ Run `revdep_details(,"")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/cbar/new/cbar.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘cbar/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘cbar’ version ‘0.1.3’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'Boom', 'bsts' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -99,24 +188,39 @@ Run `revdep_details(,"")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/cbar/old/cbar.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘cbar/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘cbar’ version ‘0.1.3’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'Boom', 'bsts' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# CNVScope +# diceR
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 1.1.0 +* GitHub: https://github.com/AlineTalhouk/diceR +* Source code: https://github.com/cran/diceR +* Date/Publication: 2021-07-23 19:30:01 UTC +* Number of recursive dependencies: 152 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "diceR")` for more info
@@ -125,7 +229,23 @@ Run `revdep_details(,"")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/diceR/new/diceR.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘diceR/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘diceR’ version ‘1.1.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘NMF’ +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -135,24 +255,40 @@ Run `revdep_details(,"")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/diceR/old/diceR.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘diceR/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘diceR’ version ‘1.1.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘NMF’ +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# codebook +# dimRed
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 0.2.3 +* GitHub: https://github.com/gdkrmr/dimRed +* Source code: https://github.com/cran/dimRed +* Date/Publication: 2019-05-08 08:10:07 UTC +* Number of recursive dependencies: 128 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "dimRed")` for more info
@@ -161,7 +297,27 @@ Run `revdep_details(,"")` for more info ### Devel ``` - +* using log directory ‘/tmp/workdir/dimRed/new/dimRed.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘dimRed/DESCRIPTION’ ... OK +* this is package ‘dimRed’ version ‘0.2.3’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... NOTE +... + + 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 + ‘dimensionality-reduction.Rnw’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... SKIPPED +* DONE +Status: 2 ERRORs, 2 NOTEs @@ -171,50 +327,102 @@ Run `revdep_details(,"")` for more info ### CRAN ``` - +* using log directory ‘/tmp/workdir/dimRed/old/dimRed.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘dimRed/DESCRIPTION’ ... OK +* this is package ‘dimRed’ version ‘0.2.3’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... NOTE +... + + 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 + ‘dimensionality-reduction.Rnw’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... SKIPPED +* DONE +Status: 2 ERRORs, 2 NOTEs ``` -# codemetar +# do
-* Version: 0.1.8 -* Source code: https://github.com/cran/codemetar -* URL: https://github.com/ropensci/codemetar, https://ropensci.github.io/codemetar -* BugReports: https://github.com/ropensci/codemetar/issues -* Date/Publication: 2019-04-22 04:20:03 UTC -* Number of recursive dependencies: 79 +* Version: 1.9.0.0 +* GitHub: https://github.com/yikeshu0611/do +* Source code: https://github.com/cran/do +* Date/Publication: 2021-07-16 07:40:07 UTC +* Number of recursive dependencies: 64 -Run `revdep_details(,"codemetar")` for more info +Run `cloud_details(, "do")` for more info
## In both -* R CMD check timed out - - -* checking dependencies in R code ... NOTE +* checking whether package ‘do’ can be installed ... ERROR ``` - Namespace in Imports field not imported from: ‘memoise’ - All declared Imports should be used. + Installation failed. + See ‘/tmp/workdir/do/new/do.Rcheck/00install.out’ for details. ``` -# embed +## Installation + +### Devel + +``` +* installing *source* package ‘do’ ... +** package ‘do’ successfully unpacked and MD5 sums checked +** using staged installation +** R +Error in parse(outFile) : + /tmp/workdir/do/new/do.Rcheck/00_pkg_src/do/R/file.name.R:13:19: unexpected '>' +12: file.name <- function(...){ +13: fn <- c(...) |> + ^ +ERROR: unable to collate and parse R files for package ‘do’ +* removing ‘/tmp/workdir/do/new/do.Rcheck/do’ + + +``` +### CRAN + +``` +* installing *source* package ‘do’ ... +** package ‘do’ successfully unpacked and MD5 sums checked +** using staged installation +** R +Error in parse(outFile) : + /tmp/workdir/do/old/do.Rcheck/00_pkg_src/do/R/file.name.R:13:19: unexpected '>' +12: file.name <- function(...){ +13: fn <- c(...) |> + ^ +ERROR: unable to collate and parse R files for package ‘do’ +* removing ‘/tmp/workdir/do/old/do.Rcheck/do’ + + +``` +# ggmsa
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 0.0.6 +* GitHub: NA +* Source code: https://github.com/cran/ggmsa +* Date/Publication: 2021-02-02 10:10:07 UTC +* Number of recursive dependencies: 70 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "ggmsa")` for more info
@@ -223,7 +431,24 @@ Run `revdep_details(,"")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/ggmsa/new/ggmsa.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘ggmsa/DESCRIPTION’ ... OK +* this is package ‘ggmsa’ version ‘0.0.6’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘Biostrings’ + +Packages suggested but not available for checking: 'ggtree', 'seqmagick' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -233,80 +458,187 @@ Run `revdep_details(,"")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/ggmsa/old/ggmsa.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘ggmsa/DESCRIPTION’ ... OK +* this is package ‘ggmsa’ version ‘0.0.6’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘Biostrings’ +Packages suggested but not available for checking: 'ggtree', 'seqmagick' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# ggstatsplot +# glmmfields
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 0.1.4 +* GitHub: https://github.com/seananderson/glmmfields +* Source code: https://github.com/cran/glmmfields +* Date/Publication: 2020-07-09 05:50:03 UTC +* Number of recursive dependencies: 93 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "glmmfields")` for more info
-## Error before installation +## In both + +* checking whether package ‘glmmfields’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/glmmfields/new/glmmfields.Rcheck/00install.out’ for details. + ``` + +## Installation ### Devel ``` +* installing *source* package ‘glmmfields’ ... +** package ‘glmmfields’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +"/opt/R/4.0.3/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/glmmfields.stan +Wrote C++ file "stan_files/glmmfields.cc" + +g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -fpic -g -O2 -c stan_files/glmmfields.cc -o stan_files/glmmfields.o +In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, +... +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_glmmfields_namespace::model_glmmfields; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stan_files/glmmfields.o] Error 1 +rm stan_files/glmmfields.cc +ERROR: compilation failed for package ‘glmmfields’ +* removing ‘/tmp/workdir/glmmfields/new/glmmfields.Rcheck/glmmfields’ +``` +### CRAN + +``` +* installing *source* package ‘glmmfields’ ... +** package ‘glmmfields’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +"/opt/R/4.0.3/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/glmmfields.stan +Wrote C++ file "stan_files/glmmfields.cc" + +g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -fpic -g -O2 -c stan_files/glmmfields.cc -o stan_files/glmmfields.o +In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, +... +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_glmmfields_namespace::model_glmmfields; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stan_files/glmmfields.o] Error 1 +rm stan_files/glmmfields.cc +ERROR: compilation failed for package ‘glmmfields’ +* removing ‘/tmp/workdir/glmmfields/old/glmmfields.Rcheck/glmmfields’ ``` -### CRAN +# loon.shiny + +
+ +* Version: 1.0.0 +* GitHub: NA +* Source code: https://github.com/cran/loon.shiny +* Date/Publication: 2021-06-10 16:30:06 UTC +* Number of recursive dependencies: 133 + +Run `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.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘loon.shiny/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘loon.shiny’ version ‘1.0.0’ +* 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 ``` -# healthcareai +### CRAN -
+``` +* using log directory ‘/tmp/workdir/loon.shiny/old/loon.shiny.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘loon.shiny/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘loon.shiny’ version ‘1.0.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'loon', 'loon.ggplot' -* Version: 2.4.0 -* Source code: https://github.com/cran/healthcareai -* URL: http://docs.healthcare.ai -* BugReports: https://github.com/HealthCatalyst/healthcareai-r/issues -* Date/Publication: 2020-02-28 18:00:05 UTC -* Number of recursive dependencies: 119 +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR -Run `revdep_details(,"healthcareai")` for more info -
-## In both -* R CMD check timed out - -# holodeck +``` +# loon.tourr
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 0.1.2 +* GitHub: https://github.com/z267xu/loon.tourr +* Source code: https://github.com/cran/loon.tourr +* Date/Publication: 2021-07-25 20:40:03 UTC +* Number of recursive dependencies: 118 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "loon.tourr")` for more info
@@ -315,7 +647,23 @@ Run `revdep_details(,"")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/loon.tourr/new/loon.tourr.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘loon.tourr/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘loon.tourr’ version ‘0.1.2’ +* 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 @@ -325,24 +673,40 @@ Run `revdep_details(,"")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/loon.tourr/old/loon.tourr.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘loon.tourr/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘loon.tourr’ version ‘0.1.2’ +* 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 ``` -# mcp +# MarketMatching
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 1.2.0 +* GitHub: NA +* Source code: https://github.com/cran/MarketMatching +* Date/Publication: 2021-01-08 20:10:02 UTC +* Number of recursive dependencies: 67 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "MarketMatching")` for more info
@@ -351,7 +715,22 @@ Run `revdep_details(,"")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/MarketMatching/new/MarketMatching.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘MarketMatching/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘MarketMatching’ version ‘1.2.0’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'CausalImpact', 'bsts', 'Boom' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -361,90 +740,111 @@ Run `revdep_details(,"")` for more info ### CRAN ``` -* using log directory ‘/home/rstudio/tibble/revdep/checks/mcp/old/mcp.Rcheck’ -* using R version 3.6.2 (2019-12-12) +* using log directory ‘/tmp/workdir/MarketMatching/old/MarketMatching.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘MarketMatching/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘MarketMatching’ version ‘1.2.0’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'CausalImpact', 'bsts', 'Boom' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# metagam + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/Lifebrain/metagam +* Source code: https://github.com/cran/metagam +* Date/Publication: 2020-11-12 08:10:02 UTC +* Number of recursive dependencies: 145 + +Run `cloud_details(, "metagam")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/metagam/new/metagam.Rcheck’ +* using R version 4.0.3 (2020-10-10) * using platform: x86_64-pc-linux-gnu (64-bit) * using session charset: UTF-8 * using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘mcp/DESCRIPTION’ ... OK -* this is package ‘mcp’ version ‘0.2.0’ +* checking for file ‘metagam/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘metagam’ version ‘0.2.0’ * package encoding: UTF-8 * checking package namespace information ... OK -* checking package dependencies ... OK -* checking if this is a source package ... OK -* checking if there is a namespace ... OK -* checking for executable files ... OK -* checking for hidden files and directories ... OK -* checking for portable file names ... OK -* checking for sufficient/correct file permissions ... OK -* checking whether package ‘mcp’ can be installed ... OK -* checking installed package size ... OK -* checking package directory ... OK -* checking DESCRIPTION meta-information ... OK -* checking top-level files ... OK -* checking for left-over files ... OK -* checking index information ... OK -* checking package subdirectories ... OK -* checking R files for non-ASCII characters ... OK -* checking R files for syntax errors ... OK -* checking whether the package can be loaded ... OK -* checking whether the package can be loaded with stated dependencies ... OK -* checking whether the package can be unloaded cleanly ... OK -* checking whether the namespace can be loaded with stated dependencies ... OK -* checking whether the namespace can be unloaded cleanly ... OK -* checking loading without being on the library search path ... OK -* checking dependencies in R code ... NOTE -Namespaces in Imports field not imported from: - ‘bayesplot’ ‘methods’ ‘purrr’ - All declared Imports should be used. -* checking S3 generic/method consistency ... OK -* checking replacement functions ... OK -* checking foreign function calls ... OK -* checking R code for possible problems ... OK -* checking Rd files ... OK -* checking Rd metadata ... OK -* checking Rd cross-references ... OK -* checking for missing documentation entries ... OK -* checking for code/documentation mismatches ... OK -* checking Rd \usage sections ... OK -* checking Rd contents ... OK -* checking for unstated dependencies in examples ... OK -* checking contents of ‘data’ directory ... OK -* checking data for non-ASCII characters ... OK -* checking data for ASCII and uncompressed saves ... OK -* checking examples ... OK -* checking for unstated dependencies in ‘tests’ ... OK -* checking tests ... - OK +* checking package dependencies ... ERROR +Package required but not available: ‘metap’ + +Package suggested but not available for checking: ‘multtest’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. * DONE -Status: 1 NOTE +Status: 1 ERROR - Running ‘testthat.R’ -See - ‘/home/rstudio/tibble/revdep/checks/mcp/old/mcp.Rcheck/00check.log’ -for details. +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/metagam/old/metagam.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘metagam/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘metagam’ version ‘0.2.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘metap’ + +Package suggested but not available for checking: ‘multtest’ +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# obfuscatoR +# pencal
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 0.4.2 +* GitHub: NA +* Source code: https://github.com/cran/pencal +* Date/Publication: 2021-05-28 09:30:02 UTC +* Number of recursive dependencies: 152 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "pencal")` for more info
@@ -453,7 +853,24 @@ Run `revdep_details(,"")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/pencal/new/pencal.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘pencal/DESCRIPTION’ ... OK +* this is package ‘pencal’ version ‘0.4.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘survcomp’ + +Package suggested but not available for checking: ‘ptmixed’ +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -463,87 +880,107 @@ Run `revdep_details(,"")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/pencal/old/pencal.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘pencal/DESCRIPTION’ ... OK +* this is package ‘pencal’ version ‘0.4.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘survcomp’ +Package suggested but not available for checking: ‘ptmixed’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# oolong +# phylopath
-* Version: 0.3.4 -* Source code: https://github.com/cran/oolong -* URL: https://github.com/chainsawriot/oolong -* BugReports: https://github.com/chainsawriot/oolong/issues -* Date/Publication: 2020-03-21 17:40:06 UTC -* Number of recursive dependencies: 121 +* Version: 1.1.2 +* GitHub: https://github.com/Ax3man/phylopath +* Source code: https://github.com/cran/phylopath +* Date/Publication: 2019-12-07 01:10:07 UTC +* Number of recursive dependencies: 90 -Run `revdep_details(,"oolong")` for more info +Run `cloud_details(, "phylopath")` for more info
-## In both - -* checking whether package ‘oolong’ can be installed ... ERROR - ``` - Installation failed. - See ‘/home/rstudio/tibble/revdep/checks/oolong/new/oolong.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘oolong’ ... -** package ‘oolong’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -Warning: namespace ‘text2vec’ is not available and has been replaced -by .GlobalEnv when processing object ‘abstracts_warplda’ -Warning: namespace ‘text2vec’ is not available and has been replaced -by .GlobalEnv when processing object ‘abstracts_warplda’ -Error in normalize(self$components, "l1") : - could not find function "normalize" -ERROR: lazydata failed for package ‘oolong’ -* removing ‘/home/rstudio/tibble/revdep/checks/oolong/new/oolong.Rcheck/oolong’ +* using log directory ‘/tmp/workdir/phylopath/new/phylopath.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘phylopath/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘phylopath’ version ‘1.1.2’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘ggm’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + ``` ### CRAN ``` -* installing *source* package ‘oolong’ ... -** package ‘oolong’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -Warning: namespace ‘text2vec’ is not available and has been replaced -by .GlobalEnv when processing object ‘abstracts_warplda’ -Warning: namespace ‘text2vec’ is not available and has been replaced -by .GlobalEnv when processing object ‘abstracts_warplda’ -Error in normalize(self$components, "l1") : - could not find function "normalize" -ERROR: lazydata failed for package ‘oolong’ -* removing ‘/home/rstudio/tibble/revdep/checks/oolong/old/oolong.Rcheck/oolong’ +* using log directory ‘/tmp/workdir/phylopath/old/phylopath.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘phylopath/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘phylopath’ version ‘1.1.2’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘ggm’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + ``` -# statsExpressions +# rabhit
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 0.1.5 +* GitHub: NA +* Source code: https://github.com/cran/rabhit +* Date/Publication: 2020-07-11 22:40:02 UTC +* Number of recursive dependencies: 127 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "rabhit")` for more info
@@ -552,7 +989,23 @@ Run `revdep_details(,"")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/rabhit/new/rabhit.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘rabhit/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘rabhit’ version ‘0.1.5’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'alakazam', 'tigger' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -562,24 +1015,40 @@ Run `revdep_details(,"")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/rabhit/old/rabhit.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘rabhit/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘rabhit’ version ‘0.1.5’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'alakazam', 'tigger' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# STRMPS +# raw
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 0.1.8 +* GitHub: NA +* Source code: https://github.com/cran/raw +* Date/Publication: 2021-02-05 15:40:03 UTC +* Number of recursive dependencies: 162 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "raw")` for more info
@@ -588,7 +1057,27 @@ Run `revdep_details(,"")` for more info ### Devel ``` - +* using log directory ‘/tmp/workdir/raw/new/raw.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘raw/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘raw’ version ‘0.1.8’ +* package encoding: UTF-8 +* checking package namespace information ... 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 ... NONE + ‘raw.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... SKIPPED +* DONE +Status: 1 NOTE @@ -598,60 +1087,200 @@ Run `revdep_details(,"")` for more info ### CRAN ``` - +* using log directory ‘/tmp/workdir/raw/old/raw.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘raw/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘raw’ version ‘0.1.8’ +* package encoding: UTF-8 +* checking package namespace information ... 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 ... NONE + ‘raw.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... SKIPPED +* DONE +Status: 1 NOTE ``` -# TestDimorph +# rmdcev
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 1.2.4 +* GitHub: https://github.com/plloydsmith/rmdcev +* Source code: https://github.com/cran/rmdcev +* Date/Publication: 2020-09-30 18:40:02 UTC +* Number of recursive dependencies: 82 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "rmdcev")` for more info
-## Error before installation +## In both -### Devel +* checking whether package ‘rmdcev’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/rmdcev/new/rmdcev.Rcheck/00install.out’ for details. + ``` -``` +## Installation +### Devel +``` +* installing *source* package ‘rmdcev’ ... +** package ‘rmdcev’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, + from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, + from /opt/R/4.0.3/lib/R/site-library/StanHeaders/include/stan/math/prim/mat/fun/Eigen.hpp:13, +... +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/ProductEvaluators.h:35:90: required from ‘Eigen::internal::evaluator >::evaluator(const XprType&) [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Options = 0; Eigen::internal::evaluator >::XprType = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>, Eigen::Matrix, 0>]’ +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_mdcev_namespace::model_mdcev; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stanExports_mdcev.o] Error 1 +ERROR: compilation failed for package ‘rmdcev’ +* removing ‘/tmp/workdir/rmdcev/new/rmdcev.Rcheck/rmdcev’ ``` ### CRAN ``` +* installing *source* package ‘rmdcev’ ... +** package ‘rmdcev’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, + from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, + from /opt/R/4.0.3/lib/R/site-library/StanHeaders/include/stan/math/prim/mat/fun/Eigen.hpp:13, +... +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/ProductEvaluators.h:35:90: required from ‘Eigen::internal::evaluator >::evaluator(const XprType&) [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Options = 0; Eigen::internal::evaluator >::XprType = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>, Eigen::Matrix, 0>]’ +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_mdcev_namespace::model_mdcev; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stanExports_mdcev.o] Error 1 +ERROR: compilation failed for package ‘rmdcev’ +* removing ‘/tmp/workdir/rmdcev/old/rmdcev.Rcheck/rmdcev’ +``` +# rstap + +
+ +* Version: 1.0.3 +* GitHub: https://github.com/biostatistics4socialimpact/rstap +* Source code: https://github.com/cran/rstap +* Date/Publication: 2019-02-06 20:30:03 UTC +* Number of recursive dependencies: 110 + +Run `cloud_details(, "rstap")` for more info + +
+ +## In both + +* checking whether package ‘rstap’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/rstap/new/rstap.Rcheck/00install.out’ for details. + ``` +## Installation + +### Devel ``` -# tidybayes +* installing *source* package ‘rstap’ ... +** package ‘rstap’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +"/opt/R/4.0.3/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/stap_binomial.stan +Wrote C++ file "stan_files/stap_binomial.cc" +g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"`"/opt/R/4.0.3/lib/R/bin/Rscript" --vanilla -e "cat(system.file('include', 'src', package = 'StanHeaders'))"`" -DBOOST_RESULT_OF_USE_TR1 -DBOOST_NO_DECLTYPE -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fpic -g -O2 -c stan_files/stap_binomial.cc -o stan_files/stap_binomial.o +In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, + from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, + from /opt/R/4.0.3/lib/R/site-library/StanHeaders/include/stan/math/prim/mat/fun/Eigen.hpp:13, +... +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_stap_binomial_namespace::model_stap_binomial; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stan_files/stap_binomial.o] Error 1 +rm stan_files/stap_binomial.cc +ERROR: compilation failed for package ‘rstap’ +* removing ‘/tmp/workdir/rstap/new/rstap.Rcheck/rstap’ + + +``` +### CRAN + +``` +* installing *source* package ‘rstap’ ... +** package ‘rstap’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +"/opt/R/4.0.3/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/stap_binomial.stan +Wrote C++ file "stan_files/stap_binomial.cc" +g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"`"/opt/R/4.0.3/lib/R/bin/Rscript" --vanilla -e "cat(system.file('include', 'src', package = 'StanHeaders'))"`" -DBOOST_RESULT_OF_USE_TR1 -DBOOST_NO_DECLTYPE -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fpic -g -O2 -c stan_files/stap_binomial.cc -o stan_files/stap_binomial.o +In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, + from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, + from /opt/R/4.0.3/lib/R/site-library/StanHeaders/include/stan/math/prim/mat/fun/Eigen.hpp:13, +... +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_stap_binomial_namespace::model_stap_binomial; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here +/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stan_files/stap_binomial.o] Error 1 +rm stan_files/stap_binomial.cc +ERROR: compilation failed for package ‘rstap’ +* removing ‘/tmp/workdir/rstap/old/rstap.Rcheck/rstap’ + + +``` +# scoper
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 1.1.0 +* GitHub: NA +* Source code: https://github.com/cran/scoper +* Date/Publication: 2020-08-10 21:50:02 UTC +* Number of recursive dependencies: 119 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "scoper")` for more info
@@ -660,7 +1289,23 @@ Run `revdep_details(,"")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/scoper/new/scoper.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘scoper/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘scoper’ version ‘1.1.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'alakazam', 'shazam' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -670,24 +1315,40 @@ Run `revdep_details(,"")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/scoper/old/scoper.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘scoper/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘scoper’ version ‘1.1.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'alakazam', 'shazam' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# tidyBF +# SynthETIC
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 1.0.1 +* GitHub: https://github.com/agi-lab/SynthETIC +* Source code: https://github.com/cran/SynthETIC +* Date/Publication: 2021-06-26 15:50:02 UTC +* Number of recursive dependencies: 108 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "SynthETIC")` for more info
@@ -696,7 +1357,27 @@ Run `revdep_details(,"")` for more info ### Devel ``` - +* using log directory ‘/tmp/workdir/SynthETIC/new/SynthETIC.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘SynthETIC/DESCRIPTION’ ... OK +* this is package ‘SynthETIC’ version ‘1.0.1’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... NOTE +... +* 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 ... NONE + ‘SynthETIC-demo.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... SKIPPED +* DONE +Status: 1 NOTE @@ -706,24 +1387,44 @@ Run `revdep_details(,"")` for more info ### CRAN ``` - +* using log directory ‘/tmp/workdir/SynthETIC/old/SynthETIC.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘SynthETIC/DESCRIPTION’ ... OK +* this is package ‘SynthETIC’ version ‘1.0.1’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... NOTE +... +* 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 ... NONE + ‘SynthETIC-demo.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... SKIPPED +* DONE +Status: 1 NOTE ``` -# tidycomm +# tigger
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 1.0.0 +* GitHub: NA +* Source code: https://github.com/cran/tigger +* Date/Publication: 2020-05-13 05:10:03 UTC +* Number of recursive dependencies: 120 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "tigger")` for more info
@@ -732,7 +1433,23 @@ Run `revdep_details(,"")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/tigger/new/tigger.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘tigger/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘tigger’ version ‘1.0.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'alakazam', 'shazam' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -742,24 +1459,40 @@ Run `revdep_details(,"")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/tigger/old/tigger.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘tigger/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘tigger’ version ‘1.0.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'alakazam', 'shazam' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# tidymodels +# trackr
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 0.10.7 +* GitHub: NA +* Source code: https://github.com/cran/trackr +* Date/Publication: 2021-05-24 14:50:02 UTC +* Number of recursive dependencies: 99 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "trackr")` for more info
@@ -768,7 +1501,23 @@ Run `revdep_details(,"")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/trackr/new/trackr.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘trackr/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘trackr’ version ‘0.10.7’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: + 'histry', 'CodeDepends', 'rsolr', 'roprov' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -778,24 +1527,40 @@ Run `revdep_details(,"")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/trackr/old/trackr.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘trackr/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘trackr’ version ‘0.10.7’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: + 'histry', 'CodeDepends', 'rsolr', 'roprov' +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# ToxicoGx +# vivid
-* Version: -* Source code: ??? -* URL: https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble -* BugReports: https://github.com/tidyverse/tibble/issues -* Number of recursive dependencies: 0 +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/vivid +* Date/Publication: 2021-04-09 09:10:02 UTC +* Number of recursive dependencies: 200 -Run `revdep_details(,"")` for more info +Run `cloud_details(, "vivid")` for more info
@@ -804,7 +1569,27 @@ Run `revdep_details(,"")` for more info ### Devel ``` - +* using log directory ‘/tmp/workdir/vivid/new/vivid.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘vivid/DESCRIPTION’ ... OK +* this is package ‘vivid’ version ‘0.1.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... NOTE +... + 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 + ‘vivid.Rmd’ using ‘UTF-8’... OK + ‘vividQStart.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... SKIPPED +* DONE +Status: 1 ERROR, 2 NOTEs @@ -814,30 +1599,106 @@ Run `revdep_details(,"")` for more info ### CRAN ``` - +* using log directory ‘/tmp/workdir/vivid/old/vivid.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘vivid/DESCRIPTION’ ... OK +* this is package ‘vivid’ version ‘0.1.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... NOTE +... + 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 + ‘vivid.Rmd’ using ‘UTF-8’... OK + ‘vividQStart.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... SKIPPED +* DONE +Status: 1 ERROR, 2 NOTEs ``` -# trialr +# wrswoR
-* Version: 0.1.3 -* Source code: https://github.com/cran/trialr -* URL: https://github.com/brockk/trialr -* BugReports: https://github.com/brockk/trialr/issues -* Date/Publication: 2020-01-08 22:30:10 UTC -* Number of recursive dependencies: 102 +* Version: 1.1.1 +* GitHub: https://github.com/krlmlr/wrswoR +* Source code: https://github.com/cran/wrswoR +* Date/Publication: 2020-07-26 18:20:02 UTC +* Number of recursive dependencies: 134 -Run `revdep_details(,"trialr")` for more info +Run `cloud_details(, "wrswoR")` for more info
-## In both +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/wrswoR/new/wrswoR.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘wrswoR/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘wrswoR’ version ‘1.1.1’ +* package encoding: UTF-8 +* checking package namespace information ... 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 +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* DONE +Status: 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/wrswoR/old/wrswoR.Rcheck’ +* using R version 4.0.3 (2020-10-10) +* using platform: x86_64-pc-linux-gnu (64-bit) +* using session charset: UTF-8 +* using options ‘--no-manual --no-build-vignettes’ +* checking for file ‘wrswoR/DESCRIPTION’ ... OK +* checking extension type ... Package +* this is package ‘wrswoR’ version ‘1.1.1’ +* package encoding: UTF-8 +* checking package namespace information ... 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 +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* DONE +Status: 1 NOTE + -* R CMD check timed out - + + +``` diff --git a/revdep/problems.md b/revdep/problems.md index f75599231..a34612fc0 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -1,278 +1,269 @@ -# autocogs +# AGread
-* Version: 0.1.2 -* Source code: https://github.com/cran/autocogs -* URL: https://github.com/schloerke/autocogs -* BugReports: https://github.com/schloerke/autocogs/issues -* Date/Publication: 2019-02-12 00:03:28 UTC -* Number of recursive dependencies: 76 +* Version: 1.1.1 +* GitHub: https://github.com/paulhibbing/AGread +* Source code: https://github.com/cran/AGread +* Date/Publication: 2020-02-26 14:30:02 UTC +* Number of recursive dependencies: 110 -Run `revdep_details(,"autocogs")` for more info +Run `cloud_details(, "AGread")` for more info
## Newly broken -* checking whether package ‘autocogs’ can be installed ... WARNING +* checking tests ... ERROR ``` - Found the following significant warnings: - Warning: `data_frame()` is deprecated as of tibble 1.1.0. - See ‘/home/rstudio/tibble/revdep/checks/autocogs/new/autocogs.Rcheck/00install.out’ for details. + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + Component 3: Attributes: < Modes: list, NULL > + Component 3: Attributes: < names for target but not for current > + Component 3: Attributes: < current is not list-like > + Component 3: Length mismatch: comparison on first 1 components + Component 3: Component 1: Numeric: lengths (179, 1) differ + Component 4: Modes: list, numeric + ... + Backtrace: + █ + 1. └─testthat::expect_equal_to_reference(...) test_gt3x.R:35:4 + 2. └─testthat::expect_known_value(..., update = update) + + [ FAIL 5 | WARN 0 | SKIP 0 | PASS 17 ] + Error: Test failures + Execution halted ``` ## In both -* checking examples ... ERROR +* checking installed package size ... NOTE ``` - ... - $remove - character(0) - - attr(,"class") - [1] "cog_spec" - [1] FALSE - > - > # set up data - > p <- ggplot2::qplot(Sepal.Length, Sepal.Width, data = iris, geom = c("point", "smooth")) - > dt <- tibble::data_frame(panel = list(p)) - Warning: `data_frame()` is deprecated as of tibble 1.1.0. - Please use `tibble()` instead. - This warning is displayed once every 8 hours. - Call `lifecycle::last_warnings()` to see where this warning was generated. - > - > # compute cognostics like normal - > add_panel_cogs(dt) - Error in switch(as.character(layer$stat_params$method), loess = "geom_smooth_loess", : - EXPR must be a length 1 vector - Calls: add_panel_cogs ... get_layer_info -> layer_info -> layer_info.ggplot -> lapply -> FUN - Execution halted + installed size is 10.5Mb + sub-directories of 1Mb or more: + libs 9.0Mb ``` -* checking tests ... +# comparer + +
+ +* Version: 0.2.2 +* GitHub: https://github.com/CollinErickson/comparer +* Source code: https://github.com/cran/comparer +* Date/Publication: 2021-03-29 09:10:09 UTC +* Number of recursive dependencies: 93 + +Run `cloud_details(, "comparer")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR ``` - ... -  6. magrittr::freduce(value, `_function_list`) -  8. function_list[[k]](value) -  9. autocogs:::expect_auto_cogs(...) -  10. p %>% plot_cogs() -  12. [ base::eval(...) ] with 1 more call -  14. autocogs:::`_fseq`(`_lhs`) -  15. magrittr::freduce(value, `_function_list`) -  17. function_list[[k]](value) -  18. autocogs:::plot_cogs(.) -  19. autocogs:::get_layer_info(p, keep = keep_layers, ...) revdep/checks/autocogs/new/autocogs.Rcheck/00_pkg_src/autocogs/R/plot_cogs.R:21:2 -  21. autocogs:::layer_info.ggplot(p, keep = keep, ...) revdep/checks/autocogs/new/autocogs.Rcheck/00_pkg_src/autocogs/R/layer_info.R:14:2 -  22. base::lapply(...) revdep/checks/autocogs/new/autocogs.Rcheck/00_pkg_src/autocogs/R/layer_info.R:36:2 -  23. autocogs:::FUN(X[[i]], ...) + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 1. ├─testthat::expect_error(f1$run_all(verbose = 0), NA) test_ffexp.R:409:2 + 2. │ └─testthat:::quasi_capture(...) + 3. │ ├─testthat:::.capture(...) + 4. │ │ └─base::withCallingHandlers(...) + 5. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 6. └─f1$run_all(verbose = 0) + ── Failure (test_ffexp.R:410:3): ffexp with single df input and df multirow output ── + all(f1$completed_runs) is not TRUE - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 241 | SKIPPED: 0 | WARNINGS: 1 | FAILED: 2 ] - 1. Failure: ggplot2 layers (@test-layers.R#20) - 2. Error: ggplot2::geom_smooth (@test-plot_cogs.R#246) + `actual`: FALSE + `expected`: TRUE - Error: testthat unit tests failed + [ FAIL 4 | WARN 1 | SKIP 0 | PASS 238 ] + Error: Test failures Execution halted ``` +## In both + * checking dependencies in R code ... NOTE ``` - Namespaces in Imports field not imported from: - ‘MASS’ ‘broom’ ‘diptest’ ‘ggplot2’ ‘hexbin’ ‘moments’ + Namespace in Imports field not imported from: ‘R6’ All declared Imports should be used. ``` -# basket +# crosstable
-* Version: 0.10.1 -* Source code: https://github.com/cran/basket -* URL: https://github.com/kaneplusplus/basket -* BugReports: https://github.com/kaneplusplus/basket/issues -* Date/Publication: 2020-03-11 05:40:02 UTC -* Number of recursive dependencies: 83 +* Version: 0.2.1 +* GitHub: https://github.com/DanChaltiel/crosstable +* Source code: https://github.com/cran/crosstable +* Date/Publication: 2021-03-08 09:20:02 UTC +* Number of recursive dependencies: 125 -Run `revdep_details(,"basket")` for more info +Run `cloud_details(, "crosstable")` for more info
## Newly broken -* checking tests ... +* checking tests ... ERROR ``` - ... - Backtrace: -  1. testthat::expect_true(inherits(plot_density(mh1), "ggplot")) -  6. basket:::plot_density.exchangeability_model(mh1) revdep/checks/basket/new/basket.Rcheck/00_pkg_src/basket/R/plot.r:33:2 -  7. base::lapply(ps, function(pt) plot_density(x[[pt]])) revdep/checks/basket/new/basket.Rcheck/00_pkg_src/basket/R/plot.r:53:2 -  8. basket:::FUN(X[[i]], ...) -  10. basket:::plot_density.mem(x[[pt]]) revdep/checks/basket/new/basket.Rcheck/00_pkg_src/basket/R/plot.r:33:2 -  12. tibble:::`$<-.tbl_df`(...) revdep/checks/basket/new/basket.Rcheck/00_pkg_src/basket/R/plot.r:71:2 -  13. tibble:::tbl_subassign(...) -  14. tibble:::vectbl_recycle_rhs(...) -  15. base::tryCatch(...) -  16. base:::tryCatchList(expr, classes, parentenv, handlers) -  17. base:::tryCatchOne(expr, names, parentenv, handlers[[1L]]) -  18. value[[3L]](cond) - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 32 | SKIPPED: 2 | WARNINGS: 0 | FAILED: 2 ] - 1. Error: (unknown) (@test-mcmc.r#74) - 2. Error: (unknown) (@test-plot.r#16) + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 4. ├─flextable::merge_v(., part = "head") + 5. └─flextable::add_header_row(., values = header_values, colwidths = header_colwidths) + ── Error (test-1-crosstable.R:414:3): Testing everything ─────────────────────── + Error: colwidths' sum must be equal to the number of col_keys (20) + Backtrace: + █ + 1. ├─flextable::as_flextable(x) + 2. ├─crosstable:::as_flextable.crosstable(x) + 3. │ └─`%>%`(...) + 4. ├─flextable::merge_v(., part = "head") + 5. └─flextable::add_header_row(., values = header_values, colwidths = header_colwidths) - Error: testthat unit tests failed + [ FAIL 12 | WARN 0 | SKIP 13 | PASS 289 ] + Error: Test failures Execution halted ``` -# beadplexr +# dat
-* Version: 0.3.0 -* Source code: https://github.com/cran/beadplexr -* URL: https://gitlab.com/ustervbo/beadplexr -* BugReports: https://gitlab.com/ustervbo/beadplexr/issues -* Date/Publication: 2020-02-05 17:00:02 UTC -* Number of recursive dependencies: 126 +* Version: 0.5.0 +* GitHub: https://github.com/wahani/dat +* Source code: https://github.com/cran/dat +* Date/Publication: 2020-05-15 19:40:03 UTC +* Number of recursive dependencies: 72 -Run `revdep_details(,"beadplexr")` for more info +Run `cloud_details(, "dat")` for more info
## Newly broken -* checking tests ... +* checking tests ... ERROR ``` - ... - ── 1. Error: ident_bead_pop() works (@test_identify_assay_analyte.R#39)  ─────── - Assigned data `c("A", "B")` must be compatible with existing data. - ✖ Existing data has 5126 rows. - ✖ Assigned data has 2 rows. - ℹ Only vectors of size 1 are recycled. - Backtrace: -  1. base::`$<-`(`*tmp*`, BeadID, value = c("A", "B")) -  2. tibble:::`$<-.tbl_df`(`*tmp*`, BeadID, value = c("A", "B")) -  3. tibble:::tbl_subassign(...) -  4. tibble:::vectbl_recycle_rhs(...) -  5. base::tryCatch(...) -  6. base:::tryCatchList(expr, classes, parentenv, handlers) -  7. base:::tryCatchOne(expr, names, parentenv, handlers[[1L]]) -  8. value[[3L]](cond) - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 398 | SKIPPED: 0 | WARNINGS: 0 | FAILED: 1 ] - 1. Error: ident_bead_pop() works (@test_identify_assay_analyte.R#39) + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 9. │ └─base::as.data.frame(x) test-mutar-data-table.R:6:4 + 10. └─base::cbind(dat, list(a = mean(dat$x))) + 11. └─tibble:::cbind(deparse.level, ...) + 12. └─vctrs::vec_cbind(!!!list(...)) + 13. └─(function () ... + 14. ├─vctrs::vec_cbind_frame_ptype(x = x) + 15. └─vctrs:::vec_cbind_frame_ptype.default(x = x) + 16. ├─x[0] + 17. └─dat:::`[.DataFrame`(x, 0) + 18. └─dat:::handleCols(...) + 19. └─(function (classes, fdef, mtable) ... - Error: testthat unit tests failed + [ FAIL 1 | WARN 4 | SKIP 1 | PASS 118 ] + Error: Test failures Execution halted ``` -# casen +# designr
-* Version: 0.1.3 -* Source code: https://github.com/cran/casen -* URL: https://pachamaltese.github.io/casen/ -* BugReports: https://github.com/pachamaltese/casen/issues -* Date/Publication: 2020-03-20 17:40:02 UTC -* Number of recursive dependencies: 81 +* Version: 0.1.12 +* GitHub: https://github.com/mmrabe/designr +* Source code: https://github.com/cran/designr +* Date/Publication: 2021-04-22 14:00:15 UTC +* Number of recursive dependencies: 102 -Run `revdep_details(,"casen")` for more info +Run `cloud_details(, "designr")` for more info
## Newly broken -* checking tests ... +* checking examples ... ERROR ``` + Running examples in ‘designr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: factor.design + > ### Title: Factorial Designs + > ### Aliases: factor.design + > + > ### ** Examples + > + > # To create an empty design: ... - - ── 3. Failure: percentiles_agrupados works properly (@test-descriptive_statistic - `str\(est\)` does not match "7 variables". - Actual value: "tibble \[12 × 7\] \(S3: tbl_df/tbl/data\.frame\)\\n \$ percentil : num \[1:12\] 0\.7 0\.7 0\.7 0\.7 0\.7 0\.7 0\.7 0\.7 0\.7 0\.7 \.\.\.\\n \$ comuna_etiqueta : chr \[1:12\] "Valdivia" "Valdivia" "Los Lagos" "Los Lagos" \.\.\.\\n \$ sexo_etiqueta : chr \[1:12\] "Mujer" "Hombre" "Hombre" "Mujer" \.\.\.\\n \$ comuna_codigo : chr \[1:12\] "14101" "14101" "14104" "14104" \.\.\.\\n \$ sexo_codigo : chr \[1:12\] "2" "1" "1" "2" \.\.\.\\n \$ mediana_ytotcorh : num \[1:12\] 1266142 1300000 853001 853162 796676 \.\.\.\\n \$ mediana_ytotcorh_err_est: num \[1:12\] 102259 102396 31364 49559 185537 \.\.\." - - trying URL 'http://observatorio.ministeriodesarrollosocial.gob.cl/casen/layout/doc/bases/Casen1990.zip' - Error in utils::download.file(u, f, mode = "wb") : - cannot open URL 'http://observatorio.ministeriodesarrollosocial.gob.cl/casen/layout/doc/bases/Casen1990.zip' - trying URL 'https://pachamaltese.github.io/casen/data-rds/1990.rds' - Content type 'application/octet-stream' length 2890424 bytes (2.8 MB) - ================================================== - downloaded 2.8 MB - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 7 | SKIPPED: 0 | WARNINGS: 5 | FAILED: 3 ] - 1. Failure: media_agrupada works properly (@test-descriptive_statistics.R#7) - 2. Failure: mediana_agrupada works properly (@test-descriptive_statistics.R#14) - 3. Failure: percentiles_agrupados works properly (@test-descriptive_statistics.R#21) - - Error: testthat unit tests failed - Execution halted + 4. │ ├─base::do.call(...) + 5. │ └─(function (...) ... + 6. │ └─designr:::na_join(ret, el) + 7. │ └─base::cbind(...) + 8. │ └─tibble:::cbind(deparse.level, ...) + 9. │ └─vctrs::vec_cbind(!!!list(...)) + 10. └─vctrs::stop_incompatible_size(...) + 11. └─vctrs:::stop_incompatible(...) + 12. └─vctrs:::stop_vctrs(...) + Execution halted ``` ## In both -* checking dependencies in R code ... NOTE - ``` - Namespaces in Imports field not imported from: - ‘Rcpp’ ‘fs’ ‘janitor’ ‘tibble’ - All declared Imports should be used. - ``` - * checking data for non-ASCII characters ... NOTE ``` - Note: found 75 marked UTF-8 strings + Note: found 47 marked UTF-8 strings ``` -# CGPfunctions +# drake
-* Version: 0.5.9 -* Source code: https://github.com/cran/CGPfunctions -* URL: https://github.com/ibecav/CGPfunctions -* BugReports: https://github.com/ibecav/CGPfunctions/issues -* Date/Publication: 2020-03-06 18:00:10 UTC -* Number of recursive dependencies: 160 +* Version: 7.13.2 +* GitHub: https://github.com/ropensci/drake +* Source code: https://github.com/cran/drake +* Date/Publication: 2021-04-22 16:40:02 UTC +* Number of recursive dependencies: 150 -Run `revdep_details(,"CGPfunctions")` for more info +Run `cloud_details(, "drake")` for more info
## Newly broken -* checking examples ... ERROR +* checking tests ... ERROR ``` - Running examples in ‘CGPfunctions-Ex.R’ failed - The error most likely occurred in: - - > ### Name: chaid_table - > ### Title: Produce CHAID results tables from a partykit CHAID model - > ### Aliases: chaid_table - > - > ### ** Examples - > - > library(CGPfunctions) - > chaid_table(chaidUS) - Error: Assigned data `min(unlist(nodeapply(chaidobject, ids = all_nodes, FUN = function(n) n$info)[[i]]))` must be compatible with existing data. - ℹ Error occurred for column `adjustedp`. - ✖ Lossy cast from `value` to `x` . + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + ── 5. Error (test-8-decorated-storr.R:264:3): flow with rds format ───────────── + Error: Can't combine `..1$command` and `..2$command` . + Backtrace: + 1. drake::drake_plan(...) test-8-decorated-storr.R:264:2 + 2. drake:::parse_custom_plan_columns(plan, envir = envir) + 7. tibble:::rbind(deparse.level, ...) + 8. vctrs::vec_rbind(!!!list(...)) + 10. vctrs::vec_default_ptype2(...) + 11. vctrs::stop_incompatible_type(...) + 12. vctrs:::stop_incompatible(...) + 13. vctrs:::stop_vctrs(...) + + ══ DONE ════════════════════════════════════════════════════════════════════════ + Error: Test failures + Execution halted ``` -# concurve +# EFAtools
-* Version: 2.3.0 -* Source code: https://github.com/cran/concurve -* URL: https://data.lesslikely.com/concurve/, https://github.com/zadchow/concurve, https://lesslikely.com/ -* BugReports: https://github.com/zadchow/concurve/issues -* Date/Publication: 2019-12-04 11:20:03 UTC -* Number of recursive dependencies: 113 +* Version: 0.3.1 +* GitHub: https://github.com/mdsteiner/EFAtools +* Source code: https://github.com/cran/EFAtools +* Date/Publication: 2021-03-27 08:40:42 UTC +* Number of recursive dependencies: 86 -Run `revdep_details(,"concurve")` for more info +Run `cloud_details(, "EFAtools")` for more info
@@ -280,50 +271,56 @@ Run `revdep_details(,"concurve")` for more info * checking examples ... ERROR ``` - ... + Running examples in ‘EFAtools-Ex.R’ failed + The error most likely occurred in: - > ### Name: curve_corr - > ### Title: Computes Consonance Intervals for Correlations - > ### Aliases: curve_corr + > ### Name: plot.EFA_AVERAGE + > ### Title: Plot EFA_AVERAGE object + > ### Aliases: plot.EFA_AVERAGE > > ### ** Examples > - > - > GroupA <- rnorm(50) - > GroupB <- rnorm(50) - > joe <- curve_corr(x = GroupA, y = GroupB, alternative = "two.sided", method = "pearson") - > tibble::tibble(joe[[1]]) - Error: All columns in a tibble must be vectors. - ✖ Column `joe[[1]]` is a `data.frame/concurve` object. - Backtrace: -  █ -  1. └─tibble::tibble(joe[[1]]) -  2.  └─tibble:::tibble_quos(xs[!is_null], .rows, .name_repair) -  3.  └─tibble:::check_valid_col(res, col_names[[j]], j) -  4.  └─tibble:::check_valid_cols(set_names(list(x), name)) + > EFA_aver <- EFA_AVERAGE(test_models$baseline$cormat, n_factors = 3, N = 500) + ... + 5. ├─...[] + 6. └─tibble:::`[.tbl_df`(...) + 7. └─tibble:::vectbl_as_col_location(...) + 8. ├─tibble:::subclass_col_index_errors(...) + 9. │ └─base::withCallingHandlers(...) + 10. └─vctrs::vec_as_location(j, n, names) + 11. └─(function () ... + 12. └─vctrs:::stop_subscript_oob(...) + 13. └─vctrs:::stop_subscript(...) Execution halted ``` ## In both +* checking installed package size ... NOTE + ``` + installed size is 9.2Mb + sub-directories of 1Mb or more: + doc 1.0Mb + libs 7.2Mb + ``` + * checking dependencies in R code ... NOTE ``` - Namespaces in Imports field not imported from: - ‘MASS’ ‘compiler’ ‘rlang’ + Namespace in Imports field not imported from: ‘progress’ All declared Imports should be used. ``` -# convergEU +# egor
-* Version: 0.4.1 -* Source code: https://github.com/cran/convergEU -* URL: https://local.disia.unifi.it/stefanini/RESEARCH/coneu/tutorial-conv.html -* Date/Publication: 2020-03-13 11:10:05 UTC -* Number of recursive dependencies: 140 +* Version: 1.21.7 +* GitHub: https://github.com/tilltnet/egor +* Source code: https://github.com/cran/egor +* Date/Publication: 2021-07-01 16:20:02 UTC +* Number of recursive dependencies: 89 -Run `revdep_details(,"convergEU")` for more info +Run `cloud_details(, "egor")` for more info
@@ -331,219 +328,190 @@ Run `revdep_details(,"convergEU")` for more info * checking examples ... ERROR ``` - ... - + 1991, 1600, 1350, 802 - + ) + Running examples in ‘egor-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_egograms + > ### Title: Plotting _egor_ objects + > ### Aliases: plot_egograms plot_ego_graphs plot_egor plot.egor + > + > ### ** Examples > - > # Country ranking according to the indicator higher is the best: - > res <- country_ranking(myTB,timeName="years") - Error: Assigned data `rank(unlist(ord_MS[auxMS, -posizTime]), ties.method = "min")` must be compatible with row subscript `auxMS`. - ✖ 1 row must be assigned. - ✖ Assigned data has 3 rows. - ℹ Only vectors of size 1 are recycled. - Backtrace: -  █ -  1. └─convergEU::country_ranking(myTB, timeName = "years") -  2.  ├─base::`[<-`(...) 00_pkg_src/convergEU/R/country_ranking.R:97:8 -  3.  └─tibble:::`[<-.tbl_df`(...) 00_pkg_src/convergEU/R/country_ranking.R:97:8 -  4.  └─tibble:::tbl_subassign(x, i, j, value, i_arg, j_arg, substitute(value)) -  5.  └─tibble:::vectbl_recycle_rhs(...) -  6.  └─base::tryCatch(...) -  7.  └─base:::tryCatchList(expr, classes, parentenv, handlers) -  8.  └─base:::tryCatchOne(expr, names, parentenv, handlers[[1L]]) -  9.  └─value[[3L]](cond) + > e <- make_egor(net.count = 5, max.alters = 12) + > plot_egograms(x = e, + + ego_no = 2, + + venn_var = "sex", + + pie_var = "country", + + vertex_size_var = "age") + Error in coords[, 4] - coords[, 2] : + non-numeric argument to binary operator + Calls: plot_egograms ... plot_egogram -> plot_one_ego_graph -> -> Execution halted ``` -* checking tests ... +* checking tests ... ERROR ``` - ... -  3. tibble:::`[.tbl_df`(sottoTB2, !is.na(sottoTB2[, aux]), ) revdep/checks/convergEU/new/convergEU.Rcheck/00_pkg_src/convergEU/R/impute_dataset.R:133:6 -  4. tibble:::tbl_subset_row(xo, i = i, i_arg) -  5. tibble:::vectbl_as_row_index(i, x, i_arg) -  6. tibble:::vectbl_as_row_location(i, nr, i_arg, assign) -  13. vctrs::vec_as_location(i, n, arg = as_label(i_arg)) - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 1755 | SKIPPED: 0 | WARNINGS: 0 | FAILED: 13 ] - 1. Error: Ranking highBest (@test_country_ranking.R#27) - 2. Error: Ranking lowBest (@test_country_ranking.R#53) - 3. Error: Simplest test on results (@test_departure_mean.R#22) - 4. Error: Change time name (@test_departure_mean.R#51) - 5. Error: Test of eurofound dataset, scrambled, further statistics. (@test_departure_mean.R#68) - 6. Error: Basic exceptions (@test_gamma_conv_msteps.R#46) - 7. Error: Basic exceptions (@test_gamma_conv_msteps.R#81) - 8. Error: LowBest and highBest (@test_graph_departure.R#60) - 9. Error: Simplest Imputation using option cut (@test_impute_dataset.R#52) - 1. ... + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + Backtrace: + █ + 1. ├─testthat::expect_warning(...) test-plot_egor.R:448:2 + 2. │ └─testthat:::quasi_capture(enquo(object), label, capture_warnings) + 3. │ ├─testthat:::.capture(...) + 4. │ │ └─base::withCallingHandlers(...) + 5. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 6. └─egor::plot_egograms(t1, 1, venn_var = "country", pie_var = "test") + 7. └─egor:::plot_egogram(...) + 8. └─egor:::plot_one_ego_graph(...) + 9. └─igraph::plot.igraph(...) - Error: testthat unit tests failed + [ FAIL 6 | WARN 1 | SKIP 0 | PASS 211 ] + Error: Test failures Execution halted ``` -## In both - -* checking dependencies in R code ... NOTE - ``` - Namespaces in Imports field not imported from: - ‘devtools’ ‘formattable’ ‘gridExtra’ ‘kableExtra’ ‘knitr’ ‘magrittr’ - ‘readr’ ‘readxl’ ‘tidyverse’ - All declared Imports should be used. - ``` - -* checking data for non-ASCII characters ... NOTE - ``` - Note: found 1 marked UTF-8 string - ``` - -# cutpointr +# ExpertChoice
-* Version: 1.0.1 -* Source code: https://github.com/cran/cutpointr -* URL: https://github.com/thie1e/cutpointr -* BugReports: https://github.com/thie1e/cutpointr/issues -* Date/Publication: 2019-12-18 15:00:08 UTC -* Number of recursive dependencies: 74 +* Version: 0.2.0 +* GitHub: https://github.com/JedStephens/ExpertChoice +* Source code: https://github.com/cran/ExpertChoice +* Date/Publication: 2020-04-03 14:30:02 UTC +* Number of recursive dependencies: 53 -Run `revdep_details(,"cutpointr")` for more info +Run `cloud_details(, "ExpertChoice")` for more info
## Newly broken -* checking tests ... +* checking examples ... ERROR ``` + Running examples in ‘ExpertChoice-Ex.R’ failed + The error most likely occurred in: + + > ### Name: check_overshadow + > ### Title: Check Overshadow - Pareto Dominate Solutions + > ### Aliases: check_overshadow + > + > ### ** Examples + > + > #See Step 7 of the Practical Introduction to ExpertChoice Vignette. ... - names for target but not for current - - ── 11. Failure: boot_test works correctly (@test-cutpointr.R#1404)  ──────────── - btg$d not equal to bt$d. - names for current but not for target - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 379 | SKIPPED: 0 | WARNINGS: 0 | FAILED: 11 ] - 1. Failure: Correct cutpoints with example data (@test-cutpointr.R#239) - 2. Failure: Correct cutpoints with example data (@test-cutpointr.R#240) - 3. Failure: Results for constrained metrics are equal to results by OptimalCutpoints (@test-cutpointr.R#563) - 4. Failure: Results for constrained metrics are equal to results by OptimalCutpoints (@test-cutpointr.R#564) - 5. Failure: Results for constrained metrics are equal to results by OptimalCutpoints (@test-cutpointr.R#570) - 6. Failure: Results for constrained metrics are equal to results by OptimalCutpoints (@test-cutpointr.R#571) - 7. Failure: Main metric gets replaced correctly when ties are broken (@test-cutpointr.R#1023) - 8. Failure: boot_ci works correctly (@test-cutpointr.R#1378) - 9. Failure: boot_test works correctly (@test-cutpointr.R#1396) - 1. ... - - Error: testthat unit tests failed - Execution halted + 2. ├─base::duplicated(...) + 3. └─base::rbind(dplyr::as_tibble(fractional_factorial_design), dplyr::as_tibble(full_factorial)) + 4. └─tibble:::rbind(deparse.level, ...) + 5. └─vctrs::vec_rbind(!!!list(...)) + 6. └─(function () ... + 7. └─vctrs::vec_default_ptype2(...) + 8. └─vctrs::stop_incompatible_type(...) + 9. └─vctrs:::stop_incompatible(...) + 10. └─vctrs:::stop_vctrs(...) + Execution halted ``` -# cvms +# fgeo.tool
-* Version: 0.3.2 -* Source code: https://github.com/cran/cvms -* URL: https://github.com/ludvigolsen/cvms -* BugReports: https://github.com/ludvigolsen/cvms/issues -* Date/Publication: 2019-12-01 23:10:02 UTC -* Number of recursive dependencies: 115 +* Version: 1.2.7 +* GitHub: https://github.com/forestgeo/fgeo.tool +* Source code: https://github.com/cran/fgeo.tool +* Date/Publication: 2021-05-25 19:40:02 UTC +* Number of recursive dependencies: 73 -Run `revdep_details(,"cvms")` for more info +Run `cloud_details(, "fgeo.tool")` for more info
## Newly broken -* checking tests ... +* checking tests ... ERROR ``` - ... - Lengths differ: 3 is not 2 + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + ══ Skipped tests ═══════════════════════════════════════════════════════════════ + • On CRAN (1) + • ctfs cannot be loaded (6) + • fgeo.data cannot be loaded (2) - ── 11. Failure: model_verbose reports the correct model functions in validate()  - ...$NULL not equal to as.character(...). - Lengths differ: 3 is not 2 + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure (test-add_var.R:41:3): add_gxgy handles NA ────────────────────────── + is.na(add_gxgy(tree)$gx1) is not TRUE - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 1617 | SKIPPED: 12 | WARNINGS: 2 | FAILED: 11 ] - 1. Failure: model_verbose reports the correct model functions in cross_validate() (@test_cross_validate.R#910) - 2. Failure: model_verbose reports the correct model functions in cross_validate() (@test_cross_validate.R#923) - 3. Failure: model_verbose reports the correct model functions in cross_validate() (@test_cross_validate.R#936) - 4. Failure: model_verbose reports the correct model functions in cross_validate() (@test_cross_validate.R#948) - 5. Failure: model_verbose reports the correct model functions in cross_validate() (@test_cross_validate.R#962) - 6. Failure: model_verbose reports the correct model functions in cross_validate() (@test_cross_validate.R#975) - 7. Failure: multinomial random predictions work with cross_validate_fn() (@test_cross_validate_fn.R#1448) - 8. Failure: model_verbose reports the correct model functions in validate() (@test_validate.R#512) - 9. Failure: model_verbose reports the correct model functions in validate() (@test_validate.R#523) - 1. ... + `actual`: + `expected`: TRUE - Error: testthat unit tests failed + [ FAIL 1 | WARN 4 | SKIP 9 | PASS 288 ] + Error: Test failures Execution halted ``` -# epikit +# finetune
* Version: 0.1.0 -* Source code: https://github.com/cran/epikit -* URL: https://github.com/R4EPI/epikit, https://r4epis.netlify.com, https://r4epi.github.io/epikit -* BugReports: https://github.com/R4EPI/epikit/issues -* Date/Publication: 2020-03-05 20:40:02 UTC -* Number of recursive dependencies: 69 +* GitHub: https://github.com/tidymodels/finetune +* Source code: https://github.com/cran/finetune +* Date/Publication: 2021-07-21 19:40:02 UTC +* Number of recursive dependencies: 162 -Run `revdep_details(,"epikit")` for more info +Run `cloud_details(, "finetune")` for more info
## Newly broken -* checking tests ... +* checking tests ... ERROR ``` - ... + Running ‘helpers.R’ + Running ‘spelling.R’ + Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(epikit) - > - > test_check("epikit") - ── 1. Failure: case_fatality_rate_df will add a total row to stratified analysis - `iris_res` not equal to `iris_n`. - Incompatible type for column `Species`: x character, y factor + Last 13 lines of output: + ══ Skipped tests ═══════════════════════════════════════════════════════════════ + • On CRAN (15) - ── 2. Failure: case_fatality_rate_df will add a total row to stratified analysis - `iris_res` not equal to `iris_n`. - Incompatible type for column `Species`: x character, y factor - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 107 | SKIPPED: 1 | WARNINGS: 0 | FAILED: 2 ] - 1. Failure: case_fatality_rate_df will add a total row to stratified analysis (@test-proportion.R#152) - 2. Failure: case_fatality_rate_df will add a total row to stratified analysis and merge CI (@test-proportion.R#173) + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Error (test-anova-filter.R:23:1): (code run outside of `test_that()`) ─────── + ... + Error: All of the models failed. See the .notes column. + Backtrace: + █ + 1. ├─tune::collect_metrics(grid_res) test-anova-filter.R:23:0 + 2. └─tune:::collect_metrics.tune_results(grid_res) + 3. └─tune::estimate_tune_results(x) - Error: testthat unit tests failed + [ FAIL 1 | WARN 1 | SKIP 15 | PASS 149 ] + Error: Test failures Execution halted ``` ## In both -* checking package dependencies ... NOTE +* checking dependencies in R code ... NOTE ``` - Package suggested but not available for checking: ‘epidict’ + Namespaces in Imports field not imported from: + ‘ranger’ ‘yardstick’ + All declared Imports should be used. ``` -# evaluator +# geonet
-* Version: 0.4.1 -* Source code: https://github.com/cran/evaluator -* URL: https://evaluator.tidyrisk.org -* BugReports: https://github.com/davidski/evaluator/issues -* Date/Publication: 2019-07-22 15:00:03 UTC -* Number of recursive dependencies: 134 +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/geonet +* Date/Publication: 2021-06-07 06:50:10 UTC +* Number of recursive dependencies: 64 -Run `revdep_details(,"evaluator")` for more info +Run `cloud_details(, "geonet")` for more info
@@ -551,68 +519,40 @@ Run `revdep_details(,"evaluator")` for more info * checking examples ... ERROR ``` - ... - Running examples in ‘evaluator-Ex.R’ failed + Running examples in ‘geonet-Ex.R’ failed The error most likely occurred in: - > ### Name: exposure_histogram - > ### Title: Display a histogram of losses for a scenario - > ### Aliases: exposure_histogram + > ### Name: as_lpp + > ### Title: Transmute to Point Pattern on a Linear Network + > ### Aliases: as_lpp as_lpp.gnpp > > ### ** Examples > - > data(mc_simulation_results) - > result <- mc_simulation_results[[1, "results"]] - > exposure_histogram(result) - Error: `data` must be a data frame, or other object coercible by `fortify()`, not a list - Backtrace: -  █ -  1. └─evaluator::exposure_histogram(result) -  2.  ├─ggplot2::ggplot(simulation_result, aes(x = .data$ale)) 00_pkg_src/evaluator/R/common_graphs.R:173:2 -  3.  └─ggplot2:::ggplot.default(simulation_result, aes(x = .data$ale)) -  4.  ├─ggplot2::fortify(data, ...) -  5.  └─ggplot2:::fortify.default(data, ...) - Execution halted - ``` - -* checking tests ... - ``` + > library(spatstat.data) ... - Expected match: "iteration" - Actual message: "All scenarios must be tidyrisk_scenario objects" - Backtrace: -  1. testthat::expect_error(...) -  6. evaluator::run_simulations(good_scen, simulation_count = 10L) - - ── 6. Error: Simulation summary handles NAs for tc/diff exceedance (@test-summar - [[ ]] improper number of subscripts - - # Scenario model: openfair_tef_tc_diff_lm - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 128 | SKIPPED: 4 | WARNINGS: 12 | FAILED: 6 ] - 1. Error: SR model works as expected (@test-openfair.R#220) - 2. Error: Simulation respects maximum ALE (@test-simulate.R#21) - 3. Failure: Missing mandatory OpenFAIR factors are detected (@test-simulate.R#29) - 4. Failure: Bad scenario parameters throw an error (@test-simulate.R#36) - 5. Failure: Multiple simulations deprecates the simulation_count parameters (@test-simulate.R#56) - 6. Error: Simulation summary handles NAs for tc/diff exceedance (@test-summarize.R#17) - - Error: testthat unit tests failed - Execution halted + spatstat.core 2.3-0 + spatstat.linnet 2.3-0 + > + > x <- as_lpp(montgomery) + Warning: Unknown or uninitialised column: `marks`. + > plot(x) + > + > L <- chicago + > X <- as_gnpp(chicago, spatstat = TRUE) + New names: ``` -# forestmangr +# ggiraph
-* Version: 0.9.1 -* Source code: https://github.com/cran/forestmangr -* URL: https://github.com/sollano/forestmangr#readme -* BugReports: https://github.com/sollano/forestmangr/issues -* Date/Publication: 2019-01-02 23:10:27 UTC -* Number of recursive dependencies: 124 +* Version: 0.7.10 +* GitHub: https://github.com/davidgohel/ggiraph +* Source code: https://github.com/cran/ggiraph +* Date/Publication: 2021-05-19 16:50:04 UTC +* Number of recursive dependencies: 99 -Run `revdep_details(,"forestmangr")` for more info +Run `cloud_details(, "ggiraph")` for more info
@@ -620,160 +560,150 @@ Run `revdep_details(,"forestmangr")` for more info * checking examples ... ERROR ``` + Running examples in ‘ggiraph-Ex.R’ failed + The error most likely occurred in: + + > ### Name: annotate_interactive + > ### Title: Create interactive annotations + > ### Aliases: annotate_interactive + > + > ### ** Examples + > + > # add interactive annotation to a ggplot ------- ... - 2: `.key` is deprecated - > - > # This can also be done directly using "merge_est" as output: - > nls_table(exfm14,dh ~ b0 * (1 - exp( -b1 * age ) )^b2, - + mod_start = tab_coef , - + .groups = "strata", - + output = "merge_est", - + est.name = "dh_est" ) %>% - + mutate( - + bias = bias_per(y = dh, yhat = dh_est), - + rmse = rmse_per(y = dh, yhat = dh_est) ) %>% - + head(15) - Error in bias_per(y = dh, yhat = dh_est) : object 'dh_est' not found - Calls: %>% ... as.data.frame -> mutate -> mutate.tbl_df -> mutate_impl -> bias_per - In addition: Warning messages: - 1: `.key` is deprecated - 2: unnest() has a new interface. See ?unnest for details. - Try `df %>% unnest(c(est_n, data_n))`, with `mutate()` if needed - 3: unnest() has a new interface. See ?unnest for details. - Try `df %>% unnest(c(dat, est))`, with `mutate()` if needed + 7. │ └─base::lapply(def_fonts, font_family_exists) + 8. │ └─ggiraph:::FUN(X[[i]], ...) + 9. │ └─ggiraph:::fortify_font_db() + 10. │ └─base::rbind(db_sys, db_reg) + 11. │ └─tibble:::rbind(deparse.level, ...) + 12. │ └─vctrs::vec_rbind(!!!list(...)) + 13. └─vctrs::stop_incompatible_type(...) + 14. └─vctrs:::stop_incompatible(...) + 15. └─vctrs:::stop_vctrs(...) Execution halted ``` -# gratia +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 3. │ └─ggiraph:::default_fontname() + 4. │ ├─base::unlist(lapply(def_fonts, font_family_exists)) + 5. │ └─base::lapply(def_fonts, font_family_exists) + 6. │ └─ggiraph:::FUN(X[[i]], ...) + 7. │ └─ggiraph:::fortify_font_db() + 8. │ └─base::rbind(db_sys, db_reg) + 9. │ └─tibble:::rbind(deparse.level, ...) + 10. │ └─vctrs::vec_rbind(!!!list(...)) + 11. └─vctrs::stop_incompatible_type(...) + 12. └─vctrs:::stop_incompatible(...) + 13. └─vctrs:::stop_vctrs(...) + + [ FAIL 28 | WARN 0 | SKIP 0 | PASS 192 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.9Mb + sub-directories of 1Mb or more: + libs 6.5Mb + ``` + +# ggiraphExtra
* Version: 0.3.0 -* Source code: https://github.com/cran/gratia -* URL: https://gavinsimpson.github.io/gratia -* BugReports: https://github.com/gavinsimpson/gratia/issues -* Date/Publication: 2020-01-19 20:20:03 UTC -* Number of recursive dependencies: 111 +* GitHub: https://github.com/cardiomoon/ggiraphExtra +* Source code: https://github.com/cran/ggiraphExtra +* Date/Publication: 2020-10-06 07:00:02 UTC +* Number of recursive dependencies: 94 -Run `revdep_details(,"gratia")` for more info +Run `cloud_details(, "ggiraphExtra")` for more info
## Newly broken -* checking tests ... +* checking examples ... ERROR ``` + Running examples in ‘ggiraphExtra-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggAncova + > ### Title: Make an interactive plot for an ANCOVA model + > ### Aliases: ggAncova ggAncova.default ggAncova.formula ggAncova.lm + > + > ### ** Examples + > + > require(moonBook) ... - ERROR - Running the tests in ‘tests/test-all.R’ failed. - Complete output: - > ## Test `gratia` using the `testthat` package - > - > ## Setup - > library("testthat") - > - > ## Runs the tests in tests/testthat - > test_check("gratia") - Loading required package: gratia - list() - ── 1. Failure: subsetting works for smooth_samples (@test-subsetting.R#23)  ──── - Names of `attrs` ('names', 'row.names', 'class', 'seed', 'data_names') don't match 'row.names', 'names', 'class', 'seed', 'data_names' - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 519 | SKIPPED: 77 | WARNINGS: 0 | FAILED: 1 ] - 1. Failure: subsetting works for smooth_samples (@test-subsetting.R#23) - - Error: testthat unit tests failed - Execution halted + 11. │ └─base::lapply(def_fonts, font_family_exists) + 12. │ └─ggiraph:::FUN(X[[i]], ...) + 13. │ └─ggiraph:::fortify_font_db() + 14. │ └─base::rbind(db_sys, db_reg) + 15. │ └─tibble:::rbind(deparse.level, ...) + 16. │ └─vctrs::vec_rbind(!!!list(...)) + 17. └─vctrs::stop_incompatible_type(...) + 18. └─vctrs:::stop_incompatible(...) + 19. └─vctrs:::stop_vctrs(...) + Execution halted ``` -# heemod +# ggspatial
-* Version: 0.11.0 -* Source code: https://github.com/cran/heemod -* BugReports: https://github.com/pierucci/heemod/issues -* Date/Publication: 2019-10-22 08:40:05 UTC -* Number of recursive dependencies: 93 +* Version: 1.1.5 +* GitHub: https://github.com/paleolimbot/ggspatial +* Source code: https://github.com/cran/ggspatial +* Date/Publication: 2021-01-04 17:30:15 UTC +* Number of recursive dependencies: 98 -Run `revdep_details(,"heemod")` for more info +Run `cloud_details(, "ggspatial")` for more info
## Newly broken -* checking examples ... ERROR - ``` - ... - > - > define_dsa( - + a, 10, 45, - + b, .5, 1.5 - + ) - Error: All columns in a tibble must be vectors. - ✖ Column `dots[i]` is a `lazy_dots` object. - Backtrace: -  █ -  1. └─heemod::define_dsa(a, 10, 45, b, 0.5, 1.5) -  2.  └─heemod:::define_dsa_(...) 00_pkg_src/heemod/R/sensitivity_define.R:47:2 -  3.  ├─base::suppressWarnings(...) 00_pkg_src/heemod/R/sensitivity_define.R:68:4 -  4.  │ └─base::withCallingHandlers(expr, warning = function(w) invokeRestart("muffleWarning")) -  5.  ├─dplyr::bind_rows(...) 00_pkg_src/heemod/R/sensitivity_define.R:69:6 -  6.  │ ├─dplyr:::flatten_bindable(dots_values(...)) -  7.  │ └─rlang::dots_values(...) -  8.  ├─stats::setNames(tibble::tibble(dots[i]), names(dots)[i]) -  9.  └─tibble::tibble(dots[i]) -  10.  └─tibble:::tibble_quos(xs[!is_null], .rows, .name_repair) -  11.  └─t - Execution halted - ``` - -* checking tests ... +* checking tests ... ERROR ``` - ... -  4. heemod:::define_dsa_(...) revdep/checks/heemod/new/heemod.Rcheck/00_pkg_src/heemod/R/tabular_input.R:639:4 -  11. tibble::tibble(dots[i]) -  12. tibble:::tibble_quos(xs[!is_null], .rows, .name_repair) -  13. tibble:::check_valid_col(res, col_names[[j]], j) -  14. tibble:::check_valid_cols(set_names(list(x), name)) + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + * x -> x...3 - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 470 | SKIPPED: 0 | WARNINGS: 1 | FAILED: 12 ] - 1. Error: Same results using 1 core or 2. (@test_parallel.R#7) - 2. Failure: Parameter evaluation (@test_parameters.R#81) - 3. Error: we can run construct_part_surv_tib (@test_part_surv.R#298) - 4. Error: define sensitivity (@test_sensitivity.R#5) - 5. Error: run sensitivity (@test_sensitivity.R#101) - 6. Error: discount rate as a parameter works (@test_sensitivity.R#173) - 7. Error: sensitivity expression inputs (@test_sensitivity.R#236) - 8. Error: can read multinomial parameters from file (@test_tabular_input.R#110) - 9. Failure: Bad parameter file input is caught. (@test_tabular_input.R#379) - 1. ... + Backtrace: + █ + 1. ├─testthat::expect_identical(...) test-df-spatial.R:6:2 + 2. │ └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. └─testthat::expect_message(fix_duplicate_cols(tbl), "Renamed columns") + ── Failure (test-df-spatial.R:6:3): duplicate column name fixing works ───────── + expect_message(fix_duplicate_cols(tbl), "Renamed columns") not identical to tibble::tibble(x = 1:5, y = 1:5, x..3 = letters[1:5]). + Names: 2 string mismatches - Error: testthat unit tests failed + [ FAIL 3 | WARN 0 | SKIP 22 | PASS 129 ] + Error: Test failures Execution halted ``` -## In both - -* checking package dependencies ... NOTE - ``` - Package suggested but not available for checking: ‘rgho’ - ``` - -# INDperform +# graphicalVAR
-* Version: 0.2.2 -* Source code: https://github.com/cran/INDperform -* URL: https://github.com/saskiaotto/INDperform -* BugReports: https://github.com/SaskiaAOtto/INDperform/issues -* Date/Publication: 2020-01-09 12:30:14 UTC -* Number of recursive dependencies: 83 +* Version: 0.2.4 +* GitHub: NA +* Source code: https://github.com/cran/graphicalVAR +* Date/Publication: 2020-10-23 17:50:07 UTC +* Number of recursive dependencies: 89 -Run `revdep_details(,"INDperform")` for more info +Run `cloud_details(, "graphicalVAR")` for more info
@@ -781,73 +711,40 @@ Run `revdep_details(,"INDperform")` for more info * checking examples ... ERROR ``` - Running examples in ‘INDperform-Ex.R’ failed + Running examples in ‘graphicalVAR-Ex.R’ failed The error most likely occurred in: - > ### Name: merge_models - > ### Title: Merging two model output tibbles. - > ### Aliases: merge_models + > ### Name: graphicalVAR + > ### Title: Estimate the graphical VAR model. + > ### Aliases: graphicalVAR > > ### ** Examples > - > # Using some models of the Baltic Sea demo data: - > # Merging GAM and GAMM tibbles - > test_ids <- 47:50 # choose subset - > gam_tbl <- model_gam_ex[test_ids,] - > gamm_tbl <- model_gamm(ind_init_ex[test_ids,], filter= gam_tbl$tac) - Error in model_gamm(ind_init_ex[test_ids, ], filter = gam_tbl$tac) : - No IND~pressure GAMM could be fitted! Check if you chose the correct error distribution (default is gaussian()). - Execution halted - ``` - -* checking tests ... - ``` + > # Simulate model: ... - ── 2. Error: (unknown) (@test_scoring.R#15)  ─────────────────────────────────── - Assigned data `"x < 0.3"` must be compatible with existing data. - ℹ Error occurred for column `condition`. - ✖ No common type for `value` and `x` . - Backtrace: -  1. base::`[<-`(`*tmp*`, 4, "condition", value = "x < 0.3") -  2. tibble:::`[<-.tbl_df`(`*tmp*`, 4, "condition", value = "x < 0.3") -  3. tibble:::tbl_subassign(x, i, j, value, i_arg, j_arg, substitute(value)) -  4. tibble:::tbl_subassign_row(xj, i, value, value_arg) -  5. base::tryCatch(...) -  6. base:::tryCatchList(expr, classes, parentenv, handlers) -  7. base:::tryCatchOne(expr, names, parentenv, handlers[[1L]]) -  8. value[[3L]](cond) - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 544 | SKIPPED: 0 | WARNINGS: 8 | FAILED: 2 ] - 1. Error: (unknown) (@test_model_gamm.R#4) - 2. Error: (unknown) (@test_scoring.R#15) - - Error: testthat unit tests failed - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 5.3Mb - sub-directories of 1Mb or more: - data 3.1Mb - help 1.6Mb + Warning: `filter_()` was deprecated in dplyr 0.7.0. + Please use `filter()` instead. + See vignette('programming') for more help + This warning is displayed once every 8 hours. + Call `lifecycle::last_warnings()` to see where this warning was generated. + Warning: `select_()` was deprecated in dplyr 0.7.0. + Please use `select()` instead. + This warning is displayed once every 8 hours. + Call `lifecycle::last_warnings()` to see where this warning was generated. + New names: ``` -# janitor +# grobblR
-* Version: 1.2.1 -* Source code: https://github.com/cran/janitor -* URL: https://github.com/sfirke/janitor -* BugReports: https://github.com/sfirke/janitor/issues -* Date/Publication: 2020-01-22 19:20:02 UTC -* Number of recursive dependencies: 59 +* Version: 0.2.0 +* GitHub: NA +* Source code: https://github.com/cran/grobblR +* Date/Publication: 2020-11-30 06:20:03 UTC +* Number of recursive dependencies: 66 -Run `revdep_details(,"janitor")` for more info +Run `cloud_details(, "grobblR")` for more info
@@ -855,161 +752,129 @@ Run `revdep_details(,"janitor")` for more info * checking examples ... ERROR ``` - ... - > # calculates correctly even with totals column and/or row: - > mtcars %>% - + tabyl(am, cyl) %>% - + adorn_totals("row") %>% - + adorn_percentages() - Error: Assigned data `name` must be compatible with existing data. - ℹ Error occurred for column `am`. - ✖ No common type for `value` and `x` . - Backtrace: -  █ -  1. └─mtcars %>% tabyl(am, cyl) %>% adorn_totals("row") %>% adorn_percentages() -  2.  ├─base::withVisible(eval(quote(`_fseq`(`_lhs`)), env, env)) -  3.  └─base::eval(quote(`_fseq`(`_lhs`)), env, env) -  4.  └─base::eval(quote(`_fseq`(`_lhs`)), env, env) -  5.  └─`_fseq`(`_lhs`) -  6.  └─magrittr::freduce(value, `_function_list`) -  7.  └─function_list[[i]](value) -  8.  └─janitor::adorn_totals(., "row") -  9.  ├─base::`[<-`(`*tmp*`, 1, 1, value = "Total") 00_pkg_src/janitor/R/adorn_totals.R:67:6 -  10.  └─tibble:::`[<-.tbl_df`(`*tmp*`, 1, 1, value = "Total") 00_pkg_src - Execution halted + Running examples in ‘grobblR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: add_aesthetic + > ### Title: Add an Aesthetic + > ### Aliases: add_aesthetic + > + > ### ** Examples + > + > + > df = data.frame(var1 = c(5, 14, 6, 10), var2 = c(3, 30, 17, 7)) + > df %>% + + grob_matrix() %>% + + add_aesthetic(aesthetic = 'text_color', value = 'red', group = 'cells') %>% + + view_grob() + New names: ``` -* checking tests ... +* checking tests ... ERROR ``` - ... -  23. tibble:::tbl_subassign_matrix(x, j, value, j_arg, substitute(value)) -  24. base::tryCatch(...) -  25. base:::tryCatchList(expr, classes, parentenv, handlers) -  26. base:::tryCatchOne(expr, names, parentenv, handlers[[1L]]) -  27. value[[3L]](cond) - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 519 | SKIPPED: 0 | WARNINGS: 0 | FAILED: 12 ] - 1. Error: grouped_df gets ungrouped and succeeds (@test-add-totals.R#122) - 2. Error: na.rm value works correctly (@test-add-totals.R#129) - 3. Error: add_totals respects if input was data.frame (@test-add-totals.R#141) - 4. Error: add_totals respects if input was data_frame (@test-add-totals.R#148) - 5. Error: works with non-numeric columns mixed in; fill character specification (@test-add-totals.R#192) - 6. Error: automatically invokes purrr::map when called on a 3-way tabyl (@test-add-totals.R#251) - 7. Error: deprecated functions adorn_totals_col and adorn_totals_row function as expected (@test-add-totals.R#283) - 8. Error: (unknown) (@test-adorn-percentages.R#44) - 9. Error: non-tabyls are treated correctly (@test-adorn-title.R#49) - 1. ... + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 14. │ └─methods::is(grob_object, "grob_matrix_object") + 15. └─grobblR::grob_matrix(.) + 16. └─grobblR:::column_names_to_row(grob_object) + 17. └─base::rbind(column_names, mat) + 18. └─tibble:::rbind(deparse.level, ...) + 19. └─vctrs::vec_rbind(!!!list(...)) + 20. └─(function () ... + 21. └─vctrs::vec_default_ptype2(...) + 22. └─vctrs::stop_incompatible_type(...) + 23. └─vctrs:::stop_incompatible(...) + 24. └─vctrs:::stop_vctrs(...) - Error: testthat unit tests failed + [ FAIL 9 | WARN 0 | SKIP 0 | PASS 12 ] + Error: Test failures Execution halted ``` -# jstor +# groupr
-* Version: 0.3.7 -* Source code: https://github.com/cran/jstor -* URL: https://github.com/ropensci/jstor, https://ropensci.github.io/jstor/ -* BugReports: https://github.com/ropensci/jstor/issues -* Date/Publication: 2019-09-05 02:10:11 UTC -* Number of recursive dependencies: 68 +* Version: 0.1.0 +* GitHub: https://github.com/ngriffiths21/groupr +* Source code: https://github.com/cran/groupr +* Date/Publication: 2020-10-14 12:30:06 UTC +* Number of recursive dependencies: 57 -Run `revdep_details(,"jstor")` for more info +Run `cloud_details(, "groupr")` for more info
## Newly broken -* checking tests ... +* checking tests ... ERROR ``` - ... - ERROR + Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(jstor) - > - > test_check("jstor") - ── 1. Failure: authors are correct (@test-books.R#117)  ──────────────────────── - chap_auth[[5, "authors"]] not identical to `correct_authors`. - names for current but not for target - Attributes: < target is NULL, current is list > - Length mismatch: comparison on first 1 components - Component 1: Cols in y but not x: `c(NA_character_, NA_character_)`. - Component 1: Cols in x but not y: `string_name`, `author_number`, `suffix`, `surname`, `given_name`, `prefix`. - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 251 | SKIPPED: 4 | WARNINGS: 0 | FAILED: 1 ] - 1. Failure: authors are correct (@test-books.R#117) + Last 13 lines of output: + 4. ├─groupr:::pivot_cg(testb3, "is_ok") + 5. │ ├─dplyr::group_modify(x, ~col_grps(., rows)) + 6. │ └─dplyr:::group_modify.data.frame(x, ~col_grps(., rows)) + 7. │ └─groupr:::.f(.data, group_keys(.data), ...) + 8. │ └─groupr:::col_grps(., rows) + 9. │ └─base::cbind(...) + 10. │ └─tibble:::cbind(deparse.level, ...) + 11. │ └─vctrs::vec_cbind(!!!list(...)) + 12. └─vctrs::stop_incompatible_size(...) + 13. └─vctrs:::stop_incompatible(...) + 14. └─vctrs:::stop_vctrs(...) - Error: testthat unit tests failed + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 18 ] + Error: Test failures Execution halted ``` -# metacoder +# heatwaveR
-* Version: 0.3.3 -* Source code: https://github.com/cran/metacoder -* URL: https://grunwaldlab.github.io/metacoder_documentation/ -* BugReports: https://github.com/grunwaldlab/metacoder/issues -* Date/Publication: 2019-07-18 06:35:33 UTC -* Number of recursive dependencies: 147 +* Version: 0.4.5 +* GitHub: https://github.com/robwschlegel/heatwaveR +* Source code: https://github.com/cran/heatwaveR +* Date/Publication: 2021-01-07 16:10:16 UTC +* Number of recursive dependencies: 137 -Run `revdep_details(,"metacoder")` for more info +Run `cloud_details(, "heatwaveR")` for more info
## Newly broken -* checking tests ... +* checking tests ... ERROR ``` - ... - > test_check("metacoder") - ── 1. Failure: Summing counts per taxon (@test--calculations.R#103)  ─────────── - sum(x$data$tax_data$`700035949`) not equal to result$`700035949`[1]. - names for current but not for target - - ── 2. Failure: Summing counts per taxon (@test--calculations.R#126)  ─────────── - `total_counts` not equal to result$total[1]. - names for current but not for target - - ── 3. Failure: Parsing the UNITE general release fasta (@test--parsers_and_write - result$data$tax_data$unite_seq[5] not equal to "CCAAATCATGTCTCCCGGCCGCAAGGCAGGTGCAGGCGTTTAACCCTTTGTGAACCAAAAAACCTTTCGCTTCGGCAGCAGCTCGGTTGGAGACAGCCTCTGTGTCAGCCTGCCGCTAGCACCAATTATCAAAACTTGCGGTTAGCAACATTGTCTGATTACCAAATTTTCGAATGAAAATCAAAACTTTCAACAACGGATCTCTTGGTTCCCGCATCGATGAAGAACGCAGCGAAACGCGATAGTTAATGTGAATTGCAGAATTCAGTGAATCATCGAGTCTTTGAACGCACATTGCGCCCATTGGTATTCCATTGGGCATGTCTGTTTGAGCGTCATTACAACCCTCGGTCACCACCGGTTTTGAGCGAGCAGGGTCTTCGGATCCAGCTGGCTTTAAAGTTGTAAGCTCTGCTGGCTGCTCGGCCCAACCAGAACATAGTAAAATCATGCTTGTTCAAGGTTCGCGGTCGAAGCGGTACGGCCTGAACAATACCTACCACCTCTTAGG". - names for target but not for current - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 93 | SKIPPED: 1 | WARNINGS: 0 | FAILED: 3 ] - 1. Failure: Summing counts per taxon (@test--calculations.R#103) - 2. Failure: Summing counts per taxon (@test--calculations.R#126) - 3. Failure: Parsing the UNITE general release fasta (@test--parsers_and_writers.R#119) + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(heatwaveR) + > + > test_check("heatwaveR") + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure (test-proto_event.R:27:3): joinAcrossGaps = FALSE creates more events ── + max(res2$event_no, na.rm = T) is not strictly more than max(res1$event_no, na.rm = T). Difference: NaN - Error: testthat unit tests failed + [ FAIL 1 | WARN 4 | SKIP 0 | PASS 227 ] + Error: Test failures Execution halted ``` -## In both - -* checking dependencies in R code ... NOTE - ``` - Namespaces in Imports field not imported from: - ‘ggrepel’ ‘reshape’ ‘svglite’ - All declared Imports should be used. - ``` - -# micropan +# HEDA
-* Version: 2.0 -* Source code: https://github.com/cran/micropan -* Date/Publication: 2020-01-19 18:30:06 UTC -* Number of recursive dependencies: 27 +* Version: 0.1.5 +* GitHub: NA +* Source code: https://github.com/cran/HEDA +* Date/Publication: 2021-07-20 19:00:02 UTC +* Number of recursive dependencies: 38 -Run `revdep_details(,"micropan")` for more info +Run `cloud_details(, "HEDA")` for more info
@@ -1017,203 +882,277 @@ Run `revdep_details(,"micropan")` for more info * checking examples ... ERROR ``` - ... - > data(xmpl.panmat) - > - > # Estimating binomial mixture models - > binmix.lst <- binomixEstimate(xmpl.panmat, K.range = 3:8) - binomixEstimate: Fitting 3 component model... - Error: Assigned data `lst[[1]]` must be compatible with row subscript `i`. - ✖ 1 row must be assigned. - ✖ Assigned data has 3 rows. - ℹ Only vectors of size 1 are recycled. - Backtrace: -  █ -  1. └─micropan::binomixEstimate(xmpl.panmat, K.range = 3:8) -  2.  ├─base::`[<-`(...) 00_pkg_src/micropan/R/binomix.R:132:4 -  3.  └─tibble:::`[<-.tbl_df`(...) 00_pkg_src/micropan/R/binomix.R:132:4 -  4.  └─tibble:::tbl_subassign(x, i, j, value, i_arg, j_arg, substitute(value)) -  5.  └─tibble:::vectbl_recycle_rhs(...) -  6.  └─base::tryCatch(...) -  7.  └─base:::tryCatchList(expr, classes, parentenv, handlers) -  8.  └─base:::tryCatchOne(expr, names, parentenv, handlers[[1L]]) -  9.  └─value[[3L]](cond) - Execution halted + Running examples in ‘HEDA-Ex.R’ failed + The error most likely occurred in: + + > ### Name: Clean_Spt + > ### Title: Clean_Spt + > ### Aliases: Clean_Spt + > + > ### ** Examples + > + > # before running the function + > HPK_SampleData$dateTime <- parse_date_time(HPK_SampleData$dateTime,"mdy HM") + > + > hpk_flow_cln <- HEDA_Tidy(HPK_SampleData, season = c(6,7,8,9)) + > + > hpk_flow_cg <- ReversalCount(hpk_flow_cln) + New names: ``` -# modeltests +# heemod
-* Version: 0.1.0 -* Source code: https://github.com/cran/modeltests -* URL: https://github.com/alexpghayes/modeltests -* BugReports: https://github.com/alexpghayes/modeltests/issues -* Date/Publication: 2020-02-29 12:20:21 UTC -* Number of recursive dependencies: 47 +* Version: 0.14.2 +* GitHub: https://github.com/pierucci/heemod +* Source code: https://github.com/cran/heemod +* Date/Publication: 2021-01-22 13:00:02 UTC +* Number of recursive dependencies: 117 -Run `revdep_details(,"modeltests")` for more info +Run `cloud_details(, "heemod")` for more info
## Newly broken -* checking tests ... +* checking tests ... ERROR ``` - ... -  7. modeltests:::aug(model, data = dl$tibble, newdata = new_dl$tibble) revdep/checks/modeltests/new/modeltests.Rcheck/00_pkg_src/modeltests/R/check_augment_data_specification.R:51:2 -  9. tibble:::`[<-.tbl_df`(`*tmp*`, 1, 1, value = "strawberry") -  10. tibble:::tbl_subassign(x, i, j, value, i_arg, j_arg, substitute(value)) -  11. tibble:::tbl_subassign_row(xj, i, value, value_arg) -  12. base::tryCatch(...) -  13. base:::tryCatchList(expr, classes, parentenv, handlers) -  14. base:::tryCatchOne(expr, names, parentenv, handlers[[1L]]) -  15. value[[3L]](cond) - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 257 | SKIPPED: 0 | WARNINGS: 25 | FAILED: 7 ] - 1. Error: add_missing = TRUE (@test-augment_data_helper.R#65) - 2. Failure: add_missing = FALSE, test_newdata = FALSE (@test-check_augment_data_specification.R#34) - 3. Failure: add_missing = FALSE, test_newdata = FALSE (@test-check_augment_data_specification.R#45) - 4. Failure: add_missing = FALSE, test_newdata = TRUE (@test-check_augment_data_specification.R#69) - 5. Failure: add_missing = FALSE, test_newdata = TRUE (@test-check_augment_data_specification.R#80) - 6. Failure: add_missing = TRUE, test_newdata = TRUE (@test-check_augment_data_specification.R#104) - 7. Failure: add_missing = TRUE, test_newdata = TRUE (@test-check_augment_data_specification.R#115) + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 3. │ └─base::rbind(should_be_fits_3, direct_dist_def_3) + 4. │ └─tibble:::rbind(deparse.level, ...) + 5. │ └─vctrs::vec_rbind(!!!list(...)) + 6. │ └─(function () ... + 7. │ └─vctrs::vec_default_ptype2(...) + 8. │ └─vctrs::stop_incompatible_type(...) + 9. │ └─vctrs:::stop_incompatible(...) + 10. │ └─vctrs:::stop_vctrs(...) + 11. ├─dplyr::ungroup(.) + 12. ├─dplyr::do(., fit = join_fits_across_time(.data)) + 13. └─dplyr::group_by(., .data$.strategy, .data$.type) - Error: testthat unit tests failed + [ FAIL 1 | WARN 6 | SKIP 0 | PASS 503 ] + Error: Test failures Execution halted ``` -# poio +# htmlTable
-* Version: 0.0-3 -* Source code: https://github.com/cran/poio -* URL: https://github.com/RL10N/poio -* BugReports: https://github.com/RL10N/poio/issues -* Date/Publication: 2017-01-29 10:16:13 -* Number of recursive dependencies: 88 +* Version: 2.2.1 +* GitHub: https://github.com/gforge/htmlTable +* Source code: https://github.com/cran/htmlTable +* Date/Publication: 2021-05-18 11:10:02 UTC +* Number of recursive dependencies: 87 -Run `revdep_details(,"poio")` for more info +Run `cloud_details(, "htmlTable")` for more info
## Newly broken -* checking whether package ‘poio’ can be installed ... WARNING - ``` - Found the following significant warnings: - Warning: `data_frame()` is deprecated as of tibble 1.1.0. - See ‘/home/rstudio/tibble/revdep/checks/poio/new/poio.Rcheck/00install.out’ for details. +* checking examples ... ERROR + ``` + Running examples in ‘htmlTable-Ex.R’ failed + The error most likely occurred in: + + > ### Name: tidyHtmlTable + > ### Title: Generate an htmlTable using tidy data as input + > ### Aliases: tidyHtmlTable + > + > ### ** Examples + > + > library(tibble) + ... + + header = gear, + + cgroup = cyl, + + rnames = summary_stat, + + rgroup = per_metric, + + skip_removal_warning = TRUE) + `summarise()` has grouped output by 'cyl', 'gear'. You can override using the `.groups` argument. + Error in checkUniqueness(tidyTableDataList) : + The input parameters "value", "header", "rnames", "rgroup", "cgroup" do not specify unique rows. The following rows are duplicated: 94 + Calls: %>% ... tidyHtmlTable -> tidyHtmlTable.data.frame -> checkUniqueness + Execution halted ``` -## In both - -* checking Rd cross-references ... NOTE +* checking tests ... ERROR ``` - Package unavailable to check Rd xrefs: ‘ISOcodes’ + Running ‘testInteractive.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 11. ├─htmlTable::tidyHtmlTable(...) + 12. └─htmlTable:::tidyHtmlTable.data.frame(...) + 13. └─htmlTable:::checkUniqueness(tidyTableDataList) + ── Error (test-tidyHtmlTable_sorting.R:85:3): Correct table sort ─────────────── + Error: The input parameters "value", "header", "rnames", "rgroup", "cgroup" do not specify unique rows. The following rows are duplicated: 96 + Backtrace: + █ + 1. ├─`%>%`(...) test-tidyHtmlTable_sorting.R:85:2 + 2. ├─htmlTable::tidyHtmlTable(...) + 3. └─htmlTable:::tidyHtmlTable.data.frame(...) + 4. └─htmlTable:::checkUniqueness(tidyTableDataList) + + [ FAIL 2 | WARN 1 | SKIP 0 | PASS 468 ] + Error: Test failures + Execution halted ``` -* checking data for non-ASCII characters ... NOTE +# hurricaneexposure + +
+ +* Version: 0.1.1 +* GitHub: https://github.com/geanders/hurricaneexposure +* Source code: https://github.com/cran/hurricaneexposure +* Date/Publication: 2020-02-13 14:30:02 UTC +* Number of recursive dependencies: 73 + +Run `cloud_details(, "hurricaneexposure")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘hurricaneexposure-Ex.R’ failed + The error most likely occurred in: + + > ### Name: county_events + > ### Title: Find events for storms by county + > ### Aliases: county_events + > + > ### ** Examples + > + > # Ensure that data package is available before running the example. + ... + 4. │ └─tibble:::`[.tbl_df`(events, events[, event_type], c("fips", "storm_id")) + 5. │ └─tibble:::tbl_subset_row(xo, i = i, i_arg) + 6. │ └─tibble:::vectbl_as_row_index(i, x, i_arg) + 7. │ └─tibble:::vectbl_as_row_location(i, nr, i_arg, assign) + 8. │ ├─tibble:::subclass_row_index_errors(...) + 9. │ │ └─base::withCallingHandlers(...) + 10. │ └─vctrs::vec_as_location(i, n) + 11. ├─dplyr::left_join(...) + 12. └─dplyr::mutate(., storm_id = as.character(.data$storm_id)) + Execution halted ``` - Note: found 8 marked UTF-8 strings + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘mapproj’ + All declared Imports should be used. ``` -# portalr +# impactr
-* Version: 0.3.1 -* Source code: https://github.com/cran/portalr -* URL: https://weecology.github.io/portalr/, https://github.com/weecology/portalr -* BugReports: https://github.com/weecology/portalr/issues -* Date/Publication: 2020-01-16 15:00:02 UTC -* Number of recursive dependencies: 103 +* Version: 0.1.0 +* GitHub: https://github.com/verasls/impactr +* Source code: https://github.com/cran/impactr +* Date/Publication: 2021-07-01 07:30:11 UTC +* Number of recursive dependencies: 95 -Run `revdep_details(,"portalr")` for more info +Run `cloud_details(, "impactr")` for more info
## Newly broken -* checking tests ... +* checking examples ... ERROR ``` - ... - ── 1. Failure: data generated by default setting is same (shrub_cover) (@test-99 - Value hashes to 273b981913, not 9e5849fa79 - - ── 2. Failure: data generated by default setting is same (ant colony_presence_ab - Value hashes to b16d3f1a01, not 8ce773ce81 - - ── 3. Failure: data generated by level = 'stake' is same (ant colony_presence_ab - Value hashes to 2194929e3e, not 4639dbfbf3 - - ── 4. Failure: data generated by level = 'plot' is same (ant colony_presence_abs - Value hashes to 255aef31fb, not 60e9306bfc + Running examples in ‘impactr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: predict_loading + > ### Title: Predict mechanical loading + > ### Aliases: predict_loading + > + > ### ** Examples + > + > data <- read_acc(impactr_example("hip-raw.csv")) + New names: + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + `actual`: "...1" "acc_X" "acc_Y" "acc_Z" + `expected`: "timestamp" "acc_X" "acc_Y" "acc_Z" + ── Failure (test-read_acc.R:81:3): output columns are correct ────────────────── + test_imu$timestamp is not an S3 object + ── Failure (test-read_acc.R:82:3): output columns are correct ────────────────── + test_raw$timestamp is not an S3 object + ── Failure (test-read_acc.R:94:3): read_acc() works with date format separated by `/` ── + `sep_dash` (`actual`) not equal to `sep_slash` (`expected`). - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 193 | SKIPPED: 10 | WARNINGS: 0 | FAILED: 4 ] - 1. Failure: data generated by default setting is same (shrub_cover) (@test-99-regression.R#166) - 2. Failure: data generated by default setting is same (ant colony_presence_absence) (@test-99-regression.R#177) - 3. Failure: data generated by level = 'stake' is same (ant colony_presence_absence) (@test-99-regression.R#195) - 4. Failure: data generated by level = 'plot' is same (ant colony_presence_absence) (@test-99-regression.R#213) + `attr(actual, 'problems')` is + `attr(expected, 'problems')` is - Error: testthat unit tests failed + [ FAIL 9 | WARN 6 | SKIP 4 | PASS 53 ] + Error: Test failures Execution halted ``` -# REDCapR +# isoreader
-* Version: 0.10.2 -* Source code: https://github.com/cran/REDCapR -* URL: https://github.com/OuhscBbmc/REDCapR, http://ouhsc.edu/bbmc/, http://project-redcap.org -* BugReports: https://github.com/OuhscBbmc/REDCapR/issues -* Date/Publication: 2019-09-23 04:30:02 UTC -* Number of recursive dependencies: 101 +* Version: 1.3.0 +* GitHub: https://github.com/isoverse/isoreader +* Source code: https://github.com/cran/isoreader +* Date/Publication: 2021-02-16 06:20:07 UTC +* Number of recursive dependencies: 109 -Run `revdep_details(,"REDCapR")` for more info +Run `cloud_details(, "isoreader")` for more info
## Newly broken -* checking tests ... +* checking tests ... ERROR ``` - ERROR - Running the tests in ‘tests/test-all.R’ failed. - Complete output: - > # Modeled after the R6 testing structure: https://github.com/wch/R6/blob/master/tests/testthat.R - > library(testthat) - > library(REDCapR) - > - > testthat::test_check("REDCapR") - ── 1. Failure: validate_no_logical -concern dataset (@test-validate.R#36)  ───── - ds$field_index not equal to 2. - names for target but not for current - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 135 | SKIPPED: 79 | WARNINGS: 0 | FAILED: 1 ] - 1. Failure: validate_no_logical -concern dataset (@test-validate.R#36) + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + Backtrace: + █ + 1. ├─testthat::expect_warning(...) test-data-structures.R:219:2 + 2. │ └─testthat:::quasi_capture(enquo(object), label, capture_warnings) + 3. │ ├─testthat:::.capture(...) + 4. │ │ └─base::withCallingHandlers(...) + 5. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 6. └─isoreader:::warn_problems(iso_filesABABC, cutoff = 3) + 7. └─purrr::map(widths, ~paste(rep(".", .x), collapse = "")) + 8. └─isoreader:::.f(.x[[i]], ...) + 9. └─base::paste(rep(".", .x), collapse = "") - Error: testthat unit tests failed + [ FAIL 2 | WARN 0 | SKIP 9 | PASS 831 ] + Error: Test failures Execution halted ``` -# rematch2 +# ITNr
-* Version: 2.1.1 -* Source code: https://github.com/cran/rematch2 -* URL: https://github.com/r-lib/rematch2#readme -* BugReports: https://github.com/r-lib/rematch2/issues -* Date/Publication: 2020-03-28 12:40:02 UTC -* Number of recursive dependencies: 40 +* Version: 0.6.0 +* GitHub: NA +* Source code: https://github.com/cran/ITNr +* Date/Publication: 2020-03-11 17:30:13 UTC +* Number of recursive dependencies: 66 -Run `revdep_details(,"rematch2")` for more info +Run `cloud_details(, "ITNr")` for more info
@@ -1221,41 +1160,79 @@ Run `revdep_details(,"rematch2")` for more info * checking examples ... ERROR ``` + Running examples in ‘ITNr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: core_periphery_weighted + > ### Title: Core-Periphery for Weighted Networks + > ### Aliases: core_periphery_weighted + > + > ### ** Examples + > + > require(igraph) ... - > # Match first occurrence - > pos <- re_exec(notables, name_rex) - > pos - Error: Input must be a vector, not a `rematch_records` object. - Backtrace: -  █ -  1. ├─(function (x, ...) ... -  2. ├─tibble:::print.tbl(x) -  3. │ ├─cli::cat_line(format(x, ..., n = n, width = width, n_extra = n_extra)) -  4. │ │ └─base::paste0(..., collapse = "\n") -  5. │ ├─base::format(x, ..., n = n, width = width, n_extra = n_extra) -  6. │ └─tibble:::format.tbl(x, ..., n = n, width = width, n_extra = n_extra) -  7. │ └─tibble::trunc_mat(x, n = n, width = width, n_extra = n_extra) -  8. │ ├─base::as.data.frame(head(x, n)) -  9. │ ├─utils::head(x, n) -  10. │ └─utils:::head.data.frame(x, n) -  11. │ ├─x[seq_len(n), , drop = FALSE] -  12. │ └─tibble:::`[.tbl_df`(x, seq_len(n), , drop = FALSE) -  13. │ └─tibble:::tbl_subset_row(xo, i = i, i_arg) - [90 - Execution halted + > V(ITN)$name<-1:vcount(ITN) + > + > ##Implement core-periphery algorithm + > ITNcp<-core_periphery_weighted(ITN,"directed") + Warning: `as_data_frame()` was deprecated in tibble 2.0.0. + Please use `as_tibble()` instead. + The signature and semantics have changed, see `?as_tibble`. + This warning is displayed once every 8 hours. + Call `lifecycle::last_warnings()` to see where this warning was generated. + New names: ``` -# RmarineHeatWaves +# LexisNexisTools
-* Version: 0.17.0 -* Source code: https://github.com/cran/RmarineHeatWaves -* URL: https://github.com/ajsmit/RmarineHeatWaves -* Date/Publication: 2018-06-04 17:43:40 UTC -* Number of recursive dependencies: 71 +* Version: 0.3.4 +* GitHub: https://github.com/JBGruber/LexisNexisTools +* Source code: https://github.com/cran/LexisNexisTools +* Date/Publication: 2021-04-06 14:50:06 UTC +* Number of recursive dependencies: 118 + +Run `cloud_details(, "LexisNexisTools")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + ══ Skipped tests ═══════════════════════════════════════════════════════════════ + • !dir.exists("/home/johannes/Dropbox/LexisNexis_sample_files/") is TRUE (1) + • On CRAN (1) + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure (test-methods.R:67:3): add ────────────────────────────────────────── + { + ... + } not equal to 9. + 1/1 mismatches + [1] 10 - 9 == 1 + + [ FAIL 1 | WARN 4 | SKIP 2 | PASS 99 ] + Error: Test failures + Execution halted + ``` + +# lvmisc + +
-Run `revdep_details(,"RmarineHeatWaves")` for more info +* Version: 0.1.1 +* GitHub: https://github.com/verasls/lvmisc +* Source code: https://github.com/cran/lvmisc +* Date/Publication: 2021-04-05 15:20:02 UTC +* Number of recursive dependencies: 117 + +Run `cloud_details(, "lvmisc")` for more info
@@ -1263,84 +1240,71 @@ Run `revdep_details(,"RmarineHeatWaves")` for more info * checking examples ... ERROR ``` - ... + Running examples in ‘lvmisc-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_bland_altman + > ### Title: Create a Bland-Altman plot + > ### Aliases: plot_bland_altman + > > ### ** Examples > - > ts_dat <- make_whole(sst_WA) - > res <- detect(ts_dat, climatology_start = "1983-01-01", - + climatology_end = "2012-12-31") - Error: Assigned data `zoo::na.approx(tDat[59:61, no_NA], maxgap = 1, na.rm = TRUE)` must be compatible with existing data. - ℹ Error occurred for column `doy`. - ✖ Can't cast to . - Can not decrease dimensions. - Backtrace: -  █ -  1. └─RmarineHeatWaves::detect(...) -  2.  ├─base::`[<-`(...) 00_pkg_src/RmarineHeatWaves/R/RmarineHeatWaves.R:265:4 -  3.  └─tibble:::`[<-.tbl_df`(...) 00_pkg_src/RmarineHeatWaves/R/RmarineHeatWaves.R:265:4 -  4.  └─tibble:::tbl_subassign(x, i, j, value, i_arg, j_arg, substitute(value)) -  5.  └─tibble:::tbl_subassign_row(xj, i, value, value_arg) -  6.  └─base::tryCatch(...) -  7.  └─base:::tryCatchList(expr, classes, parentenv, handlers) -  8.  └─base:::tryCatchOne(expr, names, parentenv, handlers[[1L]]) -  9.  └─value[[3L]](cond) - Execution halted + > mtcars <- tibble::as_tibble(mtcars, rownames = "car") + > m <- stats::lm(disp ~ mpg, mtcars) + > cv <- loo_cv(m, mtcars, car) + > plot_bland_altman(cv, colour = as.factor(am)) + New names: ``` -# rsample +# mfGARCH
-* Version: 0.0.5 -* Source code: https://github.com/cran/rsample -* URL: https://tidymodels.github.io/rsample -* BugReports: https://github.com/tidymodels/rsample/issues -* Date/Publication: 2019-07-12 22:20:11 UTC -* Number of recursive dependencies: 89 +* Version: 0.2.1 +* GitHub: https://github.com/onnokleen/mfGARCH +* Source code: https://github.com/cran/mfGARCH +* Date/Publication: 2021-06-17 14:20:02 UTC +* Number of recursive dependencies: 76 -Run `revdep_details(,"rsample")` for more info +Run `cloud_details(, "mfGARCH")` for more info
## Newly broken -* checking tests ... +* checking tests ... ERROR ``` - ... - > test_check(package = "rsample") - ── 1. Failure: Bootstrap estimate of mean is close to estimate of mean from norm - ttest$estimate not equal to single_pct_res$.estimate. - names for target but not for current - - ── 2. Failure: Bootstrap estimate of mean is close to estimate of mean from norm - ttest$estimate not equal to single_t_res$.estimate. - names for target but not for current - - ── 3. Failure: Bootstrap estimate of mean is close to estimate of mean from norm - ttest$estimate not equal to single_bca_res$.estimate. - names for target but not for current - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 529 | SKIPPED: 0 | WARNINGS: 13 | FAILED: 3 ] - 1. Failure: Bootstrap estimate of mean is close to estimate of mean from normal distribution (@test_bootci.R#53) - 2. Failure: Bootstrap estimate of mean is close to estimate of mean from normal distribution (@test_bootci.R#63) - 3. Failure: Bootstrap estimate of mean is close to estimate of mean from normal distribution (@test_bootci.R#73) + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 1. ├─testthat::expect_equal(...) test-estimation.R:73:2 + 2. │ └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. └─mfGARCH::fit_mfgarch(...) + 5. └─stats::constrOptim(...) + 6. └─mfGARCH:::f(theta, ...) + 7. └─mfGARCH:::lf(theta) + 8. └─mfGARCH:::llh_mf(...) + 9. └─mfGARCH:::calculate_tau_mf(...) + 10. ├─base::`$<-`(`*tmp*`, "tau", value = integer(0)) + 11. └─base::`$<-.data.frame`(`*tmp*`, "tau", value = integer(0)) - Error: testthat unit tests failed + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 11 ] + Error: Test failures Execution halted ``` -# RSDA +# mortAAR
-* Version: 3.0.1 -* Source code: https://github.com/cran/RSDA -* URL: http://www.oldemarrodriguez.com -* Date/Publication: 2020-01-21 07:50:31 UTC -* Number of recursive dependencies: 125 +* Version: 1.1.1 +* GitHub: NA +* Source code: https://github.com/cran/mortAAR +* Date/Publication: 2021-05-24 23:30:02 UTC +* Number of recursive dependencies: 71 -Run `revdep_details(,"RSDA")` for more info +Run `cloud_details(, "mortAAR")` for more info
@@ -1348,89 +1312,158 @@ Run `revdep_details(,"RSDA")` for more info * checking examples ... ERROR ``` - Running examples in ‘RSDA-Ex.R’ failed + Running examples in ‘mortAAR-Ex.R’ failed The error most likely occurred in: - > ### Name: VeterinaryData - > ### Title: Symbolic interval data example - > ### Aliases: VeterinaryData - > ### Keywords: datasets + > ### Name: lt.correction + > ### Title: Calculates a corrected life table from a mortAAR life table + > ### Aliases: lt.correction > > ### ** Examples > - > data(VeterinaryData) - > VeterinaryData - Error in get(x, envir = ns, inherits = FALSE) : - object 'warningc' not found - Calls: ... head.data.frame -> [ -> [.symbolic_tbl -> getFromNamespace -> get + > # Calculate a corrected life table from real life dataset. + ... + 3. │ └─mortAAR::life.table(...) + 4. │ └─mortAAR:::life.table.df(...) + 5. │ ├─base::`[<-`(...) + 6. │ └─tibble:::`[<-.tbl_df`(...) + 7. │ └─tibble:::tbl_subassign(x, i, j, value, i_arg, j_arg, substitute(value)) + 8. │ └─tibble:::vectbl_recycle_rhs(...) + 9. │ └─vctrs::vec_recycle(value, ncol) + 10. └─vctrs:::stop_recycle_incompatible_size(...) + 11. └─vctrs:::stop_vctrs(...) Execution halted ``` -# rubias +# msigdbr
-* Version: 0.3.0 -* Source code: https://github.com/cran/rubias -* Date/Publication: 2019-06-10 15:00:03 UTC -* Number of recursive dependencies: 70 +* Version: 7.4.1 +* GitHub: https://github.com/igordot/msigdbr +* Source code: https://github.com/cran/msigdbr +* Date/Publication: 2021-05-05 16:10:02 UTC +* Number of recursive dependencies: 48 -Run `revdep_details(,"rubias")` for more info +Run `cloud_details(, "msigdbr")` for more info
## Newly broken -* checking examples ... ERROR +* checking tests ... ERROR ``` - ... - [1] "/tmp/Rtmpt8oyAh/mixfile" - > - > # note that in practice you will probably want to specify - > # your own directory... - > - > # run the function - > write_gsi_sim_mixture(chinook_mix, 5, prefix) - Error: Assigned data `0` must be compatible with existing data. - ℹ Error occurred for column `repunit`. - ✖ No common type for `value` and `x` . - Backtrace: -  █ -  1. └─rubias::write_gsi_sim_mixture(chinook_mix, 5, prefix) -  2.  ├─base::`[<-`(`*tmp*`, is.na(mix), value = 0) 00_pkg_src/rubias/R/write_gsi_sim_mixture.R:36:2 -  3.  └─tibble:::`[<-.tbl_df`(`*tmp*`, is.na(mix), value = 0) 00_pkg_src/rubias/R/write_gsi_sim_mixture.R:36:2 -  4.  └─tibble:::tbl_subassign_matrix(x, j, value, j_arg, substitute(value)) -  5.  └─base::tryCatch(...) -  6.  └─base:::tryCatchList(expr, classes, parentenv, handlers) -  7.  └─base:::tryCatchOne(expr, names, parentenv, handlers[[1L]]) -  8.  └─value[[3L]](cond) - Execution halted + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + * Pan troglodytes + * Rattus norvegicus + * Saccharomyces cerevisiae + * Schizosaccharomyces pombe 972h- + * Sus scrofa + * Xenopus tropicalis + * + Backtrace: + █ + 1. └─testthat::expect_match(...) test-functions.R:8:2 + 2. └─testthat:::expect_match_(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 102 ] + Error: Test failures + Execution halted ``` ## In both * checking installed package size ... NOTE ``` - installed size is 11.1Mb + installed size is 5.9Mb sub-directories of 1Mb or more: - libs 9.2Mb + R 5.8Mb ``` -* checking for GNU extensions in Makefiles ... NOTE +# neonstore + +
+ +* Version: 0.4.3 +* GitHub: NA +* Source code: https://github.com/cran/neonstore +* Date/Publication: 2021-04-27 20:00:02 UTC +* Number of recursive dependencies: 80 + +Run `cloud_details(, "neonstore")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR ``` - GNU make is a SystemRequirements. + Running examples in ‘neonstore-Ex.R’ failed + The error most likely occurred in: + + > ### Name: neon_citation + > ### Title: Generate the appropriate citation for your data + > ### Aliases: neon_citation + > + > ### ** Examples + > + > + ... + 6. ├─base::do.call(rbind, x) + 7. └─(function (..., deparse.level = 1) ... + 8. └─tibble:::rbind(deparse.level, ...) + 9. └─vctrs::vec_rbind(!!!list(...)) + 10. └─(function () ... + 11. └─vctrs::vec_default_ptype2(...) + 12. └─vctrs::stop_incompatible_type(...) + 13. └─vctrs:::stop_incompatible(...) + 14. └─vctrs:::stop_vctrs(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 4. └─neonstore::neon_filename_parser(files) + 5. └─neonstore:::ragged_bind(...) + 6. ├─base::do.call(rbind, x) + 7. └─(function (..., deparse.level = 1) ... + 8. └─tibble:::rbind(deparse.level, ...) + 9. └─vctrs::vec_rbind(!!!list(...)) + 10. └─(function () ... + 11. └─vctrs::vec_default_ptype2(...) + 12. └─vctrs::stop_incompatible_type(...) + 13. └─vctrs:::stop_incompatible(...) + 14. └─vctrs:::stop_vctrs(...) + + [ FAIL 3 | WARN 0 | SKIP 18 | PASS 16 ] + Error: Test failures + Execution halted ``` -# SanzCircos +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘rhdf5’ + ``` + +# OncoBayes2
-* Version: 0.1.0 -* Source code: https://github.com/cran/SanzCircos -* Date/Publication: 2018-05-04 10:52:54 UTC -* Number of recursive dependencies: 42 +* Version: 0.7-0 +* GitHub: NA +* Source code: https://github.com/cran/OncoBayes2 +* Date/Publication: 2021-05-07 19:30:02 UTC +* Number of recursive dependencies: 89 -Run `revdep_details(,"SanzCircos")` for more info +Run `cloud_details(, "OncoBayes2")` for more info
@@ -1438,122 +1471,166 @@ Run `revdep_details(,"SanzCircos")` for more info * checking examples ... ERROR ``` - ... - > ### Title: make_circos_links - > ### Aliases: make_circos_links + Running examples in ‘OncoBayes2-Ex.R’ failed + The error most likely occurred in: + + > ### Name: blrm_exnex + > ### Title: Bayesian Logistic Regression Model for N-compounds with EXNEX + > ### Aliases: blrm_exnex print.blrmfit > > ### ** Examples > - > - > links_df <- data.frame(chrom = c(rep("chr1", 5), rep("chr2", 5)), - + band = c(rep("band1", 3), rep("band2", 2), "band1", rep("band2", 4)), - + link = c(1, 2, 3, 1, 2, 1, 1, 3, 4, 5), - + start = c(1, 3, 5, 10, 35, 1, 5, 8, 13, 15), - + end = c(3, 5, 10, 35, 39, 5, 8, 13, 15, 21)) - > - > links <- make_circos_links(links_df, "chrom", "band", "link", "start", "end", status = TRUE) - Warning: `as.tibble()` is deprecated as of tibble 2.0.0. - Please use `as_tibble()` instead. - The signature and semantics have changed, see `?as_tibble`. - This warning is displayed once every 8 hours. - Call `lifecycle::last_warnings()` to see where this warning was generated. - Error: Assigned data `as.character(df[[chromosome_grouping]][i])` must be compatible with existing data. - ℹ Error occurred for column `V2`. - ✖ Lossy cast from `value` to `x` . + > ## Setting up dummy sampling for fast execution of example + ... + The following objects are masked from ‘package:base’: + + intersect, setdiff, setequal, union + + > blrmfit_new <- update(blrmfit, + + data = rbind(hist_combo3, newdata) %>% + + arrange(stratum, group_id)) + Error in factor(group_index) : object 'group_index' not found + Calls: update ... update.blrmfit -> eval -> eval -> blrm_exnex -> factor + Execution halted ``` ## In both -* checking dependencies in R code ... NOTE +* checking installed package size ... NOTE ``` - Namespaces in Imports field not imported from: - ‘purrr’ ‘tidyr’ - All declared Imports should be used. + installed size is 59.5Mb + sub-directories of 1Mb or more: + libs 58.4Mb ``` -# simrel +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. + ``` + +# optimall
-* Version: 2.0 -* Source code: https://github.com/cran/simrel -* URL: https://simulatr.github.io/simrel/ -* BugReports: https://github.com/simulatr/simrel/issues -* Date/Publication: 2019-04-01 18:00:09 UTC -* Number of recursive dependencies: 97 +* Version: 0.1.0 +* GitHub: https://github.com/yangjasp/optimall +* Source code: https://github.com/cran/optimall +* Date/Publication: 2021-07-21 10:10:02 UTC +* Number of recursive dependencies: 122 -Run `revdep_details(,"simrel")` for more info +Run `cloud_details(, "optimall")` for more info
## Newly broken -* checking tests ... +* checking examples ... ERROR ``` + Running examples in ‘optimall-Ex.R’ failed + The error most likely occurred in: + + > ### Name: allocate_wave + > ### Title: Adaptive Multi-Wave Sampling + > ### Aliases: allocate_wave + > + > ### ** Examples + > + > # Create dataframe with a column specifying strata, a variable of interest ... - ERROR + + AlreadySampled = rep(c(rep(1, times = 5), + + rep(0, times = 15)), + + times = 3)) + > + > x <- allocate_wave( + + data = mydata, strata = "Strata", + + y = "Var", already_sampled = "AlreadySampled", + + nsample = 20, method = "simple" + + ) + New names: + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(simrel) - > - > test_check("simrel") - ── 1. Error: Prepare Design (@test-utils.R#44)  ──────────────────────────────── - Can't join on 'q' x 'q' because of incompatible types (list / list) - Backtrace: -  1. testthat::expect_identical(prepare_design(opts), dgn) -  3. testthat:::compare.default(act$val, exp$val) -  5. dplyr:::all.equal.tbl_df(x, y, ...) -  6. dplyr:::equal_data_frame(...) + Last 13 lines of output: + 1. └─optimall::allocate_wave(...) test-sample_strata.R:19:0 + 2. └─optimall::optimum_allocation(...) + 3. ├─...[] + 4. └─tibble:::`[.tbl_df`(...) + 5. └─tibble:::vectbl_as_col_location(...) + 6. ├─tibble:::subclass_col_index_errors(...) + 7. │ └─base::withCallingHandlers(...) + 8. └─vctrs::vec_as_location(j, n, names) + 9. └─(function () ... + 10. └─vctrs:::stop_subscript_oob(...) + 11. └─vctrs:::stop_subscript(...) - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 169 | SKIPPED: 21 | WARNINGS: 3 | FAILED: 1 ] - 1. Error: Prepare Design (@test-utils.R#44) - - Error: testthat unit tests failed + [ FAIL 17 | WARN 0 | SKIP 1 | PASS 135 ] + Error: Test failures Execution halted ``` -# tidytransit +# phenofit
-* Version: 0.7.0 -* Source code: https://github.com/cran/tidytransit -* URL: https://github.com/r-transit/tidytransit -* BugReports: https://github.com/r-transit/tidytransit -* Date/Publication: 2020-03-15 17:30:02 UTC -* Number of recursive dependencies: 83 +* Version: 0.2.7 +* GitHub: https://github.com/kongdd/phenofit +* Source code: https://github.com/cran/phenofit +* Date/Publication: 2020-04-02 11:40:03 UTC +* Number of recursive dependencies: 95 -Run `revdep_details(,"tidytransit")` for more info +Run `cloud_details(, "phenofit")` for more info
## Newly broken -* checking tests ... +* checking examples ... ERROR ``` + Running examples in ‘phenofit-Ex.R’ failed + The error most likely occurred in: + + > ### Name: get_GOF + > ### Title: get_GOF + > ### Aliases: get_GOF get_GOF.fFITs + > + > ### ** Examples + > + > library(phenofit) ... - ── 1. Error: travel_times from stop with departures from transfer stops (@test-r - Assigned data `c("stop0", "Zero", 46.9596, 7.39071, NA, 0)` must be compatible with row subscript `nrow(g2$stops) + 1`. - ✖ 1 row must be assigned. - ✖ Assigned data has 6 rows. - ℹ Only vectors of size 1 are recycled. - Backtrace: -  1. base::`[<-`(...) -  2. tibble:::`[<-.tbl_df`(...) -  3. tibble:::tbl_subassign(x, i, j, value, i_arg, j_arg, substitute(value)) -  4. tibble:::vectbl_recycle_rhs(...) -  5. base::tryCatch(...) -  6. base:::tryCatchList(expr, classes, parentenv, handlers) -  7. base:::tryCatchOne(expr, names, parentenv, handlers[[1L]]) -  8. value[[3L]](cond) - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 106 | SKIPPED: 9 | WARNINGS: 0 | FAILED: 1 ] - 1. Error: travel_times from stop with departures from transfer stops (@test-raptor.R#210) + > y <- fFUN(par, t) + > methods <- c("AG", "Beck", "Elmore", "Gu", "Zhang") # "Klos" too slow + > fFITs <- curvefit(y, t, tout, methods) + > # multiple years + > fits <- list(`2001` = fFITs, `2002` = fFITs) + > + > l_param <- get_param(fits) + > d_GOF <- get_GOF(fits) + > d_fitting <- get_fitting(fits) + New names: + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 17. │ ├─base::merge(fFITs$data[Ix], df, id = "t") + 18. │ └─data.table::merge.data.table(fFITs$data[Ix], df, id = "t") + 19. └─phenofit:::melt_list(., "flag") + 20. └─data.table::is.data.table(list[[1]]) - Error: testthat unit tests failed + [ FAIL 1 | WARN 12 | SKIP 0 | PASS 45 ] + Error: Test failures + In addition: Warning messages: + 1: In strptime(x, format, tz = "GMT") : + day-of-year 366 in year 2017 is invalid + 2: In strptime(x, format, tz = "GMT") : + day-of-year 366 in year 2017 is invalid + 3: In strptime(x, format, tz = "GMT") : + day-of-year 366 in year 2017 is invalid Execution halted ``` @@ -1561,139 +1638,1204 @@ Run `revdep_details(,"tidytransit")` for more info * checking installed package size ... NOTE ``` - installed size is 6.4Mb + installed size is 7.1Mb sub-directories of 1Mb or more: - doc 1.3Mb - extdata 4.4Mb - ``` - -* checking data for non-ASCII characters ... NOTE - ``` - Note: found 62 marked UTF-8 strings + libs 6.4Mb ``` -# tidytree +# pitchRx
-* Version: 0.3.2 -* Source code: https://github.com/cran/tidytree -* URL: https://yulab-smu.github.io/treedata-book/ -* BugReports: https://github.com/YuLab-SMU/tidytree/issues -* Date/Publication: 2020-03-12 06:30:02 UTC -* Number of recursive dependencies: 72 +* Version: 1.8.2 +* GitHub: https://github.com/cpsievert/pitchRx +* Source code: https://github.com/cran/pitchRx +* Date/Publication: 2015-12-09 12:57:25 +* Number of recursive dependencies: 96 -Run `revdep_details(,"tidytree")` for more info +Run `cloud_details(, "pitchRx")` for more info
## Newly broken -* checking whether package ‘tidytree’ can be installed ... WARNING +* checking examples ... ERROR ``` - Found the following significant warnings: - Warning: `data_frame()` is deprecated as of tibble 1.1.0. - See ‘/home/rstudio/tibble/revdep/checks/tidytree/new/tidytree.Rcheck/00install.out’ for details. + Running examples in ‘pitchRx-Ex.R’ failed + The error most likely occurred in: + + > ### Name: strikeFX + > ### Title: Visualize PITCHf/x strikezones + > ### Aliases: strikeFX + > + > ### ** Examples + > + > data(pitches) + > + > strikeFX(pitches) + Error in strikeFX(pitches) : + 'list' object cannot be coerced to type 'double' + Execution halted ``` ## In both -* checking dependencies in R code ... NOTE +* checking package dependencies ... NOTE ``` - Namespace in Imports field not imported from: ‘utils’ - All declared Imports should be used. + Package suggested but not available for checking: ‘ggsubplot’ ``` -# viafr +# PKNCA
-* Version: 0.1.0 -* Source code: https://github.com/cran/viafr -* URL: https://github.com/stefanieschneider/viafr -* BugReports: https://github.com/stefanieschneider/viafr/issues -* Date/Publication: 2019-07-01 11:40:03 UTC -* Number of recursive dependencies: 55 +* Version: 0.9.4 +* GitHub: https://github.com/billdenney/pknca +* Source code: https://github.com/cran/PKNCA +* Date/Publication: 2020-06-01 17:00:02 UTC +* Number of recursive dependencies: 73 -Run `revdep_details(,"viafr")` for more info +Run `cloud_details(, "PKNCA")` for more info
## Newly broken -* checking tests ... +* checking tests ... ERROR ``` - ... -  27. [ base::eval(...) ] with 1 more call -  29. viafr:::`_fseq`(`_lhs`) -  30. magrittr::freduce(value, `_function_list`) -  32. function_list[[k]](value) -  33. dplyr::mutate_if(., is.character, list(~utf8_normalize(.))) -  34. dplyr:::manip_if(...) -  35. dplyr:::tbl_if_syms(.tbl, .predicate, .env, .include_group_vars = .include_group_vars) -  39. dplyr:::tbl_if_vars(.tbl, .p, .env, ..., .include_group_vars = .include_group_vars) -  41. tibble:::`[[.tbl_df`(.tbl, tibble_vars[[i]]) -  42. tibble:::tbl_subset2(x, j = i, j_arg = substitute(i)) -  43. tibble:::vectbl_as_col_location2(...) -  50. vctrs::vec_as_location2(i, n, names, arg = as_label(j_arg)) -  51. vctrs:::result_get(...) - - ══ testthat results ═══════════════════════════════════════════════════════════ - [ OK: 36 | SKIPPED: 0 | WARNINGS: 31 | FAILED: 2 ] - 1. Error: query list (@test_search.R#4) - 2. Error: valid query (@test_search.R#33) + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + ── Error (test-class-PKNCAdata.R:336:3): intervals may be a tibble ───────────── + Error: exclude column must be character vector or something convertable to character without loss of information. + Backtrace: + █ + 1. ├─testthat::expect_equal(...) test-class-PKNCAdata.R:336:2 + 2. │ └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. ├─base::as.data.frame(pk.nca(mydata_tibble)) + 5. └─PKNCA::pk.nca(mydata_tibble) + 6. └─PKNCA::PKNCAresults(result = results, data = data, exclude = "exclude") + 7. └─PKNCA:::setExcludeColumn(ret, exclude = exclude, dataname = "result") - Error: testthat unit tests failed + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 1305 ] + Error: Test failures Execution halted ``` +# prettyglm + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/prettyglm +* Date/Publication: 2021-06-24 07:40:05 UTC +* Number of recursive dependencies: 127 + +Run `cloud_details(, "prettyglm")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘prettyglm-Ex.R’ failed + The error most likely occurred in: + + > ### Name: pretty_relativities + > ### Title: pretty_relativities + > ### Aliases: pretty_relativities + > + > ### ** Examples + > + > library(dplyr) + ... + 3. │ └─base::withCallingHandlers(...) + 4. └─base::rbind(count_df_all, count_df) + 5. └─tibble:::rbind(deparse.level, ...) + 6. └─vctrs::vec_rbind(!!!list(...)) + 7. └─(function () ... + 8. └─vctrs::vec_default_ptype2(...) + 9. └─vctrs::stop_incompatible_type(...) + 10. └─vctrs:::stop_incompatible(...) + 11. └─vctrs:::stop_vctrs(...) + Execution halted + ``` + ## In both -* checking data for non-ASCII characters ... NOTE +* checking Rd cross-references ... NOTE ``` - Note: found 2 marked UTF-8 strings + Package unavailable to check Rd xrefs: ‘parsnip’ ``` -# vip +# psychmeta
-* Version: 0.2.1 -* Source code: https://github.com/cran/vip -* URL: https://github.com/koalaverse/vip/ -* BugReports: https://github.com/koalaverse/vip/issues -* Date/Publication: 2020-01-20 19:20:02 UTC -* Number of recursive dependencies: 182 +* Version: 2.6.0 +* GitHub: https://github.com/psychmeta/psychmeta +* Source code: https://github.com/cran/psychmeta +* Date/Publication: 2021-06-01 04:30:02 UTC +* Number of recursive dependencies: 81 -Run `revdep_details(,"vip")` for more info +Run `cloud_details(, "psychmeta")` for more info
## Newly broken -* checking tests ... +* checking examples ... ERROR ``` + Running examples in ‘psychmeta-Ex.R’ failed + The error most likely occurred in: + + > ### Name: anova.ma_psychmeta + > ### Title: Wald-type tests for moderators in psychmeta meta-analyses + > ### Aliases: anova.ma_psychmeta + > + > ### ** Examples + > + > ma_obj <- ma_r(rxyi, n, construct_x = x_name, construct_y = y_name, ... - Running test_vip.R.................... 3 tests OK - Error: ----- FAILED[data]: test_pkg_earth.R<24--27> - call| expect_identical(current = vis_nsubsets[seq_len(nrow(vis_earth)), - call| ]$Importance, target = unname(vis_earth[, "nsubsets", drop = TRUE])) - diff| names for current but not for target - ----- FAILED[data]: test_pkg_earth.R<28--31> - call| expect_identical(current = vis_rss[seq_len(nrow(vis_earth)), - call| ]$Importance, target = unname(vis_earth[, "rss", drop = TRUE])) - diff| names for current but not for target - ----- FAILED[data]: test_pkg_earth.R<32--35> - call| expect_identical(current = vis_gcv[seq_len(nrow(vis_earth)), - call| ]$Importance, target = unname(vis_earth[, "gcv", drop = TRUE])) - diff| names for current but not for target - ----- FAILED[data]: test_pkg_glmnet.R<36--39> - call| expect_identical(current = vis1$Importance, target = coef(fit1, - call| s = min(fit1$lambda))[-1L]) - diff| names for current but not for target - ----- FAILED[data]: test_pkg_glmnet.R<40--43> - call| expect_identical(current = vis2$Importance, t - In addition: There were 50 or more warnings (use warnings() to see the first 50) + 13. ├─base::factor(...) + 14. ├─moderator_data[, i][!duplicated(moderator_data[, i])] + 15. └─tibble:::`[.tbl_df`(...) + 16. └─tibble:::vectbl_as_col_location(...) + 17. ├─tibble:::subclass_col_index_errors(...) + 18. │ └─base::withCallingHandlers(...) + 19. └─vctrs::vec_as_location(j, n, names) + 20. └─(function () ... + 21. └─vctrs:::stop_indicator_size(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 16. └─psychmeta:::ma_wrapper(...) + 17. └─psychmeta:::organize_moderators(...) + 18. ├─base::factor(...) + 19. ├─moderator_data[, i][!duplicated(moderator_data[, i])] + 20. └─tibble:::`[.tbl_df`(...) + 21. └─tibble:::vectbl_as_col_location(...) + 22. ├─tibble:::subclass_col_index_errors(...) + 23. │ └─base::withCallingHandlers(...) + 24. └─vctrs::vec_as_location(j, n, names) + 25. └─(function () ... + 26. └─vctrs:::stop_indicator_size(...) + + [ FAIL 8 | WARN 0 | SKIP 0 | PASS 44 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘mathjaxr’ + All declared Imports should be used. + ``` + +# REddyProc + +
+ +* Version: 1.2.2 +* GitHub: https://github.com/bgctw/REddyProc +* Source code: https://github.com/cran/REddyProc +* Date/Publication: 2020-03-18 07:00:18 UTC +* Number of recursive dependencies: 74 + +Run `cloud_details(, "REddyProc")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘doRUnit.R’ + Running the tests in ‘tests/doRUnit.R’ failed. + Last 13 lines of output: + █ + 1. └─testthat::expect_equal(sum(is.finite(tmpPar[, "FP_beta"])), 4L) test_partGL.R:839:2 + 2. └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. └─rlang::eval_bare(expr, quo_get_env(quo)) + ── Error (test_partGL.R:881:3): partGLPartitionFluxes missing prediction VPD ─── + Error: default method not implemented for type 'list' + Backtrace: + █ + 1. └─testthat::expect_equal(sum(is.finite(tmpPar[, "FP_beta"])), 4L) test_partGL.R:881:2 + 2. └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. └─rlang::eval_bare(expr, quo_get_env(quo)) + + [ FAIL 3 | WARN 3 | SKIP 19 | PASS 344 ] + Error: Test failures + Execution halted + ``` + +# reproducer + +
+ +* Version: 0.4.2 +* GitHub: NA +* Source code: https://github.com/cran/reproducer +* Date/Publication: 2021-02-23 18:40:02 UTC +* Number of recursive dependencies: 88 + +Run `cloud_details(, "reproducer")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘reproducer-Ex.R’ failed + The error most likely occurred in: + + > ### Name: reproduceTablesOfPaperMetaAnalysisForFamiliesOfExperiments + > ### Title: reproduceTablesOfPaperMetaAnalysisForFamiliesOfExperiments + > ### Aliases: reproduceTablesOfPaperMetaAnalysisForFamiliesOfExperiments + > + > ### ** Examples + > + > rrData = reproduceTablesOfPaperMetaAnalysisForFamiliesOfExperiments() + New names: + ``` + +# RKorAPClient + +
+ +* Version: 0.6.1 +* GitHub: https://github.com/KorAP/RKorAPClient +* Source code: https://github.com/cran/RKorAPClient +* Date/Publication: 2021-03-12 22:10:11 UTC +* Number of recursive dependencies: 112 + +Run `cloud_details(, "RKorAPClient")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + Backtrace: + █ + 1. ├─`%>%`(...) test-demos.R:89:2 + 2. ├─RKorAPClient::hc_freq_by_year_ci(.) + 3. │ └─`%>%`(...) + 4. ├─base::cbind(...) + 5. │ └─tibble:::cbind(deparse.level, ...) + 6. │ └─vctrs::vec_cbind(!!!list(...)) + 7. └─vctrs::stop_incompatible_size(...) + 8. └─vctrs:::stop_incompatible(...) + 9. └─vctrs:::stop_vctrs(...) + + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 47 ] + Error: Test failures + Execution halted + ``` + +# rubias + +
+ +* Version: 0.3.2 +* GitHub: NA +* Source code: https://github.com/cran/rubias +* Date/Publication: 2021-01-15 19:10:02 UTC +* Number of recursive dependencies: 63 + +Run `cloud_details(, "rubias")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘rubias-Ex.R’ failed + The error most likely occurred in: + + > ### Name: infer_mixture + > ### Title: Estimate mixing proportions and origin probabilities from one or + > ### several mixtures + > ### Aliases: infer_mixture + > + > ### ** Examples + > + > mcmc <- infer_mixture(reference = small_chinook_ref, + + mixture = small_chinook_mix, + + gen_start_col = 5, + + method = "MCMC", + + reps = 200) + Collating data; compiling reference allele frequencies, etc.New names: + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 10.6Mb + sub-directories of 1Mb or more: + libs 8.8Mb + ``` + +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. + ``` + +# sapfluxnetr + +
+ +* Version: 0.1.1 +* GitHub: https://github.com/sapfluxnet/sapfluxnetr +* Source code: https://github.com/cran/sapfluxnetr +* Date/Publication: 2020-08-27 12:50:02 UTC +* Number of recursive dependencies: 75 + +Run `cloud_details(, "sapfluxnetr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘sapfluxnetr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: diurnal_centroid + > ### Title: Diurnal centroid calculation + > ### Aliases: diurnal_centroid + > + > ### ** Examples + > + > # dplyr + ... + > sfn_metrics( + + ARG_TRE, + + period = '1 day', + + .funs = list(~ diurnal_centroid(.), + + ~ data_coverage(., timestep, period_minutes)), + + solar = FALSE, + + interval = 'general' + + ) + [1] "Crunching data for ARG_TRE. In large datasets this could take a while" + New names: + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 18. │ └─tidyselect:::vars_select_eval(...) + 19. │ └─tidyselect:::walk_data_tree(expr, data_mask, context_mask) + 20. │ └─tidyselect:::eval_minus(expr, data_mask, context_mask) + 21. │ └─tidyselect:::eval_bang(expr, data_mask, context_mask) + 22. │ └─tidyselect:::walk_data_tree(expr[[2]], data_mask, context_mask) + 23. │ └─base::eval(expr, data_mask) + 24. │ └─base::eval(expr, data_mask) + 25. │ ├─TIMESTAMP + 26. │ └─rlang:::`$.rlang_data_pronoun`(.data, TIMESTAMP) + 27. │ └─rlang:::data_pronoun_get(x, nm) + 28. └─rlang:::abort_data_pronoun(x) + + [ FAIL 17 | WARN 0 | SKIP 19 | PASS 140 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 4 marked UTF-8 strings + ``` + +# sim2Dpredictr + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/jmleach-bst/sim2Dpredictr +* Source code: https://github.com/cran/sim2Dpredictr +* Date/Publication: 2020-03-14 16:10:02 UTC +* Number of recursive dependencies: 134 + +Run `cloud_details(, "sim2Dpredictr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘sim2Dpredictr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: precision_builder + > ### Title: Construct a Precision Matrix + > ### Aliases: precision_builder + > + > ### ** Examples + > + > + ... + [21,] 0.00 + [22,] 0.00 + [23,] 0.00 + [24,] -0.75 + [25,] 2.00 + > + > ## binary weights + > precision_builder(im.res = c(5, 5), tau = 1, alpha = 0.75, + + neighborhood = "round", r = 3) + New names: + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + > library(testthat) + > library(sim2Dpredictr) + > + > test_check("sim2Dpredictr") + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure (test_builders.R:8:3): proximity matrix is not binary ─────────────── + length(...) is not strictly more than 2. Difference: -1 + ── Failure (test_builders.R:16:3): proximity matrix has max of phi ───────────── + max(...) not equal to 2. + 1/1 mismatches + [1] 0 - 2 == -2 + + [ FAIL 2 | WARN 752 | SKIP 0 | PASS 12 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘car’ ‘ggplot2’ ‘magrittr’ ‘tidyverse’ + All declared Imports should be used. + ``` + +# SMMT + +
+ +* Version: 1.0.7 +* GitHub: NA +* Source code: https://github.com/cran/SMMT +* Date/Publication: 2021-02-20 18:30:02 UTC +* Number of recursive dependencies: 60 + +Run `cloud_details(, "SMMT")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + filter, lag + + The following objects are masked from 'package:base': + + intersect, setdiff, setequal, union + + Loading required package: SMMT + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure (test-get_irreversible_municipality_mutations.R:72:3): Irreversible mutation is detected ── + `result` not identical to `expected`. + Objects equal but not identical + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 1 ] + Error: Test failures + Execution halted + ``` + +# stacks + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/tidymodels/stacks +* Source code: https://github.com/cran/stacks +* Date/Publication: 2021-07-23 16:20:02 UTC +* Number of recursive dependencies: 132 + +Run `cloud_details(, "stacks")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 26. └─tidyselect:::walk_data_tree(expr, data_mask, context_mask) + 27. └─tidyselect:::eval_c(expr, data_mask, context_mask) + 28. └─tidyselect:::reduce_sels(node, data_mask, context_mask, init = init) + 29. └─tidyselect:::walk_data_tree(new, data_mask, context_mask) + 30. └─tidyselect:::as_indices_sel_impl(...) + 31. └─tidyselect:::as_indices_impl(x, vars, strict = strict) + 32. └─tidyselect:::chr_as_locations(x, vars) + 33. └─vctrs::vec_as_location(x, n = length(vars), names = vars) + 34. └─(function () ... + 35. └─vctrs:::stop_subscript_oob(...) + 36. └─vctrs:::stop_subscript(...) + + [ FAIL 1 | WARN 1 | SKIP 38 | PASS 5 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘workflowsets’ ‘yardstick’ + All declared Imports should be used. + ``` + +* checking Rd cross-references ... NOTE + ``` + Packages unavailable to check Rd xrefs: ‘h2o’, ‘SuperLearner’ + ``` + +# stevemisc + +
+ +* Version: 1.2.0 +* GitHub: https://github.com/svmiller/stevemisc +* Source code: https://github.com/cran/stevemisc +* Date/Publication: 2021-07-27 13:50:02 UTC +* Number of recursive dependencies: 106 + +Run `cloud_details(, "stevemisc")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘stevemisc-Ex.R’ failed + The error most likely occurred in: + + > ### Name: get_sims + > ### Title: Get Simulations from a Model Object (with New Data) + > ### Aliases: get_sims + > + > ### ** Examples + > + > # Note: these models are dumb, but they illustrate how it works. + ... + 7. └─tibble:::repaired_names(...) + 8. ├─tibble:::subclass_name_repair_errors(...) + 9. │ └─base::withCallingHandlers(...) + 10. └─vctrs::vec_as_names(...) + 11. └─(function () ... + 12. └─vctrs:::validate_unique(names = names, arg = arg) + 13. └─vctrs:::stop_names_cannot_be_empty(names) + 14. └─vctrs:::stop_names(...) + 15. └─vctrs:::stop_vctrs(class = c(class, "vctrs_error_names"), ...) + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 1 marked UTF-8 string + ``` + +# tablet + +
+ +* Version: 0.3.2 +* GitHub: https://github.com/bergsmat/tablet +* Source code: https://github.com/cran/tablet +* Date/Publication: 2021-07-18 04:10:02 UTC +* Number of recursive dependencies: 122 + +Run `cloud_details(, "tablet")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + █ + 1. └─testthat::expect_equal_to_reference(...) test-tablet.R:84:2 + 2. └─testthat::expect_known_value(..., update = update) + ── Failure (test-tablet.R:89:3): tablet package result is stable ─────────────── + `%>%`(...) has changed from known value recorded in '016.rds'. + Attributes: < Component "class": Lengths (4, 2) differ (string compare on first 2) > + Attributes: < Component "class": 1 string mismatch > + Backtrace: + █ + 1. └─testthat::expect_equal_to_reference(...) test-tablet.R:89:2 + 2. └─testthat::expect_known_value(..., update = update) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 12 ] + Error: Test failures + Execution halted + ``` + +# textrecipes + +
+ +* Version: 0.4.1 +* GitHub: https://github.com/tidymodels/textrecipes +* Source code: https://github.com/cran/textrecipes +* Date/Publication: 2021-07-11 08:00:02 UTC +* Number of recursive dependencies: 99 + +Run `cloud_details(, "textrecipes")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + • skip, wait for final smltar render (4) + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure (test-embeddings.R:251:3): NA tokens work. ────────────────────────── + `test_result` not identical to `expected_result`. + Length mismatch: comparison on first 5 components + Component "w_embed_sum_d1": 'is.NA' value mismatch: 1 in current 0 in target + Component "w_embed_sum_d2": 'is.NA' value mismatch: 1 in current 0 in target + Component "w_embed_sum_d3": 'is.NA' value mismatch: 1 in current 0 in target + Component "w_embed_sum_d4": 'is.NA' value mismatch: 1 in current 0 in target + Component "w_embed_sum_d5": 'is.NA' value mismatch: 1 in current 0 in target + + [ FAIL 1 | WARN 0 | SKIP 8 | PASS 293 ] + Error: Test failures + Execution halted + ``` + +# tidypredict + +
+ +* Version: 0.4.8 +* GitHub: https://github.com/tidymodels/tidypredict +* Source code: https://github.com/cran/tidypredict +* Date/Publication: 2020-10-28 06:50:02 UTC +* Number of recursive dependencies: 98 + +Run `cloud_details(, "tidypredict")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 8. │ └─tibble:::`$<-.tbl_df`(`*tmp*`, "fit_diff", value = numeric(0)) + 9. │ └─tibble:::tbl_subassign(...) + 10. │ └─tibble:::vectbl_recycle_rhs(...) + 11. │ ├─base::withCallingHandlers(...) + 12. │ └─vctrs::vec_recycle(value[[j]], nrow) + 13. ├─vctrs:::stop_recycle_incompatible_size(...) + 14. │ └─vctrs:::stop_vctrs(...) + 15. │ └─rlang::abort(message, class = c(class, "vctrs_error"), ...) + 16. │ └─rlang:::signal_abort(cnd) + 17. │ └─base::signalCondition(cnd) + 18. └─(function (cnd) ... + + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 117 ] + Error: Test failures + Execution halted + ``` + +# tune + +
+ +* Version: 0.1.6 +* GitHub: https://github.com/tidymodels/tune +* Source code: https://github.com/cran/tune +* Date/Publication: 2021-07-21 14:40:06 UTC +* Number of recursive dependencies: 112 + +Run `cloud_details(, "tune")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘tune-Ex.R’ failed + The error most likely occurred in: + + > ### Name: conf_mat_resampled + > ### Title: Compute average confusion matrix across resamples + > ### Aliases: conf_mat_resampled + > + > ### ** Examples + > + > library(parsnip) + ... + > + > data(two_class_dat, package = "modeldata") + > + > set.seed(2393) + > res <- + + logistic_reg() %>% + + set_engine("glm") %>% + + fit_resamples(Class ~ ., resamples = vfold_cv(two_class_dat, v = 3), + + control = control_resamples(save_pred = TRUE)) + New names: + ``` + +# twoxtwo + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/twoxtwo +* Date/Publication: 2021-07-09 09:00:02 UTC +* Number of recursive dependencies: 65 + +Run `cloud_details(, "twoxtwo")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 2. │ └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. ├─base::summary(tmp_twoxtwo) + 5. └─twoxtwo:::summary.twoxtwo(tmp_twoxtwo) + 6. ├─base::cat(print(object, ...), sep = "\n") + 7. ├─base::print(object, ...) + 8. └─twoxtwo:::print.twoxtwo(object, ...) + 9. ├─base::cat(display(x, ...), sep = "\n") + 10. └─twoxtwo::display(x, ...) + 11. └─knitr::kable(...) + 12. └─base::`colnames<-`(`*tmp*`, value = col.names) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 59 ] + Error: Test failures + Execution halted + ``` + +# VarBundle + +
+ +* Version: 0.3.0 +* GitHub: NA +* Source code: https://github.com/cran/VarBundle +* Date/Publication: 2018-08-17 08:40:10 UTC +* Number of recursive dependencies: 57 + +Run `cloud_details(, "VarBundle")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + █ + 1. └─VarBundle::varbundle(ll) test-varbundle.R:40:2 + 2. ├─base::do.call(rbind, lapply(1:length(x), create_df)) + 3. └─(function (..., deparse.level = 1) ... + 4. └─tibble:::rbind(deparse.level, ...) + 5. └─vctrs::vec_rbind(!!!list(...)) + 6. └─(function () ... + 7. └─vctrs::vec_default_ptype2(...) + 8. └─vctrs::stop_incompatible_type(...) + 9. └─vctrs:::stop_incompatible(...) + 10. └─vctrs:::stop_vctrs(...) + + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 38 ] + Error: Test failures + Execution halted + ``` + +# visR + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/openpharma/visR +* Source code: https://github.com/cran/visR +* Date/Publication: 2021-06-14 09:00:02 UTC +* Number of recursive dependencies: 123 + +Run `cloud_details(, "visR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘visR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: get_tableone + > ### Title: Calculate summary statistics + > ### Aliases: get_tableone get_tableone.default + > + > ### ** Examples + > + > + ... + 6. │ └─tibble:::rbind(deparse.level, ...) + 7. │ └─vctrs::vec_rbind(!!!list(...)) + 8. │ └─(function () ... + 9. │ └─vctrs::vec_default_ptype2(...) + 10. │ └─vctrs::stop_incompatible_type(...) + 11. │ └─vctrs:::stop_incompatible(...) + 12. │ └─vctrs:::stop_vctrs(...) + 13. ├─dplyr::select(., variable, statistic, everything()) + 14. └─dplyr::rename(., statistic = summary_id) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 8. │ ├─`%>%`(...) + 9. │ └─base::rbind(data_ns, data_summary) + 10. │ └─tibble:::rbind(deparse.level, ...) + 11. │ └─vctrs::vec_rbind(!!!list(...)) + 12. │ └─(function () ... + 13. │ └─vctrs::vec_default_ptype2(...) + 14. │ └─vctrs::stop_incompatible_type(...) + 15. │ └─vctrs:::stop_incompatible(...) + 16. │ └─vctrs:::stop_vctrs(...) + 17. ├─dplyr::select(., variable, statistic, everything()) + 18. └─dplyr::rename(., statistic = summary_id) + + [ FAIL 9 | WARN 0 | SKIP 12 | PASS 527 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘parcats’ + All declared Imports should be used. + ``` + +# vlda + +
+ +* Version: 1.1.5 +* GitHub: https://github.com/pnuwon/vlda +* Source code: https://github.com/cran/vlda +* Date/Publication: 2020-06-26 08:50:02 UTC +* Number of recursive dependencies: 47 + +Run `cloud_details(, "vlda")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘vlda-Ex.R’ failed + The error most likely occurred in: + + > ### Name: vlda_plot + > ### Title: VLDA Plot + > ### Aliases: vlda_plot + > ### Keywords: Plot Visualzation + > + > ### ** Examples + > + ... + 9. │ └─base::lapply(def_fonts, font_family_exists) + 10. │ └─ggiraph:::FUN(X[[i]], ...) + 11. │ └─ggiraph:::fortify_font_db() + 12. │ └─base::rbind(db_sys, db_reg) + 13. │ └─tibble:::rbind(deparse.level, ...) + 14. │ └─vctrs::vec_rbind(!!!list(...)) + 15. └─vctrs::stop_incompatible_type(...) + 16. └─vctrs:::stop_incompatible(...) + 17. └─vctrs:::stop_vctrs(...) + Execution halted + ``` + +# workflowsets + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/tidymodels/workflowsets +* Source code: https://github.com/cran/workflowsets +* Date/Publication: 2021-07-22 14:00:02 UTC +* Number of recursive dependencies: 117 + +Run `cloud_details(, "workflowsets")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 4. ├─tune::collect_metrics(res_1) + 5. ├─workflowsets:::collect_metrics.workflow_set(res_1) + 6. │ ├─dplyr::mutate(...) + 7. │ └─dplyr:::mutate.data.frame(...) + 8. │ └─dplyr:::mutate_cols(.data, ..., caller_env = caller_env()) + 9. │ ├─base::withCallingHandlers(...) + 10. │ └─mask$eval_all_mutate(quo) + 11. └─purrr::map(result, collect_metrics, summarize = summarize) + 12. ├─tune:::.f(.x[[i]], ...) + 13. └─tune:::collect_metrics.tune_results(.x[[i]], ...) + 14. └─tune::estimate_tune_results(x) + + [ FAIL 1 | WARN 30 | SKIP 6 | PASS 326 ] + Error: Test failures + Execution halted + ``` + +# wpa + +
+ +* Version: 1.6.0 +* GitHub: https://github.com/microsoft/wpa +* Source code: https://github.com/cran/wpa +* Date/Publication: 2021-07-06 09:30:02 UTC +* Number of recursive dependencies: 116 + +Run `cloud_details(, "wpa")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘wpa-Ex.R’ failed + The error most likely occurred in: + + > ### Name: collaboration_rank + > ### Title: Collaboration Ranking + > ### Aliases: collaboration_rank collab_rank + > + > ### ** Examples + > + > # Return rank table + ... + 2. └─wpa::create_rank(...) + 3. └─base::rbind(results, table1) + 4. └─tibble:::rbind(deparse.level, ...) + 5. └─vctrs::vec_rbind(!!!list(...)) + 6. └─(function () ... + 7. └─vctrs::vec_default_ptype2(...) + 8. └─vctrs::stop_incompatible_type(...) + 9. └─vctrs:::stop_incompatible(...) + 10. └─vctrs:::stop_vctrs(...) + Execution halted + ``` + +# xpose4 + +
+ +* Version: 4.7.1 +* GitHub: https://github.com/UUPharmacometrics/xpose4 +* Source code: https://github.com/cran/xpose4 +* Date/Publication: 2020-12-18 13:00:02 UTC +* Number of recursive dependencies: 92 + +Run `cloud_details(, "xpose4")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘xpose4-Ex.R’ failed + The error most likely occurred in: + + > ### Name: runsum + > ### Title: Print run summary in Xpose 4 + > ### Aliases: runsum + > ### Keywords: methods + > + > ### ** Examples + > + ... + Table files read. + + Looking for NONMEM simulation table files. + No simulated table files read. + + > runsum(xpdb) + Error in Math.data.frame(list(IWRES = integer(0))) : + non-numeric variable(s) in data frame: IWRES + Calls: runsum ... absval.iwres.vs.ipred -> xpose.plot.default -> do.call -> Math.data.frame + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + Component "ID": Attributes: < target is NULL, current is list > + Component "ID": target is numeric, current is factor + Component "IWRES": names for current but not for target + Component "IWRES": Attributes: < target is NULL, current is list > + Component "IWRES": target is numeric, current is factor + Component "CWRES": names for current but not for target + ... + Backtrace: + █ + 1. └─xpose4:::compare_xpdb(xpdb_2, xpdb_3) test_reading_data.R:25:2 + 2. └─testthat::expect_equal(xpdb_1@Data, xpdb_2@Data) test_reading_data.R:7:2 + + [ FAIL 3 | WARN 0 | SKIP 1 | PASS 6 ] + Error: Test failures + Execution halted + ``` + +# xrf + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/holub008/xrf +* Source code: https://github.com/cran/xrf +* Date/Publication: 2020-05-03 21:00:01 UTC +* Number of recursive dependencies: 63 + +Run `cloud_details(, "xrf")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Last 13 lines of output: + 2. └─xrf:::xrf.formula(...) + 3. ├─rule_features[, varying_rules] + 4. └─base::`[.data.frame`(rule_features, , varying_rules) + ── Error (test_model.R:99:3): call scrubbed ──────────────────────────────────── + Error: undefined columns selected + Backtrace: + █ + 1. ├─xrf::xrf(...) test_model.R:99:2 + 2. └─xrf:::xrf.formula(...) + 3. ├─rule_features[, varying_rules] + 4. └─base::`[.data.frame`(rule_features, , varying_rules) + + [ FAIL 6 | WARN 0 | SKIP 0 | PASS 26 ] + Error: Test failures + Execution halted + ``` + +# ypr + +
+ +* Version: 0.5.2 +* GitHub: https://github.com/poissonconsulting/ypr +* Source code: https://github.com/cran/ypr +* Date/Publication: 2021-07-03 04:40:02 UTC +* Number of recursive dependencies: 74 + +Run `cloud_details(, "ypr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ypr) + > + > test_check("ypr") + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure (test-base.R:16:3): as.data.frame ─────────────────────────────────── + as.data.frame(ypr_populations(Rk = c(3, 4))) not identical to structure(...). + Attributes: < Component "row.names": Modes: numeric, character > + Attributes: < Component "row.names": target is numeric, current is character > + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 174 ] + Error: Test failures Execution halted ``` From e2a93e22ef5015b4dd4b38af1fa8d620a25b3846 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Thu, 5 Aug 2021 06:46:57 +0200 Subject: [PATCH 5/9] Add fallback --- R/class-tbl_df.R | 26 ++++++++++++++++++++++++-- 1 file changed, 24 insertions(+), 2 deletions(-) diff --git a/R/class-tbl_df.R b/R/class-tbl_df.R index d107d404f..4f37288e7 100644 --- a/R/class-tbl_df.R +++ b/R/class-tbl_df.R @@ -140,12 +140,34 @@ if (getRversion() >= "4.0.0") rbind.tbl_df <- function(...) { # deparse.level is part of the interface of the generic but not passed along # for data frame methods - vec_rbind(!!!list(...)) + e <- tryCatch( + return(vec_rbind(!!!list(...))), + error = identity + ) + lifecycle::deprecate_soft("3.2.0", "tibble::rbind()", + details = paste0( + "rbind() now forwards to vctrs::vec_rbind(), this call has failed. Falling back to legacy behavior. Error:\n", + conditionMessage(e) + ), + user_env = caller_env(2) + ) + NextMethod("rbind") } #' @rawNamespace if (getRversion() >= "4.0.0") S3method(cbind, tbl_df) if (getRversion() >= "4.0.0") cbind.tbl_df <- function(...) { - vec_cbind(!!!list(...)) + e <- tryCatch( + return(vec_cbind(!!!list(...))), + error = identity + ) + lifecycle::deprecate_soft("3.2.0", "tibble::cbind()", + details = paste0( + "cbind() now forwards to vctrs::vec_cbind(), this call has failed. Falling back to legacy behavior. Error:\n", + conditionMessage(e) + ), + user_env = caller_env(2) + ) + NextMethod("cbind") } # Errors ------------------------------------------------------------------ From 4326dbd8ea698284b46f0a1fce4a32c8ef45261d Mon Sep 17 00:00:00 2001 From: Hadley Wickham Date: Fri, 6 Aug 2021 16:59:08 -0500 Subject: [PATCH 6/9] Re-run failed revdeps --- revdep/README.md | 45 +- revdep/cran.md | 77 +- revdep/failures.md | 1705 +------------------------------------------- revdep/problems.md | 706 +----------------- 4 files changed, 26 insertions(+), 2507 deletions(-) diff --git a/revdep/README.md b/revdep/README.md index 926586c1b..f80b42d41 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -1,59 +1,23 @@ # Revdeps -## Failed to check (24) - -|package |version |error |warning |note | -|:--------------|:-------|:-----|:-------|:----| -|bayesdfa |1.1.0 |1 | | | -|CB2 |? | | | | -|cbar |? | | | | -|diceR |? | | | | -|dimRed |? | | | | -|do |1.9.0.0 |1 | | | -|ggmsa |? | | | | -|glmmfields |0.1.4 |1 | | | -|loon.shiny |? | | | | -|loon.tourr |? | | | | -|MarketMatching |? | | | | -|metagam |? | | | | -|pencal |? | | | | -|phylopath |? | | | | -|rabhit |? | | | | -|raw |? | | | | -|rmdcev |1.2.4 |1 | | | -|rstap |1.0.3 |1 | | | -|scoper |? | | | | -|SynthETIC |? | | | | -|tigger |? | | | | -|trackr |? | | | | -|vivid |? | | | | -|wrswoR |? | | | | - -## New problems (61) +## New problems (47) |package |version |error |warning |note | |:--------------------------------------------------|:-------|:------|:-------|:----| |[AGread](problems.md#agread) |1.1.1 |__+1__ | |1 | |[comparer](problems.md#comparer) |0.2.2 |__+1__ | |1 | |[crosstable](problems.md#crosstable) |0.2.1 |__+1__ | | | -|[dat](problems.md#dat) |0.5.0 |__+1__ | | | -|[designr](problems.md#designr) |0.1.12 |__+1__ | |1 | |[drake](problems.md#drake) |7.13.2 |__+1__ | | | |[EFAtools](problems.md#efatools) |0.3.1 |__+1__ | |2 | |[egor](problems.md#egor) |1.21.7 |__+2__ | | | -|[ExpertChoice](problems.md#expertchoice) |0.2.0 |__+1__ | | | |[fgeo.tool](problems.md#fgeotool) |1.2.7 |__+1__ | | | |[finetune](problems.md#finetune) |0.1.0 |__+1__ | |1 | |[geonet](problems.md#geonet) |0.1.1 |__+1__ | | | -|[ggiraph](problems.md#ggiraph) |0.7.10 |__+2__ | |1 | -|[ggiraphExtra](problems.md#ggiraphextra) |0.3.0 |__+1__ | | | |[ggspatial](problems.md#ggspatial) |1.1.5 |__+1__ | | | |[graphicalVAR](problems.md#graphicalvar) |0.2.4 |__+1__ | | | |[grobblR](problems.md#grobblr) |0.2.0 |__+2__ | | | -|[groupr](problems.md#groupr) |0.1.0 |__+1__ | | | |[heatwaveR](problems.md#heatwaver) |0.4.5 |__+1__ | | | |[HEDA](problems.md#heda) |0.1.5 |__+1__ | | | -|[heemod](problems.md#heemod) |0.14.2 |__+1__ | | | |[htmlTable](problems.md#htmltable) |2.2.1 |__+2__ | | | |[hurricaneexposure](problems.md#hurricaneexposure) |0.1.1 |__+1__ | |1 | |[impactr](problems.md#impactr) |0.1.0 |__+2__ | | | @@ -64,17 +28,14 @@ |[mfGARCH](problems.md#mfgarch) |0.2.1 |__+1__ | | | |[mortAAR](problems.md#mortaar) |1.1.1 |__+1__ | | | |[msigdbr](problems.md#msigdbr) |7.4.1 |__+1__ | |1 | -|[neonstore](problems.md#neonstore) |0.4.3 |__+2__ | |1 | |[OncoBayes2](problems.md#oncobayes2) |0.7-0 |__+1__ | |2 | |[optimall](problems.md#optimall) |0.1.0 |__+2__ | | | |[phenofit](problems.md#phenofit) |0.2.7 |__+2__ | |1 | |[pitchRx](problems.md#pitchrx) |1.8.2 |__+1__ | |1 | |[PKNCA](problems.md#pknca) |0.9.4 |__+1__ | | | -|[prettyglm](problems.md#prettyglm) |0.1.0 |__+1__ | |1 | |[psychmeta](problems.md#psychmeta) |2.6.0 |__+2__ | |1 | |[REddyProc](problems.md#reddyproc) |1.2.2 |__+1__ | | | |[reproducer](problems.md#reproducer) |0.4.2 |__+1__ | | | -|[RKorAPClient](problems.md#rkorapclient) |0.6.1 |__+1__ | | | |[rubias](problems.md#rubias) |0.3.2 |__+1__ | |2 | |[sapfluxnetr](problems.md#sapfluxnetr) |0.1.1 |__+2__ | |1 | |[sim2Dpredictr](problems.md#sim2dpredictr) |0.1.0 |__+2__ | |1 | @@ -86,11 +47,7 @@ |[tidypredict](problems.md#tidypredict) |0.4.8 |__+1__ | | | |[tune](problems.md#tune) |0.1.6 |__+1__ | | | |[twoxtwo](problems.md#twoxtwo) |0.1.0 |__+1__ | | | -|[VarBundle](problems.md#varbundle) |0.3.0 |__+1__ | | | -|[visR](problems.md#visr) |0.2.0 |__+2__ | |1 | -|[vlda](problems.md#vlda) |1.1.5 |__+1__ | | | |[workflowsets](problems.md#workflowsets) |0.1.0 |__+1__ | | | -|[wpa](problems.md#wpa) |1.6.0 |__+1__ | | | |[xpose4](problems.md#xpose4) |4.7.1 |__+2__ | | | |[xrf](problems.md#xrf) |0.2.0 |__+1__ | | | |[ypr](problems.md#ypr) |0.5.2 |__+1__ | | | diff --git a/revdep/cran.md b/revdep/cran.md index 31e99be29..e1dc60013 100644 --- a/revdep/cran.md +++ b/revdep/cran.md @@ -1,9 +1,9 @@ ## revdepcheck results -We checked 2993 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. +We checked 61 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. - * We saw 61 new problems - * We failed to check 24 packages + * We saw 47 new problems + * We failed to check 0 packages Issues with CRAN packages are summarised below. @@ -19,12 +19,6 @@ Issues with CRAN packages are summarised below. * crosstable checking tests ... ERROR -* dat - checking tests ... ERROR - -* designr - checking examples ... ERROR - * drake checking tests ... ERROR @@ -35,9 +29,6 @@ Issues with CRAN packages are summarised below. checking examples ... ERROR checking tests ... ERROR -* ExpertChoice - checking examples ... ERROR - * fgeo.tool checking tests ... ERROR @@ -47,13 +38,6 @@ Issues with CRAN packages are summarised below. * geonet checking examples ... ERROR -* ggiraph - checking examples ... ERROR - checking tests ... ERROR - -* ggiraphExtra - checking examples ... ERROR - * ggspatial checking tests ... ERROR @@ -64,18 +48,12 @@ Issues with CRAN packages are summarised below. checking examples ... ERROR checking tests ... ERROR -* groupr - checking tests ... ERROR - * heatwaveR checking tests ... ERROR * HEDA checking examples ... ERROR -* heemod - checking tests ... ERROR - * htmlTable checking examples ... ERROR checking tests ... ERROR @@ -108,10 +86,6 @@ Issues with CRAN packages are summarised below. * msigdbr checking tests ... ERROR -* neonstore - checking examples ... ERROR - checking tests ... ERROR - * OncoBayes2 checking examples ... ERROR @@ -129,9 +103,6 @@ Issues with CRAN packages are summarised below. * PKNCA checking tests ... ERROR -* prettyglm - checking examples ... ERROR - * psychmeta checking examples ... ERROR checking tests ... ERROR @@ -142,9 +113,6 @@ Issues with CRAN packages are summarised below. * reproducer checking examples ... ERROR -* RKorAPClient - checking tests ... ERROR - * rubias checking examples ... ERROR @@ -180,22 +148,9 @@ Issues with CRAN packages are summarised below. * twoxtwo checking tests ... ERROR -* VarBundle - checking tests ... ERROR - -* visR - checking examples ... ERROR - checking tests ... ERROR - -* vlda - checking examples ... ERROR - * workflowsets checking tests ... ERROR -* wpa - checking examples ... ERROR - * xpose4 checking examples ... ERROR checking tests ... ERROR @@ -206,29 +161,3 @@ Issues with CRAN packages are summarised below. * ypr checking tests ... ERROR -### Failed to check - -* bayesdfa (NA) -* CB2 (NA) -* cbar (NA) -* diceR (NA) -* dimRed (NA) -* do (NA) -* ggmsa (NA) -* glmmfields (NA) -* loon.shiny (NA) -* loon.tourr (NA) -* MarketMatching (NA) -* metagam (NA) -* pencal (NA) -* phylopath (NA) -* rabhit (NA) -* raw (NA) -* rmdcev (NA) -* rstap (NA) -* scoper (NA) -* SynthETIC (NA) -* tigger (NA) -* trackr (NA) -* vivid (NA) -* wrswoR (NA) diff --git a/revdep/failures.md b/revdep/failures.md index 16cab6fd2..9a2073633 100644 --- a/revdep/failures.md +++ b/revdep/failures.md @@ -1,1704 +1 @@ -# bayesdfa - -
- -* Version: 1.1.0 -* GitHub: https://github.com/fate-ewi/bayesdfa -* Source code: https://github.com/cran/bayesdfa -* Date/Publication: 2021-05-28 18:10:05 UTC -* Number of recursive dependencies: 81 - -Run `cloud_details(, "bayesdfa")` for more info - -
- -## In both - -* checking whether package ‘bayesdfa’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/bayesdfa/new/bayesdfa.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘bayesdfa’ ... -** package ‘bayesdfa’ successfully unpacked and MD5 sums checked -** using staged installation -** libs - - -g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, - from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, - from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/RcppEigenForward.h:30, -... -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/ProductEvaluators.h:35:90: required from ‘Eigen::internal::evaluator >::evaluator(const XprType&) [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Options = 0; Eigen::internal::evaluator >::XprType = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>, Eigen::Matrix, 0>]’ -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_dfa_namespace::model_dfa; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stanExports_dfa.o] Error 1 -ERROR: compilation failed for package ‘bayesdfa’ -* removing ‘/tmp/workdir/bayesdfa/new/bayesdfa.Rcheck/bayesdfa’ - - -``` -### CRAN - -``` -* installing *source* package ‘bayesdfa’ ... -** package ‘bayesdfa’ successfully unpacked and MD5 sums checked -** using staged installation -** libs - - -g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, - from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, - from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/RcppEigenForward.h:30, -... -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/ProductEvaluators.h:35:90: required from ‘Eigen::internal::evaluator >::evaluator(const XprType&) [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Options = 0; Eigen::internal::evaluator >::XprType = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>, Eigen::Matrix, 0>]’ -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_dfa_namespace::model_dfa; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stanExports_dfa.o] Error 1 -ERROR: compilation failed for package ‘bayesdfa’ -* removing ‘/tmp/workdir/bayesdfa/old/bayesdfa.Rcheck/bayesdfa’ - - -``` -# CB2 - -
- -* Version: 1.3.4 -* GitHub: NA -* Source code: https://github.com/cran/CB2 -* Date/Publication: 2020-07-24 09:42:24 UTC -* Number of recursive dependencies: 105 - -Run `cloud_details(, "CB2")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/CB2/new/CB2.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘CB2/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘CB2’ version ‘1.3.4’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘metap’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/CB2/old/CB2.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘CB2/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘CB2’ version ‘1.3.4’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘metap’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# cbar - -
- -* Version: 0.1.3 -* GitHub: https://github.com/zedoul/cbar -* Source code: https://github.com/cran/cbar -* Date/Publication: 2017-10-24 13:20:22 UTC -* Number of recursive dependencies: 63 - -Run `cloud_details(, "cbar")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/cbar/new/cbar.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘cbar/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘cbar’ version ‘0.1.3’ -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'Boom', 'bsts' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/cbar/old/cbar.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘cbar/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘cbar’ version ‘0.1.3’ -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'Boom', 'bsts' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# diceR - -
- -* Version: 1.1.0 -* GitHub: https://github.com/AlineTalhouk/diceR -* Source code: https://github.com/cran/diceR -* Date/Publication: 2021-07-23 19:30:01 UTC -* Number of recursive dependencies: 152 - -Run `cloud_details(, "diceR")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/diceR/new/diceR.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘diceR/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘diceR’ version ‘1.1.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘NMF’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/diceR/old/diceR.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘diceR/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘diceR’ version ‘1.1.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘NMF’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# dimRed - -
- -* Version: 0.2.3 -* GitHub: https://github.com/gdkrmr/dimRed -* Source code: https://github.com/cran/dimRed -* Date/Publication: 2019-05-08 08:10:07 UTC -* Number of recursive dependencies: 128 - -Run `cloud_details(, "dimRed")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/dimRed/new/dimRed.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘dimRed/DESCRIPTION’ ... OK -* this is package ‘dimRed’ version ‘0.2.3’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... NOTE -... - - 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 - ‘dimensionality-reduction.Rnw’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... SKIPPED -* DONE -Status: 2 ERRORs, 2 NOTEs - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/dimRed/old/dimRed.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘dimRed/DESCRIPTION’ ... OK -* this is package ‘dimRed’ version ‘0.2.3’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... NOTE -... - - 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 - ‘dimensionality-reduction.Rnw’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... SKIPPED -* DONE -Status: 2 ERRORs, 2 NOTEs - - - - - -``` -# do - -
- -* Version: 1.9.0.0 -* GitHub: https://github.com/yikeshu0611/do -* Source code: https://github.com/cran/do -* Date/Publication: 2021-07-16 07:40:07 UTC -* Number of recursive dependencies: 64 - -Run `cloud_details(, "do")` for more info - -
- -## In both - -* checking whether package ‘do’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/do/new/do.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘do’ ... -** package ‘do’ successfully unpacked and MD5 sums checked -** using staged installation -** R -Error in parse(outFile) : - /tmp/workdir/do/new/do.Rcheck/00_pkg_src/do/R/file.name.R:13:19: unexpected '>' -12: file.name <- function(...){ -13: fn <- c(...) |> - ^ -ERROR: unable to collate and parse R files for package ‘do’ -* removing ‘/tmp/workdir/do/new/do.Rcheck/do’ - - -``` -### CRAN - -``` -* installing *source* package ‘do’ ... -** package ‘do’ successfully unpacked and MD5 sums checked -** using staged installation -** R -Error in parse(outFile) : - /tmp/workdir/do/old/do.Rcheck/00_pkg_src/do/R/file.name.R:13:19: unexpected '>' -12: file.name <- function(...){ -13: fn <- c(...) |> - ^ -ERROR: unable to collate and parse R files for package ‘do’ -* removing ‘/tmp/workdir/do/old/do.Rcheck/do’ - - -``` -# ggmsa - -
- -* Version: 0.0.6 -* GitHub: NA -* Source code: https://github.com/cran/ggmsa -* Date/Publication: 2021-02-02 10:10:07 UTC -* Number of recursive dependencies: 70 - -Run `cloud_details(, "ggmsa")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/ggmsa/new/ggmsa.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘ggmsa/DESCRIPTION’ ... OK -* this is package ‘ggmsa’ version ‘0.0.6’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘Biostrings’ - -Packages suggested but not available for checking: 'ggtree', 'seqmagick' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/ggmsa/old/ggmsa.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘ggmsa/DESCRIPTION’ ... OK -* this is package ‘ggmsa’ version ‘0.0.6’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘Biostrings’ - -Packages suggested but not available for checking: 'ggtree', 'seqmagick' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# glmmfields - -
- -* Version: 0.1.4 -* GitHub: https://github.com/seananderson/glmmfields -* Source code: https://github.com/cran/glmmfields -* Date/Publication: 2020-07-09 05:50:03 UTC -* Number of recursive dependencies: 93 - -Run `cloud_details(, "glmmfields")` for more info - -
- -## In both - -* checking whether package ‘glmmfields’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/glmmfields/new/glmmfields.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘glmmfields’ ... -** package ‘glmmfields’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -"/opt/R/4.0.3/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/glmmfields.stan -Wrote C++ file "stan_files/glmmfields.cc" - - -g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -fpic -g -O2 -c stan_files/glmmfields.cc -o stan_files/glmmfields.o -In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, -... -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_glmmfields_namespace::model_glmmfields; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stan_files/glmmfields.o] Error 1 -rm stan_files/glmmfields.cc -ERROR: compilation failed for package ‘glmmfields’ -* removing ‘/tmp/workdir/glmmfields/new/glmmfields.Rcheck/glmmfields’ - - -``` -### CRAN - -``` -* installing *source* package ‘glmmfields’ ... -** package ‘glmmfields’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -"/opt/R/4.0.3/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/glmmfields.stan -Wrote C++ file "stan_files/glmmfields.cc" - - -g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -fpic -g -O2 -c stan_files/glmmfields.cc -o stan_files/glmmfields.o -In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, -... -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_glmmfields_namespace::model_glmmfields; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stan_files/glmmfields.o] Error 1 -rm stan_files/glmmfields.cc -ERROR: compilation failed for package ‘glmmfields’ -* removing ‘/tmp/workdir/glmmfields/old/glmmfields.Rcheck/glmmfields’ - - -``` -# loon.shiny - -
- -* Version: 1.0.0 -* GitHub: NA -* Source code: https://github.com/cran/loon.shiny -* Date/Publication: 2021-06-10 16:30:06 UTC -* Number of recursive dependencies: 133 - -Run `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.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘loon.shiny/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘loon.shiny’ version ‘1.0.0’ -* 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.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘loon.shiny/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘loon.shiny’ version ‘1.0.0’ -* 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.2 -* GitHub: https://github.com/z267xu/loon.tourr -* Source code: https://github.com/cran/loon.tourr -* Date/Publication: 2021-07-25 20:40:03 UTC -* Number of recursive dependencies: 118 - -Run `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.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘loon.tourr/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘loon.tourr’ version ‘0.1.2’ -* 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.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘loon.tourr/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘loon.tourr’ version ‘0.1.2’ -* 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 - - - - - -``` -# MarketMatching - -
- -* Version: 1.2.0 -* GitHub: NA -* Source code: https://github.com/cran/MarketMatching -* Date/Publication: 2021-01-08 20:10:02 UTC -* Number of recursive dependencies: 67 - -Run `cloud_details(, "MarketMatching")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/MarketMatching/new/MarketMatching.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘MarketMatching/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘MarketMatching’ version ‘1.2.0’ -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'CausalImpact', 'bsts', 'Boom' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/MarketMatching/old/MarketMatching.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘MarketMatching/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘MarketMatching’ version ‘1.2.0’ -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'CausalImpact', 'bsts', 'Boom' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# metagam - -
- -* Version: 0.2.0 -* GitHub: https://github.com/Lifebrain/metagam -* Source code: https://github.com/cran/metagam -* Date/Publication: 2020-11-12 08:10:02 UTC -* Number of recursive dependencies: 145 - -Run `cloud_details(, "metagam")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/metagam/new/metagam.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘metagam/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘metagam’ version ‘0.2.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘metap’ - -Package suggested but not available for checking: ‘multtest’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/metagam/old/metagam.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘metagam/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘metagam’ version ‘0.2.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘metap’ - -Package suggested but not available for checking: ‘multtest’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# pencal - -
- -* Version: 0.4.2 -* GitHub: NA -* Source code: https://github.com/cran/pencal -* Date/Publication: 2021-05-28 09:30:02 UTC -* Number of recursive dependencies: 152 - -Run `cloud_details(, "pencal")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/pencal/new/pencal.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘pencal/DESCRIPTION’ ... OK -* this is package ‘pencal’ version ‘0.4.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘survcomp’ - -Package suggested but not available for checking: ‘ptmixed’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/pencal/old/pencal.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘pencal/DESCRIPTION’ ... OK -* this is package ‘pencal’ version ‘0.4.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘survcomp’ - -Package suggested but not available for checking: ‘ptmixed’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# phylopath - -
- -* Version: 1.1.2 -* GitHub: https://github.com/Ax3man/phylopath -* Source code: https://github.com/cran/phylopath -* Date/Publication: 2019-12-07 01:10:07 UTC -* Number of recursive dependencies: 90 - -Run `cloud_details(, "phylopath")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/phylopath/new/phylopath.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘phylopath/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘phylopath’ version ‘1.1.2’ -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘ggm’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/phylopath/old/phylopath.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘phylopath/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘phylopath’ version ‘1.1.2’ -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘ggm’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# rabhit - -
- -* Version: 0.1.5 -* GitHub: NA -* Source code: https://github.com/cran/rabhit -* Date/Publication: 2020-07-11 22:40:02 UTC -* Number of recursive dependencies: 127 - -Run `cloud_details(, "rabhit")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/rabhit/new/rabhit.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘rabhit/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘rabhit’ version ‘0.1.5’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'alakazam', 'tigger' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/rabhit/old/rabhit.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘rabhit/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘rabhit’ version ‘0.1.5’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'alakazam', 'tigger' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# raw - -
- -* Version: 0.1.8 -* GitHub: NA -* Source code: https://github.com/cran/raw -* Date/Publication: 2021-02-05 15:40:03 UTC -* Number of recursive dependencies: 162 - -Run `cloud_details(, "raw")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/raw/new/raw.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘raw/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘raw’ version ‘0.1.8’ -* package encoding: UTF-8 -* checking package namespace information ... 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 ... NONE - ‘raw.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... SKIPPED -* DONE -Status: 1 NOTE - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/raw/old/raw.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘raw/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘raw’ version ‘0.1.8’ -* package encoding: UTF-8 -* checking package namespace information ... 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 ... NONE - ‘raw.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... SKIPPED -* DONE -Status: 1 NOTE - - - - - -``` -# rmdcev - -
- -* Version: 1.2.4 -* GitHub: https://github.com/plloydsmith/rmdcev -* Source code: https://github.com/cran/rmdcev -* Date/Publication: 2020-09-30 18:40:02 UTC -* Number of recursive dependencies: 82 - -Run `cloud_details(, "rmdcev")` for more info - -
- -## In both - -* checking whether package ‘rmdcev’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/rmdcev/new/rmdcev.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘rmdcev’ ... -** package ‘rmdcev’ successfully unpacked and MD5 sums checked -** using staged installation -** libs - - -g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, - from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, - from /opt/R/4.0.3/lib/R/site-library/StanHeaders/include/stan/math/prim/mat/fun/Eigen.hpp:13, -... -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/ProductEvaluators.h:35:90: required from ‘Eigen::internal::evaluator >::evaluator(const XprType&) [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Options = 0; Eigen::internal::evaluator >::XprType = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>, Eigen::Matrix, 0>]’ -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_mdcev_namespace::model_mdcev; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stanExports_mdcev.o] Error 1 -ERROR: compilation failed for package ‘rmdcev’ -* removing ‘/tmp/workdir/rmdcev/new/rmdcev.Rcheck/rmdcev’ - - -``` -### CRAN - -``` -* installing *source* package ‘rmdcev’ ... -** package ‘rmdcev’ successfully unpacked and MD5 sums checked -** using staged installation -** libs - - -g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.0.3/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, - from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, - from /opt/R/4.0.3/lib/R/site-library/StanHeaders/include/stan/math/prim/mat/fun/Eigen.hpp:13, -... -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/ProductEvaluators.h:35:90: required from ‘Eigen::internal::evaluator >::evaluator(const XprType&) [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Options = 0; Eigen::internal::evaluator >::XprType = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>, Eigen::Matrix, 0>]’ -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_mdcev_namespace::model_mdcev; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stanExports_mdcev.o] Error 1 -ERROR: compilation failed for package ‘rmdcev’ -* removing ‘/tmp/workdir/rmdcev/old/rmdcev.Rcheck/rmdcev’ - - -``` -# rstap - -
- -* Version: 1.0.3 -* GitHub: https://github.com/biostatistics4socialimpact/rstap -* Source code: https://github.com/cran/rstap -* Date/Publication: 2019-02-06 20:30:03 UTC -* Number of recursive dependencies: 110 - -Run `cloud_details(, "rstap")` for more info - -
- -## In both - -* checking whether package ‘rstap’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/rstap/new/rstap.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘rstap’ ... -** package ‘rstap’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -"/opt/R/4.0.3/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/stap_binomial.stan -Wrote C++ file "stan_files/stap_binomial.cc" -g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"`"/opt/R/4.0.3/lib/R/bin/Rscript" --vanilla -e "cat(system.file('include', 'src', package = 'StanHeaders'))"`" -DBOOST_RESULT_OF_USE_TR1 -DBOOST_NO_DECLTYPE -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fpic -g -O2 -c stan_files/stap_binomial.cc -o stan_files/stap_binomial.o -In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, - from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, - from /opt/R/4.0.3/lib/R/site-library/StanHeaders/include/stan/math/prim/mat/fun/Eigen.hpp:13, -... -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_stap_binomial_namespace::model_stap_binomial; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stan_files/stap_binomial.o] Error 1 -rm stan_files/stap_binomial.cc -ERROR: compilation failed for package ‘rstap’ -* removing ‘/tmp/workdir/rstap/new/rstap.Rcheck/rstap’ - - -``` -### CRAN - -``` -* installing *source* package ‘rstap’ ... -** package ‘rstap’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -"/opt/R/4.0.3/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/stap_binomial.stan -Wrote C++ file "stan_files/stap_binomial.cc" -g++ -std=gnu++14 -I"/opt/R/4.0.3/lib/R/include" -DNDEBUG -I"../inst/include" -I"`"/opt/R/4.0.3/lib/R/bin/Rscript" --vanilla -e "cat(system.file('include', 'src', package = 'StanHeaders'))"`" -DBOOST_RESULT_OF_USE_TR1 -DBOOST_NO_DECLTYPE -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -I'/opt/R/4.0.3/lib/R/site-library/StanHeaders/include' -I'/opt/R/4.0.3/lib/R/site-library/rstan/include' -I'/opt/R/4.0.3/lib/R/site-library/BH/include' -I'/opt/R/4.0.3/lib/R/site-library/Rcpp/include' -I'/opt/R/4.0.3/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fpic -g -O2 -c stan_files/stap_binomial.cc -o stan_files/stap_binomial.o -In file included from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Core:397, - from /opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/Dense:1, - from /opt/R/4.0.3/lib/R/site-library/StanHeaders/include/stan/math/prim/mat/fun/Eigen.hpp:13, -... -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/Product.h:132:22: required from ‘Eigen::internal::dense_product_base::operator const Scalar() const [with Lhs = Eigen::Product, const Eigen::CwiseNullaryOp, const Eigen::Matrix >, const Eigen::Transpose > >, Eigen::Matrix, 0>; Rhs = Eigen::Matrix; int Option = 0; Eigen::internal::dense_product_base::Scalar = double]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:23:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_stap_binomial_namespace::model_stap_binomial; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.0.3/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:10: required from here -/opt/R/4.0.3/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:55:30: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__vector(2) double’} [-Wignored-attributes] -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.0.3/lib/R/etc/Makeconf:179: stan_files/stap_binomial.o] Error 1 -rm stan_files/stap_binomial.cc -ERROR: compilation failed for package ‘rstap’ -* removing ‘/tmp/workdir/rstap/old/rstap.Rcheck/rstap’ - - -``` -# scoper - -
- -* Version: 1.1.0 -* GitHub: NA -* Source code: https://github.com/cran/scoper -* Date/Publication: 2020-08-10 21:50:02 UTC -* Number of recursive dependencies: 119 - -Run `cloud_details(, "scoper")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/scoper/new/scoper.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘scoper/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘scoper’ version ‘1.1.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'alakazam', 'shazam' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/scoper/old/scoper.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘scoper/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘scoper’ version ‘1.1.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'alakazam', 'shazam' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# SynthETIC - -
- -* Version: 1.0.1 -* GitHub: https://github.com/agi-lab/SynthETIC -* Source code: https://github.com/cran/SynthETIC -* Date/Publication: 2021-06-26 15:50:02 UTC -* Number of recursive dependencies: 108 - -Run `cloud_details(, "SynthETIC")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/SynthETIC/new/SynthETIC.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘SynthETIC/DESCRIPTION’ ... OK -* this is package ‘SynthETIC’ version ‘1.0.1’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... NOTE -... -* 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 ... NONE - ‘SynthETIC-demo.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... SKIPPED -* DONE -Status: 1 NOTE - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/SynthETIC/old/SynthETIC.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘SynthETIC/DESCRIPTION’ ... OK -* this is package ‘SynthETIC’ version ‘1.0.1’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... NOTE -... -* 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 ... NONE - ‘SynthETIC-demo.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... SKIPPED -* DONE -Status: 1 NOTE - - - - - -``` -# tigger - -
- -* Version: 1.0.0 -* GitHub: NA -* Source code: https://github.com/cran/tigger -* Date/Publication: 2020-05-13 05:10:03 UTC -* Number of recursive dependencies: 120 - -Run `cloud_details(, "tigger")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/tigger/new/tigger.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘tigger/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘tigger’ version ‘1.0.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'alakazam', 'shazam' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/tigger/old/tigger.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘tigger/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘tigger’ version ‘1.0.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'alakazam', 'shazam' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# trackr - -
- -* Version: 0.10.7 -* GitHub: NA -* Source code: https://github.com/cran/trackr -* Date/Publication: 2021-05-24 14:50:02 UTC -* Number of recursive dependencies: 99 - -Run `cloud_details(, "trackr")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/trackr/new/trackr.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘trackr/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘trackr’ version ‘0.10.7’ -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: - 'histry', 'CodeDepends', 'rsolr', 'roprov' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/trackr/old/trackr.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘trackr/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘trackr’ version ‘0.10.7’ -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: - 'histry', 'CodeDepends', 'rsolr', 'roprov' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# vivid - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/vivid -* Date/Publication: 2021-04-09 09:10:02 UTC -* Number of recursive dependencies: 200 - -Run `cloud_details(, "vivid")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/vivid/new/vivid.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘vivid/DESCRIPTION’ ... OK -* this is package ‘vivid’ version ‘0.1.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... NOTE -... - 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 - ‘vivid.Rmd’ using ‘UTF-8’... OK - ‘vividQStart.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... SKIPPED -* DONE -Status: 1 ERROR, 2 NOTEs - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/vivid/old/vivid.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘vivid/DESCRIPTION’ ... OK -* this is package ‘vivid’ version ‘0.1.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... NOTE -... - 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 - ‘vivid.Rmd’ using ‘UTF-8’... OK - ‘vividQStart.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... SKIPPED -* DONE -Status: 1 ERROR, 2 NOTEs - - - - - -``` -# wrswoR - -
- -* Version: 1.1.1 -* GitHub: https://github.com/krlmlr/wrswoR -* Source code: https://github.com/cran/wrswoR -* Date/Publication: 2020-07-26 18:20:02 UTC -* Number of recursive dependencies: 134 - -Run `cloud_details(, "wrswoR")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/wrswoR/new/wrswoR.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘wrswoR/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘wrswoR’ version ‘1.1.1’ -* package encoding: UTF-8 -* checking package namespace information ... 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 -* checking for unstated dependencies in ‘tests’ ... OK -* checking tests ... OK - Running ‘testthat.R’ -* DONE -Status: 1 NOTE - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/wrswoR/old/wrswoR.Rcheck’ -* using R version 4.0.3 (2020-10-10) -* using platform: x86_64-pc-linux-gnu (64-bit) -* using session charset: UTF-8 -* using options ‘--no-manual --no-build-vignettes’ -* checking for file ‘wrswoR/DESCRIPTION’ ... OK -* checking extension type ... Package -* this is package ‘wrswoR’ version ‘1.1.1’ -* package encoding: UTF-8 -* checking package namespace information ... 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 -* checking for unstated dependencies in ‘tests’ ... OK -* checking tests ... OK - Running ‘testthat.R’ -* DONE -Status: 1 NOTE - - - - - -``` +*Wow, no problems at all. :)* \ No newline at end of file diff --git a/revdep/problems.md b/revdep/problems.md index a34612fc0..0da7beea0 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -78,7 +78,7 @@ Run `cloud_details(, "comparer")` for more info `actual`: FALSE `expected`: TRUE - [ FAIL 4 | WARN 1 | SKIP 0 | PASS 238 ] + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 238 ] Error: Test failures Execution halted ``` @@ -129,92 +129,6 @@ Run `cloud_details(, "crosstable")` for more info Execution halted ``` -# dat - -
- -* Version: 0.5.0 -* GitHub: https://github.com/wahani/dat -* Source code: https://github.com/cran/dat -* Date/Publication: 2020-05-15 19:40:03 UTC -* Number of recursive dependencies: 72 - -Run `cloud_details(, "dat")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Last 13 lines of output: - 9. │ └─base::as.data.frame(x) test-mutar-data-table.R:6:4 - 10. └─base::cbind(dat, list(a = mean(dat$x))) - 11. └─tibble:::cbind(deparse.level, ...) - 12. └─vctrs::vec_cbind(!!!list(...)) - 13. └─(function () ... - 14. ├─vctrs::vec_cbind_frame_ptype(x = x) - 15. └─vctrs:::vec_cbind_frame_ptype.default(x = x) - 16. ├─x[0] - 17. └─dat:::`[.DataFrame`(x, 0) - 18. └─dat:::handleCols(...) - 19. └─(function (classes, fdef, mtable) ... - - [ FAIL 1 | WARN 4 | SKIP 1 | PASS 118 ] - Error: Test failures - Execution halted - ``` - -# designr - -
- -* Version: 0.1.12 -* GitHub: https://github.com/mmrabe/designr -* Source code: https://github.com/cran/designr -* Date/Publication: 2021-04-22 14:00:15 UTC -* Number of recursive dependencies: 102 - -Run `cloud_details(, "designr")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘designr-Ex.R’ failed - The error most likely occurred in: - - > ### Name: factor.design - > ### Title: Factorial Designs - > ### Aliases: factor.design - > - > ### ** Examples - > - > # To create an empty design: - ... - 4. │ ├─base::do.call(...) - 5. │ └─(function (...) ... - 6. │ └─designr:::na_join(ret, el) - 7. │ └─base::cbind(...) - 8. │ └─tibble:::cbind(deparse.level, ...) - 9. │ └─vctrs::vec_cbind(!!!list(...)) - 10. └─vctrs::stop_incompatible_size(...) - 11. └─vctrs:::stop_incompatible(...) - 12. └─vctrs:::stop_vctrs(...) - Execution halted - ``` - -## In both - -* checking data for non-ASCII characters ... NOTE - ``` - Note: found 47 marked UTF-8 strings - ``` - # drake
@@ -236,17 +150,17 @@ Run `cloud_details(, "drake")` for more info Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: - ── 5. Error (test-8-decorated-storr.R:264:3): flow with rds format ───────────── - Error: Can't combine `..1$command` and `..2$command` . Backtrace: - 1. drake::drake_plan(...) test-8-decorated-storr.R:264:2 - 2. drake:::parse_custom_plan_columns(plan, envir = envir) - 7. tibble:::rbind(deparse.level, ...) - 8. vctrs::vec_rbind(!!!list(...)) - 10. vctrs::vec_default_ptype2(...) - 11. vctrs::stop_incompatible_type(...) - 12. vctrs:::stop_incompatible(...) - 13. vctrs:::stop_vctrs(...) + 1. drake::drake_plan(...) test-7-dsl.R:404:2 + 2. drake:::transform_plan_(...) + 3. drake:::convert_splits_to_maps(plan) + + ── 3. Error (test-7-dsl.R:1328:3): row order does not matter ─────────────────── + Error: object of type 'symbol' is not subsettable + Backtrace: + 1. drake::drake_plan(...) test-7-dsl.R:1328:2 + 2. drake:::transform_plan_(...) + 3. drake:::convert_splits_to_maps(plan) ══ DONE ════════════════════════════════════════════════════════════════════════ Error: Test failures @@ -366,52 +280,11 @@ Run `cloud_details(, "egor")` for more info 8. └─egor:::plot_one_ego_graph(...) 9. └─igraph::plot.igraph(...) - [ FAIL 6 | WARN 1 | SKIP 0 | PASS 211 ] + [ FAIL 7 | WARN 1 | SKIP 0 | PASS 210 ] Error: Test failures Execution halted ``` -# ExpertChoice - -
- -* Version: 0.2.0 -* GitHub: https://github.com/JedStephens/ExpertChoice -* Source code: https://github.com/cran/ExpertChoice -* Date/Publication: 2020-04-03 14:30:02 UTC -* Number of recursive dependencies: 53 - -Run `cloud_details(, "ExpertChoice")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ExpertChoice-Ex.R’ failed - The error most likely occurred in: - - > ### Name: check_overshadow - > ### Title: Check Overshadow - Pareto Dominate Solutions - > ### Aliases: check_overshadow - > - > ### ** Examples - > - > #See Step 7 of the Practical Introduction to ExpertChoice Vignette. - ... - 2. ├─base::duplicated(...) - 3. └─base::rbind(dplyr::as_tibble(fractional_factorial_design), dplyr::as_tibble(full_factorial)) - 4. └─tibble:::rbind(deparse.level, ...) - 5. └─vctrs::vec_rbind(!!!list(...)) - 6. └─(function () ... - 7. └─vctrs::vec_default_ptype2(...) - 8. └─vctrs::stop_incompatible_type(...) - 9. └─vctrs:::stop_incompatible(...) - 10. └─vctrs:::stop_vctrs(...) - Execution halted - ``` - # fgeo.tool
@@ -542,119 +415,6 @@ Run `cloud_details(, "geonet")` for more info New names: ``` -# ggiraph - -
- -* Version: 0.7.10 -* GitHub: https://github.com/davidgohel/ggiraph -* Source code: https://github.com/cran/ggiraph -* Date/Publication: 2021-05-19 16:50:04 UTC -* Number of recursive dependencies: 99 - -Run `cloud_details(, "ggiraph")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ggiraph-Ex.R’ failed - The error most likely occurred in: - - > ### Name: annotate_interactive - > ### Title: Create interactive annotations - > ### Aliases: annotate_interactive - > - > ### ** Examples - > - > # add interactive annotation to a ggplot ------- - ... - 7. │ └─base::lapply(def_fonts, font_family_exists) - 8. │ └─ggiraph:::FUN(X[[i]], ...) - 9. │ └─ggiraph:::fortify_font_db() - 10. │ └─base::rbind(db_sys, db_reg) - 11. │ └─tibble:::rbind(deparse.level, ...) - 12. │ └─vctrs::vec_rbind(!!!list(...)) - 13. └─vctrs::stop_incompatible_type(...) - 14. └─vctrs:::stop_incompatible(...) - 15. └─vctrs:::stop_vctrs(...) - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Last 13 lines of output: - 3. │ └─ggiraph:::default_fontname() - 4. │ ├─base::unlist(lapply(def_fonts, font_family_exists)) - 5. │ └─base::lapply(def_fonts, font_family_exists) - 6. │ └─ggiraph:::FUN(X[[i]], ...) - 7. │ └─ggiraph:::fortify_font_db() - 8. │ └─base::rbind(db_sys, db_reg) - 9. │ └─tibble:::rbind(deparse.level, ...) - 10. │ └─vctrs::vec_rbind(!!!list(...)) - 11. └─vctrs::stop_incompatible_type(...) - 12. └─vctrs:::stop_incompatible(...) - 13. └─vctrs:::stop_vctrs(...) - - [ FAIL 28 | WARN 0 | SKIP 0 | PASS 192 ] - Error: Test failures - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 7.9Mb - sub-directories of 1Mb or more: - libs 6.5Mb - ``` - -# ggiraphExtra - -
- -* Version: 0.3.0 -* GitHub: https://github.com/cardiomoon/ggiraphExtra -* Source code: https://github.com/cran/ggiraphExtra -* Date/Publication: 2020-10-06 07:00:02 UTC -* Number of recursive dependencies: 94 - -Run `cloud_details(, "ggiraphExtra")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ggiraphExtra-Ex.R’ failed - The error most likely occurred in: - - > ### Name: ggAncova - > ### Title: Make an interactive plot for an ANCOVA model - > ### Aliases: ggAncova ggAncova.default ggAncova.formula ggAncova.lm - > - > ### ** Examples - > - > require(moonBook) - ... - 11. │ └─base::lapply(def_fonts, font_family_exists) - 12. │ └─ggiraph:::FUN(X[[i]], ...) - 13. │ └─ggiraph:::fortify_font_db() - 14. │ └─base::rbind(db_sys, db_reg) - 15. │ └─tibble:::rbind(deparse.level, ...) - 16. │ └─vctrs::vec_rbind(!!!list(...)) - 17. └─vctrs::stop_incompatible_type(...) - 18. └─vctrs:::stop_incompatible(...) - 19. └─vctrs:::stop_vctrs(...) - Execution halted - ``` - # ggspatial
@@ -775,61 +535,23 @@ Run `cloud_details(, "grobblR")` for more info Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Last 13 lines of output: + 9. │ └─base::unlist(list(...)) + 10. ├─grobblR::grob_col(.) + 11. │ └─grob_col_class$new(...) + 12. │ └─grobblR:::initialize(...) + 13. ├─grobblR::alter_at(., ~"bold", columns = 1, aesthetic = "font_face") 14. │ └─methods::is(grob_object, "grob_matrix_object") 15. └─grobblR::grob_matrix(.) 16. └─grobblR:::column_names_to_row(grob_object) 17. └─base::rbind(column_names, mat) 18. └─tibble:::rbind(deparse.level, ...) - 19. └─vctrs::vec_rbind(!!!list(...)) - 20. └─(function () ... - 21. └─vctrs::vec_default_ptype2(...) - 22. └─vctrs::stop_incompatible_type(...) - 23. └─vctrs:::stop_incompatible(...) - 24. └─vctrs:::stop_vctrs(...) + 19. └─base::NextMethod("rbind") [ FAIL 9 | WARN 0 | SKIP 0 | PASS 12 ] Error: Test failures Execution halted ``` -# groupr - -
- -* Version: 0.1.0 -* GitHub: https://github.com/ngriffiths21/groupr -* Source code: https://github.com/cran/groupr -* Date/Publication: 2020-10-14 12:30:06 UTC -* Number of recursive dependencies: 57 - -Run `cloud_details(, "groupr")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Last 13 lines of output: - 4. ├─groupr:::pivot_cg(testb3, "is_ok") - 5. │ ├─dplyr::group_modify(x, ~col_grps(., rows)) - 6. │ └─dplyr:::group_modify.data.frame(x, ~col_grps(., rows)) - 7. │ └─groupr:::.f(.data, group_keys(.data), ...) - 8. │ └─groupr:::col_grps(., rows) - 9. │ └─base::cbind(...) - 10. │ └─tibble:::cbind(deparse.level, ...) - 11. │ └─vctrs::vec_cbind(!!!list(...)) - 12. └─vctrs::stop_incompatible_size(...) - 13. └─vctrs:::stop_incompatible(...) - 14. └─vctrs:::stop_vctrs(...) - - [ FAIL 3 | WARN 0 | SKIP 0 | PASS 18 ] - Error: Test failures - Execution halted - ``` - # heatwaveR
@@ -900,44 +622,6 @@ Run `cloud_details(, "HEDA")` for more info New names: ``` -# heemod - -
- -* Version: 0.14.2 -* GitHub: https://github.com/pierucci/heemod -* Source code: https://github.com/cran/heemod -* Date/Publication: 2021-01-22 13:00:02 UTC -* Number of recursive dependencies: 117 - -Run `cloud_details(, "heemod")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Last 13 lines of output: - 3. │ └─base::rbind(should_be_fits_3, direct_dist_def_3) - 4. │ └─tibble:::rbind(deparse.level, ...) - 5. │ └─vctrs::vec_rbind(!!!list(...)) - 6. │ └─(function () ... - 7. │ └─vctrs::vec_default_ptype2(...) - 8. │ └─vctrs::stop_incompatible_type(...) - 9. │ └─vctrs:::stop_incompatible(...) - 10. │ └─vctrs:::stop_vctrs(...) - 11. ├─dplyr::ungroup(.) - 12. ├─dplyr::do(., fit = join_fits_across_time(.data)) - 13. └─dplyr::group_by(., .data$.strategy, .data$.type) - - [ FAIL 1 | WARN 6 | SKIP 0 | PASS 503 ] - Error: Test failures - Execution halted - ``` - # htmlTable
@@ -1096,8 +780,8 @@ Run `cloud_details(, "impactr")` for more info ── Failure (test-read_acc.R:94:3): read_acc() works with date format separated by `/` ── `sep_dash` (`actual`) not equal to `sep_slash` (`expected`). - `attr(actual, 'problems')` is - `attr(expected, 'problems')` is + `attr(actual, 'problems')` is + `attr(expected, 'problems')` is [ FAIL 9 | WARN 6 | SKIP 4 | PASS 53 ] Error: Test failures @@ -1382,77 +1066,6 @@ Run `cloud_details(, "msigdbr")` for more info R 5.8Mb ``` -# neonstore - -
- -* Version: 0.4.3 -* GitHub: NA -* Source code: https://github.com/cran/neonstore -* Date/Publication: 2021-04-27 20:00:02 UTC -* Number of recursive dependencies: 80 - -Run `cloud_details(, "neonstore")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘neonstore-Ex.R’ failed - The error most likely occurred in: - - > ### Name: neon_citation - > ### Title: Generate the appropriate citation for your data - > ### Aliases: neon_citation - > - > ### ** Examples - > - > - ... - 6. ├─base::do.call(rbind, x) - 7. └─(function (..., deparse.level = 1) ... - 8. └─tibble:::rbind(deparse.level, ...) - 9. └─vctrs::vec_rbind(!!!list(...)) - 10. └─(function () ... - 11. └─vctrs::vec_default_ptype2(...) - 12. └─vctrs::stop_incompatible_type(...) - 13. └─vctrs:::stop_incompatible(...) - 14. └─vctrs:::stop_vctrs(...) - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘spelling.R’ - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Last 13 lines of output: - 4. └─neonstore::neon_filename_parser(files) - 5. └─neonstore:::ragged_bind(...) - 6. ├─base::do.call(rbind, x) - 7. └─(function (..., deparse.level = 1) ... - 8. └─tibble:::rbind(deparse.level, ...) - 9. └─vctrs::vec_rbind(!!!list(...)) - 10. └─(function () ... - 11. └─vctrs::vec_default_ptype2(...) - 12. └─vctrs::stop_incompatible_type(...) - 13. └─vctrs:::stop_incompatible(...) - 14. └─vctrs:::stop_vctrs(...) - - [ FAIL 3 | WARN 0 | SKIP 18 | PASS 16 ] - Error: Test failures - Execution halted - ``` - -## In both - -* checking package dependencies ... NOTE - ``` - Package suggested but not available for checking: ‘rhdf5’ - ``` - # OncoBayes2
@@ -1723,54 +1336,6 @@ Run `cloud_details(, "PKNCA")` for more info Execution halted ``` -# prettyglm - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/prettyglm -* Date/Publication: 2021-06-24 07:40:05 UTC -* Number of recursive dependencies: 127 - -Run `cloud_details(, "prettyglm")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘prettyglm-Ex.R’ failed - The error most likely occurred in: - - > ### Name: pretty_relativities - > ### Title: pretty_relativities - > ### Aliases: pretty_relativities - > - > ### ** Examples - > - > library(dplyr) - ... - 3. │ └─base::withCallingHandlers(...) - 4. └─base::rbind(count_df_all, count_df) - 5. └─tibble:::rbind(deparse.level, ...) - 6. └─vctrs::vec_rbind(!!!list(...)) - 7. └─(function () ... - 8. └─vctrs::vec_default_ptype2(...) - 9. └─vctrs::stop_incompatible_type(...) - 10. └─vctrs:::stop_incompatible(...) - 11. └─vctrs:::stop_vctrs(...) - Execution halted - ``` - -## In both - -* checking Rd cross-references ... NOTE - ``` - Package unavailable to check Rd xrefs: ‘parsnip’ - ``` - # psychmeta
@@ -1911,44 +1476,6 @@ Run `cloud_details(, "reproducer")` for more info New names: ``` -# RKorAPClient - -
- -* Version: 0.6.1 -* GitHub: https://github.com/KorAP/RKorAPClient -* Source code: https://github.com/cran/RKorAPClient -* Date/Publication: 2021-03-12 22:10:11 UTC -* Number of recursive dependencies: 112 - -Run `cloud_details(, "RKorAPClient")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Last 13 lines of output: - Backtrace: - █ - 1. ├─`%>%`(...) test-demos.R:89:2 - 2. ├─RKorAPClient::hc_freq_by_year_ci(.) - 3. │ └─`%>%`(...) - 4. ├─base::cbind(...) - 5. │ └─tibble:::cbind(deparse.level, ...) - 6. │ └─vctrs::vec_cbind(!!!list(...)) - 7. └─vctrs::stop_incompatible_size(...) - 8. └─vctrs:::stop_incompatible(...) - 9. └─vctrs:::stop_vctrs(...) - - [ FAIL 3 | WARN 0 | SKIP 0 | PASS 47 ] - Error: Test failures - Execution halted - ``` - # rubias
@@ -2472,156 +1999,6 @@ Run `cloud_details(, "twoxtwo")` for more info Execution halted ``` -# VarBundle - -
- -* Version: 0.3.0 -* GitHub: NA -* Source code: https://github.com/cran/VarBundle -* Date/Publication: 2018-08-17 08:40:10 UTC -* Number of recursive dependencies: 57 - -Run `cloud_details(, "VarBundle")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Last 13 lines of output: - █ - 1. └─VarBundle::varbundle(ll) test-varbundle.R:40:2 - 2. ├─base::do.call(rbind, lapply(1:length(x), create_df)) - 3. └─(function (..., deparse.level = 1) ... - 4. └─tibble:::rbind(deparse.level, ...) - 5. └─vctrs::vec_rbind(!!!list(...)) - 6. └─(function () ... - 7. └─vctrs::vec_default_ptype2(...) - 8. └─vctrs::stop_incompatible_type(...) - 9. └─vctrs:::stop_incompatible(...) - 10. └─vctrs:::stop_vctrs(...) - - [ FAIL 3 | WARN 0 | SKIP 0 | PASS 38 ] - Error: Test failures - Execution halted - ``` - -# visR - -
- -* Version: 0.2.0 -* GitHub: https://github.com/openpharma/visR -* Source code: https://github.com/cran/visR -* Date/Publication: 2021-06-14 09:00:02 UTC -* Number of recursive dependencies: 123 - -Run `cloud_details(, "visR")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘visR-Ex.R’ failed - The error most likely occurred in: - - > ### Name: get_tableone - > ### Title: Calculate summary statistics - > ### Aliases: get_tableone get_tableone.default - > - > ### ** Examples - > - > - ... - 6. │ └─tibble:::rbind(deparse.level, ...) - 7. │ └─vctrs::vec_rbind(!!!list(...)) - 8. │ └─(function () ... - 9. │ └─vctrs::vec_default_ptype2(...) - 10. │ └─vctrs::stop_incompatible_type(...) - 11. │ └─vctrs:::stop_incompatible(...) - 12. │ └─vctrs:::stop_vctrs(...) - 13. ├─dplyr::select(., variable, statistic, everything()) - 14. └─dplyr::rename(., statistic = summary_id) - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Last 13 lines of output: - 8. │ ├─`%>%`(...) - 9. │ └─base::rbind(data_ns, data_summary) - 10. │ └─tibble:::rbind(deparse.level, ...) - 11. │ └─vctrs::vec_rbind(!!!list(...)) - 12. │ └─(function () ... - 13. │ └─vctrs::vec_default_ptype2(...) - 14. │ └─vctrs::stop_incompatible_type(...) - 15. │ └─vctrs:::stop_incompatible(...) - 16. │ └─vctrs:::stop_vctrs(...) - 17. ├─dplyr::select(., variable, statistic, everything()) - 18. └─dplyr::rename(., statistic = summary_id) - - [ FAIL 9 | WARN 0 | SKIP 12 | PASS 527 ] - Error: Test failures - Execution halted - ``` - -## In both - -* checking dependencies in R code ... NOTE - ``` - Namespace in Imports field not imported from: ‘parcats’ - All declared Imports should be used. - ``` - -# vlda - -
- -* Version: 1.1.5 -* GitHub: https://github.com/pnuwon/vlda -* Source code: https://github.com/cran/vlda -* Date/Publication: 2020-06-26 08:50:02 UTC -* Number of recursive dependencies: 47 - -Run `cloud_details(, "vlda")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘vlda-Ex.R’ failed - The error most likely occurred in: - - > ### Name: vlda_plot - > ### Title: VLDA Plot - > ### Aliases: vlda_plot - > ### Keywords: Plot Visualzation - > - > ### ** Examples - > - ... - 9. │ └─base::lapply(def_fonts, font_family_exists) - 10. │ └─ggiraph:::FUN(X[[i]], ...) - 11. │ └─ggiraph:::fortify_font_db() - 12. │ └─base::rbind(db_sys, db_reg) - 13. │ └─tibble:::rbind(deparse.level, ...) - 14. │ └─vctrs::vec_rbind(!!!list(...)) - 15. └─vctrs::stop_incompatible_type(...) - 16. └─vctrs:::stop_incompatible(...) - 17. └─vctrs:::stop_vctrs(...) - Execution halted - ``` - # workflowsets
@@ -2656,52 +2033,11 @@ Run `cloud_details(, "workflowsets")` for more info 13. └─tune:::collect_metrics.tune_results(.x[[i]], ...) 14. └─tune::estimate_tune_results(x) - [ FAIL 1 | WARN 30 | SKIP 6 | PASS 326 ] + [ FAIL 1 | WARN 27 | SKIP 6 | PASS 326 ] Error: Test failures Execution halted ``` -# wpa - -
- -* Version: 1.6.0 -* GitHub: https://github.com/microsoft/wpa -* Source code: https://github.com/cran/wpa -* Date/Publication: 2021-07-06 09:30:02 UTC -* Number of recursive dependencies: 116 - -Run `cloud_details(, "wpa")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘wpa-Ex.R’ failed - The error most likely occurred in: - - > ### Name: collaboration_rank - > ### Title: Collaboration Ranking - > ### Aliases: collaboration_rank collab_rank - > - > ### ** Examples - > - > # Return rank table - ... - 2. └─wpa::create_rank(...) - 3. └─base::rbind(results, table1) - 4. └─tibble:::rbind(deparse.level, ...) - 5. └─vctrs::vec_rbind(!!!list(...)) - 6. └─(function () ... - 7. └─vctrs::vec_default_ptype2(...) - 8. └─vctrs::stop_incompatible_type(...) - 9. └─vctrs:::stop_incompatible(...) - 10. └─vctrs:::stop_vctrs(...) - Execution halted - ``` - # xpose4
From 03245c4851f2517e4ba2fd2c0682e3365cdc5a64 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Sat, 7 Aug 2021 07:01:11 +0200 Subject: [PATCH 7/9] Install curl --- .github/workflows/continuous-benchmarks.yaml | 3 ++- 1 file changed, 2 insertions(+), 1 deletion(-) diff --git a/.github/workflows/continuous-benchmarks.yaml b/.github/workflows/continuous-benchmarks.yaml index eac0bc84e..468dd8587 100644 --- a/.github/workflows/continuous-benchmarks.yaml +++ b/.github/workflows/continuous-benchmarks.yaml @@ -23,7 +23,8 @@ jobs: - name: Install dependencies run: | - install.packages("remotes") + if (!requireNamespace("curl", quietly = TRUE)) install.packages("curl") + if (!requireNamespace("remotes", quietly = TRUE)) install.packages("remotes") remotes::install_deps(dependencies = TRUE, type = .Platform$pkgType) remotes::install_github("r-lib/bench") install.packages("here") From 11db9ab6ff2bb1b81b33ba0743b2246df28e86c3 Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 20 Oct 2021 19:44:48 +0200 Subject: [PATCH 8/9] Add rbind_trace and cbind_trace options --- R/options.R | 10 ++++++++++ R/tbl_df.R | 18 ++++++++++++++++++ man/tibble-package.Rd | 3 +-- man/tibble_options.Rd | 4 ++++ 4 files changed, 33 insertions(+), 2 deletions(-) diff --git a/R/options.R b/R/options.R index 6a8359266..6e59402e7 100644 --- a/R/options.R +++ b/R/options.R @@ -38,4 +38,14 @@ tibble_options <- list2( view_max = make_option_impl( getOption("tibble.view_max", default = 1000L) ), + #' - `rbind_trace`: Print diagnostic information for [rbind()] calls. + #' Default: `FALSE`. + rbind_trace = make_option_impl( + getOption("tibble.rbind_trace", default = FALSE) + ), + #' - `cbind_trace`: Print diagnostic information for [cbind()] calls. + #' Default: `FALSE`. + cbind_trace = make_option_impl( + getOption("tibble.cbind_trace", default = FALSE) + ), ) diff --git a/R/tbl_df.R b/R/tbl_df.R index 89a5806d2..e81311fb4 100644 --- a/R/tbl_df.R +++ b/R/tbl_df.R @@ -146,6 +146,15 @@ if (getRversion() >= "4.0.0") rbind.tbl_df <- function(...) { # deparse.level is part of the interface of the generic but not passed along # for data frame methods + if (tibble_options$rbind_trace()) { + writeLines("rbind()") + print(list(...)) + writeLines("rbind() results") + print(base:::rbind.data.frame(...)) + try(print(vec_rbind(!!!list(...)))) + writeLines("rbind() end") + } + e <- tryCatch( return(vec_rbind(!!!list(...))), error = identity @@ -162,6 +171,15 @@ if (getRversion() >= "4.0.0") rbind.tbl_df <- function(...) { #' @rawNamespace if (getRversion() >= "4.0.0") S3method(cbind, tbl_df) if (getRversion() >= "4.0.0") cbind.tbl_df <- function(...) { + if (tibble_options$cbind_trace()) { + writeLines("cbind()") + print(list(...)) + writeLines("cbind() results") + print(base:::cbind.data.frame(...)) + try(print(vec_cbind(!!!list(...)))) + writeLines("cbind() end") + } + e <- tryCatch( return(vec_cbind(!!!list(...))), error = identity diff --git a/man/tibble-package.Rd b/man/tibble-package.Rd index 3384dd71d..668a8a850 100644 --- a/man/tibble-package.Rd +++ b/man/tibble-package.Rd @@ -7,8 +7,7 @@ \description{ \if{html}{\figure{logo.png}{options: align='right' alt='logo' width='120'}} -Provides a 'tbl_df' class (the 'tibble') with stricter checking and better formatting than the traditional - data frame. +Provides a 'tbl_df' class (the 'tibble') with stricter checking and better formatting than the traditional data frame. } \details{ \ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#stable}{\figure{lifecycle-stable.svg}{options: alt='[Stable]'}}}{\strong{[Stable]}} diff --git a/man/tibble_options.Rd b/man/tibble_options.Rd index 0b927d6e0..de74808ef 100644 --- a/man/tibble_options.Rd +++ b/man/tibble_options.Rd @@ -25,6 +25,10 @@ An option value of \code{NULL} means that the default is used. \itemize{ \item \code{view_max}: Maximum number of rows shown by \code{\link[=view]{view()}} if the input is not a data frame, passed on to \code{\link[=head]{head()}}. Default: \code{1000}. +\item \code{rbind_trace}: Print diagnostic information for \code{\link[=rbind]{rbind()}} calls. +Default: \code{FALSE}. +\item \code{cbind_trace}: Print diagnostic information for \code{\link[=cbind]{cbind()}} calls. +Default: \code{FALSE}. } } From 991c7b288d296659fb1b7bd9080480e1d56069cd Mon Sep 17 00:00:00 2001 From: =?UTF-8?q?Kirill=20M=C3=BCller?= Date: Wed, 20 Oct 2021 19:55:58 +0200 Subject: [PATCH 9/9] Opt-out and preview helpers --- NAMESPACE | 2 ++ R/options.R | 10 +++++++ R/tbl_df.R | 70 ++++++++++++++++++++++++------------------- man/tbl_rbind.Rd | 23 ++++++++++++++ man/tibble_options.Rd | 4 +++ 5 files changed, 79 insertions(+), 30 deletions(-) create mode 100644 man/tbl_rbind.Rd diff --git a/NAMESPACE b/NAMESPACE index ae1264002..22595ca32 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -58,6 +58,8 @@ export(rowid_to_column) export(rownames_to_column) export(set_tidy_names) export(size_sum) +export(tbl_cbind) +export(tbl_rbind) export(tbl_sum) export(tibble) export(tibble_) diff --git a/R/options.R b/R/options.R index 6e59402e7..a7c69ad5e 100644 --- a/R/options.R +++ b/R/options.R @@ -48,4 +48,14 @@ tibble_options <- list2( cbind_trace = make_option_impl( getOption("tibble.cbind_trace", default = FALSE) ), + #' - `rbind_base`: Forware [rbind()] calls to base. + #' Default: `FALSE`. + rbind_base = make_option_impl( + getOption("tibble.rbind_base", default = FALSE) + ), + #' - `cbind_base`: Forware [cbind()] calls to base. + #' Default: `FALSE`. + cbind_base = make_option_impl( + getOption("tibble.cbind_base", default = FALSE) + ), ) diff --git a/R/tbl_df.R b/R/tbl_df.R index e81311fb4..1a54225a9 100644 --- a/R/tbl_df.R +++ b/R/tbl_df.R @@ -141,10 +141,23 @@ cnd_names_non_na <- function(name) { } } -#' @rawNamespace if (getRversion() >= "4.0.0") S3method(rbind, tbl_df) -if (getRversion() >= "4.0.0") rbind.tbl_df <- function(...) { - # deparse.level is part of the interface of the generic but not passed along - # for data frame methods +#' Binding rows and columns +#' +#' @description +#' `r lifecycle::badge("experimental")` +#' +#' In tibble 4.0.0, the [rbind()] and [cbind()] methods +#' will become stricter. +#' These functions are designed to help the transition to those stricter +#' versions. +#' Replace calls to `rbind()` and `cbind()` with `tbl_rbind()` and `tbl_cbind()`, +#' respectively, to preview how your code will behave after the upgrade. +#' Set the `tibble.rbind_trace` or `tibble.cbind_trace` options to `TRUE` +#' to enable diagnostic information. +#' @export +tbl_rbind <- function(...) { + # deparse.level is part of the interface of the rbind generic + # but not passed along for data frame methods if (tibble_options$rbind_trace()) { writeLines("rbind()") @@ -155,22 +168,12 @@ if (getRversion() >= "4.0.0") rbind.tbl_df <- function(...) { writeLines("rbind() end") } - e <- tryCatch( - return(vec_rbind(!!!list(...))), - error = identity - ) - lifecycle::deprecate_soft("3.2.0", "tibble::rbind()", - details = paste0( - "rbind() now forwards to vctrs::vec_rbind(), this call has failed. Falling back to legacy behavior. Error:\n", - conditionMessage(e) - ), - user_env = caller_env(2) - ) - NextMethod("rbind") + vec_rbind(!!!list(...)) } -#' @rawNamespace if (getRversion() >= "4.0.0") S3method(cbind, tbl_df) -if (getRversion() >= "4.0.0") cbind.tbl_df <- function(...) { +#' @rdname tbl_rbind +#' @export +tbl_cbind <- function(...) { if (tibble_options$cbind_trace()) { writeLines("cbind()") print(list(...)) @@ -180,18 +183,25 @@ if (getRversion() >= "4.0.0") cbind.tbl_df <- function(...) { writeLines("cbind() end") } - e <- tryCatch( - return(vec_cbind(!!!list(...))), - error = identity - ) - lifecycle::deprecate_soft("3.2.0", "tibble::cbind()", - details = paste0( - "cbind() now forwards to vctrs::vec_cbind(), this call has failed. Falling back to legacy behavior. Error:\n", - conditionMessage(e) - ), - user_env = caller_env(2) - ) - NextMethod("cbind") + vec_cbind(!!!list(...)) +} + +#' @rawNamespace if (getRversion() >= "4.0.0") S3method(rbind, tbl_df) +if (getRversion() >= "4.0.0") rbind.tbl_df <- function(...) { + if (tibble_options$rbind_base()) { + NextMethod("rbind") + } else { + tbl_rbind(...) + } +} + +#' @rawNamespace if (getRversion() >= "4.0.0") S3method(cbind, tbl_df) +if (getRversion() >= "4.0.0") cbind.tbl_df <- function(...) { + if (tibble_options$cbind_base()) { + NextMethod("cbind") + } else { + tbl_cbind(...) + } } # Errors ------------------------------------------------------------------ diff --git a/man/tbl_rbind.Rd b/man/tbl_rbind.Rd new file mode 100644 index 000000000..51f177675 --- /dev/null +++ b/man/tbl_rbind.Rd @@ -0,0 +1,23 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/tbl_df.R +\name{tbl_rbind} +\alias{tbl_rbind} +\alias{tbl_cbind} +\title{Binding rows and columns} +\usage{ +tbl_rbind(...) + +tbl_cbind(...) +} +\description{ +\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#experimental}{\figure{lifecycle-experimental.svg}{options: alt='[Experimental]'}}}{\strong{[Experimental]}} + +In tibble 4.0.0, the \code{\link[=rbind]{rbind()}} and \code{\link[=cbind]{cbind()}} methods +will become stricter. +These functions are designed to help the transition to those stricter +versions. +Replace calls to \code{rbind()} and \code{cbind()} with \code{tbl_rbind()} and \code{tbl_cbind()}, +respectively, to preview how your code will behave after the upgrade. +Set the \code{tibble.rbind_trace} or \code{tibble.cbind_trace} options to \code{TRUE} +to enable diagnostic information. +} diff --git a/man/tibble_options.Rd b/man/tibble_options.Rd index de74808ef..e53c63f43 100644 --- a/man/tibble_options.Rd +++ b/man/tibble_options.Rd @@ -29,6 +29,10 @@ if the input is not a data frame, passed on to \code{\link[=head]{head()}}. Defa Default: \code{FALSE}. \item \code{cbind_trace}: Print diagnostic information for \code{\link[=cbind]{cbind()}} calls. Default: \code{FALSE}. +\item \code{rbind_base}: Forware \code{\link[=rbind]{rbind()}} calls to base. +Default: \code{FALSE}. +\item \code{cbind_base}: Forware \code{\link[=cbind]{cbind()}} calls to base. +Default: \code{FALSE}. } }