diff --git a/NEWS.md b/NEWS.md index 7bcc32375c..e94f33adb2 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,5 +1,9 @@ # ggplot2 (development version) +* Deprecated functions and arguments prior to ggplot2 3.0.0 throw errors instead + of warnings. +* Functions and arguments that were soft-deprecated up to ggplot2 3.4.0 now + throw warnings. * (internal) layer data can be attenuated with parameter attributes (@teunbrand, #3175). * Date scales silently coerce to and datetime scales silently diff --git a/R/aes.R b/R/aes.R index 045d388d8a..60655a24bd 100644 --- a/R/aes.R +++ b/R/aes.R @@ -290,7 +290,7 @@ is_position_aes <- function(vars) { #' #' @export aes_ <- function(x, y, ...) { - deprecate_soft0( + deprecate_warn0( "3.0.0", "aes_()", details = "Please use tidy evaluation idioms with `aes()`" @@ -317,7 +317,7 @@ aes_ <- function(x, y, ...) { #' @rdname aes_ #' @export aes_string <- function(x, y, ...) { - deprecate_soft0( + deprecate_warn0( "3.0.0", "aes_string()", details = c( @@ -374,29 +374,7 @@ aes_all <- function(vars) { #' @keywords internal #' @export aes_auto <- function(data = NULL, ...) { - deprecate_warn0("2.0.0", "aes_auto()") - - # detect names of data - if (is.null(data)) { - cli::cli_abort("{.fn aes_auto} requires a {.cls data.frame} or names of data.frame.") - } else if (is.data.frame(data)) { - vars <- names(data) - } else { - vars <- data - } - - # automatically detected aes - vars <- intersect(ggplot_global$all_aesthetics, vars) - names(vars) <- vars - aes <- lapply(vars, function(x) parse(text = x)[[1]]) - - # explicitly defined aes - if (length(match.call()) > 2) { - args <- as.list(match.call()[-1]) - aes <- c(aes, args[names(args) != "data"]) - } - - structure(rename_aes(aes), class = "uneval") + lifecycle::deprecate_stop("2.0.0", "aes_auto()") } mapped_aesthetics <- function(x) { diff --git a/R/annotation-custom.R b/R/annotation-custom.R index 76cb26ac2c..8f060efab2 100644 --- a/R/annotation-custom.R +++ b/R/annotation-custom.R @@ -80,7 +80,7 @@ GeomCustomAnn <- ggproto("GeomCustomAnn", Geom, editGrob(grob, vp = vp, name = paste(grob$name, annotation_id())) }, - default_aes = aes_(xmin = -Inf, xmax = Inf, ymin = -Inf, ymax = Inf) + default_aes = aes(xmin = -Inf, xmax = Inf, ymin = -Inf, ymax = Inf) ) annotation_id <- local({ diff --git a/R/bin.R b/R/bin.R index f45fe90090..a213513b1b 100644 --- a/R/bin.R +++ b/R/bin.R @@ -240,18 +240,24 @@ bin_loc <- function(x, id) { ) } -fix_bin_params = function(params, fun, version) { +fix_bin_params <- function(params, fun, version) { + + if (package_version(version) < "3.0.0") { + deprecate <- lifecycle::deprecate_stop + } else { + deprecate <- deprecate_warn0 + } if (!is.null(params$origin)) { args <- paste0(fun, c("(origin)", "(boundary)")) - deprecate_warn0(version, args[1], args[2]) - params$boudnary <- params$origin + deprecate(version, args[1], args[2]) + params$boundary <- params$origin params$origin <- NULL } if (!is.null(params$right)) { args <- paste0(fun, c("(right)", "(closed)")) - deprecate_warn0(version, args[1], args[2]) + deprecate(version, args[1], args[2]) params$closed <- if (isTRUE(params$right)) "right" else "left" params$right <- NULL } diff --git a/R/facet-grid-.R b/R/facet-grid-.R index ff5cdf0d81..b41bbbac42 100644 --- a/R/facet-grid-.R +++ b/R/facet-grid-.R @@ -132,10 +132,9 @@ facet_grid <- function(rows = NULL, cols = NULL, scales = "fixed", switch = NULL, drop = TRUE, margins = FALSE, axes = "margins", axis.labels = "all", facets = deprecated()) { - # `facets` is deprecated and renamed to `rows` + # `facets` is deprecated if (lifecycle::is_present(facets)) { - deprecate_warn0("2.2.0", "facet_grid(facets)", "facet_grid(rows)") - rows <- facets + lifecycle::deprecate_stop("2.2.0", "facet_grid(facets)", "facet_grid(rows)") } # Should become a warning in a future release @@ -177,7 +176,7 @@ facet_grid <- function(rows = NULL, cols = NULL, scales = "fixed", facets_list <- grid_as_facets_list(rows, cols) # Check for deprecated labellers - labeller <- fix_labeller(labeller) + check_labeller(labeller) ggproto(NULL, FacetGrid, shrink = shrink, diff --git a/R/facet-wrap.R b/R/facet-wrap.R index 6bc72f8af4..bbe121d37b 100644 --- a/R/facet-wrap.R +++ b/R/facet-wrap.R @@ -174,14 +174,15 @@ facet_wrap <- function(facets, nrow = NULL, ncol = NULL, scales = "fixed", ) # Check for deprecated labellers - labeller <- fix_labeller(labeller) + check_labeller(labeller) # Flatten all facets dimensions into a single one facets <- compact_facets(facets) if (lifecycle::is_present(switch) && !is.null(switch)) { - deprecate_warn0("2.2.0", "facet_wrap(switch)", "facet_wrap(strip.position)") - strip.position <- if (switch == "x") "bottom" else "left" + lifecycle::deprecate_stop( + "2.2.0", "facet_wrap(switch)", "facet_wrap(strip.position)" + ) } strip.position <- arg_match0(strip.position, c("top", "bottom", "left", "right")) diff --git a/R/fortify-map.R b/R/fortify-map.R index e124e57e54..19b58a04bf 100644 --- a/R/fortify-map.R +++ b/R/fortify-map.R @@ -159,6 +159,6 @@ map_data <- function(map, region = ".", exact = FALSE, ...) { borders <- function(database = "world", regions = ".", fill = NA, colour = "grey50", xlim = NULL, ylim = NULL, ...) { df <- map_data(database, regions, xlim = xlim, ylim = ylim) - geom_polygon(aes_(~long, ~lat, group = ~group), data = df, + geom_polygon(aes(.data$long, .data$lat, group = .data$group), data = df, fill = fill, colour = colour, ..., inherit.aes = FALSE) } diff --git a/R/geom-.R b/R/geom-.R index c19b1f3458..8f3705c249 100644 --- a/R/geom-.R +++ b/R/geom-.R @@ -126,7 +126,7 @@ Geom <- ggproto("Geom", # Take care of subclasses setting the wrong default when inheriting from # a geom with rename_size = TRUE if (self$rename_size && is.null(default_aes$linewidth)) { - deprecate_soft0("3.4.0", I("Using the `size` aesthetic in this geom"), I("`linewidth` in the `default_aes` field and elsewhere")) + deprecate_warn0("3.4.0", I("Using the `size` aesthetic in this geom"), I("`linewidth` in the `default_aes` field and elsewhere")) default_aes$linewidth <- default_aes$size } @@ -281,7 +281,7 @@ check_aesthetics <- function(x, n) { fix_linewidth <- function(data, name) { if (is.null(data$linewidth) && !is.null(data$size)) { - deprecate_soft0("3.4.0", I(paste0("Using the `size` aesthetic with ", name)), I("the `linewidth` aesthetic")) + deprecate_warn0("3.4.0", I(paste0("Using the `size` aesthetic with ", name)), I("the `linewidth` aesthetic")) data$linewidth <- data$size } data diff --git a/R/geom-spoke.R b/R/geom-spoke.R index 032267b765..9ffbe71144 100644 --- a/R/geom-spoke.R +++ b/R/geom-spoke.R @@ -47,8 +47,7 @@ geom_spoke <- function(mapping = NULL, data = NULL, #' @rdname geom_spoke #' @usage NULL stat_spoke <- function(...) { - deprecate_warn0("2.0.0", "stat_spoke()", "geom_spoke()") - geom_spoke(...) + lifecycle::deprecate_stop("2.0.0", "stat_spoke()", "geom_spoke()") } #' @rdname ggplot2-ggproto diff --git a/R/labeller.R b/R/labeller.R index a9ba883a79..9afd572da0 100644 --- a/R/labeller.R +++ b/R/labeller.R @@ -411,7 +411,7 @@ labeller <- function(..., .rows = NULL, .cols = NULL, keep.as.numeric = deprecated(), .multi_line = TRUE, .default = label_value) { if (lifecycle::is_present(keep.as.numeric)) { - deprecate_warn0("2.0.0", "labeller(keep.as.numeric)") + lifecycle::deprecate_stop("2.0.0", "labeller(keep.as.numeric)") } dots <- list2(...) .default <- as_labeller(.default) @@ -577,22 +577,18 @@ assemble_strips <- function(grobs, theme, horizontal = TRUE, clip) { }) } -# Repair old school labeller -fix_labeller <- function(labeller) { +# Reject old school labeller +check_labeller <- function(labeller) { + labeller <- match.fun(labeller) is_deprecated <- all(c("variable", "value") %in% names(formals(labeller))) - if (is_deprecated) { - deprecate_warn0( - "2.0.0", what = "facet_(labeller)", - details = - "Modern labellers do not take `variable` and `value` arguments anymore." - ) - old_labeller <- labeller - labeller <- function(labels) { - Map(old_labeller, names(labels), labels) - } + if (!is_deprecated) { + return(invisible()) } - labeller + lifecycle::deprecate_stop( + "2.0.0", + what = I("Providing a labeller with `variable` and `value` arguments") + ) } diff --git a/R/layer.R b/R/layer.R index 2cd10c447f..0cef32b35b 100644 --- a/R/layer.R +++ b/R/layer.R @@ -104,9 +104,9 @@ layer <- function(geom = NULL, stat = NULL, # Handle show_guide/show.legend if (!is.null(params$show_guide)) { - deprecate_warn0("2.0.0", "layer(show_guide)", "layer(show.legend)", user_env = user_env) - show.legend <- params$show_guide - params$show_guide <- NULL + lifecycle::deprecate_stop( + "2.0.0", "layer(show_guide)", "layer(show.legend)" + ) } # we validate mapping before data because in geoms and stats @@ -156,7 +156,7 @@ layer <- function(geom = NULL, stat = NULL, if (geom$rename_size && "size" %in% extra_param && !"linewidth" %in% mapped_aesthetics(mapping)) { aes_params <- c(aes_params, params["size"]) extra_param <- setdiff(extra_param, "size") - deprecate_soft0("3.4.0", I("Using `size` aesthetic for lines"), I("`linewidth`"), user_env = user_env) + deprecate_warn0("3.4.0", I("Using `size` aesthetic for lines"), I("`linewidth`"), user_env = user_env) } if (check.param && length(extra_param) > 0) { cli::cli_warn("Ignoring unknown parameters: {.arg {extra_param}}", call = call_env) @@ -169,7 +169,7 @@ layer <- function(geom = NULL, stat = NULL, # Take care of size->linewidth aes renaming if (geom$rename_size && "size" %in% extra_aes && !"linewidth" %in% mapped_aesthetics(mapping)) { extra_aes <- setdiff(extra_aes, "size") - deprecate_soft0("3.4.0", I("Using `size` aesthetic for lines"), I("`linewidth`"), user_env = user_env) + deprecate_warn0("3.4.0", I("Using `size` aesthetic for lines"), I("`linewidth`"), user_env = user_env) } if (check.aes && length(extra_aes) > 0) { cli::cli_warn("Ignoring unknown aesthetics: {.field {extra_aes}}", call = call_env) @@ -273,7 +273,7 @@ Layer <- ggproto("Layer", NULL, !"linewidth" %in% names(self$computed_mapping) && "linewidth" %in% self$geom$aesthetics()) { self$computed_mapping$size <- plot$mapping$size - deprecate_soft0("3.4.0", I("Using `size` aesthetic for lines"), I("`linewidth`")) + deprecate_warn0("3.4.0", I("Using `size` aesthetic for lines"), I("`linewidth`")) } # defaults() strips class, but it needs to be preserved for now class(self$computed_mapping) <- "uneval" diff --git a/R/plot.R b/R/plot.R index f6a6aaeb49..c992530a0b 100644 --- a/R/plot.R +++ b/R/plot.R @@ -178,18 +178,17 @@ plot_clone <- function(plot) { #' @export #' @method print ggplot #' @examples -#' colours <- list(~class, ~drv, ~fl) +#' colours <- c("class", "drv", "fl") #' #' # Doesn't seem to do anything! #' for (colour in colours) { -#' ggplot(mpg, aes_(~ displ, ~ hwy, colour = colour)) + +#' ggplot(mpg, aes(displ, hwy, colour = .data[[colour]])) + #' geom_point() #' } #' -#' # Works when we explicitly print the plots #' for (colour in colours) { -#' print(ggplot(mpg, aes_(~ displ, ~ hwy, colour = colour)) + -#' geom_point()) +#' print(ggplot(mpg, aes(displ, hwy, colour = .data[[colour]])) + +#' geom_point()) #' } print.ggplot <- function(x, newpage = is.null(vp), vp = NULL, ...) { set_last_plot(x) diff --git a/R/quick-plot.R b/R/quick-plot.R index 38cfd895fc..64e2ab460d 100644 --- a/R/quick-plot.R +++ b/R/quick-plot.R @@ -62,7 +62,7 @@ qplot <- function(x, y, ..., data, facets = NULL, margins = FALSE, xlab = NULL, ylab = NULL, asp = NA, stat = deprecated(), position = deprecated()) { - deprecate_soft0("3.4.0", "qplot()") + deprecate_warn0("3.4.0", "qplot()") caller_env <- parent.frame() diff --git a/R/theme-elements.R b/R/theme-elements.R index c3b6ded319..4fcc4b1d25 100644 --- a/R/theme-elements.R +++ b/R/theme-elements.R @@ -94,7 +94,7 @@ element_rect <- function(fill = NULL, colour = NULL, linewidth = NULL, linetype = NULL, color = NULL, inherit.blank = FALSE, size = deprecated()) { if (lifecycle::is_present(size)) { - deprecate_soft0("3.4.0", "element_rect(size)", "element_rect(linewidth)") + deprecate_warn0("3.4.0", "element_rect(size)", "element_rect(linewidth)") linewidth <- size } @@ -115,7 +115,7 @@ element_line <- function(colour = NULL, linewidth = NULL, linetype = NULL, inherit.blank = FALSE, size = deprecated()) { if (lifecycle::is_present(size)) { - deprecate_soft0("3.4.0", "element_line(size)", "element_line(linewidth)") + deprecate_warn0("3.4.0", "element_line(size)", "element_line(linewidth)") linewidth <- size } @@ -307,7 +307,7 @@ element_grob.element_rect <- function(element, x = 0.5, y = 0.5, fill = NULL, colour = NULL, linewidth = NULL, linetype = NULL, ..., size = deprecated()) { if (lifecycle::is_present(size)) { - deprecate_soft0("3.4.0", "element_grob.element_rect(size)", "element_grob.element_rect(linewidth)") + deprecate_warn0("3.4.0", "element_grob.element_rect(size)", "element_grob.element_rect(linewidth)") linewidth <- size } @@ -357,7 +357,7 @@ element_grob.element_line <- function(element, x = 0:1, y = 0:1, default.units = "npc", id.lengths = NULL, ..., size = deprecated()) { if (lifecycle::is_present(size)) { - deprecate_soft0("3.4.0", "element_grob.element_line(size)", "element_grob.element_line(linewidth)") + deprecate_warn0("3.4.0", "element_grob.element_line(size)", "element_grob.element_line(linewidth)") linewidth <- size } diff --git a/R/theme.R b/R/theme.R index dfe986fc62..d2029cb22b 100644 --- a/R/theme.R +++ b/R/theme.R @@ -469,34 +469,6 @@ theme <- function(..., validate = TRUE) { elements <- find_args(..., complete = NULL, validate = NULL) - if (!is.null(elements$axis.ticks.margin)) { - deprecate_warn0( - "2.0.0", "theme(axis.ticks.margin)", - details = "Please set `margin` property of `axis.text` instead" - ) - elements$axis.ticks.margin <- NULL - } - if (!is.null(elements$panel.margin)) { - deprecate_warn0( - "2.2.0", "theme(panel.margin)", "theme(panel.spacing)" - ) - elements$panel.spacing <- elements$panel.margin - elements$panel.margin <- NULL - } - if (!is.null(elements$panel.margin.x)) { - deprecate_warn0( - "2.2.0", "theme(panel.margin.x)", "theme(panel.spacing.x)" - ) - elements$panel.spacing.x <- elements$panel.margin.x - elements$panel.margin.x <- NULL - } - if (!is.null(elements$panel.margin.y)) { - deprecate_warn0( - "2.2.0", "theme(panel.margin.y)", "theme(panel.spacing.y)" - ) - elements$panel.spacing.y <- elements$panel.margin.y - elements$panel.margin.y <- NULL - } if (is.unit(elements$legend.margin) && !is.margin(elements$legend.margin)) { cli::cli_warn(c( "{.var legend.margin} must be specified using {.fn margin}", diff --git a/man/print.ggplot.Rd b/man/print.ggplot.Rd index 07b2a68942..1d558a3e9e 100644 --- a/man/print.ggplot.Rd +++ b/man/print.ggplot.Rd @@ -28,18 +28,17 @@ to call \code{print()} explicitly if you want to draw a plot inside a function or for loop. } \examples{ -colours <- list(~class, ~drv, ~fl) +colours <- c("class", "drv", "fl") # Doesn't seem to do anything! for (colour in colours) { - ggplot(mpg, aes_(~ displ, ~ hwy, colour = colour)) + + ggplot(mpg, aes(displ, hwy, colour = .data[[colour]])) + geom_point() } -# Works when we explicitly print the plots for (colour in colours) { - print(ggplot(mpg, aes_(~ displ, ~ hwy, colour = colour)) + - geom_point()) + print(ggplot(mpg, aes(displ, hwy, colour = .data[[colour]])) + + geom_point()) } } \keyword{hplot} diff --git a/revdep/README.md b/revdep/README.md index 498c024ad2..ea1dc6ed4c 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -1,646 +1,555 @@ # Revdeps -## Failed to check (165) +## Failed to check (196) -|package |version |error |warning |note | -|:-----------------------|:-------|:------|:-------|:----| -|abctools |1.1.7 |1 | | | -|adjclust |? | | | | -|animalEKF |1.2 |1 | | | -|ANOM |0.5 |1 | | | -|atRisk |0.1.0 |1 | | | -|AutoScore |? | | | | -|baRulho |? | | | | -|bayesDP |1.3.6 |1 | | | -|BayesianFactorZoo |0.0.0.2 |1 | | | -|BayesSurvive |0.0.2 |1 | | | -|BCClong |1.0.3 |1 | | | -|BGGM |2.1.3 |1 | | | -|binsreg |1.1 |1 | | | -|bspcov |1.0.0 |1 | | | -|bsub |1.1.0 |1 | | | -|BuyseTest |3.0.4 |1 | | | -|CARBayesST |4.0 |1 | | | -|CGPfunctions |0.6.3 |1 | | | -|chemodiv |? | | | | -|cinaR |? | | | | -|cmprskcoxmsm |0.2.1 |1 | | | -|CNVScope |? | | | | -|COMMA |1.0.0 |1 | | | -|conos |? | | | | -|counterfactuals |? | | | | -|CRMetrics |? | | | | -|crosstalkr |? | | | | -|ctsem |3.10.1 |1 | | | -|DepthProc |2.1.5 |1 | | | -|DR.SC |3.4 |1 | | | -|easybgm |0.1.2 |1 | | | -|EcoEnsemble |1.1.0 |1 | | | -|ecolottery |1.0.0 |1 | | | -|EMAS |? | | | | -|EpiEstim |2.2-4 |1 | | | -|evolqg |0.3-4 |1 | | | -|EWSmethods |? | | | | -|fmx |? | | | | -|ForecastComb |1.3.1 |1 | | | -|GALLO |? | | | | -|gap |? | | | | -|gapfill |0.9.6-1 |1 | |1 | -|geneHapR |? | | | | -|GeneSelectR |? | | | | -|GeomComb |1.0 |1 | | | -|geomorph |? | | | | -|gJLS2 |0.2.0 |1 | | | -|hettx |0.1.3 |1 | | | -|Hmisc |? | | | | -|Hmsc |3.0-13 |1 | | | -|iClusterVB |0.1.2 |1 | | | +|package |version |error |warning |note | +|:----------------------|:-------|:------|:-------|:----| +|abctools |1.1.7 |1 | | | +|adjustedCurves |? | | | | +|animalEKF |1.2 |1 | | | +|ANOM |0.5 |1 | | | +|atRisk |0.2.0 |1 | | | +|autoReg |? | | | | +|AutoScore |? | | | | +|[bartMan](failures.md#bartman)|0.1.1 |__+1__ | | | +|bayesDP |1.3.7 |1 | | | +|BayesianFactorZoo |0.0.0.3 |1 | | | +|BayesSurvive |? | | | | +|BCClong |1.0.3 |1 | | | +|BGGM |2.1.5 |1 | | | +|binsreg |1.1 |1 | | | +|bspcov |1.0.1 |1 | | | +|BSTZINB |1.0.1 |1 | | | +|BuyseTest |? | | | | +|CAESAR.Suite |? | | | | +|CARBayesST |4.0 |1 | | | +|Certara.VPCResults |3.0.2 |1 | | | +|CGPfunctions |0.6.3 |1 | | | +|cia |? | | | | +|cinaR |? | | | | +|cmprskcoxmsm |0.2.1 |1 | | | +|COMMA |1.1.1 |1 | | | +|contsurvplot |? | | | | +|counterfactuals |? | | | | +|CRMetrics |0.3.2 |1 | | | +|ctsem |3.10.2 |1 | | | +|dartR.base |? | | | | +|dartR.captive |? | | | | +|dartR.popgen |? | | | | +|dartR.sexlinked |? | | | | +|dartR.sim |? | | | | +|dartR.spatial |? | | | | +|DepthProc |2.1.5 |1 | | | +|DFD |? | | | | +|dMrs |? | | | | +|DR.SC |3.4 |1 | | | +|dscoreMSM |? | | | | +|DynForest |? | | | | +|easybgm |0.2.1 |1 | | | +|EcoEnsemble |1.1.0 |1 | | | +|ecolottery |1.0.0 |1 | | | +|EpiEstim |2.2-4 |1 | | | +|evolqg |0.3-4 |1 | | | +|EWSmethods |? | | | | +|flexrsurv |? | | | | +|fmx |? | | | | +|ForecastComb |1.3.1 |1 | | | +|gap |? | | | | +|gapfill |0.9.6-1 |1 | |1 | +|genekitr |? | | | | +|GeneSelectR |? | | | | +|GeomComb |1.0 |1 | | | +|geomorph |? | | | | +|GeoTox |? | | | | +|[ggtern](failures.md#ggtern)|3.5.0 |__+1__ | |1 -1 | +|[ggThemeAssist](failures.md#ggthemeassist)|0.1.5 |__+1__ | |-1 | +|gJLS2 |0.2.0 |1 | | | +|grandR |? | | | | +|GseaVis |? | | | | +|hettx |0.1.3 |1 | | | +|Hmisc |? | | | | +|Hmsc |3.0-13 |1 | | | +|iClusterVB |0.1.4 |1 | | | +|immcp |? | | | | |[inventorize](failures.md#inventorize)|1.1.1 |__+1__ | | | -|iNZightPlots |2.15.3 |1 | | | -|iNZightRegression |1.3.4 |1 | | | -|IRexamples |0.0.4 |1 | | | -|jmBIG |0.1.2 |1 | | | -|joineRML |0.4.6 |1 | | | -|kibior |? | | | | -|kmc |0.4-2 |1 | | | -|L2E |2.0 |1 | | | -|llbayesireg |1.0.0 |1 | | | -|locuszoomr |? | | | | -|LorenzRegression |2.0.0 |1 | | | -|lsirm12pl |1.3.3 |1 | | | -|MantaID |? | | | | -|MARVEL |? | | | | -|mbsts |3.0 |1 | | | -|MitoHEAR |? | | | | -|miWQS |0.4.4 |1 | | | -|mlmts |1.1.2 |1 | | | -|mlr |? | | | | -|MOCHA |? | | | | -|MRZero |0.2.0 |1 | | | -|multilevelTools |0.1.1 |1 | | | -|multinma |0.7.1 |1 | | | -|NCA |4.0.1 |1 | | | -|netcmc |1.0.2 |1 | | | -|NetworkChange |0.8 |1 | | | -|nlmeVPC |2.6 |1 | | | -|NMADiagT |0.1.2 |1 | | | -|ohun |? | | | | -|optweight |0.2.5 |1 | | | -|OVtool |1.0.3 |1 | | | -|pagoda2 |? | | | | -|PAMpal |1.2.1 |1 | | | -|PAMscapes |0.6.0 |1 | | | -|paths |0.1.1 |1 | | | -|PathwaySpace |? | | | | -|pcvr |1.0.0 |1 | | | -|PlasmaMutationDetector |? | | | | -|PlasmaMutationDetector2 |? | | | | -|PLMIX |2.1.1 |1 | | | -|polyRAD |? | | | | -|popstudy |1.0.1 |1 | | | -|pould |1.0.1 |1 | | | -|PoweREST |0.1.0 |1 | | | -|powerly |1.8.6 |1 | | | -|pre |1.0.7 |1 | | | -|ProFAST |? | | | | -|psbcSpeedUp |2.0.7 |1 | | | -|pscore |0.4.0 |1 | | | -|qPCRtools |1.0.1 |1 | | | -|qris |1.1.1 |1 | | | -|qte |1.3.1 |1 | | | -|quantilogram |3.1.1 |1 | | | -|quid |0.0.1 |1 | | | -|RcmdrPlugin.RiskDemo |3.2 |1 | | | -|rddtools |1.6.0 |1 | | | -|RGraphSpace |? | | | | -|rms |? | | | | -|RNAseqQC |? | | | | -|robmed |1.0.2 |1 | | | -|robmedExtra |0.1.0 |1 | | | -|RPPanalyzer |1.4.9 |1 | | | -|RQdeltaCT |1.3.0 |1 | | | -|RRPP |? | | | | -|rstanarm |2.32.1 |1 | | | -|RTIGER |? | | | | -|rTwig |1.1.0 |1 | | | -|RVA |? | | | | -|scCustomize |? | | | | -|SCdeconR |1.0.0 |1 | | | -|scGate |1.6.2 |1 | | | -|SCIntRuler |0.99.6 |1 | | | -|scITD |? | | | | -|scMappR |1.0.11 |1 | | | -|scpi |2.2.5 |1 | | | -|scRNAstat |0.1.1 |1 | | | -|sectorgap |0.1.0 |1 | | | -|SeedMatchR |? | | | | -|SEERaBomb |2019.2 |1 | | | -|semicmprskcoxmsm |0.2.0 |1 | | | -|SensMap |0.7 |1 | | | -|sephora |? | | | | -|Seurat |? | | | | -|shinyTempSignal |0.0.8 |1 | | | -|sievePH |1.1 |1 | | | -|sigminer |? | | | | -|Signac |? | | | | -|SimplyAgree |0.2.0 |1 | | | -|SNPassoc |? | | | | -|snplinkage |? | | | | -|SoupX |1.6.2 |1 | | | -|sparsereg |1.2 |1 | | | -|SpatialDDLS |? | | | | -|spikeSlabGAM |1.1-19 |1 | | | -|statsr |0.3.0 |1 | | | -|streamDAG |? | | | | -|survidm |1.3.2 |1 | | | -|tempted |0.1.1 |1 | | | -|TestAnaAPP |1.1.1 |1 | | | +|invivoPKfit |2.0.0 |1 | | | +|iNZightPlots |2.15.3 |1 | | | +|iNZightRegression |1.3.4 |1 | | | +|IRexamples |0.0.4 |1 | | | +|jmBIG |? | | | | +|joineRML |0.4.6 |1 | | | +|jsmodule |? | | | | +|kmc |0.4-2 |1 | | | +|KMunicate |? | | | | +|L2E |2.0 |1 | | | +|Landmarking |? | | | | +|lavaSearch2 |? | | | | +|llbayesireg |1.0.0 |1 | | | +|lnmixsurv |? | | | | +|LorenzRegression |2.1.0 |1 | | | +|lsirm12pl |1.3.3 |1 | | | +|MantaID |? | | | | +|MARVEL |? | | | | +|MaxWiK |1.0.5 |1 | | | +|mbsts |3.0 |1 | | | +|MendelianRandomization |0.10.0 |1 | | | +|miWQS |0.4.4 |1 | |1 | +|mlmts |1.1.2 |1 | | | +|mlr |? | | | | +|MRZero |0.2.0 |1 | | | +|mstate |? | | | | +|multilevelTools |0.1.1 |1 | | | +|multinma |0.7.2 |1 | | | +|multipleOutcomes |? | | | | +|MuPETFlow |? | | | | +|NCA |4.0.2 |1 | | | +|netcmc |1.0.2 |1 | | | +|NetworkChange |0.8 |1 | | | +|nlmeVPC |2.6 |1 | | | +|NMADiagT |0.1.2 |1 | | | +|[NMF](failures.md#nmf) |0.28 |__+1__ | |-1 | +|obliqueRSF |? | | | | +|OlinkAnalyze |? | | | | +|optweight |0.2.5 |1 | | | +|OVtool |1.0.3 |1 | | | +|pammtools |? | | | | +|paths |0.1.1 |1 | | | +|PathwaySpace |? | | | | +|pcvr |1.1.1.0 |1 | | | +|PLMIX |2.1.1 |1 | | | +|popstudy |1.0.1 |1 | | | +|pould |? | | | | +|PoweREST |0.1.0 |1 | | | +|powerly |1.8.6 |1 | | | +|pre |1.0.7 |1 | | | +|ProFAST |? | | | | +|psbcSpeedUp |? | | | | +|pscore |0.4.0 |1 | | | +|pubh |? | | | | +|qPCRtools |1.0.1 |1 | | | +|qris |1.1.1 |1 | | | +|qte |1.3.1 |1 | | | +|quantilogram |3.1.1 |1 | | | +|quid |0.0.1 |1 | | | +|RcmdrPlugin.RiskDemo |3.2 |1 | | | +|rddtools |1.6.0 |1 | | | +|relsurv |? | | | | +|ReporterScore |? | | | | +|RGraphSpace |? | | | | +|riskRegression |? | | | | +|rmlnomogram |? | | | | +|rms |? | | | | +|robber |? | | | | +|robmed |1.2.0 |1 | | | +|robmedExtra |0.1.1 |1 | | | +|RPPanalyzer |1.4.9 |1 | | | +|RQdeltaCT |1.3.0 |1 | | | +|RRPP |? | | | | +|rstanarm |2.32.1 |1 | | | +|rTwig |1.3.0 |1 | | | +|RVA |? | | | | +|S4DM |0.0.1 |1 | | | +|scCustomize |3.0.1 |1 | |1 | +|SCdeconR |1.0.0 |1 | | | +|scGate |1.6.2 |1 | | | +|SCIntRuler |0.99.6 |1 | | | +|scMappR |1.0.11 |1 | | | +|scpi |2.2.6 |1 | | | +|SCpubr |? | | | | +|scRNAstat |0.1.1 |1 | | | +|sectorgap |0.1.0 |1 | | | +|SEERaBomb |2019.2 |1 | | | +|semicmprskcoxmsm |0.2.0 |1 | | | +|SensMap |0.7 |1 | | | +|Seurat |5.2.1 |1 | | | +|shinyTempSignal |0.0.8 |1 | | | +|sievePH |1.1 |1 | | | +|SiFINeT |1.13 |1 | | | +|[sigminer](failures.md#sigminer)|2.3.1 |__+1__ | |-1 | +|Signac |1.14.0 |1 | | | +|SimplyAgree |0.2.0 |1 | | | +|smer |? | | | | +|SNPassoc |? | | | | +|snplinkage |? | | | | +|SoupX |1.6.2 |1 | | | +|SpaCCI |1.0.3 |1 | | | +|sparsereg |1.2 |1 | | | +|[spectralAnalysis](failures.md#spectralanalysis)|4.3.3 |__+1__ | |-1 | +|spikeSlabGAM |1.1-20 |1 | | | +|stabiliser |1.0.6 |1 | | | +|statsr |0.3.0 |1 | | | +|streamDAG |? | | | | +|survex |? | | | | +|survHE |? | | | | +|survidm |1.3.2 |1 | | | +|tempted |0.1.1 |1 | | | +|TestAnaAPP |? | | | | |[tidydr](failures.md#tidydr)|0.0.5 |__+1__ | | | -|tidyEdSurvey |0.1.3 |1 | | | -|tidyseurat |0.8.0 |1 | | | -|tidyvpc |1.5.1 |1 | | | -|TriDimRegression |1.0.2 |1 | | | -|TSrepr |1.1.0 |1 | | | -|twang |2.6.1 |1 | | | -|updog |? | | | | -|valr |? | | | | -|vdg |1.2.3 |1 | | | -|visa |0.1.0 |1 | | | -|VisualizeSimon2Stage |? | | | | -|WRTDStidal |1.1.4 |1 | | | -|xxdi |? | | | | +|tidyEdSurvey |0.1.3 |1 | | | +|tidyseurat |0.8.0 |1 | | | +|tidyvpc |1.5.2 |1 | | | +|tinyarray |? | | | | +|treeclim |2.0.7.1 |1 | | | +|TriDimRegression |1.0.2 |1 | | | +|TSrepr |1.1.0 |1 | | | +|twang |2.6.1 |1 | | | +|vdg |1.2.3 |1 | | | +|VecDep |? | | | | +|visa |0.1.0 |1 | | | +|VisualizeSimon2Stage |? | | | | +|[wppExplorer](failures.md#wppexplorer)|2.3-4 |__+1__ | | | +|WRTDStidal |1.1.4 |1 | | | +|xxdi |? | | | | -## New problems (469) +## New problems (347) -|package |version |error |warning |note | -|:---------------------|:---------|:--------|:-------|:--------| -|[activAnalyzer](problems.md#activanalyzer)|2.1.1 |__+1__ | |1 __+1__ | -|[actxps](problems.md#actxps)|1.5.0 |__+1__ | |__+1__ | -|[adaptr](problems.md#adaptr)|1.4.0 |__+3__ | |__+1__ | -|[AeRobiology](problems.md#aerobiology)|2.0.1 |1 | |__+1__ | -|[agricolaeplotr](problems.md#agricolaeplotr)|0.5.0 |__+1__ | | | -|[alien](problems.md#alien)|1.0.2 |__+1__ | |__+1__ | -|[AlphaPart](problems.md#alphapart)|0.9.8 |1 __+1__ | | | -|[AnalysisLin](problems.md#analysislin)|0.1.2 |__+1__ | | | -|[animbook](problems.md#animbook)|1.0.0 |__+1__ | | | -|[ANN2](problems.md#ann2)|2.3.4 |__+1__ | |3 | -|[AnnoProbe](problems.md#annoprobe)|0.1.7 |__+1__ | | | -|[ANOFA](problems.md#anofa)|0.1.3 |__+3__ | |__+1__ | -|[ANOPA](problems.md#anopa)|0.1.3 |__+3__ | |__+1__ | -|[AntMAN](problems.md#antman)|1.1.0 |__+2__ | |3 | -|[APCI](problems.md#apci)|1.0.8 |__+1__ | | | -|[aplot](problems.md#aplot)|0.2.3 |__+1__ | | | -|[applicable](problems.md#applicable)|0.1.1 |__+1__ | | | -|[ASRgenomics](problems.md#asrgenomics)|1.1.4 |__+2__ | |1 | -|[autocogs](problems.md#autocogs)|0.1.4 |__+1__ | |1 | -|[autoplotly](problems.md#autoplotly)|0.1.4 |__+2__ | | | -|[autoReg](problems.md#autoreg)|0.3.3 |__+2__ | |__+1__ | -|[baggr](problems.md#baggr)|0.7.8 |__+3__ | |2 __+1__ | -|[banter](problems.md#banter)|0.9.6 |__+1__ | | | -|[bartMan](problems.md#bartman)|0.1.1 |__+1__ | | | -|[BasketballAnalyzeR](problems.md#basketballanalyzer)|0.5.0 |__+1__ | |2 | -|[bayefdr](problems.md#bayefdr)|0.2.1 |__+2__ | | | -|[bayesAB](problems.md#bayesab)|1.1.3 |__+1__ | | | -|[BayesGrowth](problems.md#bayesgrowth)|1.0.0 |__+1__ | |2 __+1__ | -|[BayesianReasoning](problems.md#bayesianreasoning)|0.4.2 |__+2__ | |__+1__ | -|[BayesMallows](problems.md#bayesmallows)|2.2.2 |__+1__ | |1 | -|[bayesplay](problems.md#bayesplay)|0.9.3 |__+2__ | |__+1__ | -|[bayesplot](problems.md#bayesplot)|1.11.1 |1 __+2__ | |1 | -|[bayestestR](problems.md#bayestestr)|0.14.0 |1 __+1__ | | | -|[BCEA](problems.md#bcea)|2.4.6 |__+3__ | |__+1__ | -|[BDgraph](problems.md#bdgraph)|2.73 |__+1__ | |1 __+1__ | -|[BEAMR](problems.md#beamr)|1.1.0 |__+1__ | | | -|[beastt](problems.md#beastt)|0.0.1 |__+2__ | |__+1__ | -|[BeeGUTS](problems.md#beeguts)|1.1.3 |__+2__ | |2 __+1__ | -|[besthr](problems.md#besthr)|0.3.2 |__+2__ | |__+1__ | -|[betaclust](problems.md#betaclust)|1.0.3 |__+1__ | |__+1__ | -|[biclustermd](problems.md#biclustermd)|0.2.3 |__+1__ | |1 | -|[biodosetools](problems.md#biodosetools)|3.6.1 |__+1__ | | | -|[BioPred](problems.md#biopred)|1.0.1 |__+1__ | |__+1__ | -|[BlandAltmanLeh](problems.md#blandaltmanleh)|0.3.1 |__+1__ | | | -|[bmggum](problems.md#bmggum)|0.1.0 |__+1__ | |3 | -|[boxly](problems.md#boxly)|0.1.1 |__+1__ | | | -|[braidReports](problems.md#braidreports)|0.5.4 |__+1__ | | | -|[BRcal](problems.md#brcal)|0.0.4 |__+2__ | |__+1__ | -|[breathtestcore](problems.md#breathtestcore)|0.8.7 |__+1__ | | | -|[brolgar](problems.md#brolgar)|1.0.1 |1 __+1__ | |1 | -|[calibrationband](problems.md#calibrationband)|0.2.1 |__+1__ | | | -|[cartograflow](problems.md#cartograflow)|1.0.5 |__+1__ | | | -|[cases](problems.md#cases)|0.1.1 |__+1__ | |__+1__ | -|[cats](problems.md#cats)|1.0.2 |__+1__ | |1 | -|[ceterisParibus](problems.md#ceterisparibus)|0.4.2 |__+1__ | |2 | -|[cfda](problems.md#cfda)|0.11.0 |__+3__ | |__+1__ | -|[cheem](problems.md#cheem)|0.4.0.0 |1 __+1__ | | | -|[chillR](problems.md#chillr)|0.75 |__+1__ | | | -|[chronicle](problems.md#chronicle)|0.3 |__+2__ | |1 __+1__ | -|[CINNA](problems.md#cinna)|1.2.2 |__+2__ | |1 __+1__ | -|[circhelp](problems.md#circhelp)|1.1 |__+2__ | |__+1__ | -|[clifro](problems.md#clifro)|3.2-5 |__+1__ | | | -|[clinDataReview](problems.md#clindatareview)|1.6.1 |__+2__ | |1 __+1__ | -|[clinUtils](problems.md#clinutils)|0.2.0 |__+1__ |-1 |1 __+1__ | -|[cloneRate](problems.md#clonerate)|0.2.3 |__+1__ | |2 __+1__ | -|[clustEff](problems.md#clusteff)|0.3.1 |__+1__ | | | -|[ClustImpute](problems.md#clustimpute)|0.2.4 |__+1__ | |1 | -|[cmstatr](problems.md#cmstatr)|0.9.3 |__+3__ | |__+1__ | -|[codaredistlm](problems.md#codaredistlm)|0.1.0 |__+1__ | | | -|[coefplot](problems.md#coefplot)|1.2.8 |__+1__ | | | -|[CohortPlat](problems.md#cohortplat)|1.0.5 |__+2__ | |__+1__ | -|[complmrob](problems.md#complmrob)|0.7.0 |__+1__ | | | -|[conjoint](problems.md#conjoint)|1.41 |__+1__ | | | -|[conquestr](problems.md#conquestr)|1.3.4 |__+1__ | |__+1__ | -|[CoreMicrobiomeR](problems.md#coremicrobiomer)|0.1.0 |__+1__ | | | -|[correlationfunnel](problems.md#correlationfunnel)|0.2.0 |__+1__ | |1 | -|[corrViz](problems.md#corrviz)|0.1.0 |__+2__ | |1 __+1__ | -|[corx](problems.md#corx)|1.0.7.2 |__+1__ | | | -|[cosinor2](problems.md#cosinor2)|0.2.1 |__+2__ | |__+1__ | -|[CoSMoS](problems.md#cosmos)|2.1.0 |__+1__ | |__+1__ | -|[countfitteR](problems.md#countfitter)|1.4 |__+1__ | | | -|[coursekata](problems.md#coursekata)|0.18.0 |__+2__ | | | -|[covidcast](problems.md#covidcast)|0.5.2 |__+2__ | |1 __+1__ | -|[Coxmos](problems.md#coxmos)|1.0.2 |1 __+1__ | |1 | -|[cpr](problems.md#cpr)|0.4.0 |1 __+1__ | |1 __+1__ | -|[cpsvote](problems.md#cpsvote)|0.1.0 |__+1__ | | | -|[crimeutils](problems.md#crimeutils)|0.5.1 |__+1__ | | | -|[crmPack](problems.md#crmpack)|1.0.6 |__+2__ | |1 | -|[crosshap](problems.md#crosshap)|1.4.0 |__+1__ | | | -|[ctrialsgov](problems.md#ctrialsgov)|0.2.5 |__+1__ | |1 | -|[cubble](problems.md#cubble)|1.0.0 |__+1__ | |1 __+1__ | -|[curtailment](problems.md#curtailment)|0.2.6 |__+1__ | | | -|[dabestr](problems.md#dabestr)|2023.9.12 |__+1__ | |__+1__ | -|[DAISIEprep](problems.md#daisieprep)|0.4.0 |__+1__ | | | -|[dbmss](problems.md#dbmss)|2.9-2 |__+2__ | |__+1__ | -|[deeptime](problems.md#deeptime)|2.0.0 |__+2__ | |1 __+1__ | -|[descriptio](problems.md#descriptio)|1.3 |__+1__ | |1 | -|[directlabels](problems.md#directlabels)|2024.1.21 |__+1__ | |__+1__ | -|[disto](problems.md#disto)|0.2.0 |__+2__ | |1 __+1__ | -|[distributional](problems.md#distributional)|0.4.0 |__+1__ | | | -|[dittoViz](problems.md#dittoviz)|1.0.1 |__+2__ | | | -|[dotwhisker](problems.md#dotwhisker)|0.8.2 |__+2__ | |__+1__ | -|[DRomics](problems.md#dromics)|2.5-2 |1 __+1__ | |1 __+1__ | -|[dtwclust](problems.md#dtwclust)|6.0.0 |__+1__ |1 |2 | -|[duke](problems.md#duke)|0.0.3 |__+1__ | | | -|[easysurv](problems.md#easysurv)|2.0.1 |__+2__ | |__+1__ | -|[EGAnet](problems.md#eganet)|2.0.7 |__+1__ | |1 | -|[EGM](problems.md#egm)|0.1.0 |__+1__ | | | -|[emmeans](problems.md#emmeans)|1.10.4 |1 __+1__ | |2 | -|[EMMIXmfa](problems.md#emmixmfa)|2.0.14 |__+1__ | | | -|[entropart](problems.md#entropart)|1.6-15 |__+2__ | |__+1__ | -|[EnvStats](problems.md#envstats)|3.0.0 |__+1__ | |1 | -|[epiCleanr](problems.md#epicleanr)|0.2.0 |__+1__ | |1 | -|[epiphy](problems.md#epiphy)|0.5.0 |__+1__ | | | -|[EQUALSTATS](problems.md#equalstats)|0.4.0 |__+1__ | |1 | -|[ergm.multi](problems.md#ergmmulti)|0.2.1 |__+2__ | |__+1__ | -|[esci](problems.md#esci)|1.0.3 |__+2__ | | | -|[evalITR](problems.md#evalitr)|1.0.0 |1 | |1 __+1__ | -|[eventstudyr](problems.md#eventstudyr)|1.1.3 |__+1__ | | | -|[EvoPhylo](problems.md#evophylo)|0.3.2 |1 __+1__ | |1 __+1__ | -|[expirest](problems.md#expirest)|0.1.6 |__+1__ | | | -|[explainer](problems.md#explainer)|1.0.1 |__+1__ | |1 | -|[exuber](problems.md#exuber)|1.0.2 |__+1__ | |__+1__ | -|[ezEDA](problems.md#ezeda)|0.1.1 |__+1__ | | | -|[ezplot](problems.md#ezplot)|0.7.13 |__+1__ | | | -|[fable.prophet](problems.md#fableprophet)|0.1.0 |__+1__ | |1 __+1__ | -|[fabletools](problems.md#fabletools)|0.4.2 |__+2__ | | | -|[factoextra](problems.md#factoextra)|1.0.7 |__+1__ | | | -|[fairmodels](problems.md#fairmodels)|1.2.1 |__+1__ | | | -|[fastR2](problems.md#fastr2)|1.2.4 |__+1__ | |1 | -|[faux](problems.md#faux)|1.2.1 |3 | |__+1__ | -|[fddm](problems.md#fddm)|1.0-2 |__+1__ | |1 | -|[feasts](problems.md#feasts)|0.3.2 |__+1__ | | | -|[fergm](problems.md#fergm)|1.1.4 |__+1__ | | | -|[ffp](problems.md#ffp)|0.2.2 |__+1__ | | | -|[fic](problems.md#fic)|1.0.0 |__+1__ | |2 | -|[fido](problems.md#fido)|1.1.1 |1 __+2__ | |2 | -|[fitdistrplus](problems.md#fitdistrplus)|1.2-1 |__+3__ | |__+1__ | -|[fitlandr](problems.md#fitlandr)|0.1.0 |__+1__ | | | -|[flexsurv](problems.md#flexsurv)|2.3.2 |__+1__ | |2 | -|[flipr](problems.md#flipr)|0.3.3 |1 | |1 __+1__ | -|[FLOPART](problems.md#flopart)|2024.6.19 |__+1__ | |__+1__ | -|[fmesher](problems.md#fmesher)|0.1.7 |__+2__ | |1 __+1__ | -|[fmf](problems.md#fmf)|1.1.1 |__+1__ | |1 | -|[forestly](problems.md#forestly)|0.1.1 |__+1__ | |__+1__ | -|[FossilSim](problems.md#fossilsim)|2.4.0 |__+1__ | | | -|[FPDclustering](problems.md#fpdclustering)|2.3.1 |__+1__ | | | -|[frailtyEM](problems.md#frailtyem)|1.0.1 |__+1__ | |2 | -|[funcharts](problems.md#funcharts)|1.5.0 |__+1__ | | | -|[FunnelPlotR](problems.md#funnelplotr)|0.5.0 |__+2__ | |__+1__ | -|[genekitr](problems.md#genekitr)|1.2.8 |__+1__ | | | -|[geoheatmap](problems.md#geoheatmap)|0.1.0 |__+1__ | |__+1__ | -|[geomtextpath](problems.md#geomtextpath)|0.1.4 |__+2__ | | | -|[geostan](problems.md#geostan)|0.6.2 |__+1__ | |3 | -|[GGally](problems.md#ggally)|2.2.1 |__+2__ | | | -|[gganimate](problems.md#gganimate)|1.0.9 |__+2__ | |__+1__ | -|[ggbrain](problems.md#ggbrain)|0.8.1 |__+1__ | |1 __+1__ | -|[ggbreak](problems.md#ggbreak)|0.1.2 |__+2__ | |__+1__ | -|[ggcharts](problems.md#ggcharts)|0.2.1 |__+3__ | |__+1__ | -|[ggdark](problems.md#ggdark)|0.2.1 |__+2__ | |1 | -|[ggdist](problems.md#ggdist)|3.3.2 |1 __+2__ | |1 __+1__ | -|[ggeasy](problems.md#ggeasy)|0.1.4 |__+3__ | |__+1__ | -|[ggedit](problems.md#ggedit)|0.4.1 |__+1__ | | | -|[ggESDA](problems.md#ggesda)|0.2.0 |__+2__ | |__+1__ | -|[ggExtra](problems.md#ggextra)|0.10.1 |__+1__ | |1 __+1__ | -|[ggfacto](problems.md#ggfacto)|0.3.1 |__+1__ | | | -|[ggfixest](problems.md#ggfixest)|0.1.0 |1 __+1__ | | | -|[ggfocus](problems.md#ggfocus)|1.0.0 |__+1__ | |1 __+1__ | -|[ggforce](problems.md#ggforce)|0.4.2 |__+1__ | |1 | -|[ggformula](problems.md#ggformula)|0.12.0 |__+3__ |__+1__ |1 __+1__ | -|[ggfortify](problems.md#ggfortify)|0.4.17 |__+3__ | |__+1__ | -|[gggenomes](problems.md#gggenomes)|1.0.1 |__+2__ | |__+1__ | -|[ggh4x](problems.md#ggh4x)|0.2.8 |1 __+1__ | |__+1__ | -|[gghighlight](problems.md#gghighlight)|0.4.1 |__+3__ | |__+1__ | -|[ggHoriPlot](problems.md#gghoriplot)|1.0.1 |__+1__ | |__+1__ | -|[ggiraph](problems.md#ggiraph)|0.8.10 |__+2__ | |1 | -|[ggiraphExtra](problems.md#ggiraphextra)|0.3.0 |__+2__ | |__+1__ | -|[ggmatplot](problems.md#ggmatplot)|0.1.2 |__+3__ | |__+1__ | -|[ggmice](problems.md#ggmice)|0.1.0 |__+1__ | |__+1__ | -|[ggmulti](problems.md#ggmulti)|1.0.7 |__+3__ | |__+1__ | -|[ggpackets](problems.md#ggpackets)|0.2.1 |__+3__ | |__+1__ | -|[ggparallel](problems.md#ggparallel)|0.4.0 |__+1__ | | | -|[ggparty](problems.md#ggparty)|1.0.0 |__+2__ | |2 __+1__ | -|[ggpicrust2](problems.md#ggpicrust2)|1.7.3 |__+1__ | |2 | -|[ggplotlyExtra](problems.md#ggplotlyextra)|0.0.1 |__+1__ | |1 | -|[ggPMX](problems.md#ggpmx)|1.2.11 |__+2__ | |2 __+1__ | -|[ggpol](problems.md#ggpol)|0.0.7 |__+1__ | |2 | -|[ggprism](problems.md#ggprism)|1.0.5 |__+3__ | |__+1__ | -|[ggpubr](problems.md#ggpubr)|0.6.0 |__+2__ | | | -|[ggrain](problems.md#ggrain)|0.0.4 |__+2__ | |__+1__ | -|[ggraph](problems.md#ggraph)|2.2.1 |1 __+1__ | |1 __+1__ | -|[ggredist](problems.md#ggredist)|0.0.2 |__+1__ | | | -|[ggRtsy](problems.md#ggrtsy)|0.1.0 |__+2__ | |1 __+1__ | -|[ggseqplot](problems.md#ggseqplot)|0.8.4 |__+3__ | |__+1__ | -|[ggside](problems.md#ggside)|0.3.1 |__+1__ |__+1__ | | -|[ggsmc](problems.md#ggsmc)|0.1.2.0 |__+1__ | |1 | -|[ggspatial](problems.md#ggspatial)|1.1.9 |__+2__ | | | -|[ggstatsplot](problems.md#ggstatsplot)|0.12.4 |1 __+1__ | | | -|[ggtern](problems.md#ggtern)|3.5.0 |__+1__ | |2 | -|[ggupset](problems.md#ggupset)|0.4.0 |__+1__ | | | -|[ggVennDiagram](problems.md#ggvenndiagram)|1.5.2 |__+1__ | |1 __+1__ | -|[GimmeMyPlot](problems.md#gimmemyplot)|0.1.0 |__+3__ | |__+1__ | -|[giniVarCI](problems.md#ginivarci)|0.0.1-3 |__+1__ | |1 | -|[gMCPLite](problems.md#gmcplite)|0.1.5 |__+1__ | |__+1__ | -|[gMOIP](problems.md#gmoip)|1.5.2 |__+2__ | |__+1__ | -|[GofCens](problems.md#gofcens)|1.1 |__+1__ | | | -|[greatR](problems.md#greatr)|2.0.0 |__+1__ | |__+1__ | -|[Greymodels](problems.md#greymodels)|2.0.1 |__+1__ | | | -|[gsDesign](problems.md#gsdesign)|3.6.4 |__+3__ | |__+1__ | -|[gtExtras](problems.md#gtextras)|0.5.0 |__+1__ | | | -|[HaploCatcher](problems.md#haplocatcher)|1.0.4 |__+1__ | |__+1__ | -|[healthyR](problems.md#healthyr)|0.2.2 |__+1__ | |1 __+1__ | -|[healthyR.ts](problems.md#healthyrts)|0.3.0 |__+2__ | |1 __+1__ | -|[heatmaply](problems.md#heatmaply)|1.5.0 |__+2__ | |1 __+1__ | -|[hermiter](problems.md#hermiter)|2.3.1 |__+1__ | |2 __+1__ | -|[heumilkr](problems.md#heumilkr)|0.2.0 |__+1__ | |__+1__ | -|[hilldiv](problems.md#hilldiv)|1.5.1 |__+1__ | | | -|[hmclearn](problems.md#hmclearn)|0.0.5 |__+1__ | | | -|[HTLR](problems.md#htlr)|0.4-4 |__+1__ | |2 __+1__ | -|[HVT](problems.md#hvt)|24.5.2 |__+1__ | | | -|[hypsoLoop](problems.md#hypsoloop)|0.2.0 | |__+1__ | | -|[ibdsim2](problems.md#ibdsim2)|2.1.1 |__+1__ | | | -|[ICtest](problems.md#ictest)|0.3-5 |__+1__ | |1 | -|[idiogramFISH](problems.md#idiogramfish)|2.0.13 |1 | |__+1__ | -|[IDMIR](problems.md#idmir)|0.1.0 |__+2__ | |__+1__ | -|[idopNetwork](problems.md#idopnetwork)|0.1.2 |__+1__ | |__+1__ | -|[ihclust](problems.md#ihclust)|0.1.0 |__+1__ | | | -|[immunarch](problems.md#immunarch)|0.9.1 |__+1__ | |1 | -|[incidental](problems.md#incidental)|0.1 |__+1__ | |__+1__ | -|[infer](problems.md#infer)|1.0.7 |__+3__ | |__+1__ | -|[injurytools](problems.md#injurytools)|1.0.3 |__+1__ | |__+1__ | -|[inlabru](problems.md#inlabru)|2.11.1 |1 __+1__ | |1 | -|[insurancerating](problems.md#insurancerating)|0.7.4 |__+1__ | | | -|[inTextSummaryTable](problems.md#intextsummarytable)|3.3.3 |__+2__ | |1 __+1__ | -|[IPV](problems.md#ipv)|1.0.0 |__+2__ | |1 __+1__ | -|[IRon](problems.md#iron)|0.1.4 |__+1__ | |1 | -|[irt](problems.md#irt)|0.2.9 |__+1__ | |1 | -|[isoorbi](problems.md#isoorbi)|1.3.1 |__+1__ | |1 __+1__ | -|[ivDiag](problems.md#ivdiag)|1.0.6 |__+1__ | | | -|[ivreg](problems.md#ivreg)|0.6-3 |__+1__ | |__+1__ | -|[jarbes](problems.md#jarbes)|2.2.1 |__+1__ | |__+1__ | -|[karel](problems.md#karel)|0.1.1 |__+2__ | |1 | -|[kDGLM](problems.md#kdglm)|1.2.0 |1 __+1__ | | | -|[KMEANS.KNN](problems.md#kmeansknn)|0.1.0 |__+2__ | | | -|[latentcor](problems.md#latentcor)|2.0.1 |__+1__ | | | -|[lcars](problems.md#lcars)|0.3.8 |__+2__ | | | -|[lemon](problems.md#lemon)|0.4.9 |__+3__ | |__+1__ | -|[lfproQC](problems.md#lfproqc)|0.2.0 |__+2__ | |1 __+1__ | -|[lgpr](problems.md#lgpr)|1.2.4 |__+1__ | |2 | -|[LightLogR](problems.md#lightlogr)|0.3.8 |__+1__ | | | -|[LMoFit](problems.md#lmofit)|0.1.7 |__+1__ | |1 __+1__ | -|[lnmixsurv](problems.md#lnmixsurv)|3.1.6 |__+2__ | |4 __+1__ | -|[LocalControl](problems.md#localcontrol)|1.1.4 |__+1__ | |2 | -|[LocalCop](problems.md#localcop)|0.0.1 |1 | |1 __+1__ | -|[LongDat](problems.md#longdat)|1.1.2 |__+1__ | |__+1__ | -|[longreadvqs](problems.md#longreadvqs)|0.1.3 |__+2__ | |__+1__ | -|[lpdensity](problems.md#lpdensity)|2.4 |__+1__ | | | -|[lspartition](problems.md#lspartition)|0.4 |__+1__ | |1 | -|[LSTbook](problems.md#lstbook)|0.5.0 |1 __+1__ |1 |1 __+1__ | -|[manydata](problems.md#manydata)|0.9.3 |__+1__ | |1 | -|[manymome](problems.md#manymome)|0.2.2 |__+1__ | | | -|[mapbayr](problems.md#mapbayr)|0.10.0 |__+1__ | | | -|[MBNMAdose](problems.md#mbnmadose)|0.4.3 |__+1__ | |1 __+1__ | -|[MBNMAtime](problems.md#mbnmatime)|0.2.4 |1 | |__+1__ | -|[mecoturn](problems.md#mecoturn)|0.3.0 |__+1__ | | | -|[MetaNet](problems.md#metanet)|0.1.2 |__+1__ | | | -|[metR](problems.md#metr)|0.15.0 |__+3__ | |1 __+1__ | -|[metrica](problems.md#metrica)|2.1.0 |__+1__ | |__+1__ | -|[miceRanger](problems.md#miceranger)|1.5.0 |__+1__ | | | -|[microbial](problems.md#microbial)|0.0.21 |__+2__ | |__+1__ | -|[MicrobiomeSurv](problems.md#microbiomesurv)|0.1.0 |__+1__ | | | -|[migraph](problems.md#migraph)|1.4.2 |__+1__ | | | -|[mikropml](problems.md#mikropml)|1.6.1 |__+1__ | | | -|[MiMIR](problems.md#mimir)|1.5 |__+1__ | | | -|[miRetrieve](problems.md#miretrieve)|1.3.4 |__+1__ | | | -|[MiscMetabar](problems.md#miscmetabar)|0.9.3 |__+2__ | | | -|[misspi](problems.md#misspi)|0.1.0 |__+1__ | | | -|[mixpoissonreg](problems.md#mixpoissonreg)|1.0.0 |__+3__ | |__+1__ | -|[mizer](problems.md#mizer)|2.5.1 |__+1__ | |1 | -|[mlr3spatiotempcv](problems.md#mlr3spatiotempcv)|2.3.1 |1 __+1__ | |1 | -|[mlr3viz](problems.md#mlr3viz)|0.9.0 |__+2__ | | | -|[modeltime.resample](problems.md#modeltimeresample)|0.2.3 |__+1__ | |1 | -|[moreparty](problems.md#moreparty)|0.4 |__+1__ | |__+1__ | -|[mosaicCalc](problems.md#mosaiccalc)|0.6.4 |__+2__ | |1 __+1__ | -|[mosaicData](problems.md#mosaicdata)|0.20.4 |__+1__ | |1 | -|[mosaicModel](problems.md#mosaicmodel)|0.3.0 |__+1__ | |1 __+1__ | -|[mppR](problems.md#mppr)|1.5.0 |__+1__ | |__+1__ | -|[MSCMT](problems.md#mscmt)|1.4.0 |__+1__ | |__+1__ | -|[mstate](problems.md#mstate)|0.3.3 |__+2__ | |1 | -|[mtb](problems.md#mtb)|0.1.8 |__+1__ | | | -|[mulgar](problems.md#mulgar)|1.0.2 |__+1__ | |1 | -|[MultivariateAnalysis](problems.md#multivariateanalysis)|0.5.0 |__+1__ | | | -|[mxfda](problems.md#mxfda)|0.2.1 | | |__+1__ | -|[neatmaps](problems.md#neatmaps)|2.1.0 |__+1__ | |1 | -|[neatStats](problems.md#neatstats)|1.13.3 |__+1__ | | | -|[netcom](problems.md#netcom)|2.1.7 |__+1__ | |1 __+1__ | -|[NetFACS](problems.md#netfacs)|0.5.0 |__+2__ | | | -|[neuroUp](problems.md#neuroup)|0.3.1 |__+3__ | |__+1__ | -|[NHSRplotthedots](problems.md#nhsrplotthedots)|0.1.0 |__+1__ | |1 | -|[nichetools](problems.md#nichetools)|0.3.1 |__+1__ | |__+1__ | -|[NIMAA](problems.md#nimaa)|0.2.1 |__+3__ | |2 __+1__ | -|[nonmem2R](problems.md#nonmem2r)|0.2.5 |__+2__ | |__+1__ | -|[nphRCT](problems.md#nphrct)|0.1.1 |__+1__ | |__+1__ | -|[nprobust](problems.md#nprobust)|0.4.0 |__+1__ | |1 | -|[nzelect](problems.md#nzelect)|0.4.0 |__+2__ | |2 __+1__ | -|[OBIC](problems.md#obic)|3.0.3 |__+1__ | |1 __+1__ | -|[oceanic](problems.md#oceanic)|0.1.7 |__+1__ | |2 | -|[oddsratio](problems.md#oddsratio)|2.0.1 |__+2__ | |1 __+1__ | -|[ofpetrial](problems.md#ofpetrial)|0.1.1 |__+1__ | | | -|[OmicNavigator](problems.md#omicnavigator)|1.13.13 |__+1__ | |1 | -|[omu](problems.md#omu)|1.1.2 |1 __+1__ | |__+1__ | -|[OncoBayes2](problems.md#oncobayes2)|0.8-9 |__+1__ | |2 | -|[oncomsm](problems.md#oncomsm)|0.1.4 |__+2__ | |2 __+1__ | -|[OneSampleLogRankTest](problems.md#onesamplelogranktest)|0.9.2 |__+2__ | |__+1__ | -|[onpoint](problems.md#onpoint)|1.0.5 |__+1__ | | | -|[ordbetareg](problems.md#ordbetareg)|0.7.2 |__+1__ | |2 | -|[packcircles](problems.md#packcircles)|0.3.6 |__+1__ | |__+1__ | -|[pafr](problems.md#pafr)|0.0.2 |__+1__ | |1 | -|[patchwork](problems.md#patchwork)|1.2.0 |__+1__ | | | -|[pathviewr](problems.md#pathviewr)|1.1.7 |__+1__ | | | -|[patientProfilesVis](problems.md#patientprofilesvis)|2.0.9 |1 __+1__ | |1 __+1__ | -|[PCADSC](problems.md#pcadsc)|0.8.0 |__+1__ | |3 | -|[pcutils](problems.md#pcutils)|0.2.6 |__+1__ | | | -|[pdxTrees](problems.md#pdxtrees)|0.4.0 |__+1__ | |1 __+1__ | -|[personalized](problems.md#personalized)|0.2.7 |__+1__ | | | -|[phyloseqGraphTest](problems.md#phyloseqgraphtest)|0.1.1 |__+2__ | |__+1__ | -|[PieGlyph](problems.md#pieglyph)|1.0.0 |1 __+2__ | |__+1__ | -|[Plasmidprofiler](problems.md#plasmidprofiler)|0.1.6 |__+1__ | | | -|[platetools](problems.md#platetools)|0.1.7 |__+1__ | | | -|[PLNmodels](problems.md#plnmodels)|1.2.0 |__+1__ | |1 __+1__ | -|[plotBart](problems.md#plotbart)|0.1.7 |__+1__ | | | -|[plotDK](problems.md#plotdk)|0.1.0 |__+1__ | |2 | -|[plotly](problems.md#plotly)|4.10.4 |__+2__ | |1 | -|[pmartR](problems.md#pmartr)|2.4.5 |__+1__ | |1 | -|[pmxTools](problems.md#pmxtools)|1.3 |__+1__ | |1 | -|[posterior](problems.md#posterior)|1.6.0 |1 | |__+1__ | -|[PPQplan](problems.md#ppqplan)|1.1.0 |1 | |2 __+1__ | -|[ppseq](problems.md#ppseq)|0.2.5 |__+1__ | |1 __+1__ | -|[PPtreeregViz](problems.md#pptreeregviz)|2.0.5 |__+2__ | |1 __+1__ | -|[precintcon](problems.md#precintcon)|2.3.0 |__+1__ | | | -|[precrec](problems.md#precrec)|0.14.4 |__+1__ | |1 __+1__ | -|[priorsense](problems.md#priorsense)|1.0.2 |__+2__ | |__+1__ | -|[probably](problems.md#probably)|1.0.3 |__+1__ | | | -|[processmapR](problems.md#processmapr)|0.5.5 |__+1__ | | | -|[projpred](problems.md#projpred)|2.8.0 |1 __+2__ | |1 | -|[psborrow](problems.md#psborrow)|0.2.1 |__+1__ | | | -|[pubh](problems.md#pubh)|1.3.7 |1 __+1__ | |__+1__ | -|[PUPMSI](problems.md#pupmsi)|0.1.0 |__+1__ | | | -|[qacBase](problems.md#qacbase)|1.0.3 |__+1__ | | | -|[qPCRhelper](problems.md#qpcrhelper)|0.1.0 |__+2__ | |__+1__ | -|[r2dii.plot](problems.md#r2diiplot)|0.4.0 |__+1__ | | | -|[r2spss](problems.md#r2spss)|0.3.2 |__+2__ | |1 | -|[radiant.basics](problems.md#radiantbasics)|1.6.6 |__+1__ | | | -|[radiant.data](problems.md#radiantdata)|1.6.6 |__+1__ | | | -|[radiant.model](problems.md#radiantmodel)|1.6.6 |__+1__ | | | -|[Radviz](problems.md#radviz)|0.9.3 |__+2__ | |__+1__ | -|[randomForestExplainer](problems.md#randomforestexplainer)|0.10.1 |__+3__ | |1 __+1__ | -|[rassta](problems.md#rassta)|1.0.6 |__+3__ | | | -|[rater](problems.md#rater)|1.3.1 |__+1__ | |2 | -|[RBesT](problems.md#rbest)|1.7-3 |__+2__ | |2 __+1__ | -|[rddensity](problems.md#rddensity)|2.5 |__+1__ | | | -|[RecordTest](problems.md#recordtest)|2.2.0 |__+2__ | |__+1__ | -|[reda](problems.md#reda)|0.5.4 |__+2__ | |2 __+1__ | -|[redist](problems.md#redist)|4.2.0 |__+1__ | |1 __+1__ | -|[registr](problems.md#registr)|2.1.0 |2 __+1__ | |2 __+1__ | -|[reliabilitydiag](problems.md#reliabilitydiag)|0.2.1 |__+1__ | | | -|[relliptical](problems.md#relliptical)|1.3.0 |__+1__ | |1 | -|[reportRmd](problems.md#reportrmd)|0.1.0 |__+2__ | |__+1__ | -|[reservr](problems.md#reservr)|0.0.3 |1 __+1__ | |2 __+1__ | -|[RestoreNet](problems.md#restorenet)|1.0.1 |__+1__ |1 | | -|[rfPermute](problems.md#rfpermute)|2.5.2 |__+1__ | | | -|[RKorAPClient](problems.md#rkorapclient)|0.8.1 |__+1__ | | | -|[roahd](problems.md#roahd)|1.4.3 |__+1__ | |1 | -|[robCompositions](problems.md#robcompositions)|2.4.1 |__+1__ | |3 | -|[romic](problems.md#romic)|1.1.3 |__+2__ | | | -|[roptions](problems.md#roptions)|1.0.3 |__+1__ | |1 | -|[rSAFE](problems.md#rsafe)|0.1.4 |__+2__ | |__+1__ | -|[santaR](problems.md#santar)|1.2.4 |1 __+1__ | | | -|[saros](problems.md#saros)|1.2.0 |__+2__ | | | -|[scatterpie](problems.md#scatterpie)|0.2.4 |__+2__ | |__+1__ | -|[scdtb](problems.md#scdtb)|0.1.0 |__+1__ | | | -|[scoringutils](problems.md#scoringutils)|1.2.2 |1 __+1__ | |__+1__ | -|[scUtils](problems.md#scutils)|0.1.0 |__+1__ | |1 | -|[SCVA](problems.md#scva)|1.3.1 |__+1__ | | | -|[sdmTMB](problems.md#sdmtmb)|0.6.0 |__+1__ | |1 | -|[SDMtune](problems.md#sdmtune)|1.3.1 |1 __+1__ | | | -|[sedproxy](problems.md#sedproxy)|0.7.5 |__+2__ | |__+1__ | -|[see](problems.md#see)|0.9.0 |__+1__ | | | -|[seedreg](problems.md#seedreg)|1.0.3 |__+1__ | | | -|[semfindr](problems.md#semfindr)|0.1.8 |__+3__ | |__+1__ | -|[sensiPhy](problems.md#sensiphy)|0.8.5 |1 __+1__ | | | -|[sglg](problems.md#sglg)|0.2.2 |__+1__ | | | -|[sgsR](problems.md#sgsr)|1.4.5 |__+1__ | | | -|[SHAPforxgboost](problems.md#shapforxgboost)|0.1.3 |__+1__ | | | -|[ShapleyOutlier](problems.md#shapleyoutlier)|0.1.1 |__+2__ | |__+1__ | -|[shinipsum](problems.md#shinipsum)|0.1.1 |__+1__ | | | -|[signatureSurvival](problems.md#signaturesurvival)|1.0.0 |__+1__ | |1 | -|[SimCorrMix](problems.md#simcorrmix)|0.1.1 |__+2__ | |3 __+1__ | -|[SimMultiCorrData](problems.md#simmulticorrdata)|0.2.2 |__+1__ | |1 __+1__ | -|[SimNPH](problems.md#simnph)|0.5.5 |__+1__ | | | -|[slendr](problems.md#slendr)|0.9.1 |1 __+1__ | |1 | -|[smallsets](problems.md#smallsets)|2.0.0 |__+2__ | |1 __+1__ | -|[spinifex](problems.md#spinifex)|0.3.7.0 |__+1__ | | | -|[sport](problems.md#sport)|0.2.1 |__+1__ | |1 | -|[spotoroo](problems.md#spotoroo)|0.1.4 |__+2__ | |1 __+1__ | -|[SqueakR](problems.md#squeakr)|1.3.0 |1 | |1 __+1__ | -|[stability](problems.md#stability)|0.5.0 |__+1__ | | | -|[statgenGWAS](problems.md#statgengwas)|1.0.9 |__+1__ | |2 | -|[statgenHTP](problems.md#statgenhtp)|1.0.6.1 |__+3__ | |2 __+1__ | -|[sugrrants](problems.md#sugrrants)|0.2.9 |__+2__ | |__+1__ | -|[superb](problems.md#superb)|0.95.15 |__+3__ | |__+1__ | -|[surveyexplorer](problems.md#surveyexplorer)|0.2.0 |__+1__ | | | -|[survivalAnalysis](problems.md#survivalanalysis)|0.3.0 |1 __+1__ | |__+1__ | -|[survminer](problems.md#survminer)|0.4.9 |__+3__ | |1 __+1__ | -|[survParamSim](problems.md#survparamsim)|0.1.6 |__+1__ | |__+1__ | -|[survstan](problems.md#survstan)|0.0.7.1 |__+1__ | |3 __+1__ | -|[SVMMaj](problems.md#svmmaj)|0.2.9.2 |__+2__ | |1 | -|[Sysrecon](problems.md#sysrecon)|0.1.3 |__+1__ | |1 | -|[tabledown](problems.md#tabledown)|1.0.0 |__+1__ | |1 | -|[tcgaViz](problems.md#tcgaviz)|1.0.2 |__+1__ | |__+1__ | -|[TCIU](problems.md#tciu)|1.2.6 |__+2__ | |1 __+1__ | -|[tcpl](problems.md#tcpl)|3.1.0 |1 __+1__ | | | -|[tern](problems.md#tern)|0.9.5 |__+1__ | |1 | -|[thematic](problems.md#thematic)|0.1.6 |__+2__ | | | -|[Thermistor](problems.md#thermistor)|1.1.0 |__+1__ | | | -|[tidybayes](problems.md#tidybayes)|3.0.6 |2 __+1__ | | | -|[tidycat](problems.md#tidycat)|0.1.2 |__+2__ | |1 __+1__ | -|[tidyCDISC](problems.md#tidycdisc)|0.2.1 |__+1__ | |1 | -|[tidysdm](problems.md#tidysdm)|0.9.5 |__+1__ | |1 __+1__ | -|[tidySEM](problems.md#tidysem)|0.2.7 |__+3__ | |__+1__ | -|[tidytreatment](problems.md#tidytreatment)|0.2.2 |__+1__ | |1 __+1__ | -|[timeplyr](problems.md#timeplyr)|0.8.2 |__+1__ | | | -|[timetk](problems.md#timetk)|2.9.0 |__+1__ | |1 | -|[tinyarray](problems.md#tinyarray)|2.4.2 |__+1__ | |1 | -|[tipmap](problems.md#tipmap)|0.5.2 |__+1__ | |__+1__ | -|[tornado](problems.md#tornado)|0.1.3 |__+3__ | |__+1__ | -|[TOSTER](problems.md#toster)|0.8.3 |__+3__ | |__+1__ | -|[TreatmentPatterns](problems.md#treatmentpatterns)|2.6.9 |__+1__ | | | -|[TreatmentSelection](problems.md#treatmentselection)|2.1.1 |__+1__ | | | -|[TreeDep](problems.md#treedep)|0.1.3 |__+1__ | | | -|[TreeDist](problems.md#treedist)|2.9.1 |__+1__ | |1 __+1__ | -|[treeheatr](problems.md#treeheatr)|0.2.1 |__+2__ | |__+1__ | -|[trelliscopejs](problems.md#trelliscopejs)|0.2.6 |__+1__ | | | -|[tricolore](problems.md#tricolore)|1.2.4 |__+2__ | |1 __+1__ | -|[triptych](problems.md#triptych)|0.1.3 |__+1__ | | | -|[tsnet](problems.md#tsnet)|0.1.0 |__+1__ | |2 | -|[UBayFS](problems.md#ubayfs)|1.0 |__+1__ | |__+1__ | -|[Umatrix](problems.md#umatrix)|4.0.1 |__+1__ | | | -|[umiAnalyzer](problems.md#umianalyzer)|1.0.0 |__+1__ | | | -|[UnalR](problems.md#unalr)|1.0.0 |__+2__ | |2 | -|[unmconf](problems.md#unmconf)|1.0.0 |__+1__ | |__+1__ | -|[usmap](problems.md#usmap)|0.7.1 |__+3__ | |1 __+1__ | -|[vannstats](problems.md#vannstats)|1.3.4.14 |__+1__ | | | -|[vDiveR](problems.md#vdiver)|1.2.1 |__+1__ | |1 | -|[venn](problems.md#venn)|1.12 |__+1__ | | | -|[vimpclust](problems.md#vimpclust)|0.1.0 |__+1__ | |1 __+1__ | -|[vip](problems.md#vip)|0.4.1 |__+2__ | |2 | -|[VirtualPop](problems.md#virtualpop)|2.0.2 |__+1__ | |__+1__ | -|[viscomp](problems.md#viscomp)|1.0.0 |__+1__ | | | -|[vivaldi](problems.md#vivaldi)|1.0.1 |__+3__ | |1 __+1__ | -|[voiceR](problems.md#voicer)|0.1.0 |__+2__ | |1 | -|[volcano3D](problems.md#volcano3d)|2.0.9 |__+2__ | |__+1__ | -|[voluModel](problems.md#volumodel)|0.2.2 |1 __+1__ | |__+1__ | -|[vsd](problems.md#vsd)|0.1.0 |__+1__ | |1 | -|[vvshiny](problems.md#vvshiny)|0.1.1 |__+1__ | | | -|[walker](problems.md#walker)|1.0.10 |__+1__ | |2 __+1__ | -|[WVPlots](problems.md#wvplots)|1.3.8 |__+3__ | |__+1__ | -|[xaringanthemer](problems.md#xaringanthemer)|0.4.2 |1 __+1__ | | | -|[yamlet](problems.md#yamlet)|1.0.3 |__+2__ | |1 | +|package |version |error |warning |note | +|:------------------|:----------|:---------|:--------|:--------| +|[ABHgenotypeR](problems.md#abhgenotyper)|1.0.1 |__+1__ | |1 __+1__ | +|[actxps](problems.md#actxps)|1.6.0 |__+1__ | |__+1__ | +|[adklakedata](problems.md#adklakedata)|0.6.1 |__+1__ | |1 | +|[adobeanalyticsr](problems.md#adobeanalyticsr)|0.5.0 | |__+1__ |__+1__ | +|[adw](problems.md#adw)|0.4.0 |__+2__ | |__+1__ | +|[AeRobiology](problems.md#aerobiology)|2.0.1 |__+1__ | |__+1__ | +|[agricolaeplotr](problems.md#agricolaeplotr)|0.6.0 |__+2__ | |__+1__ | +|[agridat](problems.md#agridat)|1.24 |__+2__ | |__+1__ | +|[AnalysisLin](problems.md#analysislin)|0.1.2 |__+1__ | | | +|[animbook](problems.md#animbook)|1.0.0 |__+1__ | | | +|[ANN2](problems.md#ann2)|2.3.4 |__+1__ | |3 | +|[APCI](problems.md#apci)|1.0.8 |__+1__ | | | +|[APCtools](problems.md#apctools)|1.0.4 |__+3__ | |__+1__ | +|[applicable](problems.md#applicable)|0.1.1 |__+1__ | | | +|[ARPALData](problems.md#arpaldata)|1.6.1 |__+1__ |__+1__ |__+1__ | +|[arulesViz](problems.md#arulesviz)|1.5.3 | |__+1__ | | +|[asremlPlus](problems.md#asremlplus)|4.4.43 |1 |__+1__ |1 __+1__ | +|[autocogs](problems.md#autocogs)|0.1.4 |__+1__ | |1 | +|[autoplotly](problems.md#autoplotly)|0.1.4 |__+2__ | | | +|[autoTS](problems.md#autots)|0.9.11 |1 | |2 __+1__ | +|[backShift](problems.md#backshift)|0.1.4.3 |__+2__ |__+1__ |1 __+2__ | +|[bayesAB](problems.md#bayesab)|1.1.3 |__+1__ | | | +|[bayesforecast](problems.md#bayesforecast)|1.0.1 |__+1__ |__+1__ |3 __+2__ | +|[BayesGrowth](problems.md#bayesgrowth)|1.0.0 |__+1__ | |2 __+1__ | +|[BayesianMCPMod](problems.md#bayesianmcpmod)|1.0.1 |__+3__ | |__+1__ | +|[BayesianReasoning](problems.md#bayesianreasoning)|0.4.2 |__+1__ | | | +|[BayesMallows](problems.md#bayesmallows)|2.2.3 |__+1__ | |1 | +|[bayesplot](problems.md#bayesplot)|1.11.1 |1 __+1__ | |1 | +|[BCEA](problems.md#bcea)|2.4.7 |__+3__ |__+1__ |__+2__ | +|[BEAMR](problems.md#beamr)|1.1.0 |__+1__ |__+1__ |__+1__ | +|[beastt](problems.md#beastt)|0.0.1 |__+2__ | |__+1__ | +|[biclust](problems.md#biclust)|2.0.3.1 |__+1__ |__+1__ |__+1__ | +|[biclustermd](problems.md#biclustermd)|0.2.3 |__+1__ | |1 | +|[biodosetools](problems.md#biodosetools)|3.6.1 |__+1__ | | | +|[boxly](problems.md#boxly)|0.1.1 |__+1__ | | | +|[brolgar](problems.md#brolgar)|1.0.1 |1 __+1__ | |1 | +|[cartograflow](problems.md#cartograflow)|1.0.5 |__+1__ | | | +|[cats](problems.md#cats)|1.0.2 |__+1__ | |1 | +|[CausalImpact](problems.md#causalimpact)|1.3.0 |__+3__ |__+1__ |__+2__ | +|[celltrackR](problems.md#celltrackr)|1.2.1 |1 | |1 __+1__ | +|[cellularautomata](problems.md#cellularautomata)|0.1.0 |__+1__ | | | +|[CensMFM](problems.md#censmfm)|3.1 | |__+1__ |__+1__ | +|[CFO](problems.md#cfo)|2.2.0 |__+1__ |__+1__ |__+1__ | +|[changepoint.geo](problems.md#changepointgeo)|1.0.2 |__+1__ | | | +|[cheem](problems.md#cheem)|0.4.0.0 |1 __+1__ | | | +|[chillR](problems.md#chillr)|0.76 |__+1__ |__+1__ |__+1__ | +|[chronicle](problems.md#chronicle)|0.3 |__+2__ | |1 __+1__ | +|[cjoint](problems.md#cjoint)|2.1.1 |__+2__ |__+1__ |1 __+1__ | +|[clickstream](problems.md#clickstream)|1.3.3 | |__+1__ | | +|[clinDataReview](problems.md#clindatareview)|1.6.1 |__+2__ | |1 __+1__ | +|[clinDR](problems.md#clindr)|2.4.1 |__+1__ | | | +|[clinUtils](problems.md#clinutils)|0.2.0 |__+1__ |-1 |1 __+1__ | +|[CLONETv2](problems.md#clonetv2)|2.2.1 | |__+1__ | | +|[ClusROC](problems.md#clusroc)|1.0.2 |__+2__ |__+1__ |__+1__ | +|[clustcurv](problems.md#clustcurv)|2.0.2 |__+1__ | |__+1__ | +|[clustMD](problems.md#clustmd)|1.2.1 | |__+1__ |1 __+1__ | +|[cnmap](problems.md#cnmap)|0.1.0 |__+2__ | |__+1__ | +|[codaredistlm](problems.md#codaredistlm)|0.1.0 |__+1__ | | | +|[codez](problems.md#codez)|1.0.0 | |__+1__ | | +|[CohortPlat](problems.md#cohortplat)|1.0.5 |__+2__ | |__+1__ | +|[colorrepel](problems.md#colorrepel)|0.4.1 |__+1__ | | | +|[CoreMicrobiomeR](problems.md#coremicrobiomer)|0.1.0 |__+1__ | | | +|[correlationfunnel](problems.md#correlationfunnel)|0.2.0 |__+1__ | |1 | +|[corrViz](problems.md#corrviz)|0.1.0 |__+2__ | |1 __+1__ | +|[CoSMoS](problems.md#cosmos)|2.1.0 |__+1__ | |__+1__ | +|[countfitteR](problems.md#countfitter)|1.4 |__+1__ | | | +|[covidcast](problems.md#covidcast)|0.5.2 |__+2__ | |1 __+1__ | +|[creditmodel](problems.md#creditmodel)|1.3.1 |__+2__ |__+1__ |1 __+2__ | +|[cricketr](problems.md#cricketr)|0.0.26 | |__+1__ |__+1__ | +|[crosshap](problems.md#crosshap)|1.4.0 |__+1__ | | | +|[CRTgeeDR](problems.md#crtgeedr)|2.0.1 | |__+1__ |__+1__ | +|[ctrialsgov](problems.md#ctrialsgov)|0.2.5 |__+1__ | |1 | +|[cubble](problems.md#cubble)|1.0.0 |__+1__ | |1 __+1__ | +|[DAISIE](problems.md#daisie)|4.4.1 |__+1__ | |2 | +|[DAISIEprep](problems.md#daisieprep)|1.0.0 |__+1__ | | | +|[daltoolbox](problems.md#daltoolbox)|1.1.727 |__+1__ |__+1__ |__+1__ | +|[dawaR](problems.md#dawar)|0.2.7 |-1 __+1__ | |1 | +|[DDPNA](problems.md#ddpna)|0.3.3 |__+1__ |__+1__ |__+1__ | +|[Deducer](problems.md#deducer)|0.7-9 |__+1__ |__+1__ |__+1__ | +|[deeptime](problems.md#deeptime)|2.1.0 |__+2__ | | | +|[desplot](problems.md#desplot)|1.10 |__+3__ |__+1__ |__+2__ | +|[diceR](problems.md#dicer)|2.2.0 |__+3__ | |__+1__ | +|[directlabels](problems.md#directlabels)|2024.1.21 |__+2__ | |__+1__ | +|[distributional](problems.md#distributional)|0.5.0 |__+1__ | | | +|[dittoViz](problems.md#dittoviz)|1.0.1 |__+2__ | | | +|[divent](problems.md#divent)|0.4-4 |__+2__ | |1 __+1__ | +|[doBy](problems.md#doby)|4.6.24 |2 |__+1__ |2 __+1__ | +|[DoseFinding](problems.md#dosefinding)|1.2-1 |__+3__ |__+1__ |__+2__ | +|[dotsViolin](problems.md#dotsviolin)|0.0.1 |__+1__ | |1 | +|[dr4pl](problems.md#dr4pl)|2.0.0 |__+2__ |__+1__ |1 __+2__ | +|[DRomics](problems.md#dromics)|2.6-2 |1 __+1__ |__+1__ |1 __+2__ | +|[drpop](problems.md#drpop)|0.0.3 | |__+1__ |__+1__ | +|[duke](problems.md#duke)|0.0.3 |__+1__ | | | +|[dymo](problems.md#dymo)|1.1.0 | |__+1__ | | +|[dynr](problems.md#dynr)|0.1.16-105 | |1 __+1__ |2 __+1__ | +|[easysurv](problems.md#easysurv)|2.0.1 |__+2__ | |__+1__ | +|[EGM](problems.md#egm)|0.1.0 |__+1__ | | | +|[entropart](problems.md#entropart)|1.6-15 |__+2__ | |__+1__ | +|[epiCleanr](problems.md#epicleanr)|0.2.0 |__+1__ | |1 | +|[epiphy](problems.md#epiphy)|0.5.0 |__+1__ | | | +|[EQUALSTATS](problems.md#equalstats)|0.5.0 |__+1__ | |1 | +|[esci](problems.md#esci)|1.0.6 |__+2__ | | | +|[evalITR](problems.md#evalitr)|1.0.0 |1 | |1 __+1__ | +|[eventstudyr](problems.md#eventstudyr)|1.1.3 |__+1__ | | | +|[expirest](problems.md#expirest)|0.1.6 |__+1__ | | | +|[explainer](problems.md#explainer)|1.0.2 |__+1__ | |1 | +|[ezEDA](problems.md#ezeda)|0.1.1 |__+1__ | | | +|[fable.prophet](problems.md#fableprophet)|0.1.0 |__+1__ | |1 __+1__ | +|[fabletools](problems.md#fabletools)|0.5.0 |__+2__ | | | +|[fairmodels](problems.md#fairmodels)|1.2.1 |__+1__ | | | +|[FCPS](problems.md#fcps)|1.3.4 |__+1__ |__+1__ |1 __+1__ | +|[fdANOVA](problems.md#fdanova)|0.1.2 |__+1__ | | | +|[fddm](problems.md#fddm)|1.0-2 |__+1__ | |1 | +|[feasts](problems.md#feasts)|0.4.1 |__+1__ | | | +|[ffp](problems.md#ffp)|0.2.2 |__+1__ | | | +|[fido](problems.md#fido)|1.1.1 |1 __+2__ | |2 | +|[FielDHub](problems.md#fieldhub)|1.4.2 |__+1__ | |1 __+1__ | +|[figuRes2](problems.md#figures2)|1.0.0 |__+2__ | | | +|[flexsurv](problems.md#flexsurv)|2.3.2 |__+2__ | |2 | +|[flipr](problems.md#flipr)|0.3.3 |1 | |1 __+1__ | +|[forestmodel](problems.md#forestmodel)|0.6.2 |__+1__ |__+1__ |1 __+1__ | +|[frailtyEM](problems.md#frailtyem)|1.0.1 |__+1__ | |2 | +|[gapmap](problems.md#gapmap)|1.0.0 |__+2__ | |__+1__ | +|[gapminder](problems.md#gapminder)|1.0.0 |1 __+1__ | | | +|[GEInter](problems.md#geinter)|0.3.2 |1 |__+1__ |1 __+1__ | +|[geoheatmap](problems.md#geoheatmap)|0.1.0 |__+1__ | |__+1__ | +|[geomtextpath](problems.md#geomtextpath)|0.1.5 |__+2__ | | | +|[ggalign](problems.md#ggalign)|0.0.5 | |__+1__ |1 | +|[GGally](problems.md#ggally)|2.2.1 |__+1__ | | | +|[gganimate](problems.md#gganimate)|1.0.9 |__+2__ | |__+1__ | +|[ggblanket](problems.md#ggblanket)|12.1.0 |__+1__ | | | +|[ggdark](problems.md#ggdark)|0.2.1 |__+2__ | |1 | +|[ggdemetra](problems.md#ggdemetra)|0.2.8 | |__+1__ | | +|[ggdist](problems.md#ggdist)|3.3.2 |1 __+2__ | |1 __+1__ | +|[ggedit](problems.md#ggedit)|0.4.1 |__+1__ | | | +|[ggESDA](problems.md#ggesda)|0.2.0 |__+1__ | | | +|[ggfixest](problems.md#ggfixest)|0.2.0 |__+1__ | | | +|[ggforce](problems.md#ggforce)|0.4.2 |__+1__ | |1 | +|[ggformula](problems.md#ggformula)|0.12.0 | |__+1__ |1 | +|[ggfortify](problems.md#ggfortify)|0.4.17 |__+1__ | | | +|[ggh4x](problems.md#ggh4x)|0.3.0 |__+3__ | |__+1__ | +|[gghighlight](problems.md#gghighlight)|0.4.1 |__+3__ | |__+1__ | +|[ggiraph](problems.md#ggiraph)|0.8.12 |__+2__ | |1 | +|[ggmap](problems.md#ggmap)|4.0.0 | |__+1__ |1 | +|[ggmcmc](problems.md#ggmcmc)|1.5.1.1 |1 __+1__ | |1 | +|[ggmice](problems.md#ggmice)|0.1.0 |__+1__ | |__+1__ | +|[ggmulti](problems.md#ggmulti)|1.0.7 |__+3__ | |__+1__ | +|[ggparallel](problems.md#ggparallel)|0.4.0 |__+1__ | | | +|[ggplotlyExtra](problems.md#ggplotlyextra)|0.0.1 |__+1__ | |1 | +|[ggpol](problems.md#ggpol)|0.0.7 |__+1__ | |2 | +|[ggpubr](problems.md#ggpubr)|0.6.0 |__+1__ | | | +|[ggraph](problems.md#ggraph)|2.2.1 |1 __+1__ | |1 __+1__ | +|[ggredist](problems.md#ggredist)|0.0.2 |__+1__ | | | +|[ggRtsy](problems.md#ggrtsy)|0.1.0 |__+2__ | |1 __+1__ | +|[ggseqplot](problems.md#ggseqplot)|0.8.5 |__+3__ | |__+1__ | +|[ggside](problems.md#ggside)|0.3.1 |__+3__ |__+2__ |__+2__ | +|[ggsmc](problems.md#ggsmc)|0.1.2.0 |__+1__ | |1 | +|[ggspatial](problems.md#ggspatial)|1.1.9 |__+2__ | | | +|[ggstatsplot](problems.md#ggstatsplot)|0.13.0 |1 __+1__ | | | +|[ggswissmaps](problems.md#ggswissmaps)|0.1.1 | |__+1__ |__+1__ | +|[ggupset](problems.md#ggupset)|0.4.0 |__+1__ | | | +|[ggVennDiagram](problems.md#ggvenndiagram)|1.5.2 |__+1__ | |1 __+1__ | +|[Greymodels](problems.md#greymodels)|2.0.1 |__+1__ | | | +|[GWASinspector](problems.md#gwasinspector)|1.7.1 |1 |__+1__ |__+1__ | +|[GWlasso](problems.md#gwlasso)|1.0.1 |__+1__ | | | +|[harbinger](problems.md#harbinger)|1.1.707 |__+1__ |__+1__ |__+1__ | +|[HCmodelSets](problems.md#hcmodelsets)|1.1.3 |__+1__ |__+1__ |__+1__ | +|[healthyR](problems.md#healthyr)|0.2.2 |__+1__ | |1 __+1__ | +|[healthyR.ts](problems.md#healthyrts)|0.3.1 |__+2__ | |1 __+1__ | +|[heatmaply](problems.md#heatmaply)|1.5.0 |__+2__ | |1 __+1__ | +|[heemod](problems.md#heemod)|1.0.2 |__+1__ | | | +|[hesim](problems.md#hesim)|0.5.5 |__+1__ | |1 | +|[hmsidwR](problems.md#hmsidwr)|1.1.2 |__+1__ | |2 __+1__ | +|[HVT](problems.md#hvt)|24.9.1 |__+1__ |__+1__ |__+1__ | +|[hypsoLoop](problems.md#hypsoloop)|0.2.0 | |__+1__ | | +|[iCARH](problems.md#icarh)|2.0.2.1 | |__+1__ |__+1__ | +|[ICSsmoothing](problems.md#icssmoothing)|1.2.8 |__+1__ | | | +|[incidental](problems.md#incidental)|0.1 |__+1__ | |__+1__ | +|[industRial](problems.md#industrial)|0.1.0 |__+1__ | |1 | +|[infer](problems.md#infer)|1.0.7 |__+2__ | |__+1__ | +|[inferCSN](problems.md#infercsn)|1.0.8 |__+1__ | |1 | +|[injurytools](problems.md#injurytools)|1.0.3 |__+1__ | |__+1__ | +|[inTextSummaryTable](problems.md#intextsummarytable)|3.3.3 |__+2__ | |1 __+1__ | +|[inti](problems.md#inti)|0.6.6 |2 |__+1__ |1 __+1__ | +|[IPV](problems.md#ipv)|1.0.0 |__+2__ | |1 __+1__ | +|[IRon](problems.md#iron)|0.1.4 |__+1__ | |1 | +|[isoorbi](problems.md#isoorbi)|1.3.1 |__+1__ | |1 __+1__ | +|[jenga](problems.md#jenga)|1.3.0 | |__+1__ | | +|[karel](problems.md#karel)|0.1.1 |__+2__ | |1 | +|[kDGLM](problems.md#kdglm)|1.2.0 |__+1__ | | | +|[Keyboard](problems.md#keyboard)|0.1.3 |__+1__ |__+1__ |__+1__ | +|[latentcor](problems.md#latentcor)|2.0.1 |__+1__ | | | +|[lcars](problems.md#lcars)|0.4.0 |__+2__ | | | +|[lemon](problems.md#lemon)|0.5.0 |__+3__ | |__+1__ | +|[lfproQC](problems.md#lfproqc)|1.4.0 |__+2__ | |__+1__ | +|[lilikoi](problems.md#lilikoi)|2.1.1 | |__+1__ |__+1__ | +|[LMoFit](problems.md#lmofit)|0.1.7 |__+1__ | |1 __+1__ | +|[LocalCop](problems.md#localcop)|0.0.2 |1 | |1 __+1__ | +|[lognorm](problems.md#lognorm)|0.1.10 |__+1__ | |__+1__ | +|[lsl](problems.md#lsl)|0.5.6 |__+1__ | |1 | +|[MAINT.Data](problems.md#maintdata)|2.7.1 |__+2__ |__+1__ |1 __+1__ | +|[MarketMatching](problems.md#marketmatching)|1.2.1 |__+1__ | | | +|[metacart](problems.md#metacart)|2.0-3 |__+1__ |__+1__ |__+1__ | +|[MetAlyzer](problems.md#metalyzer)|1.1.0 |__+1__ | | | +|[metR](problems.md#metr)|0.17.0 |__+3__ | |1 __+1__ | +|[mgcViz](problems.md#mgcviz)|0.1.11 |__+1__ | |__+1__ | +|[migraph](problems.md#migraph)|1.4.5 |__+1__ | | | +|[mikropml](problems.md#mikropml)|1.6.1 |__+1__ | | | +|[MiMIR](problems.md#mimir)|1.5 |__+1__ | | | +|[miRetrieve](problems.md#miretrieve)|1.3.4 |__+1__ | | | +|[MiscMetabar](problems.md#miscmetabar)|0.10.1 |__+2__ | | | +|[misspi](problems.md#misspi)|0.1.0 |__+1__ | | | +|[mizer](problems.md#mizer)|2.5.3 |__+1__ | |1 | +|[MLEce](problems.md#mlece)|2.1.0 |__+1__ |__+1__ |__+1__ | +|[modeltime.resample](problems.md#modeltimeresample)|0.2.3 |__+1__ | |1 | +|[moreparty](problems.md#moreparty)|0.4 |__+1__ | |__+1__ | +|[mppR](problems.md#mppr)|1.5.0 |__+1__ |__+1__ |__+2__ | +|[MPTmultiverse](problems.md#mptmultiverse)|0.4-2 |__+2__ | |1 __+1__ | +|[mtb](problems.md#mtb)|0.1.8 |__+1__ | | | +|[mudfold](problems.md#mudfold)|1.1.21 | |__+1__ |__+1__ | +|[mulgar](problems.md#mulgar)|1.0.2 |__+1__ | |1 | +|[MultiTraits](problems.md#multitraits)|0.2.0 |__+2__ | |__+1__ | +|[mvSLOUCH](problems.md#mvslouch)|2.7.6 | | |__+1__ | +|[naive](problems.md#naive)|1.2.3 | |__+1__ | | +|[ncappc](problems.md#ncappc)|0.3.0 | |__+1__ |2 __+1__ | +|[neatmaps](problems.md#neatmaps)|2.1.0 |__+1__ | |1 | +|[NetFACS](problems.md#netfacs)|0.5.0 |__+2__ | | | +|[NetworkInference](problems.md#networkinference)|1.2.4 |__+3__ |__+1__ |1 __+2__ | +|[NHSRplotthedots](problems.md#nhsrplotthedots)|0.1.0 |__+1__ | |1 | +|[nichetools](problems.md#nichetools)|0.3.2 |__+1__ | |__+1__ | +|[NIMAA](problems.md#nimaa)|0.2.1 |__+3__ | |2 __+1__ | +|[nzelect](problems.md#nzelect)|0.4.0 |__+1__ | |2 | +|[oddsratio](problems.md#oddsratio)|2.0.1 |__+2__ | |1 __+1__ | +|[OmicNavigator](problems.md#omicnavigator)|1.13.13 |__+1__ | |1 | +|[ordbetareg](problems.md#ordbetareg)|0.7.2 |__+1__ | |2 | +|[pafr](problems.md#pafr)|0.0.2 |__+1__ | |1 | +|[pathviewr](problems.md#pathviewr)|1.1.7 |__+1__ | | | +|[pdxTrees](problems.md#pdxtrees)|0.4.0 |__+1__ | |1 __+1__ | +|[PeakError](problems.md#peakerror)|2023.9.4 |__+1__ | | | +|[PeakSegJoint](problems.md#peaksegjoint)|2024.12.4 |__+1__ | | | +|[PeakSegOptimal](problems.md#peaksegoptimal)|2024.10.1 |__+1__ | | | +|[personalized](problems.md#personalized)|0.2.7 |__+1__ | | | +|[Plasmidprofiler](problems.md#plasmidprofiler)|0.1.6 |__+1__ | | | +|[plotDK](problems.md#plotdk)|0.1.0 |__+1__ | |2 | +|[PlotFTIR](problems.md#plotftir)|1.0.0 |__+3__ | | | +|[plotly](problems.md#plotly)|4.10.4 |__+2__ | |1 | +|[plotthis](problems.md#plotthis)|0.5.0 |__+1__ | | | +|[pmartR](problems.md#pmartr)|2.4.6 |__+1__ | |1 | +|[pmxTools](problems.md#pmxtools)|1.3 |__+1__ | |1 | +|[pogit](problems.md#pogit)|1.3.0 | |__+1__ |__+1__ | +|[posterior](problems.md#posterior)|1.6.0 |__+1__ | |__+1__ | +|[PPQplan](problems.md#ppqplan)|1.1.0 |1 | |2 __+1__ | +|[ppseq](problems.md#ppseq)|0.2.5 |__+1__ | |1 __+1__ | +|[precintcon](problems.md#precintcon)|2.3.0 |__+1__ | | | +|[pRecipe](problems.md#precipe)|3.0.2 | |__+1__ |__+1__ | +|[PReMiuM](problems.md#premium)|3.2.13 | |__+1__ |1 __+1__ | +|[prevR](problems.md#prevr)|5.0.0 |__+2__ |__+1__ |1 __+2__ | +|[priorsense](problems.md#priorsense)|1.0.4 |__+2__ | |__+1__ | +|[probably](problems.md#probably)|1.0.3 |__+1__ | | | +|[processmapR](problems.md#processmapr)|0.5.6 |__+1__ | | | +|[psborrow](problems.md#psborrow)|0.2.1 |__+1__ | | | +|[PupilPre](problems.md#pupilpre)|0.6.2 |__+1__ | |__+1__ | +|[qgcomp](problems.md#qgcomp)|2.16.4 |__+3__ |__+1__ |__+2__ | +|[qpNCA](problems.md#qpnca)|1.1.6 |__+2__ |__+1__ |__+2__ | +|[r2dii.plot](problems.md#r2diiplot)|0.4.0 |__+1__ | | | +|[r4ss](problems.md#r4ss)|1.44.0 | |__+1__ |__+1__ | +|[r6qualitytools](problems.md#r6qualitytools)|1.0.1 |__+1__ |__+1__ |__+1__ | +|[Radviz](problems.md#radviz)|0.9.3 |__+2__ | |__+1__ | +|[rassta](problems.md#rassta)|1.0.6 |__+2__ | | | +|[rater](problems.md#rater)|1.3.1 |__+1__ | |2 | +|[ratlas](problems.md#ratlas)|0.1.0 |1 __+1__ | |1 __+1__ | +|[RclusTool](problems.md#rclustool)|0.91.6 |__+1__ |__+1__ |__+1__ | +|[RDS](problems.md#rds)|0.9-10 |__+1__ |__+1__ |__+1__ | +|[regtomean](problems.md#regtomean)|1.2 | |__+1__ |1 | +|[RKorAPClient](problems.md#rkorapclient)|0.9.0 |__+1__ | | | +|[rmcfs](problems.md#rmcfs)|1.3.6 | |__+1__ |__+1__ | +|[rnmamod](problems.md#rnmamod)|0.4.0 |__+3__ |__+1__ |1 __+2__ | +|[roahd](problems.md#roahd)|1.4.3 |__+1__ | |1 | +|[robomit](problems.md#robomit)|1.0.6 |__+1__ |__+1__ |__+1__ | +|[romic](problems.md#romic)|1.1.3 |__+1__ | | | +|[roptions](problems.md#roptions)|1.0.3 |__+1__ | |1 | +|[rsimsum](problems.md#rsimsum)|0.13.0 | |__+1__ |1 | +|[rSRD](problems.md#rsrd)|0.1.8 |__+1__ |__+1__ |__+1__ | +|[saeRobust](problems.md#saerobust)|0.5.0 |__+2__ |__+1__ |__+1__ | +|[scUtils](problems.md#scutils)|0.1.0 |__+1__ | |1 | +|[SCVA](problems.md#scva)|1.3.1 |__+1__ | | | +|[SDMtune](problems.md#sdmtune)|1.3.2 |1 __+1__ | |__+1__ | +|[seAMLess](problems.md#seamless)|0.1.1 |__+1__ | |1 | +|[seedreg](problems.md#seedreg)|1.0.3 |__+1__ | | | +|[segen](problems.md#segen)|1.1.0 | |__+1__ | | +|[sensitivity](problems.md#sensitivity)|1.30.1 |__+1__ |__+1__ |1 __+1__ | +|[sglg](problems.md#sglg)|0.2.2 |__+1__ | | | +|[sgsR](problems.md#sgsr)|1.4.5 |__+1__ | | | +|[SHAPforxgboost](problems.md#shapforxgboost)|0.1.3 |__+1__ | | | +|[SHELF](problems.md#shelf)|1.11.0 | |__+1__ |__+1__ | +|[signatureSurvival](problems.md#signaturesurvival)|1.0.0 |__+1__ |__+1__ |1 __+1__ | +|[SimNPH](problems.md#simnph)|0.5.5 |__+1__ | | | +|[simRestore](problems.md#simrestore)|1.1.4 |__+1__ | | | +|[singleCellHaystack](problems.md#singlecellhaystack)|1.0.2 |__+1__ |__+1__ |__+1__ | +|[SNPannotator](problems.md#snpannotator)|0.2.6.0 | |__+1__ |__+1__ | +|[soc.ca](problems.md#socca)|0.8.0 |__+1__ |__+1__ |2 __+1__ | +|[SOMbrero](problems.md#sombrero)|1.4-2 |__+2__ |__+1__ |__+1__ | +|[spectralR](problems.md#spectralr)|0.1.3 |__+1__ | | | +|[spinifex](problems.md#spinifex)|0.3.8 |__+1__ | | | +|[spooky](problems.md#spooky)|1.4.0 | |__+1__ | | +|[sport](problems.md#sport)|0.2.1 |__+1__ | |1 | +|[SqueakR](problems.md#squeakr)|1.3.0 |1 | |1 __+1__ | +|[statgenGWAS](problems.md#statgengwas)|1.0.10 |__+1__ | |1 | +|[statgenHTP](problems.md#statgenhtp)|1.0.7 |__+1__ | |2 | +|[Superpower](problems.md#superpower)|0.2.0 |__+3__ |__+1__ |1 __+2__ | +|[surveyexplorer](problems.md#surveyexplorer)|0.2.0 |__+1__ | | | +|[tabledown](problems.md#tabledown)|1.0.0 |__+1__ | |1 | +|[TCIU](problems.md#tciu)|1.2.7 |__+2__ | |1 __+1__ | +|[tcplfit2](problems.md#tcplfit2)|0.1.7 |__+1__ | |1 __+1__ | +|[tetragon](problems.md#tetragon)|1.3.0 | |__+1__ | | +|[thematic](problems.md#thematic)|0.1.6 |__+2__ | | | +|[tidybayes](problems.md#tidybayes)|3.0.7 |2 __+1__ | | | +|[tidycat](problems.md#tidycat)|0.1.2 |__+2__ | |1 __+1__ | +|[tidyCDISC](problems.md#tidycdisc)|0.2.1 |__+1__ | |1 | +|[tidyplots](problems.md#tidyplots)|0.2.1 |__+3__ | |__+1__ | +|[tidytreatment](problems.md#tidytreatment)|0.3.1 |__+1__ | |1 __+1__ | +|[timetk](problems.md#timetk)|2.9.0 |__+1__ | |1 | +|[TOSTER](problems.md#toster)|0.8.3 |__+3__ | |__+1__ | +|[TransProR](problems.md#transpror)|0.0.6 |__+1__ | | | +|[TreatmentPatterns](problems.md#treatmentpatterns)|2.7.0 |__+1__ | | | +|[TreatmentSelection](problems.md#treatmentselection)|2.1.1 |__+1__ |__+1__ |__+1__ | +|[trelliscopejs](problems.md#trelliscopejs)|0.2.6 |__+1__ | | | +|[tricolore](problems.md#tricolore)|1.2.4 |__+2__ | |1 __+1__ | +|[tsnet](problems.md#tsnet)|0.1.0 |__+1__ | |2 | +|[UCSCXenaShiny](problems.md#ucscxenashiny)|2.1.0 |__+1__ | |1 __+1__ | +|[umiAnalyzer](problems.md#umianalyzer)|1.0.0 |__+1__ | | | +|[usmap](problems.md#usmap)|0.7.1 |__+3__ | |1 __+1__ | +|[vaccineff](problems.md#vaccineff)|1.0.0 |__+1__ | | | +|[valr](problems.md#valr)|0.8.3 |__+1__ | |1 | +|[visOmopResults](problems.md#visomopresults)|1.0.0 |__+1__ | | | +|[visvow](problems.md#visvow)|1.3.11 |__+1__ |__+1__ |__+1__ | +|[vivaldi](problems.md#vivaldi)|1.0.1 |__+3__ | |1 __+1__ | +|[voluModel](problems.md#volumodel)|0.2.2 |1 __+1__ | |__+1__ | +|[vvshiny](problems.md#vvshiny)|0.1.1 |__+1__ | | | +|[VWPre](problems.md#vwpre)|1.2.4 |__+1__ | |__+1__ | +|[WebAnalytics](problems.md#webanalytics)|0.9.12 |__+2__ |1 __+1__ |__+1__ | +|[WhatsR](problems.md#whatsr)|1.0.4 |__+2__ |__+1__ |__+1__ | +|[wilson](problems.md#wilson)|2.4.2 |__+1__ | | | +|[wordmap](problems.md#wordmap)|0.9.2 |__+1__ | |1 | +|[xpose](problems.md#xpose)|0.4.19 |__+3__ | |__+1__ | +|[xpose.xtras](problems.md#xposextras)|0.0.2 |__+2__ | |3 __+1__ | +|[yamlet](problems.md#yamlet)|1.2.0 |__+2__ | |1 | diff --git a/revdep/cran.md b/revdep/cran.md index 4a1365f7a5..d521f55150 100644 --- a/revdep/cran.md +++ b/revdep/cran.md @@ -1,16 +1,16 @@ ## revdepcheck results -We checked 5209 reverse dependencies (5199 from CRAN + 10 from Bioconductor), comparing R CMD check results across CRAN and dev versions of this package. +We checked 5478 reverse dependencies (5461 from CRAN + 17 from Bioconductor), comparing R CMD check results across CRAN and dev versions of this package. - * We saw 469 new problems - * We failed to check 155 packages + * We saw 347 new problems + * We failed to check 179 packages Issues with CRAN packages are summarised below. ### New problems (This reports the first line of each new failure) -* activAnalyzer +* ABHgenotypeR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE @@ -18,24 +18,31 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* adaptr +* adklakedata + checking examples ... ERROR + +* adobeanalyticsr + checking whether package ‘adobeanalyticsr’ can be installed ... WARNING + checking R code for possible problems ... NOTE + +* adw checking examples ... ERROR - checking tests ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE * AeRobiology + checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE * agricolaeplotr checking tests ... ERROR - -* alien checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* AlphaPart +* agridat checking examples ... ERROR + checking running R code from vignettes ... ERROR + checking re-building of vignette outputs ... NOTE * AnalysisLin checking examples ... ERROR @@ -46,37 +53,29 @@ Issues with CRAN packages are summarised below. * ANN2 checking tests ... ERROR -* AnnoProbe - checking examples ... ERROR - -* ANOFA - checking examples ... ERROR +* APCI checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* ANOPA +* APCtools checking examples ... ERROR checking tests ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* AntMAN - checking examples ... ERROR - checking tests ... ERROR - -* APCI +* applicable checking tests ... ERROR -* aplot +* ARPALData checking examples ... ERROR + checking whether package ‘ARPALData’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* applicable - checking tests ... ERROR +* arulesViz + checking whether package ‘arulesViz’ can be installed ... WARNING -* ASRgenomics - checking examples ... ERROR - checking tests ... ERROR +* asremlPlus + checking whether package ‘asremlPlus’ can be installed ... WARNING + checking R code for possible problems ... NOTE * autocogs checking tests ... ERROR @@ -85,88 +84,66 @@ Issues with CRAN packages are summarised below. checking examples ... ERROR checking tests ... ERROR -* autoReg - checking examples ... ERROR - checking running R code from vignettes ... ERROR +* autoTS checking re-building of vignette outputs ... NOTE -* baggr +* backShift checking examples ... ERROR - checking tests ... ERROR checking running R code from vignettes ... ERROR + checking whether package ‘backShift’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE -* banter - checking examples ... ERROR - -* bartMan - checking examples ... ERROR - -* BasketballAnalyzeR - checking examples ... ERROR - -* bayefdr - checking examples ... ERROR - checking tests ... ERROR - * bayesAB checking tests ... ERROR +* bayesforecast + checking running R code from vignettes ... ERROR + checking whether package ‘bayesforecast’ can be installed ... WARNING + checking R code for possible problems ... NOTE + checking re-building of vignette outputs ... NOTE + * BayesGrowth checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* BayesianReasoning +* BayesianMCPMod + checking examples ... ERROR checking tests ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* BayesMallows +* BayesianReasoning checking tests ... ERROR -* bayesplay - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* BayesMallows + checking tests ... ERROR * bayesplot - checking examples ... ERROR checking tests ... ERROR -* bayestestR - checking examples ... ERROR - * BCEA checking examples ... ERROR checking tests ... ERROR checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* BDgraph - checking running R code from vignettes ... ERROR + checking whether package ‘BCEA’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE * BEAMR checking examples ... ERROR + checking whether package ‘BEAMR’ can be installed ... WARNING + checking R code for possible problems ... NOTE * beastt checking examples ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* BeeGUTS - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* besthr +* biclust checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* betaclust - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking whether package ‘biclust’ can be installed ... WARNING + checking R code for possible problems ... NOTE * biclustermd checking tests ... ERROR @@ -174,125 +151,114 @@ Issues with CRAN packages are summarised below. * biodosetools checking tests ... ERROR -* BioPred - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* BlandAltmanLeh - checking running R code from vignettes ... ERROR - -* bmggum - checking examples ... ERROR - * boxly checking tests ... ERROR -* braidReports - checking examples ... ERROR - -* BRcal - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* breathtestcore - checking tests ... ERROR - * brolgar checking examples ... ERROR -* calibrationband +* cartograflow checking examples ... ERROR -* cartograflow +* cats checking examples ... ERROR -* cases +* CausalImpact + checking examples ... ERROR + checking tests ... ERROR checking running R code from vignettes ... ERROR + checking whether package ‘CausalImpact’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE -* cats - checking examples ... ERROR +* celltrackR + checking re-building of vignette outputs ... NOTE -* ceterisParibus - checking tests ... ERROR +* cellularautomata + checking running R code from vignettes ... ERROR + +* CensMFM + checking whether package ‘CensMFM’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* cfda +* CFO checking examples ... ERROR + checking whether package ‘CFO’ can be installed ... WARNING + checking R code for possible problems ... NOTE + +* changepoint.geo checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE * cheem checking tests ... ERROR * chillR checking examples ... ERROR + checking whether package ‘chillR’ can be installed ... WARNING + checking R code for possible problems ... NOTE * chronicle checking examples ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* CINNA - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* circhelp +* cjoint checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* clifro checking tests ... ERROR + checking whether package ‘cjoint’ can be installed ... WARNING + checking R code for possible problems ... NOTE + +* clickstream + checking whether package ‘clickstream’ can be installed ... WARNING * clinDataReview checking examples ... ERROR checking tests ... ERROR checking re-building of vignette outputs ... NOTE +* clinDR + checking examples ... ERROR + * clinUtils checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* cloneRate - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* CLONETv2 + checking whether package ‘CLONETv2’ can be installed ... WARNING -* clustEff +* ClusROC checking examples ... ERROR + checking tests ... ERROR + checking whether package ‘ClusROC’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* ClustImpute +* clustcurv checking running R code from vignettes ... ERROR + checking re-building of vignette outputs ... NOTE + +* clustMD + checking whether package ‘clustMD’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* cmstatr +* cnmap checking examples ... ERROR - checking tests ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE * codaredistlm checking examples ... ERROR -* coefplot - checking examples ... ERROR +* codez + checking whether package ‘codez’ can be installed ... WARNING * CohortPlat checking examples ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* complmrob +* colorrepel checking examples ... ERROR -* conjoint - checking examples ... ERROR - -* conquestr - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * CoreMicrobiomeR checking examples ... ERROR @@ -304,14 +270,6 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* corx - checking tests ... ERROR - -* cosinor2 - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * CoSMoS checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE @@ -319,35 +277,29 @@ Issues with CRAN packages are summarised below. * countfitteR checking tests ... ERROR -* coursekata - checking examples ... ERROR - checking tests ... ERROR - * covidcast checking tests ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* Coxmos +* creditmodel checking examples ... ERROR - -* cpr checking running R code from vignettes ... ERROR + checking whether package ‘creditmodel’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE -* cpsvote - checking running R code from vignettes ... ERROR - -* crimeutils - checking examples ... ERROR - -* crmPack - checking examples ... ERROR - checking running R code from vignettes ... ERROR +* cricketr + checking whether package ‘cricketr’ can be installed ... WARNING + checking R code for possible problems ... NOTE * crosshap checking examples ... ERROR +* CRTgeeDR + checking whether package ‘CRTgeeDR’ can be installed ... WARNING + checking R code for possible problems ... NOTE + * ctrialsgov checking tests ... ERROR @@ -355,34 +307,49 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* curtailment +* DAISIE checking examples ... ERROR -* dabestr - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * DAISIEprep checking tests ... ERROR -* dbmss +* daltoolbox checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking whether package ‘daltoolbox’ can be installed ... WARNING + checking R code for possible problems ... NOTE + +* dawaR + checking examples ... ERROR + +* DDPNA + checking examples ... ERROR + checking whether package ‘DDPNA’ can be installed ... WARNING + checking R code for possible problems ... NOTE + +* Deducer + checking examples ... ERROR + checking whether package ‘Deducer’ can be installed ... WARNING + checking R code for possible problems ... NOTE * deeptime + checking examples ... ERROR + checking tests ... ERROR + +* desplot + checking examples ... ERROR checking tests ... ERROR checking running R code from vignettes ... ERROR + checking whether package ‘desplot’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE -* descriptio +* diceR checking examples ... ERROR - -* directlabels + checking tests ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* disto +* directlabels checking examples ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE @@ -394,46 +361,66 @@ Issues with CRAN packages are summarised below. checking examples ... ERROR checking tests ... ERROR -* dotwhisker +* divent + checking examples ... ERROR + checking running R code from vignettes ... ERROR + checking re-building of vignette outputs ... NOTE + +* doBy + checking whether package ‘doBy’ can be installed ... WARNING + checking R code for possible problems ... NOTE + +* DoseFinding + checking examples ... ERROR + checking tests ... ERROR + checking running R code from vignettes ... ERROR + checking whether package ‘DoseFinding’ can be installed ... WARNING + checking R code for possible problems ... NOTE + checking re-building of vignette outputs ... NOTE + +* dotsViolin + checking examples ... ERROR + +* dr4pl checking examples ... ERROR checking running R code from vignettes ... ERROR + checking whether package ‘dr4pl’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE * DRomics checking examples ... ERROR + checking whether package ‘DRomics’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE -* dtwclust - checking tests ... ERROR +* drpop + checking whether package ‘drpop’ can be installed ... WARNING + checking R code for possible problems ... NOTE * duke checking tests ... ERROR +* dymo + checking whether package ‘dymo’ can be installed ... WARNING + +* dynr + checking whether package ‘dynr’ can be installed ... WARNING + checking R code for possible problems ... NOTE + * easysurv checking examples ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* EGAnet - checking examples ... ERROR - * EGM checking tests ... ERROR -* emmeans - checking examples ... ERROR - -* EMMIXmfa - checking examples ... ERROR - * entropart checking examples ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* EnvStats - checking examples ... ERROR - * epiCleanr checking examples ... ERROR @@ -443,11 +430,6 @@ Issues with CRAN packages are summarised below. * EQUALSTATS checking examples ... ERROR -* ergm.multi - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * esci checking examples ... ERROR checking tests ... ERROR @@ -458,26 +440,15 @@ Issues with CRAN packages are summarised below. * eventstudyr checking tests ... ERROR -* EvoPhylo - checking examples ... ERROR - checking re-building of vignette outputs ... NOTE - * expirest checking tests ... ERROR * explainer checking examples ... ERROR -* exuber - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * ezEDA checking tests ... ERROR -* ezplot - checking examples ... ERROR - * fable.prophet checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE @@ -486,17 +457,16 @@ Issues with CRAN packages are summarised below. checking examples ... ERROR checking tests ... ERROR -* factoextra - checking examples ... ERROR - * fairmodels checking tests ... ERROR -* fastR2 +* FCPS checking examples ... ERROR + checking whether package ‘FCPS’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* faux - checking re-building of vignette outputs ... NOTE +* fdANOVA + checking examples ... ERROR * fddm checking running R code from vignettes ... ERROR @@ -504,70 +474,48 @@ Issues with CRAN packages are summarised below. * feasts checking tests ... ERROR -* fergm - checking examples ... ERROR - * ffp checking examples ... ERROR -* fic - checking running R code from vignettes ... ERROR - * fido checking examples ... ERROR checking tests ... ERROR -* fitdistrplus - checking examples ... ERROR - checking tests ... ERROR +* FielDHub checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* fitlandr +* figuRes2 checking examples ... ERROR + checking running R code from vignettes ... ERROR * flexsurv + checking tests ... ERROR checking running R code from vignettes ... ERROR * flipr checking re-building of vignette outputs ... NOTE -* FLOPART - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* fmesher - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* fmf - checking examples ... ERROR - -* forestly - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* FossilSim - checking examples ... ERROR - -* FPDclustering +* forestmodel checking examples ... ERROR + checking whether package ‘forestmodel’ can be installed ... WARNING + checking R code for possible problems ... NOTE * frailtyEM checking examples ... ERROR -* funcharts - checking examples ... ERROR - -* FunnelPlotR +* gapmap checking examples ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* genekitr +* gapminder checking examples ... ERROR +* GEInter + checking whether package ‘GEInter’ can be installed ... WARNING + checking R code for possible problems ... NOTE + * geoheatmap checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE @@ -576,11 +524,10 @@ Issues with CRAN packages are summarised below. checking examples ... ERROR checking tests ... ERROR -* geostan - checking examples ... ERROR +* ggalign + checking for code/documentation mismatches ... WARNING * GGally - checking examples ... ERROR checking tests ... ERROR * gganimate @@ -588,34 +535,19 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* ggbrain - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* ggbreak - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* ggcharts +* ggblanket checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE * ggdark checking examples ... ERROR checking tests ... ERROR -* ggdist - checking examples ... ERROR - checking tests ... ERROR - checking re-building of vignette outputs ... NOTE +* ggdemetra + checking whether package ‘ggdemetra’ can be installed ... WARNING -* ggeasy +* ggdist checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE * ggedit @@ -623,46 +555,23 @@ Issues with CRAN packages are summarised below. * ggESDA checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* ggExtra - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* ggfacto - checking examples ... ERROR * ggfixest checking tests ... ERROR -* ggfocus - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * ggforce checking examples ... ERROR * ggformula - checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR checking for code/documentation mismatches ... WARNING - checking re-building of vignette outputs ... NOTE * ggfortify - checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* gggenomes - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE * ggh4x + checking examples ... ERROR checking tests ... ERROR + checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE * gghighlight @@ -671,24 +580,15 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* ggHoriPlot - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * ggiraph checking examples ... ERROR checking tests ... ERROR -* ggiraphExtra - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* ggmap + checking whether package ‘ggmap’ can be installed ... WARNING -* ggmatplot +* ggmcmc checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE * ggmice checking running R code from vignettes ... ERROR @@ -700,49 +600,18 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* ggpackets - checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * ggparallel checking tests ... ERROR -* ggparty - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* ggpicrust2 - checking examples ... ERROR - * ggplotlyExtra checking examples ... ERROR -* ggPMX - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * ggpol checking examples ... ERROR -* ggprism - checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * ggpubr - checking examples ... ERROR checking tests ... ERROR -* ggrain - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * ggraph checking examples ... ERROR checking re-building of vignette outputs ... NOTE @@ -762,8 +631,13 @@ Issues with CRAN packages are summarised below. checking re-building of vignette outputs ... NOTE * ggside + checking examples ... ERROR checking tests ... ERROR + checking running R code from vignettes ... ERROR + checking whether package ‘ggside’ can be installed ... WARNING checking for code/documentation mismatches ... WARNING + checking R code for possible problems ... NOTE + checking re-building of vignette outputs ... NOTE * ggsmc checking running R code from vignettes ... ERROR @@ -775,8 +649,9 @@ Issues with CRAN packages are summarised below. * ggstatsplot checking examples ... ERROR -* ggtern - checking examples ... ERROR +* ggswissmaps + checking whether package ‘ggswissmaps’ can be installed ... WARNING + checking whether the namespace can be loaded with stated dependencies ... NOTE * ggupset checking examples ... ERROR @@ -785,46 +660,25 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* GimmeMyPlot - checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* giniVarCI +* Greymodels checking examples ... ERROR -* gMCPLite - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* GWASinspector + checking whether package ‘GWASinspector’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* gMOIP +* GWlasso checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* GofCens +* harbinger checking examples ... ERROR + checking whether package ‘harbinger’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* greatR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* Greymodels - checking examples ... ERROR - -* gsDesign +* HCmodelSets checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* gtExtras - checking tests ... ERROR - -* HaploCatcher - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking whether package ‘HCmodelSets’ can be installed ... WARNING + checking R code for possible problems ... NOTE * healthyR checking running R code from vignettes ... ERROR @@ -840,79 +694,59 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* hermiter - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* heumilkr +* heemod checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* hilldiv - checking examples ... ERROR - -* hmclearn - checking examples ... ERROR +* hesim + checking tests ... ERROR -* HTLR +* hmsidwR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE * HVT checking examples ... ERROR + checking whether package ‘HVT’ can be installed ... WARNING + checking R code for possible problems ... NOTE * hypsoLoop checking whether package ‘hypsoLoop’ can be installed ... WARNING -* ibdsim2 - checking examples ... ERROR - -* ICtest - checking examples ... ERROR +* iCARH + checking whether package ‘iCARH’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* idiogramFISH - checking installed package size ... NOTE - -* IDMIR - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* ICSsmoothing + checking tests ... ERROR -* idopNetwork +* incidental checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* ihclust +* industRial checking examples ... ERROR -* immunarch +* infer checking examples ... ERROR - -* incidental checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* infer +* inferCSN checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE * injurytools checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* inlabru - checking examples ... ERROR - -* insurancerating - checking examples ... ERROR - * inTextSummaryTable checking tests ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE +* inti + checking whether package ‘inti’ can be installed ... WARNING + checking R code for possible problems ... NOTE + * IPV checking examples ... ERROR checking running R code from vignettes ... ERROR @@ -921,23 +755,12 @@ Issues with CRAN packages are summarised below. * IRon checking examples ... ERROR -* irt - checking examples ... ERROR - * isoorbi checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* ivDiag - checking examples ... ERROR - -* ivreg - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* jarbes - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* jenga + checking whether package ‘jenga’ can be installed ... WARNING * karel checking examples ... ERROR @@ -946,9 +769,10 @@ Issues with CRAN packages are summarised below. * kDGLM checking examples ... ERROR -* KMEANS.KNN +* Keyboard checking examples ... ERROR - checking tests ... ERROR + checking whether package ‘Keyboard’ can be installed ... WARNING + checking R code for possible problems ... NOTE * latentcor checking examples ... ERROR @@ -968,66 +792,39 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* lgpr - checking tests ... ERROR - -* LightLogR - checking examples ... ERROR +* lilikoi + checking whether package ‘lilikoi’ can be installed ... WARNING + checking R code for possible problems ... NOTE * LMoFit checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* lnmixsurv - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* LocalControl - checking running R code from vignettes ... ERROR - * LocalCop checking re-building of vignette outputs ... NOTE -* LongDat +* lognorm checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* longreadvqs - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* lpdensity +* lsl checking examples ... ERROR -* lspartition +* MAINT.Data checking examples ... ERROR - -* LSTbook - checking tests ... ERROR - checking re-building of vignette outputs ... NOTE - -* manydata checking tests ... ERROR + checking whether package ‘MAINT.Data’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* manymome - checking examples ... ERROR - -* mapbayr - checking examples ... ERROR - -* MBNMAdose - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* MBNMAtime - checking re-building of vignette outputs ... NOTE +* MarketMatching + checking re-building of vignette outputs ... ERROR -* mecoturn +* metacart checking examples ... ERROR + checking whether package ‘metacart’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* MetaNet +* MetAlyzer checking examples ... ERROR * metR @@ -1036,21 +833,10 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* metrica - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* miceRanger - checking running R code from vignettes ... ERROR - -* microbial - checking examples ... ERROR +* mgcViz checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* MicrobiomeSurv - checking examples ... ERROR - * migraph checking tests ... ERROR @@ -1070,21 +856,13 @@ Issues with CRAN packages are summarised below. * misspi checking examples ... ERROR -* mixpoissonreg - checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * mizer checking tests ... ERROR -* mlr3spatiotempcv - checking examples ... ERROR - -* mlr3viz +* MLEce checking examples ... ERROR - checking tests ... ERROR + checking whether package ‘MLEce’ can be installed ... WARNING + checking R code for possible problems ... NOTE * modeltime.resample checking tests ... ERROR @@ -1093,60 +871,55 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* mosaicCalc - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* mosaicData - checking examples ... ERROR - -* mosaicModel - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * mppR checking running R code from vignettes ... ERROR + checking whether package ‘mppR’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE -* MSCMT - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* mstate +* MPTmultiverse checking examples ... ERROR checking running R code from vignettes ... ERROR + checking re-building of vignette outputs ... NOTE * mtb checking tests ... ERROR +* mudfold + checking whether package ‘mudfold’ can be installed ... WARNING + checking R code for possible problems ... NOTE + * mulgar checking examples ... ERROR -* MultivariateAnalysis +* MultiTraits checking examples ... ERROR + checking running R code from vignettes ... ERROR + checking re-building of vignette outputs ... NOTE -* mxfda - checking installed package size ... NOTE +* mvSLOUCH + checking re-building of vignette outputs ... NOTE -* neatmaps - checking examples ... ERROR +* naive + checking whether package ‘naive’ can be installed ... WARNING -* neatStats - checking examples ... ERROR +* ncappc + checking whether package ‘ncappc’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* netcom - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* neatmaps + checking examples ... ERROR * NetFACS checking examples ... ERROR checking running R code from vignettes ... ERROR -* neuroUp +* NetworkInference checking examples ... ERROR checking tests ... ERROR checking running R code from vignettes ... ERROR + checking whether package ‘NetworkInference’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE * NHSRplotthedots @@ -1162,131 +935,72 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* nonmem2R - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* nphRCT - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* nprobust - checking examples ... ERROR - * nzelect checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* OBIC - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* oceanic - checking examples ... ERROR * oddsratio checking examples ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* ofpetrial - checking examples ... ERROR - * OmicNavigator checking tests ... ERROR -* omu - checking examples ... ERROR - checking re-building of vignette outputs ... NOTE - -* OncoBayes2 - checking examples ... ERROR - -* oncomsm - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* OneSampleLogRankTest - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* onpoint - checking examples ... ERROR - * ordbetareg checking examples ... ERROR -* packcircles - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * pafr checking tests ... ERROR -* patchwork - checking examples ... ERROR - * pathviewr checking tests ... ERROR -* patientProfilesVis +* pdxTrees checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* PCADSC +* PeakError checking examples ... ERROR -* pcutils +* PeakSegJoint checking examples ... ERROR -* pdxTrees - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* PeakSegOptimal + checking examples ... ERROR * personalized checking tests ... ERROR -* phyloseqGraphTest +* Plasmidprofiler checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* PieGlyph - checking examples ... ERROR +* plotDK checking tests ... ERROR - checking re-building of vignette outputs ... NOTE -* Plasmidprofiler +* PlotFTIR checking examples ... ERROR - -* platetools checking tests ... ERROR - -* PLNmodels checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* plotBart - checking tests ... ERROR - -* plotDK - checking tests ... ERROR * plotly checking examples ... ERROR checking tests ... ERROR +* plotthis + checking examples ... ERROR + * pmartR checking tests ... ERROR * pmxTools checking tests ... ERROR +* pogit + checking whether package ‘pogit’ can be installed ... WARNING + checking R code for possible problems ... NOTE + * posterior + checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE * PPQplan @@ -1296,16 +1010,22 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* PPtreeregViz - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * precintcon checking examples ... ERROR -* precrec +* pRecipe + checking whether package ‘pRecipe’ can be installed ... WARNING + checking R code for possible problems ... NOTE + +* PReMiuM + checking whether package ‘PReMiuM’ can be installed ... WARNING + checking R code for possible problems ... NOTE + +* prevR + checking examples ... ERROR checking running R code from vignettes ... ERROR + checking whether package ‘prevR’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE * priorsense @@ -1319,149 +1039,111 @@ Issues with CRAN packages are summarised below. * processmapR checking tests ... ERROR -* projpred - checking examples ... ERROR - checking running R code from vignettes ... ERROR - * psborrow checking tests ... ERROR -* pubh +* PupilPre checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* PUPMSI - checking examples ... ERROR - -* qacBase - checking examples ... ERROR - -* qPCRhelper +* qgcomp checking examples ... ERROR + checking tests ... ERROR checking running R code from vignettes ... ERROR + checking whether package ‘qgcomp’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE -* r2dii.plot +* qpNCA checking tests ... ERROR - -* r2spss - checking examples ... ERROR checking running R code from vignettes ... ERROR + checking whether package ‘qpNCA’ can be installed ... WARNING + checking R code for possible problems ... NOTE + checking re-building of vignette outputs ... NOTE -* radiant.basics - checking examples ... ERROR +* r2dii.plot + checking tests ... ERROR -* radiant.data - checking examples ... ERROR +* r4ss + checking whether package ‘r4ss’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* radiant.model +* r6qualitytools checking examples ... ERROR + checking whether package ‘r6qualitytools’ can be installed ... WARNING + checking R code for possible problems ... NOTE * Radviz checking examples ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* randomForestExplainer - checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * rassta checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR * rater checking tests ... ERROR -* RBesT - checking examples ... ERROR - checking running R code from vignettes ... ERROR +* ratlas + checking tests ... ERROR checking re-building of vignette outputs ... NOTE -* rddensity +* RclusTool checking examples ... ERROR + checking whether package ‘RclusTool’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* RecordTest +* RDS checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking whether package ‘RDS’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* reda - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* redist - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* regtomean + checking whether package ‘regtomean’ can be installed ... WARNING -* registr - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* reliabilitydiag - checking examples ... ERROR +* RKorAPClient + checking tests ... ERROR -* relliptical - checking examples ... ERROR +* rmcfs + checking whether package ‘rmcfs’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* reportRmd +* rnmamod checking examples ... ERROR + checking tests ... ERROR checking running R code from vignettes ... ERROR + checking whether package ‘rnmamod’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE -* reservr - checking examples ... ERROR - checking re-building of vignette outputs ... NOTE - -* RestoreNet - checking examples ... ERROR - -* rfPermute - checking examples ... ERROR - -* RKorAPClient - checking tests ... ERROR - * roahd checking examples ... ERROR -* robCompositions +* robomit checking examples ... ERROR + checking whether package ‘robomit’ can be installed ... WARNING + checking R code for possible problems ... NOTE * romic - checking examples ... ERROR checking tests ... ERROR * roptions checking examples ... ERROR -* rSAFE - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* santaR - checking tests ... ERROR +* rsimsum + checking whether package ‘rsimsum’ can be installed ... WARNING -* saros +* rSRD checking examples ... ERROR - checking tests ... ERROR + checking whether package ‘rSRD’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* scatterpie +* saeRobust checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* scdtb checking tests ... ERROR - -* scoringutils - checking examples ... ERROR - checking re-building of vignette outputs ... NOTE + checking whether package ‘saeRobust’ can be installed ... WARNING + checking R code for possible problems ... NOTE * scUtils checking tests ... ERROR @@ -1469,31 +1151,23 @@ Issues with CRAN packages are summarised below. * SCVA checking examples ... ERROR -* sdmTMB - checking examples ... ERROR - * SDMtune checking tests ... ERROR + checking installed package size ... NOTE -* sedproxy - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* see +* seAMLess checking examples ... ERROR * seedreg checking examples ... ERROR -* semfindr - checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* segen + checking whether package ‘segen’ can be installed ... WARNING -* sensiPhy +* sensitivity checking examples ... ERROR + checking whether package ‘sensitivity’ can be installed ... WARNING + checking R code for possible problems ... NOTE * sglg checking examples ... ERROR @@ -1504,127 +1178,92 @@ Issues with CRAN packages are summarised below. * SHAPforxgboost checking examples ... ERROR -* ShapleyOutlier +* SHELF + checking whether package ‘SHELF’ can be installed ... WARNING + checking R code for possible problems ... NOTE + +* signatureSurvival checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking whether package ‘signatureSurvival’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* shinipsum +* SimNPH checking tests ... ERROR -* signatureSurvival - checking examples ... ERROR +* simRestore + checking tests ... ERROR -* SimCorrMix +* singleCellHaystack checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking whether package ‘singleCellHaystack’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* SimMultiCorrData - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* SNPannotator + checking whether package ‘SNPannotator’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* SimNPH - checking tests ... ERROR - -* slendr +* soc.ca checking examples ... ERROR + checking whether package ‘soc.ca’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* smallsets +* SOMbrero checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking tests ... ERROR + checking whether package ‘SOMbrero’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* spinifex +* spectralR checking tests ... ERROR -* sport +* spinifex checking tests ... ERROR -* spotoroo +* spooky + checking whether package ‘spooky’ can be installed ... WARNING + +* sport checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE * SqueakR checking re-building of vignette outputs ... NOTE -* stability - checking examples ... ERROR - * statgenGWAS checking tests ... ERROR * statgenHTP - checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* sugrrants - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* superb +* Superpower checking examples ... ERROR checking tests ... ERROR checking running R code from vignettes ... ERROR + checking whether package ‘Superpower’ can be installed ... WARNING + checking R code for possible problems ... NOTE checking re-building of vignette outputs ... NOTE * surveyexplorer checking examples ... ERROR -* survivalAnalysis - checking examples ... ERROR - checking re-building of vignette outputs ... NOTE - -* survminer - checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* survParamSim - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* survstan - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* SVMMaj - checking examples ... ERROR - checking running R code from vignettes ... ERROR - -* Sysrecon - checking examples ... ERROR - * tabledown checking examples ... ERROR -* tcgaViz - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * TCIU checking examples ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* tcpl - checking tests ... ERROR +* tcplfit2 + checking running R code from vignettes ... ERROR + checking re-building of vignette outputs ... NOTE -* tern - checking examples ... ERROR +* tetragon + checking whether package ‘tetragon’ can be installed ... WARNING * thematic checking examples ... ERROR checking tests ... ERROR -* Thermistor - checking examples ... ERROR - * tidybayes checking examples ... ERROR @@ -1636,11 +1275,7 @@ Issues with CRAN packages are summarised below. * tidyCDISC checking tests ... ERROR -* tidysdm - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* tidySEM +* tidyplots checking examples ... ERROR checking tests ... ERROR checking running R code from vignettes ... ERROR @@ -1650,48 +1285,25 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* timeplyr - checking examples ... ERROR - * timetk checking tests ... ERROR -* tinyarray - checking examples ... ERROR - -* tipmap - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* tornado +* TOSTER checking examples ... ERROR checking tests ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* TOSTER +* TransProR checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE * TreatmentPatterns checking tests ... ERROR * TreatmentSelection checking examples ... ERROR - -* TreeDep - checking examples ... ERROR - -* TreeDist - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* treeheatr - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking whether package ‘TreatmentSelection’ can be installed ... WARNING + checking R code for possible problems ... NOTE * trelliscopejs checking tests ... ERROR @@ -1701,59 +1313,35 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* triptych - checking examples ... ERROR - * tsnet checking tests ... ERROR -* UBayFS +* UCSCXenaShiny checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* Umatrix - checking examples ... ERROR - * umiAnalyzer checking examples ... ERROR -* UnalR - checking examples ... ERROR - checking tests ... ERROR - -* unmconf - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - * usmap checking examples ... ERROR checking tests ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* vannstats - checking examples ... ERROR - -* vDiveR - checking examples ... ERROR - -* venn - checking examples ... ERROR - -* vimpclust - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* vaccineff + checking tests ... ERROR -* vip - checking examples ... ERROR +* valr checking tests ... ERROR -* VirtualPop - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* visOmopResults + checking tests ... ERROR -* viscomp - checking examples ... ERROR +* visvow + checking tests ... ERROR + checking whether package ‘visvow’ can be installed ... WARNING + checking R code for possible problems ... NOTE * vivaldi checking examples ... ERROR @@ -1761,37 +1349,45 @@ Issues with CRAN packages are summarised below. checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* voiceR +* voluModel checking examples ... ERROR + checking re-building of vignette outputs ... NOTE + +* vvshiny checking tests ... ERROR -* volcano3D - checking examples ... ERROR +* VWPre checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* voluModel +* WebAnalytics checking examples ... ERROR - checking re-building of vignette outputs ... NOTE + checking tests ... ERROR + checking whether package ‘WebAnalytics’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* vsd +* WhatsR checking examples ... ERROR + checking tests ... ERROR + checking whether package ‘WhatsR’ can be installed ... WARNING + checking R code for possible problems ... NOTE -* vvshiny +* wilson checking tests ... ERROR -* walker - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* wordmap + checking tests ... ERROR -* WVPlots +* xpose checking examples ... ERROR checking tests ... ERROR checking running R code from vignettes ... ERROR checking re-building of vignette outputs ... NOTE -* xaringanthemer - checking tests ... ERROR +* xpose.xtras + checking examples ... ERROR + checking running R code from vignettes ... ERROR + checking re-building of vignette outputs ... NOTE * yamlet checking examples ... ERROR @@ -1799,158 +1395,182 @@ Issues with CRAN packages are summarised below. ### Failed to check -* abctools (NA) -* adjclust (NA) -* animalEKF (NA) -* ANOM (NA) -* atRisk (NA) -* AutoScore (NA) -* baRulho (NA) -* bayesDP (NA) -* BayesianFactorZoo (NA) -* BayesSurvive (NA) -* BCClong (NA) -* BGGM (NA) -* binsreg (NA) -* bspcov (NA) -* bsub (NA) -* BuyseTest (NA) -* CARBayesST (NA) -* CGPfunctions (NA) -* chemodiv (NA) -* cinaR (NA) -* cmprskcoxmsm (NA) -* CNVScope (NA) -* COMMA (NA) -* conos (NA) -* counterfactuals (NA) -* CRMetrics (NA) -* crosstalkr (NA) -* ctsem (NA) -* DepthProc (NA) -* DR.SC (NA) -* easybgm (NA) -* EcoEnsemble (NA) -* ecolottery (NA) -* EMAS (NA) -* EpiEstim (NA) -* evolqg (NA) -* ForecastComb (NA) -* GALLO (NA) -* gap (NA) -* gapfill (NA) -* geneHapR (NA) -* GeneSelectR (NA) -* GeomComb (NA) -* gJLS2 (NA) -* hettx (NA) -* Hmisc (NA) -* Hmsc (NA) -* iClusterVB (NA) -* inventorize (NA) -* iNZightPlots (NA) -* iNZightRegression (NA) -* IRexamples (NA) -* jmBIG (NA) -* joineRML (NA) -* kibior (NA) -* kmc (NA) -* L2E (NA) -* llbayesireg (NA) -* locuszoomr (NA) -* LorenzRegression (NA) -* lsirm12pl (NA) -* MARVEL (NA) -* mbsts (NA) -* MitoHEAR (NA) -* miWQS (NA) -* mlmts (NA) -* mlr (NA) -* MOCHA (NA) -* MRZero (NA) -* multilevelTools (NA) -* multinma (NA) -* NCA (NA) -* netcmc (NA) -* NetworkChange (NA) -* nlmeVPC (NA) -* NMADiagT (NA) -* ohun (NA) -* optweight (NA) -* OVtool (NA) -* pagoda2 (NA) -* PAMpal (NA) -* PAMscapes (NA) -* paths (NA) -* pcvr (NA) -* PlasmaMutationDetector (NA) -* PlasmaMutationDetector2 (NA) -* PLMIX (NA) -* polyRAD (NA) -* popstudy (NA) -* pould (NA) -* PoweREST (NA) -* powerly (NA) -* pre (NA) -* ProFAST (NA) -* psbcSpeedUp (NA) -* pscore (NA) -* qPCRtools (NA) -* qris (NA) -* qte (NA) -* quantilogram (NA) -* quid (NA) -* RcmdrPlugin.RiskDemo (NA) -* rddtools (NA) -* RNAseqQC (NA) -* robmed (NA) -* robmedExtra (NA) -* RPPanalyzer (NA) -* RQdeltaCT (NA) -* rstanarm (NA) -* RTIGER (NA) -* rTwig (NA) -* RVA (NA) -* scCustomize (NA) -* SCdeconR (NA) -* scGate (NA) -* SCIntRuler (NA) -* scITD (NA) -* scMappR (NA) -* scpi (NA) -* scRNAstat (NA) -* sectorgap (NA) -* SeedMatchR (NA) -* SEERaBomb (NA) -* semicmprskcoxmsm (NA) -* SensMap (NA) -* sephora (NA) -* Seurat (NA) -* shinyTempSignal (NA) -* sievePH (NA) -* sigminer (NA) -* Signac (NA) -* SimplyAgree (NA) -* SNPassoc (NA) -* snplinkage (NA) -* SoupX (NA) -* sparsereg (NA) -* SpatialDDLS (NA) -* spikeSlabGAM (NA) -* statsr (NA) -* streamDAG (NA) -* survidm (NA) -* tempted (NA) -* TestAnaAPP (NA) -* tidydr (NA) -* tidyEdSurvey (NA) -* tidyseurat (NA) -* tidyvpc (NA) -* TriDimRegression (NA) -* TSrepr (NA) -* twang (NA) -* updog (NA) -* valr (NA) -* vdg (NA) -* visa (NA) -* WRTDStidal (NA) +* abctools (NA) +* adjustedCurves (NA) +* animalEKF (NA) +* ANOM (NA) +* atRisk (NA) +* autoReg (NA) +* AutoScore (NA) +* bartMan (NA) +* bayesDP (NA) +* BayesianFactorZoo (NA) +* BayesSurvive (NA) +* BCClong (NA) +* BGGM (NA) +* binsreg (NA) +* bspcov (NA) +* BSTZINB (NA) +* BuyseTest (NA) +* CAESAR.Suite (NA) +* CARBayesST (NA) +* Certara.VPCResults (NA) +* CGPfunctions (NA) +* cinaR (NA) +* cmprskcoxmsm (NA) +* COMMA (NA) +* contsurvplot (NA) +* counterfactuals (NA) +* CRMetrics (NA) +* ctsem (NA) +* dartR.base (NA) +* dartR.captive (NA) +* dartR.popgen (NA) +* dartR.sexlinked (NA) +* dartR.sim (NA) +* dartR.spatial (NA) +* DepthProc (NA) +* DFD (NA) +* dMrs (NA) +* DR.SC (NA) +* dscoreMSM (NA) +* easybgm (NA) +* EcoEnsemble (NA) +* ecolottery (NA) +* EpiEstim (NA) +* evolqg (NA) +* flexrsurv (NA) +* ForecastComb (NA) +* gap (NA) +* gapfill (NA) +* genekitr (NA) +* GeneSelectR (NA) +* GeomComb (NA) +* ggtern (NA) +* ggThemeAssist (NA) +* gJLS2 (NA) +* grandR (NA) +* GseaVis (NA) +* hettx (NA) +* Hmisc (NA) +* Hmsc (NA) +* iClusterVB (NA) +* immcp (NA) +* inventorize (NA) +* invivoPKfit (NA) +* iNZightPlots (NA) +* iNZightRegression (NA) +* IRexamples (NA) +* jmBIG (NA) +* joineRML (NA) +* jsmodule (NA) +* kmc (NA) +* KMunicate (NA) +* L2E (NA) +* Landmarking (NA) +* lavaSearch2 (NA) +* llbayesireg (NA) +* lnmixsurv (NA) +* LorenzRegression (NA) +* lsirm12pl (NA) +* MARVEL (NA) +* MaxWiK (NA) +* mbsts (NA) +* MendelianRandomization (NA) +* miWQS (NA) +* mlmts (NA) +* mlr (NA) +* MRZero (NA) +* mstate (NA) +* multilevelTools (NA) +* multinma (NA) +* multipleOutcomes (NA) +* MuPETFlow (NA) +* NCA (NA) +* netcmc (NA) +* NetworkChange (NA) +* nlmeVPC (NA) +* NMADiagT (NA) +* NMF (NA) +* obliqueRSF (NA) +* OlinkAnalyze (NA) +* optweight (NA) +* OVtool (NA) +* pammtools (NA) +* paths (NA) +* pcvr (NA) +* PLMIX (NA) +* popstudy (NA) +* pould (NA) +* PoweREST (NA) +* powerly (NA) +* pre (NA) +* ProFAST (NA) +* psbcSpeedUp (NA) +* pscore (NA) +* qPCRtools (NA) +* qris (NA) +* qte (NA) +* quantilogram (NA) +* quid (NA) +* RcmdrPlugin.RiskDemo (NA) +* rddtools (NA) +* relsurv (NA) +* ReporterScore (NA) +* riskRegression (NA) +* robber (NA) +* robmed (NA) +* robmedExtra (NA) +* RPPanalyzer (NA) +* RQdeltaCT (NA) +* rstanarm (NA) +* rTwig (NA) +* RVA (NA) +* S4DM (NA) +* scCustomize (NA) +* SCdeconR (NA) +* scGate (NA) +* SCIntRuler (NA) +* scMappR (NA) +* scpi (NA) +* SCpubr (NA) +* scRNAstat (NA) +* sectorgap (NA) +* SEERaBomb (NA) +* semicmprskcoxmsm (NA) +* SensMap (NA) +* Seurat (NA) +* shinyTempSignal (NA) +* sievePH (NA) +* SiFINeT (NA) +* sigminer (NA) +* Signac (NA) +* SimplyAgree (NA) +* SNPassoc (NA) +* snplinkage (NA) +* SoupX (NA) +* SpaCCI (NA) +* sparsereg (NA) +* spectralAnalysis (NA) +* spikeSlabGAM (NA) +* stabiliser (NA) +* statsr (NA) +* streamDAG (NA) +* survex (NA) +* survHE (NA) +* survidm (NA) +* tempted (NA) +* TestAnaAPP (NA) +* tidydr (NA) +* tidyEdSurvey (NA) +* tidyseurat (NA) +* tidyvpc (NA) +* tinyarray (NA) +* treeclim (NA) +* TriDimRegression (NA) +* TSrepr (NA) +* twang (NA) +* vdg (NA) +* visa (NA) +* wppExplorer (NA) +* WRTDStidal (NA) diff --git a/revdep/failures.md b/revdep/failures.md index 444f4e174b..16b90a9326 100644 --- a/revdep/failures.md +++ b/revdep/failures.md @@ -29,7 +29,7 @@ Run `revdepcheck::cloud_details(, "abctools")` for more info ** package ‘abctools’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c abctools.c -o abctools.o gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c init.c -o init.o gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o abctools.so abctools.o init.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR @@ -53,7 +53,7 @@ ERROR: lazy loading failed for package ‘abctools’ ** package ‘abctools’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c abctools.c -o abctools.o gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c init.c -o init.o gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o abctools.so abctools.o init.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR @@ -70,17 +70,17 @@ ERROR: lazy loading failed for package ‘abctools’ ``` -# adjclust +# adjustedCurves
-* Version: 0.6.9 -* GitHub: https://github.com/pneuvial/adjclust -* Source code: https://github.com/cran/adjclust -* Date/Publication: 2024-02-08 08:50:05 UTC -* Number of recursive dependencies: 119 +* Version: 0.11.2 +* GitHub: https://github.com/RobinDenz1/adjustedCurves +* Source code: https://github.com/cran/adjustedCurves +* Date/Publication: 2024-07-29 14:30:02 UTC +* Number of recursive dependencies: 177 -Run `revdepcheck::cloud_details(, "adjclust")` for more info +Run `revdepcheck::cloud_details(, "adjustedCurves")` for more info
@@ -89,27 +89,27 @@ Run `revdepcheck::cloud_details(, "adjclust")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/adjclust/new/adjclust.Rcheck’ +* using log directory ‘/tmp/workdir/adjustedCurves/new/adjustedCurves.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘adjclust/DESCRIPTION’ ... OK +* checking for file ‘adjustedCurves/DESCRIPTION’ ... OK ... - When sourcing ‘hicClust.R’: -Error: there is no package called ‘HiTC’ +--- finished re-building ‘plot_customization.rmd’ + +SUMMARY: processing the following file failed: + ‘introduction.Rmd’ + +Error: Vignette re-building failed. Execution halted - ‘hicClust.Rmd’ using ‘UTF-8’... failed - ‘notesCHAC.Rmd’ using ‘UTF-8’... OK - ‘snpClust.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK * DONE -Status: 1 WARNING, 2 NOTEs +Status: 2 ERRORs, 1 WARNING, 3 NOTEs @@ -119,27 +119,27 @@ Status: 1 WARNING, 2 NOTEs ### CRAN ``` -* using log directory ‘/tmp/workdir/adjclust/old/adjclust.Rcheck’ +* using log directory ‘/tmp/workdir/adjustedCurves/old/adjustedCurves.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘adjclust/DESCRIPTION’ ... OK +* checking for file ‘adjustedCurves/DESCRIPTION’ ... OK ... - When sourcing ‘hicClust.R’: -Error: there is no package called ‘HiTC’ +--- finished re-building ‘plot_customization.rmd’ + +SUMMARY: processing the following file failed: + ‘introduction.Rmd’ + +Error: Vignette re-building failed. Execution halted - ‘hicClust.Rmd’ using ‘UTF-8’... failed - ‘notesCHAC.Rmd’ using ‘UTF-8’... OK - ‘snpClust.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK * DONE -Status: 1 WARNING, 2 NOTEs +Status: 2 ERRORs, 1 WARNING, 3 NOTEs @@ -216,7 +216,7 @@ ERROR: lazy loading failed for package ‘animalEKF’ * GitHub: https://github.com/PhilipPallmann/ANOM * Source code: https://github.com/cran/ANOM * Date/Publication: 2017-04-12 13:32:33 UTC -* Number of recursive dependencies: 60 +* Number of recursive dependencies: 63 Run `revdepcheck::cloud_details(, "ANOM")` for more info @@ -276,10 +276,10 @@ ERROR: lazy loading failed for package ‘ANOM’
-* Version: 0.1.0 +* Version: 0.2.0 * GitHub: NA * Source code: https://github.com/cran/atRisk -* Date/Publication: 2023-08-08 14:50:05 UTC +* Date/Publication: 2025-01-14 18:50:01 UTC * Number of recursive dependencies: 37 Run `revdepcheck::cloud_details(, "atRisk")` for more info @@ -334,17 +334,17 @@ ERROR: lazy loading failed for package ‘atRisk’ ``` -# AutoScore +# autoReg
-* Version: 1.0.0 -* GitHub: https://github.com/nliulab/AutoScore -* Source code: https://github.com/cran/AutoScore -* Date/Publication: 2022-10-15 22:15:26 UTC -* Number of recursive dependencies: 170 +* Version: 0.3.3 +* GitHub: https://github.com/cardiomoon/autoReg +* Source code: https://github.com/cran/autoReg +* Date/Publication: 2023-11-14 05:53:27 UTC +* Number of recursive dependencies: 215 -Run `revdepcheck::cloud_details(, "AutoScore")` for more info +Run `revdepcheck::cloud_details(, "autoReg")` for more info
@@ -353,27 +353,27 @@ Run `revdepcheck::cloud_details(, "AutoScore")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/AutoScore/new/AutoScore.Rcheck’ +* using log directory ‘/tmp/workdir/autoReg/new/autoReg.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘AutoScore/DESCRIPTION’ ... OK +* checking for file ‘autoReg/DESCRIPTION’ ... OK ... -* this is package ‘AutoScore’ version ‘1.0.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘survAUC’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘Automatic_Regression_Modeling.Rmd’ using ‘UTF-8’... OK + ‘Bootstrap_Prediction.Rmd’ using ‘UTF-8’... OK + ‘Getting_started.Rmd’ using ‘UTF-8’... OK + ‘Statiastical_test_in_gaze.Rmd’ using ‘UTF-8’... OK + ‘Survival.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK * DONE -Status: 1 ERROR +Status: OK @@ -383,44 +383,44 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/AutoScore/old/AutoScore.Rcheck’ +* using log directory ‘/tmp/workdir/autoReg/old/autoReg.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘AutoScore/DESCRIPTION’ ... OK +* checking for file ‘autoReg/DESCRIPTION’ ... OK ... -* this is package ‘AutoScore’ version ‘1.0.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘survAUC’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘Automatic_Regression_Modeling.Rmd’ using ‘UTF-8’... OK + ‘Bootstrap_Prediction.Rmd’ using ‘UTF-8’... OK + ‘Getting_started.Rmd’ using ‘UTF-8’... OK + ‘Statiastical_test_in_gaze.Rmd’ using ‘UTF-8’... OK + ‘Survival.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK * DONE -Status: 1 ERROR +Status: OK ``` -# baRulho +# AutoScore
-* Version: 2.1.2 -* GitHub: https://github.com/ropensci/baRulho -* Source code: https://github.com/cran/baRulho -* Date/Publication: 2024-08-31 13:10:07 UTC -* Number of recursive dependencies: 115 +* Version: 1.0.0 +* GitHub: https://github.com/nliulab/AutoScore +* Source code: https://github.com/cran/AutoScore +* Date/Publication: 2022-10-15 22:15:26 UTC +* Number of recursive dependencies: 173 -Run `revdepcheck::cloud_details(, "baRulho")` for more info +Run `revdepcheck::cloud_details(, "AutoScore")` for more info
@@ -429,22 +429,22 @@ Run `revdepcheck::cloud_details(, "baRulho")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/baRulho/new/baRulho.Rcheck’ +* using log directory ‘/tmp/workdir/AutoScore/new/AutoScore.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘baRulho/DESCRIPTION’ ... OK +* checking for file ‘AutoScore/DESCRIPTION’ ... OK ... +* this is package ‘AutoScore’ version ‘1.0.0’ +* package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Packages required but not available: 'warbleR', 'ohun' - -Package suggested but not available for checking: ‘Rraven’ +Package required but not available: ‘survAUC’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -459,22 +459,22 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/baRulho/old/baRulho.Rcheck’ +* using log directory ‘/tmp/workdir/AutoScore/old/AutoScore.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘baRulho/DESCRIPTION’ ... OK +* checking for file ‘AutoScore/DESCRIPTION’ ... OK ... +* this is package ‘AutoScore’ version ‘1.0.0’ +* package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Packages required but not available: 'warbleR', 'ohun' - -Package suggested but not available for checking: ‘Rraven’ +Package required but not available: ‘survAUC’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -485,16 +485,78 @@ Status: 1 ERROR +``` +# bartMan + +
+ +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/bartMan +* Date/Publication: 2024-07-24 12:10:02 UTC +* Number of recursive dependencies: 135 + +Run `revdepcheck::cloud_details(, "bartMan")` for more info + +
+ +## Newly broken + +* checking whether package ‘bartMan’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/bartMan/new/bartMan.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘bartMan’ ... +** package ‘bartMan’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in eval(exprs[i], envir) : object 'justify_grobs' not found +Error: unable to load R code in package ‘bartMan’ +Execution halted +ERROR: lazy loading failed for package ‘bartMan’ +* removing ‘/tmp/workdir/bartMan/new/bartMan.Rcheck/bartMan’ + + +``` +### CRAN + +``` +* installing *source* package ‘bartMan’ ... +** package ‘bartMan’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +** help +*** installing help indices +** building package indices +** testing if installed package can be loaded from temporary location +** testing if installed package can be loaded from final location +** testing if installed package keeps a record of temporary installation path +* DONE (bartMan) + + ``` # bayesDP
-* Version: 1.3.6 +* Version: 1.3.7 * GitHub: https://github.com/graemeleehickey/bayesDP * Source code: https://github.com/cran/bayesDP -* Date/Publication: 2022-01-30 22:20:02 UTC -* Number of recursive dependencies: 80 +* Date/Publication: 2025-01-12 11:40:10 UTC +* Number of recursive dependencies: 79 Run `revdepcheck::cloud_details(, "bayesDP")` for more info @@ -517,10 +579,10 @@ Run `revdepcheck::cloud_details(, "bayesDP")` for more info ** package ‘bayesDP’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c bdplm.cpp -o bdplm.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c ppexp.cpp -o ppexp.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c bdplm.cpp -o bdplm.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c ppexp.cpp -o ppexp.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o bayesDP.so RcppExports.o bdplm.o ppexp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/bayesDP/new/bayesDP.Rcheck/00LOCK-bayesDP/00new/bayesDP/libs ** R @@ -542,10 +604,10 @@ ERROR: lazy loading failed for package ‘bayesDP’ ** package ‘bayesDP’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c bdplm.cpp -o bdplm.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c ppexp.cpp -o ppexp.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c bdplm.cpp -o bdplm.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c ppexp.cpp -o ppexp.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o bayesDP.so RcppExports.o bdplm.o ppexp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/bayesDP/old/bayesDP.Rcheck/00LOCK-bayesDP/00new/bayesDP/libs ** R @@ -564,11 +626,11 @@ ERROR: lazy loading failed for package ‘bayesDP’
-* Version: 0.0.0.2 +* Version: 0.0.0.3 * GitHub: NA * Source code: https://github.com/cran/BayesianFactorZoo -* Date/Publication: 2023-11-14 12:43:44 UTC -* Number of recursive dependencies: 75 +* Date/Publication: 2024-10-04 09:30:08 UTC +* Number of recursive dependencies: 74 Run `revdepcheck::cloud_details(, "BayesianFactorZoo")` for more info @@ -632,73 +694,71 @@ ERROR: lazy loading failed for package ‘BayesianFactorZoo’ * GitHub: https://github.com/ocbe-uio/BayesSurvive * Source code: https://github.com/cran/BayesSurvive * Date/Publication: 2024-06-04 13:20:12 UTC -* Number of recursive dependencies: 129 +* Number of recursive dependencies: 118 Run `revdepcheck::cloud_details(, "BayesSurvive")` for more info
-## In both - -* checking whether package ‘BayesSurvive’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/BayesSurvive/new/BayesSurvive.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘BayesSurvive’ ... -** package ‘BayesSurvive’ successfully unpacked and MD5 sums checked -** using staged installation -checking whether the C++ compiler works... yes -checking for C++ compiler default output file name... a.out -checking for suffix of executables... -checking whether we are cross compiling... no -checking for suffix of object files... o -checking whether the compiler supports GNU C++... yes -checking whether g++ -std=gnu++17 accepts -g... yes +* using log directory ‘/tmp/workdir/BayesSurvive/new/BayesSurvive.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘BayesSurvive/DESCRIPTION’ ... OK ... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rms’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘BayesSurvive’ -* removing ‘/tmp/workdir/BayesSurvive/new/BayesSurvive.Rcheck/BayesSurvive’ +* this is package ‘BayesSurvive’ version ‘0.0.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` ### CRAN ``` -* installing *source* package ‘BayesSurvive’ ... -** package ‘BayesSurvive’ successfully unpacked and MD5 sums checked -** using staged installation -checking whether the C++ compiler works... yes -checking for C++ compiler default output file name... a.out -checking for suffix of executables... -checking whether we are cross compiling... no -checking for suffix of object files... o -checking whether the compiler supports GNU C++... yes -checking whether g++ -std=gnu++17 accepts -g... yes +* using log directory ‘/tmp/workdir/BayesSurvive/old/BayesSurvive.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘BayesSurvive/DESCRIPTION’ ... OK ... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rms’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘BayesSurvive’ -* removing ‘/tmp/workdir/BayesSurvive/old/BayesSurvive.Rcheck/BayesSurvive’ +* this is package ‘BayesSurvive’ version ‘0.0.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` @@ -710,7 +770,7 @@ ERROR: lazy loading failed for package ‘BayesSurvive’ * GitHub: NA * Source code: https://github.com/cran/BCClong * Date/Publication: 2024-06-24 00:00:02 UTC -* Number of recursive dependencies: 145 +* Number of recursive dependencies: 148 Run `revdepcheck::cloud_details(, "BCClong")` for more info @@ -733,11 +793,11 @@ Run `revdepcheck::cloud_details(, "BCClong")` for more info ** package ‘BCClong’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c BCC.cpp -o BCC.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Likelihood.cpp -o Likelihood.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c c_which.cpp -o c_which.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c BCC.cpp -o BCC.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Likelihood.cpp -o Likelihood.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c c_which.cpp -o c_which.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o BCClong.so BCC.o Likelihood.o RcppExports.o c_which.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR ... ** R @@ -760,11 +820,11 @@ ERROR: lazy loading failed for package ‘BCClong’ ** package ‘BCClong’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c BCC.cpp -o BCC.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Likelihood.cpp -o Likelihood.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c c_which.cpp -o c_which.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c BCC.cpp -o BCC.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Likelihood.cpp -o Likelihood.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c c_which.cpp -o c_which.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o BCClong.so BCC.o Likelihood.o RcppExports.o c_which.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR ... ** R @@ -784,11 +844,11 @@ ERROR: lazy loading failed for package ‘BCClong’
-* Version: 2.1.3 +* Version: 2.1.5 * GitHub: https://github.com/donaldRwilliams/BGGM * Source code: https://github.com/cran/BGGM -* Date/Publication: 2024-07-05 20:30:02 UTC -* Number of recursive dependencies: 209 +* Date/Publication: 2024-12-22 21:40:02 UTC +* Number of recursive dependencies: 211 Run `revdepcheck::cloud_details(, "BGGM")` for more info @@ -810,13 +870,13 @@ Run `revdepcheck::cloud_details(, "BGGM")` for more info * installing *source* package ‘BGGM’ ... ** package ‘BGGM’ successfully unpacked and MD5 sums checked ** using staged installation -checking whether the C++ compiler works... yes -checking for C++ compiler default output file name... a.out -checking for suffix of executables... -checking whether we are cross compiling... no -checking for suffix of object files... o -checking whether we are using the GNU C++ compiler... yes -checking whether g++ -std=gnu++17 accepts -g... yes +configure: creating ./config.status +config.status: creating src/Makevars +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c bggm_fast.cpp -o bggm_fast.o ... ** data *** moving datasets to lazyload DB @@ -837,13 +897,13 @@ ERROR: lazy loading failed for package ‘BGGM’ * installing *source* package ‘BGGM’ ... ** package ‘BGGM’ successfully unpacked and MD5 sums checked ** using staged installation -checking whether the C++ compiler works... yes -checking for C++ compiler default output file name... a.out -checking for suffix of executables... -checking whether we are cross compiling... no -checking for suffix of object files... o -checking whether we are using the GNU C++ compiler... yes -checking whether g++ -std=gnu++17 accepts -g... yes +configure: creating ./config.status +config.status: creating src/Makevars +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c bggm_fast.cpp -o bggm_fast.o ... ** data *** moving datasets to lazyload DB @@ -920,11 +980,11 @@ ERROR: lazy loading failed for package ‘binsreg’
-* Version: 1.0.0 +* Version: 1.0.1 * GitHub: https://github.com/statjs/bspcov * Source code: https://github.com/cran/bspcov -* Date/Publication: 2024-02-06 16:50:08 UTC -* Number of recursive dependencies: 122 +* Date/Publication: 2024-11-13 20:10:02 UTC +* Number of recursive dependencies: 111 Run `revdepcheck::cloud_details(, "bspcov")` for more info @@ -978,26 +1038,26 @@ ERROR: lazy loading failed for package ‘bspcov’ ``` -# bsub +# BSTZINB
-* Version: 1.1.0 -* GitHub: https://github.com/jokergoo/bsub -* Source code: https://github.com/cran/bsub -* Date/Publication: 2021-07-01 15:50:10 UTC -* Number of recursive dependencies: 79 +* Version: 1.0.1 +* GitHub: https://github.com/SumanM47/BSTZINB +* Source code: https://github.com/cran/BSTZINB +* Date/Publication: 2024-10-31 22:50:02 UTC +* Number of recursive dependencies: 110 -Run `revdepcheck::cloud_details(, "bsub")` for more info +Run `revdepcheck::cloud_details(, "BSTZINB")` for more info
## In both -* checking whether package ‘bsub’ can be installed ... ERROR +* checking whether package ‘BSTZINB’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/bsub/new/bsub.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/BSTZINB/new/BSTZINB.Rcheck/00install.out’ for details. ``` ## Installation @@ -1005,36 +1065,40 @@ Run `revdepcheck::cloud_details(, "bsub")` for more info ### Devel ``` -* installing *source* package ‘bsub’ ... -** package ‘bsub’ successfully unpacked and MD5 sums checked +* installing *source* package ‘BSTZINB’ ... +** package ‘BSTZINB’ successfully unpacked and MD5 sums checked ** using staged installation ** R +** data +*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rjson’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘bsub’ -* removing ‘/tmp/workdir/bsub/new/bsub.Rcheck/bsub’ +ERROR: lazy loading failed for package ‘BSTZINB’ +* removing ‘/tmp/workdir/BSTZINB/new/BSTZINB.Rcheck/BSTZINB’ ``` ### CRAN ``` -* installing *source* package ‘bsub’ ... -** package ‘bsub’ successfully unpacked and MD5 sums checked +* installing *source* package ‘BSTZINB’ ... +** package ‘BSTZINB’ successfully unpacked and MD5 sums checked ** using staged installation ** R +** data +*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rjson’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘bsub’ -* removing ‘/tmp/workdir/bsub/old/bsub.Rcheck/bsub’ +ERROR: lazy loading failed for package ‘BSTZINB’ +* removing ‘/tmp/workdir/BSTZINB/old/BSTZINB.Rcheck/BSTZINB’ ``` @@ -1042,89 +1106,163 @@ ERROR: lazy loading failed for package ‘bsub’
-* Version: 3.0.4 +* Version: 3.0.5 * GitHub: https://github.com/bozenne/BuyseTest * Source code: https://github.com/cran/BuyseTest -* Date/Publication: 2024-07-01 09:20:02 UTC -* Number of recursive dependencies: 133 +* Date/Publication: 2024-10-13 21:40:02 UTC +* Number of recursive dependencies: 132 Run `revdepcheck::cloud_details(, "BuyseTest")` for more info
-## In both - -* checking whether package ‘BuyseTest’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/BuyseTest/new/BuyseTest.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘BuyseTest’ ... -** package ‘BuyseTest’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c FCT_buyseTest.cpp -o FCT_buyseTest.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c FCT_precompute.cpp -o FCT_precompute.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c utils-from-riskRegression.cpp -o utils-from-riskRegression.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o BuyseTest.so FCT_buyseTest.o FCT_precompute.o RcppExports.o utils-from-riskRegression.o -L/opt/R/4.3.1/lib/R/lib -lR +* using log directory ‘/tmp/workdir/BuyseTest/new/BuyseTest.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘BuyseTest/DESCRIPTION’ ... OK ... -installing to /tmp/workdir/BuyseTest/new/BuyseTest.Rcheck/00LOCK-BuyseTest/00new/BuyseTest/libs -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rms’ -Error: unable to load R code in package ‘BuyseTest’ -Execution halted -ERROR: lazy loading failed for package ‘BuyseTest’ -* removing ‘/tmp/workdir/BuyseTest/new/BuyseTest.Rcheck/BuyseTest’ +* this is package ‘BuyseTest’ version ‘3.0.5’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` ### CRAN ``` -* installing *source* package ‘BuyseTest’ ... -** package ‘BuyseTest’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c FCT_buyseTest.cpp -o FCT_buyseTest.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c FCT_precompute.cpp -o FCT_precompute.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c utils-from-riskRegression.cpp -o utils-from-riskRegression.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o BuyseTest.so FCT_buyseTest.o FCT_precompute.o RcppExports.o utils-from-riskRegression.o -L/opt/R/4.3.1/lib/R/lib -lR +* using log directory ‘/tmp/workdir/BuyseTest/old/BuyseTest.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘BuyseTest/DESCRIPTION’ ... OK ... -installing to /tmp/workdir/BuyseTest/old/BuyseTest.Rcheck/00LOCK-BuyseTest/00new/BuyseTest/libs -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rms’ -Error: unable to load R code in package ‘BuyseTest’ -Execution halted -ERROR: lazy loading failed for package ‘BuyseTest’ -* removing ‘/tmp/workdir/BuyseTest/old/BuyseTest.Rcheck/BuyseTest’ +* this is package ‘BuyseTest’ version ‘3.0.5’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR -``` -# CARBayesST -
-* Version: 4.0 + + +``` +# CAESAR.Suite + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/XiaoZhangryy/CAESAR.Suite +* Source code: https://github.com/cran/CAESAR.Suite +* Date/Publication: 2024-09-16 14:20:06 UTC +* Number of recursive dependencies: 269 + +Run `revdepcheck::cloud_details(, "CAESAR.Suite")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/CAESAR.Suite/new/CAESAR.Suite.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘CAESAR.Suite/DESCRIPTION’ ... OK +... +* this is package ‘CAESAR.Suite’ version ‘0.1.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘ProFAST’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/CAESAR.Suite/old/CAESAR.Suite.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘CAESAR.Suite/DESCRIPTION’ ... OK +... +* this is package ‘CAESAR.Suite’ version ‘0.1.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘ProFAST’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# CARBayesST + +
+ +* Version: 4.0 * GitHub: https://github.com/duncanplee/CARBayesST * Source code: https://github.com/cran/CARBayesST * Date/Publication: 2023-10-30 16:40:02 UTC -* Number of recursive dependencies: 118 +* Number of recursive dependencies: 106 Run `revdepcheck::cloud_details(, "CARBayesST")` for more info @@ -1147,9 +1285,9 @@ Run `revdepcheck::cloud_details(, "CARBayesST")` for more info ** package ‘CARBayesST’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CARBayesST.cpp -o CARBayesST.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CARBayesST.cpp -o CARBayesST.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o CARBayesST.so CARBayesST.o RcppExports.o -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/CARBayesST/new/CARBayesST.Rcheck/00LOCK-CARBayesST/00new/CARBayesST/libs ** R @@ -1171,9 +1309,9 @@ ERROR: lazy loading failed for package ‘CARBayesST’ ** package ‘CARBayesST’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CARBayesST.cpp -o CARBayesST.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CARBayesST.cpp -o CARBayesST.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o CARBayesST.so CARBayesST.o RcppExports.o -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/CARBayesST/old/CARBayesST.Rcheck/00LOCK-CARBayesST/00new/CARBayesST/libs ** R @@ -1187,6 +1325,66 @@ ERROR: lazy loading failed for package ‘CARBayesST’ * removing ‘/tmp/workdir/CARBayesST/old/CARBayesST.Rcheck/CARBayesST’ +``` +# Certara.VPCResults + +
+ +* Version: 3.0.2 +* GitHub: NA +* Source code: https://github.com/cran/Certara.VPCResults +* Date/Publication: 2024-12-02 15:30:02 UTC +* Number of recursive dependencies: 141 + +Run `revdepcheck::cloud_details(, "Certara.VPCResults")` for more info + +
+ +## In both + +* checking whether package ‘Certara.VPCResults’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/Certara.VPCResults/new/Certara.VPCResults.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘Certara.VPCResults’ ... +** package ‘Certara.VPCResults’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Certara.VPCResults’ +* removing ‘/tmp/workdir/Certara.VPCResults/new/Certara.VPCResults.Rcheck/Certara.VPCResults’ + + +``` +### CRAN + +``` +* installing *source* package ‘Certara.VPCResults’ ... +** package ‘Certara.VPCResults’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Certara.VPCResults’ +* removing ‘/tmp/workdir/Certara.VPCResults/old/Certara.VPCResults.Rcheck/Certara.VPCResults’ + + ``` # CGPfunctions @@ -1196,7 +1394,7 @@ ERROR: lazy loading failed for package ‘CARBayesST’ * GitHub: https://github.com/ibecav/CGPfunctions * Source code: https://github.com/cran/CGPfunctions * Date/Publication: 2020-11-12 14:50:09 UTC -* Number of recursive dependencies: 148 +* Number of recursive dependencies: 155 Run `revdepcheck::cloud_details(, "CGPfunctions")` for more info @@ -1252,17 +1450,16 @@ ERROR: lazy loading failed for package ‘CGPfunctions’ ``` -# chemodiv +# cia
-* Version: 0.3.0 -* GitHub: https://github.com/hpetren/chemodiv -* Source code: https://github.com/cran/chemodiv -* Date/Publication: 2023-08-17 17:52:33 UTC -* Number of recursive dependencies: 170 +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/cia +* Number of recursive dependencies: 122 -Run `revdepcheck::cloud_details(, "chemodiv")` for more info +Run `revdepcheck::cloud_details(, "cia")` for more info
@@ -1271,27 +1468,7 @@ Run `revdepcheck::cloud_details(, "chemodiv")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/chemodiv/new/chemodiv.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘chemodiv/DESCRIPTION’ ... OK -... -* this is package ‘chemodiv’ version ‘0.3.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'fmcsR', 'ChemmineR' -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR @@ -1301,27 +1478,7 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/chemodiv/old/chemodiv.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘chemodiv/DESCRIPTION’ ... OK -... -* this is package ‘chemodiv’ version ‘0.3.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'fmcsR', 'ChemmineR' -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR @@ -1336,7 +1493,7 @@ Status: 1 ERROR * GitHub: https://github.com/eonurk/cinaR * Source code: https://github.com/cran/cinaR * Date/Publication: 2022-05-18 14:00:09 UTC -* Number of recursive dependencies: 177 +* Number of recursive dependencies: 171 Run `revdepcheck::cloud_details(, "cinaR")` for more info @@ -1351,18 +1508,18 @@ Run `revdepcheck::cloud_details(, "cinaR")` for more info * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘cinaR/DESCRIPTION’ ... OK ... +* this is package ‘cinaR’ version ‘0.2.3’ +* package encoding: UTF-8 +* checking package namespace information ... OK * checking package dependencies ... ERROR -Packages required but not available: - 'ChIPseeker', 'TxDb.Hsapiens.UCSC.hg38.knownGene', - 'TxDb.Hsapiens.UCSC.hg19.knownGene', - 'TxDb.Mmusculus.UCSC.mm10.knownGene' +Packages required but not available: 'ChIPseeker', 'fgsea' See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -1381,18 +1538,18 @@ Status: 1 ERROR * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘cinaR/DESCRIPTION’ ... OK ... +* this is package ‘cinaR’ version ‘0.2.3’ +* package encoding: UTF-8 +* checking package namespace information ... OK * checking package dependencies ... ERROR -Packages required but not available: - 'ChIPseeker', 'TxDb.Hsapiens.UCSC.hg38.knownGene', - 'TxDb.Hsapiens.UCSC.hg19.knownGene', - 'TxDb.Mmusculus.UCSC.mm10.knownGene' +Packages required but not available: 'ChIPseeker', 'fgsea' See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -1465,91 +1622,15 @@ ERROR: lazy loading failed for package ‘cmprskcoxmsm’ * removing ‘/tmp/workdir/cmprskcoxmsm/old/cmprskcoxmsm.Rcheck/cmprskcoxmsm’ -``` -# CNVScope - -
- -* Version: 3.7.2 -* GitHub: https://github.com/jamesdalg/CNVScope -* Source code: https://github.com/cran/CNVScope -* Date/Publication: 2022-03-30 23:40:08 UTC -* Number of recursive dependencies: 206 - -Run `revdepcheck::cloud_details(, "CNVScope")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/CNVScope/new/CNVScope.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘CNVScope/DESCRIPTION’ ... OK -... -Packages required but not available: 'GenomicInteractions', 'rtracklayer' - -Packages suggested but not available for checking: - 'ComplexHeatmap', 'HiCseg', 'GenomicFeatures', - 'BSgenome.Hsapiens.UCSC.hg19' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/CNVScope/old/CNVScope.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘CNVScope/DESCRIPTION’ ... OK -... -Packages required but not available: 'GenomicInteractions', 'rtracklayer' - -Packages suggested but not available for checking: - 'ComplexHeatmap', 'HiCseg', 'GenomicFeatures', - 'BSgenome.Hsapiens.UCSC.hg19' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - ``` # COMMA
-* Version: 1.0.0 +* Version: 1.1.1 * GitHub: NA * Source code: https://github.com/cran/COMMA -* Date/Publication: 2024-07-21 10:10:05 UTC +* Date/Publication: 2024-12-13 21:10:02 UTC * Number of recursive dependencies: 72 Run `revdepcheck::cloud_details(, "COMMA")` for more info @@ -1573,6 +1654,8 @@ Run `revdepcheck::cloud_details(, "COMMA")` for more info ** package ‘COMMA’ successfully unpacked and MD5 sums checked ** using staged installation ** R +** data +*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : @@ -1591,6 +1674,8 @@ ERROR: lazy loading failed for package ‘COMMA’ ** package ‘COMMA’ successfully unpacked and MD5 sums checked ** using staged installation ** R +** data +*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : @@ -1602,17 +1687,17 @@ ERROR: lazy loading failed for package ‘COMMA’ ``` -# conos +# contsurvplot
-* Version: 1.5.2 -* GitHub: https://github.com/kharchenkolab/conos -* Source code: https://github.com/cran/conos -* Date/Publication: 2024-02-26 19:30:05 UTC -* Number of recursive dependencies: 240 +* Version: 0.2.1 +* GitHub: https://github.com/RobinDenz1/contsurvplot +* Source code: https://github.com/cran/contsurvplot +* Date/Publication: 2023-08-15 08:00:03 UTC +* Number of recursive dependencies: 156 -Run `revdepcheck::cloud_details(, "conos")` for more info +Run `revdepcheck::cloud_details(, "contsurvplot")` for more info
@@ -1621,22 +1706,22 @@ Run `revdepcheck::cloud_details(, "conos")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/conos/new/conos.Rcheck’ +* using log directory ‘/tmp/workdir/contsurvplot/new/contsurvplot.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘conos/DESCRIPTION’ ... OK +* checking for file ‘contsurvplot/DESCRIPTION’ ... OK ... +* this is package ‘contsurvplot’ version ‘0.2.1’ +* package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Package required but not available: ‘ComplexHeatmap’ - -Package suggested but not available for checking: ‘pagoda2’ +Package required but not available: ‘riskRegression’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -1651,22 +1736,22 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/conos/old/conos.Rcheck’ +* using log directory ‘/tmp/workdir/contsurvplot/old/contsurvplot.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘conos/DESCRIPTION’ ... OK +* checking for file ‘contsurvplot/DESCRIPTION’ ... OK ... +* this is package ‘contsurvplot’ version ‘0.2.1’ +* package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Package required but not available: ‘ComplexHeatmap’ - -Package suggested but not available for checking: ‘pagoda2’ +Package required but not available: ‘riskRegression’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -1682,11 +1767,11 @@ Status: 1 ERROR
-* Version: 0.1.4 +* Version: 0.1.6 * GitHub: https://github.com/dandls/counterfactuals * Source code: https://github.com/cran/counterfactuals -* Date/Publication: 2024-05-14 19:00:02 UTC -* Number of recursive dependencies: 227 +* Date/Publication: 2024-10-17 12:00:06 UTC +* Number of recursive dependencies: 217 Run `revdepcheck::cloud_details(, "counterfactuals")` for more info @@ -1701,9 +1786,9 @@ Run `revdepcheck::cloud_details(, "counterfactuals")` for more info * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘counterfactuals/DESCRIPTION’ ... OK @@ -1731,9 +1816,9 @@ Status: 1 NOTE * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘counterfactuals/DESCRIPTION’ ... OK @@ -1758,151 +1843,59 @@ Status: 1 NOTE
-* Version: 0.3.0 +* Version: 0.3.2 * GitHub: https://github.com/khodosevichlab/CRMetrics * Source code: https://github.com/cran/CRMetrics -* Date/Publication: 2023-09-01 09:00:06 UTC -* Number of recursive dependencies: 239 +* Date/Publication: 2024-11-08 00:20:06 UTC +* Number of recursive dependencies: 242 Run `revdepcheck::cloud_details(, "CRMetrics")` for more info
-## Error before installation - -### Devel +## In both -``` -* using log directory ‘/tmp/workdir/CRMetrics/new/CRMetrics.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘CRMetrics/DESCRIPTION’ ... 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 ‘CRMetrics’ can be installed ... ERROR -Installation failed. -See ‘/tmp/workdir/CRMetrics/new/CRMetrics.Rcheck/00install.out’ for details. -* DONE -Status: 1 ERROR, 1 NOTE +* checking whether package ‘CRMetrics’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/CRMetrics/new/CRMetrics.Rcheck/00install.out’ for details. + ``` +## Installation +### Devel +``` +* installing *source* package ‘CRMetrics’ ... +** package ‘CRMetrics’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘CRMetrics’ +* removing ‘/tmp/workdir/CRMetrics/new/CRMetrics.Rcheck/CRMetrics’ ``` ### CRAN ``` -* using log directory ‘/tmp/workdir/CRMetrics/old/CRMetrics.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘CRMetrics/DESCRIPTION’ ... 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 ‘CRMetrics’ can be installed ... ERROR -Installation failed. -See ‘/tmp/workdir/CRMetrics/old/CRMetrics.Rcheck/00install.out’ for details. -* DONE -Status: 1 ERROR, 1 NOTE - - - - - -``` -# crosstalkr - -
- -* Version: 1.0.5 -* GitHub: NA -* Source code: https://github.com/cran/crosstalkr -* Date/Publication: 2024-05-17 11:40:09 UTC -* Number of recursive dependencies: 164 - -Run `revdepcheck::cloud_details(, "crosstalkr")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/crosstalkr/new/crosstalkr.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘crosstalkr/DESCRIPTION’ ... OK -... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘ensembldb’ - -Package suggested but not available for checking: ‘EnsDb.Hsapiens.v86’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/crosstalkr/old/crosstalkr.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘crosstalkr/DESCRIPTION’ ... OK -... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘ensembldb’ - -Package suggested but not available for checking: ‘EnsDb.Hsapiens.v86’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - +* installing *source* package ‘CRMetrics’ ... +** package ‘CRMetrics’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘CRMetrics’ +* removing ‘/tmp/workdir/CRMetrics/old/CRMetrics.Rcheck/CRMetrics’ ``` @@ -1910,11 +1903,11 @@ Status: 1 ERROR
-* Version: 3.10.1 +* Version: 3.10.2 * GitHub: https://github.com/cdriveraus/ctsem * Source code: https://github.com/cran/ctsem -* Date/Publication: 2024-08-19 14:40:06 UTC -* Number of recursive dependencies: 158 +* Date/Publication: 2025-01-13 11:00:08 UTC +* Number of recursive dependencies: 160 Run `revdepcheck::cloud_details(, "ctsem")` for more info @@ -1937,16 +1930,16 @@ Run `revdepcheck::cloud_details(, "ctsem")` for more info ** package ‘ctsem’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ using C++17 -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/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.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, ... -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here -/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] 654 | return internal::first_aligned::alignment),Derived>(m); | ^~~~~~~~~ g++: fatal error: Killed signal terminated program cc1plus @@ -1964,16 +1957,16 @@ ERROR: compilation failed for package ‘ctsem’ ** package ‘ctsem’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ using C++17 -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/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.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, ... -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here -/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] 654 | return internal::first_aligned::alignment),Derived>(m); | ^~~~~~~~~ g++: fatal error: Killed signal terminated program cc1plus @@ -1984,369 +1977,397 @@ ERROR: compilation failed for package ‘ctsem’ ``` -# DepthProc +# dartR.base
-* Version: 2.1.5 -* GitHub: https://github.com/zzawadz/DepthProc -* Source code: https://github.com/cran/DepthProc -* Date/Publication: 2022-02-03 20:30:02 UTC -* Number of recursive dependencies: 134 +* Version: 0.98 +* GitHub: NA +* Source code: https://github.com/cran/dartR.base +* Date/Publication: 2024-09-19 13:20:02 UTC +* Number of recursive dependencies: 288 -Run `revdepcheck::cloud_details(, "DepthProc")` for more info +Run `revdepcheck::cloud_details(, "dartR.base")` for more info
-## In both - -* checking whether package ‘DepthProc’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/DepthProc/new/DepthProc.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘DepthProc’ ... -** package ‘DepthProc’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Depth.cpp -o Depth.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationEstimators.cpp -o LocationEstimators.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepth.cpp -o LocationScaleDepth.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepthCPP.cpp -o LocationScaleDepthCPP.o +* using log directory ‘/tmp/workdir/dartR.base/new/dartR.base.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.base/DESCRIPTION’ ... OK ... -installing to /tmp/workdir/DepthProc/new/DepthProc.Rcheck/00LOCK-DepthProc/00new/DepthProc/libs -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘DepthProc’ -* removing ‘/tmp/workdir/DepthProc/new/DepthProc.Rcheck/DepthProc’ +* this is package ‘dartR.base’ version ‘0.98’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘SNPassoc’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` ### CRAN ``` -* installing *source* package ‘DepthProc’ ... -** package ‘DepthProc’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Depth.cpp -o Depth.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationEstimators.cpp -o LocationEstimators.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepth.cpp -o LocationScaleDepth.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepthCPP.cpp -o LocationScaleDepthCPP.o +* using log directory ‘/tmp/workdir/dartR.base/old/dartR.base.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.base/DESCRIPTION’ ... OK ... -installing to /tmp/workdir/DepthProc/old/DepthProc.Rcheck/00LOCK-DepthProc/00new/DepthProc/libs -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘DepthProc’ -* removing ‘/tmp/workdir/DepthProc/old/DepthProc.Rcheck/DepthProc’ +* this is package ‘dartR.base’ version ‘0.98’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘SNPassoc’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` -# DR.SC +# dartR.captive
-* Version: 3.4 -* GitHub: https://github.com/feiyoung/DR.SC -* Source code: https://github.com/cran/DR.SC -* Date/Publication: 2024-03-19 08:40:02 UTC -* Number of recursive dependencies: 151 +* Version: 0.75 +* GitHub: NA +* Source code: https://github.com/cran/dartR.captive +* Date/Publication: 2023-11-27 17:10:09 UTC +* Number of recursive dependencies: 152 -Run `revdepcheck::cloud_details(, "DR.SC")` for more info +Run `revdepcheck::cloud_details(, "dartR.captive")` for more info
-## In both - -* checking whether package ‘DR.SC’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/DR.SC/new/DR.SC.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘DR.SC’ ... -** package ‘DR.SC’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++17 -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c getNB_fast.cpp -o getNB_fast.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c mt_paral_job.cpp -o mt_paral_job.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c mt_paral_job2.cpp -o mt_paral_job2.o +* using log directory ‘/tmp/workdir/dartR.captive/new/dartR.captive.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.captive/DESCRIPTION’ ... OK ... -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘DR.SC’ -* removing ‘/tmp/workdir/DR.SC/new/DR.SC.Rcheck/DR.SC’ +* this is package ‘dartR.captive’ version ‘0.75’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘dartR.base’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` ### CRAN ``` -* installing *source* package ‘DR.SC’ ... -** package ‘DR.SC’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++17 -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c getNB_fast.cpp -o getNB_fast.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c mt_paral_job.cpp -o mt_paral_job.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c mt_paral_job2.cpp -o mt_paral_job2.o +* using log directory ‘/tmp/workdir/dartR.captive/old/dartR.captive.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.captive/DESCRIPTION’ ... OK ... -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘DR.SC’ -* removing ‘/tmp/workdir/DR.SC/old/DR.SC.Rcheck/DR.SC’ +* this is package ‘dartR.captive’ version ‘0.75’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘dartR.base’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` -# easybgm +# dartR.popgen
-* Version: 0.1.2 -* GitHub: https://github.com/KarolineHuth/easybgm -* Source code: https://github.com/cran/easybgm -* Date/Publication: 2024-03-13 13:40:02 UTC +* Version: 1.0.0 +* GitHub: NA +* Source code: https://github.com/cran/dartR.popgen +* Date/Publication: 2024-06-27 23:20:04 UTC * Number of recursive dependencies: 175 -Run `revdepcheck::cloud_details(, "easybgm")` for more info +Run `revdepcheck::cloud_details(, "dartR.popgen")` for more info
-## In both - -* checking whether package ‘easybgm’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/easybgm/new/easybgm.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘easybgm’ ... -** package ‘easybgm’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘easybgm’ -* removing ‘/tmp/workdir/easybgm/new/easybgm.Rcheck/easybgm’ +* using log directory ‘/tmp/workdir/dartR.popgen/new/dartR.popgen.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.popgen/DESCRIPTION’ ... OK +... +* this is package ‘dartR.popgen’ version ‘1.0.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘dartR.base’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` ### CRAN ``` -* installing *source* package ‘easybgm’ ... -** package ‘easybgm’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘easybgm’ -* removing ‘/tmp/workdir/easybgm/old/easybgm.Rcheck/easybgm’ +* using log directory ‘/tmp/workdir/dartR.popgen/old/dartR.popgen.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.popgen/DESCRIPTION’ ... OK +... +* this is package ‘dartR.popgen’ version ‘1.0.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘dartR.base’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` -# EcoEnsemble +# dartR.sexlinked
-* Version: 1.1.0 -* GitHub: https://github.com/CefasRepRes/EcoEnsemble -* Source code: https://github.com/cran/EcoEnsemble -* Date/Publication: 2024-08-19 17:20:06 UTC -* Number of recursive dependencies: 91 +* Version: 1.0.5 +* GitHub: NA +* Source code: https://github.com/cran/dartR.sexlinked +* Date/Publication: 2024-06-24 15:40:02 UTC +* Number of recursive dependencies: 120 -Run `revdepcheck::cloud_details(, "EcoEnsemble")` for more info +Run `revdepcheck::cloud_details(, "dartR.sexlinked")` for more info
-## In both - -* checking whether package ‘EcoEnsemble’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘EcoEnsemble’ ... -** package ‘EcoEnsemble’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++17 +* using log directory ‘/tmp/workdir/dartR.sexlinked/new/dartR.sexlinked.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.sexlinked/DESCRIPTION’ ... OK +... +* this is package ‘dartR.sexlinked’ version ‘1.0.5’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘dartR.base’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o -In file included from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ensemble_model_hierarchical_namespace::model_ensemble_model_hierarchical; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here -/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ensemble_model_hierarchical.o] Error 1 -ERROR: compilation failed for package ‘EcoEnsemble’ -* removing ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/EcoEnsemble’ ``` ### CRAN ``` -* installing *source* package ‘EcoEnsemble’ ... -** package ‘EcoEnsemble’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++17 +* using log directory ‘/tmp/workdir/dartR.sexlinked/old/dartR.sexlinked.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.sexlinked/DESCRIPTION’ ... OK +... +* this is package ‘dartR.sexlinked’ version ‘1.0.5’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘dartR.base’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o -In file included from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ensemble_model_hierarchical_namespace::model_ensemble_model_hierarchical; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here -/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ensemble_model_hierarchical.o] Error 1 -ERROR: compilation failed for package ‘EcoEnsemble’ -* removing ‘/tmp/workdir/EcoEnsemble/old/EcoEnsemble.Rcheck/EcoEnsemble’ ``` -# ecolottery +# dartR.sim
-* Version: 1.0.0 -* GitHub: https://github.com/frmunoz/ecolottery -* Source code: https://github.com/cran/ecolottery -* Date/Publication: 2017-07-03 11:01:29 UTC -* Number of recursive dependencies: 88 +* Version: 0.70 +* GitHub: https://github.com/green-striped-gecko/dartR.sim +* Source code: https://github.com/cran/dartR.sim +* Date/Publication: 2023-11-20 19:30:02 UTC +* Number of recursive dependencies: 133 -Run `revdepcheck::cloud_details(, "ecolottery")` for more info +Run `revdepcheck::cloud_details(, "dartR.sim")` for more info
-## In both - -* checking whether package ‘ecolottery’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘ecolottery’ ... -** package ‘ecolottery’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘ecolottery’ -* removing ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/ecolottery’ +* using log directory ‘/tmp/workdir/dartR.sim/new/dartR.sim.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.sim/DESCRIPTION’ ... OK +... +* this is package ‘dartR.sim’ version ‘0.70’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘dartR.base’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` ### CRAN ``` -* installing *source* package ‘ecolottery’ ... -** package ‘ecolottery’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘ecolottery’ -* removing ‘/tmp/workdir/ecolottery/old/ecolottery.Rcheck/ecolottery’ +* using log directory ‘/tmp/workdir/dartR.sim/old/dartR.sim.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dartR.sim/DESCRIPTION’ ... OK +... +* this is package ‘dartR.sim’ version ‘0.70’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘dartR.base’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` -# EMAS +# dartR.spatial
-* Version: 0.2.2 +* Version: 0.78 * GitHub: NA -* Source code: https://github.com/cran/EMAS -* Date/Publication: 2022-08-11 13:50:07 UTC -* Number of recursive dependencies: 186 +* Source code: https://github.com/cran/dartR.spatial +* Date/Publication: 2023-11-15 00:50:02 UTC +* Number of recursive dependencies: 168 -Run `revdepcheck::cloud_details(, "EMAS")` for more info +Run `revdepcheck::cloud_details(, "dartR.spatial")` for more info
@@ -2355,22 +2376,22 @@ Run `revdepcheck::cloud_details(, "EMAS")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/EMAS/new/EMAS.Rcheck’ +* using log directory ‘/tmp/workdir/dartR.spatial/new/dartR.spatial.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘EMAS/DESCRIPTION’ ... OK +* checking for file ‘dartR.spatial/DESCRIPTION’ ... OK ... +* this is package ‘dartR.spatial’ version ‘0.78’ +* package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Packages required but not available: - 'minfi', 'IlluminaHumanMethylationEPICanno.ilm10b4.hg19', - 'IlluminaHumanMethylation450kanno.ilmn12.hg19' +Package required but not available: ‘dartR.base’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -2385,22 +2406,22 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/EMAS/old/EMAS.Rcheck’ +* using log directory ‘/tmp/workdir/dartR.spatial/old/dartR.spatial.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘EMAS/DESCRIPTION’ ... OK +* checking for file ‘dartR.spatial/DESCRIPTION’ ... OK ... +* this is package ‘dartR.spatial’ version ‘0.78’ +* package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Packages required but not available: - 'minfi', 'IlluminaHumanMethylationEPICanno.ilm10b4.hg19', - 'IlluminaHumanMethylation450kanno.ilmn12.hg19' +Package required but not available: ‘dartR.base’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -2412,26 +2433,26 @@ Status: 1 ERROR ``` -# EpiEstim +# DepthProc
-* Version: 2.2-4 -* GitHub: https://github.com/mrc-ide/EpiEstim -* Source code: https://github.com/cran/EpiEstim -* Date/Publication: 2021-01-07 16:20:10 UTC -* Number of recursive dependencies: 91 +* Version: 2.1.5 +* GitHub: https://github.com/zzawadz/DepthProc +* Source code: https://github.com/cran/DepthProc +* Date/Publication: 2022-02-03 20:30:02 UTC +* Number of recursive dependencies: 133 -Run `revdepcheck::cloud_details(, "EpiEstim")` for more info +Run `revdepcheck::cloud_details(, "DepthProc")` for more info
## In both -* checking whether package ‘EpiEstim’ can be installed ... ERROR +* checking whether package ‘DepthProc’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/EpiEstim/new/EpiEstim.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/DepthProc/new/DepthProc.Rcheck/00install.out’ for details. ``` ## Installation @@ -2439,125 +2460,68 @@ Run `revdepcheck::cloud_details(, "EpiEstim")` for more info ### Devel ``` -* installing *source* package ‘EpiEstim’ ... -** package ‘EpiEstim’ successfully unpacked and MD5 sums checked +* installing *source* package ‘DepthProc’ ... +** package ‘DepthProc’ successfully unpacked and MD5 sums checked ** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Depth.cpp -o Depth.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationEstimators.cpp -o LocationEstimators.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepth.cpp -o LocationScaleDepth.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepthCPP.cpp -o LocationScaleDepthCPP.o +... +installing to /tmp/workdir/DepthProc/new/DepthProc.Rcheck/00LOCK-DepthProc/00new/DepthProc/libs ** R ** data ** inst ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Execution halted -ERROR: lazy loading failed for package ‘EpiEstim’ -* removing ‘/tmp/workdir/EpiEstim/new/EpiEstim.Rcheck/EpiEstim’ +ERROR: lazy loading failed for package ‘DepthProc’ +* removing ‘/tmp/workdir/DepthProc/new/DepthProc.Rcheck/DepthProc’ ``` ### CRAN ``` -* installing *source* package ‘EpiEstim’ ... -** package ‘EpiEstim’ successfully unpacked and MD5 sums checked +* installing *source* package ‘DepthProc’ ... +** package ‘DepthProc’ successfully unpacked and MD5 sums checked ** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Depth.cpp -o Depth.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationEstimators.cpp -o LocationEstimators.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepth.cpp -o LocationScaleDepth.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepthCPP.cpp -o LocationScaleDepthCPP.o +... +installing to /tmp/workdir/DepthProc/old/DepthProc.Rcheck/00LOCK-DepthProc/00new/DepthProc/libs ** R ** data ** inst ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘EpiEstim’ -* removing ‘/tmp/workdir/EpiEstim/old/EpiEstim.Rcheck/EpiEstim’ - - -``` -# evolqg - -
- -* Version: 0.3-4 -* GitHub: https://github.com/lem-usp/evolqg -* Source code: https://github.com/cran/evolqg -* Date/Publication: 2023-12-05 15:20:12 UTC -* Number of recursive dependencies: 111 - -Run `revdepcheck::cloud_details(, "evolqg")` for more info - -
- -## In both - -* checking whether package ‘evolqg’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/evolqg/new/evolqg.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘evolqg’ ... -** package ‘evolqg’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c fast_RS.cpp -o fast_RS.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o evolqg.so RcppExports.o fast_RS.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/evolqg/new/evolqg.Rcheck/00LOCK-evolqg/00new/evolqg/libs -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘evolqg’ -* removing ‘/tmp/workdir/evolqg/new/evolqg.Rcheck/evolqg’ - - -``` -### CRAN - -``` -* installing *source* package ‘evolqg’ ... -** package ‘evolqg’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c fast_RS.cpp -o fast_RS.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o evolqg.so RcppExports.o fast_RS.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/evolqg/old/evolqg.Rcheck/00LOCK-evolqg/00new/evolqg/libs -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Execution halted -ERROR: lazy loading failed for package ‘evolqg’ -* removing ‘/tmp/workdir/evolqg/old/evolqg.Rcheck/evolqg’ +ERROR: lazy loading failed for package ‘DepthProc’ +* removing ‘/tmp/workdir/DepthProc/old/DepthProc.Rcheck/DepthProc’ ``` -# EWSmethods +# DFD
-* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/EWSmethods -* Number of recursive dependencies: 140 +* Version: 0.2.0 +* GitHub: https://github.com/MohmedSoudy/DFD +* Source code: https://github.com/cran/DFD +* Date/Publication: 2024-08-28 18:20:02 UTC +* Number of recursive dependencies: 207 -Run `revdepcheck::cloud_details(, "EWSmethods")` for more info +Run `revdepcheck::cloud_details(, "DFD")` for more info
@@ -2566,7 +2530,27 @@ Run `revdepcheck::cloud_details(, "EWSmethods")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/DFD/new/DFD.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘DFD/DESCRIPTION’ ... OK +... +* this is package ‘DFD’ version ‘0.2.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘signatureSearch’ +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -2576,23 +2560,44 @@ Run `revdepcheck::cloud_details(, "EWSmethods")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/DFD/old/DFD.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘DFD/DESCRIPTION’ ... OK +... +* this is package ‘DFD’ version ‘0.2.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘signatureSearch’ +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# fmx +# dMrs
-* Version: NA +* Version: 1.0.0 * GitHub: NA -* Source code: https://github.com/cran/fmx -* Number of recursive dependencies: 93 +* Source code: https://github.com/cran/dMrs +* Date/Publication: 2025-01-21 15:40:05 UTC +* Number of recursive dependencies: 137 -Run `revdepcheck::cloud_details(, "fmx")` for more info +Run `revdepcheck::cloud_details(, "dMrs")` for more info
@@ -2601,7 +2606,27 @@ Run `revdepcheck::cloud_details(, "fmx")` for more info ### Devel ``` - +* using log directory ‘/tmp/workdir/dMrs/new/dMrs.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dMrs/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... NONE +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘dMrs.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK @@ -2611,33 +2636,53 @@ Run `revdepcheck::cloud_details(, "fmx")` for more info ### CRAN ``` - +* using log directory ‘/tmp/workdir/dMrs/old/dMrs.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘dMrs/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... NONE +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘dMrs.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK ``` -# ForecastComb +# DR.SC
-* Version: 1.3.1 -* GitHub: https://github.com/ceweiss/ForecastComb -* Source code: https://github.com/cran/ForecastComb -* Date/Publication: 2018-08-07 13:50:08 UTC -* Number of recursive dependencies: 74 +* Version: 3.4 +* GitHub: https://github.com/feiyoung/DR.SC +* Source code: https://github.com/cran/DR.SC +* Date/Publication: 2024-03-19 08:40:02 UTC +* Number of recursive dependencies: 151 -Run `revdepcheck::cloud_details(, "ForecastComb")` for more info +Run `revdepcheck::cloud_details(, "DR.SC")` for more info
## In both -* checking whether package ‘ForecastComb’ can be installed ... ERROR +* checking whether package ‘DR.SC’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/ForecastComb/new/ForecastComb.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/DR.SC/new/DR.SC.Rcheck/00install.out’ for details. ``` ## Installation @@ -2645,52 +2690,68 @@ Run `revdepcheck::cloud_details(, "ForecastComb")` for more info ### Devel ``` -* installing *source* package ‘ForecastComb’ ... -** package ‘ForecastComb’ successfully unpacked and MD5 sums checked +* installing *source* package ‘DR.SC’ ... +** package ‘DR.SC’ successfully unpacked and MD5 sums checked ** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c getNB_fast.cpp -o getNB_fast.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c mt_paral_job.cpp -o mt_paral_job.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c mt_paral_job2.cpp -o mt_paral_job2.o +... ** R ** data -*** moving datasets to lazyload DB +** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘ForecastComb’ -* removing ‘/tmp/workdir/ForecastComb/new/ForecastComb.Rcheck/ForecastComb’ +ERROR: lazy loading failed for package ‘DR.SC’ +* removing ‘/tmp/workdir/DR.SC/new/DR.SC.Rcheck/DR.SC’ ``` ### CRAN ``` -* installing *source* package ‘ForecastComb’ ... -** package ‘ForecastComb’ successfully unpacked and MD5 sums checked +* installing *source* package ‘DR.SC’ ... +** package ‘DR.SC’ successfully unpacked and MD5 sums checked ** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c getNB_fast.cpp -o getNB_fast.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c mt_paral_job.cpp -o mt_paral_job.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -DARMA_64BIT_WORD -fpic -g -O2 -c mt_paral_job2.cpp -o mt_paral_job2.o +... ** R ** data -*** moving datasets to lazyload DB +** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘ForecastComb’ -* removing ‘/tmp/workdir/ForecastComb/old/ForecastComb.Rcheck/ForecastComb’ +ERROR: lazy loading failed for package ‘DR.SC’ +* removing ‘/tmp/workdir/DR.SC/old/DR.SC.Rcheck/DR.SC’ ``` -# GALLO +# dscoreMSM
-* Version: 1.5 +* Version: 0.1.0 * GitHub: NA -* Source code: https://github.com/cran/GALLO -* Date/Publication: 2024-06-04 15:30:20 UTC -* Number of recursive dependencies: 142 +* Source code: https://github.com/cran/dscoreMSM +* Date/Publication: 2024-12-13 16:40:02 UTC +* Number of recursive dependencies: 121 -Run `revdepcheck::cloud_details(, "GALLO")` for more info +Run `revdepcheck::cloud_details(, "dscoreMSM")` for more info
@@ -2699,27 +2760,27 @@ Run `revdepcheck::cloud_details(, "GALLO")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/GALLO/new/GALLO.Rcheck’ +* using log directory ‘/tmp/workdir/dscoreMSM/new/dscoreMSM.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘GALLO/DESCRIPTION’ ... OK +* checking for file ‘dscoreMSM/DESCRIPTION’ ... OK ... -* this is package ‘GALLO’ version ‘1.5’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘rtracklayer’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘dscoreMSM.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK * DONE -Status: 1 ERROR +Status: OK @@ -2729,44 +2790,43 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/GALLO/old/GALLO.Rcheck’ +* using log directory ‘/tmp/workdir/dscoreMSM/old/dscoreMSM.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘GALLO/DESCRIPTION’ ... OK +* checking for file ‘dscoreMSM/DESCRIPTION’ ... OK ... -* this is package ‘GALLO’ version ‘1.5’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘rtracklayer’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘dscoreMSM.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK * DONE -Status: 1 ERROR +Status: OK ``` -# gap +# DynForest
-* Version: 1.6 -* GitHub: https://github.com/jinghuazhao/R -* Source code: https://github.com/cran/gap -* Date/Publication: 2024-08-27 04:40:06 UTC -* Number of recursive dependencies: 199 +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/DynForest +* Number of recursive dependencies: 143 -Run `revdepcheck::cloud_details(, "gap")` for more info +Run `revdepcheck::cloud_details(, "DynForest")` for more info
@@ -2775,27 +2835,7 @@ Run `revdepcheck::cloud_details(, "gap")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/gap/new/gap.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘gap/DESCRIPTION’ ... OK -... ---- failed re-building ‘jss.Rnw’ - -SUMMARY: processing the following file failed: - ‘jss.Rnw’ - -Error: Vignette re-building failed. -Execution halted -* DONE -Status: 4 NOTEs @@ -2805,59 +2845,33 @@ Status: 4 NOTEs ### CRAN ``` -* using log directory ‘/tmp/workdir/gap/old/gap.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘gap/DESCRIPTION’ ... OK -... ---- failed re-building ‘jss.Rnw’ -SUMMARY: processing the following file failed: - ‘jss.Rnw’ - -Error: Vignette re-building failed. -Execution halted - -* DONE -Status: 4 NOTEs ``` -# gapfill +# easybgm
-* Version: 0.9.6-1 -* GitHub: https://github.com/florafauna/gapfill -* Source code: https://github.com/cran/gapfill -* Date/Publication: 2021-02-12 10:10:05 UTC -* Number of recursive dependencies: 71 +* Version: 0.2.1 +* GitHub: https://github.com/KarolineHuth/easybgm +* Source code: https://github.com/cran/easybgm +* Date/Publication: 2024-10-17 08:30:02 UTC +* Number of recursive dependencies: 180 -Run `revdepcheck::cloud_details(, "gapfill")` for more info +Run `revdepcheck::cloud_details(, "easybgm")` for more info
## In both -* checking whether package ‘gapfill’ can be installed ... ERROR +* checking whether package ‘easybgm’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/gapfill/new/gapfill.Rcheck/00install.out’ for details. - ``` - -* checking package dependencies ... NOTE - ``` - Packages which this enhances but not available for checking: - 'raster', 'doParallel', 'doMPI' + See ‘/tmp/workdir/easybgm/new/easybgm.Rcheck/00install.out’ for details. ``` ## Installation @@ -2865,229 +2879,195 @@ Run `revdepcheck::cloud_details(, "gapfill")` for more info ### Devel ``` -* installing *source* package ‘gapfill’ ... -** package ‘gapfill’ successfully unpacked and MD5 sums checked +* installing *source* package ‘easybgm’ ... +** package ‘easybgm’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c gapfill.cpp -o gapfill.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o gapfill.so RcppExports.o gapfill.o -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/gapfill/new/gapfill.Rcheck/00LOCK-gapfill/00new/gapfill/libs ** R -... -** data -*** moving datasets to lazyload DB -** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘gapfill’ -* removing ‘/tmp/workdir/gapfill/new/gapfill.Rcheck/gapfill’ +ERROR: lazy loading failed for package ‘easybgm’ +* removing ‘/tmp/workdir/easybgm/new/easybgm.Rcheck/easybgm’ ``` ### CRAN ``` -* installing *source* package ‘gapfill’ ... -** package ‘gapfill’ successfully unpacked and MD5 sums checked +* installing *source* package ‘easybgm’ ... +** package ‘easybgm’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c gapfill.cpp -o gapfill.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o gapfill.so RcppExports.o gapfill.o -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/gapfill/old/gapfill.Rcheck/00LOCK-gapfill/00new/gapfill/libs ** R -... -** data -*** moving datasets to lazyload DB -** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘gapfill’ -* removing ‘/tmp/workdir/gapfill/old/gapfill.Rcheck/gapfill’ +ERROR: lazy loading failed for package ‘easybgm’ +* removing ‘/tmp/workdir/easybgm/old/easybgm.Rcheck/easybgm’ ``` -# geneHapR +# EcoEnsemble
-* Version: 1.2.4 -* GitHub: NA -* Source code: https://github.com/cran/geneHapR -* Date/Publication: 2024-03-01 14:32:40 UTC -* Number of recursive dependencies: 180 +* Version: 1.1.0 +* GitHub: https://github.com/CefasRepRes/EcoEnsemble +* Source code: https://github.com/cran/EcoEnsemble +* Date/Publication: 2024-08-19 17:20:06 UTC +* Number of recursive dependencies: 90 -Run `revdepcheck::cloud_details(, "geneHapR")` for more info +Run `revdepcheck::cloud_details(, "EcoEnsemble")` for more info
-## Error before installation +## In both -### Devel +* checking whether package ‘EcoEnsemble’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/00install.out’ for details. + ``` -``` -* using log directory ‘/tmp/workdir/geneHapR/new/geneHapR.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘geneHapR/DESCRIPTION’ ... OK -... -* this is package ‘geneHapR’ version ‘1.2.4’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘rtracklayer’ +## Installation -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR +### Devel +``` +* installing *source* package ‘EcoEnsemble’ ... +** package ‘EcoEnsemble’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ensemble_model_hierarchical_namespace::model_ensemble_model_hierarchical; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ensemble_model_hierarchical.o] Error 1 +ERROR: compilation failed for package ‘EcoEnsemble’ +* removing ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/EcoEnsemble’ ``` ### CRAN ``` -* using log directory ‘/tmp/workdir/geneHapR/old/geneHapR.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘geneHapR/DESCRIPTION’ ... OK -... -* this is package ‘geneHapR’ version ‘1.2.4’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘rtracklayer’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - +* installing *source* package ‘EcoEnsemble’ ... +** package ‘EcoEnsemble’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ensemble_model_hierarchical_namespace::model_ensemble_model_hierarchical; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ensemble_model_hierarchical.o] Error 1 +ERROR: compilation failed for package ‘EcoEnsemble’ +* removing ‘/tmp/workdir/EcoEnsemble/old/EcoEnsemble.Rcheck/EcoEnsemble’ ``` -# GeneSelectR +# ecolottery
-* Version: 1.0.1 -* GitHub: https://github.com/dzhakparov/GeneSelectR -* Source code: https://github.com/cran/GeneSelectR -* Date/Publication: 2024-02-03 14:00:05 UTC -* Number of recursive dependencies: 191 +* Version: 1.0.0 +* GitHub: https://github.com/frmunoz/ecolottery +* Source code: https://github.com/cran/ecolottery +* Date/Publication: 2017-07-03 11:01:29 UTC +* Number of recursive dependencies: 87 -Run `revdepcheck::cloud_details(, "GeneSelectR")` for more info +Run `revdepcheck::cloud_details(, "ecolottery")` for more info
-## Error before installation +## In both + +* checking whether package ‘ecolottery’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/00install.out’ for details. + ``` + +## Installation ### Devel ``` -* using log directory ‘/tmp/workdir/GeneSelectR/new/GeneSelectR.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘GeneSelectR/DESCRIPTION’ ... OK -... -+ build_vignettes = FALSE) - - When sourcing ‘example.R’: -Error: there is no package called ‘devtools’ +* installing *source* package ‘ecolottery’ ... +** package ‘ecolottery’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted - - ‘example.Rmd’ using ‘UTF-8’... failed -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 WARNING, 1 NOTE - - - +ERROR: lazy loading failed for package ‘ecolottery’ +* removing ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/ecolottery’ ``` ### CRAN ``` -* using log directory ‘/tmp/workdir/GeneSelectR/old/GeneSelectR.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘GeneSelectR/DESCRIPTION’ ... OK -... -+ build_vignettes = FALSE) - - When sourcing ‘example.R’: -Error: there is no package called ‘devtools’ +* installing *source* package ‘ecolottery’ ... +** package ‘ecolottery’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted - - ‘example.Rmd’ using ‘UTF-8’... failed -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 WARNING, 1 NOTE - - - +ERROR: lazy loading failed for package ‘ecolottery’ +* removing ‘/tmp/workdir/ecolottery/old/ecolottery.Rcheck/ecolottery’ ``` -# GeomComb +# EpiEstim
-* Version: 1.0 -* GitHub: https://github.com/ceweiss/GeomComb -* Source code: https://github.com/cran/GeomComb -* Date/Publication: 2016-11-27 16:02:26 -* Number of recursive dependencies: 75 +* Version: 2.2-4 +* GitHub: https://github.com/mrc-ide/EpiEstim +* Source code: https://github.com/cran/EpiEstim +* Date/Publication: 2021-01-07 16:20:10 UTC +* Number of recursive dependencies: 90 -Run `revdepcheck::cloud_details(, "GeomComb")` for more info +Run `revdepcheck::cloud_details(, "EpiEstim")` for more info
## In both -* checking whether package ‘GeomComb’ can be installed ... ERROR +* checking whether package ‘EpiEstim’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/GeomComb/new/GeomComb.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/EpiEstim/new/EpiEstim.Rcheck/00install.out’ for details. ``` ## Installation @@ -3095,92 +3075,61 @@ Run `revdepcheck::cloud_details(, "GeomComb")` for more info ### Devel ``` -* installing *source* package ‘GeomComb’ ... -** package ‘GeomComb’ successfully unpacked and MD5 sums checked +* installing *source* package ‘EpiEstim’ ... +** package ‘EpiEstim’ successfully unpacked and MD5 sums checked ** using staged installation ** R +** data +** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘GeomComb’ -* removing ‘/tmp/workdir/GeomComb/new/GeomComb.Rcheck/GeomComb’ +ERROR: lazy loading failed for package ‘EpiEstim’ +* removing ‘/tmp/workdir/EpiEstim/new/EpiEstim.Rcheck/EpiEstim’ ``` ### CRAN ``` -* installing *source* package ‘GeomComb’ ... -** package ‘GeomComb’ successfully unpacked and MD5 sums checked +* installing *source* package ‘EpiEstim’ ... +** package ‘EpiEstim’ successfully unpacked and MD5 sums checked ** using staged installation ** R +** data +** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘GeomComb’ -* removing ‘/tmp/workdir/GeomComb/old/GeomComb.Rcheck/GeomComb’ - - -``` -# geomorph - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/geomorph -* Number of recursive dependencies: 72 - -Run `revdepcheck::cloud_details(, "geomorph")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - +ERROR: lazy loading failed for package ‘EpiEstim’ +* removing ‘/tmp/workdir/EpiEstim/old/EpiEstim.Rcheck/EpiEstim’ ``` -# gJLS2 +# evolqg
-* Version: 0.2.0 -* GitHub: NA -* Source code: https://github.com/cran/gJLS2 -* Date/Publication: 2021-09-30 09:00:05 UTC -* Number of recursive dependencies: 45 +* Version: 0.3-4 +* GitHub: https://github.com/lem-usp/evolqg +* Source code: https://github.com/cran/evolqg +* Date/Publication: 2023-12-05 15:20:12 UTC +* Number of recursive dependencies: 110 -Run `revdepcheck::cloud_details(, "gJLS2")` for more info +Run `revdepcheck::cloud_details(, "evolqg")` for more info
## In both -* checking whether package ‘gJLS2’ can be installed ... ERROR +* checking whether package ‘evolqg’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/gJLS2/new/gJLS2.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/evolqg/new/evolqg.Rcheck/00install.out’ for details. ``` ## Installation @@ -3188,118 +3137,99 @@ Run `revdepcheck::cloud_details(, "gJLS2")` for more info ### Devel ``` -* installing *source* package ‘gJLS2’ ... -** package ‘gJLS2’ successfully unpacked and MD5 sums checked +* installing *source* package ‘evolqg’ ... +** package ‘evolqg’ successfully unpacked and MD5 sums checked ** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c fast_RS.cpp -o fast_RS.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o evolqg.so RcppExports.o fast_RS.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/evolqg/new/evolqg.Rcheck/00LOCK-evolqg/00new/evolqg/libs ** R ** data -*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘gJLS2’ -* removing ‘/tmp/workdir/gJLS2/new/gJLS2.Rcheck/gJLS2’ +ERROR: lazy loading failed for package ‘evolqg’ +* removing ‘/tmp/workdir/evolqg/new/evolqg.Rcheck/evolqg’ ``` ### CRAN ``` -* installing *source* package ‘gJLS2’ ... -** package ‘gJLS2’ successfully unpacked and MD5 sums checked +* installing *source* package ‘evolqg’ ... +** package ‘evolqg’ successfully unpacked and MD5 sums checked ** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c fast_RS.cpp -o fast_RS.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o evolqg.so RcppExports.o fast_RS.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/evolqg/old/evolqg.Rcheck/00LOCK-evolqg/00new/evolqg/libs ** R ** data -*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘gJLS2’ -* removing ‘/tmp/workdir/gJLS2/old/gJLS2.Rcheck/gJLS2’ +ERROR: lazy loading failed for package ‘evolqg’ +* removing ‘/tmp/workdir/evolqg/old/evolqg.Rcheck/evolqg’ ``` -# hettx +# EWSmethods
-* Version: 0.1.3 -* GitHub: https://github.com/bfifield/hettx -* Source code: https://github.com/cran/hettx -* Date/Publication: 2023-08-19 22:22:34 UTC -* Number of recursive dependencies: 85 +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/EWSmethods +* Number of recursive dependencies: 139 -Run `revdepcheck::cloud_details(, "hettx")` for more info +Run `revdepcheck::cloud_details(, "EWSmethods")` for more info
-## In both - -* checking whether package ‘hettx’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/hettx/new/hettx.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘hettx’ ... -** package ‘hettx’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘hettx’ -* removing ‘/tmp/workdir/hettx/new/hettx.Rcheck/hettx’ + + + + ``` ### CRAN ``` -* installing *source* package ‘hettx’ ... -** package ‘hettx’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘hettx’ -* removing ‘/tmp/workdir/hettx/old/hettx.Rcheck/hettx’ + + + + ``` -# Hmisc +# flexrsurv
-* Version: 5.1-3 +* Version: 2.0.18 * GitHub: NA -* Source code: https://github.com/cran/Hmisc -* Date/Publication: 2024-05-28 07:10:02 UTC -* Number of recursive dependencies: 170 +* Source code: https://github.com/cran/flexrsurv +* Date/Publication: 2024-02-09 16:10:02 UTC +* Number of recursive dependencies: 129 -Run `revdepcheck::cloud_details(, "Hmisc")` for more info +Run `revdepcheck::cloud_details(, "flexrsurv")` for more info
@@ -3308,16 +3238,16 @@ Run `revdepcheck::cloud_details(, "Hmisc")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/Hmisc/new/Hmisc.Rcheck’ +* using log directory ‘/tmp/workdir/flexrsurv/new/flexrsurv.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘Hmisc/DESCRIPTION’ ... OK +* checking for file ‘flexrsurv/DESCRIPTION’ ... OK ... * checking for missing documentation entries ... OK * checking for code/documentation mismatches ... OK @@ -3328,7 +3258,7 @@ Run `revdepcheck::cloud_details(, "Hmisc")` for more info * checking compiled code ... OK * checking examples ... OK * DONE -Status: 4 NOTEs +Status: OK @@ -3338,16 +3268,16 @@ Status: 4 NOTEs ### CRAN ``` -* using log directory ‘/tmp/workdir/Hmisc/old/Hmisc.Rcheck’ +* using log directory ‘/tmp/workdir/flexrsurv/old/flexrsurv.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘Hmisc/DESCRIPTION’ ... OK +* checking for file ‘flexrsurv/DESCRIPTION’ ... OK ... * checking for missing documentation entries ... OK * checking for code/documentation mismatches ... OK @@ -3358,97 +3288,68 @@ Status: 4 NOTEs * checking compiled code ... OK * checking examples ... OK * DONE -Status: 4 NOTEs +Status: OK ``` -# Hmsc +# fmx
-* Version: 3.0-13 -* GitHub: https://github.com/hmsc-r/HMSC -* Source code: https://github.com/cran/Hmsc -* Date/Publication: 2022-08-11 14:10:14 UTC -* Number of recursive dependencies: 76 +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/fmx +* Number of recursive dependencies: 93 -Run `revdepcheck::cloud_details(, "Hmsc")` for more info +Run `revdepcheck::cloud_details(, "fmx")` for more info
-## In both - -* checking whether package ‘Hmsc’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/Hmsc/new/Hmsc.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘Hmsc’ ... -** package ‘Hmsc’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘Hmsc’ -* removing ‘/tmp/workdir/Hmsc/new/Hmsc.Rcheck/Hmsc’ + + + + ``` ### CRAN ``` -* installing *source* package ‘Hmsc’ ... -** package ‘Hmsc’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘Hmsc’ -* removing ‘/tmp/workdir/Hmsc/old/Hmsc.Rcheck/Hmsc’ + + + + ``` -# iClusterVB +# ForecastComb
-* Version: 0.1.2 -* GitHub: https://github.com/AbdalkarimA/iClusterVB -* Source code: https://github.com/cran/iClusterVB -* Date/Publication: 2024-08-20 19:10:02 UTC -* Number of recursive dependencies: 127 +* Version: 1.3.1 +* GitHub: https://github.com/ceweiss/ForecastComb +* Source code: https://github.com/cran/ForecastComb +* Date/Publication: 2018-08-07 13:50:08 UTC +* Number of recursive dependencies: 73 -Run `revdepcheck::cloud_details(, "iClusterVB")` for more info +Run `revdepcheck::cloud_details(, "ForecastComb")` for more info
## In both -* checking whether package ‘iClusterVB’ can be installed ... ERROR +* checking whether package ‘ForecastComb’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/iClusterVB/new/iClusterVB.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/ForecastComb/new/ForecastComb.Rcheck/00install.out’ for details. ``` ## Installation @@ -3456,66 +3357,1211 @@ Run `revdepcheck::cloud_details(, "iClusterVB")` for more info ### Devel ``` -* installing *source* package ‘iClusterVB’ ... -** package ‘iClusterVB’ successfully unpacked and MD5 sums checked +* installing *source* package ‘ForecastComb’ ... +** package ‘ForecastComb’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c CAVI_algorithms.cpp -o CAVI_algorithms.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o iClusterVB.so CAVI_algorithms.o RcppExports.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/iClusterVB/new/iClusterVB.Rcheck/00LOCK-iClusterVB/00new/iClusterVB/libs ** R -... ** data *** moving datasets to lazyload DB -** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘iClusterVB’ -* removing ‘/tmp/workdir/iClusterVB/new/iClusterVB.Rcheck/iClusterVB’ +ERROR: lazy loading failed for package ‘ForecastComb’ +* removing ‘/tmp/workdir/ForecastComb/new/ForecastComb.Rcheck/ForecastComb’ ``` ### CRAN ``` -* installing *source* package ‘iClusterVB’ ... -** package ‘iClusterVB’ successfully unpacked and MD5 sums checked +* installing *source* package ‘ForecastComb’ ... +** package ‘ForecastComb’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c CAVI_algorithms.cpp -o CAVI_algorithms.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o iClusterVB.so CAVI_algorithms.o RcppExports.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/iClusterVB/old/iClusterVB.Rcheck/00LOCK-iClusterVB/00new/iClusterVB/libs ** R -... ** data *** moving datasets to lazyload DB -** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘iClusterVB’ -* removing ‘/tmp/workdir/iClusterVB/old/iClusterVB.Rcheck/iClusterVB’ +ERROR: lazy loading failed for package ‘ForecastComb’ +* removing ‘/tmp/workdir/ForecastComb/old/ForecastComb.Rcheck/ForecastComb’ ``` -# inventorize +# gap
-* Version: 1.1.1 -* GitHub: NA -* Source code: https://github.com/cran/inventorize -* Date/Publication: 2022-05-31 22:20:09 UTC -* Number of recursive dependencies: 71 +* Version: 1.6 +* GitHub: https://github.com/jinghuazhao/R +* Source code: https://github.com/cran/gap +* Date/Publication: 2024-08-27 04:40:06 UTC +* Number of recursive dependencies: 177 + +Run `revdepcheck::cloud_details(, "gap")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/gap/new/gap.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘gap/DESCRIPTION’ ... OK +... +--- failed re-building ‘jss.Rnw’ + +SUMMARY: processing the following file failed: + ‘jss.Rnw’ + +Error: Vignette re-building failed. +Execution halted + +* DONE +Status: 4 NOTEs + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/gap/old/gap.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘gap/DESCRIPTION’ ... OK +... +--- failed re-building ‘jss.Rnw’ + +SUMMARY: processing the following file failed: + ‘jss.Rnw’ + +Error: Vignette re-building failed. +Execution halted + +* DONE +Status: 4 NOTEs + + + + + +``` +# gapfill + +
+ +* Version: 0.9.6-1 +* GitHub: https://github.com/florafauna/gapfill +* Source code: https://github.com/cran/gapfill +* Date/Publication: 2021-02-12 10:10:05 UTC +* Number of recursive dependencies: 70 + +Run `revdepcheck::cloud_details(, "gapfill")` for more info + +
+ +## In both + +* checking whether package ‘gapfill’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/gapfill/new/gapfill.Rcheck/00install.out’ for details. + ``` + +* checking package dependencies ... NOTE + ``` + Packages which this enhances but not available for checking: + 'raster', 'doParallel', 'doMPI' + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘gapfill’ ... +** package ‘gapfill’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c gapfill.cpp -o gapfill.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o gapfill.so RcppExports.o gapfill.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/gapfill/new/gapfill.Rcheck/00LOCK-gapfill/00new/gapfill/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘gapfill’ +* removing ‘/tmp/workdir/gapfill/new/gapfill.Rcheck/gapfill’ + + +``` +### CRAN + +``` +* installing *source* package ‘gapfill’ ... +** package ‘gapfill’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c gapfill.cpp -o gapfill.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o gapfill.so RcppExports.o gapfill.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/gapfill/old/gapfill.Rcheck/00LOCK-gapfill/00new/gapfill/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘gapfill’ +* removing ‘/tmp/workdir/gapfill/old/gapfill.Rcheck/gapfill’ + + +``` +# genekitr + +
+ +* Version: 1.2.8 +* GitHub: https://github.com/GangLiLab/genekitr +* Source code: https://github.com/cran/genekitr +* Date/Publication: 2024-09-06 13:00:06 UTC +* Number of recursive dependencies: 199 + +Run `revdepcheck::cloud_details(, "genekitr")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/genekitr/new/genekitr.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘genekitr/DESCRIPTION’ ... OK +... +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +Package suggested but not available for checking: ‘fgsea’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/genekitr/old/genekitr.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘genekitr/DESCRIPTION’ ... OK +... +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +Package suggested but not available for checking: ‘fgsea’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# GeneSelectR + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/dzhakparov/GeneSelectR +* Source code: https://github.com/cran/GeneSelectR +* Date/Publication: 2024-02-03 14:00:05 UTC +* Number of recursive dependencies: 183 + +Run `revdepcheck::cloud_details(, "GeneSelectR")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/GeneSelectR/new/GeneSelectR.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘GeneSelectR/DESCRIPTION’ ... OK +... ++ build_vignettes = FALSE) + + When sourcing ‘example.R’: +Error: there is no package called ‘devtools’ +Execution halted + + ‘example.Rmd’ using ‘UTF-8’... failed +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 WARNING, 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/GeneSelectR/old/GeneSelectR.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘GeneSelectR/DESCRIPTION’ ... OK +... ++ build_vignettes = FALSE) + + When sourcing ‘example.R’: +Error: there is no package called ‘devtools’ +Execution halted + + ‘example.Rmd’ using ‘UTF-8’... failed +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 WARNING, 1 NOTE + + + + + +``` +# GeomComb + +
+ +* Version: 1.0 +* GitHub: https://github.com/ceweiss/GeomComb +* Source code: https://github.com/cran/GeomComb +* Date/Publication: 2016-11-27 16:02:26 +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "GeomComb")` for more info + +
+ +## In both + +* checking whether package ‘GeomComb’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/GeomComb/new/GeomComb.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘GeomComb’ ... +** package ‘GeomComb’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘GeomComb’ +* removing ‘/tmp/workdir/GeomComb/new/GeomComb.Rcheck/GeomComb’ + + +``` +### CRAN + +``` +* installing *source* package ‘GeomComb’ ... +** package ‘GeomComb’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘GeomComb’ +* removing ‘/tmp/workdir/GeomComb/old/GeomComb.Rcheck/GeomComb’ + + +``` +# geomorph + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/geomorph +* Number of recursive dependencies: 71 + +Run `revdepcheck::cloud_details(, "geomorph")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# GeoTox + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/GeoTox +* Number of recursive dependencies: 143 + +Run `revdepcheck::cloud_details(, "GeoTox")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + +``` +# ggtern + +
+ +* Version: 3.5.0 +* GitHub: NA +* Source code: https://github.com/cran/ggtern +* Date/Publication: 2024-03-24 21:50:02 UTC +* Number of recursive dependencies: 42 + +Run `revdepcheck::cloud_details(, "ggtern")` for more info + +
+ +## Newly broken + +* checking whether package ‘ggtern’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ggtern/new/ggtern.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘chemometrics’ + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package which this enhances but not available for checking: ‘sp’ + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘ggtern’ ... +** package ‘ggtern’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** demo +** inst +** byte-compile and prepare package for lazy loading +Error in get(x, envir = ns, inherits = FALSE) : + object 'update_guides' not found +Error: unable to load R code in package ‘ggtern’ +Execution halted +ERROR: lazy loading failed for package ‘ggtern’ +* removing ‘/tmp/workdir/ggtern/new/ggtern.Rcheck/ggtern’ + + +``` +### CRAN + +``` +* installing *source* package ‘ggtern’ ... +** package ‘ggtern’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** demo +** inst +** byte-compile and prepare package for lazy loading +** help +*** installing help indices +** building package indices +** testing if installed package can be loaded from temporary location +** testing if installed package can be loaded from final location +** testing if installed package keeps a record of temporary installation path +* DONE (ggtern) + + +``` +# ggThemeAssist + +
+ +* Version: 0.1.5 +* GitHub: https://github.com/calligross/ggthemeassist +* Source code: https://github.com/cran/ggThemeAssist +* Date/Publication: 2016-08-13 16:50:55 +* Number of recursive dependencies: 57 + +Run `revdepcheck::cloud_details(, "ggThemeAssist")` for more info + +
+ +## Newly broken + +* checking whether package ‘ggThemeAssist’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ggThemeAssist/new/ggThemeAssist.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘ggThemeAssist’ ... +** package ‘ggThemeAssist’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in is.element("extrafont", installed.packages()[, 1]) : + unused argument (installed.packages()[, 1]) +Error: unable to load R code in package ‘ggThemeAssist’ +Execution halted +ERROR: lazy loading failed for package ‘ggThemeAssist’ +* removing ‘/tmp/workdir/ggThemeAssist/new/ggThemeAssist.Rcheck/ggThemeAssist’ + + +``` +### CRAN + +``` +* installing *source* package ‘ggThemeAssist’ ... +** package ‘ggThemeAssist’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +** help +*** installing help indices +** building package indices +** testing if installed package can be loaded from temporary location +** testing if installed package can be loaded from final location +** testing if installed package keeps a record of temporary installation path +* DONE (ggThemeAssist) + + +``` +# gJLS2 + +
+ +* Version: 0.2.0 +* GitHub: NA +* Source code: https://github.com/cran/gJLS2 +* Date/Publication: 2021-09-30 09:00:05 UTC +* Number of recursive dependencies: 45 + +Run `revdepcheck::cloud_details(, "gJLS2")` for more info + +
+ +## In both + +* checking whether package ‘gJLS2’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/gJLS2/new/gJLS2.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘gJLS2’ ... +** package ‘gJLS2’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘gJLS2’ +* removing ‘/tmp/workdir/gJLS2/new/gJLS2.Rcheck/gJLS2’ + + +``` +### CRAN + +``` +* installing *source* package ‘gJLS2’ ... +** package ‘gJLS2’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘gJLS2’ +* removing ‘/tmp/workdir/gJLS2/old/gJLS2.Rcheck/gJLS2’ + + +``` +# grandR + +
+ +* Version: 0.2.6 +* GitHub: https://github.com/erhard-lab/grandR +* Source code: https://github.com/cran/grandR +* Date/Publication: 2025-01-22 22:10:02 UTC +* Number of recursive dependencies: 265 + +Run `revdepcheck::cloud_details(, "grandR")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/grandR/new/grandR.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘grandR/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘getting-started.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 2 NOTEs + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/grandR/old/grandR.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘grandR/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘getting-started.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 2 NOTEs + + + + + +``` +# GseaVis + +
+ +* Version: 0.0.5 +* GitHub: https://github.com/junjunlab/GseaVis +* Source code: https://github.com/cran/GseaVis +* Date/Publication: 2022-12-20 19:40:07 UTC +* Number of recursive dependencies: 104 + +Run `revdepcheck::cloud_details(, "GseaVis")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/GseaVis/new/GseaVis.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘GseaVis/DESCRIPTION’ ... OK +... +* this is package ‘GseaVis’ version ‘0.0.5’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘DOSE’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/GseaVis/old/GseaVis.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘GseaVis/DESCRIPTION’ ... OK +... +* this is package ‘GseaVis’ version ‘0.0.5’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘DOSE’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# hettx + +
+ +* Version: 0.1.3 +* GitHub: https://github.com/bfifield/hettx +* Source code: https://github.com/cran/hettx +* Date/Publication: 2023-08-19 22:22:34 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "hettx")` for more info + +
+ +## In both + +* checking whether package ‘hettx’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/hettx/new/hettx.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘hettx’ ... +** package ‘hettx’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘hettx’ +* removing ‘/tmp/workdir/hettx/new/hettx.Rcheck/hettx’ + + +``` +### CRAN + +``` +* installing *source* package ‘hettx’ ... +** package ‘hettx’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘hettx’ +* removing ‘/tmp/workdir/hettx/old/hettx.Rcheck/hettx’ + + +``` +# Hmisc + +
+ +* Version: 5.2-2 +* GitHub: NA +* Source code: https://github.com/cran/Hmisc +* Date/Publication: 2025-01-10 23:30:03 UTC +* Number of recursive dependencies: 173 + +Run `revdepcheck::cloud_details(, "Hmisc")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/Hmisc/new/Hmisc.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘Hmisc/DESCRIPTION’ ... 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 line endings in C/C++/Fortran sources/headers ... OK +* checking compiled code ... OK +* checking examples ... OK +* DONE +Status: 4 NOTEs + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/Hmisc/old/Hmisc.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘Hmisc/DESCRIPTION’ ... 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 line endings in C/C++/Fortran sources/headers ... OK +* checking compiled code ... OK +* checking examples ... OK +* DONE +Status: 4 NOTEs + + + + + +``` +# Hmsc + +
+ +* Version: 3.0-13 +* GitHub: https://github.com/hmsc-r/HMSC +* Source code: https://github.com/cran/Hmsc +* Date/Publication: 2022-08-11 14:10:14 UTC +* Number of recursive dependencies: 75 + +Run `revdepcheck::cloud_details(, "Hmsc")` for more info + +
+ +## In both + +* checking whether package ‘Hmsc’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/Hmsc/new/Hmsc.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘Hmsc’ ... +** package ‘Hmsc’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Hmsc’ +* removing ‘/tmp/workdir/Hmsc/new/Hmsc.Rcheck/Hmsc’ + + +``` +### CRAN + +``` +* installing *source* package ‘Hmsc’ ... +** package ‘Hmsc’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Hmsc’ +* removing ‘/tmp/workdir/Hmsc/old/Hmsc.Rcheck/Hmsc’ + + +``` +# iClusterVB + +
+ +* Version: 0.1.4 +* GitHub: https://github.com/AbdalkarimA/iClusterVB +* Source code: https://github.com/cran/iClusterVB +* Date/Publication: 2024-12-09 19:50:06 UTC +* Number of recursive dependencies: 128 + +Run `revdepcheck::cloud_details(, "iClusterVB")` for more info + +
+ +## In both + +* checking whether package ‘iClusterVB’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/iClusterVB/new/iClusterVB.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘iClusterVB’ ... +** package ‘iClusterVB’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c CAVI_algorithms.cpp -o CAVI_algorithms.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o iClusterVB.so CAVI_algorithms.o RcppExports.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/iClusterVB/new/iClusterVB.Rcheck/00LOCK-iClusterVB/00new/iClusterVB/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘iClusterVB’ +* removing ‘/tmp/workdir/iClusterVB/new/iClusterVB.Rcheck/iClusterVB’ + + +``` +### CRAN + +``` +* installing *source* package ‘iClusterVB’ ... +** package ‘iClusterVB’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c CAVI_algorithms.cpp -o CAVI_algorithms.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o iClusterVB.so CAVI_algorithms.o RcppExports.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/iClusterVB/old/iClusterVB.Rcheck/00LOCK-iClusterVB/00new/iClusterVB/libs +** R +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘iClusterVB’ +* removing ‘/tmp/workdir/iClusterVB/old/iClusterVB.Rcheck/iClusterVB’ + + +``` +# immcp + +
+ +* Version: 1.0.3 +* GitHub: https://github.com/YuanlongHu/immcp +* Source code: https://github.com/cran/immcp +* Date/Publication: 2022-05-12 05:50:02 UTC +* Number of recursive dependencies: 187 + +Run `revdepcheck::cloud_details(, "immcp")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/immcp/new/immcp.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘immcp/DESCRIPTION’ ... OK +... +* this is package ‘immcp’ version ‘1.0.3’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'clusterProfiler', 'DOSE' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/immcp/old/immcp.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘immcp/DESCRIPTION’ ... OK +... +* this is package ‘immcp’ version ‘1.0.3’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Packages required but not available: 'clusterProfiler', 'DOSE' + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# inventorize + +
+ +* Version: 1.1.1 +* GitHub: NA +* Source code: https://github.com/cran/inventorize +* Date/Publication: 2022-05-31 22:20:09 UTC +* Number of recursive dependencies: 71 Run `revdepcheck::cloud_details(, "inventorize")` for more info @@ -3556,6 +4602,7 @@ ERROR: lazy loading failed for package ‘inventorize’ ** R ** byte-compile and prepare package for lazy loading Warning in qgamma(service_level, alpha, beta) : NaNs produced +Warning in qgamma(service_level, alpha, beta) : NaNs produced ** help *** installing help indices ** building package indices @@ -3565,6 +4612,66 @@ Warning in qgamma(service_level, alpha, beta) : NaNs produced * DONE (inventorize) +``` +# invivoPKfit + +
+ +* Version: 2.0.0 +* GitHub: NA +* Source code: https://github.com/cran/invivoPKfit +* Date/Publication: 2025-01-09 14:30:02 UTC +* Number of recursive dependencies: 172 + +Run `revdepcheck::cloud_details(, "invivoPKfit")` for more info + +
+ +## In both + +* checking whether package ‘invivoPKfit’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/invivoPKfit/new/invivoPKfit.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘invivoPKfit’ ... +** package ‘invivoPKfit’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error: object ‘expand1’ is not exported by 'namespace:Matrix' +Execution halted +ERROR: lazy loading failed for package ‘invivoPKfit’ +* removing ‘/tmp/workdir/invivoPKfit/new/invivoPKfit.Rcheck/invivoPKfit’ + + +``` +### CRAN + +``` +* installing *source* package ‘invivoPKfit’ ... +** package ‘invivoPKfit’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error: object ‘expand1’ is not exported by 'namespace:Matrix' +Execution halted +ERROR: lazy loading failed for package ‘invivoPKfit’ +* removing ‘/tmp/workdir/invivoPKfit/old/invivoPKfit.Rcheck/invivoPKfit’ + + ``` # iNZightPlots @@ -3574,7 +4681,7 @@ Warning in qgamma(service_level, alpha, beta) : NaNs produced * GitHub: https://github.com/iNZightVIT/iNZightPlots * Source code: https://github.com/cran/iNZightPlots * Date/Publication: 2023-10-14 05:00:02 UTC -* Number of recursive dependencies: 162 +* Number of recursive dependencies: 161 Run `revdepcheck::cloud_details(, "iNZightPlots")` for more info @@ -3634,7 +4741,7 @@ ERROR: lazy loading failed for package ‘iNZightPlots’ * GitHub: https://github.com/iNZightVIT/iNZightRegression * Source code: https://github.com/cran/iNZightRegression * Date/Publication: 2024-04-05 02:32:59 UTC -* Number of recursive dependencies: 159 +* Number of recursive dependencies: 162 Run `revdepcheck::cloud_details(, "iNZightRegression")` for more info @@ -3694,18 +4801,168 @@ ERROR: lazy loading failed for package ‘iNZightRegression’ * GitHub: https://github.com/vinhdizzo/IRexamples * Source code: https://github.com/cran/IRexamples * Date/Publication: 2023-10-06 06:40:02 UTC -* Number of recursive dependencies: 177 +* Number of recursive dependencies: 180 + +Run `revdepcheck::cloud_details(, "IRexamples")` for more info + +
+ +## In both + +* checking whether package ‘IRexamples’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/IRexamples/new/IRexamples.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘IRexamples’ ... +** package ‘IRexamples’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘IRexamples’ +* removing ‘/tmp/workdir/IRexamples/new/IRexamples.Rcheck/IRexamples’ + + +``` +### CRAN + +``` +* installing *source* package ‘IRexamples’ ... +** package ‘IRexamples’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘IRexamples’ +* removing ‘/tmp/workdir/IRexamples/old/IRexamples.Rcheck/IRexamples’ + + +``` +# jmBIG + +
+ +* Version: 0.1.3 +* GitHub: NA +* Source code: https://github.com/cran/jmBIG +* Date/Publication: 2025-01-19 21:00:02 UTC +* Number of recursive dependencies: 187 + +Run `revdepcheck::cloud_details(, "jmBIG")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/jmBIG/new/jmBIG.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘jmBIG/DESCRIPTION’ ... 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 ‘jmBIG’ can be installed ... ERROR +Installation failed. +See ‘/tmp/workdir/jmBIG/new/jmBIG.Rcheck/00install.out’ for details. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/jmBIG/old/jmBIG.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘jmBIG/DESCRIPTION’ ... 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 ‘jmBIG’ can be installed ... ERROR +Installation failed. +See ‘/tmp/workdir/jmBIG/old/jmBIG.Rcheck/00install.out’ for details. +* DONE +Status: 1 ERROR + + + + + +``` +# joineRML + +
-Run `revdepcheck::cloud_details(, "IRexamples")` for more info +* Version: 0.4.6 +* GitHub: https://github.com/graemeleehickey/joineRML +* Source code: https://github.com/cran/joineRML +* Date/Publication: 2023-01-20 04:50:02 UTC +* Number of recursive dependencies: 93 + +Run `revdepcheck::cloud_details(, "joineRML")` for more info
## In both -* checking whether package ‘IRexamples’ can be installed ... ERROR +* checking whether package ‘joineRML’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/IRexamples/new/IRexamples.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/joineRML/new/joineRML.Rcheck/00install.out’ for details. ``` ## Installation @@ -3713,73 +4970,153 @@ Run `revdepcheck::cloud_details(, "IRexamples")` for more info ### Devel ``` -* installing *source* package ‘IRexamples’ ... -** package ‘IRexamples’ successfully unpacked and MD5 sums checked +* installing *source* package ‘joineRML’ ... +** package ‘joineRML’ successfully unpacked and MD5 sums checked ** using staged installation -** R +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c expW.cpp -o expW.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gammaUpdate.cpp -o gammaUpdate.o +... ** data *** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘IRexamples’ -* removing ‘/tmp/workdir/IRexamples/new/IRexamples.Rcheck/IRexamples’ +ERROR: lazy loading failed for package ‘joineRML’ +* removing ‘/tmp/workdir/joineRML/new/joineRML.Rcheck/joineRML’ ``` ### CRAN ``` -* installing *source* package ‘IRexamples’ ... -** package ‘IRexamples’ successfully unpacked and MD5 sums checked +* installing *source* package ‘joineRML’ ... +** package ‘joineRML’ successfully unpacked and MD5 sums checked ** using staged installation -** R +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++11 +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c expW.cpp -o expW.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gammaUpdate.cpp -o gammaUpdate.o +... ** data *** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘IRexamples’ -* removing ‘/tmp/workdir/IRexamples/old/IRexamples.Rcheck/IRexamples’ +ERROR: lazy loading failed for package ‘joineRML’ +* removing ‘/tmp/workdir/joineRML/old/joineRML.Rcheck/joineRML’ ``` -# jmBIG +# jsmodule
-* Version: 0.1.2 -* GitHub: NA -* Source code: https://github.com/cran/jmBIG -* Date/Publication: 2024-03-20 23:40:02 UTC -* Number of recursive dependencies: 184 +* Version: 1.6.1 +* GitHub: https://github.com/jinseob2kim/jsmodule +* Source code: https://github.com/cran/jsmodule +* Date/Publication: 2025-01-08 13:10:02 UTC +* Number of recursive dependencies: 241 -Run `revdepcheck::cloud_details(, "jmBIG")` for more info +Run `revdepcheck::cloud_details(, "jsmodule")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/jsmodule/new/jsmodule.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘jsmodule/DESCRIPTION’ ... OK +... +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘jsmodule.Rmd’ using ‘UTF-8’... OK + ‘jsmodule_subgroup_cmprsk.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/jsmodule/old/jsmodule.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘jsmodule/DESCRIPTION’ ... OK +... +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘jsmodule.Rmd’ using ‘UTF-8’... OK + ‘jsmodule_subgroup_cmprsk.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +# kmc + +
+ +* Version: 0.4-2 +* GitHub: https://github.com/yfyang86/kmc +* Source code: https://github.com/cran/kmc +* Date/Publication: 2022-11-22 08:30:02 UTC +* Number of recursive dependencies: 60 + +Run `revdepcheck::cloud_details(, "kmc")` for more info
## In both -* checking whether package ‘jmBIG’ can be installed ... ERROR +* checking whether package ‘kmc’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/jmBIG/new/jmBIG.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/kmc/new/kmc.Rcheck/00install.out’ for details. ``` ## Installation @@ -3787,61 +5124,149 @@ Run `revdepcheck::cloud_details(, "jmBIG")` for more info ### Devel ``` -* installing *source* package ‘jmBIG’ ... -** package ‘jmBIG’ successfully unpacked and MD5 sums checked +* installing *source* package ‘kmc’ ... +** package ‘kmc’ successfully unpacked and MD5 sums checked ** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExport.cpp -o RcppExport.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc.cpp -o kmc.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc_init.c -o kmc_init.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c surv2.c -o surv2.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o kmc.so RcppExport.o kmc.o kmc_init.o surv2.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/kmc/new/kmc.Rcheck/00LOCK-kmc/00new/kmc/libs ** R -** data -*** moving datasets to lazyload DB ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Error: package or namespace load failed for ‘emplik’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Execution halted -ERROR: lazy loading failed for package ‘jmBIG’ -* removing ‘/tmp/workdir/jmBIG/new/jmBIG.Rcheck/jmBIG’ +ERROR: lazy loading failed for package ‘kmc’ +* removing ‘/tmp/workdir/kmc/new/kmc.Rcheck/kmc’ ``` ### CRAN ``` -* installing *source* package ‘jmBIG’ ... -** package ‘jmBIG’ successfully unpacked and MD5 sums checked +* installing *source* package ‘kmc’ ... +** package ‘kmc’ successfully unpacked and MD5 sums checked ** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExport.cpp -o RcppExport.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc.cpp -o kmc.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc_init.c -o kmc_init.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c surv2.c -o surv2.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o kmc.so RcppExport.o kmc.o kmc_init.o surv2.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/kmc/old/kmc.Rcheck/00LOCK-kmc/00new/kmc/libs ** R -** data -*** moving datasets to lazyload DB ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Error: package or namespace load failed for ‘emplik’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Execution halted -ERROR: lazy loading failed for package ‘jmBIG’ -* removing ‘/tmp/workdir/jmBIG/old/jmBIG.Rcheck/jmBIG’ +ERROR: lazy loading failed for package ‘kmc’ +* removing ‘/tmp/workdir/kmc/old/kmc.Rcheck/kmc’ ``` -# joineRML +# KMunicate
-* Version: 0.4.6 -* GitHub: https://github.com/graemeleehickey/joineRML -* Source code: https://github.com/cran/joineRML -* Date/Publication: 2023-01-20 04:50:02 UTC -* Number of recursive dependencies: 91 +* Version: 0.2.5 +* GitHub: https://github.com/ellessenne/KMunicate-package +* Source code: https://github.com/cran/KMunicate +* Date/Publication: 2024-05-16 11:50:08 UTC +* Number of recursive dependencies: 171 -Run `revdepcheck::cloud_details(, "joineRML")` for more info +Run `revdepcheck::cloud_details(, "KMunicate")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/KMunicate/new/KMunicate.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘KMunicate/DESCRIPTION’ ... OK +... +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘KMunicate.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/KMunicate/old/KMunicate.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘KMunicate/DESCRIPTION’ ... OK +... +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘KMunicate.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +# L2E + +
+ +* Version: 2.0 +* GitHub: NA +* Source code: https://github.com/cran/L2E +* Date/Publication: 2022-09-08 21:13:00 UTC +* Number of recursive dependencies: 65 + +Run `revdepcheck::cloud_details(, "L2E")` for more info
## In both -* checking whether package ‘joineRML’ can be installed ... ERROR +* checking whether package ‘L2E’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/joineRML/new/joineRML.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/L2E/new/L2E.Rcheck/00install.out’ for details. ``` ## Installation @@ -3849,68 +5274,52 @@ Run `revdepcheck::cloud_details(, "joineRML")` for more info ### Devel ``` -* installing *source* package ‘joineRML’ ... -** package ‘joineRML’ successfully unpacked and MD5 sums checked +* installing *source* package ‘L2E’ ... +** package ‘L2E’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c expW.cpp -o expW.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gammaUpdate.cpp -o gammaUpdate.o -... +** R ** data *** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Error: package or namespace load failed for ‘osqp’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.1 is required Execution halted -ERROR: lazy loading failed for package ‘joineRML’ -* removing ‘/tmp/workdir/joineRML/new/joineRML.Rcheck/joineRML’ +ERROR: lazy loading failed for package ‘L2E’ +* removing ‘/tmp/workdir/L2E/new/L2E.Rcheck/L2E’ ``` ### CRAN ``` -* installing *source* package ‘joineRML’ ... -** package ‘joineRML’ successfully unpacked and MD5 sums checked +* installing *source* package ‘L2E’ ... +** package ‘L2E’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c expW.cpp -o expW.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gammaUpdate.cpp -o gammaUpdate.o -... +** R ** data *** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Error: package or namespace load failed for ‘osqp’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.1 is required Execution halted -ERROR: lazy loading failed for package ‘joineRML’ -* removing ‘/tmp/workdir/joineRML/old/joineRML.Rcheck/joineRML’ +ERROR: lazy loading failed for package ‘L2E’ +* removing ‘/tmp/workdir/L2E/old/L2E.Rcheck/L2E’ ``` -# kibior +# Landmarking
-* Version: 0.1.1 -* GitHub: https://github.com/regisoc/kibior -* Source code: https://github.com/cran/kibior -* Date/Publication: 2021-01-28 15:20:02 UTC -* Number of recursive dependencies: 140 +* Version: 1.0.0 +* GitHub: https://github.com/isobelbarrott/Landmarking +* Source code: https://github.com/cran/Landmarking +* Date/Publication: 2022-02-15 20:00:07 UTC +* Number of recursive dependencies: 122 -Run `revdepcheck::cloud_details(, "kibior")` for more info +Run `revdepcheck::cloud_details(, "Landmarking")` for more info
@@ -3919,22 +5328,22 @@ Run `revdepcheck::cloud_details(, "kibior")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/kibior/new/kibior.Rcheck’ +* using log directory ‘/tmp/workdir/Landmarking/new/Landmarking.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘kibior/DESCRIPTION’ ... OK +* checking for file ‘Landmarking/DESCRIPTION’ ... OK ... -* this is package ‘kibior’ version ‘0.1.1’ +* this is package ‘Landmarking’ version ‘1.0.0’ * package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Package required but not available: ‘rtracklayer’ +Package required but not available: ‘riskRegression’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -3949,22 +5358,22 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/kibior/old/kibior.Rcheck’ +* using log directory ‘/tmp/workdir/Landmarking/old/Landmarking.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘kibior/DESCRIPTION’ ... OK +* checking for file ‘Landmarking/DESCRIPTION’ ... OK ... -* this is package ‘kibior’ version ‘0.1.1’ +* this is package ‘Landmarking’ version ‘1.0.0’ * package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Package required but not available: ‘rtracklayer’ +Package required but not available: ‘riskRegression’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -3976,139 +5385,79 @@ Status: 1 ERROR ``` -# kmc +# lavaSearch2
-* Version: 0.4-2 -* GitHub: https://github.com/yfyang86/kmc -* Source code: https://github.com/cran/kmc -* Date/Publication: 2022-11-22 08:30:02 UTC -* Number of recursive dependencies: 61 +* Version: 2.0.3 +* GitHub: https://github.com/bozenne/lavaSearch2 +* Source code: https://github.com/cran/lavaSearch2 +* Date/Publication: 2024-02-23 09:10:02 UTC +* Number of recursive dependencies: 149 -Run `revdepcheck::cloud_details(, "kmc")` for more info +Run `revdepcheck::cloud_details(, "lavaSearch2")` for more info
-## In both - -* checking whether package ‘kmc’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/kmc/new/kmc.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘kmc’ ... -** package ‘kmc’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExport.cpp -o RcppExport.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc.cpp -o kmc.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc_init.c -o kmc_init.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c surv2.c -o surv2.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o kmc.so RcppExport.o kmc.o kmc_init.o surv2.o -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/kmc/new/kmc.Rcheck/00LOCK-kmc/00new/kmc/libs -** R -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘emplik’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘kmc’ -* removing ‘/tmp/workdir/kmc/new/kmc.Rcheck/kmc’ +* using log directory ‘/tmp/workdir/lavaSearch2/new/lavaSearch2.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘lavaSearch2/DESCRIPTION’ ... OK +... + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 266 ] + Error: Test failures + Execution halted +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... NONE + ‘overview.pdf.asis’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 ERROR, 1 NOTE -``` -### CRAN -``` -* installing *source* package ‘kmc’ ... -** package ‘kmc’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExport.cpp -o RcppExport.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc.cpp -o kmc.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc_init.c -o kmc_init.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c surv2.c -o surv2.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o kmc.so RcppExport.o kmc.o kmc_init.o surv2.o -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/kmc/old/kmc.Rcheck/00LOCK-kmc/00new/kmc/libs -** R -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘emplik’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘kmc’ -* removing ‘/tmp/workdir/kmc/old/kmc.Rcheck/kmc’ ``` -# L2E - -
- -* Version: 2.0 -* GitHub: NA -* Source code: https://github.com/cran/L2E -* Date/Publication: 2022-09-08 21:13:00 UTC -* Number of recursive dependencies: 65 - -Run `revdepcheck::cloud_details(, "L2E")` for more info - -
- -## In both - -* checking whether package ‘L2E’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/L2E/new/L2E.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel +### CRAN ``` -* installing *source* package ‘L2E’ ... -** package ‘L2E’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘osqp’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.1 is required -Execution halted -ERROR: lazy loading failed for package ‘L2E’ -* removing ‘/tmp/workdir/L2E/new/L2E.Rcheck/L2E’ +* using log directory ‘/tmp/workdir/lavaSearch2/old/lavaSearch2.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘lavaSearch2/DESCRIPTION’ ... OK +... + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 266 ] + Error: Test failures + Execution halted +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... NONE + ‘overview.pdf.asis’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 ERROR, 1 NOTE -``` -### CRAN -``` -* installing *source* package ‘L2E’ ... -** package ‘L2E’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘osqp’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.1 is required -Execution halted -ERROR: lazy loading failed for package ‘L2E’ -* removing ‘/tmp/workdir/L2E/old/L2E.Rcheck/L2E’ ``` @@ -4174,17 +5523,17 @@ ERROR: lazy loading failed for package ‘llbayesireg’ ``` -# locuszoomr +# lnmixsurv
-* Version: 0.3.4 -* GitHub: https://github.com/myles-lewis/locuszoomr -* Source code: https://github.com/cran/locuszoomr -* Date/Publication: 2024-09-06 10:10:02 UTC -* Number of recursive dependencies: 132 +* Version: 3.1.6 +* GitHub: NA +* Source code: https://github.com/cran/lnmixsurv +* Date/Publication: 2024-09-03 15:20:08 UTC +* Number of recursive dependencies: 195 -Run `revdepcheck::cloud_details(, "locuszoomr")` for more info +Run `revdepcheck::cloud_details(, "lnmixsurv")` for more info
@@ -4193,27 +5542,27 @@ Run `revdepcheck::cloud_details(, "locuszoomr")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/locuszoomr/new/locuszoomr.Rcheck’ +* using log directory ‘/tmp/workdir/lnmixsurv/new/lnmixsurv.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘locuszoomr/DESCRIPTION’ ... OK +* checking for file ‘lnmixsurv/DESCRIPTION’ ... OK ... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'ensembldb', 'rtracklayer' +--- finished re-building ‘parallel_computation.Rmd’ -Package suggested but not available for checking: ‘EnsDb.Hsapiens.v75’ +SUMMARY: processing the following file failed: + ‘expectation_maximization.Rmd’ + +Error: Vignette re-building failed. +Execution halted -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. * DONE -Status: 1 ERROR +Status: 2 ERRORs, 5 NOTEs @@ -4223,27 +5572,27 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/locuszoomr/old/locuszoomr.Rcheck’ +* using log directory ‘/tmp/workdir/lnmixsurv/old/lnmixsurv.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘locuszoomr/DESCRIPTION’ ... OK +* checking for file ‘lnmixsurv/DESCRIPTION’ ... OK ... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'ensembldb', 'rtracklayer' - -Package suggested but not available for checking: ‘EnsDb.Hsapiens.v75’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘compare.Rmd’ using ‘UTF-8’... OK + ‘expectation_maximization.Rmd’ using ‘UTF-8’... OK + ‘intercept_only.Rmd’ using ‘UTF-8’... OK + ‘lnmixsurv.Rmd’ using ‘UTF-8’... OK + ‘parallel_computation.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK * DONE -Status: 1 ERROR +Status: 4 NOTEs @@ -4254,10 +5603,10 @@ Status: 1 ERROR
-* Version: 2.0.0 +* Version: 2.1.0 * GitHub: https://github.com/AlJacq/LorenzRegression * Source code: https://github.com/cran/LorenzRegression -* Date/Publication: 2024-09-09 11:20:33 UTC +* Date/Publication: 2024-10-11 16:50:02 UTC * Number of recursive dependencies: 83 Run `revdepcheck::cloud_details(, "LorenzRegression")` for more info @@ -4281,12 +5630,12 @@ Run `revdepcheck::cloud_details(, "LorenzRegression")` for more info ** package ‘LorenzRegression’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c GA_fitness.cpp -o GA_fitness.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c GA_meanrank.cpp -o GA_meanrank.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c PLR_derivative.cpp -o PLR_derivative.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c PLR_loss.cpp -o PLR_loss.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c GA_fitness.cpp -o GA_fitness.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c GA_meanrank.cpp -o GA_meanrank.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c PLR_derivative.cpp -o PLR_derivative.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c PLR_loss.cpp -o PLR_loss.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o ... ** data *** moving datasets to lazyload DB @@ -4308,12 +5657,12 @@ ERROR: lazy loading failed for package ‘LorenzRegression’ ** package ‘LorenzRegression’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c GA_fitness.cpp -o GA_fitness.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c GA_meanrank.cpp -o GA_meanrank.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c PLR_derivative.cpp -o PLR_derivative.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c PLR_loss.cpp -o PLR_loss.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c GA_fitness.cpp -o GA_fitness.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c GA_meanrank.cpp -o GA_meanrank.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c PLR_derivative.cpp -o PLR_derivative.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c PLR_loss.cpp -o PLR_loss.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o ... ** data *** moving datasets to lazyload DB @@ -4336,7 +5685,7 @@ ERROR: lazy loading failed for package ‘LorenzRegression’ * GitHub: NA * Source code: https://github.com/cran/lsirm12pl * Date/Publication: 2024-08-28 23:00:02 UTC -* Number of recursive dependencies: 124 +* Number of recursive dependencies: 123 Run `revdepcheck::cloud_details(, "lsirm12pl")` for more info @@ -4359,12 +5708,12 @@ Run `revdepcheck::cloud_details(, "lsirm12pl")` for more info ** package ‘lsirm12pl’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl.cpp -o lsirm1pl.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm2pl.cpp -o lsirm2pl.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsm.cpp -o lsm.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c utility_cpp.cpp -o utility_cpp.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl.cpp -o lsirm1pl.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm2pl.cpp -o lsirm2pl.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsm.cpp -o lsm.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c utility_cpp.cpp -o utility_cpp.o ... ** R ** data @@ -4386,12 +5735,12 @@ ERROR: lazy loading failed for package ‘lsirm12pl’ ** package ‘lsirm12pl’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl.cpp -o lsirm1pl.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm2pl.cpp -o lsirm2pl.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsm.cpp -o lsm.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c utility_cpp.cpp -o utility_cpp.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl.cpp -o lsirm1pl.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm2pl.cpp -o lsirm2pl.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsm.cpp -o lsm.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c utility_cpp.cpp -o utility_cpp.o ... ** R ** data @@ -4449,7 +5798,7 @@ Run `revdepcheck::cloud_details(, "MantaID")` for more info * GitHub: NA * Source code: https://github.com/cran/MARVEL * Date/Publication: 2022-10-31 10:22:50 UTC -* Number of recursive dependencies: 231 +* Number of recursive dependencies: 229 Run `revdepcheck::cloud_details(, "MARVEL")` for more info @@ -4464,9 +5813,9 @@ Run `revdepcheck::cloud_details(, "MARVEL")` for more info * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘MARVEL/DESCRIPTION’ ... OK @@ -4494,9 +5843,9 @@ Status: 1 NOTE * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘MARVEL/DESCRIPTION’ ... OK @@ -4516,6 +5865,70 @@ Status: 1 NOTE +``` +# MaxWiK + +
+ +* Version: 1.0.5 +* GitHub: NA +* Source code: https://github.com/cran/MaxWiK +* Date/Publication: 2024-11-25 11:40:13 UTC +* Number of recursive dependencies: 57 + +Run `revdepcheck::cloud_details(, "MaxWiK")` for more info + +
+ +## In both + +* checking whether package ‘MaxWiK’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/MaxWiK/new/MaxWiK.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘MaxWiK’ ... +** package ‘MaxWiK’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘MaxWiK’ +* removing ‘/tmp/workdir/MaxWiK/new/MaxWiK.Rcheck/MaxWiK’ + + +``` +### CRAN + +``` +* installing *source* package ‘MaxWiK’ ... +** package ‘MaxWiK’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘MaxWiK’ +* removing ‘/tmp/workdir/MaxWiK/old/MaxWiK.Rcheck/MaxWiK’ + + ``` # mbsts @@ -4525,7 +5938,7 @@ Status: 1 NOTE * GitHub: NA * Source code: https://github.com/cran/mbsts * Date/Publication: 2023-01-07 01:10:02 UTC -* Number of recursive dependencies: 82 +* Number of recursive dependencies: 81 Run `revdepcheck::cloud_details(, "mbsts")` for more info @@ -4577,79 +5990,75 @@ ERROR: lazy loading failed for package ‘mbsts’ ``` -# MitoHEAR +# MendelianRandomization
-* Version: 0.1.0 +* Version: 0.10.0 * GitHub: NA -* Source code: https://github.com/cran/MitoHEAR -* Date/Publication: 2022-03-01 21:20:02 UTC -* Number of recursive dependencies: 183 +* Source code: https://github.com/cran/MendelianRandomization +* Date/Publication: 2024-04-12 10:10:02 UTC +* Number of recursive dependencies: 88 -Run `revdepcheck::cloud_details(, "MitoHEAR")` for more info +Run `revdepcheck::cloud_details(, "MendelianRandomization")` for more info
-## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/MitoHEAR/new/MitoHEAR.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘MitoHEAR/DESCRIPTION’ ... OK -... -* checking package dependencies ... ERROR -Package required but not available: ‘ComplexHeatmap’ - -Packages suggested but not available for checking: - 'karyoploteR', 'regioneR' +## In both -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR +* checking whether package ‘MendelianRandomization’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/MendelianRandomization/new/MendelianRandomization.Rcheck/00install.out’ for details. + ``` +## Installation +### Devel +``` +* installing *source* package ‘MendelianRandomization’ ... +** package ‘MendelianRandomization’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c mvmrcML.cpp -o mvmrcML.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o MendelianRandomization.so RcppExports.o mvmrcML.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/MendelianRandomization/new/MendelianRandomization.Rcheck/00LOCK-MendelianRandomization/00new/MendelianRandomization/libs +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘MendelianRandomization’ +* removing ‘/tmp/workdir/MendelianRandomization/new/MendelianRandomization.Rcheck/MendelianRandomization’ ``` ### CRAN ``` -* using log directory ‘/tmp/workdir/MitoHEAR/old/MitoHEAR.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘MitoHEAR/DESCRIPTION’ ... OK -... -* checking package dependencies ... ERROR -Package required but not available: ‘ComplexHeatmap’ - -Packages suggested but not available for checking: - 'karyoploteR', 'regioneR' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - +* installing *source* package ‘MendelianRandomization’ ... +** package ‘MendelianRandomization’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c mvmrcML.cpp -o mvmrcML.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o MendelianRandomization.so RcppExports.o mvmrcML.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/MendelianRandomization/old/MendelianRandomization.Rcheck/00LOCK-MendelianRandomization/00new/MendelianRandomization/libs +** R +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘MendelianRandomization’ +* removing ‘/tmp/workdir/MendelianRandomization/old/MendelianRandomization.Rcheck/MendelianRandomization’ ``` @@ -4661,7 +6070,7 @@ Status: 1 ERROR * GitHub: https://github.com/phargarten2/miWQS * Source code: https://github.com/cran/miWQS * Date/Publication: 2021-04-02 21:50:02 UTC -* Number of recursive dependencies: 152 +* Number of recursive dependencies: 151 Run `revdepcheck::cloud_details(, "miWQS")` for more info @@ -4675,6 +6084,11 @@ Run `revdepcheck::cloud_details(, "miWQS")` for more info See ‘/tmp/workdir/miWQS/new/miWQS.Rcheck/00install.out’ for details. ``` +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘wqs’ + ``` + ## Installation ### Devel @@ -4725,7 +6139,7 @@ ERROR: lazy loading failed for package ‘miWQS’ * GitHub: NA * Source code: https://github.com/cran/mlmts * Date/Publication: 2024-08-18 08:40:06 UTC -* Number of recursive dependencies: 242 +* Number of recursive dependencies: 244 Run `revdepcheck::cloud_details(, "mlmts")` for more info @@ -4789,7 +6203,7 @@ ERROR: lazy loading failed for package ‘mlmts’ * GitHub: https://github.com/mlr-org/mlr * Source code: https://github.com/cran/mlr * Date/Publication: 2024-06-12 10:50:02 UTC -* Number of recursive dependencies: 362 +* Number of recursive dependencies: 365 Run `revdepcheck::cloud_details(, "mlr")` for more info @@ -4804,9 +6218,9 @@ Run `revdepcheck::cloud_details(, "mlr")` for more info * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘mlr/DESCRIPTION’ ... OK @@ -4820,7 +6234,7 @@ Run `revdepcheck::cloud_details(, "mlr")` for more info ‘mlr.Rmd’ using ‘UTF-8’... OK * checking re-building of vignette outputs ... OK * DONE -Status: 2 NOTEs +Status: 1 WARNING, 3 NOTEs @@ -4834,9 +6248,9 @@ Status: 2 NOTEs * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘mlr/DESCRIPTION’ ... OK @@ -4856,82 +6270,6 @@ Status: 2 NOTEs -``` -# MOCHA - -
- -* Version: 1.1.0 -* GitHub: NA -* Source code: https://github.com/cran/MOCHA -* Date/Publication: 2024-01-25 12:20:12 UTC -* Number of recursive dependencies: 249 - -Run `revdepcheck::cloud_details(, "MOCHA")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/MOCHA/new/MOCHA.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘MOCHA/DESCRIPTION’ ... OK -... - -Packages suggested but not available for checking: - 'ArchR', 'motifmatchr', 'TxDb.Hsapiens.UCSC.hg38.refGene', - 'TxDb.Hsapiens.UCSC.hg19.knownGene', 'BSgenome.Hsapiens.UCSC.hg19', - 'chromVAR', 'rtracklayer' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/MOCHA/old/MOCHA.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘MOCHA/DESCRIPTION’ ... OK -... - -Packages suggested but not available for checking: - 'ArchR', 'motifmatchr', 'TxDb.Hsapiens.UCSC.hg38.refGene', - 'TxDb.Hsapiens.UCSC.hg19.knownGene', 'BSgenome.Hsapiens.UCSC.hg19', - 'chromVAR', 'rtracklayer' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - ``` # MRZero @@ -4990,6 +6328,82 @@ ERROR: lazy loading failed for package ‘MRZero’ * removing ‘/tmp/workdir/MRZero/old/MRZero.Rcheck/MRZero’ +``` +# mstate + +
+ +* Version: 0.3.3 +* GitHub: https://github.com/hputter/mstate +* Source code: https://github.com/cran/mstate +* Date/Publication: 2024-07-11 21:30:06 UTC +* Number of recursive dependencies: 113 + +Run `revdepcheck::cloud_details(, "mstate")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/mstate/new/mstate.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘mstate/DESCRIPTION’ ... OK +... +--- failed re-building ‘Tutorial.Rnw’ + +SUMMARY: processing the following file failed: + ‘Tutorial.Rnw’ + +Error: Vignette re-building failed. +Execution halted + +* DONE +Status: 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/mstate/old/mstate.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘mstate/DESCRIPTION’ ... OK +... +--- failed re-building ‘Tutorial.Rnw’ + +SUMMARY: processing the following file failed: + ‘Tutorial.Rnw’ + +Error: Vignette re-building failed. +Execution halted + +* DONE +Status: 1 NOTE + + + + + ``` # multilevelTools @@ -4999,7 +6413,7 @@ ERROR: lazy loading failed for package ‘MRZero’ * GitHub: https://github.com/JWiley/multilevelTools * Source code: https://github.com/cran/multilevelTools * Date/Publication: 2020-03-04 09:50:02 UTC -* Number of recursive dependencies: 168 +* Number of recursive dependencies: 170 Run `revdepcheck::cloud_details(, "multilevelTools")` for more info @@ -5065,11 +6479,11 @@ ERROR: lazy loading failed for package ‘multilevelTools’
-* Version: 0.7.1 +* Version: 0.7.2 * GitHub: https://github.com/dmphillippo/multinma * Source code: https://github.com/cran/multinma -* Date/Publication: 2024-06-11 12:20:06 UTC -* Number of recursive dependencies: 152 +* Date/Publication: 2024-09-16 12:20:02 UTC +* Number of recursive dependencies: 151 Run `revdepcheck::cloud_details(, "multinma")` for more info @@ -5087,55 +6501,207 @@ Run `revdepcheck::cloud_details(, "multinma")` for more info ### Devel -``` -* installing *source* package ‘multinma’ ... -** package ‘multinma’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++17 +``` +* installing *source* package ‘multinma’ ... +** package ‘multinma’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_survival_param_namespace::model_survival_param; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_survival_param.o] Error 1 +ERROR: compilation failed for package ‘multinma’ +* removing ‘/tmp/workdir/multinma/new/multinma.Rcheck/multinma’ + + +``` +### CRAN + +``` +* installing *source* package ‘multinma’ ... +** package ‘multinma’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_survival_param_namespace::model_survival_param; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_survival_param.o] Error 1 +ERROR: compilation failed for package ‘multinma’ +* removing ‘/tmp/workdir/multinma/old/multinma.Rcheck/multinma’ + + +``` +# multipleOutcomes + +
+ +* Version: 0.4 +* GitHub: NA +* Source code: https://github.com/cran/multipleOutcomes +* Date/Publication: 2024-05-30 15:00:03 UTC +* Number of recursive dependencies: 176 + +Run `revdepcheck::cloud_details(, "multipleOutcomes")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/multipleOutcomes/new/multipleOutcomes.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘multipleOutcomes/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘test.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/multipleOutcomes/old/multipleOutcomes.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘multipleOutcomes/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘test.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: OK + + + + + +``` +# MuPETFlow + +
+ +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/MuPETFlow +* Date/Publication: 2025-01-15 19:40:19 UTC +* Number of recursive dependencies: 85 + +Run `revdepcheck::cloud_details(, "MuPETFlow")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/MuPETFlow/new/MuPETFlow.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘MuPETFlow/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘MuPETFlow.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 NOTE + -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/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.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_survival_param_namespace::model_survival_param; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here -/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_survival_param.o] Error 1 -ERROR: compilation failed for package ‘multinma’ -* removing ‘/tmp/workdir/multinma/new/multinma.Rcheck/multinma’ ``` ### CRAN ``` -* installing *source* package ‘multinma’ ... -** package ‘multinma’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++17 +* using log directory ‘/tmp/workdir/MuPETFlow/old/MuPETFlow.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘MuPETFlow/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘MuPETFlow.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 NOTE + -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/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.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_survival_param_namespace::model_survival_param; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here -/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_survival_param.o] Error 1 -ERROR: compilation failed for package ‘multinma’ -* removing ‘/tmp/workdir/multinma/old/multinma.Rcheck/multinma’ ``` @@ -5143,11 +6709,11 @@ ERROR: compilation failed for package ‘multinma’
-* Version: 4.0.1 +* Version: 4.0.2 * GitHub: NA * Source code: https://github.com/cran/NCA -* Date/Publication: 2024-02-23 09:30:15 UTC -* Number of recursive dependencies: 99 +* Date/Publication: 2024-11-09 18:10:02 UTC +* Number of recursive dependencies: 98 Run `revdepcheck::cloud_details(, "NCA")` for more info @@ -5207,7 +6773,7 @@ ERROR: lazy loading failed for package ‘NCA’ * GitHub: NA * Source code: https://github.com/cran/netcmc * Date/Publication: 2022-11-08 22:30:15 UTC -* Number of recursive dependencies: 61 +* Number of recursive dependencies: 60 Run `revdepcheck::cloud_details(, "netcmc")` for more info @@ -5230,14 +6796,14 @@ Run `revdepcheck::cloud_details(, "netcmc")` for more info ** package ‘netcmc’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c choleskyDecompositionRcppConversion.cpp -o choleskyDecompositionRcppConversion.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleMatrixMultiplicationRcpp.cpp -o doubleMatrixMultiplicationRcpp.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleVectorMultiplicationRcpp.cpp -o doubleVectorMultiplicationRcpp.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c choleskyDecompositionRcppConversion.cpp -o choleskyDecompositionRcppConversion.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleMatrixMultiplicationRcpp.cpp -o doubleMatrixMultiplicationRcpp.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleVectorMultiplicationRcpp.cpp -o doubleVectorMultiplicationRcpp.o ... -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c vectorVectorTransposeMultiplicationRcpp.cpp -o vectorVectorTransposeMultiplicationRcpp.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c vectorVectorTransposeMultiplicationRcpp.cpp -o vectorVectorTransposeMultiplicationRcpp.o g++ -std=gnu++11 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o netcmc.so RcppExports.o choleskyDecompositionRcppConversion.o doubleMatrixMultiplicationRcpp.o doubleVectorMultiplicationRcpp.o eigenValuesRcppConversion.o getDiagonalMatrix.o getExp.o getExpDividedByOnePlusExp.o getMeanCenteredRandomEffects.o getMultivariateBinomialNetworkLerouxDIC.o getMultivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariateGaussianNetworkLerouxDIC.o getMultivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariatePoissonNetworkLerouxDIC.o getMultivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getNonZeroEntries.o getSubvector.o getSubvectorIndecies.o getSumExpNetwork.o getSumExpNetworkIndecies.o getSumExpNetworkLeroux.o getSumExpNetworkLerouxIndecies.o getSumLogExp.o getSumLogExpIndecies.o getSumVector.o getTripletForm.o getUnivariateBinomialNetworkLerouxDIC.o getUnivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariateGaussianNetworkLerouxDIC.o getUnivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkDIC.o getUnivariatePoissonNetworkFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkLerouxDIC.o getUnivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getVectorMean.o matrixInverseRcppConversion.o matrixMatrixAdditionRcpp.o matrixMatrixSubtractionRcpp.o matrixVectorMultiplicationRcpp.o multivariateBinomialNetworkLerouxAllUpdate.o multivariateBinomialNetworkLerouxBetaUpdate.o multivariateBinomialNetworkLerouxRhoUpdate.o multivariateBinomialNetworkLerouxSingleUpdate.o multivariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o multivariateBinomialNetworkLerouxTauSquaredUpdate.o multivariateBinomialNetworkLerouxURandomEffectsUpdate.o multivariateBinomialNetworkLerouxVRandomEffectsUpdate.o multivariateBinomialNetworkLerouxVarianceCovarianceUUpdate.o multivariateBinomialNetworkRandAllUpdate.o multivariateBinomialNetworkRandSingleUpdate.o multivariateGaussianNetworkLerouxAllMHUpdate.o multivariateGaussianNetworkLerouxBetaUpdate.o multivariateGaussianNetworkLerouxRhoUpdate.o multivariateGaussianNetworkLerouxSigmaSquaredEUpdate.o multivariateGaussianNetworkLerouxSingleMHUpdate.o multivariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o multivariateGaussianNetworkLerouxTauSquaredUpdate.o multivariateGaussianNetworkLerouxURandomEffectsUpdate.o multivariateGaussianNetworkLerouxVarianceCovarianceUUpdate.o multivariateGaussianNetworkRandAllUpdate.o multivariateGaussianNetworkRandSingleUpdate.o multivariateGaussianNetworkRandVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxAllUpdate.o multivariatePoissonNetworkLerouxBetaUpdate.o multivariatePoissonNetworkLerouxRhoUpdate.o multivariatePoissonNetworkLerouxSingleUpdate.o multivariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o multivariatePoissonNetworkLerouxTauSquaredUpdate.o multivariatePoissonNetworkLerouxURandomEffectsUpdate.o multivariatePoissonNetworkLerouxVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxVarianceCovarianceUUpdate.o multivariatePoissonNetworkRandAllUpdate.o multivariatePoissonNetworkRandSingleUpdate.o sumMatrix.o univariateBinomialNetworkLerouxAllUpdate.o univariateBinomialNetworkLerouxBetaUpdate.o univariateBinomialNetworkLerouxRhoUpdate.o univariateBinomialNetworkLerouxSigmaSquaredUpdate.o univariateBinomialNetworkLerouxSingleUpdate.o univariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o univariateBinomialNetworkLerouxTauSquaredUpdate.o univariateBinomialNetworkLerouxURandomEffectsUpdate.o univariateGaussianNetworkLerouxAllMHUpdate.o univariateGaussianNetworkLerouxBetaUpdate.o univariateGaussianNetworkLerouxRhoUpdate.o univariateGaussianNetworkLerouxSigmaSquaredEUpdate.o univariateGaussianNetworkLerouxSigmaSquaredUUpdate.o univariateGaussianNetworkLerouxSingleMHUpdate.o univariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o univariateGaussianNetworkLerouxTauSquaredUpdate.o univariateGaussianNetworkLerouxURandomEffectsUpdate.o univariatePoissonNetworkLerouxAllUpdate.o univariatePoissonNetworkLerouxBetaUpdate.o univariatePoissonNetworkLerouxRhoUpdate.o univariatePoissonNetworkLerouxSigmaSquaredUpdate.o univariatePoissonNetworkLerouxSingleUpdate.o univariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o univariatePoissonNetworkLerouxTauSquaredUpdate.o univariatePoissonNetworkLerouxURandomEffectsUpdate.o vectorTransposeVectorMultiplicationRcpp.o vectorVectorTransposeMultiplicationRcpp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/netcmc/new/netcmc.Rcheck/00LOCK-netcmc/00new/netcmc/libs ** R @@ -5257,14 +6823,14 @@ ERROR: lazy loading failed for package ‘netcmc’ ** package ‘netcmc’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c choleskyDecompositionRcppConversion.cpp -o choleskyDecompositionRcppConversion.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleMatrixMultiplicationRcpp.cpp -o doubleMatrixMultiplicationRcpp.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleVectorMultiplicationRcpp.cpp -o doubleVectorMultiplicationRcpp.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c choleskyDecompositionRcppConversion.cpp -o choleskyDecompositionRcppConversion.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleMatrixMultiplicationRcpp.cpp -o doubleMatrixMultiplicationRcpp.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleVectorMultiplicationRcpp.cpp -o doubleVectorMultiplicationRcpp.o ... -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c vectorVectorTransposeMultiplicationRcpp.cpp -o vectorVectorTransposeMultiplicationRcpp.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c vectorVectorTransposeMultiplicationRcpp.cpp -o vectorVectorTransposeMultiplicationRcpp.o g++ -std=gnu++11 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o netcmc.so RcppExports.o choleskyDecompositionRcppConversion.o doubleMatrixMultiplicationRcpp.o doubleVectorMultiplicationRcpp.o eigenValuesRcppConversion.o getDiagonalMatrix.o getExp.o getExpDividedByOnePlusExp.o getMeanCenteredRandomEffects.o getMultivariateBinomialNetworkLerouxDIC.o getMultivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariateGaussianNetworkLerouxDIC.o getMultivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariatePoissonNetworkLerouxDIC.o getMultivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getNonZeroEntries.o getSubvector.o getSubvectorIndecies.o getSumExpNetwork.o getSumExpNetworkIndecies.o getSumExpNetworkLeroux.o getSumExpNetworkLerouxIndecies.o getSumLogExp.o getSumLogExpIndecies.o getSumVector.o getTripletForm.o getUnivariateBinomialNetworkLerouxDIC.o getUnivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariateGaussianNetworkLerouxDIC.o getUnivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkDIC.o getUnivariatePoissonNetworkFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkLerouxDIC.o getUnivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getVectorMean.o matrixInverseRcppConversion.o matrixMatrixAdditionRcpp.o matrixMatrixSubtractionRcpp.o matrixVectorMultiplicationRcpp.o multivariateBinomialNetworkLerouxAllUpdate.o multivariateBinomialNetworkLerouxBetaUpdate.o multivariateBinomialNetworkLerouxRhoUpdate.o multivariateBinomialNetworkLerouxSingleUpdate.o multivariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o multivariateBinomialNetworkLerouxTauSquaredUpdate.o multivariateBinomialNetworkLerouxURandomEffectsUpdate.o multivariateBinomialNetworkLerouxVRandomEffectsUpdate.o multivariateBinomialNetworkLerouxVarianceCovarianceUUpdate.o multivariateBinomialNetworkRandAllUpdate.o multivariateBinomialNetworkRandSingleUpdate.o multivariateGaussianNetworkLerouxAllMHUpdate.o multivariateGaussianNetworkLerouxBetaUpdate.o multivariateGaussianNetworkLerouxRhoUpdate.o multivariateGaussianNetworkLerouxSigmaSquaredEUpdate.o multivariateGaussianNetworkLerouxSingleMHUpdate.o multivariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o multivariateGaussianNetworkLerouxTauSquaredUpdate.o multivariateGaussianNetworkLerouxURandomEffectsUpdate.o multivariateGaussianNetworkLerouxVarianceCovarianceUUpdate.o multivariateGaussianNetworkRandAllUpdate.o multivariateGaussianNetworkRandSingleUpdate.o multivariateGaussianNetworkRandVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxAllUpdate.o multivariatePoissonNetworkLerouxBetaUpdate.o multivariatePoissonNetworkLerouxRhoUpdate.o multivariatePoissonNetworkLerouxSingleUpdate.o multivariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o multivariatePoissonNetworkLerouxTauSquaredUpdate.o multivariatePoissonNetworkLerouxURandomEffectsUpdate.o multivariatePoissonNetworkLerouxVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxVarianceCovarianceUUpdate.o multivariatePoissonNetworkRandAllUpdate.o multivariatePoissonNetworkRandSingleUpdate.o sumMatrix.o univariateBinomialNetworkLerouxAllUpdate.o univariateBinomialNetworkLerouxBetaUpdate.o univariateBinomialNetworkLerouxRhoUpdate.o univariateBinomialNetworkLerouxSigmaSquaredUpdate.o univariateBinomialNetworkLerouxSingleUpdate.o univariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o univariateBinomialNetworkLerouxTauSquaredUpdate.o univariateBinomialNetworkLerouxURandomEffectsUpdate.o univariateGaussianNetworkLerouxAllMHUpdate.o univariateGaussianNetworkLerouxBetaUpdate.o univariateGaussianNetworkLerouxRhoUpdate.o univariateGaussianNetworkLerouxSigmaSquaredEUpdate.o univariateGaussianNetworkLerouxSigmaSquaredUUpdate.o univariateGaussianNetworkLerouxSingleMHUpdate.o univariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o univariateGaussianNetworkLerouxTauSquaredUpdate.o univariateGaussianNetworkLerouxURandomEffectsUpdate.o univariatePoissonNetworkLerouxAllUpdate.o univariatePoissonNetworkLerouxBetaUpdate.o univariatePoissonNetworkLerouxRhoUpdate.o univariatePoissonNetworkLerouxSigmaSquaredUpdate.o univariatePoissonNetworkLerouxSingleUpdate.o univariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o univariatePoissonNetworkLerouxTauSquaredUpdate.o univariatePoissonNetworkLerouxURandomEffectsUpdate.o vectorTransposeVectorMultiplicationRcpp.o vectorVectorTransposeMultiplicationRcpp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/netcmc/old/netcmc.Rcheck/00LOCK-netcmc/00new/netcmc/libs ** R @@ -5285,7 +6851,7 @@ ERROR: lazy loading failed for package ‘netcmc’ * GitHub: https://github.com/jongheepark/NetworkChange * Source code: https://github.com/cran/NetworkChange * Date/Publication: 2022-03-04 07:30:02 UTC -* Number of recursive dependencies: 133 +* Number of recursive dependencies: 122 Run `revdepcheck::cloud_details(, "NetworkChange")` for more info @@ -5366,10 +6932,10 @@ Run `revdepcheck::cloud_details(, "nlmeVPC")` for more info ** package ‘nlmeVPC’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Misc.cpp -o Misc.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Misc.cpp -o Misc.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o g++ -std=gnu++11 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o nlmeVPC.so Misc.o RcppExports.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/nlmeVPC/new/nlmeVPC.Rcheck/00LOCK-nlmeVPC/00new/nlmeVPC/libs ** R @@ -5391,10 +6957,10 @@ ERROR: lazy loading failed for package ‘nlmeVPC’ ** package ‘nlmeVPC’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Misc.cpp -o Misc.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Misc.cpp -o Misc.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o g++ -std=gnu++11 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o nlmeVPC.so Misc.o RcppExports.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/nlmeVPC/old/nlmeVPC.Rcheck/00LOCK-nlmeVPC/00new/nlmeVPC/libs ** R @@ -5417,7 +6983,7 @@ ERROR: lazy loading failed for package ‘nlmeVPC’ * GitHub: NA * Source code: https://github.com/cran/NMADiagT * Date/Publication: 2020-02-26 07:00:02 UTC -* Number of recursive dependencies: 79 +* Number of recursive dependencies: 78 Run `revdepcheck::cloud_details(, "NMADiagT")` for more info @@ -5469,102 +7035,53 @@ ERROR: lazy loading failed for package ‘NMADiagT’ ``` -# ohun - -
- -* Version: 1.0.2 -* GitHub: https://github.com/ropensci/ohun -* Source code: https://github.com/cran/ohun -* Date/Publication: 2024-08-19 18:40:02 UTC -* Number of recursive dependencies: 100 - -Run `revdepcheck::cloud_details(, "ohun")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/ohun/new/ohun.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘ohun/DESCRIPTION’ ... OK -... -* this is package ‘ohun’ version ‘1.0.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘warbleR’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/ohun/old/ohun.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘ohun/DESCRIPTION’ ... OK -... -* this is package ‘ohun’ version ‘1.0.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘warbleR’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# optweight +# NMF
-* Version: 0.2.5 +* Version: 0.28 * GitHub: NA -* Source code: https://github.com/cran/optweight -* Date/Publication: 2019-09-16 15:40:02 UTC -* Number of recursive dependencies: 55 +* Source code: https://github.com/cran/NMF +* Date/Publication: 2024-08-22 16:20:01 UTC +* Number of recursive dependencies: 132 -Run `revdepcheck::cloud_details(, "optweight")` for more info +Run `revdepcheck::cloud_details(, "NMF")` for more info
-## In both +## Newly broken -* checking whether package ‘optweight’ can be installed ... ERROR +* checking whether package ‘NMF’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/optweight/new/optweight.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/NMF/new/NMF.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘NMF-vignette.Rnw’ using knitr + Error in citation(x) : there is no package called 'doMC' + Converted 9 of 10 package citations to BibTeX + Writing 11 Bibtex entries ... OK + Results written to file 'Rpackages.bib' + Error: processing vignette 'NMF-vignette.Rnw' failed with diagnostics: + Running 'texi2dvi' on 'NMF-vignette.tex' failed. + LaTeX errors: + ! LaTeX Error: File `a4wide.sty' not found. + ... + l.62 \usepackage + {xspace}^^M + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘heatmaps.Rnw’ + + SUMMARY: processing the following files failed: + ‘NMF-vignette.Rnw’ ‘heatmaps.Rnw’ + + Error: Vignette re-building failed. + Execution halted ``` ## Installation @@ -5572,110 +7089,68 @@ Run `revdepcheck::cloud_details(, "optweight")` for more info ### Devel ``` -* installing *source* package ‘optweight’ ... -** package ‘optweight’ successfully unpacked and MD5 sums checked +* installing *source* package ‘NMF’ ... +** package ‘NMF’ successfully unpacked and MD5 sums checked ** using staged installation -** R -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c distance.cpp -o distance.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c divergence.cpp -o divergence.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c euclidean.cpp -o euclidean.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c registerDynamicSymbol.c -o registerDynamicSymbol.o +... +Creating meta registry in package 'NMF' ... OK +Creating registry 'extra_handler' in package 'NMF' ... OK +Creating registry 'extra_action' in package 'NMF' ... OK +Registering extra handler 'install.packages' [function] ... OK +Creating registry 'algorithm' in package 'NMF' ... OK +Error in is.element("...", n.update) : unused argument (n.update) +Error: unable to load R code in package ‘NMF’ Execution halted -ERROR: lazy loading failed for package ‘optweight’ -* removing ‘/tmp/workdir/optweight/new/optweight.Rcheck/optweight’ +ERROR: lazy loading failed for package ‘NMF’ +* removing ‘/tmp/workdir/NMF/new/NMF.Rcheck/NMF’ ``` ### CRAN ``` -* installing *source* package ‘optweight’ ... -** package ‘optweight’ successfully unpacked and MD5 sums checked +* installing *source* package ‘NMF’ ... +** package ‘NMF’ successfully unpacked and MD5 sums checked ** using staged installation -** R -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘optweight’ -* removing ‘/tmp/workdir/optweight/old/optweight.Rcheck/optweight’ +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c distance.cpp -o distance.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c divergence.cpp -o divergence.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c euclidean.cpp -o euclidean.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c registerDynamicSymbol.c -o registerDynamicSymbol.o +... +Registering NMF seeding method 'nndsvd' [NMFSeed] ... OK +** help +*** installing help indices +** building package indices +** installing vignettes +** testing if installed package can be loaded from temporary location +** checking absolute paths in shared objects and dynamic libraries +** testing if installed package can be loaded from final location +** testing if installed package keeps a record of temporary installation path +* DONE (NMF) ``` -# OVtool +# obliqueRSF
-* Version: 1.0.3 +* Version: 0.1.2 * GitHub: NA -* Source code: https://github.com/cran/OVtool -* Date/Publication: 2021-11-02 08:10:07 UTC -* Number of recursive dependencies: 157 - -Run `revdepcheck::cloud_details(, "OVtool")` for more info - -
- -## In both - -* checking whether package ‘OVtool’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/OVtool/new/OVtool.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘OVtool’ ... -** package ‘OVtool’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘twang’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘OVtool’ -* removing ‘/tmp/workdir/OVtool/new/OVtool.Rcheck/OVtool’ - - -``` -### CRAN - -``` -* installing *source* package ‘OVtool’ ... -** package ‘OVtool’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘twang’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘OVtool’ -* removing ‘/tmp/workdir/OVtool/old/OVtool.Rcheck/OVtool’ - - -``` -# pagoda2 - -
- -* Version: 1.0.12 -* GitHub: https://github.com/kharchenkolab/pagoda2 -* Source code: https://github.com/cran/pagoda2 -* Date/Publication: 2024-02-27 00:50:02 UTC -* Number of recursive dependencies: 162 +* Source code: https://github.com/cran/obliqueRSF +* Date/Publication: 2022-08-28 20:50:02 UTC +* Number of recursive dependencies: 117 -Run `revdepcheck::cloud_details(, "pagoda2")` for more info +Run `revdepcheck::cloud_details(, "obliqueRSF")` for more info
@@ -5684,27 +7159,27 @@ Run `revdepcheck::cloud_details(, "pagoda2")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/pagoda2/new/pagoda2.Rcheck’ +* using log directory ‘/tmp/workdir/obliqueRSF/new/obliqueRSF.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘pagoda2/DESCRIPTION’ ... OK +* checking for file ‘obliqueRSF/DESCRIPTION’ ... OK ... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘rjson’ - -Package suggested but not available for checking: ‘scde’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* 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 line endings in C/C++/Fortran sources/headers ... OK +* checking compiled code ... OK +* checking examples ... OK * DONE -Status: 1 ERROR +Status: OK @@ -5714,117 +7189,129 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/pagoda2/old/pagoda2.Rcheck’ +* using log directory ‘/tmp/workdir/obliqueRSF/old/obliqueRSF.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘pagoda2/DESCRIPTION’ ... OK +* checking for file ‘obliqueRSF/DESCRIPTION’ ... OK ... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘rjson’ +* 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 line endings in C/C++/Fortran sources/headers ... OK +* checking compiled code ... OK +* checking examples ... OK +* DONE +Status: OK + -Package suggested but not available for checking: ‘scde’ -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR +``` +# OlinkAnalyze + +
+ +* Version: 4.0.2 +* GitHub: https://github.com/Olink-Proteomics/OlinkRPackage +* Source code: https://github.com/cran/OlinkAnalyze +* Date/Publication: 2024-11-22 16:20:02 UTC +* Number of recursive dependencies: 210 + +Run `revdepcheck::cloud_details(, "OlinkAnalyze")` for more info + +
+ +## Error before installation + +### Devel +``` +* using log directory ‘/tmp/workdir/OlinkAnalyze/new/OlinkAnalyze.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘OlinkAnalyze/DESCRIPTION’ ... OK +... +--- finished re-building ‘plate_randomizer.Rmd’ +SUMMARY: processing the following file failed: + ‘Vignett.Rmd’ -``` -# PAMpal +Error: Vignette re-building failed. +Execution halted -
+* DONE +Status: 1 ERROR, 2 NOTEs -* Version: 1.2.1 -* GitHub: NA -* Source code: https://github.com/cran/PAMpal -* Date/Publication: 2024-07-11 22:50:02 UTC -* Number of recursive dependencies: 118 -Run `revdepcheck::cloud_details(, "PAMpal")` for more info -
-## In both -* checking whether package ‘PAMpal’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/PAMpal/new/PAMpal.Rcheck/00install.out’ for details. - ``` +``` +### CRAN -## Installation +``` +* using log directory ‘/tmp/workdir/OlinkAnalyze/old/OlinkAnalyze.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘OlinkAnalyze/DESCRIPTION’ ... OK +... +--- finished re-building ‘plate_randomizer.Rmd’ -### Devel +SUMMARY: processing the following file failed: + ‘Vignett.Rmd’ -``` -* installing *source* package ‘PAMpal’ ... -** package ‘PAMpal’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rjson’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Error: Vignette re-building failed. Execution halted -ERROR: lazy loading failed for package ‘PAMpal’ -* removing ‘/tmp/workdir/PAMpal/new/PAMpal.Rcheck/PAMpal’ + +* DONE +Status: 1 ERROR, 2 NOTEs -``` -### CRAN -``` -* installing *source* package ‘PAMpal’ ... -** package ‘PAMpal’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rjson’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘PAMpal’ -* removing ‘/tmp/workdir/PAMpal/old/PAMpal.Rcheck/PAMpal’ ``` -# PAMscapes +# optweight
-* Version: 0.6.0 +* Version: 0.2.5 * GitHub: NA -* Source code: https://github.com/cran/PAMscapes -* Date/Publication: 2024-07-09 22:50:02 UTC -* Number of recursive dependencies: 110 +* Source code: https://github.com/cran/optweight +* Date/Publication: 2019-09-16 15:40:02 UTC +* Number of recursive dependencies: 55 -Run `revdepcheck::cloud_details(, "PAMscapes")` for more info +Run `revdepcheck::cloud_details(, "optweight")` for more info
## In both -* checking whether package ‘PAMscapes’ can be installed ... ERROR +* checking whether package ‘optweight’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/PAMscapes/new/PAMscapes.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/optweight/new/optweight.Rcheck/00install.out’ for details. ``` ## Installation @@ -5832,59 +7319,57 @@ Run `revdepcheck::cloud_details(, "PAMscapes")` for more info ### Devel ``` -* installing *source* package ‘PAMscapes’ ... -** package ‘PAMscapes’ successfully unpacked and MD5 sums checked +* installing *source* package ‘optweight’ ... +** package ‘optweight’ successfully unpacked and MD5 sums checked ** using staged installation ** R -** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rjson’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘PAMscapes’ -* removing ‘/tmp/workdir/PAMscapes/new/PAMscapes.Rcheck/PAMscapes’ +ERROR: lazy loading failed for package ‘optweight’ +* removing ‘/tmp/workdir/optweight/new/optweight.Rcheck/optweight’ ``` ### CRAN ``` -* installing *source* package ‘PAMscapes’ ... -** package ‘PAMscapes’ successfully unpacked and MD5 sums checked +* installing *source* package ‘optweight’ ... +** package ‘optweight’ successfully unpacked and MD5 sums checked ** using staged installation ** R -** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rjson’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘PAMscapes’ -* removing ‘/tmp/workdir/PAMscapes/old/PAMscapes.Rcheck/PAMscapes’ +ERROR: lazy loading failed for package ‘optweight’ +* removing ‘/tmp/workdir/optweight/old/optweight.Rcheck/optweight’ ``` -# paths +# OVtool
-* Version: 0.1.1 +* Version: 1.0.3 * GitHub: NA -* Source code: https://github.com/cran/paths -* Date/Publication: 2021-06-18 08:40:02 UTC -* Number of recursive dependencies: 102 +* Source code: https://github.com/cran/OVtool +* Date/Publication: 2021-11-02 08:10:07 UTC +* Number of recursive dependencies: 156 -Run `revdepcheck::cloud_details(, "paths")` for more info +Run `revdepcheck::cloud_details(, "OVtool")` for more info
## In both -* checking whether package ‘paths’ can be installed ... ERROR +* checking whether package ‘OVtool’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/paths/new/paths.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/OVtool/new/OVtool.Rcheck/00install.out’ for details. ``` ## Installation @@ -5892,53 +7377,52 @@ Run `revdepcheck::cloud_details(, "paths")` for more info ### Devel ``` -* installing *source* package ‘paths’ ... -** package ‘paths’ successfully unpacked and MD5 sums checked +* installing *source* package ‘OVtool’ ... +** package ‘OVtool’ successfully unpacked and MD5 sums checked ** using staged installation ** R ** data *** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Error: package or namespace load failed for ‘twang’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Execution halted -ERROR: lazy loading failed for package ‘paths’ -* removing ‘/tmp/workdir/paths/new/paths.Rcheck/paths’ +ERROR: lazy loading failed for package ‘OVtool’ +* removing ‘/tmp/workdir/OVtool/new/OVtool.Rcheck/OVtool’ ``` ### CRAN ``` -* installing *source* package ‘paths’ ... -** package ‘paths’ successfully unpacked and MD5 sums checked +* installing *source* package ‘OVtool’ ... +** package ‘OVtool’ successfully unpacked and MD5 sums checked ** using staged installation ** R ** data *** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Error: package or namespace load failed for ‘twang’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Execution halted -ERROR: lazy loading failed for package ‘paths’ -* removing ‘/tmp/workdir/paths/old/paths.Rcheck/paths’ +ERROR: lazy loading failed for package ‘OVtool’ +* removing ‘/tmp/workdir/OVtool/old/OVtool.Rcheck/OVtool’ ``` -# PathwaySpace +# pammtools
-* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/PathwaySpace -* Number of recursive dependencies: 70 +* Version: 0.5.93 +* GitHub: https://github.com/adibender/pammtools +* Source code: https://github.com/cran/pammtools +* Date/Publication: 2024-02-25 10:10:02 UTC +* Number of recursive dependencies: 124 -Run `revdepcheck::cloud_details(, "PathwaySpace")` for more info +Run `revdepcheck::cloud_details(, "pammtools")` for more info
@@ -5947,7 +7431,27 @@ Run `revdepcheck::cloud_details(, "PathwaySpace")` for more info ### Devel ``` - +* using log directory ‘/tmp/workdir/pammtools/new/pammtools.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘pammtools/DESCRIPTION’ ... OK +... +* checking data for non-ASCII characters ... OK +* checking LazyData ... OK +* checking data for ASCII and uncompressed saves ... OK +* checking R/sysdata.rda ... OK +* checking examples ... OK +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* DONE +Status: OK @@ -5957,33 +7461,53 @@ Run `revdepcheck::cloud_details(, "PathwaySpace")` for more info ### CRAN ``` - +* using log directory ‘/tmp/workdir/pammtools/old/pammtools.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘pammtools/DESCRIPTION’ ... OK +... +* checking data for non-ASCII characters ... OK +* checking LazyData ... OK +* checking data for ASCII and uncompressed saves ... OK +* checking R/sysdata.rda ... OK +* checking examples ... OK +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* DONE +Status: OK ``` -# pcvr +# paths
-* Version: 1.0.0 -* GitHub: https://github.com/danforthcenter/pcvr -* Source code: https://github.com/cran/pcvr -* Date/Publication: 2024-09-05 17:30:02 UTC -* Number of recursive dependencies: 189 +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/paths +* Date/Publication: 2021-06-18 08:40:02 UTC +* Number of recursive dependencies: 102 -Run `revdepcheck::cloud_details(, "pcvr")` for more info +Run `revdepcheck::cloud_details(, "paths")` for more info
## In both -* checking whether package ‘pcvr’ can be installed ... ERROR +* checking whether package ‘paths’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/pcvr/new/pcvr.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/paths/new/paths.Rcheck/00install.out’ for details. ``` ## Installation @@ -5991,60 +7515,53 @@ Run `revdepcheck::cloud_details(, "pcvr")` for more info ### Devel ``` -* installing *source* package ‘pcvr’ ... -** package ‘pcvr’ successfully unpacked and MD5 sums checked +* installing *source* package ‘paths’ ... +** package ‘paths’ successfully unpacked and MD5 sums checked ** using staged installation ** R +** data +*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘pcvr’ -* removing ‘/tmp/workdir/pcvr/new/pcvr.Rcheck/pcvr’ +ERROR: lazy loading failed for package ‘paths’ +* removing ‘/tmp/workdir/paths/new/paths.Rcheck/paths’ ``` ### CRAN ``` -* installing *source* package ‘pcvr’ ... -** package ‘pcvr’ successfully unpacked and MD5 sums checked +* installing *source* package ‘paths’ ... +** package ‘paths’ successfully unpacked and MD5 sums checked ** using staged installation ** R +** data +*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘pcvr’ -* removing ‘/tmp/workdir/pcvr/old/pcvr.Rcheck/pcvr’ +ERROR: lazy loading failed for package ‘paths’ +* removing ‘/tmp/workdir/paths/old/paths.Rcheck/paths’ ``` -# PlasmaMutationDetector +# PathwaySpace
-* Version: 1.7.2 +* Version: NA * GitHub: NA -* Source code: https://github.com/cran/PlasmaMutationDetector -* Date/Publication: 2018-06-11 07:43:09 UTC -* Number of recursive dependencies: 91 +* Source code: https://github.com/cran/PathwaySpace +* Number of recursive dependencies: 69 -Run `revdepcheck::cloud_details(, "PlasmaMutationDetector")` for more info +Run `revdepcheck::cloud_details(, "PathwaySpace")` for more info
@@ -6053,27 +7570,7 @@ Run `revdepcheck::cloud_details(, "PlasmaMutationDetector")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/PlasmaMutationDetector/new/PlasmaMutationDetector.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘PlasmaMutationDetector/DESCRIPTION’ ... OK -... -* this is package ‘PlasmaMutationDetector’ version ‘1.7.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'VariantAnnotation', 'rtracklayer' -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR @@ -6083,106 +7580,80 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/PlasmaMutationDetector/old/PlasmaMutationDetector.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘PlasmaMutationDetector/DESCRIPTION’ ... OK -... -* this is package ‘PlasmaMutationDetector’ version ‘1.7.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'VariantAnnotation', 'rtracklayer' -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR ``` -# PlasmaMutationDetector2 +# pcvr
-* Version: 1.1.11 -* GitHub: NA -* Source code: https://github.com/cran/PlasmaMutationDetector2 -* Date/Publication: 2022-05-03 10:00:08 UTC -* Number of recursive dependencies: 91 - -Run `revdepcheck::cloud_details(, "PlasmaMutationDetector2")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/PlasmaMutationDetector2/new/PlasmaMutationDetector2.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘PlasmaMutationDetector2/DESCRIPTION’ ... OK -... -* this is package ‘PlasmaMutationDetector2’ version ‘1.1.11’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'VariantAnnotation', 'rtracklayer' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR +* Version: 1.1.1.0 +* GitHub: https://github.com/danforthcenter/pcvr +* Source code: https://github.com/cran/pcvr +* Date/Publication: 2024-11-06 20:50:02 UTC +* Number of recursive dependencies: 192 +Run `revdepcheck::cloud_details(, "pcvr")` for more info +
+## In both +* checking whether package ‘pcvr’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/pcvr/new/pcvr.Rcheck/00install.out’ for details. + ``` -``` -### CRAN +## Installation -``` -* using log directory ‘/tmp/workdir/PlasmaMutationDetector2/old/PlasmaMutationDetector2.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘PlasmaMutationDetector2/DESCRIPTION’ ... OK -... -* this is package ‘PlasmaMutationDetector2’ version ‘1.1.11’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'VariantAnnotation', 'rtracklayer' +### Devel -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR +``` +* installing *source* package ‘pcvr’ ... +** package ‘pcvr’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘pcvr’ +* removing ‘/tmp/workdir/pcvr/new/pcvr.Rcheck/pcvr’ +``` +### CRAN +``` +* installing *source* package ‘pcvr’ ... +** package ‘pcvr’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘pcvr’ +* removing ‘/tmp/workdir/pcvr/old/pcvr.Rcheck/pcvr’ ``` @@ -6194,7 +7665,7 @@ Status: 1 ERROR * GitHub: NA * Source code: https://github.com/cran/PLMIX * Date/Publication: 2019-09-04 11:50:02 UTC -* Number of recursive dependencies: 139 +* Number of recursive dependencies: 128 Run `revdepcheck::cloud_details(, "PLMIX")` for more info @@ -6217,12 +7688,12 @@ Run `revdepcheck::cloud_details(, "PLMIX")` for more info ** package ‘PLMIX’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompProbZpartial.cpp -o CompProbZpartial.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompRateP.cpp -o CompRateP.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompRateYpartial.cpp -o CompRateYpartial.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c Estep.cpp -o Estep.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c PLMIXsim.cpp -o PLMIXsim.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompProbZpartial.cpp -o CompProbZpartial.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompRateP.cpp -o CompRateP.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompRateYpartial.cpp -o CompRateYpartial.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c Estep.cpp -o Estep.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c PLMIXsim.cpp -o PLMIXsim.o ... ** data *** moving datasets to lazyload DB @@ -6244,12 +7715,12 @@ ERROR: lazy loading failed for package ‘PLMIX’ ** package ‘PLMIX’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompProbZpartial.cpp -o CompProbZpartial.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompRateP.cpp -o CompRateP.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompRateYpartial.cpp -o CompRateYpartial.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c Estep.cpp -o Estep.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c PLMIXsim.cpp -o PLMIXsim.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompProbZpartial.cpp -o CompProbZpartial.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompRateP.cpp -o CompRateP.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c CompRateYpartial.cpp -o CompRateYpartial.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c Estep.cpp -o Estep.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c PLMIXsim.cpp -o PLMIXsim.o ... ** data *** moving datasets to lazyload DB @@ -6263,82 +7734,6 @@ ERROR: lazy loading failed for package ‘PLMIX’ * removing ‘/tmp/workdir/PLMIX/old/PLMIX.Rcheck/PLMIX’ -``` -# polyRAD - -
- -* Version: 2.0.0 -* GitHub: https://github.com/lvclark/polyRAD -* Source code: https://github.com/cran/polyRAD -* Date/Publication: 2022-11-06 21:50:02 UTC -* Number of recursive dependencies: 135 - -Run `revdepcheck::cloud_details(, "polyRAD")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/polyRAD/new/polyRAD.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘polyRAD/DESCRIPTION’ ... OK -... - - When sourcing ‘polyRADtutorial.R’: -Error: Probabilities must be finite and non-negative! -Execution halted - - ‘isolocus_sorting.Rmd’ using ‘UTF-8’... OK - ‘polyRADtutorial.Rmd’ using ‘UTF-8’... failed -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 ERROR, 3 NOTEs - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/polyRAD/old/polyRAD.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘polyRAD/DESCRIPTION’ ... OK -... - - When sourcing ‘polyRADtutorial.R’: -Error: Probabilities must be finite and non-negative! -Execution halted - - ‘isolocus_sorting.Rmd’ using ‘UTF-8’... OK - ‘polyRADtutorial.Rmd’ using ‘UTF-8’... failed -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 ERROR, 3 NOTEs - - - - - ``` # popstudy @@ -6348,7 +7743,7 @@ Status: 1 ERROR, 3 NOTEs * GitHub: NA * Source code: https://github.com/cran/popstudy * Date/Publication: 2023-10-17 23:50:02 UTC -* Number of recursive dependencies: 240 +* Number of recursive dependencies: 242 Run `revdepcheck::cloud_details(, "popstudy")` for more info @@ -6418,53 +7813,65 @@ Run `revdepcheck::cloud_details(, "pould")` for more info
-## In both - -* checking whether package ‘pould’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/pould/new/pould.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘pould’ ... -** package ‘pould’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : - there is no package called ‘rms’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘pould’ -* removing ‘/tmp/workdir/pould/new/pould.Rcheck/pould’ +* using log directory ‘/tmp/workdir/pould/new/pould.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘pould/DESCRIPTION’ ... OK +... +* this is package ‘pould’ version ‘1.0.1’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘haplo.stats’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` ### CRAN ``` -* installing *source* package ‘pould’ ... -** package ‘pould’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : - there is no package called ‘rms’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘pould’ -* removing ‘/tmp/workdir/pould/old/pould.Rcheck/pould’ +* using log directory ‘/tmp/workdir/pould/old/pould.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘pould/DESCRIPTION’ ... OK +... +* this is package ‘pould’ version ‘1.0.1’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘haplo.stats’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` @@ -6540,7 +7947,7 @@ ERROR: lazy loading failed for package ‘PoweREST’ * GitHub: https://github.com/mihaiconstantin/powerly * Source code: https://github.com/cran/powerly * Date/Publication: 2022-09-09 14:10:01 UTC -* Number of recursive dependencies: 181 +* Number of recursive dependencies: 169 Run `revdepcheck::cloud_details(, "powerly")` for more info @@ -6610,7 +8017,7 @@ ERROR: lazy loading failed for package ‘powerly’ * GitHub: https://github.com/marjoleinF/pre * Source code: https://github.com/cran/pre * Date/Publication: 2024-01-12 19:30:02 UTC -* Number of recursive dependencies: 151 +* Number of recursive dependencies: 153 Run `revdepcheck::cloud_details(, "pre")` for more info @@ -6674,7 +8081,7 @@ ERROR: lazy loading failed for package ‘pre’ * GitHub: https://github.com/feiyoung/ProFAST * Source code: https://github.com/cran/ProFAST * Date/Publication: 2024-03-18 08:10:06 UTC -* Number of recursive dependencies: 245 +* Number of recursive dependencies: 248 Run `revdepcheck::cloud_details(, "ProFAST")` for more info @@ -6689,9 +8096,9 @@ Run `revdepcheck::cloud_details(, "ProFAST")` for more info * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘ProFAST/DESCRIPTION’ ... OK @@ -6719,9 +8126,9 @@ Status: 1 ERROR * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘ProFAST/DESCRIPTION’ ... OK @@ -6750,73 +8157,71 @@ Status: 1 ERROR * GitHub: https://github.com/ocbe-uio/psbcSpeedUp * Source code: https://github.com/cran/psbcSpeedUp * Date/Publication: 2024-07-01 09:00:02 UTC -* Number of recursive dependencies: 130 +* Number of recursive dependencies: 119 Run `revdepcheck::cloud_details(, "psbcSpeedUp")` for more info
-## In both - -* checking whether package ‘psbcSpeedUp’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/psbcSpeedUp/new/psbcSpeedUp.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘psbcSpeedUp’ ... -** package ‘psbcSpeedUp’ successfully unpacked and MD5 sums checked -** using staged installation -checking whether the C++ compiler works... yes -checking for C++ compiler default output file name... a.out -checking for suffix of executables... -checking whether we are cross compiling... no -checking for suffix of object files... o -checking whether the compiler supports GNU C++... yes -checking whether g++ -std=gnu++17 accepts -g... yes +* using log directory ‘/tmp/workdir/psbcSpeedUp/new/psbcSpeedUp.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘psbcSpeedUp/DESCRIPTION’ ... OK ... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rms’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘psbcSpeedUp’ -* removing ‘/tmp/workdir/psbcSpeedUp/new/psbcSpeedUp.Rcheck/psbcSpeedUp’ +* this is package ‘psbcSpeedUp’ version ‘2.0.7’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` ### CRAN ``` -* installing *source* package ‘psbcSpeedUp’ ... -** package ‘psbcSpeedUp’ successfully unpacked and MD5 sums checked -** using staged installation -checking whether the C++ compiler works... yes -checking for C++ compiler default output file name... a.out -checking for suffix of executables... -checking whether we are cross compiling... no -checking for suffix of object files... o -checking whether the compiler supports GNU C++... yes -checking whether g++ -std=gnu++17 accepts -g... yes +* using log directory ‘/tmp/workdir/psbcSpeedUp/old/psbcSpeedUp.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘psbcSpeedUp/DESCRIPTION’ ... OK ... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rms’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘psbcSpeedUp’ -* removing ‘/tmp/workdir/psbcSpeedUp/old/psbcSpeedUp.Rcheck/psbcSpeedUp’ +* this is package ‘psbcSpeedUp’ version ‘2.0.7’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘riskRegression’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` @@ -6828,7 +8233,7 @@ ERROR: lazy loading failed for package ‘psbcSpeedUp’ * GitHub: https://github.com/JWiley/score-project * Source code: https://github.com/cran/pscore * Date/Publication: 2022-05-13 22:30:02 UTC -* Number of recursive dependencies: 169 +* Number of recursive dependencies: 171 Run `revdepcheck::cloud_details(, "pscore")` for more info @@ -6891,6 +8296,41 @@ ERROR: lazy loading failed for package ‘pscore’ * removing ‘/tmp/workdir/pscore/old/pscore.Rcheck/pscore’ +``` +# pubh + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/pubh +* Number of recursive dependencies: 161 + +Run `revdepcheck::cloud_details(, "pubh")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + ``` # qPCRtools @@ -6900,7 +8340,7 @@ ERROR: lazy loading failed for package ‘pscore’ * GitHub: https://github.com/lixiang117423/qPCRtools * Source code: https://github.com/cran/qPCRtools * Date/Publication: 2023-11-02 13:10:05 UTC -* Number of recursive dependencies: 106 +* Number of recursive dependencies: 110 Run `revdepcheck::cloud_details(, "qPCRtools")` for more info @@ -6960,7 +8400,7 @@ ERROR: lazy loading failed for package ‘qPCRtools’ * GitHub: https://github.com/Kyuhyun07/qris * Source code: https://github.com/cran/qris * Date/Publication: 2024-03-05 14:40:03 UTC -* Number of recursive dependencies: 55 +* Number of recursive dependencies: 54 Run `revdepcheck::cloud_details(, "qris")` for more info @@ -6983,12 +8423,12 @@ Run `revdepcheck::cloud_details(, "qris")` for more info ** package ‘qris’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Amat.cpp -o Amat.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c ghat.cpp -o ghat.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Amat.cpp -o Amat.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c ghat.cpp -o ghat.o ... installing to /tmp/workdir/qris/new/qris.Rcheck/00LOCK-qris/00new/qris/libs ** R @@ -7010,12 +8450,12 @@ ERROR: lazy loading failed for package ‘qris’ ** package ‘qris’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Amat.cpp -o Amat.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c ghat.cpp -o ghat.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Amat.cpp -o Amat.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c ghat.cpp -o ghat.o ... installing to /tmp/workdir/qris/old/qris.Rcheck/00LOCK-qris/00new/qris/libs ** R @@ -7038,7 +8478,7 @@ ERROR: lazy loading failed for package ‘qris’ * GitHub: NA * Source code: https://github.com/cran/qte * Date/Publication: 2022-09-01 14:30:02 UTC -* Number of recursive dependencies: 87 +* Number of recursive dependencies: 123 Run `revdepcheck::cloud_details(, "qte")` for more info @@ -7164,7 +8604,7 @@ ERROR: lazy loading failed for package ‘quantilogram’ * GitHub: NA * Source code: https://github.com/cran/quid * Date/Publication: 2021-12-09 09:00:02 UTC -* Number of recursive dependencies: 95 +* Number of recursive dependencies: 94 Run `revdepcheck::cloud_details(, "quid")` for more info @@ -7224,144 +8664,407 @@ ERROR: lazy loading failed for package ‘quid’
-* Version: 3.2 +* Version: 3.2 +* GitHub: NA +* Source code: https://github.com/cran/RcmdrPlugin.RiskDemo +* Date/Publication: 2024-02-06 09:20:02 UTC +* Number of recursive dependencies: 201 + +Run `revdepcheck::cloud_details(, "RcmdrPlugin.RiskDemo")` for more info + +
+ +## In both + +* checking whether package ‘RcmdrPlugin.RiskDemo’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/RcmdrPlugin.RiskDemo/new/RcmdrPlugin.RiskDemo.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘RcmdrPlugin.RiskDemo’ ... +** package ‘RcmdrPlugin.RiskDemo’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘RcmdrPlugin.RiskDemo’ +* removing ‘/tmp/workdir/RcmdrPlugin.RiskDemo/new/RcmdrPlugin.RiskDemo.Rcheck/RcmdrPlugin.RiskDemo’ + + +``` +### CRAN + +``` +* installing *source* package ‘RcmdrPlugin.RiskDemo’ ... +** package ‘RcmdrPlugin.RiskDemo’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Warning in check_dep_version() : + ABI version mismatch: +lme4 was built with Matrix ABI version 1 +Current Matrix ABI version is 0 +Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘RcmdrPlugin.RiskDemo’ +* removing ‘/tmp/workdir/RcmdrPlugin.RiskDemo/old/RcmdrPlugin.RiskDemo.Rcheck/RcmdrPlugin.RiskDemo’ + + +``` +# rddtools + +
+ +* Version: 1.6.0 +* GitHub: https://github.com/bquast/rddtools +* Source code: https://github.com/cran/rddtools +* Date/Publication: 2022-01-10 12:42:49 UTC +* Number of recursive dependencies: 108 + +Run `revdepcheck::cloud_details(, "rddtools")` for more info + +
+ +## In both + +* checking whether package ‘rddtools’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/rddtools/new/rddtools.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘rddtools’ ... +** package ‘rddtools’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘rddtools’ +* removing ‘/tmp/workdir/rddtools/new/rddtools.Rcheck/rddtools’ + + +``` +### CRAN + +``` +* installing *source* package ‘rddtools’ ... +** package ‘rddtools’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘rddtools’ +* removing ‘/tmp/workdir/rddtools/old/rddtools.Rcheck/rddtools’ + + +``` +# relsurv + +
+ +* Version: 2.3-1 +* GitHub: NA +* Source code: https://github.com/cran/relsurv +* Date/Publication: 2025-01-20 15:40:01 UTC +* Number of recursive dependencies: 112 + +Run `revdepcheck::cloud_details(, "relsurv")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/relsurv/new/relsurv.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘relsurv/DESCRIPTION’ ... OK +... +* checking line endings in C/C++/Fortran sources/headers ... OK +* checking line endings in Makefiles ... OK +* checking compilation flags in Makevars ... OK +* checking for GNU extensions in Makefiles ... OK +* checking for portable use of $(BLAS_LIBS) and $(LAPACK_LIBS) ... OK +* checking use of PKG_*FLAGS in Makefiles ... OK +* checking compiled code ... OK +* checking examples ... OK +* DONE +Status: OK + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/relsurv/old/relsurv.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘relsurv/DESCRIPTION’ ... OK +... +* checking line endings in C/C++/Fortran sources/headers ... OK +* checking line endings in Makefiles ... OK +* checking compilation flags in Makevars ... OK +* checking for GNU extensions in Makefiles ... OK +* checking for portable use of $(BLAS_LIBS) and $(LAPACK_LIBS) ... OK +* checking use of PKG_*FLAGS in Makefiles ... OK +* checking compiled code ... OK +* checking examples ... OK +* DONE +Status: OK + + + + + +``` +# ReporterScore + +
+ +* Version: 0.1.9 +* GitHub: https://github.com/Asa12138/ReporterScore +* Source code: https://github.com/cran/ReporterScore +* Date/Publication: 2024-11-28 14:10:06 UTC +* Number of recursive dependencies: 250 + +Run `revdepcheck::cloud_details(, "ReporterScore")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/ReporterScore/new/ReporterScore.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘ReporterScore/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘ReporterScore.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 NOTE + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/ReporterScore/old/ReporterScore.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘ReporterScore/DESCRIPTION’ ... OK +... +* checking installed files from ‘inst/doc’ ... OK +* checking files in ‘vignettes’ ... OK +* checking examples ... OK +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘ReporterScore.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 1 NOTE + + + + + +``` +# RGraphSpace + +
+ +* Version: NA * GitHub: NA -* Source code: https://github.com/cran/RcmdrPlugin.RiskDemo -* Date/Publication: 2024-02-06 09:20:02 UTC -* Number of recursive dependencies: 200 +* Source code: https://github.com/cran/RGraphSpace +* Number of recursive dependencies: 64 -Run `revdepcheck::cloud_details(, "RcmdrPlugin.RiskDemo")` for more info +Run `revdepcheck::cloud_details(, "RGraphSpace")` for more info
-## In both - -* checking whether package ‘RcmdrPlugin.RiskDemo’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/RcmdrPlugin.RiskDemo/new/RcmdrPlugin.RiskDemo.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘RcmdrPlugin.RiskDemo’ ... -** package ‘RcmdrPlugin.RiskDemo’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘RcmdrPlugin.RiskDemo’ -* removing ‘/tmp/workdir/RcmdrPlugin.RiskDemo/new/RcmdrPlugin.RiskDemo.Rcheck/RcmdrPlugin.RiskDemo’ + + + + ``` ### CRAN ``` -* installing *source* package ‘RcmdrPlugin.RiskDemo’ ... -** package ‘RcmdrPlugin.RiskDemo’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘RcmdrPlugin.RiskDemo’ -* removing ‘/tmp/workdir/RcmdrPlugin.RiskDemo/old/RcmdrPlugin.RiskDemo.Rcheck/RcmdrPlugin.RiskDemo’ + + + + ``` -# rddtools +# riskRegression
-* Version: 1.6.0 -* GitHub: https://github.com/bquast/rddtools -* Source code: https://github.com/cran/rddtools -* Date/Publication: 2022-01-10 12:42:49 UTC -* Number of recursive dependencies: 106 +* Version: 2023.12.21 +* GitHub: https://github.com/tagteam/riskRegression +* Source code: https://github.com/cran/riskRegression +* Date/Publication: 2023-12-19 17:00:02 UTC +* Number of recursive dependencies: 185 -Run `revdepcheck::cloud_details(, "rddtools")` for more info +Run `revdepcheck::cloud_details(, "riskRegression")` for more info
-## In both - -* checking whether package ‘rddtools’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/rddtools/new/rddtools.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘rddtools’ ... -** package ‘rddtools’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘rddtools’ -* removing ‘/tmp/workdir/rddtools/new/rddtools.Rcheck/rddtools’ +* using log directory ‘/tmp/workdir/riskRegression/new/riskRegression.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘riskRegression/DESCRIPTION’ ... OK +... +* this is package ‘riskRegression’ version ‘2023.12.21’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘rms’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` ### CRAN ``` -* installing *source* package ‘rddtools’ ... -** package ‘rddtools’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘rddtools’ -* removing ‘/tmp/workdir/rddtools/old/rddtools.Rcheck/rddtools’ +* using log directory ‘/tmp/workdir/riskRegression/old/riskRegression.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘riskRegression/DESCRIPTION’ ... OK +... +* this is package ‘riskRegression’ version ‘2023.12.21’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘rms’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` -# RGraphSpace +# rmlnomogram
* Version: NA * GitHub: NA -* Source code: https://github.com/cran/RGraphSpace -* Number of recursive dependencies: 65 +* Source code: https://github.com/cran/rmlnomogram +* Number of recursive dependencies: 181 -Run `revdepcheck::cloud_details(, "RGraphSpace")` for more info +Run `revdepcheck::cloud_details(, "rmlnomogram")` for more info
@@ -7394,7 +9097,7 @@ Run `revdepcheck::cloud_details(, "RGraphSpace")` for more info * Version: NA * GitHub: NA * Source code: https://github.com/cran/rms -* Number of recursive dependencies: 145 +* Number of recursive dependencies: 148 Run `revdepcheck::cloud_details(, "rms")` for more info @@ -7422,17 +9125,17 @@ Run `revdepcheck::cloud_details(, "rms")` for more info ``` -# RNAseqQC +# robber
-* Version: 0.2.1 -* GitHub: https://github.com/frederikziebell/RNAseqQC -* Source code: https://github.com/cran/RNAseqQC -* Date/Publication: 2024-07-15 14:40:02 UTC -* Number of recursive dependencies: 162 +* Version: 0.2.4 +* GitHub: https://github.com/Chabert-Liddell/robber +* Source code: https://github.com/cran/robber +* Date/Publication: 2024-02-07 13:50:02 UTC +* Number of recursive dependencies: 143 -Run `revdepcheck::cloud_details(, "RNAseqQC")` for more info +Run `revdepcheck::cloud_details(, "robber")` for more info
@@ -7441,27 +9144,27 @@ Run `revdepcheck::cloud_details(, "RNAseqQC")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/RNAseqQC/new/RNAseqQC.Rcheck’ +* using log directory ‘/tmp/workdir/robber/new/robber.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘RNAseqQC/DESCRIPTION’ ... OK +* checking for file ‘robber/DESCRIPTION’ ... OK ... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'ensembldb', 'ComplexHeatmap' - -Package suggested but not available for checking: ‘recount3’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* checking tests ... OK + Running ‘spelling.R’ + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘topological-analysis.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK * DONE -Status: 1 ERROR +Status: OK @@ -7471,27 +9174,27 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/RNAseqQC/old/RNAseqQC.Rcheck’ +* using log directory ‘/tmp/workdir/robber/old/robber.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘RNAseqQC/DESCRIPTION’ ... OK +* checking for file ‘robber/DESCRIPTION’ ... OK ... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'ensembldb', 'ComplexHeatmap' - -Package suggested but not available for checking: ‘recount3’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* checking tests ... OK + Running ‘spelling.R’ + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... OK + ‘topological-analysis.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK * DONE -Status: 1 ERROR +Status: OK @@ -7502,11 +9205,11 @@ Status: 1 ERROR
-* Version: 1.0.2 +* Version: 1.2.0 * GitHub: https://github.com/aalfons/robmed * Source code: https://github.com/cran/robmed -* Date/Publication: 2023-06-16 23:00:02 UTC -* Number of recursive dependencies: 60 +* Date/Publication: 2024-12-10 00:00:02 UTC +* Number of recursive dependencies: 59 Run `revdepcheck::cloud_details(, "robmed")` for more info @@ -7566,11 +9269,11 @@ ERROR: lazy loading failed for package ‘robmed’
-* Version: 0.1.0 +* Version: 0.1.1 * GitHub: https://github.com/aalfons/robmedExtra * Source code: https://github.com/cran/robmedExtra -* Date/Publication: 2023-06-02 14:40:02 UTC -* Number of recursive dependencies: 90 +* Date/Publication: 2024-11-03 12:10:01 UTC +* Number of recursive dependencies: 91 Run `revdepcheck::cloud_details(, "robmedExtra")` for more info @@ -7690,7 +9393,7 @@ ERROR: lazy loading failed for package ‘RPPanalyzer’ * GitHub: NA * Source code: https://github.com/cran/RQdeltaCT * Date/Publication: 2024-04-17 15:50:02 UTC -* Number of recursive dependencies: 166 +* Number of recursive dependencies: 163 Run `revdepcheck::cloud_details(, "RQdeltaCT")` for more info @@ -7753,7 +9456,7 @@ ERROR: lazy loading failed for package ‘RQdeltaCT’ * Version: NA * GitHub: NA * Source code: https://github.com/cran/RRPP -* Number of recursive dependencies: 68 +* Number of recursive dependencies: 67 Run `revdepcheck::cloud_details(, "RRPP")` for more info @@ -7789,7 +9492,7 @@ Run `revdepcheck::cloud_details(, "RRPP")` for more info * GitHub: https://github.com/stan-dev/rstanarm * Source code: https://github.com/cran/rstanarm * Date/Publication: 2024-01-18 23:00:03 UTC -* Number of recursive dependencies: 138 +* Number of recursive dependencies: 140 Run `revdepcheck::cloud_details(, "rstanarm")` for more info @@ -7808,130 +9511,54 @@ Run `revdepcheck::cloud_details(, "rstanarm")` for more info ### Devel ``` -* installing *source* package ‘rstanarm’ ... -** package ‘rstanarm’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++17 -"/opt/R/4.3.1/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan -Wrote C++ file "stan_files/bernoulli.cc" - - -... -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:16: required from here -/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stan_files/continuous.o] Error 1 -rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc -ERROR: compilation failed for package ‘rstanarm’ -* removing ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/rstanarm’ - - -``` -### CRAN - -``` -* installing *source* package ‘rstanarm’ ... -** package ‘rstanarm’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++17 -"/opt/R/4.3.1/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan -Wrote C++ file "stan_files/bernoulli.cc" - - -... -/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:16: required from here -/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stan_files/continuous.o] Error 1 -rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc -ERROR: compilation failed for package ‘rstanarm’ -* removing ‘/tmp/workdir/rstanarm/old/rstanarm.Rcheck/rstanarm’ - - -``` -# RTIGER - -
- -* Version: 2.1.0 -* GitHub: NA -* Source code: https://github.com/cran/RTIGER -* Date/Publication: 2023-03-29 09:20:02 UTC -* Number of recursive dependencies: 160 - -Run `revdepcheck::cloud_details(, "RTIGER")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/RTIGER/new/RTIGER.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘RTIGER/DESCRIPTION’ ... OK -... -* checking installed files from ‘inst/doc’ ... OK -* checking files in ‘vignettes’ ... OK -* checking examples ... OK -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘tutorial_RTIGER.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 NOTE - +* installing *source* package ‘rstanarm’ ... +** package ‘rstanarm’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +"/opt/R/4.3.1/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan +Wrote C++ file "stan_files/bernoulli.cc" +... +/usr/local/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stan_files/continuous.o] Error 1 +rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc +ERROR: compilation failed for package ‘rstanarm’ +* removing ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/rstanarm’ ``` ### CRAN ``` -* using log directory ‘/tmp/workdir/RTIGER/old/RTIGER.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘RTIGER/DESCRIPTION’ ... OK -... -* checking installed files from ‘inst/doc’ ... OK -* checking files in ‘vignettes’ ... OK -* checking examples ... OK -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘tutorial_RTIGER.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 NOTE - +* installing *source* package ‘rstanarm’ ... +** package ‘rstanarm’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +"/opt/R/4.3.1/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan +Wrote C++ file "stan_files/bernoulli.cc" +... +/usr/local/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stan_files/continuous.o] Error 1 +rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc +ERROR: compilation failed for package ‘rstanarm’ +* removing ‘/tmp/workdir/rstanarm/old/rstanarm.Rcheck/rstanarm’ ``` @@ -7939,11 +9566,11 @@ Status: 1 NOTE
-* Version: 1.1.0 +* Version: 1.3.0 * GitHub: https://github.com/aidanmorales/rTwig * Source code: https://github.com/cran/rTwig -* Date/Publication: 2024-08-21 00:50:02 UTC -* Number of recursive dependencies: 147 +* Date/Publication: 2024-11-21 21:30:02 UTC +* Number of recursive dependencies: 141 Run `revdepcheck::cloud_details(, "rTwig")` for more info @@ -7966,12 +9593,12 @@ Run `revdepcheck::cloud_details(, "rTwig")` for more info ** package ‘rTwig’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c box_counting.cpp -o box_counting.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c colors.cpp -o colors.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c convex_hull.cpp -o convex_hull.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c cylinder_mesh.cpp -o cylinder_mesh.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I../inst/include -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I../inst/include -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c box_counting.cpp -o box_counting.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I../inst/include -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c cluster_cloud.cpp -o cluster_cloud.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I../inst/include -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c colors.cpp -o colors.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I../inst/include -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c convex_hull.cpp -o convex_hull.o ... ** data *** moving datasets to lazyload DB @@ -7993,12 +9620,12 @@ ERROR: lazy loading failed for package ‘rTwig’ ** package ‘rTwig’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c box_counting.cpp -o box_counting.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c colors.cpp -o colors.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c convex_hull.cpp -o convex_hull.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c cylinder_mesh.cpp -o cylinder_mesh.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I../inst/include -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I../inst/include -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c box_counting.cpp -o box_counting.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I../inst/include -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c cluster_cloud.cpp -o cluster_cloud.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I../inst/include -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c colors.cpp -o colors.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I../inst/include -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c convex_hull.cpp -o convex_hull.o ... ** data *** moving datasets to lazyload DB @@ -8021,7 +9648,7 @@ ERROR: lazy loading failed for package ‘rTwig’ * GitHub: https://github.com/THERMOSTATS/RVA * Source code: https://github.com/cran/RVA * Date/Publication: 2021-11-01 21:40:02 UTC -* Number of recursive dependencies: 207 +* Number of recursive dependencies: 210 Run `revdepcheck::cloud_details(, "RVA")` for more info @@ -8036,9 +9663,9 @@ Run `revdepcheck::cloud_details(, "RVA")` for more info * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘RVA/DESCRIPTION’ ... OK @@ -8047,7 +9674,7 @@ Run `revdepcheck::cloud_details(, "RVA")` for more info * package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Packages required but not available: 'ComplexHeatmap', 'rWikiPathways' +Package required but not available: ‘clusterProfiler’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -8066,9 +9693,9 @@ Status: 1 ERROR * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘RVA/DESCRIPTION’ ... OK @@ -8077,7 +9704,7 @@ Status: 1 ERROR * package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Packages required but not available: 'ComplexHeatmap', 'rWikiPathways' +Package required but not available: ‘clusterProfiler’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -8089,79 +9716,132 @@ Status: 1 ERROR ``` -# scCustomize +# S4DM
-* Version: 2.1.2 -* GitHub: https://github.com/samuel-marsh/scCustomize -* Source code: https://github.com/cran/scCustomize -* Date/Publication: 2024-02-28 19:40:02 UTC -* Number of recursive dependencies: 267 +* Version: 0.0.1 +* GitHub: NA +* Source code: https://github.com/cran/S4DM +* Date/Publication: 2025-01-10 21:00:02 UTC +* Number of recursive dependencies: 138 -Run `revdepcheck::cloud_details(, "scCustomize")` for more info +Run `revdepcheck::cloud_details(, "S4DM")` for more info
-## Error before installation +## In both + +* checking whether package ‘S4DM’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/S4DM/new/S4DM.Rcheck/00install.out’ for details. + ``` + +## Installation ### Devel ``` -* using log directory ‘/tmp/workdir/scCustomize/new/scCustomize.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘scCustomize/DESCRIPTION’ ... 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 ‘scCustomize’ can be installed ... ERROR -Installation failed. -See ‘/tmp/workdir/scCustomize/new/scCustomize.Rcheck/00install.out’ for details. -* DONE -Status: 1 ERROR, 1 NOTE +* installing *source* package ‘S4DM’ ... +** package ‘S4DM’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘S4DM’ +* removing ‘/tmp/workdir/S4DM/new/S4DM.Rcheck/S4DM’ +``` +### CRAN +``` +* installing *source* package ‘S4DM’ ... +** package ‘S4DM’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘S4DM’ +* removing ‘/tmp/workdir/S4DM/old/S4DM.Rcheck/S4DM’ ``` -### CRAN +# scCustomize + +
+ +* Version: 3.0.1 +* GitHub: https://github.com/samuel-marsh/scCustomize +* Source code: https://github.com/cran/scCustomize +* Date/Publication: 2024-12-18 18:40:02 UTC +* Number of recursive dependencies: 272 + +Run `revdepcheck::cloud_details(, "scCustomize")` for more info + +
+ +## In both + +* checking whether package ‘scCustomize’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/scCustomize/new/scCustomize.Rcheck/00install.out’ for details. + ``` + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘Nebulosa’ + ``` + +## Installation + +### Devel ``` -* using log directory ‘/tmp/workdir/scCustomize/old/scCustomize.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘scCustomize/DESCRIPTION’ ... 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 ‘scCustomize’ can be installed ... ERROR -Installation failed. -See ‘/tmp/workdir/scCustomize/old/scCustomize.Rcheck/00install.out’ for details. -* DONE -Status: 1 ERROR, 1 NOTE +* installing *source* package ‘scCustomize’ ... +** package ‘scCustomize’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Execution halted +ERROR: lazy loading failed for package ‘scCustomize’ +* removing ‘/tmp/workdir/scCustomize/new/scCustomize.Rcheck/scCustomize’ +``` +### CRAN +``` +* installing *source* package ‘scCustomize’ ... +** package ‘scCustomize’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Execution halted +ERROR: lazy loading failed for package ‘scCustomize’ +* removing ‘/tmp/workdir/scCustomize/old/scCustomize.Rcheck/scCustomize’ ``` @@ -8173,7 +9853,7 @@ Status: 1 ERROR, 1 NOTE * GitHub: https://github.com/Liuy12/SCdeconR * Source code: https://github.com/cran/SCdeconR * Date/Publication: 2024-03-22 19:20:02 UTC -* Number of recursive dependencies: 236 +* Number of recursive dependencies: 237 Run `revdepcheck::cloud_details(, "SCdeconR")` for more info @@ -8231,7 +9911,7 @@ ERROR: lazy loading failed for package ‘SCdeconR’ * GitHub: https://github.com/carmonalab/scGate * Source code: https://github.com/cran/scGate * Date/Publication: 2024-04-23 08:50:02 UTC -* Number of recursive dependencies: 179 +* Number of recursive dependencies: 180 Run `revdepcheck::cloud_details(, "scGate")` for more info @@ -8326,9 +10006,9 @@ Run `revdepcheck::cloud_details(, "SCIntRuler")` for more info ** package ‘SCIntRuler’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c crossdist.cpp -o crossdist.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c crossdist.cpp -o crossdist.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o SCIntRuler.so RcppExports.o crossdist.o -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/SCIntRuler/new/SCIntRuler.Rcheck/00LOCK-SCIntRuler/00new/SCIntRuler/libs ** R @@ -8353,9 +10033,9 @@ ERROR: lazy loading failed for package ‘SCIntRuler’ ** package ‘SCIntRuler’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c crossdist.cpp -o crossdist.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c crossdist.cpp -o crossdist.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o SCIntRuler.so RcppExports.o crossdist.o -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/SCIntRuler/old/SCIntRuler.Rcheck/00LOCK-SCIntRuler/00new/SCIntRuler/libs ** R @@ -8372,82 +10052,6 @@ ERROR: lazy loading failed for package ‘SCIntRuler’ * removing ‘/tmp/workdir/SCIntRuler/old/SCIntRuler.Rcheck/SCIntRuler’ -``` -# scITD - -
- -* Version: 1.0.4 -* GitHub: NA -* Source code: https://github.com/cran/scITD -* Date/Publication: 2023-09-08 16:00:02 UTC -* Number of recursive dependencies: 233 - -Run `revdepcheck::cloud_details(, "scITD")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/scITD/new/scITD.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘scITD/DESCRIPTION’ ... OK -... -* checking package dependencies ... ERROR -Package required but not available: ‘ComplexHeatmap’ - -Packages suggested but not available for checking: - 'simplifyEnrichment', 'conos', 'pagoda2' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/scITD/old/scITD.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘scITD/DESCRIPTION’ ... OK -... -* checking package dependencies ... ERROR -Package required but not available: ‘ComplexHeatmap’ - -Packages suggested but not available for checking: - 'simplifyEnrichment', 'conos', 'pagoda2' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - ``` # scMappR @@ -8517,11 +10121,11 @@ ERROR: lazy loading failed for package ‘scMappR’
-* Version: 2.2.5 +* Version: 2.2.6 * GitHub: NA * Source code: https://github.com/cran/scpi -* Date/Publication: 2023-11-01 06:10:07 UTC -* Number of recursive dependencies: 98 +* Date/Publication: 2024-11-11 23:40:02 UTC +* Number of recursive dependencies: 96 Run `revdepcheck::cloud_details(, "scpi")` for more info @@ -8590,6 +10194,82 @@ ERROR: lazy loading failed for package ‘scpi’ * removing ‘/tmp/workdir/scpi/old/scpi.Rcheck/scpi’ +``` +# SCpubr + +
+ +* Version: 2.0.2 +* GitHub: https://github.com/enblacar/SCpubr +* Source code: https://github.com/cran/SCpubr +* Date/Publication: 2023-10-11 09:50:02 UTC +* Number of recursive dependencies: 301 + +Run `revdepcheck::cloud_details(, "SCpubr")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/SCpubr/new/SCpubr.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘SCpubr/DESCRIPTION’ ... OK +... +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... NONE + ‘reference_manual.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 2 NOTEs + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/SCpubr/old/SCpubr.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘SCpubr/DESCRIPTION’ ... OK +... +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ +* checking for unstated dependencies in vignettes ... OK +* checking package vignettes in ‘inst/doc’ ... OK +* checking running R code from vignettes ... NONE + ‘reference_manual.Rmd’ using ‘UTF-8’... OK +* checking re-building of vignette outputs ... OK +* DONE +Status: 2 NOTEs + + + + + ``` # scRNAstat @@ -8732,82 +10412,6 @@ ERROR: lazy loading failed for package ‘sectorgap’ * removing ‘/tmp/workdir/sectorgap/old/sectorgap.Rcheck/sectorgap’ -``` -# SeedMatchR - -
- -* Version: 1.1.1 -* GitHub: NA -* Source code: https://github.com/cran/SeedMatchR -* Date/Publication: 2023-10-24 20:30:02 UTC -* Number of recursive dependencies: 167 - -Run `revdepcheck::cloud_details(, "SeedMatchR")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/SeedMatchR/new/SeedMatchR.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘SeedMatchR/DESCRIPTION’ ... OK -... -* this is package ‘SeedMatchR’ version ‘1.1.1’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'msa', 'GenomicFeatures' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/SeedMatchR/old/SeedMatchR.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘SeedMatchR/DESCRIPTION’ ... OK -... -* this is package ‘SeedMatchR’ version ‘1.1.1’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'msa', 'GenomicFeatures' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - ``` # SEERaBomb @@ -8840,11 +10444,11 @@ Run `revdepcheck::cloud_details(, "SEERaBomb")` for more info ** package ‘SEERaBomb’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c SEERaBomb_init.c -o SEERaBomb_init.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c fillPYM.cpp -o fillPYM.o +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c SEERaBomb_init.c -o SEERaBomb_init.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c fillPYM.cpp -o fillPYM.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o SEERaBomb.so RcppExports.o SEERaBomb_init.o fillPYM.o -L/opt/R/4.3.1/lib/R/lib -lR ... ** R @@ -8867,11 +10471,11 @@ ERROR: lazy loading failed for package ‘SEERaBomb’ ** package ‘SEERaBomb’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c SEERaBomb_init.c -o SEERaBomb_init.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c fillPYM.cpp -o fillPYM.o +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c SEERaBomb_init.c -o SEERaBomb_init.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c fillPYM.cpp -o fillPYM.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o SEERaBomb.so RcppExports.o SEERaBomb_init.o fillPYM.o -L/opt/R/4.3.1/lib/R/lib -lR ... ** R @@ -8953,7 +10557,7 @@ ERROR: lazy loading failed for package ‘semicmprskcoxmsm’ * GitHub: https://github.com/IbtihelRebhi/SensMap * Source code: https://github.com/cran/SensMap * Date/Publication: 2022-07-04 19:00:02 UTC -* Number of recursive dependencies: 145 +* Number of recursive dependencies: 148 Run `revdepcheck::cloud_details(, "SensMap")` for more info @@ -9008,156 +10612,82 @@ ERROR: lazy loading failed for package ‘SensMap’ * removing ‘/tmp/workdir/SensMap/old/SensMap.Rcheck/SensMap’ -``` -# sephora - -
- -* Version: 0.1.31 -* GitHub: NA -* Source code: https://github.com/cran/sephora -* Date/Publication: 2024-01-17 18:40:02 UTC -* Number of recursive dependencies: 139 - -Run `revdepcheck::cloud_details(, "sephora")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/sephora/new/sephora.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘sephora/DESCRIPTION’ ... OK -... -* this is package ‘sephora’ version ‘0.1.31’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘spiralize’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/sephora/old/sephora.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘sephora/DESCRIPTION’ ... OK -... -* this is package ‘sephora’ version ‘0.1.31’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘spiralize’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - ``` # Seurat
-* Version: 5.1.0 +* Version: 5.2.1 * GitHub: https://github.com/satijalab/seurat * Source code: https://github.com/cran/Seurat -* Date/Publication: 2024-05-10 17:23:17 UTC -* Number of recursive dependencies: 267 +* Date/Publication: 2025-01-24 06:50:06 UTC +* Number of recursive dependencies: 281 Run `revdepcheck::cloud_details(, "Seurat")` for more info
-## Error before installation +## In both + +* checking whether package ‘Seurat’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/Seurat/new/Seurat.Rcheck/00install.out’ for details. + ``` + +## Installation ### Devel ``` -* using log directory ‘/tmp/workdir/Seurat/new/Seurat.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘Seurat/DESCRIPTION’ ... OK +* installing *source* package ‘Seurat’ ... +** package ‘Seurat’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c ModularityOptimizer.cpp -o ModularityOptimizer.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RModularityOptimizer.cpp -o RModularityOptimizer.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, ... -* 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 ‘Seurat’ can be installed ... ERROR -Installation failed. -See ‘/tmp/workdir/Seurat/new/Seurat.Rcheck/00install.out’ for details. -* DONE -Status: 1 ERROR, 1 NOTE - - - +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Execution halted +ERROR: lazy loading failed for package ‘Seurat’ +* removing ‘/tmp/workdir/Seurat/new/Seurat.Rcheck/Seurat’ ``` ### CRAN ``` -* using log directory ‘/tmp/workdir/Seurat/old/Seurat.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘Seurat/DESCRIPTION’ ... OK +* installing *source* package ‘Seurat’ ... +** package ‘Seurat’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c ModularityOptimizer.cpp -o ModularityOptimizer.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RModularityOptimizer.cpp -o RModularityOptimizer.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, ... -* 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 ‘Seurat’ can be installed ... ERROR -Installation failed. -See ‘/tmp/workdir/Seurat/old/Seurat.Rcheck/00install.out’ for details. -* DONE -Status: 1 ERROR, 1 NOTE - - - +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Execution halted +ERROR: lazy loading failed for package ‘Seurat’ +* removing ‘/tmp/workdir/Seurat/old/Seurat.Rcheck/Seurat’ ``` @@ -9169,7 +10699,7 @@ Status: 1 ERROR, 1 NOTE * GitHub: https://github.com/YuLab-SMU/shinyTempSignal * Source code: https://github.com/cran/shinyTempSignal * Date/Publication: 2024-03-06 08:00:02 UTC -* Number of recursive dependencies: 137 +* Number of recursive dependencies: 134 Run `revdepcheck::cloud_details(, "shinyTempSignal")` for more info @@ -9229,7 +10759,7 @@ ERROR: lazy loading failed for package ‘shinyTempSignal’ * GitHub: https://github.com/mjuraska/sievePH * Source code: https://github.com/cran/sievePH * Date/Publication: 2024-05-17 23:40:02 UTC -* Number of recursive dependencies: 72 +* Number of recursive dependencies: 76 Run `revdepcheck::cloud_details(, "sievePH")` for more info @@ -9252,42 +10782,120 @@ Run `revdepcheck::cloud_details(, "sievePH")` for more info ** package ‘sievePH’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c kernel_sievePH_utils.cpp -o kernel_sievePH_utils.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o sievePH.so RcppExports.o kernel_sievePH_utils.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/sievePH/new/sievePH.Rcheck/00LOCK-sievePH/00new/sievePH/libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c kernel_sievePH_utils.cpp -o kernel_sievePH_utils.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o sievePH.so RcppExports.o kernel_sievePH_utils.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/sievePH/new/sievePH.Rcheck/00LOCK-sievePH/00new/sievePH/libs +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘sievePH’ +* removing ‘/tmp/workdir/sievePH/new/sievePH.Rcheck/sievePH’ + + +``` +### CRAN + +``` +* installing *source* package ‘sievePH’ ... +** package ‘sievePH’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c kernel_sievePH_utils.cpp -o kernel_sievePH_utils.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o sievePH.so RcppExports.o kernel_sievePH_utils.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/sievePH/old/sievePH.Rcheck/00LOCK-sievePH/00new/sievePH/libs +** R +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘sievePH’ +* removing ‘/tmp/workdir/sievePH/old/sievePH.Rcheck/sievePH’ + + +``` +# SiFINeT + +
+ +* Version: 1.13 +* GitHub: NA +* Source code: https://github.com/cran/SiFINeT +* Date/Publication: 2025-01-16 15:10:05 UTC +* Number of recursive dependencies: 75 + +Run `revdepcheck::cloud_details(, "SiFINeT")` for more info + +
+ +## In both + +* checking whether package ‘SiFINeT’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/SiFINeT/new/SiFINeT.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘SiFINeT’ ... +** package ‘SiFINeT’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_64BIT_WORD=1 -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c EstNull.cpp -o EstNull.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_64BIT_WORD=1 -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_64BIT_WORD=1 -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c cal_coexp.cpp -o cal_coexp.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_64BIT_WORD=1 -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c cal_coexp_sp.cpp -o cal_coexp_sp.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_64BIT_WORD=1 -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c cal_conn.cpp -o cal_conn.o +... +installing to /tmp/workdir/SiFINeT/new/SiFINeT.Rcheck/00LOCK-SiFINeT/00new/SiFINeT/libs ** R +** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘sievePH’ -* removing ‘/tmp/workdir/sievePH/new/sievePH.Rcheck/sievePH’ +ERROR: lazy loading failed for package ‘SiFINeT’ +* removing ‘/tmp/workdir/SiFINeT/new/SiFINeT.Rcheck/SiFINeT’ ``` ### CRAN ``` -* installing *source* package ‘sievePH’ ... -** package ‘sievePH’ successfully unpacked and MD5 sums checked +* installing *source* package ‘SiFINeT’ ... +** package ‘SiFINeT’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c kernel_sievePH_utils.cpp -o kernel_sievePH_utils.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o sievePH.so RcppExports.o kernel_sievePH_utils.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/sievePH/old/sievePH.Rcheck/00LOCK-sievePH/00new/sievePH/libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_64BIT_WORD=1 -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c EstNull.cpp -o EstNull.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_64BIT_WORD=1 -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_64BIT_WORD=1 -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c cal_coexp.cpp -o cal_coexp.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_64BIT_WORD=1 -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c cal_coexp_sp.cpp -o cal_coexp_sp.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_64BIT_WORD=1 -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c cal_conn.cpp -o cal_conn.o +... +installing to /tmp/workdir/SiFINeT/old/SiFINeT.Rcheck/00LOCK-SiFINeT/00new/SiFINeT/libs ** R +** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘sievePH’ -* removing ‘/tmp/workdir/sievePH/old/sievePH.Rcheck/sievePH’ +ERROR: lazy loading failed for package ‘SiFINeT’ +* removing ‘/tmp/workdir/SiFINeT/old/SiFINeT.Rcheck/SiFINeT’ ``` @@ -9299,71 +10907,86 @@ ERROR: lazy loading failed for package ‘sievePH’ * GitHub: https://github.com/ShixiangWang/sigminer * Source code: https://github.com/cran/sigminer * Date/Publication: 2024-05-11 08:50:02 UTC -* Number of recursive dependencies: 209 +* Number of recursive dependencies: 212 Run `revdepcheck::cloud_details(, "sigminer")` for more info
-## Error before installation +## Newly broken + +* checking whether package ‘sigminer’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/sigminer/new/sigminer.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking installed package size ... NOTE + ``` + installed size is 7.9Mb + sub-directories of 1Mb or more: + R 1.0Mb + data 2.0Mb + extdata 1.0Mb + help 1.7Mb + libs 1.3Mb + ``` + +## Installation ### Devel ``` -* using log directory ‘/tmp/workdir/sigminer/new/sigminer.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘sigminer/DESCRIPTION’ ... OK +* installing *source* package ‘sigminer’ ... +** package ‘sigminer’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c calc_cosine.cpp -o calc_cosine.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c get_intersect_size.cpp -o get_intersect_size.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o sigminer.so RcppExports.o calc_cosine.o get_intersect_size.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/sigminer/new/sigminer.Rcheck/00LOCK-sigminer/00new/sigminer/libs ... - 18. └─rlang::abort(...) +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error: .onLoad failed in loadNamespace() for 'NMF', details: + call: is.element(models, models.wraps) + error: unused argument (models.wraps) Execution halted -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘cnsignature.Rmd’ using ‘UTF-8’... OK - ‘sigminer.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 ERROR, 2 NOTEs - - - +ERROR: lazy loading failed for package ‘sigminer’ +* removing ‘/tmp/workdir/sigminer/new/sigminer.Rcheck/sigminer’ ``` ### CRAN ``` -* using log directory ‘/tmp/workdir/sigminer/old/sigminer.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘sigminer/DESCRIPTION’ ... OK +* installing *source* package ‘sigminer’ ... +** package ‘sigminer’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c calc_cosine.cpp -o calc_cosine.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c get_intersect_size.cpp -o get_intersect_size.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o sigminer.so RcppExports.o calc_cosine.o get_intersect_size.o -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/sigminer/old/sigminer.Rcheck/00LOCK-sigminer/00new/sigminer/libs ... -* checking files in ‘vignettes’ ... OK -* checking examples ... OK -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘cnsignature.Rmd’ using ‘UTF-8’... OK - ‘sigminer.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 2 NOTEs - - - +** help +*** installing help indices +*** copying figures +** building package indices +** installing vignettes +** testing if installed package can be loaded from temporary location +** checking absolute paths in shared objects and dynamic libraries +** testing if installed package can be loaded from final location +** testing if installed package keeps a record of temporary installation path +* DONE (sigminer) ``` @@ -9375,71 +10998,73 @@ Status: 2 NOTEs * GitHub: https://github.com/stuart-lab/signac * Source code: https://github.com/cran/Signac * Date/Publication: 2024-08-21 07:40:02 UTC -* Number of recursive dependencies: 247 +* Number of recursive dependencies: 246 Run `revdepcheck::cloud_details(, "Signac")` for more info
-## Error before installation +## In both + +* checking whether package ‘Signac’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/Signac/new/Signac.Rcheck/00install.out’ for details. + ``` + +## Installation ### Devel ``` -* using log directory ‘/tmp/workdir/Signac/new/Signac.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘Signac/DESCRIPTION’ ... OK +* installing *source* package ‘Signac’ ... +** package ‘Signac’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c filter.cpp -o filter.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c group.cpp -o group.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c split.cpp -o split.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c validate.cpp -o validate.o ... -* 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 ‘Signac’ can be installed ... ERROR -Installation failed. -See ‘/tmp/workdir/Signac/new/Signac.Rcheck/00install.out’ for details. -* DONE -Status: 1 ERROR, 1 NOTE - - - +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Signac’ +* removing ‘/tmp/workdir/Signac/new/Signac.Rcheck/Signac’ ``` ### CRAN ``` -* using log directory ‘/tmp/workdir/Signac/old/Signac.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘Signac/DESCRIPTION’ ... OK +* installing *source* package ‘Signac’ ... +** package ‘Signac’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c filter.cpp -o filter.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c group.cpp -o group.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c split.cpp -o split.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c validate.cpp -o validate.o ... -* 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 ‘Signac’ can be installed ... ERROR -Installation failed. -See ‘/tmp/workdir/Signac/old/Signac.Rcheck/00install.out’ for details. -* DONE -Status: 1 ERROR, 1 NOTE - - - +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘Signac’ +* removing ‘/tmp/workdir/Signac/old/Signac.Rcheck/Signac’ ``` @@ -9451,7 +11076,7 @@ Status: 1 ERROR, 1 NOTE * GitHub: https://github.com/arcaldwell49/SimplyAgree * Source code: https://github.com/cran/SimplyAgree * Date/Publication: 2024-03-21 14:20:06 UTC -* Number of recursive dependencies: 115 +* Number of recursive dependencies: 118 Run `revdepcheck::cloud_details(, "SimplyAgree")` for more info @@ -9516,16 +11141,51 @@ ERROR: lazy loading failed for package ‘SimplyAgree’ * removing ‘/tmp/workdir/SimplyAgree/old/SimplyAgree.Rcheck/SimplyAgree’ +``` +# smer + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/smer +* Number of recursive dependencies: 114 + +Run `revdepcheck::cloud_details(, "smer")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + ``` # SNPassoc
-* Version: 2.1-0 +* Version: 2.1-2 * GitHub: https://github.com/isglobal-brge/SNPassoc * Source code: https://github.com/cran/SNPassoc -* Date/Publication: 2022-12-14 20:20:02 UTC -* Number of recursive dependencies: 168 +* Date/Publication: 2024-10-28 17:30:02 UTC +* Number of recursive dependencies: 164 Run `revdepcheck::cloud_details(, "SNPassoc")` for more info @@ -9540,23 +11200,23 @@ Run `revdepcheck::cloud_details(, "SNPassoc")` for more info * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘SNPassoc/DESCRIPTION’ ... OK ... -* 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 ‘SNPassoc’ can be installed ... ERROR -Installation failed. -See ‘/tmp/workdir/SNPassoc/new/SNPassoc.Rcheck/00install.out’ for details. +* this is package ‘SNPassoc’ version ‘2.1-2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘haplo.stats’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. * DONE -Status: 1 ERROR, 1 NOTE +Status: 1 ERROR @@ -9570,23 +11230,23 @@ Status: 1 ERROR, 1 NOTE * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘SNPassoc/DESCRIPTION’ ... OK ... -* 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 ‘SNPassoc’ can be installed ... ERROR -Installation failed. -See ‘/tmp/workdir/SNPassoc/old/SNPassoc.Rcheck/00install.out’ for details. +* this is package ‘SNPassoc’ version ‘2.1-2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘haplo.stats’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. * DONE -Status: 1 ERROR, 1 NOTE +Status: 1 ERROR @@ -9601,7 +11261,7 @@ Status: 1 ERROR, 1 NOTE * GitHub: NA * Source code: https://github.com/cran/snplinkage * Date/Publication: 2024-09-09 19:10:02 UTC -* Number of recursive dependencies: 153 +* Number of recursive dependencies: 155 Run `revdepcheck::cloud_details(, "snplinkage")` for more info @@ -9616,9 +11276,9 @@ Run `revdepcheck::cloud_details(, "snplinkage")` for more info * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘snplinkage/DESCRIPTION’ ... OK @@ -9646,9 +11306,9 @@ Status: 1 ERROR * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ * checking for file ‘snplinkage/DESCRIPTION’ ... OK @@ -9669,26 +11329,90 @@ Status: 1 ERROR ``` -# SoupX +# SoupX + +
+ +* Version: 1.6.2 +* GitHub: https://github.com/constantAmateur/SoupX +* Source code: https://github.com/cran/SoupX +* Date/Publication: 2022-11-01 14:00:03 UTC +* Number of recursive dependencies: 202 + +Run `revdepcheck::cloud_details(, "SoupX")` for more info + +
+ +## In both + +* checking whether package ‘SoupX’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/SoupX/new/SoupX.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘SoupX’ ... +** package ‘SoupX’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘SoupX’ +* removing ‘/tmp/workdir/SoupX/new/SoupX.Rcheck/SoupX’ + + +``` +### CRAN + +``` +* installing *source* package ‘SoupX’ ... +** package ‘SoupX’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘SoupX’ +* removing ‘/tmp/workdir/SoupX/old/SoupX.Rcheck/SoupX’ + + +``` +# SpaCCI
-* Version: 1.6.2 -* GitHub: https://github.com/constantAmateur/SoupX -* Source code: https://github.com/cran/SoupX -* Date/Publication: 2022-11-01 14:00:03 UTC -* Number of recursive dependencies: 201 +* Version: 1.0.3 +* GitHub: NA +* Source code: https://github.com/cran/SpaCCI +* Date/Publication: 2025-01-18 23:10:02 UTC +* Number of recursive dependencies: 151 -Run `revdepcheck::cloud_details(, "SoupX")` for more info +Run `revdepcheck::cloud_details(, "SpaCCI")` for more info
## In both -* checking whether package ‘SoupX’ can be installed ... ERROR +* checking whether package ‘SpaCCI’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/SoupX/new/SoupX.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/SpaCCI/new/SpaCCI.Rcheck/00install.out’ for details. ``` ## Installation @@ -9696,40 +11420,50 @@ Run `revdepcheck::cloud_details(, "SoupX")` for more info ### Devel ``` -* installing *source* package ‘SoupX’ ... -** package ‘SoupX’ successfully unpacked and MD5 sums checked +* installing *source* package ‘SpaCCI’ ... +** package ‘SpaCCI’ successfully unpacked and MD5 sums checked ** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c permutation_func.cpp -o permutation_func.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o SpaCCI.so RcppExports.o permutation_func.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/SpaCCI/new/SpaCCI.Rcheck/00LOCK-SpaCCI/00new/SpaCCI/libs ** R ** data -*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘SoupX’ -* removing ‘/tmp/workdir/SoupX/new/SoupX.Rcheck/SoupX’ +ERROR: lazy loading failed for package ‘SpaCCI’ +* removing ‘/tmp/workdir/SpaCCI/new/SpaCCI.Rcheck/SpaCCI’ ``` ### CRAN ``` -* installing *source* package ‘SoupX’ ... -** package ‘SoupX’ successfully unpacked and MD5 sums checked +* installing *source* package ‘SpaCCI’ ... +** package ‘SpaCCI’ successfully unpacked and MD5 sums checked ** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c permutation_func.cpp -o permutation_func.o +g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o SpaCCI.so RcppExports.o permutation_func.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR +installing to /tmp/workdir/SpaCCI/old/SpaCCI.Rcheck/00LOCK-SpaCCI/00new/SpaCCI/libs ** R ** data -*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘SoupX’ -* removing ‘/tmp/workdir/SoupX/old/SoupX.Rcheck/SoupX’ +ERROR: lazy loading failed for package ‘SpaCCI’ +* removing ‘/tmp/workdir/SpaCCI/old/SpaCCI.Rcheck/SpaCCI’ ``` @@ -9764,11 +11498,11 @@ Run `revdepcheck::cloud_details(, "sparsereg")` for more info ** package ‘sparsereg’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c makeinter.cpp -o makeinter.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c makethreeinter.cpp -o makethreeinter.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c subgroup.cpp -o subgroup.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c makeinter.cpp -o makeinter.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c makethreeinter.cpp -o makethreeinter.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c subgroup.cpp -o subgroup.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o sparsereg.so RcppExports.o makeinter.o makethreeinter.o subgroup.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/sparsereg/new/sparsereg.Rcheck/00LOCK-sparsereg/00new/sparsereg/libs ** R @@ -9789,11 +11523,11 @@ ERROR: lazy loading failed for package ‘sparsereg’ ** package ‘sparsereg’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c makeinter.cpp -o makeinter.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c makethreeinter.cpp -o makethreeinter.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c subgroup.cpp -o subgroup.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c makeinter.cpp -o makeinter.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c makethreeinter.cpp -o makethreeinter.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c subgroup.cpp -o subgroup.o g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o sparsereg.so RcppExports.o makeinter.o makethreeinter.o subgroup.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/sparsereg/old/sparsereg.Rcheck/00LOCK-sparsereg/00new/sparsereg/libs ** R @@ -9807,79 +11541,75 @@ ERROR: lazy loading failed for package ‘sparsereg’ ``` -# SpatialDDLS +# spectralAnalysis
-* Version: 1.0.2 -* GitHub: https://github.com/diegommcc/SpatialDDLS -* Source code: https://github.com/cran/SpatialDDLS -* Date/Publication: 2024-04-26 16:10:02 UTC -* Number of recursive dependencies: 207 +* Version: 4.3.3 +* GitHub: NA +* Source code: https://github.com/cran/spectralAnalysis +* Date/Publication: 2024-01-30 08:50:02 UTC +* Number of recursive dependencies: 117 -Run `revdepcheck::cloud_details(, "SpatialDDLS")` for more info +Run `revdepcheck::cloud_details(, "spectralAnalysis")` for more info
-## Error before installation - -### Devel +## Newly broken -``` -* using log directory ‘/tmp/workdir/SpatialDDLS/new/SpatialDDLS.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘SpatialDDLS/DESCRIPTION’ ... OK -... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘SpatialExperiment’ +* checking whether package ‘spectralAnalysis’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/spectralAnalysis/new/spectralAnalysis.Rcheck/00install.out’ for details. + ``` -Package suggested but not available for checking: ‘ComplexHeatmap’ +## Newly fixed -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR +* checking installed package size ... NOTE + ``` + installed size is 6.0Mb + sub-directories of 1Mb or more: + doc 4.6Mb + ``` +## Installation +### Devel +``` +* installing *source* package ‘spectralAnalysis’ ... +** package ‘spectralAnalysis’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error: .onLoad failed in loadNamespace() for 'NMF', details: + call: is.element(models, models.wraps) + error: unused argument (models.wraps) +Execution halted +ERROR: lazy loading failed for package ‘spectralAnalysis’ +* removing ‘/tmp/workdir/spectralAnalysis/new/spectralAnalysis.Rcheck/spectralAnalysis’ ``` ### CRAN ``` -* using log directory ‘/tmp/workdir/SpatialDDLS/old/SpatialDDLS.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘SpatialDDLS/DESCRIPTION’ ... OK -... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘SpatialExperiment’ - -Package suggested but not available for checking: ‘ComplexHeatmap’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - +* installing *source* package ‘spectralAnalysis’ ... +** package ‘spectralAnalysis’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Creating a new generic function for ‘smooth’ in package ‘spectralAnalysis’ +** help +*** installing help indices +** building package indices +** installing vignettes +** testing if installed package can be loaded from temporary location +** testing if installed package can be loaded from final location +** testing if installed package keeps a record of temporary installation path +* DONE (spectralAnalysis) ``` @@ -9887,10 +11617,10 @@ Status: 1 ERROR
-* Version: 1.1-19 +* Version: 1.1-20 * GitHub: https://github.com/fabian-s/spikeSlabGAM * Source code: https://github.com/cran/spikeSlabGAM -* Date/Publication: 2022-06-10 15:50:07 UTC +* Date/Publication: 2024-10-22 17:30:02 UTC * Number of recursive dependencies: 77 Run `revdepcheck::cloud_details(, "spikeSlabGAM")` for more info @@ -9914,7 +11644,7 @@ Run `revdepcheck::cloud_details(, "spikeSlabGAM")` for more info ** package ‘spikeSlabGAM’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c sampler.c -o sampler.o gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c spikeSlabGAM_init.c -o spikeSlabGAM_init.o gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o spikeSlabGAM.so sampler.o spikeSlabGAM_init.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR @@ -9938,7 +11668,7 @@ ERROR: lazy loading failed for package ‘spikeSlabGAM’ ** package ‘spikeSlabGAM’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c sampler.c -o sampler.o gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c spikeSlabGAM_init.c -o spikeSlabGAM_init.o gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o spikeSlabGAM.so sampler.o spikeSlabGAM_init.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR @@ -9954,80 +11684,292 @@ ERROR: lazy loading failed for package ‘spikeSlabGAM’ * removing ‘/tmp/workdir/spikeSlabGAM/old/spikeSlabGAM.Rcheck/spikeSlabGAM’ +``` +# stabiliser + +
+ +* Version: 1.0.6 +* GitHub: NA +* Source code: https://github.com/cran/stabiliser +* Date/Publication: 2023-05-17 11:00:05 UTC +* Number of recursive dependencies: 151 + +Run `revdepcheck::cloud_details(, "stabiliser")` for more info + +
+ +## In both + +* checking whether package ‘stabiliser’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/stabiliser/new/stabiliser.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘stabiliser’ ... +** package ‘stabiliser’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘maditr’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: lazy loading failed for package ‘stabiliser’ +* removing ‘/tmp/workdir/stabiliser/new/stabiliser.Rcheck/stabiliser’ + + +``` +### CRAN + +``` +* installing *source* package ‘stabiliser’ ... +** package ‘stabiliser’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘maditr’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: lazy loading failed for package ‘stabiliser’ +* removing ‘/tmp/workdir/stabiliser/old/stabiliser.Rcheck/stabiliser’ + + ``` # statsr
-* Version: 0.3.0 -* GitHub: https://github.com/StatsWithR/statsr -* Source code: https://github.com/cran/statsr -* Date/Publication: 2021-01-22 20:40:03 UTC -* Number of recursive dependencies: 97 +* Version: 0.3.0 +* GitHub: https://github.com/StatsWithR/statsr +* Source code: https://github.com/cran/statsr +* Date/Publication: 2021-01-22 20:40:03 UTC +* Number of recursive dependencies: 96 + +Run `revdepcheck::cloud_details(, "statsr")` for more info + +
+ +## In both + +* checking whether package ‘statsr’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/statsr/new/statsr.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘statsr’ ... +** package ‘statsr’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘BayesFactor’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘statsr’ +* removing ‘/tmp/workdir/statsr/new/statsr.Rcheck/statsr’ + + +``` +### CRAN + +``` +* installing *source* package ‘statsr’ ... +** package ‘statsr’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘BayesFactor’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Execution halted +ERROR: lazy loading failed for package ‘statsr’ +* removing ‘/tmp/workdir/statsr/old/statsr.Rcheck/statsr’ + + +``` +# streamDAG + +
+ +* Version: 1.5-9 +* GitHub: NA +* Source code: https://github.com/cran/streamDAG +* Date/Publication: 2025-01-14 21:50:02 UTC +* Number of recursive dependencies: 139 + +Run `revdepcheck::cloud_details(, "streamDAG")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/streamDAG/new/streamDAG.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘streamDAG/DESCRIPTION’ ... OK +* this is package ‘streamDAG’ version ‘1.5-9’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘asbio’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/streamDAG/old/streamDAG.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘streamDAG/DESCRIPTION’ ... OK +* this is package ‘streamDAG’ version ‘1.5-9’ +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘asbio’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +# survex + +
+ +* Version: 1.2.0 +* GitHub: https://github.com/ModelOriented/survex +* Source code: https://github.com/cran/survex +* Date/Publication: 2023-10-24 18:50:07 UTC +* Number of recursive dependencies: 182 -Run `revdepcheck::cloud_details(, "statsr")` for more info +Run `revdepcheck::cloud_details(, "survex")` for more info
-## In both - -* checking whether package ‘statsr’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/statsr/new/statsr.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘statsr’ ... -** package ‘statsr’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘BayesFactor’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +* using log directory ‘/tmp/workdir/survex/new/survex.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘survex/DESCRIPTION’ ... OK +... +  A new explainer has been created!  +> +> y <- cph_exp$y +> times <- cph_exp$times +> surv <- cph_exp$predict_survival_function(cph, cph_exp$data, times) +Error in loadNamespace(x) : there is no package called ‘riskRegression’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart Execution halted -ERROR: lazy loading failed for package ‘statsr’ -* removing ‘/tmp/workdir/statsr/new/statsr.Rcheck/statsr’ +* DONE +Status: 1 ERROR, 1 NOTE + + + ``` ### CRAN ``` -* installing *source* package ‘statsr’ ... -** package ‘statsr’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘BayesFactor’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +* using log directory ‘/tmp/workdir/survex/old/survex.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘survex/DESCRIPTION’ ... OK +... +  A new explainer has been created!  +> +> y <- cph_exp$y +> times <- cph_exp$times +> surv <- cph_exp$predict_survival_function(cph, cph_exp$data, times) +Error in loadNamespace(x) : there is no package called ‘riskRegression’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart Execution halted -ERROR: lazy loading failed for package ‘statsr’ -* removing ‘/tmp/workdir/statsr/old/statsr.Rcheck/statsr’ +* DONE +Status: 1 ERROR, 1 NOTE + + + ``` -# streamDAG +# survHE
-* Version: 1.5 -* GitHub: NA -* Source code: https://github.com/cran/streamDAG -* Date/Publication: 2023-10-06 18:50:02 UTC -* Number of recursive dependencies: 132 +* Version: 2.0.2 +* GitHub: https://github.com/giabaio/survHE +* Source code: https://github.com/cran/survHE +* Date/Publication: 2024-10-04 09:50:02 UTC +* Number of recursive dependencies: 129 -Run `revdepcheck::cloud_details(, "streamDAG")` for more info +Run `revdepcheck::cloud_details(, "survHE")` for more info
@@ -10036,20 +11978,22 @@ Run `revdepcheck::cloud_details(, "streamDAG")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/streamDAG/new/streamDAG.Rcheck’ +* using log directory ‘/tmp/workdir/survHE/new/survHE.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘streamDAG/DESCRIPTION’ ... OK -* this is package ‘streamDAG’ version ‘1.5’ -* checking package namespace information ... OK +* checking for file ‘survHE/DESCRIPTION’ ... OK +... * checking package dependencies ... ERROR -Package required but not available: ‘asbio’ +Package required but not available: ‘rms’ + +Packages suggested but not available for checking: + 'survHEinla', 'survHEhmc' See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -10064,20 +12008,22 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/streamDAG/old/streamDAG.Rcheck’ +* using log directory ‘/tmp/workdir/survHE/old/survHE.Rcheck’ * using R version 4.3.1 (2023-06-16) * using platform: x86_64-pc-linux-gnu (64-bit) * R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘streamDAG/DESCRIPTION’ ... OK -* this is package ‘streamDAG’ version ‘1.5’ -* checking package namespace information ... OK +* checking for file ‘survHE/DESCRIPTION’ ... OK +... * checking package dependencies ... ERROR -Package required but not available: ‘asbio’ +Package required but not available: ‘rms’ + +Packages suggested but not available for checking: + 'survHEinla', 'survHEhmc' See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -10120,9 +12066,9 @@ Run `revdepcheck::cloud_details(, "survidm")` for more info ** package ‘survidm’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c survidm_init.c -o survidm_init.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c survivalBIV.c -o survivalBIV.o +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c survidm_init.c -o survidm_init.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c survivalBIV.c -o survivalBIV.o gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o survidm.so survidm_init.o survivalBIV.o -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/survidm/new/survidm.Rcheck/00LOCK-survidm/00new/survidm/libs ** R @@ -10145,9 +12091,9 @@ ERROR: lazy loading failed for package ‘survidm’ ** package ‘survidm’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c survidm_init.c -o survidm_init.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c survivalBIV.c -o survivalBIV.o +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c survidm_init.c -o survidm_init.o +gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c survivalBIV.c -o survivalBIV.o gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o survidm.so survidm_init.o survivalBIV.o -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/survidm/old/survidm.Rcheck/00LOCK-survidm/00new/survidm/libs ** R @@ -10229,69 +12175,75 @@ ERROR: lazy loading failed for package ‘tempted’
-* Version: 1.1.1 +* Version: 1.1.2 * GitHub: https://github.com/jiangyouxiang/TestAnaAPP * Source code: https://github.com/cran/TestAnaAPP -* Date/Publication: 2024-09-10 07:30:02 UTC -* Number of recursive dependencies: 250 +* Date/Publication: 2024-11-09 04:00:02 UTC +* Number of recursive dependencies: 255 Run `revdepcheck::cloud_details(, "TestAnaAPP")` for more info
-## In both - -* checking whether package ‘TestAnaAPP’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/TestAnaAPP/new/TestAnaAPP.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘TestAnaAPP’ ... -** package ‘TestAnaAPP’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rms’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘TestAnaAPP’ -* removing ‘/tmp/workdir/TestAnaAPP/new/TestAnaAPP.Rcheck/TestAnaAPP’ +* using log directory ‘/tmp/workdir/TestAnaAPP/new/TestAnaAPP.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘TestAnaAPP/DESCRIPTION’ ... OK +... +* this is package ‘TestAnaAPP’ version ‘1.1.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘lordif’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` ### CRAN ``` -* installing *source* package ‘TestAnaAPP’ ... -** package ‘TestAnaAPP’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - there is no package called ‘rms’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘TestAnaAPP’ -* removing ‘/tmp/workdir/TestAnaAPP/old/TestAnaAPP.Rcheck/TestAnaAPP’ +* using log directory ‘/tmp/workdir/TestAnaAPP/old/TestAnaAPP.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘TestAnaAPP/DESCRIPTION’ ... OK +... +* this is package ‘TestAnaAPP’ version ‘1.1.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘lordif’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` @@ -10365,7 +12317,7 @@ ERROR: lazy loading failed for package ‘tidydr’ * GitHub: NA * Source code: https://github.com/cran/tidyEdSurvey * Date/Publication: 2024-05-14 20:20:03 UTC -* Number of recursive dependencies: 111 +* Number of recursive dependencies: 113 Run `revdepcheck::cloud_details(, "tidyEdSurvey")` for more info @@ -10431,7 +12383,7 @@ ERROR: lazy loading failed for package ‘tidyEdSurvey’ * GitHub: https://github.com/stemangiola/tidyseurat * Source code: https://github.com/cran/tidyseurat * Date/Publication: 2024-01-10 04:50:02 UTC -* Number of recursive dependencies: 208 +* Number of recursive dependencies: 196 Run `revdepcheck::cloud_details(, "tidyseurat")` for more info @@ -10469,42 +12421,182 @@ ERROR: lazy loading failed for package ‘tidyseurat’ ### CRAN ``` -* installing *source* package ‘tidyseurat’ ... -** package ‘tidyseurat’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required -Execution halted -ERROR: lazy loading failed for package ‘tidyseurat’ -* removing ‘/tmp/workdir/tidyseurat/old/tidyseurat.Rcheck/tidyseurat’ +* installing *source* package ‘tidyseurat’ ... +** package ‘tidyseurat’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required +Execution halted +ERROR: lazy loading failed for package ‘tidyseurat’ +* removing ‘/tmp/workdir/tidyseurat/old/tidyseurat.Rcheck/tidyseurat’ + + +``` +# tidyvpc + +
+ +* Version: 1.5.2 +* GitHub: https://github.com/certara/tidyvpc +* Source code: https://github.com/cran/tidyvpc +* Date/Publication: 2024-11-21 23:10:02 UTC +* Number of recursive dependencies: 180 + +Run `revdepcheck::cloud_details(, "tidyvpc")` for more info + +
+ +## In both + +* checking whether package ‘tidyvpc’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/tidyvpc/new/tidyvpc.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘tidyvpc’ ... +** package ‘tidyvpc’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘tidyvpc’ +* removing ‘/tmp/workdir/tidyvpc/new/tidyvpc.Rcheck/tidyvpc’ + + +``` +### CRAN + +``` +* installing *source* package ‘tidyvpc’ ... +** package ‘tidyvpc’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : + namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Execution halted +ERROR: lazy loading failed for package ‘tidyvpc’ +* removing ‘/tmp/workdir/tidyvpc/old/tidyvpc.Rcheck/tidyvpc’ + + +``` +# tinyarray + +
+ +* Version: 2.4.2 +* GitHub: https://github.com/xjsun1221/tinyarray +* Source code: https://github.com/cran/tinyarray +* Date/Publication: 2024-06-13 14:20:02 UTC +* Number of recursive dependencies: 250 + +Run `revdepcheck::cloud_details(, "tinyarray")` for more info + +
+ +## Error before installation + +### Devel + +``` +* using log directory ‘/tmp/workdir/tinyarray/new/tinyarray.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘tinyarray/DESCRIPTION’ ... OK +... +* this is package ‘tinyarray’ version ‘2.4.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + + + +``` +### CRAN + +``` +* using log directory ‘/tmp/workdir/tinyarray/old/tinyarray.Rcheck’ +* using R version 4.3.1 (2023-06-16) +* using platform: x86_64-pc-linux-gnu (64-bit) +* R was compiled by + gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 + GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 +* running under: Ubuntu 24.04.1 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘tinyarray/DESCRIPTION’ ... OK +... +* this is package ‘tinyarray’ version ‘2.4.2’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘clusterProfiler’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` -# tidyvpc +# treeclim
-* Version: 1.5.1 -* GitHub: https://github.com/certara/tidyvpc -* Source code: https://github.com/cran/tidyvpc -* Date/Publication: 2024-01-18 13:10:02 UTC -* Number of recursive dependencies: 176 +* Version: 2.0.7.1 +* GitHub: https://github.com/cszang/treeclim +* Source code: https://github.com/cran/treeclim +* Date/Publication: 2024-12-16 16:20:02 UTC +* Number of recursive dependencies: 60 -Run `revdepcheck::cloud_details(, "tidyvpc")` for more info +Run `revdepcheck::cloud_details(, "treeclim")` for more info
## In both -* checking whether package ‘tidyvpc’ can be installed ... ERROR +* checking whether package ‘treeclim’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/tidyvpc/new/tidyvpc.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/treeclim/new/treeclim.Rcheck/00install.out’ for details. ``` ## Installation @@ -10512,10 +12604,17 @@ Run `revdepcheck::cloud_details(, "tidyvpc")` for more info ### Devel ``` -* installing *source* package ‘tidyvpc’ ... -** package ‘tidyvpc’ successfully unpacked and MD5 sums checked +* installing *source* package ‘treeclim’ ... +** package ‘treeclim’ successfully unpacked and MD5 sums checked ** using staged installation -** R +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun.cpp -o corfun.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_exact.cpp -o corfun_exact.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_noboot.cpp -o corfun_noboot.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c pcor.cpp -o pcor.o +... ** data *** moving datasets to lazyload DB ** inst @@ -10524,18 +12623,25 @@ Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘tidyvpc’ -* removing ‘/tmp/workdir/tidyvpc/new/tidyvpc.Rcheck/tidyvpc’ +ERROR: lazy loading failed for package ‘treeclim’ +* removing ‘/tmp/workdir/treeclim/new/treeclim.Rcheck/treeclim’ ``` ### CRAN ``` -* installing *source* package ‘tidyvpc’ ... -** package ‘tidyvpc’ successfully unpacked and MD5 sums checked +* installing *source* package ‘treeclim’ ... +** package ‘treeclim’ successfully unpacked and MD5 sums checked ** using staged installation -** R +** libs +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun.cpp -o corfun.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_exact.cpp -o corfun_exact.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_noboot.cpp -o corfun_noboot.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c pcor.cpp -o pcor.o +... ** data *** moving datasets to lazyload DB ** inst @@ -10544,8 +12650,8 @@ Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace Execution halted -ERROR: lazy loading failed for package ‘tidyvpc’ -* removing ‘/tmp/workdir/tidyvpc/old/tidyvpc.Rcheck/tidyvpc’ +ERROR: lazy loading failed for package ‘treeclim’ +* removing ‘/tmp/workdir/treeclim/old/treeclim.Rcheck/treeclim’ ``` @@ -10557,7 +12663,7 @@ ERROR: lazy loading failed for package ‘tidyvpc’ * GitHub: https://github.com/alexander-pastukhov/tridim-regression * Source code: https://github.com/cran/TriDimRegression * Date/Publication: 2023-09-13 14:10:03 UTC -* Number of recursive dependencies: 99 +* Number of recursive dependencies: 98 Run `revdepcheck::cloud_details(, "TriDimRegression")` for more info @@ -10609,7 +12715,7 @@ ERROR: configuration failed for package ‘TriDimRegression’ * GitHub: https://github.com/PetoLau/TSrepr * Source code: https://github.com/cran/TSrepr * Date/Publication: 2020-07-13 06:50:15 UTC -* Number of recursive dependencies: 72 +* Number of recursive dependencies: 71 Run `revdepcheck::cloud_details(, "TSrepr")` for more info @@ -10632,12 +12738,12 @@ Run `revdepcheck::cloud_details(, "TSrepr")` for more info ** package ‘TSrepr’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c FeatureClippingTrending.cpp -o FeatureClippingTrending.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c helpers.cpp -o helpers.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c measures.cpp -o measures.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c normalizations.cpp -o normalizations.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c FeatureClippingTrending.cpp -o FeatureClippingTrending.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c helpers.cpp -o helpers.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c measures.cpp -o measures.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c normalizations.cpp -o normalizations.o ... ** data *** moving datasets to lazyload DB @@ -10659,12 +12765,12 @@ ERROR: lazy loading failed for package ‘TSrepr’ ** package ‘TSrepr’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c FeatureClippingTrending.cpp -o FeatureClippingTrending.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c helpers.cpp -o helpers.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c measures.cpp -o measures.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c normalizations.cpp -o normalizations.o +using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c FeatureClippingTrending.cpp -o FeatureClippingTrending.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c helpers.cpp -o helpers.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c measures.cpp -o measures.o +g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c normalizations.cpp -o normalizations.o ... ** data *** moving datasets to lazyload DB @@ -10710,7 +12816,7 @@ Run `revdepcheck::cloud_details(, "twang")` for more info ** package ‘twang’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c init.c -o init.o gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c ks.c -o ks.o gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o twang.so init.o ks.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR @@ -10735,7 +12841,7 @@ ERROR: lazy loading failed for package ‘twang’ ** package ‘twang’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c init.c -o init.o gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c ks.c -o ks.o gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o twang.so init.o ks.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR @@ -10752,158 +12858,6 @@ ERROR: lazy loading failed for package ‘twang’ * removing ‘/tmp/workdir/twang/old/twang.Rcheck/twang’ -``` -# updog - -
- -* Version: 2.1.5 -* GitHub: https://github.com/dcgerard/updog -* Source code: https://github.com/cran/updog -* Date/Publication: 2023-11-29 15:50:02 UTC -* Number of recursive dependencies: 138 - -Run `revdepcheck::cloud_details(, "updog")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/updog/new/updog.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘updog/DESCRIPTION’ ... OK -... -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘multidog.Rmd’ using ‘UTF-8’... OK - ‘oracle_calculations.Rmd’ using ‘UTF-8’... OK - ‘simulate_ngs.Rmd’ using ‘UTF-8’... OK - ‘smells_like_updog.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 2 NOTEs - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/updog/old/updog.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘updog/DESCRIPTION’ ... OK -... -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘multidog.Rmd’ using ‘UTF-8’... OK - ‘oracle_calculations.Rmd’ using ‘UTF-8’... OK - ‘simulate_ngs.Rmd’ using ‘UTF-8’... OK - ‘smells_like_updog.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 2 NOTEs - - - - - -``` -# valr - -
- -* Version: 0.8.2 -* GitHub: https://github.com/rnabioco/valr -* Source code: https://github.com/cran/valr -* Date/Publication: 2024-08-30 22:10:03 UTC -* Number of recursive dependencies: 176 - -Run `revdepcheck::cloud_details(, "valr")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/valr/new/valr.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘valr/DESCRIPTION’ ... OK -... -* this is package ‘valr’ version ‘0.8.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘rtracklayer’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/valr/old/valr.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 - GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0 -* running under: Ubuntu 22.04.4 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘valr/DESCRIPTION’ ... OK -... -* this is package ‘valr’ version ‘0.8.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘rtracklayer’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - ``` # vdg @@ -10936,7 +12890,7 @@ Run `revdepcheck::cloud_details(, "vdg")` for more info ** package ‘vdg’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using Fortran compiler: ‘GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using Fortran compiler: ‘GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ gfortran -fpic -g -O2 -c FDS.f -o FDS.o gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o vdg.so FDS.o -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/vdg/new/vdg.Rcheck/00LOCK-vdg/00new/vdg/libs @@ -10960,7 +12914,7 @@ ERROR: lazy loading failed for package ‘vdg’ ** package ‘vdg’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using Fortran compiler: ‘GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’ +using Fortran compiler: ‘GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ gfortran -fpic -g -O2 -c FDS.f -o FDS.o gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o vdg.so FDS.o -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR installing to /tmp/workdir/vdg/old/vdg.Rcheck/00LOCK-vdg/00new/vdg/libs @@ -10976,6 +12930,41 @@ ERROR: lazy loading failed for package ‘vdg’ * removing ‘/tmp/workdir/vdg/old/vdg.Rcheck/vdg’ +``` +# VecDep + +
+ +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/VecDep +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "VecDep")` for more info + +
+ +## Error before installation + +### Devel + +``` + + + + + + +``` +### CRAN + +``` + + + + + + ``` # visa @@ -10985,7 +12974,7 @@ ERROR: lazy loading failed for package ‘vdg’ * GitHub: https://github.com/kang-yu/visa * Source code: https://github.com/cran/visa * Date/Publication: 2021-04-20 07:20:02 UTC -* Number of recursive dependencies: 140 +* Number of recursive dependencies: 139 Run `revdepcheck::cloud_details(, "visa")` for more info @@ -11048,7 +13037,7 @@ ERROR: lazy loading failed for package ‘visa’ * Version: NA * GitHub: NA * Source code: https://github.com/cran/VisualizeSimon2Stage -* Number of recursive dependencies: 30 +* Number of recursive dependencies: 36 Run `revdepcheck::cloud_details(, "VisualizeSimon2Stage")` for more info @@ -11075,6 +13064,69 @@ Run `revdepcheck::cloud_details(, "VisualizeSimon2Stage")` for more info +``` +# wppExplorer + +
+ +* Version: 2.3-4 +* GitHub: NA +* Source code: https://github.com/cran/wppExplorer +* Date/Publication: 2020-04-09 09:10:02 UTC +* Number of recursive dependencies: 99 + +Run `revdepcheck::cloud_details(, "wppExplorer")` for more info + +
+ +## Newly broken + +* checking whether package ‘wppExplorer’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/wppExplorer/new/wppExplorer.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘wppExplorer’ ... +** package ‘wppExplorer’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error in is.element(wpp.data.env$iso3166$uncode, wpp.data.env$popM$country_code) : + unused argument (wpp.data.env$popM$country_code) +Error: unable to load R code in package ‘wppExplorer’ +Execution halted +ERROR: lazy loading failed for package ‘wppExplorer’ +* removing ‘/tmp/workdir/wppExplorer/new/wppExplorer.Rcheck/wppExplorer’ + + +``` +### CRAN + +``` +* installing *source* package ‘wppExplorer’ ... +** package ‘wppExplorer’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +** help +*** installing help indices +** building package indices +** testing if installed package can be loaded from temporary location +** testing if installed package can be loaded from final location +** testing if installed package keeps a record of temporary installation path +* DONE (wppExplorer) + + ``` # WRTDStidal diff --git a/revdep/problems.md b/revdep/problems.md index 73ee83725d..f698c10792 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -1,14 +1,14 @@ -# activAnalyzer +# ABHgenotypeR
-* Version: 2.1.1 -* GitHub: https://github.com/pydemull/activAnalyzer -* Source code: https://github.com/cran/activAnalyzer -* Date/Publication: 2024-05-05 22:40:03 UTC -* Number of recursive dependencies: 148 +* Version: 1.0.1 +* GitHub: https://github.com/StefanReuscher/ABHgenotypeR +* Source code: https://github.com/cran/ABHgenotypeR +* Date/Publication: 2016-02-04 11:27:29 +* Number of recursive dependencies: 54 -Run `revdepcheck::cloud_details(, "activAnalyzer")` for more info +Run `revdepcheck::cloud_details(, "ABHgenotypeR")` for more info
@@ -17,47 +17,57 @@ Run `revdepcheck::cloud_details(, "activAnalyzer")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘activAnalyzer.Rmd’ + when running code in ‘ABHgenotypeR-vignette.Rmd’ ... - > p3 <- accum_metrics_sed$p_UBD + + "preprefall025TestData.csv", package = "ABHgenotypeR"), nameA = "NB", + + nameB = "OL ..." ... [TRUNCATED] - > p4 <- accum_metrics_sed$p_gini + > plotGenos(genotypes) - > (p1 | p2)/(p3 | p4) + plot_layout(guides = "collect") & - + theme(legend.position = "bottom") - - When sourcing ‘activAnalyzer.R’: - Error: object is not a unit + When sourcing ‘ABHgenotypeR-vignette.R’: + Error: The `panel.margin` argument of `theme()` was deprecated in ggplot2 2.2.0 + and is now defunct. + ℹ Please use the `panel.spacing` argument instead. Execution halted - ‘activAnalyzer.Rmd’ using ‘UTF-8’... failed + ‘ABHgenotypeR-vignette.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘activAnalyzer.Rmd’ using rmarkdown + ... + --- re-building ‘ABHgenotypeR-vignette.Rmd’ using rmarkdown + + Quitting from lines 70-72 [unnamed-chunk-3] (ABHgenotypeR-vignette.Rmd) + Error: processing vignette 'ABHgenotypeR-vignette.Rmd' failed with diagnostics: + The `panel.margin` argument of `theme()` was deprecated in ggplot2 2.2.0 + and is now defunct. + ℹ Please use the `panel.spacing` argument instead. + --- failed re-building ‘ABHgenotypeR-vignette.Rmd’ + + SUMMARY: processing the following file failed: + ‘ABHgenotypeR-vignette.Rmd’ + + Error: Vignette re-building failed. + Execution halted ``` ## In both -* checking installed package size ... NOTE +* checking LazyData ... NOTE ``` - installed size is 5.8Mb - sub-directories of 1Mb or more: - R 1.5Mb - doc 1.0Mb - extdata 2.0Mb + 'LazyData' is specified without a 'data' directory ``` # actxps
-* Version: 1.5.0 +* Version: 1.6.0 * GitHub: https://github.com/mattheaphy/actxps * Source code: https://github.com/cran/actxps -* Date/Publication: 2024-06-25 12:40:02 UTC +* Date/Publication: 2025-01-07 13:00:02 UTC * Number of recursive dependencies: 130 Run `revdepcheck::cloud_details(, "actxps")` for more info @@ -116,17 +126,17 @@ Run `revdepcheck::cloud_details(, "actxps")` for more info Execution halted ``` -# adaptr +# adklakedata
-* Version: 1.4.0 -* GitHub: https://github.com/INCEPTdk/adaptr -* Source code: https://github.com/cran/adaptr -* Date/Publication: 2024-05-03 12:10:02 UTC -* Number of recursive dependencies: 74 +* Version: 0.6.1 +* GitHub: https://github.com/lawinslow/adklakedata +* Source code: https://github.com/cran/adklakedata +* Date/Publication: 2018-02-16 19:08:16 UTC +* Number of recursive dependencies: 64 -Run `revdepcheck::cloud_details(, "adaptr")` for more info +Run `revdepcheck::cloud_details(, "adklakedata")` for more info
@@ -134,79 +144,139 @@ Run `revdepcheck::cloud_details(, "adaptr")` for more info * checking examples ... ERROR ``` - Running examples in ‘adaptr-Ex.R’ failed + Running examples in ‘adklakedata-Ex.R’ failed The error most likely occurred in: - > ### Name: plot_history - > ### Title: Plot trial metric history - > ### Aliases: plot_history plot_history.trial_result - > ### plot_history.trial_results + > ### Name: adk_lake_shapes + > ### Title: Return path to Lake Polygons Shapefile + > ### Aliases: adk_lake_shapes > > ### ** Examples > - ... - + # Run a single simulation with a fixed random seed - + res <- run_trial(binom_trial, seed = 12345) - + - + # Plot total allocations to each arm according to overall total allocations - + plot_history(res, x_value = "total n", y_value = "n") - + - + } - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot_history ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > library(sf) + Linking to GEOS 3.12.1, GDAL 3.8.4, PROJ 9.4.0; sf_use_s2() is TRUE + > bl = read_sf(adklakedata::adk_shape()) + Error in process_cpl_read_ogr(x, quiet, check_ring_dir = check_ring_dir, : + package tibble not available: install first? + Calls: read_sf ... st_read -> st_read.character -> process_cpl_read_ogr Execution halted ``` -* checking tests ... ERROR +## In both + +* checking LazyData ... NOTE ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(adaptr) - Loading 'adaptr' package v1.4.0. - For instructions, type 'help("adaptr")' - or see https://inceptdk.github.io/adaptr/. - > - > test_check("adaptr") - ... - • plot_history/history-plot-binomial-single-ratio-ys-look.svg - • plot_metrics_ecdf/errors.svg - • plot_metrics_ecdf/selected.svg - • plot_metrics_ecdf/size-only.svg - • plot_metrics_ecdf/superior.svg - • plot_status/status-plot-across-arms-binomial.svg - • plot_status/status-plot-for-all-arms-binomial.svg - • plot_status/status-plot-for-arm-c-binom.svg - Error: Test failures - Execution halted + 'LazyData' is specified without a 'data' directory + ``` + +# adobeanalyticsr + +
+ +* Version: 0.5.0 +* GitHub: https://github.com/benrwoodard/adobeanalyticsr +* Source code: https://github.com/cran/adobeanalyticsr +* Date/Publication: 2025-01-16 06:10:02 UTC +* Number of recursive dependencies: 83 + +Run `revdepcheck::cloud_details(, "adobeanalyticsr")` for more info + +
+ +## Newly broken + +* checking whether package ‘adobeanalyticsr’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(limit[i], ': unused argument (c("within", "after")) + See ‘/tmp/workdir/adobeanalyticsr/new/adobeanalyticsr.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + seg_then: possible error in is.element(limit[i], c("within", "after")): + unused argument (c("within", "after")) + ``` + +# adw + +
+ +* Version: 0.4.0 +* GitHub: https://github.com/PanfengZhang/adw +* Source code: https://github.com/cran/adw +* Date/Publication: 2024-04-15 19:10:16 UTC +* Number of recursive dependencies: 62 + +Run `revdepcheck::cloud_details(, "adw")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘adw-Ex.R’ failed + The error most likely occurred in: + + > ### Name: adw + > ### Title: Angular Distance Weighting Interpolation. + > ### Aliases: adw + > + > ### ** Examples + > + > set.seed(2) + ... + 4 111.75 31.25 -0.47570806 + 5 112.25 31.25 -1.57521787 + 6 112.75 31.25 -1.10541492 + > + > # example 2 + > hmap <- cnmap::getMap(code = "410000") |> sf::st_make_valid() # return a 'sf' object. + Error in process_cpl_read_ogr(x, quiet, check_ring_dir = check_ring_dir, : + package tibble not available: install first? + Calls: ... st_read -> st_read.character -> process_cpl_read_ogr + Execution halted ``` * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘Overview.Rmd’ + when running code in ‘Introduction.Rmd’ ... - > plot_convergence(calibrated_binom_trial$best_sims, - + metrics = c("size mean", "prob_superior", "prob_equivalence"), - + n_split = 4) + > tavg <- data.frame(lon = runif(100, min = 110, max = 117), + + lat = runif(100, min = 31, max = 37), value = runif(100, + + min = 20, max .... [TRUNCATED] - > plot_status(calibrated_binom_trial$best_sims, x_value = "total n") + > hmap <- getMap(name = "河南省", returnClass = "sf") - When sourcing ‘Overview.R’: - Error: argument is of length zero + When sourcing ‘Introduction.R’: + Error: package tibble not available: install first? Execution halted - ‘Advanced-example.Rmd’ using ‘UTF-8’... OK - ‘Basic-examples.Rmd’ using ‘UTF-8’... OK - ‘Overview.Rmd’ using ‘UTF-8’... failed + ‘Introduction.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘Advanced-example.Rmd’ using rmarkdown + ... + --- re-building ‘Introduction.Rmd’ using rmarkdown + + Quitting from lines 48-74 [unnamed-chunk-3] (Introduction.Rmd) + Error: processing vignette 'Introduction.Rmd' failed with diagnostics: + package tibble not available: install first? + --- failed re-building ‘Introduction.Rmd’ + + SUMMARY: processing the following file failed: + ‘Introduction.Rmd’ + + Error: Vignette re-building failed. + Execution halted ``` # AeRobiology @@ -217,7 +287,7 @@ Run `revdepcheck::cloud_details(, "adaptr")` for more info * GitHub: NA * Source code: https://github.com/cran/AeRobiology * Date/Publication: 2019-06-03 06:20:03 UTC -* Number of recursive dependencies: 98 +* Number of recursive dependencies: 97 Run `revdepcheck::cloud_details(, "AeRobiology")` for more info @@ -225,14 +295,6 @@ Run `revdepcheck::cloud_details(, "AeRobiology")` for more info ## Newly broken -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘my-vignette.Rmd’ using rmarkdown - ``` - -## In both - * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: @@ -252,15 +314,21 @@ Run `revdepcheck::cloud_details(, "AeRobiology")` for more info ‘my-vignette.Rmd’ using ‘UTF-8’... failed ``` +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘my-vignette.Rmd’ using rmarkdown + ``` + # agricolaeplotr
-* Version: 0.5.0 +* Version: 0.6.0 * GitHub: https://github.com/jensharbers/agricolaeplotr * Source code: https://github.com/cran/agricolaeplotr -* Date/Publication: 2024-01-17 16:42:04 UTC -* Number of recursive dependencies: 144 +* Date/Publication: 2025-01-22 13:20:02 UTC +* Number of recursive dependencies: 143 Run `revdepcheck::cloud_details(, "agricolaeplotr")` for more info @@ -293,60 +361,50 @@ Run `revdepcheck::cloud_details(, "agricolaeplotr")` for more info Execution halted ``` -# alien - -
- -* Version: 1.0.2 -* GitHub: NA -* Source code: https://github.com/cran/alien -* Date/Publication: 2024-06-19 16:20:02 UTC -* Number of recursive dependencies: 91 - -Run `revdepcheck::cloud_details(, "alien")` for more info - -
- -## Newly broken - * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘basic_usage.Rmd’ + when running code in ‘FielDHub.Rmd’ ... - 2 0.3330822 6.848124e-06 1.620061e+04 - 3 0.3377835 1.902532e-07 5.997150e+05 - 4 0.3425512 5.285577e-09 2.220028e+07 + 3 3 IBAGUE 103 1 ND-10 + 4 4 IBAGUE 104 1 ND-13 + 5 5 IBAGUE 105 1 ND-6 + 6 6 IBAGUE 106 1 ND-14 - > plot_snc(model, cumulative = T) + coord_cartesian(ylim = c(0, - + 150)) + scale_y_continuous(breaks = seq(0, 150, 50)) + ylab("Cumulative discove ..." ... [TRUNCATED] + > plt <- plot(rcbd2) - When sourcing ‘basic_usage.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 + When sourcing ‘FielDHub.R’: + Error: unused argument (dn) Execution halted - ‘basic_usage.Rmd’ using ‘UTF-8’... failed - ‘native_discoveries.Rmd’ using ‘UTF-8’... OK - ‘simulations.Rmd’ using ‘UTF-8’... OK + ‘FielDHub.Rmd’ using ‘UTF-8’... failed + ‘vignette.Rmd’ using ‘UTF-8’... OK ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘basic_usage.Rmd’ using rmarkdown + --- re-building ‘FielDHub.Rmd’ using rmarkdown + + Quitting from lines 40-44 [unnamed-chunk-2] (FielDHub.Rmd) + Error: processing vignette 'FielDHub.Rmd' failed with diagnostics: + unused argument (dn) + --- failed re-building ‘FielDHub.Rmd’ + + --- re-building ‘vignette.Rmd’ using rmarkdown ``` -# AlphaPart +# agridat
-* Version: 0.9.8 -* GitHub: NA -* Source code: https://github.com/cran/AlphaPart -* Date/Publication: 2022-11-15 21:40:05 UTC -* Number of recursive dependencies: 83 +* Version: 1.24 +* GitHub: https://github.com/kwstat/agridat +* Source code: https://github.com/cran/agridat +* Date/Publication: 2024-10-27 17:00:02 UTC +* Number of recursive dependencies: 226 -Run `revdepcheck::cloud_details(, "AlphaPart")` for more info +Run `revdepcheck::cloud_details(, "agridat")` for more info
@@ -354,49 +412,59 @@ Run `revdepcheck::cloud_details(, "AlphaPart")` for more info * checking examples ... ERROR ``` - Running examples in ‘AlphaPart-Ex.R’ failed + Running examples in ‘agridat-Ex.R’ failed The error most likely occurred in: - > ### Name: print.plotSummaryAlphaPart - > ### Title: Print a plot generate by the function 'plotSummaryAlphaPart' - > ### Aliases: print.plotSummaryAlphaPart + > ### Name: connolly.potato + > ### Title: Potato yields in single-drill plots + > ### Aliases: connolly.potato + > ### Keywords: datasets > > ### ** Examples > - > ## Partition additive genetic values ... - 4 4 1 105.00000 66 39.00000 - + > dat <- connolly.potato > - > ## Plot the partitions - > p <- plot(ret, ylab=c("BV for trait 1", "BV for trait 2"), xlab="Generation") - > print(p[[1]]) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: print ... drawDetails -> drawDetails.polyline -> grid.Call.graphics + > # Field plan + > libs(desplot) + > desplot(dat, yield~col*row, + + out1=rep, # aspect unknown + + main="connolly.potato yields (reps not contiguous)") + Error in is.element(x, dn) : unused argument (dn) + Calls: desplot -> checkvars Execution halted ``` -## In both - * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘alphapart-variance.Rmd’ + when running code in ‘agridat_graphical_gems.Rmd’ ... - > data <- readRDS("./../inst/extdata/AlphaPartCattleSim.rds") %>% - + dplyr::mutate(across(generation:mother, as.numeric)) %>% - + dplyr::rename .... [TRUNCATED] - Warning in gzfile(file, "rb") : - cannot open compressed file './../inst/extdata/AlphaPartCattleSim.rds', probable reason 'No such file or directory' + > dat <- gomez.stripsplitplot - When sourcing ‘alphapart-variance.R’: - Error: cannot open the connection + > if (require("desplot")) { + + desplot(dat, gen ~ col * row, out1 = rep, col = nitro, text = planting, + + cex = 1, main = "gomez.stripsplit ..." ... [TRUNCATED] + + When sourcing ‘agridat_graphical_gems.R’: + Error: unused argument (dn) Execution halted - ‘alphapart-variance.Rmd’ using ‘UTF-8’... failed - ‘alphapart-vignette.Rmd’ using ‘UTF-8’... OK + ‘agridat_data.Rmd’ using ‘UTF-8’... OK + ‘agridat_graphical_gems.Rmd’ using ‘UTF-8’... failed + ‘agridat_intro.Rmd’ using ‘UTF-8’... OK + ‘agridat_mixed_model_example.Rmd’ using ‘UTF-8’... OK + ‘agridat_uniformity_data.Rmd’ using ‘UTF-8’... OK + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘agridat_data.Rmd’ using rmarkdown + --- finished re-building ‘agridat_data.Rmd’ + + --- re-building ‘agridat_graphical_gems.Rmd’ using rmarkdown ``` # AnalysisLin @@ -482,7 +550,7 @@ Run `revdepcheck::cloud_details(, "animbook")` for more info * GitHub: https://github.com/bflammers/ANN2 * Source code: https://github.com/cran/ANN2 * Date/Publication: 2020-12-01 10:00:02 UTC -* Number of recursive dependencies: 52 +* Number of recursive dependencies: 51 Run `revdepcheck::cloud_details(, "ANN2")` for more info @@ -524,10 +592,10 @@ Run `revdepcheck::cloud_details(, "ANN2")` for more info * checking installed package size ... NOTE ``` - installed size is 58.9Mb + installed size is 48.8Mb sub-directories of 1Mb or more: cereal 1.4Mb - libs 57.3Mb + libs 47.2Mb ``` * checking LazyData ... NOTE @@ -535,58 +603,58 @@ Run `revdepcheck::cloud_details(, "ANN2")` for more info 'LazyData' is specified without a 'data' directory ``` -# AnnoProbe +# APCI
-* Version: 0.1.7 -* GitHub: https://github.com/jmzeng1314/AnnoProbe -* Source code: https://github.com/cran/AnnoProbe -* Date/Publication: 2022-11-14 08:30:11 UTC -* Number of recursive dependencies: 121 +* Version: 1.0.8 +* GitHub: NA +* Source code: https://github.com/cran/APCI +* Date/Publication: 2024-09-02 20:20:06 UTC +* Number of recursive dependencies: 77 -Run `revdepcheck::cloud_details(, "AnnoProbe")` for more info +Run `revdepcheck::cloud_details(, "APCI")` for more info
## Newly broken -* checking examples ... ERROR +* checking tests ... ERROR ``` - Running examples in ‘AnnoProbe-Ex.R’ failed - The error most likely occurred in: - - > ### Name: check_diff_genes - > ### Title: Check a list of genes how they show difference. - > ### Aliases: check_diff_genes - > - > ### ** Examples - > - > attach(GSE95166) + Running ‘1_tests.R’ + Running the tests in ‘tests/1_tests.R’ failed. + Complete output: + > # install the package and use this script to test the package + > library("APCI") + > # or: remotes::install_github("jiahui1902/APCI") + > test_data <- APCI::women9017 + > test_data$acc <- as.factor(test_data$acc) + > test_data$pcc <- as.factor(test_data$pcc) + > test_data$educc <- as.factor(test_data$educc) ... - 11. │ └─ggplot2:::`+.gg`(...) - 12. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 13. │ ├─ggplot2::ggplot_add(object, p, objectname) - 14. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 15. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 16. └─base::.handleSimpleError(...) - 17. └─purrr (local) h(simpleError(msg, call)) - 18. └─cli::cli_abort(...) - 19. └─rlang::abort(...) - Execution halted + -0.330681588 0.124972726 0.151208824 -0.350044237 0.160268300 + acc8:pcc3 acc9:pcc3 acc1:pcc4 acc2:pcc4 acc3:pcc4 + -0.124023962 0.184278037 -0.415952378 0.038103374 0.173343774 + acc4:pcc4 acc5:pcc4 acc6:pcc4 acc7:pcc4 acc8:pcc4 + 0.274042725 0.250469135 -0.098811727 -0.063004131 -0.355449149 + acc9:pcc4 acc1:pcc5 acc2:pcc5 acc3:pcc5 acc4:pcc5 + 0.147098521 0.009963326 0.321744801 -0.080742516 -0.199308789 + acc5:pcc5 acc6:pcc5 acc7:pcc5 acc8:pcc5 acc9:pcc5 + -0.509084301 -0.328667274 0.352292245 0.698949422 -0.291285834 + Killed ``` -# ANOFA +# APCtools
-* Version: 0.1.3 -* GitHub: https://github.com/dcousin3/ANOFA -* Source code: https://github.com/cran/ANOFA -* Date/Publication: 2023-11-18 14:20:08 UTC -* Number of recursive dependencies: 81 +* Version: 1.0.4 +* GitHub: https://github.com/bauer-alex/APCtools +* Source code: https://github.com/cran/APCtools +* Date/Publication: 2023-01-13 23:30:02 UTC +* Number of recursive dependencies: 114 -Run `revdepcheck::cloud_details(, "ANOFA")` for more info +Run `revdepcheck::cloud_details(, "APCtools")` for more info
@@ -594,26 +662,26 @@ Run `revdepcheck::cloud_details(, "ANOFA")` for more info * checking examples ... ERROR ``` - Running examples in ‘ANOFA-Ex.R’ failed + Running examples in ‘APCtools-Ex.R’ failed The error most likely occurred in: - > ### Name: Gillet1993 - > ### Title: Gillet1993 - > ### Aliases: Gillet1993 - > ### Keywords: datasets + > ### Name: plot_densityMatrix + > ### Title: Create a matrix of density plots + > ### Aliases: plot_densityMatrix > > ### ** Examples > + > library(APCtools) ... - > # run the base analysis - > w <- anofa( Freq ~ species * location * florished, Gillet1993) - > - > # display a plot of the results - > anofaPlot(w) - superb::FYI: The variables will be plotted in that order: species, location, florished (use factorOrder to change). - Error in superb::superbPlot(cdata, BSFactors = bsfact, variables = as.character(w$freqColumn), : - superb::ERROR: The function superbPlot.line is not a known function for making plots with superbPlot. Exiting... - Calls: anofaPlot -> + 2.2.0 and is now defunct. + ℹ Please use the `rows` argument instead. + Backtrace: + ▆ + 1. └─APCtools::plot_densityMatrix(...) + 2. └─ggplot2::facet_grid(facets = facet_formula, switch = "y") + 3. └─lifecycle::deprecate_stop("2.2.0", "facet_grid(facets)", "facet_grid(rows)") + 4. └─lifecycle:::deprecate_stop0(msg) + 5. └─rlang::cnd_signal(...) Execution halted ``` @@ -623,21 +691,21 @@ Run `revdepcheck::cloud_details(, "ANOFA")` for more info Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > test_check("ANOFA") - Loading required package: ANOFA - [ FAIL 3 | WARN 0 | SKIP 0 | PASS 149 ] - - ══ Failed tests ════════════════════════════════════════════════════════════════ - ── Error ('test-ANOFA-2.R:36:5'): TESTS of emFrequencies function (2/3) ──────── + > library(APCtools) + > + > test_check("APCtools") + Loading required package: nlme + This is mgcv 1.8-42. For overview type 'help("mgcv-package")'. + Excluding 9565 missing observations of mainTrip_distance... ... - statistic = "count", errorbar = "CI", gamma = confidenceLevel, - plotStyle = plotStyle, errorbarParams = errorbarParams, ...)`: superb::ERROR: The function superbPlot.line is not a known function for making plots with superbPlot. Exiting... - Backtrace: ▆ - 1. └─ANOFA::anofaPlot(w, Freq ~ B) at test-ANOFA-3.R:46:5 - 2. └─superb::superbPlot(...) + 1. └─APCtools::plot_densityMatrix(...) at test-plots_descriptive.R:148:3 + 2. └─ggplot2::facet_grid(facets = facet_formula, switch = "y") + 3. └─lifecycle::deprecate_stop("2.2.0", "facet_grid(facets)", "facet_grid(rows)") + 4. └─lifecycle:::deprecate_stop0(msg) + 5. └─rlang::cnd_signal(...) - [ FAIL 3 | WARN 0 | SKIP 0 | PASS 149 ] + [ FAIL 2 | WARN 51 | SKIP 0 | PASS 84 ] Error: Test failures Execution halted ``` @@ -645,452 +713,230 @@ Run `revdepcheck::cloud_details(, "ANOFA")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘ConfidenceIntervals.Rmd’ + when running code in ‘main_functionality.Rmd’ ... - > library(ANOFA) - - > w <- anofa(obsfreq ~ vocation * gender, LightMargolin1971) - - > anofaPlot(w) - superb::FYI: The variables will be plotted in that order: vocation, gender (use factorOrder to change). - ... - - > anofaPlot(w) + > plot_densityMatrix(dat = travel, y_var = "mainTrip_distance", + + age_groups = age_groups, period_groups = period_groups, log_scale = TRUE) + Excluding 9149 missing observations of mainTrip_distance... - When sourcing ‘WhatIsANOFA.R’: - Error: superb::ERROR: The function superbPlot.line is not a known function for making plots with superbPlot. Exiting... + When sourcing ‘main_functionality.R’: + Error: The `facets` argument of `facet_grid()` was deprecated in ggplot2 2.2.0 + and is now defunct. + ℹ Please use the `rows` argument instead. Execution halted - ‘ConfidenceIntervals.Rmd’ using ‘UTF-8’... failed - ‘DataFormatsForFrequencies.Rmd’ using ‘UTF-8’... OK - ‘WhatIsANOFA.Rmd’ using ‘UTF-8’... failed + ‘main_functionality.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - ... - --- re-building ‘ConfidenceIntervals.Rmd’ using rmarkdown - - Quitting from lines 70-73 [unnamed-chunk-2] (ConfidenceIntervals.Rmd) - Error: processing vignette 'ConfidenceIntervals.Rmd' failed with diagnostics: - superb::ERROR: The function superbPlot.line is not a known function for making plots with superbPlot. Exiting... - --- failed re-building ‘ConfidenceIntervals.Rmd’ - - --- re-building ‘DataFormatsForFrequencies.Rmd’ using rmarkdown - ... - Quitting from lines 108-109 [unnamed-chunk-4] (WhatIsANOFA.Rmd) - Error: processing vignette 'WhatIsANOFA.Rmd' failed with diagnostics: - superb::ERROR: The function superbPlot.line is not a known function for making plots with superbPlot. Exiting... - --- failed re-building ‘WhatIsANOFA.Rmd’ - - SUMMARY: processing the following files failed: - ‘ConfidenceIntervals.Rmd’ ‘WhatIsANOFA.Rmd’ - - Error: Vignette re-building failed. - Execution halted + --- re-building ‘main_functionality.Rmd’ using rmarkdown ``` -# ANOPA +# applicable
-* Version: 0.1.3 -* GitHub: https://github.com/dcousin3/ANOPA -* Source code: https://github.com/cran/ANOPA -* Date/Publication: 2024-03-22 19:40:05 UTC -* Number of recursive dependencies: 81 +* Version: 0.1.1 +* GitHub: https://github.com/tidymodels/applicable +* Source code: https://github.com/cran/applicable +* Date/Publication: 2024-04-25 00:00:04 UTC +* Number of recursive dependencies: 116 -Run `revdepcheck::cloud_details(, "ANOPA")` for more info +Run `revdepcheck::cloud_details(, "applicable")` for more info
## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘ANOPA-Ex.R’ failed - The error most likely occurred in: - - > ### Name: ArringtonEtAl2002 - > ### Title: Arrington et al. (2002) dataset - > ### Aliases: ArringtonEtAl2002 - > ### Keywords: datasets - > - > ### ** Examples - > - ... - Africa Nocturnal Omnivore 0 0 - North America Nocturnal Detritivore 0 0 - Warning: ANOPA::warning(1): Some cells have zero over zero data. Imputing... - > - > # make a plot with all the factors - > anopaPlot(w) - Error in superb::superbPlot(wdata, BSFactors = bsfact, WSFactors = wsfact, : - superb::ERROR: The function superbPlot.line is not a known function for making plots with superbPlot. Exiting... - Calls: anopaPlot -> - Execution halted - ``` - * checking tests ... ERROR ``` + Running ‘spelling.R’ Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > test_check("ANOPA") - Loading required package: ANOPA - ------------------------------------------------------------ - Design is: 2 x ( 3 ) with 2 independent groups. - ------------------------------------------------------------ - 1.Between-Subject Factors ( 2 groups ) : - ... - 1) "UA" else "none"), plotStyle = plotStyle, errorbarParams = errorbarParams, - ...)`: superb::ERROR: The function superbPlot.line is not a known function for making plots with superbPlot. Exiting... - Backtrace: - ▆ - 1. └─ANOPA::anopaPlot(w) at test-ANOPA-4.R:106:9 - 2. └─superb::superbPlot(...) + > library(applicable) + Loading required package: ggplot2 + + Attaching package: 'ggplot2' + + ... + `expected` is a character vector ('percentile') + ── Failure ('test-plot.R:36:3'): output of autoplot.apd_pca is correct when options=distance are provided ── + ad_plot$labels$y (`actual`) not equal to "percentile" (`expected`). - [ FAIL 2 | WARN 0 | SKIP 0 | PASS 131 ] + `actual` is NULL + `expected` is a character vector ('percentile') + + [ FAIL 3 | WARN 0 | SKIP 22 | PASS 90 ] Error: Test failures Execution halted ``` -* checking running R code from vignettes ... ERROR +# ARPALData + +
+ +* Version: 1.6.1 +* GitHub: NA +* Source code: https://github.com/cran/ARPALData +* Date/Publication: 2025-01-10 14:00:10 UTC +* Number of recursive dependencies: 140 + +Run `revdepcheck::cloud_details(, "ARPALData")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR ``` - Errors in running code in vignettes: - when running code in ‘A-WhatIsANOPA.Rmd’ - ... - > w <- anopa({ - + nSuccess - + nParticipants - + } ~ DistractingTask, ArticleExample1) - - > anopaPlot(w) + Running examples in ‘ARPALData-Ex.R’ failed + The error most likely occurred in: + > ### Name: is_ARPALdf + > ### Title: Check if a given object belongs to class 'ARPALdf' + > ### Aliases: is_ARPALdf + > + > ### ** Examples + > + > d <- get_ARPA_Lombardia_AQ_registry() ... - When sourcing ‘E-ArcsineIsAsinine.R’: - Error: superb::ERROR: The function superbPlot.line is not a known function for making plots with superbPlot. Exiting... - Execution halted + dbl (5): IDSensor, IDStation, Altitude, Latitude, Longitude + date (2): DateStart, DateStop - ‘A-WhatIsANOPA.Rmd’ using ‘UTF-8’... failed - ‘B-DataFormatsForProportions.Rmd’ using ‘UTF-8’... OK - ‘C-ConfidenceIntervals.Rmd’ using ‘UTF-8’... failed - ‘D-ArringtonExample.Rmd’ using ‘UTF-8’... failed - ‘E-ArcsineIsAsinine.Rmd’ using ‘UTF-8’... failed - ‘F-TestingTypeIError.Rmd’ using ‘UTF-8’... OK + ℹ Use `spec()` to retrieve the full column specification for this data. + ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message. + > is_ARPALdf(d) + Error in is.element("ARPALdf", attr(Data, "class")) : + unused argument (attr(Data, "class")) + Calls: is_ARPALdf + Execution halted ``` -* checking re-building of vignette outputs ... NOTE +* checking whether package ‘ARPALData’ can be installed ... WARNING ``` - Error(s) in re-building vignettes: - --- re-building ‘A-WhatIsANOPA.Rmd’ using rmarkdown - - Quitting from lines 182-183 [unnamed-chunk-5] (A-WhatIsANOPA.Rmd) - Error: processing vignette 'A-WhatIsANOPA.Rmd' failed with diagnostics: - superb::ERROR: The function superbPlot.line is not a known function for making plots with superbPlot. Exiting... - --- failed re-building ‘A-WhatIsANOPA.Rmd’ - - --- re-building ‘B-DataFormatsForProportions.Rmd’ using rmarkdown - --- finished re-building ‘B-DataFormatsForProportions.Rmd’ - ... - - --- re-building ‘F-TestingTypeIError.Rmd’ using rmarkdown - --- finished re-building ‘F-TestingTypeIError.Rmd’ - - SUMMARY: processing the following files failed: - ‘A-WhatIsANOPA.Rmd’ ‘C-ConfidenceIntervals.Rmd’ - ‘D-ArringtonExample.Rmd’ ‘E-ArcsineIsAsinine.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -# AntMAN - -
- -* Version: 1.1.0 -* GitHub: https://github.com/bbodin/AntMAN -* Source code: https://github.com/cran/AntMAN -* Date/Publication: 2021-07-23 10:00:02 UTC -* Number of recursive dependencies: 80 - -Run `revdepcheck::cloud_details(, "AntMAN")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘AntMAN-Ex.R’ failed - The error most likely occurred in: - - > ### Name: AM_mix_hyperparams_uninorm - > ### Title: univariate Normal mixture hyperparameters - > ### Aliases: AM_mix_hyperparams_uninorm - > - > ### ** Examples - > - > - ... - Press [enter] to continue - Plotting pmf for M,K - NULL - Press [enter] to continue - Plotting traces from M,K - Press [enter] to continue - Plotting values from M,K - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘UnitTest_AM_binder.R’ - Running ‘UnitTest_AM_coclustering.R’ - Running ‘UnitTest_AM_demo.R’ - Running ‘UnitTest_AM_extract.R’ - Running ‘UnitTest_AM_mcmc.R’ - Running the tests in ‘tests/UnitTest_AM_mcmc.R’ failed. - Complete output: - > ####################################################################################### - > ############### - > ############### AntMAN Package : Tests and Examples - ... - Press [enter] to continue - Plotting pmf for M,K - NULL - Press [enter] to continue - Plotting traces from M,K - Press [enter] to continue - Plotting values from M,K - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -## In both - -* checking C++ specification ... NOTE - ``` - Specified C++11: please drop specification unless essential - ``` - -* checking installed package size ... NOTE - ``` - installed size is 6.8Mb - sub-directories of 1Mb or more: - libs 6.4Mb + Found the following significant warnings: + Note: possible error in 'is.element("try-error", ': unused argument (attr(Meteo2, "class")) + Note: possible error in 'is.element("ARPALdf", ': unused argument (attr(Data, "class")) + Note: possible error in 'is.element("ARPALdf_AQ", ': unused argument (attr(Data, "class")) + Note: possible error in 'is.element("ARPALdf_AQ_mun", ': unused argument (attr(Data, "class")) + Note: possible error in 'is.element("ARPALdf_W", ': unused argument (attr(Data, "class")) + See ‘/tmp/workdir/ARPALData/new/ARPALData.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. ``` -* checking dependencies in R code ... NOTE +* checking R code for possible problems ... NOTE ``` - Namespaces in Imports field not imported from: - ‘Rdpack’ ‘mcclust’ - All declared Imports should be used. + get_ARPA_Lombardia_W_data: possible error in is.element("try-error", + attr(Meteo2, "class")): unused argument (attr(Meteo2, "class")) + is_ARPALdf: possible error in is.element("ARPALdf", attr(Data, + "class")): unused argument (attr(Data, "class")) + is_ARPALdf_AQ: possible error in is.element("ARPALdf_AQ", attr(Data, + "class")): unused argument (attr(Data, "class")) + is_ARPALdf_AQ_mun: possible error in is.element("ARPALdf_AQ_mun", + attr(Data, "class")): unused argument (attr(Data, "class")) + is_ARPALdf_W: possible error in is.element("ARPALdf_W", attr(Data, + "class")): unused argument (attr(Data, "class")) ``` -# APCI +# arulesViz
-* Version: 1.0.8 -* GitHub: NA -* Source code: https://github.com/cran/APCI -* Date/Publication: 2024-09-02 20:20:06 UTC -* Number of recursive dependencies: 73 +* Version: 1.5.3 +* GitHub: https://github.com/mhahsler/arulesViz +* Source code: https://github.com/cran/arulesViz +* Date/Publication: 2024-04-26 09:20:02 UTC +* Number of recursive dependencies: 124 -Run `revdepcheck::cloud_details(, "APCI")` for more info +Run `revdepcheck::cloud_details(, "arulesViz")` for more info
## Newly broken -* checking tests ... ERROR +* checking whether package ‘arulesViz’ can be installed ... WARNING ``` - Running ‘1_tests.R’ - Running the tests in ‘tests/1_tests.R’ failed. - Complete output: - > # install the package and use this script to test the package - > library("APCI") - > # or: remotes::install_github("jiahui1902/APCI") - > test_data <- APCI::women9017 - > test_data$acc <- as.factor(test_data$acc) - > test_data$pcc <- as.factor(test_data$pcc) - > test_data$educc <- as.factor(test_data$educc) - ... - -0.335818939 0.165402344 0.138957101 -0.357703237 0.229441985 - acc8:pcc3 acc9:pcc3 acc1:pcc4 acc2:pcc4 acc3:pcc4 - -0.147848556 0.146360984 -0.436635793 0.062363971 0.289676120 - acc4:pcc4 acc5:pcc4 acc6:pcc4 acc7:pcc4 acc8:pcc4 - 0.266502847 0.199035811 -0.082410026 -0.140171983 -0.274808726 - acc9:pcc4 acc1:pcc5 acc2:pcc5 acc3:pcc5 acc4:pcc5 - 0.070541348 0.052280642 0.320968547 -0.136111903 -0.102002632 - acc5:pcc5 acc6:pcc5 acc7:pcc5 acc8:pcc5 acc9:pcc5 - -0.553458810 -0.333938836 0.340338956 0.670285259 -0.300340437 - Killed + Found the following significant warnings: + Warning: replacing previous import ‘arules::is.element’ by ‘ggplot2::is.element’ when loading ‘arulesViz’ + See ‘/tmp/workdir/arulesViz/new/arulesViz.Rcheck/00install.out’ for details. ``` -# aplot +# asremlPlus
-* Version: 0.2.3 -* GitHub: https://github.com/YuLab-SMU/aplot -* Source code: https://github.com/cran/aplot -* Date/Publication: 2024-06-17 09:50:01 UTC -* Number of recursive dependencies: 50 +* Version: 4.4.43 +* GitHub: https://github.com/briencj/asremlPlus +* Source code: https://github.com/cran/asremlPlus +* Date/Publication: 2024-12-10 08:30:01 UTC +* Number of recursive dependencies: 176 -Run `revdepcheck::cloud_details(, "aplot")` for more info +Run `revdepcheck::cloud_details(, "asremlPlus")` for more info
## Newly broken -* checking examples ... ERROR +* checking whether package ‘asremlPlus’ can be installed ... WARNING ``` - Running examples in ‘aplot-Ex.R’ failed - The error most likely occurred in: - - > ### Name: insert_left - > ### Title: plot-insertion - > ### Aliases: insert_left insert_right insert_top insert_bottom - > - > ### ** Examples - > - > library(ggplot2) - ... - > ap - > ap[2, 1] <- ap[2, 1] + theme_bw() - > ap[2, 1] <- ap[2, 1] + - + aes(color = as.factor(am)) + - + scale_color_manual(values = c('steelblue', 'darkgreen')) - > ap[1, 1] <- ap[1, 1] + theme(axis.line.x.bottom=element_line()) - > ap - Error in identicalUnits(x) : object is not a unit - Calls: ... assemble_guides -> guides_build -> unit.c -> identicalUnits - Execution halted + Found the following significant warnings: + Note: possible error in 'is.element(fixed.labels[[1]], ': unused argument (fixed.labels[[i]]) + Note: possible error in 'is.element(sparse.labels[[1]], ': unused argument (sparse.labels[[i]]) + See ‘/tmp/workdir/asremlPlus/new/asremlPlus.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. ``` -# applicable - -
- -* Version: 0.1.1 -* GitHub: https://github.com/tidymodels/applicable -* Source code: https://github.com/cran/applicable -* Date/Publication: 2024-04-25 00:00:04 UTC -* Number of recursive dependencies: 116 - -Run `revdepcheck::cloud_details(, "applicable")` for more info - -
- -## Newly broken - -* checking tests ... ERROR +* checking R code for possible problems ... NOTE ``` - Running ‘spelling.R’ - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(applicable) - Loading required package: ggplot2 - > - > test_check("applicable") - Loading required package: dplyr - ... - `expected` is a character vector ('percentile') - ── Failure ('test-plot.R:36:3'): output of autoplot.apd_pca is correct when options=distance are provided ── - ad_plot$labels$y (`actual`) not equal to "percentile" (`expected`). - - `actual` is NULL - `expected` is a character vector ('percentile') - - [ FAIL 3 | WARN 0 | SKIP 22 | PASS 90 ] - Error: Test failures - Execution halted + REMLRT.asreml: possible error in is.element(fixed.labels[[1]], + fixed.labels[[i]]): unused argument (fixed.labels[[i]]) + REMLRT.asreml: possible error in is.element(sparse.labels[[1]], + sparse.labels[[i]]): unused argument (sparse.labels[[i]]) + bootREMLRT.asreml: possible error in is.element(fixed.labels[[1]], + fixed.labels[[i]]): unused argument (fixed.labels[[i]]) + bootREMLRT.asreml: possible error in is.element(sparse.labels[[1]], + sparse.labels[[i]]): unused argument (sparse.labels[[i]]) ``` -# ASRgenomics - -
- -* Version: 1.1.4 -* GitHub: NA -* Source code: https://github.com/cran/ASRgenomics -* Date/Publication: 2024-01-29 21:20:02 UTC -* Number of recursive dependencies: 136 - -Run `revdepcheck::cloud_details(, "ASRgenomics")` for more info - -
- -## Newly broken +## In both * checking examples ... ERROR ``` - Running examples in ‘ASRgenomics-Ex.R’ failed + Running examples in ‘asremlPlus-Ex.R’ failed The error most likely occurred in: - > ### Name: kinship.pca - > ### Title: Performs a Principal Component Analysis (PCA) based on a kinship - > ### matrix K - > ### Aliases: kinship.pca + > ### Name: LSD.frame + > ### Title: Description of an LSD frame + > ### Aliases: LSD.frame + > ### Keywords: asreml htest > > ### ** Examples > ... - 13. │ └─ggplot2:::`+.gg`(...) - 14. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 15. │ ├─ggplot2::ggplot_add(object, p, objectname) - 16. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 17. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 18. └─base::.handleSimpleError(...) - 19. └─purrr (local) h(simpleError(msg, call)) - 20. └─cli::cli_abort(...) - 21. └─rlang::abort(...) + + } + Warning in check_dep_version() : + ABI version mismatch: + lme4 was built with Matrix ABI version 1 + Current Matrix ABI version is 0 + Please re-install lme4 from source or restore original ‘Matrix’ package + Error in initializePtr() : + function 'cholmod_factor_ldetA' not provided by package 'Matrix' + Calls: ... initialize -> -> initializePtr -> .Call Execution halted ``` -* checking tests ... ERROR - ``` - Running ‘spelling.R’ - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > # This file is part of the standard setup for testthat. - > # It is recommended that you do not modify it. - > # - > # Where should you do additional test configuration? - > # Learn more about the roles of various files in: - > # * https://r-pkgs.org/tests.html - ... - 16. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 17. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 18. └─base::.handleSimpleError(...) - 19. └─purrr (local) h(simpleError(msg, call)) - 20. └─cli::cli_abort(...) - 21. └─rlang::abort(...) - - [ FAIL 2 | WARN 2 | SKIP 0 | PASS 249 ] - Error: Test failures - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE +* checking package dependencies ... NOTE ``` - installed size is 8.9Mb - sub-directories of 1Mb or more: - data 8.5Mb + Package which this enhances but not available for checking: ‘asreml’ ``` # autocogs @@ -1101,7 +947,7 @@ Run `revdepcheck::cloud_details(, "ASRgenomics")` for more info * GitHub: https://github.com/schloerke/autocogs * Source code: https://github.com/cran/autocogs * Date/Publication: 2021-05-29 17:00:05 UTC -* Number of recursive dependencies: 74 +* Number of recursive dependencies: 73 Run `revdepcheck::cloud_details(, "autocogs")` for more info @@ -1151,7 +997,7 @@ Run `revdepcheck::cloud_details(, "autocogs")` for more info * GitHub: https://github.com/terrytangyuan/autoplotly * Source code: https://github.com/cran/autoplotly * Date/Publication: 2021-04-18 06:50:11 UTC -* Number of recursive dependencies: 88 +* Number of recursive dependencies: 87 Run `revdepcheck::cloud_details(, "autoplotly")` for more info @@ -1171,11 +1017,16 @@ Run `revdepcheck::cloud_details(, "autoplotly")` for more info > > ### ** Examples > - > # Automatically generate interactive plot for results produced by `stats::prcomp` + ... > p <- autoplotly(prcomp(iris[c(1, 2, 3, 4)]), data = iris, + colour = 'Species', label = TRUE, label.size = 3, frame = TRUE) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: autoplotly ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + Warning: `aes_string()` was deprecated in ggplot2 3.0.0. + ℹ Please use tidy evaluation idioms with `aes()`. + ℹ See also `vignette("ggplot2-in-packages")` for more information. + ℹ The deprecated feature was likely used in the ggfortify package. + Please report the issue at . + Error in pm[[2]] : subscript out of bounds + Calls: autoplotly ... autoplotly.default -> ggplotly -> ggplotly.ggplot -> gg2list Execution halted ``` @@ -1188,110 +1039,88 @@ Run `revdepcheck::cloud_details(, "autoplotly")` for more info > library(autoplotly) > > test_check("autoplotly") - [ FAIL 3 | WARN 0 | SKIP 0 | PASS 1 ] + [ FAIL 3 | WARN 1 | SKIP 0 | PASS 1 ] ══ Failed tests ════════════════════════════════════════════════════════════════ ... - 5. └─ggfortify::ggbiplot(...) - 6. └─ggplot2:::`+.gg`(...) - 7. └─ggplot2:::add_ggplot(e1, e2, e2name) - 8. ├─ggplot2::ggplot_add(object, p, objectname) - 9. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 10. └─ggplot2:::new_layer_names(object, names(plot$layers)) + ▆ + 1. ├─autoplotly::autoplotly(...) at test_all.R:26:3 + 2. └─autoplotly:::autoplotly.default(...) + 3. ├─plotly::ggplotly(...) + 4. └─plotly:::ggplotly.ggplot(...) + 5. └─plotly::gg2list(...) - [ FAIL 3 | WARN 0 | SKIP 0 | PASS 1 ] + [ FAIL 3 | WARN 1 | SKIP 0 | PASS 1 ] Error: Test failures Execution halted ``` -# autoReg +# autoTS
-* Version: 0.3.3 -* GitHub: https://github.com/cardiomoon/autoReg -* Source code: https://github.com/cran/autoReg -* Date/Publication: 2023-11-14 05:53:27 UTC -* Number of recursive dependencies: 214 +* Version: 0.9.11 +* GitHub: https://github.com/vivienroussez/autots +* Source code: https://github.com/cran/autoTS +* Date/Publication: 2020-06-05 12:20:06 UTC +* Number of recursive dependencies: 119 -Run `revdepcheck::cloud_details(, "autoReg")` for more info +Run `revdepcheck::cloud_details(, "autoTS")` for more info
## Newly broken -* checking examples ... ERROR +* checking re-building of vignette outputs ... NOTE ``` - Running examples in ‘autoReg-Ex.R’ failed - The error most likely occurred in: - - > ### Name: adjustedPlot.survreg - > ### Title: Draw predicted survival curve with an object survreg - > ### Aliases: adjustedPlot.survreg - > - > ### ** Examples - > - > library(survival) - > x=survreg(Surv(time, status) ~ rx, data=anderson,dist="exponential") - > adjustedPlot(x) - > adjustedPlot(x,addCox=TRUE) - Warning: Removed 42 rows containing missing values or values outside the scale range - (`geom_line()`). - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted + Error(s) in re-building vignettes: + --- re-building ‘autoTS_vignette.Rmd’ using rmarkdown ``` +## In both + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘Automatic_Regression_Modeling.Rmd’ + when running code in ‘autoTS_vignette.Rmd’ ... - Species setosa (N=50) Mean ± SD 5.0 ± 0.4 - versicolor (N=50) Mean ± SD 5.9 ± 0.5 1.46 (1.24 to 1.68, p<.001) 1.44 (1.16 to 1.71, p<.001) 1.47 (1.23 to 1.70, p<.001) - virginica (N=50) Mean ± SD 6.6 ± 0.6 1.95 (1.75 to 2.14, p<.001) 1.87 (1.62 to 2.11, p<.001) 1.97 (1.76 to 2.17, p<.001) - ———————————————————————————————————————————————————————————————————————————————————————————————————————————————————————————————————————————————————————— + Warning in unzip(zipfile = "../inst/extdata/namq_10_gdp.zip", exdir = tmp_dir) : + error 1 in extracting from zip file - > modelPlot(fit1, imputed = TRUE) + > dat <- read.csv(paste0(tmp_dir, "/namq_10_gdp_1_Data.csv")) + Warning in file(file, "rt") : + cannot open file '/tmp/RtmpJMEUNu/namq_10_gdp_1_Data.csv': No such file or directory - ... - - When sourcing ‘Survival.R’: - Error: argument is of length zero + When sourcing ‘autoTS_vignette.R’: + Error: cannot open the connection Execution halted - ‘Automatic_Regression_Modeling.Rmd’ using ‘UTF-8’... failed - ‘Bootstrap_Prediction.Rmd’ using ‘UTF-8’... OK - ‘Getting_started.Rmd’ using ‘UTF-8’... failed - ‘Statiastical_test_in_gaze.Rmd’ using ‘UTF-8’... OK - ‘Survival.Rmd’ using ‘UTF-8’... failed + ‘autoTS_vignette.Rmd’ using ‘UTF-8’... failed ``` -* checking re-building of vignette outputs ... NOTE +* checking dependencies in R code ... NOTE ``` - Error(s) in re-building vignettes: - --- re-building ‘Automatic_Regression_Modeling.Rmd’ using rmarkdown - - Quitting from lines 142-143 [unnamed-chunk-15] (Automatic_Regression_Modeling.Rmd) - Error: processing vignette 'Automatic_Regression_Modeling.Rmd' failed with diagnostics: - object is not a unit - --- failed re-building ‘Automatic_Regression_Modeling.Rmd’ - - --- re-building ‘Bootstrap_Prediction.Rmd’ using rmarkdown + Namespaces in Imports field not imported from: + ‘plotly’ ‘shinycssloaders’ + All declared Imports should be used. + ``` + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory ``` -# baggr +# backShift
-* Version: 0.7.8 -* GitHub: https://github.com/wwiecek/baggr -* Source code: https://github.com/cran/baggr -* Date/Publication: 2024-02-12 18:20:02 UTC -* Number of recursive dependencies: 104 +* Version: 0.1.4.3 +* GitHub: https://github.com/christinaheinze/backShift +* Source code: https://github.com/cran/backShift +* Date/Publication: 2020-05-06 11:30:03 UTC +* Number of recursive dependencies: 95 -Run `revdepcheck::cloud_details(, "baggr")` for more info +Run `revdepcheck::cloud_details(, "backShift")` for more info
@@ -1299,334 +1128,261 @@ Run `revdepcheck::cloud_details(, "baggr")` for more info * checking examples ... ERROR ``` - Running examples in ‘baggr-Ex.R’ failed + Running examples in ‘backShift-Ex.R’ failed The error most likely occurred in: - > ### Name: baggr_plot - > ### Title: Plotting method in baggr package - > ### Aliases: baggr_plot + > ### Name: metricsThreshold + > ### Title: Performance metrics for estimate of connectiviy matrix A. + > ### Aliases: metricsThreshold > > ### ** Examples > - > fit <- baggr(schools, pooling = "none") - Automatically chose Rubin model with aggregate data based on input data. - Setting prior for mean in each group using 10 times the max effect : - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(baggr) - Loading required package: Rcpp - This is baggr; see vignette('baggr') for tutorial, ?baggr for basic help. - For execution on a local, multicore CPU with excess RAM call: - options(mc.cores = parallel::detectCores()) - > + > # true A ... - 10. └─bayesplot::mcmc_areas(...) - 11. └─ggplot2:::`+.gg`(...) - 12. └─ggplot2:::add_ggplot(e1, e2, e2name) - 13. ├─ggplot2::ggplot_add(object, p, objectname) - 14. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 15. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 6 | WARN 0 | SKIP 6 | PASS 488 ] - Error: Test failures - Execution halted + > diag(A.est) <- 0 + > A.est[1,2] <- 0.76 + > A.est[2,3] <- -0.68 + > A.est[3,1] <- 0.83 + > + > # compute metrics with threshold 0.25 + > metricsThreshold(A, A.est, thres = 0.25) + Error in is.element(-1, errs$diff) : unused argument (errs$diff) + Calls: metricsThreshold -> unlist -> metrics + Execution halted ``` * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘baggr.Rmd’ + when running code in ‘exampleBackShift.Rmd’ ... - 2.5% 0.4303903 - mean 0.8619752 - 97.5% 0.9998572 + > plotGraphEdgeAttr(estimate = Ahat.structure, plotStabSelec = TRUE, + + labels = colnames(A), thres.point = thres.pe, edgeWeights = Ahat, + + t .... [TRUNCATED] - > plot(baggr_schools, order = FALSE) + > metricsThresholdedA <- metricsThreshold(A, Ahat, thres = thres.pe) - When sourcing ‘baggr.R’: - Error: argument is of length zero + When sourcing ‘exampleBackShift.R’: + Error: unused argument (errs$diff) Execution halted - ‘baggr.Rmd’ using ‘UTF-8’... failed - ‘baggr_binary.Rmd’ using ‘UTF-8’... OK + ‘exampleBackShift.Rmd’ using ‘UTF-8’... failed ``` -* checking re-building of vignette outputs ... NOTE +* checking whether package ‘backShift’ can be installed ... WARNING ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘baggr.Rmd’ using rmarkdown - - Quitting from lines 272-273 [unnamed-chunk-9] (baggr.Rmd) - Error: processing vignette 'baggr.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘baggr.Rmd’ - - --- re-building ‘baggr_binary.Rmd’ using rmarkdown - --- finished re-building ‘baggr_binary.Rmd’ - - SUMMARY: processing the following file failed: - ‘baggr.Rmd’ - - Error: Vignette re-building failed. - Execution halted + Found the following significant warnings: + Note: possible error in 'is.element(-1, errs$diff)': unused argument (errs$diff) + Note: possible error in 'is.element(1, errs$diff)': unused argument (errs$diff) + See ‘/tmp/workdir/backShift/new/backShift.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. ``` -## In both +* checking R code for possible problems ... NOTE + ``` + metrics: possible error in is.element(-1, errs$diff): unused argument + (errs$diff) + metrics: possible error in is.element(1, errs$diff): unused argument + (errs$diff) + ``` -* checking installed package size ... NOTE +* checking re-building of vignette outputs ... NOTE ``` - installed size is 196.3Mb - sub-directories of 1Mb or more: - libs 194.5Mb + Error(s) in re-building vignettes: + --- re-building ‘exampleBackShift.Rmd’ using rmarkdown ``` -* checking for GNU extensions in Makefiles ... NOTE +## In both + +* checking Rd cross-references ... NOTE ``` - GNU make is a SystemRequirements. + Packages unavailable to check Rd xrefs: ‘InvariantCausalPrediction’, ‘CompareCausalNetworks’ ``` -# banter +# bartMan
-* Version: 0.9.6 +* Version: 0.1.1 * GitHub: NA -* Source code: https://github.com/cran/banter -* Date/Publication: 2023-02-12 21:32:29 UTC -* Number of recursive dependencies: 95 +* Source code: https://github.com/cran/bartMan +* Date/Publication: 2024-07-24 12:10:02 UTC +* Number of recursive dependencies: 135 -Run `revdepcheck::cloud_details(, "banter")` for more info +Run `revdepcheck::cloud_details(, "bartMan")` for more info
## Newly broken -* checking examples ... ERROR +* checking whether package ‘bartMan’ can be installed ... ERROR ``` - Running examples in ‘banter-Ex.R’ failed - The error most likely occurred in: - - > ### Name: plotDetectorTrace - > ### Title: Plot BANTER Detector Traces - > ### Aliases: plotDetectorTrace - > - > ### ** Examples - > - > data(train.data) - ... - > bant.mdl <- addBanterDetector( - + bant.mdl, train.data$detectors, - + ntree = 50, sampsize = 1, num.cores = 1 - + ) - > - > plotDetectorTrace(bant.mdl) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: plotDetectorTrace ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted + Installation failed. + See ‘/tmp/workdir/bartMan/new/bartMan.Rcheck/00install.out’ for details. ``` -# bartMan +## Installation -
+### Devel -* Version: 0.1.1 -* GitHub: NA -* Source code: https://github.com/cran/bartMan -* Date/Publication: 2024-07-24 12:10:02 UTC -* Number of recursive dependencies: 135 +``` +* installing *source* package ‘bartMan’ ... +** package ‘bartMan’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +Error in eval(exprs[i], envir) : object 'justify_grobs' not found +Error: unable to load R code in package ‘bartMan’ +Execution halted +ERROR: lazy loading failed for package ‘bartMan’ +* removing ‘/tmp/workdir/bartMan/new/bartMan.Rcheck/bartMan’ -Run `revdepcheck::cloud_details(, "bartMan")` for more info -
+``` +### CRAN -## Newly broken +``` +* installing *source* package ‘bartMan’ ... +** package ‘bartMan’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** byte-compile and prepare package for lazy loading +** help +*** installing help indices +** building package indices +** testing if installed package can be loaded from temporary location +** testing if installed package can be loaded from final location +** testing if installed package keeps a record of temporary installation path +* DONE (bartMan) -* checking examples ... ERROR - ``` - Running examples in ‘bartMan-Ex.R’ failed - The error most likely occurred in: - - > ### Name: mdsBart - > ### Title: mdsBart - > ### Aliases: mdsBart - > - > ### ** Examples - > - > if (requireNamespace("dbarts", quietly = TRUE)) { - ... - | - |======================================================================| 100% - Extracting Observation Data... - - Getting proximites... - Getting MDS... - Performing procrustes... - Error in if (new_name %in% existing) { : argument is of length zero - Calls: mdsBart -> suppressMessages -> withCallingHandlers - Execution halted - ``` -# BasketballAnalyzeR +``` +# bayesAB
-* Version: 0.5.0 -* GitHub: https://github.com/sndmrc/BasketballAnalyzeR -* Source code: https://github.com/cran/BasketballAnalyzeR -* Date/Publication: 2020-06-26 09:00:11 UTC -* Number of recursive dependencies: 83 +* Version: 1.1.3 +* GitHub: https://github.com/FrankPortman/bayesAB +* Source code: https://github.com/cran/bayesAB +* Date/Publication: 2021-06-25 00:50:02 UTC +* Number of recursive dependencies: 73 -Run `revdepcheck::cloud_details(, "BasketballAnalyzeR")` for more info +Run `revdepcheck::cloud_details(, "bayesAB")` for more info
## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘BasketballAnalyzeR-Ex.R’ failed - The error most likely occurred in: - - > ### Name: scatterplot - > ### Title: Draws a scatter plot or a matrix of scatter plots - > ### Aliases: scatterplot - > - > ### ** Examples - > - > # Single scatter plot - ... - > X <- data.frame(AST=Pbox.sel$AST/Pbox.sel$MIN,TOV=Pbox.sel$TOV/Pbox.sel$MIN) - > X$PTSpm <- Pbox.sel$PTS/Pbox.sel$MIN - > mypal <- colorRampPalette(c("blue","yellow","red")) - > scatterplot(X, data.var=c("AST","TOV"), z.var="PTSpm", labels=1:nrow(X), palette=mypal) - > # Matrix of scatter plots - > data <- Pbox[1:50, c("PTS","P3M","P2M","OREB","Team")] - > scatterplot(data, data.var=1:4, z.var="Team") - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 6.9Mb - sub-directories of 1Mb or more: - data 6.5Mb - ``` - -* checking dependencies in R code ... NOTE +* checking tests ... ERROR ``` - Namespaces in Imports field not imported from: - ‘circlize’ ‘hexbin’ ‘scales’ ‘sna’ - All declared Imports should be used. + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(bayesAB) + > + > test_check("bayesAB") + [ FAIL 1 | WARN 4 | SKIP 0 | PASS 140 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-dists.R:34:3'): Success ────────────────────────────────────── + plotNormalInvGamma(3, 1, 1, 1)$labels$y not equal to "sig_sq". + target is NULL, current is character + + [ FAIL 1 | WARN 4 | SKIP 0 | PASS 140 ] + Error: Test failures + Execution halted ``` -# bayefdr +# bayesforecast
-* Version: 0.2.1 -* GitHub: https://github.com/VallejosGroup/bayefdr -* Source code: https://github.com/cran/bayefdr -* Date/Publication: 2022-10-26 19:35:06 UTC -* Number of recursive dependencies: 96 +* Version: 1.0.1 +* GitHub: NA +* Source code: https://github.com/cran/bayesforecast +* Date/Publication: 2021-06-17 10:00:02 UTC +* Number of recursive dependencies: 111 -Run `revdepcheck::cloud_details(, "bayefdr")` for more info +Run `revdepcheck::cloud_details(, "bayesforecast")` for more info
## Newly broken -* checking examples ... ERROR +* checking running R code from vignettes ... ERROR ``` - Running examples in ‘bayefdr-Ex.R’ failed - The error most likely occurred in: + Errors in running code in vignettes: + when running code in ‘ARIMA.Rmd’ + ... + ma -0.4547 0.0033 -0.6145 -0.2713 1008.0532 1.0008 + sar -0.2735 0.0023 -0.3902 -0.1508 1034.6555 0.9992 + sma -0.3322 0.0027 -0.4979 -0.2091 1022.9639 1.0007 + loglik -443.0979 0.0588 -446.7919 -440.8711 935.8408 0.9999 - > ### Name: traceplot - > ### Title: Trace, marginal density histogram, and autocorrelation plot of - > ### MCMC draws. - > ### Aliases: traceplot - > - > ### ** Examples - > - > x <- rnorm(1000) - > traceplot(x) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: traceplot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > mcmc_plot(object = sf1) + + ... + [1] "df [ ] ~ gamma ( shape = 2 ,rate = 0.1 )" + + > mcmc_plot(sf1) + + When sourcing ‘GARCH.R’: + Error: unused argument (code) Execution halted + + ‘ARIMA.Rmd’ using ‘UTF-8’... failed + ‘GARCH.Rmd’ using ‘UTF-8’... failed ``` -* checking tests ... ERROR +* checking whether package ‘bayesforecast’ can be installed ... WARNING ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(bayefdr) - > - > test_check("bayefdr") - [ FAIL 1 | WARN 1 | SKIP 0 | PASS 14 ] - - ══ Failed tests ════════════════════════════════════════════════════════════════ - ... - 8. └─base::Reduce(`+`, c(list(noGeomPlot), layers)) - 9. └─ggplot2:::`+.gg`(init, x[[i]]) - 10. └─ggplot2:::add_ggplot(e1, e2, e2name) - 11. ├─ggplot2::ggplot_add(object, p, objectname) - 12. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 13. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 1 | WARN 1 | SKIP 0 | PASS 14 ] - Error: Test failures - Execution halted + Found the following significant warnings: + Note: possible error in 'is.element(NA, code)': unused argument (code) + See ‘/tmp/workdir/bayesforecast/new/bayesforecast.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. ``` -# bayesAB - -
+* checking R code for possible problems ... NOTE + ``` + mcmc_plot.varstan: possible error in is.element(NA, code): unused + argument (code) + ``` -* Version: 1.1.3 -* GitHub: https://github.com/FrankPortman/bayesAB -* Source code: https://github.com/cran/bayesAB -* Date/Publication: 2021-06-25 00:50:02 UTC -* Number of recursive dependencies: 74 +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘ARIMA.Rmd’ using rmarkdown + ``` -Run `revdepcheck::cloud_details(, "bayesAB")` for more info +## In both -
+* checking installed package size ... NOTE + ``` + installed size is 163.5Mb + sub-directories of 1Mb or more: + libs 162.0Mb + ``` -## Newly broken +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘RcppParallel’ ‘StanHeaders’ ‘astsa’ + All declared Imports should be used. + ``` -* checking tests ... ERROR +* checking for GNU extensions in Makefiles ... NOTE ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(bayesAB) - > - > test_check("bayesAB") - [ FAIL 1 | WARN 4 | SKIP 0 | PASS 140 ] - - ══ Failed tests ════════════════════════════════════════════════════════════════ - ── Failure ('test-dists.R:34:3'): Success ────────────────────────────────────── - plotNormalInvGamma(3, 1, 1, 1)$labels$y not equal to "sig_sq". - target is NULL, current is character - - [ FAIL 1 | WARN 4 | SKIP 0 | PASS 140 ] - Error: Test failures - Execution halted + GNU make is a SystemRequirements. ``` # BayesGrowth @@ -1658,7 +1414,7 @@ Run `revdepcheck::cloud_details(, "BayesGrowth")` for more info When sourcing ‘MCMC-example.R’: Error: unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 14, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, FALSE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, - NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NUL + NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, Execution halted ‘MCMC-example.Rmd’ using ‘UTF-8’... failed @@ -1674,10 +1430,10 @@ Run `revdepcheck::cloud_details(, "BayesGrowth")` for more info * checking installed package size ... NOTE ``` - installed size is 84.8Mb + installed size is 82.3Mb sub-directories of 1Mb or more: data 1.5Mb - libs 82.6Mb + libs 80.1Mb ``` * checking for GNU extensions in Makefiles ... NOTE @@ -1685,84 +1441,133 @@ Run `revdepcheck::cloud_details(, "BayesGrowth")` for more info GNU make is a SystemRequirements. ``` -# BayesianReasoning +# BayesianMCPMod
-* Version: 0.4.2 -* GitHub: https://github.com/gorkang/BayesianReasoning -* Source code: https://github.com/cran/BayesianReasoning -* Date/Publication: 2023-11-14 11:33:20 UTC -* Number of recursive dependencies: 107 +* Version: 1.0.1 +* GitHub: https://github.com/Boehringer-Ingelheim/BayesianMCPMod +* Source code: https://github.com/cran/BayesianMCPMod +* Date/Publication: 2024-04-05 13:53:00 UTC +* Number of recursive dependencies: 115 -Run `revdepcheck::cloud_details(, "BayesianReasoning")` for more info +Run `revdepcheck::cloud_details(, "BayesianMCPMod")` for more info
## Newly broken +* checking examples ... ERROR + ``` + Running examples in ‘BayesianMCPMod-Ex.R’ failed + The error most likely occurred in: + + > ### Name: getBootstrapQuantiles + > ### Title: getBootstrapQuantiles + > ### Aliases: getBootstrapQuantiles + > + > ### ** Examples + > + > posterior_list <- list(Ctrl = RBesT::mixnorm(comp1 = c(w = 1, m = 0, s = 1), sigma = 2), + ... + + DG_4 = RBesT::mixnorm(comp1 = c(w = 1, m = 6.5, s = 1.1), sigma = 2)) + > models <- c("exponential", "linear") + > dose_levels <- c(0, 1, 2, 4, 8) + > fit <- getModelFits(models = models, + + posterior = posterior_list, + + dose_levels = dose_levels, + + simple = TRUE) + Error in is.element(modelNum, 1:4) : unused argument (1:4) + Calls: getModelFits -> lapply -> FUN -> -> fitMod.raw + Execution halted + ``` + * checking tests ... ERROR ``` + Running ‘spelling.R’ Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: - > library(testthat) - > library(BayesianReasoning) - > - > test_check("BayesianReasoning") - - Plot created in: ./FP_10_sens_100_screening_1667_diagnostic_44.png - + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/tests.html ... - `names(expected)` is absent - ── Failure ('test-PPV_heatmap.R:1097:3'): Plot with line overlay ─────────────── - vapply(p$result$layers, function(x) class(x$geom)[1], "") (`actual`) not identical to c("GeomTile", "GeomSegment", "GeomPoint", "GeomMarkRect") (`expected`). - - `names(actual)` is a character vector ('geom_tile', 'annotate', 'annotate...3', 'geom_mark_rect') - `names(expected)` is absent - - [ FAIL 8 | WARN 56 | SKIP 4 | PASS 115 ] - Error: Test failures + 10. │ └─testthat::source_file(path, env = env, chdir = chdir, wrap = wrap) + 11. │ ├─base::withCallingHandlers(...) + 12. │ └─base::eval(exprs, env) + 13. │ └─base::eval(exprs, env) + 14. │ └─DoseFinding::Mods(linear = NULL, doses = dose_levels) at tests/testthat/setup.R:106:1 + 15. │ └─DoseFinding:::fullMod(...) + 16. └─base::.handleSimpleError(...) + 17. └─testthat (local) h(simpleError(msg, call)) + 18. └─rlang::abort(...) Execution halted ``` * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘PPV_NPV.Rmd’ + when running code in ‘Simulation_Example.Rmd’ ... - ℹ Please consider using `annotate()` or provide this layer with data containing - a single row. - Warning in ggforce::geom_mark_rect(aes(label = paste0(translated_labels$label_PPV_NPV, : - All aesthetics have length 1, but the data has 10201 rows. - ℹ Please consider using `annotate()` or provide this layer with data containing - a single row. + > sigemax2 <- DoseFinding::guesst(d = c(2, 4), p = c(0.3, + + 0.8), model = "sigEmax") + + > mods <- DoseFinding::Mods(linear = NULL, emax = emax, + + exponential = exp, sigEmax = rbind(sigemax, sigemax2), doses = dose_levels, + + maxE .... [TRUNCATED] + + ... + > mods <- DoseFinding::Mods(linear = NULL, emax = emax_guesst, + + exponential = exp_guesst, doses = dose_levels, maxEff = -1, + + placEff = -12 .... [TRUNCATED] - When sourcing ‘PPV_NPV.R’: - Error: object is not coercible to a unit + When sourcing ‘analysis_normal.R’: + Error: unused argument (c("emax", "quadratic", "exponential")) Execution halted - ‘PPV_NPV.Rmd’ using ‘UTF-8’... failed - ‘introduction.Rmd’ using ‘UTF-8’... OK + ‘Simulation_Example.Rmd’ using ‘UTF-8’... failed + ‘analysis_normal.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘PPV_NPV.Rmd’ using rmarkdown + ... + --- re-building ‘Simulation_Example.Rmd’ using rmarkdown + + Quitting from lines 93-124 [unnamed-chunk-2] (Simulation_Example.Rmd) + Error: processing vignette 'Simulation_Example.Rmd' failed with diagnostics: + unused argument (c("emax", "quadratic", "exponential")) + --- failed re-building ‘Simulation_Example.Rmd’ + + --- re-building ‘analysis_normal.Rmd’ using rmarkdown + ... + Quitting from lines 130-148 [Pre-Specification of candidate models] (analysis_normal.Rmd) + Error: processing vignette 'analysis_normal.Rmd' failed with diagnostics: + unused argument (c("emax", "quadratic", "exponential")) + --- failed re-building ‘analysis_normal.Rmd’ + + SUMMARY: processing the following files failed: + ‘Simulation_Example.Rmd’ ‘analysis_normal.Rmd’ + + Error: Vignette re-building failed. + Execution halted ``` -# BayesMallows +# BayesianReasoning
-* Version: 2.2.2 -* GitHub: https://github.com/ocbe-uio/BayesMallows -* Source code: https://github.com/cran/BayesMallows -* Date/Publication: 2024-08-17 13:00:03 UTC -* Number of recursive dependencies: 82 +* Version: 0.4.2 +* GitHub: https://github.com/gorkang/BayesianReasoning +* Source code: https://github.com/cran/BayesianReasoning +* Date/Publication: 2023-11-14 11:33:20 UTC +* Number of recursive dependencies: 106 -Run `revdepcheck::cloud_details(, "BayesMallows")` for more info +Run `revdepcheck::cloud_details(, "BayesianReasoning")` for more info
@@ -1773,106 +1578,75 @@ Run `revdepcheck::cloud_details(, "BayesMallows")` for more info Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: - > # This file is part of the standard setup for testthat. - > # It is recommended that you do not modify it. - > # - > # Where should you do additional test configuration? - > # Learn more about the roles of various files in: - > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview - > # * https://testthat.r-lib.org/articles/special-files.html + > library(testthat) + > library(BayesianReasoning) + > + > test_check("BayesianReasoning") + + Attaching package: 'ggplot2' + ... - `expected` is a character vector ('interaction(chain, cluster)') - ── Failure ('test-assess_convergence.R:217:3'): assess_convergence.BayesMallowsMixtures works ── - p$labels$colour (`actual`) not equal to "cluster" (`expected`). + `names(expected)` is absent + ── Failure ('test-PPV_heatmap.R:1097:3'): Plot with line overlay ─────────────── + vapply(p$result$layers, function(x) class(x$geom)[1], "") (`actual`) not identical to c("GeomTile", "GeomSegment", "GeomPoint", "GeomMarkRect") (`expected`). - `actual` is NULL - `expected` is a character vector ('cluster') + `names(actual)` is a character vector ('geom_tile', 'annotate', 'annotate...3', 'geom_mark_rect') + `names(expected)` is absent - [ FAIL 10 | WARN 0 | SKIP 6 | PASS 435 ] + [ FAIL 8 | WARN 56 | SKIP 4 | PASS 115 ] Error: Test failures Execution halted ``` -## In both - -* checking installed package size ... NOTE - ``` - installed size is 23.7Mb - sub-directories of 1Mb or more: - doc 2.7Mb - libs 20.1Mb - ``` - -# bayesplay +# BayesMallows
-* Version: 0.9.3 -* GitHub: https://github.com/bayesplay/bayesplay -* Source code: https://github.com/cran/bayesplay -* Date/Publication: 2023-04-13 12:10:02 UTC -* Number of recursive dependencies: 84 +* Version: 2.2.3 +* GitHub: https://github.com/ocbe-uio/BayesMallows +* Source code: https://github.com/cran/BayesMallows +* Date/Publication: 2025-01-14 11:30:02 UTC +* Number of recursive dependencies: 81 -Run `revdepcheck::cloud_details(, "bayesplay")` for more info +Run `revdepcheck::cloud_details(, "BayesMallows")` for more info
## Newly broken -* checking examples ... ERROR +* checking tests ... ERROR ``` - Running examples in ‘bayesplay-Ex.R’ failed - The error most likely occurred in: - - > ### Name: visual_compare - > ### Title: Visually compare two models - > ### Aliases: visual_compare - > - > ### ** Examples - > - > # define two models + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html ... - > h1_mod <- prior(family = "normal", mean = 0, sd = 10) - > m0 <- extract_predictions(data_model * h0_mod) - > m1 <- extract_predictions(data_model * h1_mod) - > - > # visually compare the model - > visual_compare(m0, m1) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted + `expected` is a character vector ('interaction(chain, cluster)') + ── Failure ('test-assess_convergence.R:217:3'): assess_convergence.BayesMallowsMixtures works ── + p$labels$colour (`actual`) not equal to "cluster" (`expected`). + + `actual` is NULL + `expected` is a character vector ('cluster') + + [ FAIL 10 | WARN 0 | SKIP 10 | PASS 363 ] + Error: Test failures + Execution halted ``` -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘advanced.Rmd’ - ... - > plot(posterior1, add_prior = TRUE) + labs(title = "prior and posterior distribution", - + subtitle = "for a binomial likelihood and beta prior") - Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : - conversion failure on 'ϴ' in 'mbcsToSbcs': dot substituted for - Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : - conversion failure on 'ϴ' in 'mbcsToSbcs': dot substituted for - - ... - > visual_compare(d_model1, d_model2) - - When sourcing ‘plots.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘advanced.Rmd’ using ‘UTF-8’... failed - ‘basic.Rmd’ using ‘UTF-8’... OK - ‘default_ttests.Rmd’ using ‘UTF-8’... OK - ‘plots.Rmd’ using ‘UTF-8’... failed - ``` +## In both -* checking re-building of vignette outputs ... NOTE +* checking installed package size ... NOTE ``` - Error(s) in re-building vignettes: - --- re-building ‘advanced.Rmd’ using rmarkdown + installed size is 23.6Mb + sub-directories of 1Mb or more: + doc 2.7Mb + libs 20.0Mb ``` # bayesplot @@ -1883,7 +1657,7 @@ Run `revdepcheck::cloud_details(, "bayesplay")` for more info * GitHub: https://github.com/stan-dev/bayesplot * Source code: https://github.com/cran/bayesplot * Date/Publication: 2024-02-15 05:30:11 UTC -* Number of recursive dependencies: 126 +* Number of recursive dependencies: 128 Run `revdepcheck::cloud_details(, "bayesplot")` for more info @@ -1891,31 +1665,6 @@ Run `revdepcheck::cloud_details(, "bayesplot")` for more info ## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘bayesplot-Ex.R’ failed - The error most likely occurred in: - - > ### Name: MCMC-intervals - > ### Title: Plot interval estimates from MCMC draws - > ### Aliases: MCMC-intervals mcmc_intervals mcmc_areas mcmc_areas_ridges - > ### mcmc_intervals_data mcmc_areas_data mcmc_areas_ridges_data - > - > ### ** Examples - > - ... - - $Parameter - [1] "alpha" "sigma" "beta[1]" "beta[2]" "beta[3]" "beta[4]" - - > - > color_scheme_set("brightblue") - > mcmc_intervals(x) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: mcmc_intervals ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - * checking tests ... ERROR ``` Running ‘testthat.R’ @@ -1929,14 +1678,14 @@ Run `revdepcheck::cloud_details(, "bayesplot")` for more info * Does _not_ affect other ggplot2 plots * See ?bayesplot_theme_set for details on theme setting ... - 5. └─bayesplot::ppc_violin_grouped(y, yrep, group) - 6. └─ggplot2:::`+.gg`(...) - 7. └─ggplot2:::add_ggplot(e1, e2, e2name) - 8. ├─ggplot2::ggplot_add(object, p, objectname) - 9. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 10. └─ggplot2:::new_layer_names(object, names(plot$layers)) + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-mcmc-traces.R:55:3'): mcmc_trace options work ──────────────── + all(c("xmin", "xmax", "ymin", "ymax") %in% names(ll)) is not TRUE + + `actual`: FALSE + `expected`: TRUE - [ FAIL 6 | WARN 1 | SKIP 73 | PASS 994 ] + [ FAIL 1 | WARN 1 | SKIP 73 | PASS 1024 ] Error: Test failures Execution halted ``` @@ -1946,16 +1695,12 @@ Run `revdepcheck::cloud_details(, "bayesplot")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘plotting-mcmc-draws.Rmd’ + when running code in ‘visual-mcmc-diagnostics.Rmd’ ... + > schools_dat <- list(J = 8, y = c(28, 8, -3, 7, -1, + + 1, 18, 12), sigma = c(15, 10, 16, 11, 9, 11, 10, 18)) - > color_scheme_set("red") - - > mcmc_intervals(posterior, pars = c("cyl", "drat", - + "am", "sigma")) - - ... > fit_cp <- sampling(schools_mod_cp, data = schools_dat, + seed = 803214055, control = list(adapt_delta = 0.9)) @@ -1964,7 +1709,7 @@ Run `revdepcheck::cloud_details(, "bayesplot")` for more info Execution halted ‘graphical-ppcs.Rmd’ using ‘UTF-8’... OK - ‘plotting-mcmc-draws.Rmd’ using ‘UTF-8’... failed + ‘plotting-mcmc-draws.Rmd’ using ‘UTF-8’... OK ‘visual-mcmc-diagnostics.Rmd’ using ‘UTF-8’... failed ``` @@ -1976,83 +1721,15 @@ Run `revdepcheck::cloud_details(, "bayesplot")` for more info doc 3.8Mb ``` -# bayestestR - -
- -* Version: 0.14.0 -* GitHub: https://github.com/easystats/bayestestR -* Source code: https://github.com/cran/bayestestR -* Date/Publication: 2024-07-24 14:10:02 UTC -* Number of recursive dependencies: 209 - -Run `revdepcheck::cloud_details(, "bayestestR")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘bayestestR-Ex.R’ failed - The error most likely occurred in: - - > ### Name: bayesfactor_restricted - > ### Title: Bayes Factors (BF) for Order Restricted Models - > ### Aliases: bayesfactor_restricted bf_restricted - > ### bayesfactor_restricted.stanreg bayesfactor_restricted.brmsfit - > ### bayesfactor_restricted.blavaan bayesfactor_restricted.emmGrid - > ### as.logical.bayesfactor_restricted - > - ... - + ) - > - > - > (b <- bayesfactor_restricted(posterior, hypothesis = hyps, prior = prior)) - Bayes Factor (Order-Restriction) - - Hypothesis P(Prior) P(Posterior) BF - A > B & B > C 0.16 0.23 1.39 - A > B & A > C 0.36 0.59 1.61 - C > A 0.46 0.34 0.742 - ``` - -## In both - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(bayestestR) - > - > test_check("bayestestR") - Starting 2 test processes - [ FAIL 3 | WARN 2 | SKIP 74 | PASS 180 ] - - ... - 14. └─brms:::eval2(call, envir = args, enclos = envir) - 15. └─base::eval(expr, envir, ...) - 16. └─base::eval(expr, envir, ...) - 17. └─rstan (local) .fun(model_code = .x1) - 18. └─rstan:::cxxfunctionplus(...) - 19. └─base::sink(type = "output") - - [ FAIL 3 | WARN 2 | SKIP 74 | PASS 180 ] - Error: Test failures - Execution halted - ``` - # BCEA
-* Version: 2.4.6 +* Version: 2.4.7 * GitHub: https://github.com/n8thangreen/BCEA * Source code: https://github.com/cran/BCEA -* Date/Publication: 2024-02-16 15:00:08 UTC -* Number of recursive dependencies: 125 +* Date/Publication: 2025-01-14 12:30:08 UTC +* Number of recursive dependencies: 124 Run `revdepcheck::cloud_details(, "BCEA")` for more info @@ -2065,23 +1742,23 @@ Run `revdepcheck::cloud_details(, "BCEA")` for more info Running examples in ‘BCEA-Ex.R’ failed The error most likely occurred in: - > ### Name: ceac.plot.bcea - > ### Title: Cost-Effectiveness Acceptability Curve (CEAC) Plot - > ### Aliases: ceac.plot.bcea ceac.plot - > ### Keywords: hplot + > ### Name: bcea + > ### Title: Create Bayesian Cost-Effectiveness Analysis Object + > ### Aliases: bcea bcea.default bcea.rjags bcea.rstan bcea.bugs + > ### Keywords: manip > > ### ** Examples > ... - > he <- BCEA::bcea(eff, cost) - No reference selected. Defaulting to first intervention. - > ceac.plot(he) - > - > ceac.plot(he, graph = "base") - > ceac.plot(he, graph = "ggplot2") - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics + + # with each intervention + + Kmax=50000, # maximum value possible for the willingness + + # to pay threshold; implies that k is chosen + + # in a grid from the interval (0, Kmax) + + plot=TRUE # plots the results + + ) + Error in is.element("point", names(extra_args)) : + unused argument (names(extra_args)) + Calls: bcea -> bcea.default -> plot -> plot.bcea Execution halted ``` @@ -2092,20 +1769,20 @@ Run `revdepcheck::cloud_details(, "BCEA")` for more info Complete output: > library(testthat) > library(BCEA) - The BCEA version loaded is: 2.4.6 + Registered S3 method overwritten by 'BCEA': + method from + plot.evppi voi + The BCEA version loaded is: 2.4.7 - Attaching package: 'BCEA' - - The following object is masked from 'package:graphics': ... - 3. └─BCEA:::eib_plot_ggplot(he, graph_params, ...) - 4. └─ggplot2:::`+.gg`(...) - 5. └─ggplot2:::add_ggplot(e1, e2, e2name) - 6. ├─ggplot2::ggplot_add(object, p, objectname) - 7. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 8. └─ggplot2:::new_layer_names(object, names(plot$layers)) + 6. │ │ ├─withr::with_output_sink(path, withVisible(code)) + 7. │ │ │ └─base::force(code) + 8. │ │ └─base::withVisible(code) + 9. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 10. ├─base::summary(smoke_bcea) + 11. └─BCEA:::summary.bcea(smoke_bcea) - [ FAIL 1 | WARN 1 | SKIP 7 | PASS 159 ] + [ FAIL 3 | WARN 0 | SKIP 3 | PASS 89 ] Error: Test failures Execution halted ``` @@ -2113,90 +1790,66 @@ Run `revdepcheck::cloud_details(, "BCEA")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘CEriskav.Rmd’ + when running code in ‘bcea.Rmd’ ... + is.element - > CEriskav(bcea_smoke) <- r - > plot(bcea_smoke) + > library(purrr) - > plot(bcea_smoke, graph = "ggplot") + > plot(bcea_smoke) ... - ‘CEriskav.Rmd’ using ‘UTF-8’... failed + ‘CEriskav.Rmd’ using ‘UTF-8’... OK ‘bcea.Rmd’ using ‘UTF-8’... failed - ‘ceac.Rmd’ using ‘UTF-8’... failed + ‘ceac.Rmd’ using ‘UTF-8’... OK ‘ceef.Rmd’ using ‘UTF-8’... OK - ‘ceplane.Rmd’ using ‘UTF-8’... failed - ‘contour.Rmd’ using ‘UTF-8’... failed - ‘eib.Rmd’ using ‘UTF-8’... failed + ‘ceplane.Rmd’ using ‘UTF-8’... OK + ‘contour.Rmd’ using ‘UTF-8’... OK + ‘eib.Rmd’ using ‘UTF-8’... OK ‘paired_vs_multiple_comps.Rmd’ using ‘UTF-8’... OK ‘Set_bcea_parameters.Rmd’ using ‘UTF-8’... OK ``` -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘CEriskav.Rmd’ using rmarkdown - - Quitting from lines 41-46 [unnamed-chunk-3] (CEriskav.Rmd) - Error: processing vignette 'CEriskav.Rmd' failed with diagnostics: - invalid line type: must be length 2, 4, 6 or 8 - --- failed re-building ‘CEriskav.Rmd’ - - --- re-building ‘bcea.Rmd’ using rmarkdown - ``` - -# BDgraph - -
- -* Version: 2.73 -* GitHub: NA -* Source code: https://github.com/cran/BDgraph -* Date/Publication: 2024-08-23 13:20:02 UTC -* Number of recursive dependencies: 71 - -Run `revdepcheck::cloud_details(, "BDgraph")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR +* checking whether package ‘BCEA’ can be installed ... WARNING ``` - Errors in running code in vignettes: - when running code in ‘BDgraph-Examples.Rmd’ - ... - Sensitivity 1 0.714 0.714 - MCC 1 0.827 0.827 - - > plotroc(list(bdgraph.obj, bdgraph.mpl.obj), data.sim, - + cut = 200, labels = c("BDgraph", "BDgraph.mpl"), color = c("blue", - + "red")) - - When sourcing ‘BDgraph-Examples.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘BDgraph-Examples.Rmd’ using ‘UTF-8’... failed - ‘Introduction-BDgraph.Rmd’ using ‘UTF-8’... OK + Found the following significant warnings: + Note: possible error in 'is.element(wtp, he$k)': unused argument (he$k) + Note: possible error in 'is.element("point", names(extra_args))': unused argument (names(extra_args)) + Note: possible error in 'is.element("color", names(extra_args$point))': unused argument (names(extra_args$point)) + Note: possible error in 'is.element(names(Table), ': unused argument (paste0("U", c(he$ref, he$comp))) + See ‘/tmp/workdir/BCEA/new/BCEA.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + ib_plot_base: possible error in is.element(wtp, he$k): unused argument + (he$k) + ib_plot_ggplot: possible error in is.element(wtp, he$k): unused + argument (he$k) + plot.bcea: possible error in is.element("point", names(extra_args)): + unused argument (names(extra_args)) + plot.bcea: possible error in is.element("color", + names(extra_args$point)): unused argument (names(extra_args$point)) + sim_table.bcea: possible error in is.element(wtp, he$k): unused + argument (he$k) + summary.bcea: possible error in is.element(wtp, he$k): unused argument + (he$k) + summary.bcea: possible error in is.element(names(Table), paste0("U", + c(he$ref, he$comp))): unused argument (paste0("U", c(he$ref, + he$comp))) + summary.pairwise: possible error in is.element(wtp, he$k): unused + argument (he$k) ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘BDgraph-Examples.Rmd’ using rmarkdown - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 8.3Mb - sub-directories of 1Mb or more: - libs 6.8Mb + --- re-building ‘CEriskav.Rmd’ using rmarkdown ``` # BEAMR @@ -2207,7 +1860,7 @@ Run `revdepcheck::cloud_details(, "BDgraph")` for more info * GitHub: https://github.com/annaSeffernick/BEAMR * Source code: https://github.com/cran/BEAMR * Date/Publication: 2024-07-27 16:00:06 UTC -* Number of recursive dependencies: 148 +* Number of recursive dependencies: 152 Run `revdepcheck::cloud_details(, "BEAMR")` for more info @@ -2220,26 +1873,62 @@ Run `revdepcheck::cloud_details(, "BEAMR")` for more info Running examples in ‘BEAMR-Ex.R’ failed The error most likely occurred in: - > ### Name: gen_beam_plot_list - > ### Title: Generate BEAM Plot List - > ### Aliases: gen_beam_plot_list + > ### Name: check_beam_specs + > ### Title: Check that beam.specs satisfies all necessary conditions + > ### Aliases: check_beam_specs > > ### ** Examples > - > data(beam_stats) - ... - + beam.specs=beam_stats$beam.specs) - > plot.list <- gen_beam_plot_list(beam.result=beam_stats, beam.specs=plot.specs, - + beam.feat.pvals=test.feat.pvals, - + number.pairs=1, set.id="ENSG00000099810", - + feat.id=NULL, title.size=11, - + pair.order="omic", endpt.order=NULL) - Error in if (new_name %in% existing) { : argument is of length zero - Error in plot.temp$plot : $ operator is invalid for atomic vectors - Calls: gen_beam_plot_list + > data(beam_dat) + > data(beam_specs) + > test_specs <- check_beam_specs(beam_specs, names(beam_dat$mtx.data)) + Error in is.element(beam.specs[, "mtx"], mtx.names) : + unused argument (mtx.names) + Calls: check_beam_specs Execution halted ``` +* checking whether package ‘BEAMR’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(beam.specs[, ': unused argument (mtx.names) + Note: possible error in 'is.element("name", colnames(beam.specs))': unused argument (colnames(beam.specs)) + Note: possible error in 'is.element(cls, required.class)': unused argument (required.class) + Note: possible error in 'is.element(obj.cls, "list")': unused argument ("list") + Note: possible error in 'is.element(set.data$mtx.id, ': unused argument (specs.mtx) + Note: possible error in 'is.element(colnames(set.anns), ': unused argument ("set.id") + Note: possible error in 'is.element(c("set.id", ': unused argument (colnames(set.data)) + Note: possible error in 'is.element(set.index$mtx.id[i], ': unused argument (mtx.names) + Note: possible error in 'is.element(set.data$row.id[row.index], ': unused argument (row.ids) + See ‘/tmp/workdir/BEAMR/new/BEAMR.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + check_beam_specs: possible error in is.element(beam.specs[, "mtx"], + mtx.names): unused argument (mtx.names) + check_beam_specs: possible error in is.element("name", + colnames(beam.specs)): unused argument (colnames(beam.specs)) + check_list_class: possible error in is.element(cls, required.class): + unused argument (required.class) + check_list_class: possible error in is.element(obj.cls, "list"): unused + argument ("list") + compute_set_pvalues: possible error in is.element(set.data$mtx.id, + specs.mtx): unused argument (specs.mtx) + prep_beam_data: possible error in is.element(colnames(set.anns), + "set.id"): unused argument ("set.id") + prep_beam_data: possible error in is.element(c("set.id", "mtx.id", + "row.id"), colnames(set.data)): unused argument (colnames(set.data)) + prep_beam_data: possible error in is.element(set.index$mtx.id[i], + mtx.names): unused argument (mtx.names) + prep_beam_data: possible error in + is.element(set.data$row.id[row.index], row.ids): unused argument + (row.ids) + ``` + # beastt
@@ -2248,7 +1937,7 @@ Run `revdepcheck::cloud_details(, "BEAMR")` for more info * GitHub: https://github.com/GSK-Biostatistics/beastt * Source code: https://github.com/cran/beastt * Date/Publication: 2024-06-20 15:50:16 UTC -* Number of recursive dependencies: 100 +* Number of recursive dependencies: 99 Run `revdepcheck::cloud_details(, "beastt")` for more info @@ -2299,7 +1988,7 @@ Run `revdepcheck::cloud_details(, "beastt")` for more info ℹ Error occurred in the 1st layer. Caused by error in `use_defaults()`: ! unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, - NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, + NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, Execution halted ‘binary.Rmd’ using ‘UTF-8’... failed @@ -2312,17 +2001,17 @@ Run `revdepcheck::cloud_details(, "beastt")` for more info --- re-building ‘binary.Rmd’ using rmarkdown ``` -# BeeGUTS +# biclust
-* Version: 1.1.3 -* GitHub: https://github.com/bgoussen/BeeGUTS -* Source code: https://github.com/cran/BeeGUTS -* Date/Publication: 2023-09-18 15:40:02 UTC -* Number of recursive dependencies: 86 +* Version: 2.0.3.1 +* GitHub: NA +* Source code: https://github.com/cran/biclust +* Date/Publication: 2023-05-19 07:18:34 UTC +* Number of recursive dependencies: 41 -Run `revdepcheck::cloud_details(, "BeeGUTS")` for more info +Run `revdepcheck::cloud_details(, "biclust")` for more info
@@ -2330,207 +2019,85 @@ Run `revdepcheck::cloud_details(, "BeeGUTS")` for more info * checking examples ... ERROR ``` - Running examples in ‘BeeGUTS-Ex.R’ failed + Running examples in ‘biclust-Ex.R’ failed The error most likely occurred in: - > ### Name: traceplot - > ### Title: Plotting method for traces and densities for 'beeSurvFit' - > ### objects - > ### Aliases: traceplot traceplot.beeSurvFit + > ### Name: BCPlaid + > ### Title: The Plaid Model Bicluster algorithm + > ### Aliases: BCPlaid plaid 'plaid model' BCPlaid BCPlaid-class 'turner + > ### biclustering' biclust,matrix,BCPlaid-method + > ### Keywords: cluster classif models > > ### ** Examples > - > data(fitBetacyfluthrin_Chronic) - > traceplot(fitBetacyfluthrin_Chronic) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: traceplot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘Tutorial.Rmd’ - ... - Chain 1: Elapsed Time: 137.867 seconds (Warm-up) - Chain 1: 75.093 seconds (Sampling) - Chain 1: 212.96 seconds (Total) - Chain 1: - - > traceplot(fit) - - When sourcing ‘Tutorial.R’: - Error: argument is of length zero - Execution halted - - ‘Tutorial.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘Tutorial.Rmd’ using rmarkdown - - Quitting from lines 45-58 [example] (Tutorial.Rmd) - Error: processing vignette 'Tutorial.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘Tutorial.Rmd’ - - SUMMARY: processing the following file failed: - ‘Tutorial.Rmd’ - - Error: Vignette re-building failed. + > #Random matrix with embedded bicluster + > test <- matrix(rnorm(5000),100,50) + > test[11:20,11:20] <- rnorm(100,3,0.3) + > res<-biclust(test, method=BCPlaid()) + Error in is.element("a", model) : unused argument (model) + Calls: biclust -> biclust -> -> plaid -> fitLayer Execution halted ``` -## In both - -* checking installed package size ... NOTE - ``` - installed size is 78.9Mb - sub-directories of 1Mb or more: - data 4.0Mb - libs 74.3Mb - ``` - -* checking for GNU extensions in Makefiles ... NOTE +* checking whether package ‘biclust’ can be installed ... WARNING ``` - GNU make is a SystemRequirements. + Found the following significant warnings: + Note: possible error in 'is.element("a", model)': unused argument (model) + Note: possible error in 'is.element("b", model)': unused argument (model) + Note: possible error in 'is.element("c", model)': unused argument (model) + Note: possible error in 'is.element("a", fit.model)': unused argument (fit.model) + Note: possible error in 'is.element("b", fit.model)': unused argument (fit.model) + Note: possible error in 'is.element("c", fit.model)': unused argument (fit.model) + Note: possible error in 'is.element(cluster, c("r", ': unused argument (c("r", "b")) + Note: possible error in 'is.element(cluster, c("c", ': unused argument (c("c", "b")) + See ‘/tmp/workdir/biclust/new/biclust.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + fitLayer: possible error in is.element("a", model): unused argument + (model) + fitLayer: possible error in is.element("b", model): unused argument + (model) + fitLayer: possible error in is.element("c", model): unused argument + (model) + plaid: possible error in is.element("a", fit.model): unused argument + (fit.model) + plaid: possible error in is.element("b", fit.model): unused argument + (fit.model) + ... + updatePlaid: possible error in is.element(cluster, c("r", "b")): unused + argument (c("r", "b")) + updatePlaid: possible error in is.element(cluster, c("c", "b")): unused + argument (c("c", "b")) + updatePlaid: possible error in is.element("a", model): unused argument + (model) + updatePlaid: possible error in is.element("b", model): unused argument + (model) + updatePlaid: possible error in is.element("c", model): unused argument + (model) ``` -# besthr +# biclustermd
-* Version: 0.3.2 -* GitHub: NA -* Source code: https://github.com/cran/besthr -* Date/Publication: 2023-04-14 08:50:08 UTC -* Number of recursive dependencies: 67 +* Version: 0.2.3 +* GitHub: https://github.com/jreisner/biclustermd +* Source code: https://github.com/cran/biclustermd +* Date/Publication: 2021-06-17 15:10:06 UTC +* Number of recursive dependencies: 83 -Run `revdepcheck::cloud_details(, "besthr")` for more info +Run `revdepcheck::cloud_details(, "biclustermd")` for more info
## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘besthr-Ex.R’ failed - The error most likely occurred in: - - > ### Name: plot.hrest - > ### Title: plots the 'hrest' object - > ### Aliases: plot.hrest - > - > ### ** Examples - > - > - > d1 <- make_data() - > hr_est <- estimate(d1, score, group) - > plot(hr_est) - Picking joint bandwidth of 0.68 - Error in as.unit(value) : object is not coercible to a unit - Calls: ... assemble_guides -> guides_build -> [<- -> [<-.unit -> as.unit - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘basic-use.Rmd’ - ... - Confidence Intervals (0.025, 0.975) - 3.7475, 8.2525 - - 100 bootstrap resamples. - > plot(hr_est_1) - Picking joint bandwidth of 0.381 - - When sourcing ‘basic-use.R’: - Error: object is not coercible to a unit - Execution halted - - ‘basic-use.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘basic-use.Rmd’ using rmarkdown - - Quitting from lines 34-44 [unnamed-chunk-2] (basic-use.Rmd) - Error: processing vignette 'basic-use.Rmd' failed with diagnostics: - object is not coercible to a unit - --- failed re-building ‘basic-use.Rmd’ - - SUMMARY: processing the following file failed: - ‘basic-use.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -# betaclust - -
- -* Version: 1.0.3 -* GitHub: NA -* Source code: https://github.com/cran/betaclust -* Date/Publication: 2023-09-29 10:20:02 UTC -* Number of recursive dependencies: 76 - -Run `revdepcheck::cloud_details(, "betaclust")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘vignettes.Rmd’ - ... - + data = pca.methylation.data[, 2:5], patient_number = 1, plot_type = "ggplot") - - > plot(threshold_out, what = "kernel density", threshold = TRUE, - + data = pca.methylation.data[, 2:5], plot_type = "ggplot") - - > plot(threshold_out, what = "uncertainty") - - When sourcing ‘vignettes.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘vignettes.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘vignettes.Rmd’ using rmarkdown - ``` - -# biclustermd - -
- -* Version: 0.2.3 -* GitHub: https://github.com/jreisner/biclustermd -* Source code: https://github.com/cran/biclustermd -* Date/Publication: 2021-06-17 15:10:06 UTC -* Number of recursive dependencies: 84 - -Run `revdepcheck::cloud_details(, "biclustermd")` for more info - -
- -## Newly broken - -* checking tests ... ERROR +* checking tests ... ERROR ``` Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. @@ -2538,10 +2105,10 @@ Run `revdepcheck::cloud_details(, "biclustermd")` for more info > library(testthat) > library(biclustermd) Loading required package: ggplot2 - Loading required package: tidyr - Attaching package: 'tidyr' + Attaching package: 'ggplot2' + The following object is masked from 'package:base': ... ── Failure ('test-autoplot_biclustermd.R:6:3'): autoplot_biclustermd() correctly plots cluster lines ── ap$data[[3]]$xintercept[-1] not equal to cumsum(colSums(sbc$P)) + 0.5. @@ -2571,7 +2138,7 @@ Run `revdepcheck::cloud_details(, "biclustermd")` for more info * GitHub: https://github.com/biodosetools-team/biodosetools * Source code: https://github.com/cran/biodosetools * Date/Publication: 2022-11-16 16:00:02 UTC -* Number of recursive dependencies: 121 +* Number of recursive dependencies: 118 Run `revdepcheck::cloud_details(, "biodosetools")` for more info @@ -2604,144 +2171,6 @@ Run `revdepcheck::cloud_details(, "biodosetools")` for more info Execution halted ``` -# BioPred - -
- -* Version: 1.0.1 -* GitHub: NA -* Source code: https://github.com/cran/BioPred -* Date/Publication: 2024-06-06 16:50:09 UTC -* Number of recursive dependencies: 118 - -Run `revdepcheck::cloud_details(, "BioPred")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘Tutorial.Rmd’ - ... - - > tutorial_data$biogroup = ifelse(tutorial_data$x2 <= - + 0.5, "biomarker_positive", "biomarker_negative") - - > res = subgrp_perf_pred(yvar = "y.time", censorvar = "y.event", - + grpvar = "biogroup", grpname = c("biomarker_positive", "biomarker_negative"), .... [TRUNCATED] - - When sourcing ‘Tutorial.R’: - Error: argument is of length zero - Execution halted - - ‘Tutorial.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘Tutorial.Rmd’ using rmarkdown - ``` - -# BlandAltmanLeh - -
- -* Version: 0.3.1 -* GitHub: NA -* Source code: https://github.com/cran/BlandAltmanLeh -* Date/Publication: 2015-12-23 23:32:17 -* Number of recursive dependencies: 63 - -Run `revdepcheck::cloud_details(, "BlandAltmanLeh")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘Intro.Rmd’ - ... - > b <- 0.02 * a + 0.3 * rnorm(150) - - > library(ggExtra) - - > print(ggMarginal(bland.altman.plot(a, b, graph.sys = "ggplot2"), - + type = "histogram", size = 4)) - - When sourcing ‘Intro.R’: - Error: argument is of length zero - Execution halted - - ‘Intro.Rmd’... failed - ``` - -# bmggum - -
- -* Version: 0.1.0 -* GitHub: https://github.com/Naidantu/bmggum -* Source code: https://github.com/cran/bmggum -* Date/Publication: 2021-04-09 08:50:06 UTC -* Number of recursive dependencies: 85 - -Run `revdepcheck::cloud_details(, "bmggum")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘bmggum-Ex.R’ failed - The error most likely occurred in: - - > ### Name: bayesplot - > ### Title: bayesian convergence diagnosis plotting function - > ### Aliases: bayesplot - > - > ### ** Examples - > - > Data <- c(1,4,2,3) - ... - Chain 1: - Warning: There were 3 divergent transitions after warmup. See - https://mc-stan.org/misc/warnings.html#divergent-transitions-after-warmup - to find out why this is a problem and how to eliminate them. - Warning: Examine the pairs() plot to diagnose sampling problems - - > bayesplot(mod, 'alpha', 'density', inc_warmup=FALSE) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: bayesplot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 206.7Mb - sub-directories of 1Mb or more: - libs 206.1Mb - ``` - -* checking dependencies in R code ... NOTE - ``` - Namespaces in Imports field not imported from: - ‘RcppParallel’ ‘rstantools’ - All declared Imports should be used. - ``` - -* checking for GNU extensions in Makefiles ... NOTE - ``` - GNU make is a SystemRequirements. - ``` - # boxly
@@ -2750,7 +2179,7 @@ Run `revdepcheck::cloud_details(, "bmggum")` for more info * GitHub: https://github.com/Merck/boxly * Source code: https://github.com/cran/boxly * Date/Publication: 2023-10-24 02:40:02 UTC -* Number of recursive dependencies: 91 +* Number of recursive dependencies: 90 Run `revdepcheck::cloud_details(, "boxly")` for more info @@ -2783,17 +2212,17 @@ Run `revdepcheck::cloud_details(, "boxly")` for more info Execution halted ``` -# braidReports +# brolgar
-* Version: 0.5.4 -* GitHub: NA -* Source code: https://github.com/cran/braidReports -* Date/Publication: 2021-01-05 18:20:09 UTC -* Number of recursive dependencies: 30 +* Version: 1.0.1 +* GitHub: https://github.com/njtierney/brolgar +* Source code: https://github.com/cran/brolgar +* Date/Publication: 2024-05-10 14:50:34 UTC +* Number of recursive dependencies: 103 -Run `revdepcheck::cloud_details(, "braidReports")` for more info +Run `revdepcheck::cloud_details(, "brolgar")` for more info
@@ -2801,273 +2230,74 @@ Run `revdepcheck::cloud_details(, "braidReports")` for more info * checking examples ... ERROR ``` - Running examples in ‘braidReports-Ex.R’ failed + Running examples in ‘brolgar-Ex.R’ failed The error most likely occurred in: - > ### Name: makeBRAIDreport - > ### Title: Make a BRAID Report Page - > ### Aliases: makeBRAIDreport - > ### Keywords: hplot + > ### Name: facet_sample + > ### Title: Facet data into groups to facilitate exploration + > ### Aliases: facet_sample > > ### ** Examples > + > library(ggplot2) ... - 22. │ └─grid::convertUnit(short, "cm", valueOnly = TRUE) - 23. │ ├─grid:::upgradeUnit(x) - 24. │ └─grid:::upgradeUnit.default(x) - 25. │ └─base::stop("Not a unit object") - 26. └─base::.handleSimpleError(``, "Not a unit object", base::quote(upgradeUnit.default(x))) - 27. └─rlang (local) h(simpleError(msg, call)) - 28. └─handlers[[1L]](cnd) - 29. └─cli::cli_abort(...) - 30. └─rlang::abort(...) - Execution halted - ``` - -# BRcal - -
- -* Version: 0.0.4 -* GitHub: https://github.com/apguthrie/BRcal -* Source code: https://github.com/cran/BRcal -* Date/Publication: 2024-06-25 11:30:08 UTC -* Number of recursive dependencies: 116 - -Run `revdepcheck::cloud_details(, "BRcal")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘BRcal-Ex.R’ failed - The error most likely occurred in: - > ### Name: lineplot - > ### Title: Lineplot for LLO-adjusted Probability Predictions - > ### Aliases: lineplot - > - > ### ** Examples - > - > - ... - > # Simulated 100 binary event outcomes using x - > y <- rbinom(100, 1, x) # By construction, x is well calibrated. - > - > # Lineplot show change in probabilities from original to MLE-recalibration to - > # specified Levels of Boldness-Recalibration via t_levels - > # Return a list with dataframe used to construct plot with return_df=TRUE - > lp1 <- lineplot(x, y, t_levels=c(0.98, 0.95), return_df=TRUE) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: lineplot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > ggplot(heights, + + aes(x = year, + + y = height_cm, + + group = country)) + + + geom_line() + + + facet_sample() + Error in if (params$as.table) { : argument is of length zero + Calls: ... -> setup -> -> compute_layout Execution halted ``` +## In both + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘hockey_vignette.Rmd’ + when running code in ‘exploratory-modelling.Rmd’ ... - [841] 0.4804441 0.7670617 0.4668403 0.4104682 0.6058493 0.4249086 0.6581869 - [848] 0.7194199 0.4534938 0.7421488 0.6726924 0.3255808 0.5005185 0.6483056 - [855] 0.7210362 0.6593455 0.4586214 0.7750603 0.5841900 0.4826292 0.4080026 - [862] 0.6701504 0.6561462 0.4814185 0.7421488 0.6786381 0.3255808 0.4814569 - - > lineplot(hockey$x, hockey$y) + Warning in is.na(non_null_default_aes[[aes_param_name]]) : + is.na() applied to non-(list or vector) of type 'language' - When sourcing ‘hockey_vignette.R’: + When sourcing ‘exploratory-modelling.R’: + Error: ℹ In index: 1. + ℹ With name: geom_line. + Caused by error in `aes_param_name %in% names(non_null_default_aes) && is.na(non_null_default_aes[[ + ... Error: argument is of length zero Execution halted - ‘hockey_vignette.Rmd’ using ‘UTF-8’... failed + ‘exploratory-modelling.Rmd’ using ‘UTF-8’... failed + ‘finding-features.Rmd’ using ‘UTF-8’... failed + ‘getting-started.Rmd’ using ‘UTF-8’... failed + ‘id-interesting-obs.Rmd’ using ‘UTF-8’... OK + ‘longitudinal-data-structures.Rmd’ using ‘UTF-8’... OK + ‘mixed-effects-models.Rmd’ using ‘UTF-8’... failed + ‘visualisation-gallery.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - ... - --- re-building ‘hockey_vignette.Rmd’ using rmarkdown - - Quitting from lines 180-181 [unnamed-chunk-11] (hockey_vignette.Rmd) - Error: processing vignette 'hockey_vignette.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘hockey_vignette.Rmd’ + --- re-building ‘exploratory-modelling.Rmd’ using rmarkdown - SUMMARY: processing the following file failed: - ‘hockey_vignette.Rmd’ + Quitting from lines 47-56 [use-gg-highlight] (exploratory-modelling.Rmd) + Error: processing vignette 'exploratory-modelling.Rmd' failed with diagnostics: + ℹ In index: 1. + ℹ With name: geom_line. + Caused by error in `aes_param_name %in% names(non_null_default_aes) && is.na(non_null_default_aes[[ + aes_param_name]])`: + ! 'length = 2' in coercion to 'logical(1)' + --- failed re-building ‘exploratory-modelling.Rmd’ - Error: Vignette re-building failed. - Execution halted + --- re-building ‘finding-features.Rmd’ using rmarkdown ``` -# breathtestcore - -
- -* Version: 0.8.7 -* GitHub: https://github.com/dmenne/breathtestcore -* Source code: https://github.com/cran/breathtestcore -* Date/Publication: 2024-01-24 15:02:47 UTC -* Number of recursive dependencies: 130 - -Run `revdepcheck::cloud_details(, "breathtestcore")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘test-all.R’ - Running the tests in ‘tests/test-all.R’ failed. - Complete output: - > library(testthat) - > - > options(Ncpus = parallelly::availableCores(omit = 1)) - > test_check("breathtestcore") - Loading required package: breathtestcore - Starting 1 test process - [ FAIL 3 | WARN 11 | SKIP 4 | PASS 356 ] - ... - `expected`: 10 - ── Failure ('test_plot_breathtestfit.R:81:3'): Plot multiple groups data only (no fit) ── - length(p) (`actual`) not equal to length(ggplot()) (`expected`). - - `actual`: 11 - `expected`: 10 - - [ FAIL 3 | WARN 11 | SKIP 4 | PASS 356 ] - Error: Test failures - Execution halted - ``` - -# brolgar - -
- -* Version: 1.0.1 -* GitHub: https://github.com/njtierney/brolgar -* Source code: https://github.com/cran/brolgar -* Date/Publication: 2024-05-10 14:50:34 UTC -* Number of recursive dependencies: 101 - -Run `revdepcheck::cloud_details(, "brolgar")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘brolgar-Ex.R’ failed - The error most likely occurred in: - - > ### Name: facet_sample - > ### Title: Facet data into groups to facilitate exploration - > ### Aliases: facet_sample - > - > ### ** Examples - > - > library(ggplot2) - > ggplot(heights, - + aes(x = year, - + y = height_cm, - + group = country)) + - + geom_line() + - + facet_sample() - Error in if (params$as.table) { : argument is of length zero - Calls: ... -> setup -> -> compute_layout - Execution halted - ``` - -## In both - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘exploratory-modelling.Rmd’ - ... - Warning in is.na(non_null_default_aes[[aes_param_name]]) : - is.na() applied to non-(list or vector) of type 'language' - - When sourcing ‘exploratory-modelling.R’: - Error: ℹ In index: 1. - ℹ With name: geom_line. - Caused by error in `aes_param_name %in% names(non_null_default_aes) && is.na(non_null_default_aes[[ - ... - Error: argument is of length zero - Execution halted - - ‘exploratory-modelling.Rmd’ using ‘UTF-8’... failed - ‘finding-features.Rmd’ using ‘UTF-8’... failed - ‘getting-started.Rmd’ using ‘UTF-8’... failed - ‘id-interesting-obs.Rmd’ using ‘UTF-8’... OK - ‘longitudinal-data-structures.Rmd’ using ‘UTF-8’... OK - ‘mixed-effects-models.Rmd’ using ‘UTF-8’... failed - ‘visualisation-gallery.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘exploratory-modelling.Rmd’ using rmarkdown - - Quitting from lines 47-56 [use-gg-highlight] (exploratory-modelling.Rmd) - Error: processing vignette 'exploratory-modelling.Rmd' failed with diagnostics: - ℹ In index: 1. - ℹ With name: geom_line. - Caused by error in `aes_param_name %in% names(non_null_default_aes) && is.na(non_null_default_aes[[ - aes_param_name]])`: - ! 'length = 2' in coercion to 'logical(1)' - --- failed re-building ‘exploratory-modelling.Rmd’ - - --- re-building ‘finding-features.Rmd’ using rmarkdown - ``` - -# calibrationband - -
- -* Version: 0.2.1 -* GitHub: https://github.com/marius-cp/calibrationband -* Source code: https://github.com/cran/calibrationband -* Date/Publication: 2022-08-09 14:40:02 UTC -* Number of recursive dependencies: 38 - -Run `revdepcheck::cloud_details(, "calibrationband")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘calibrationband-Ex.R’ failed - The error most likely occurred in: - - > ### Name: plot.calibrationband - > ### Title: Plotting monotone confidence bands - > ### Aliases: plot.calibrationband autoplot.calibrationband - > ### autolayer.calibrationband - > - > ### ** Examples - > - ... - > p <- function(x,s){p = 1/(1+((1/x*(1-x))^(s+1)));return(p)} - > dat <- data.frame(pr=x, y=rbinom(n,1,p(x,s))) - > - > cb <- calibration_bands(x=dat$pr, y=dat$y,alpha=0.05, method="round", digits =3) - > - > #simple plotting - > plot(cb) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot ... ggplot_add.list -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -# cartograflow +# cartograflow
@@ -3075,7 +2305,7 @@ Run `revdepcheck::cloud_details(, "calibrationband")` for more info * GitHub: https://github.com/fbahoken/cartogRaflow * Source code: https://github.com/cran/cartograflow * Date/Publication: 2023-10-17 22:40:21 UTC -* Number of recursive dependencies: 102 +* Number of recursive dependencies: 101 Run `revdepcheck::cloud_details(, "cartograflow")` for more info @@ -3108,72 +2338,6 @@ Run `revdepcheck::cloud_details(, "cartograflow")` for more info Execution halted ``` -# cases - -
- -* Version: 0.1.1 -* GitHub: https://github.com/maxwestphal/cases -* Source code: https://github.com/cran/cases -* Date/Publication: 2023-05-18 08:30:02 UTC -* Number of recursive dependencies: 129 - -Run `revdepcheck::cloud_details(, "cases")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘example_wdbc.Rmd’ - ... - 13 TRUE FALSE - 14 FALSE FALSE - 15 FALSE FALSE - - - > visualize(results_bm) - - ... - + regu = TRU .... [TRUNCATED] - - > visualize(results_comp) - - When sourcing ‘package_overview.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘example_wdbc.Rmd’ using ‘UTF-8’... failed - ‘package_overview.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘example_wdbc.Rmd’ using rmarkdown - data_wdbc package:cases R Documentation - - _B_r_e_a_s_t _C_a_n_c_e_r _W_i_s_c_o_n_s_i_n (_D_i_a_g_n_o_s_t_i_c) _D_a_t_a _S_e_t - - _D_e_s_c_r_i_p_t_i_o_n: - - Dataset documentation can be found at the source website and - references below. - ... - Quitting from lines 160-168 [viz_comp] (package_overview.Rmd) - Error: processing vignette 'package_overview.Rmd' failed with diagnostics: - invalid line type: must be length 2, 4, 6 or 8 - --- failed re-building ‘package_overview.Rmd’ - - SUMMARY: processing the following files failed: - ‘example_wdbc.Rmd’ ‘package_overview.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - # cats
@@ -3224,71 +2388,17 @@ Run `revdepcheck::cloud_details(, "cats")` for more info All declared Imports should be used. ``` -# ceterisParibus - -
- -* Version: 0.4.2 -* GitHub: https://github.com/pbiecek/ceterisParibus -* Source code: https://github.com/cran/ceterisParibus -* Date/Publication: 2020-03-28 03:10:02 UTC -* Number of recursive dependencies: 80 - -Run `revdepcheck::cloud_details(, "ceterisParibus")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(ceterisParibus) - Loading required package: ggplot2 - Loading required package: gower - > - > test_check("ceterisParibus") - Welcome to DALEX (version: 2.4.3). - ... - 5. └─ceterisParibus:::plot_interactive.what_if_explainer(wi_rf_all) - 6. └─ggplot2:::`+.gg`(...) - 7. └─ggplot2:::add_ggplot(e1, e2, e2name) - 8. ├─ggplot2::ggplot_add(object, p, objectname) - 9. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 10. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 1 | WARN 3 | SKIP 0 | PASS 29 ] - Error: Test failures - Execution halted - ``` - -## In both - -* checking dependencies in R code ... NOTE - ``` - Namespace in Imports field not imported from: ‘knitr’ - All declared Imports should be used. - ``` - -* checking LazyData ... NOTE - ``` - 'LazyData' is specified without a 'data' directory - ``` - -# cfda +# CausalImpact
-* Version: 0.11.0 -* GitHub: https://github.com/modal-inria/cfda -* Source code: https://github.com/cran/cfda -* Date/Publication: 2023-10-07 15:50:05 UTC -* Number of recursive dependencies: 98 +* Version: 1.3.0 +* GitHub: NA +* Source code: https://github.com/cran/CausalImpact +* Date/Publication: 2022-11-09 08:40:40 UTC +* Number of recursive dependencies: 76 -Run `revdepcheck::cloud_details(, "cfda")` for more info +Run `revdepcheck::cloud_details(, "CausalImpact")` for more info
@@ -3296,108 +2406,344 @@ Run `revdepcheck::cloud_details(, "cfda")` for more info * checking examples ... ERROR ``` - Running examples in ‘cfda-Ex.R’ failed + Running examples in ‘CausalImpact-Ex.R’ failed The error most likely occurred in: - > ### Name: compute_duration - > ### Title: Compute duration of individuals - > ### Aliases: compute_duration + > ### Name: CausalImpact + > ### Title: Inferring causal impact using structural time-series models + > ### Aliases: CausalImpact > > ### ** Examples > - > # Simulate the Jukes-Cantor model of nucleotide replacement + > # Example 1 ... - > d_JK <- generate_Markov(n = 10, K = K, P = PJK, lambda = lambda_PJK, Tmax = 10) - > - > - > # compute duration of each individual - > duration <- compute_duration(d_JK) - > - > hist(duration) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: hist ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > y <- 1.2 * x1 + rnorm(52) + > y[41:52] <- y[41:52] + 10 + > data <- cbind(y, x1) + > pre.period <- c(1, 40) + > post.period <- c(41, 52) + > impact <- CausalImpact(data, pre.period, post.period) + Error in is.element(letter, c("B", "M", "K")) : + unused argument (c("B", "M", "K")) + Calls: CausalImpact ... InterpretSummaryTable -> IdentifyNumberAbbreviation Execution halted ``` * checking tests ... ERROR ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. + Running ‘CausalImpact_import_test.R’ + Running the tests in ‘tests/CausalImpact_import_test.R’ failed. Complete output: - > library(testthat) - > library(cfda) - Loading required package: fda - Loading required package: splines - Loading required package: fds - Loading required package: rainbow - Loading required package: MASS - ... - 7. └─cfda:::hist.njump(njump) - 8. └─ggplot2:::`+.gg`(...) - 9. └─ggplot2:::add_ggplot(e1, e2, e2name) - 10. ├─ggplot2::ggplot_add(object, p, objectname) - 11. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 12. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 2 | WARN 1 | SKIP 12 | PASS 351 ] - Error: Test failures + > # Copyright 2014-2022 Google Inc. All rights reserved. + > # + > # Licensed under the Apache License, Version 2.0 (the "License"); + > # you may not use this file except in compliance with the License. + > # You may obtain a copy of the License at + > # + > # http://www.apache.org/licenses/LICENSE-2.0 + ... + > y <- 1.2 * x1 + rnorm(100) + > y[71:100] <- y[71:100] + 10 + > data <- cbind(y, x1) + > + > # Test that a `CausalImpact` object is created when the package is not loaded. + > impact <- CausalImpact::CausalImpact(data, c(1, 70), c(71, 100)) + Error in is.element(letter, c("B", "M", "K")) : + unused argument (c("B", "M", "K")) + Calls: ... InterpretSummaryTable -> IdentifyNumberAbbreviation Execution halted ``` * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘cfda.Rmd’ + when running code in ‘CausalImpact.Rmd’ ... - > head(nJump) - 1 2 3 4 5 6 - 17 9 3 13 10 13 + > pre.period <- c(1, 70) - > hist(nJump) + > post.period <- c(71, 100) - When sourcing ‘cfda.R’: - Error: argument is of length zero + > impact <- CausalImpact(data, pre.period, post.period) + + When sourcing ‘CausalImpact.R’: + Error: unused argument (c("B", "M", "K")) Execution halted - ‘cfda.Rmd’ using ‘UTF-8’... failed + ‘CausalImpact.Rmd’ using ‘UTF-8’... failed + ``` + +* checking whether package ‘CausalImpact’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(letter, c("B", ': unused argument (c("B", "M", "K")) + See ‘/tmp/workdir/CausalImpact/new/CausalImpact.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + IdentifyNumberAbbreviation: possible error in is.element(letter, c("B", + "M", "K")): unused argument (c("B", "M", "K")) ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘cfda.Rmd’ using rmarkdown + --- re-building ‘CausalImpact.Rmd’ using rmarkdown ``` -# cheem +# celltrackR
-* Version: 0.4.0.0 -* GitHub: https://github.com/nspyrison/cheem -* Source code: https://github.com/cran/cheem -* Date/Publication: 2023-11-08 21:30:02 UTC -* Number of recursive dependencies: 153 +* Version: 1.2.1 +* GitHub: NA +* Source code: https://github.com/cran/celltrackR +* Date/Publication: 2024-08-26 12:20:02 UTC +* Number of recursive dependencies: 94 -Run `revdepcheck::cloud_details(, "cheem")` for more info +Run `revdepcheck::cloud_details(, "celltrackR")` for more info
## Newly broken -* checking tests ... ERROR +* checking re-building of vignette outputs ... NOTE ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(cheem) - -------------------------------------------------------- - cheem --- version 0.4.0.0 - Please share bugs, suggestions, and feature requests at: - https://github.com/nspyrison/cheem/issues/ - -------------------------------------------------------- - ... + Error(s) in re-building vignettes: + --- re-building ‘QC.Rmd’ using rmarkdown + ``` + +## In both + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘clustering.Rmd’ + ... + + squareDisplacement, maxDisplacement, outreachRatio), method = "MDS", + + labels = r .... [TRUNCATED] + + > trackFeatureMap(all.tracks, c(speed, meanTurningAngle, + + squareDisplacement, maxDisplacement, outreachRatio), method = "UMAP", + + labels = .... [TRUNCATED] + + ... + When sourcing ‘data-QC.R’: + Error: unused argument (names(TCells)) + Execution halted + + ‘QC.Rmd’ using ‘UTF-8’... OK + ‘ana-methods.Rmd’ using ‘UTF-8’... OK + ‘clustering.Rmd’ using ‘UTF-8’... failed + ‘data-QC.Rmd’ using ‘UTF-8’... failed + ‘reading-converting-data.Rmd’ using ‘UTF-8’... OK + ‘simulation.Rmd’ using ‘UTF-8’... OK + ``` + +* checking installed package size ... NOTE + ``` + installed size is 5.1Mb + sub-directories of 1Mb or more: + doc 3.6Mb + ``` + +# cellularautomata + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/cellularautomata +* Date/Publication: 2024-11-20 19:10:06 UTC +* Number of recursive dependencies: 72 + +Run `revdepcheck::cloud_details(, "cellularautomata")` for more info + +
+ +## Newly broken + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘basic-usage.Rmd’ + ... + + > plot(ca(45)) + + > plot(ca(195)) + + > plot(ca(30, ncols = 20, steps = 30), animate = TRUE) + + When sourcing ‘basic-usage.R’: + Error: argument "theme" is missing, with no default + Execution halted + + ‘basic-usage.Rmd’ using ‘UTF-8’... failed + ``` + +# CensMFM + +
+ +* Version: 3.1 +* GitHub: NA +* Source code: https://github.com/cran/CensMFM +* Date/Publication: 2024-05-14 07:33:36 UTC +* Number of recursive dependencies: 41 + +Run `revdepcheck::cloud_details(, "CensMFM")` for more info + +
+ +## Newly broken + +* checking whether package ‘CensMFM’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(NA, y)': unused argument (y) + See ‘/tmp/workdir/CensMFM/new/CensMFM.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + fit.EM.MSNC: possible error in is.element(NA, y): unused argument (y) + ``` + +# CFO + +
+ +* Version: 2.2.0 +* GitHub: NA +* Source code: https://github.com/cran/CFO +* Date/Publication: 2024-11-15 12:00:09 UTC +* Number of recursive dependencies: 34 + +Run `revdepcheck::cloud_details(, "CFO")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘CFO-Ex.R’ failed + The error most likely occurred in: + + > ### Name: CFO.oc + > ### Title: Generate operating characteristics of phase I trials single-drug + > ### trials in multiple simulations + > ### Aliases: CFO.oc + > + > ### ** Examples + > + ... + Percentage of patients allocated to the MTD: 0.340 + Percentage of selecting a dose above the MTD: 0.200 + Percentage of allocating patients at dose levels above the MTD: 0.240 + Percentage of the patients suffering DLT: 0.227 + Average trial duration: 17.9 + > plot(faCFOoc) + Error in is.element(strpattern, c("none", names(objectPlot))) : + unused argument (c("none", names(objectPlot))) + Calls: plot -> plot.cfo + Execution halted + ``` + +* checking whether package ‘CFO’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(strpattern, ': unused argument (c("none", names(objectPlot))) + See ‘/tmp/workdir/CFO/new/CFO.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + plot.cfo: possible error in is.element(strpattern, c("none", + names(objectPlot))): unused argument (c("none", names(objectPlot))) + ``` + +# changepoint.geo + +
+ +* Version: 1.0.2 +* GitHub: https://github.com/grundy95/changepoint.geo +* Source code: https://github.com/cran/changepoint.geo +* Date/Publication: 2023-09-23 22:50:09 UTC +* Number of recursive dependencies: 50 + +Run `revdepcheck::cloud_details(, "changepoint.geo")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(changepoint.geo) + Loading required package: changepoint + Loading required package: zoo + + Attaching package: 'zoo' + + ... + Angle Changepoints : 60 90 + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 152 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Error ('test-geomcp.R:74:2'): (code run outside of `test_that()`) ─────────── + Error in `is.element(NA, data[[d]])`: unused argument (data[[d]]) + + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 152 ] + Error: Test failures + Execution halted + ``` + +# cheem + +
+ +* Version: 0.4.0.0 +* GitHub: https://github.com/nspyrison/cheem +* Source code: https://github.com/cran/cheem +* Date/Publication: 2023-11-08 21:30:02 UTC +* Number of recursive dependencies: 151 + +Run `revdepcheck::cloud_details(, "cheem")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(cheem) + -------------------------------------------------------- + cheem --- version 0.4.0.0 + Please share bugs, suggestions, and feature requests at: + https://github.com/nspyrison/cheem/issues/ + -------------------------------------------------------- + ... 13. │ ├─utils::modifyList(x %||% list(), y %||% list(), ...) 14. │ │ └─base::stopifnot(is.list(x), is.list(val)) 15. │ └─x %||% list() @@ -3435,11 +2781,11 @@ Run `revdepcheck::cloud_details(, "cheem")` for more info
-* Version: 0.75 +* Version: 0.76 * GitHub: NA * Source code: https://github.com/cran/chillR -* Date/Publication: 2023-11-27 22:20:02 UTC -* Number of recursive dependencies: 138 +* Date/Publication: 2024-11-14 09:40:02 UTC +* Number of recursive dependencies: 137 Run `revdepcheck::cloud_details(, "chillR")` for more info @@ -3452,26 +2798,38 @@ Run `revdepcheck::cloud_details(, "chillR")` for more info Running examples in ‘chillR-Ex.R’ failed The error most likely occurred in: - > ### Name: plot_scenarios - > ### Title: Plot historic and future scenarios for climate-related metrics - > ### ('ggplot2' version) - > ### Aliases: plot_scenarios + > ### Name: interpolate_gaps_hourly + > ### Title: Interpolate gaps in hourly temperature records + > ### Aliases: interpolate_gaps_hourly + > ### Keywords: utility > > ### ** Examples > - ... - > - > # Plot the climate scenarios > - > plot_scenarios(climate_scenario_list, metric = 'Chill_Portions', - + add_historic = TRUE, size = 2, shape = 3, color = 'blue', - + outlier_shape = 12, historic_color = 'skyblue', - + group_by = c("Year", "Scenario")) - Error in identicalUnits(x) : object is not a unit - Calls: ... assemble_guides -> guides_build -> unit.c -> identicalUnits + > + > Winters_gaps<-make_JDay(Winters_hours_gaps[1:2000,]) + Error in is.element(c("Day", "Month", "Year"), colnames(dateframe)) : + unused argument (colnames(dateframe)) + Calls: make_JDay Execution halted ``` +* checking whether package ‘chillR’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(c("Day", "Month", ': unused argument (colnames(dateframe)) + See ‘/tmp/workdir/chillR/new/chillR.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + make_JDay: possible error in is.element(c("Day", "Month", "Year"), + colnames(dateframe)): unused argument (colnames(dateframe)) + ``` + # chronicle
@@ -3480,7 +2838,7 @@ Run `revdepcheck::cloud_details(, "chillR")` for more info * GitHub: NA * Source code: https://github.com/cran/chronicle * Date/Publication: 2021-06-25 05:00:02 UTC -* Number of recursive dependencies: 146 +* Number of recursive dependencies: 145 Run `revdepcheck::cloud_details(, "chronicle")` for more info @@ -3553,17 +2911,17 @@ Run `revdepcheck::cloud_details(, "chronicle")` for more info All declared Imports should be used. ``` -# CINNA +# cjoint
-* Version: 1.2.2 +* Version: 2.1.1 * GitHub: NA -* Source code: https://github.com/cran/CINNA -* Date/Publication: 2023-08-08 16:40:02 UTC -* Number of recursive dependencies: 140 +* Source code: https://github.com/cran/cjoint +* Date/Publication: 2023-08-22 07:50:07 UTC +* Number of recursive dependencies: 85 -Run `revdepcheck::cloud_details(, "CINNA")` for more info +Run `revdepcheck::cloud_details(, "cjoint")` for more info
@@ -3571,199 +2929,151 @@ Run `revdepcheck::cloud_details(, "CINNA")` for more info * checking examples ... ERROR ``` - Running examples in ‘CINNA-Ex.R’ failed + Running examples in ‘cjoint-Ex.R’ failed The error most likely occurred in: - > ### Name: pca_centralities - > ### Title: PCA Centrality Measures - > ### Aliases: pca_centralities + > ### Name: japan2014conjoint + > ### Title: Japan 2014 Conjoint Experiment Dataset from Horiuchi et. al. + > ### (2014) + > ### Aliases: japan2014conjoint + > ### Keywords: datasets > > ### ** Examples - > - > # Create a data frame with multiple observations ... - 13. │ └─e1 %+% e2 - 14. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 15. │ ├─ggplot2::ggplot_add(object, p, objectname) - 16. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 17. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 18. └─base::.handleSimpleError(...) - 19. └─purrr (local) h(simpleError(msg, call)) - 20. └─cli::cli_abort(...) - 21. └─rlang::abort(...) + > # Run AMCE estimator using all attributes and uniform design + > results <- amce(selected ~ `Consumption tax` + `Employment` + `Monetary and fiscal policy` + + + `Economic growth strategy` + `Nuclear power` + `TPP` + + + `Collective self-defense` + `Constitutional revision` + + + `National assembly seat reduction`, data=japan2014conjoint, cluster=TRUE, + + respondent.id="respondentIndex", weights="wgt", design="uniform") + Error in is.element(full_terms, orig_effects) : + unused argument (orig_effects) + Calls: amce Execution halted ``` -* checking running R code from vignettes ... ERROR +* checking tests ... ERROR ``` - Errors in running code in vignettes: - when running code in ‘CINNA.Rmd’ - ... - > calc_cent <- calculate_centralities(zachary, include = pr_cent[1:10]) - - > pca_centralities(calc_cent) - - When sourcing ‘CINNA.R’: - Error: ℹ In index: 1. - ℹ With name: contrib. - Caused by error in `if (new_name %in% existing) ...`: - ! argument is of length zero - Execution halted - - ‘CINNA.Rmd’ using ‘UTF-8’... failed + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(cjoint) + Loading required package: sandwich + Loading required package: lmtest + Loading required package: zoo + + Attaching package: 'zoo' + ... + 2. └─cjoint::amce(...) at test-main.r:16:3 + ── Error ('test-plot.R:3:1'): (code run outside of `test_that()`) ────────────── + Error in `is.element(full_terms, orig_effects)`: unused argument (orig_effects) + Backtrace: + ▆ + 1. └─cjoint::amce(...) at test-plot.R:3:1 + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted ``` -* checking re-building of vignette outputs ... NOTE +* checking whether package ‘cjoint’ can be installed ... WARNING ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘CINNA.Rmd’ using rmarkdown - - Quitting from lines 231-234 [unnamed-chunk-11] (CINNA.Rmd) - Error: processing vignette 'CINNA.Rmd' failed with diagnostics: - ℹ In index: 1. - ℹ With name: contrib. - Caused by error in `if (new_name %in% existing) ...`: - ! argument is of length zero - --- failed re-building ‘CINNA.Rmd’ - - SUMMARY: processing the following file failed: - ‘CINNA.Rmd’ - - Error: Vignette re-building failed. - Execution halted + Found the following significant warnings: + Note: possible error in 'is.element(full_terms, ': unused argument (orig_effects) + Note: possible error in 'is.element(unique_vars, ': unused argument (respondent_vars) + Note: possible error in 'is.element(y, respondent_vars)': unused argument (respondent_vars) + Note: possible error in 'is.element(all_prof, ': unused argument (all_run_vars) + Note: possible error in 'is.element(substrings, ': unused argument (y) + Note: possible error in 'is.element(all_depends, ': unused argument (profile_effects[i]) + Note: possible error in 'is.element(substrings_d, ': unused argument (substrings) + Note: possible error in 'is.element(all_depends, ': unused argument (resp_effects[i]) + Note: possible error in 'is.element(respondent_vars, ': unused argument (substrings) + ... + Note: possible error in 'is.element(facet.names, ': unused argument (amce_obj$respondent.varying) + Note: possible error in 'is.element(raw_attributes, ': unused argument (attr_remove) + Note: possible error in 'is.element(subs, names(amce_obj$estimates))': unused argument (names(amce_obj$estimates)) + Note: possible error in 'is.element(facet.name, ': unused argument (names(amce_obj$estimates)) + Note: possible error in 'is.element(all.vars, ': unused argument (this.var) + Note: possible error in 'is.element(subs, all_prof)': unused argument (all_prof) + See ‘/tmp/workdir/cjoint/new/cjoint.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + amce: possible error in is.element(full_terms, orig_effects): unused + argument (orig_effects) + amce: possible error in is.element(unique_vars, respondent_vars): + unused argument (respondent_vars) + amce : : possible error in is.element(y, respondent_vars): + unused argument (respondent_vars) + amce: possible error in is.element(all_prof, all_run_vars): unused + argument (all_run_vars) + amce : : possible error in is.element(substrings, y): unused + argument (y) + ... + plot.amce : : possible error in is.element(subs, + names(amce_obj$estimates)): unused argument + (names(amce_obj$estimates)) + plot.amce: possible error in is.element(facet.name, + names(amce_obj$estimates)): unused argument + (names(amce_obj$estimates)) + print.summary.amce: possible error in is.element(all.vars, this.var): + unused argument (this.var) + summary.amce : : possible error in is.element(subs, + all_prof): unused argument (all_prof) ``` ## In both -* checking dependencies in R code ... NOTE +* checking data for non-ASCII characters ... NOTE ``` - Namespaces in Imports field not imported from: - ‘circlize’ ‘utils’ - All declared Imports should be used. + Note: found 29 marked UTF-8 strings ``` -# circhelp +# clickstream
-* Version: 1.1 -* GitHub: https://github.com/achetverikov/circhelp -* Source code: https://github.com/cran/circhelp -* Date/Publication: 2024-07-04 17:10:02 UTC -* Number of recursive dependencies: 106 +* Version: 1.3.3 +* GitHub: NA +* Source code: https://github.com/cran/clickstream +* Date/Publication: 2023-09-27 14:50:02 UTC +* Number of recursive dependencies: 43 -Run `revdepcheck::cloud_details(, "circhelp")` for more info +Run `revdepcheck::cloud_details(, "clickstream")` for more info
## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘circhelp-Ex.R’ failed - The error most likely occurred in: - - > ### Name: remove_cardinal_biases - > ### Title: Remove cardinal biases - > ### Aliases: remove_cardinal_biases - > - > ### ** Examples - > - > - > # Data in orientation domain from Pascucci et al. (2019, PLOS Bio), - > # https://doi.org/10.5281/zenodo.2544946 - > - > ex_data <- Pascucci_et_al_2019_data[observer == 4, ] - > remove_cardinal_biases(ex_data$err, ex_data$orientation, plots = "show") - Error in as.unit(value) : object is not coercible to a unit - Calls: remove_cardinal_biases ... assemble_guides -> guides_build -> [<- -> [<-.unit -> as.unit - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘cardinal_biases.Rmd’ - ... - + 90)) + .... [TRUNCATED] - - > ex_subj_data <- data[observer == 4, ] - - > res <- remove_cardinal_biases(ex_subj_data$err, ex_subj_data$orientation, - + plots = "show") - - When sourcing ‘cardinal_biases.R’: - Error: object is not coercible to a unit - Execution halted - - ‘cardinal_biases.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE +* checking whether package ‘clickstream’ can be installed ... WARNING ``` - Error(s) in re-building vignettes: - --- re-building ‘cardinal_biases.Rmd’ using rmarkdown + Found the following significant warnings: + Warning: replacing previous import ‘arules::is.element’ by ‘ggplot2::is.element’ when loading ‘clickstream’ + See ‘/tmp/workdir/clickstream/new/clickstream.Rcheck/00install.out’ for details. ``` -# clifro +# clinDataReview
-* Version: 3.2-5 -* GitHub: https://github.com/ropensci/clifro -* Source code: https://github.com/cran/clifro -* Date/Publication: 2021-05-24 05:50:02 UTC -* Number of recursive dependencies: 84 +* Version: 1.6.1 +* GitHub: https://github.com/openanalytics/clinDataReview +* Source code: https://github.com/cran/clinDataReview +* Date/Publication: 2024-06-18 09:10:05 UTC +* Number of recursive dependencies: 120 -Run `revdepcheck::cloud_details(, "clifro")` for more info +Run `revdepcheck::cloud_details(, "clinDataReview")` for more info
## Newly broken -* checking tests ... ERROR - ``` - Running ‘spelling.R’ - Running ‘test-all.R’ - Running the tests in ‘tests/test-all.R’ failed. - Complete output: - > library(testthat) - > library(clifro) - > - > test_check("clifro") - [ FAIL 1 | WARN 1 | SKIP 4 | PASS 10 ] - - ... - • On CRAN (4): 'test-cf_find_station.R:4:3', 'test-cf_last_query.R:4:3', - 'test-cf_query.R:4:3', 'test-cf_station.R:4:3' - - ══ Failed tests ════════════════════════════════════════════════════════════════ - ── Failure ('test-windrose.R:15:3'): windrose ────────────────────────────────── - tt$labels inherits from `'NULL'` not `'character'`. - - [ FAIL 1 | WARN 1 | SKIP 4 | PASS 10 ] - Error: Test failures - Execution halted - ``` - -# clinDataReview - -
- -* Version: 1.6.1 -* GitHub: https://github.com/openanalytics/clinDataReview -* Source code: https://github.com/cran/clinDataReview -* Date/Publication: 2024-06-18 09:10:05 UTC -* Number of recursive dependencies: 121 - -Run `revdepcheck::cloud_details(, "clinDataReview")` for more info - -
- -## Newly broken - -* checking examples ... ERROR +* checking examples ... ERROR ``` Running examples in ‘clinDataReview-Ex.R’ failed The error most likely occurred in: @@ -3783,8 +3093,8 @@ Run `revdepcheck::cloud_details(, "clinDataReview")` for more info + aesLineVar = list(group = "USUBJID", color = "TRTP"), + labelVars = labelVars + ) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: scatterplotClinData ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + Error in pm[[2]] : subscript out of bounds + Calls: scatterplotClinData -> ggplotly -> ggplotly.ggplot -> gg2list Execution halted ``` @@ -3798,17 +3108,17 @@ Run `revdepcheck::cloud_details(, "clinDataReview")` for more info > > test_check("clinDataReview") adding: report.html (deflated 63%) - adding: report_dependencies169f5c7b66d/ (stored 0%) - adding: report_dependencies169f5c7b66d/file169f105f2e2e.html (deflated 8%) + adding: report_dependencies16a96c1c4532/ (stored 0%) + adding: report_dependencies16a96c1c4532/file16a9248230f.html (deflated 8%) ... - 11. ├─base::withCallingHandlers(...) - 12. └─ggplot2:::`+.gg`(gg, do.call(layerFunction, argsGeom)) - 13. └─ggplot2:::add_ggplot(e1, e2, e2name) - 14. ├─ggplot2::ggplot_add(object, p, objectname) - 15. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 16. └─ggplot2:::new_layer_names(object, names(plot$layers)) + Backtrace: + ▆ + 1. └─clinDataReview::scatterplotClinData(...) at test_scatterplotClinData.R:1001:3 + 2. ├─plotly::ggplotly(p = gg, width = width, height = height, tooltip = if (!is.null(hoverVars)) "text") + 3. └─plotly:::ggplotly.ggplot(...) + 4. └─plotly::gg2list(...) - [ FAIL 35 | WARN 0 | SKIP 31 | PASS 453 ] + [ FAIL 31 | WARN 0 | SKIP 31 | PASS 466 ] Error: Test failures Execution halted ``` @@ -3824,7 +3134,7 @@ Run `revdepcheck::cloud_details(, "clinDataReview")` for more info Quitting from lines 167-208 [timeProfiles] (clinDataReview-dataVisualization.Rmd) Error: processing vignette 'clinDataReview-dataVisualization.Rmd' failed with diagnostics: - argument is of length zero + subscript out of bounds ... --- failed re-building ‘clinDataReview-dataVisualization.Rmd’ @@ -3847,6 +3157,47 @@ Run `revdepcheck::cloud_details(, "clinDataReview")` for more info doc 4.3Mb ``` +# clinDR + +
+ +* Version: 2.4.1 +* GitHub: NA +* Source code: https://github.com/cran/clinDR +* Date/Publication: 2023-08-09 04:20:05 UTC +* Number of recursive dependencies: 88 + +Run `revdepcheck::cloud_details(, "clinDR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘clinDR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: "Extract.emaxsim" + > ### Title: Extract a simulation from the output of emaxsim + > ### Aliases: [.emaxsim + > ### Keywords: nonlinear + > + > ### ** Examples + > + ... + > meanlev<-emaxfun(doselev,pop) + > + > ###FixedMean is specialized constructor function for emaxsim + > gen.parm<-FixedMean(n,doselev,meanlev,sdy) + > + > D1 <- emaxsim(nsim=2,gen.parm,modType=3,nproc=1) + Error in is.element(x, c("emax", "quadratic", "exponential")) : + unused argument (c("emax", "quadratic", "exponential")) + Calls: emaxsim -> Mods -> fullMod -> modCount -> lapply -> FUN + Execution halted + ``` + # clinUtils
@@ -3855,7 +3206,7 @@ Run `revdepcheck::cloud_details(, "clinDataReview")` for more info * GitHub: https://github.com/openanalytics/clinUtils * Source code: https://github.com/cran/clinUtils * Date/Publication: 2024-05-17 14:50:06 UTC -* Number of recursive dependencies: 111 +* Number of recursive dependencies: 110 Run `revdepcheck::cloud_details(, "clinUtils")` for more info @@ -3918,74 +3269,40 @@ Run `revdepcheck::cloud_details(, "clinUtils")` for more info doc 6.5Mb ``` -# cloneRate +# CLONETv2
-* Version: 0.2.3 -* GitHub: https://github.com/bdj34/cloneRate -* Source code: https://github.com/cran/cloneRate -* Date/Publication: 2023-09-22 15:40:02 UTC -* Number of recursive dependencies: 121 +* Version: 2.2.1 +* GitHub: NA +* Source code: https://github.com/cran/CLONETv2 +* Date/Publication: 2021-10-13 20:40:14 UTC +* Number of recursive dependencies: 34 -Run `revdepcheck::cloud_details(, "cloneRate")` for more info +Run `revdepcheck::cloud_details(, "CLONETv2")` for more info
## Newly broken -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘cloneRate-dataAnalysis.Rmd’ - ... - - > fitColor <- colorPal[6] - - > ggplot(PD9478_long, aes(x = Age, y = VAF)) + theme_bw() + - + coord_cartesian(xlim = c(min(x), max(x)), ylim = c(-0.01, - + 0.52), expand .... [TRUNCATED] - - When sourcing ‘cloneRate-dataAnalysis.R’: - Error: `expand` must be a logical vector, not the number 0. - Execution halted - - ‘cloneRate-dataAnalysis.Rmd’ using ‘UTF-8’... failed - ‘cloneRate-simulate.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘cloneRate-dataAnalysis.Rmd’ using rmarkdown - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 47.4Mb - sub-directories of 1Mb or more: - doc 1.0Mb - libs 45.2Mb - ``` - -* checking for GNU extensions in Makefiles ... NOTE +* checking whether package ‘CLONETv2’ can be installed ... WARNING ``` - GNU make is a SystemRequirements. + Found the following significant warnings: + Warning: replacing previous import ‘arules::is.element’ by ‘ggplot2::is.element’ when loading ‘CLONETv2’ + See ‘/tmp/workdir/CLONETv2/new/CLONETv2.Rcheck/00install.out’ for details. ``` -# clustEff +# ClusROC
-* Version: 0.3.1 -* GitHub: NA -* Source code: https://github.com/cran/clustEff -* Date/Publication: 2024-01-23 08:52:55 UTC -* Number of recursive dependencies: 125 +* Version: 1.0.2 +* GitHub: https://github.com/toduckhanh/ClusROC +* Source code: https://github.com/cran/ClusROC +* Date/Publication: 2022-11-17 15:00:02 UTC +* Number of recursive dependencies: 113 -Run `revdepcheck::cloud_details(, "clustEff")` for more info +Run `revdepcheck::cloud_details(, "ClusROC")` for more info
@@ -3993,40 +3310,97 @@ Run `revdepcheck::cloud_details(, "clustEff")` for more info * checking examples ... ERROR ``` - Running examples in ‘clustEff-Ex.R’ failed + Running examples in ‘ClusROC-Ex.R’ failed The error most likely occurred in: - > ### Name: clustEff-package - > ### Title: Clusters of effects curves - > ### Aliases: clustEff-package - > ### Keywords: package + > ### Name: clus_lme + > ### Title: Linear Mixed-Effects Models for a continuous diagnostic test or + > ### a biomarker (or a classifier). + > ### Aliases: clus_lme > > ### ** Examples > ... - 13. │ └─ggplot2:::`+.gg`(p, do.call(geom_line, option)) - 14. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 15. │ ├─ggplot2::ggplot_add(object, p, objectname) - 16. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 17. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 18. └─base::.handleSimpleError(...) - 19. └─purrr (local) h(simpleError(msg, call)) - 20. └─cli::cli_abort(...) - 21. └─rlang::abort(...) + 3 1 -0.5174383 2 0.36460260 1 + 4 2 2.0831761 1 2.55955171 0 + 5 2 2.5393980 2 -0.57296509 1 + 6 2 -1.6553751 1 0.06360181 0 + > ## A model with two covariate + > out1 <- clus_lme(fixed_formula = Y ~ X1 + X2, name_class = "D", + + name_clust = "id_Clus", data = data_3class) + Error in is.element(name_test, names_vars) : unused argument (names_vars) + Calls: clus_lme -> check_fixed_formula Execution halted ``` -# ClustImpute +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ClusROC) + Loading required package: nlme + Loading required package: Rcpp + > library(rgl) + > + > options(rgl.useNULL = TRUE) + ... + without newdata ── + Error in `is.element(name_test, names_vars)`: unused argument (names_vars) + Backtrace: + ▆ + 1. └─ClusROC::clus_lme(...) at test-clus_vus.R:31:3 + 2. └─ClusROC:::check_fixed_formula(fixed_formula, call, names_vars) + + [ FAIL 31 | WARN 0 | SKIP 0 | PASS 12 ] + Error: Test failures + Execution halted + ``` + +* checking whether package ‘ClusROC’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(name_class, ': unused argument (names_vars) + Note: possible error in 'is.element(name_clust, ': unused argument (names_vars) + Note: possible error in 'is.element(name_clust, ': unused argument (c(name_test, names_covars, name_class)) + Note: possible error in 'is.element(name_test, ': unused argument (names_vars) + Note: possible error in 'is.element(names_covars, ': unused argument (names_vars) + Note: possible error in 'is.element(x, ok_method)': unused argument (ok_method) + See ‘/tmp/workdir/ClusROC/new/ClusROC.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + check_class: possible error in is.element(name_class, names_vars): + unused argument (names_vars) + check_clust: possible error in is.element(name_clust, names_vars): + unused argument (names_vars) + check_clust: possible error in is.element(name_clust, c(name_test, + names_covars, name_class)): unused argument (c(name_test, + names_covars, name_class)) + check_fixed_formula: possible error in is.element(name_test, + names_vars): unused argument (names_vars) + check_fixed_formula: possible error in is.element(names_covars, + names_vars): unused argument (names_vars) + get_method_opt_thres3 : : possible error in is.element(x, + ok_method): unused argument (ok_method) + ``` + +# clustcurv
-* Version: 0.2.4 -* GitHub: NA -* Source code: https://github.com/cran/ClustImpute -* Date/Publication: 2021-05-31 07:40:11 UTC -* Number of recursive dependencies: 121 +* Version: 2.0.2 +* GitHub: https://github.com/noramvillanueva/clustcurv +* Source code: https://github.com/cran/clustcurv +* Date/Publication: 2024-10-25 08:20:07 UTC +* Number of recursive dependencies: 109 -Run `revdepcheck::cloud_details(, "ClustImpute")` for more info +Run `revdepcheck::cloud_details(, "clustcurv")` for more info
@@ -4035,61 +3409,97 @@ Run `revdepcheck::cloud_details(, "ClustImpute")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘Example_on_simulated_data.Rmd’ + when running code in ‘clustcurv.Rmd’ ... - > dat4plot$true_clust_fct <- factor(true_clust) - - > p_base <- ggplot(dat4plot, aes(x = x, y = y, color = true_clust_fct)) + - + geom_point() + > autoplot(res, groups_by_colour = FALSE, interactive = TRUE) + Warning: `aes_string()` was deprecated in ggplot2 3.0.0. + ℹ Please use tidy evaluation idioms with `aes()`. + ℹ See also `vignette("ggplot2-in-packages")` for more information. + ℹ The deprecated feature was likely used in the ggfortify package. + Please report the issue at . - > ggExtra::ggMarginal(p_base, groupColour = TRUE, groupFill = TRUE) - - When sourcing ‘Example_on_simulated_data.R’: - Error: argument is of length zero + When sourcing ‘clustcurv.R’: + Error: subscript out of bounds Execution halted - ‘Example_on_simulated_data.Rmd’ using ‘UTF-8’... failed - ‘description_of_algorithm.Rnw’ using ‘UTF-8’... OK + ‘clustcurv.Rmd’ using ‘UTF-8’... failed ``` -## In both - * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘Example_on_simulated_data.Rmd’ using rmarkdown - - Quitting from lines 49-53 [unnamed-chunk-3] (Example_on_simulated_data.Rmd) - Error: processing vignette 'Example_on_simulated_data.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘Example_on_simulated_data.Rmd’ + ... + --- re-building ‘clustcurv.Rmd’ using rmarkdown - --- re-building ‘description_of_algorithm.Rnw’ using Sweave - Error: processing vignette 'description_of_algorithm.Rnw' failed with diagnostics: - ... - l.6 \usepackage - {Sweave}^^M - ! ==> Fatal error occurred, no output PDF file produced! - --- failed re-building ‘description_of_algorithm.Rnw’ + Quitting from lines 93-94 [unnamed-chunk-5] (clustcurv.Rmd) + Error: processing vignette 'clustcurv.Rmd' failed with diagnostics: + subscript out of bounds + --- failed re-building ‘clustcurv.Rmd’ - SUMMARY: processing the following files failed: - ‘Example_on_simulated_data.Rmd’ ‘description_of_algorithm.Rnw’ + SUMMARY: processing the following file failed: + ‘clustcurv.Rmd’ Error: Vignette re-building failed. Execution halted ``` -# cmstatr +# clustMD
-* Version: 0.9.3 -* GitHub: https://github.com/cmstatr/cmstatr -* Source code: https://github.com/cran/cmstatr -* Date/Publication: 2024-03-14 14:30:02 UTC -* Number of recursive dependencies: 87 +* Version: 1.2.1 +* GitHub: NA +* Source code: https://github.com/cran/clustMD +* Date/Publication: 2017-05-08 17:19:20 UTC +* Number of recursive dependencies: 42 + +Run `revdepcheck::cloud_details(, "clustMD")` for more info + +
+ +## Newly broken + +* checking whether package ‘clustMD’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(model, c("EII", ': unused argument (c("EII", "VII", "EEI", "VEI", "EVI", "VVI", "BD")) + Note: possible error in 'is.element(covModel, ': unused argument (resParallel$models) + Note: possible error in 'is.element(nClus, resParallel$G)': unused argument (resParallel$G) + See ‘/tmp/workdir/clustMD/new/clustMD.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + M.step: possible error in is.element(model, c("EII", "VII", "EEI", + "VEI", "EVI", "VVI", "BD")): unused argument (c("EII", "VII", "EEI", + "VEI", "EVI", "VVI", "BD")) + getOutput_clustMDparallel: possible error in is.element(covModel, + resParallel$models): unused argument (resParallel$models) + getOutput_clustMDparallel: possible error in is.element(nClus, + resParallel$G): unused argument (resParallel$G) + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) dtmvnom.Rd:30: Escaped LaTeX specials: \& + ``` + +# cnmap + +
-Run `revdepcheck::cloud_details(, "cmstatr")` for more info +* Version: 0.1.0 +* GitHub: https://github.com/PanfengZhang/cnmap +* Source code: https://github.com/cran/cnmap +* Date/Publication: 2024-04-02 12:42:06 UTC +* Number of recursive dependencies: 61 + +Run `revdepcheck::cloud_details(, "cnmap")` for more info
@@ -4097,84 +3507,59 @@ Run `revdepcheck::cloud_details(, "cmstatr")` for more info * checking examples ... ERROR ``` - Running examples in ‘cmstatr-Ex.R’ failed + Running examples in ‘cnmap-Ex.R’ failed The error most likely occurred in: - > ### Name: nested_data_plot - > ### Title: Create a plot of nested sources of variation - > ### Aliases: nested_data_plot + > ### Name: getMap + > ### Title: China Map Data from AutoNavi Map + > ### Aliases: getMap > > ### ** Examples > - > library(dplyr) - ... - - intersect, setdiff, setequal, union - - > carbon.fabric.2 %>% - + filter(test == "WT" & condition == "RTD") %>% - + nested_data_plot(strength, - + groups = c(batch, panel)) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: %>% ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > library(cnmap) + > + > map1 <- getMap(code = "110000") # get the map data of Beijing City + Error in process_cpl_read_ogr(x, quiet, check_ring_dir = check_ring_dir, : + package tibble not available: install first? + Calls: getMap ... st_read -> st_read.character -> process_cpl_read_ogr Execution halted ``` -* checking tests ... ERROR - ``` - Running ‘spelling.R’ - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(cmstatr) - > - > test_check("cmstatr") - Starting 2 test processes - [ FAIL 6 | WARN 0 | SKIP 6 | PASS 1396 ] - ... - 6. └─cmstatr:::draw_vert_lines_to_labels(g, elm_list, vline_args) - 7. └─ggplot2:::`+.gg`(...) - 8. └─ggplot2:::add_ggplot(e1, e2, e2name) - 9. ├─ggplot2::ggplot_add(object, p, objectname) - 10. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 11. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 6 | WARN 0 | SKIP 6 | PASS 1396 ] - Error: Test failures - Execution halted - ``` - * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘cmstatr_Graphing.Rmd’ + when running code in ‘Introduction.Rmd’ ... - + by = "condition") %>% inner_join(a_basis_pooled_results, - + by = "condition") .... [TRUNCATED] + > library(sf) + Linking to GEOS 3.12.1, GDAL 3.8.4, PROJ 9.4.0; sf_use_s2() is TRUE - > carbon.fabric.2 %>% mutate(panel = as.character(panel)) %>% - + filter(test == "WT") %>% nested_data_plot(strength, groups = c(batch, - + pane .... [TRUNCATED] + > library(cnmap) - When sourcing ‘cmstatr_Graphing.R’: - Error: argument is of length zero + > map1 <- getMap(name = "中国") + + When sourcing ‘Introduction.R’: + Error: package tibble not available: install first? Execution halted - ‘adktest.Rmd’ using ‘UTF-8’... OK - ‘cmstatr_Graphing.Rmd’ using ‘UTF-8’... failed - ‘cmstatr_Tutorial.Rmd’ using ‘UTF-8’... OK - ‘cmstatr_Validation.Rmd’ using ‘UTF-8’... OK - ‘hk_ext.Rmd’ using ‘UTF-8’... OK + ‘Introduction.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘adktest.Rmd’ using rmarkdown - --- finished re-building ‘adktest.Rmd’ + ... + --- re-building ‘Introduction.Rmd’ using rmarkdown + + Quitting from lines 29-35 [unnamed-chunk-3] (Introduction.Rmd) + Error: processing vignette 'Introduction.Rmd' failed with diagnostics: + package tibble not available: install first? + --- failed re-building ‘Introduction.Rmd’ + + SUMMARY: processing the following file failed: + ‘Introduction.Rmd’ - --- re-building ‘cmstatr_Graphing.Rmd’ using rmarkdown + Error: Vignette re-building failed. + Execution halted ``` # codaredistlm @@ -4185,7 +3570,7 @@ Run `revdepcheck::cloud_details(, "cmstatr")` for more info * GitHub: https://github.com/tystan/codaredistlm * Source code: https://github.com/cran/codaredistlm * Date/Publication: 2022-12-22 19:50:06 UTC -* Number of recursive dependencies: 67 +* Number of recursive dependencies: 66 Run `revdepcheck::cloud_details(, "codaredistlm")` for more info @@ -4218,45 +3603,27 @@ Run `revdepcheck::cloud_details(, "codaredistlm")` for more info --- ``` -# coefplot +# codez
-* Version: 1.2.8 +* Version: 1.0.0 * GitHub: NA -* Source code: https://github.com/cran/coefplot -* Date/Publication: 2022-01-14 09:42:47 UTC -* Number of recursive dependencies: 110 +* Source code: https://github.com/cran/codez +* Date/Publication: 2022-09-23 15:10:02 UTC +* Number of recursive dependencies: 136 -Run `revdepcheck::cloud_details(, "coefplot")` for more info +Run `revdepcheck::cloud_details(, "codez")` for more info
## Newly broken -* checking examples ... ERROR +* checking whether package ‘codez’ can be installed ... WARNING ``` - Running examples in ‘coefplot-Ex.R’ failed - The error most likely occurred in: - - > ### Name: buildModelCI - > ### Title: buildModelCI - > ### Aliases: buildModelCI - > - > ### ** Examples - > - > - ... - cut.C 327.4816 model1 - cut.Q -574.8626 model1 - cut.L 1187.6004 model1 - carat 7843.1229 model1 - (Intercept) -2732.2382 model1 - > coefplot(model1) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted + Found the following significant warnings: + Warning: replacing previous import ‘ggplot2::is.scale’ by ‘greybox::is.scale’ when loading ‘codez’ + See ‘/tmp/workdir/codez/new/codez.Rcheck/00install.out’ for details. ``` # CohortPlat @@ -4337,17 +3704,17 @@ Run `revdepcheck::cloud_details(, "CohortPlat")` for more info Execution halted ``` -# complmrob +# colorrepel
-* Version: 0.7.0 -* GitHub: https://github.com/dakep/complmrob -* Source code: https://github.com/cran/complmrob -* Date/Publication: 2019-09-17 18:10:02 UTC -* Number of recursive dependencies: 31 +* Version: 0.4.1 +* GitHub: https://github.com/raysinensis/color_repel +* Source code: https://github.com/cran/colorrepel +* Date/Publication: 2025-01-19 04:50:02 UTC +* Number of recursive dependencies: 89 -Run `revdepcheck::cloud_details(, "complmrob")` for more info +Run `revdepcheck::cloud_details(, "colorrepel")` for more info
@@ -4355,35 +3722,36 @@ Run `revdepcheck::cloud_details(, "complmrob")` for more info * checking examples ... ERROR ``` - Running examples in ‘complmrob-Ex.R’ failed + Running examples in ‘colorrepel-Ex.R’ failed The error most likely occurred in: - > ### Name: plot.complmrob - > ### Title: Diagnostic plots for the robust regression model with - > ### compositional covariates - > ### Aliases: plot.complmrob + > ### Name: ggplotly_background + > ### Title: Prepare ggplot object to ggplotly-compatible layer and image + > ### layer + > ### Aliases: ggplotly_background > > ### ** Examples > - > data <- data.frame(lifeExp = state.x77[, "Life Exp"], USArrests[ , -3]) - > mUSArr <- complmrob(lifeExp ~ ., data = data) - > plot(mUSArr) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > a <- ggplot2::ggplot(ggplot2::mpg, ggplot2::aes(displ, hwy)) + + + ggplot2::geom_point(ggplot2::aes(color = as.factor(cyl))) + > new_colors <- color_repel(a) + > b <- ggplotly_background(a, filename = NULL) + Error in pm[[2]] : subscript out of bounds + Calls: ggplotly_background -> -> ggplotly.ggplot -> gg2list Execution halted ``` -# conjoint +# CoreMicrobiomeR
-* Version: 1.41 +* Version: 0.1.0 * GitHub: NA -* Source code: https://github.com/cran/conjoint -* Date/Publication: 2018-07-26 13:00:03 UTC -* Number of recursive dependencies: 53 +* Source code: https://github.com/cran/CoreMicrobiomeR +* Date/Publication: 2024-04-03 20:03:02 UTC +* Number of recursive dependencies: 91 -Run `revdepcheck::cloud_details(, "conjoint")` for more info +Run `revdepcheck::cloud_details(, "CoreMicrobiomeR")` for more info
@@ -4391,137 +3759,46 @@ Run `revdepcheck::cloud_details(, "conjoint")` for more info * checking examples ... ERROR ``` - Running examples in ‘conjoint-Ex.R’ failed + Running examples in ‘CoreMicrobiomeR-Ex.R’ failed The error most likely occurred in: - > ### Name: caSegmentation - > ### Title: Function caSegmentation divides respondents on clusters - > ### Aliases: caSegmentation - > ### Keywords: multivariate + > ### Name: group_bar_plots + > ### Title: Grouped Bar Plots Based on Sample Size + > ### Aliases: group_bar_plots > > ### ** Examples > + > #To run input data ... - Available components: - - [1] "cluster" "centers" "totss" "withinss" "tot.withinss" - [6] "betweenss" "size" "iter" "ifault" - > util<-as.data.frame(segments$util) - > set.seed(123) - > ggplot2::autoplot(kmeans(util,3),data=util,label=TRUE,label.size=4,frame=TRUE) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + + top_percentage = 10 # Adjust the percentage as needed for core/non-core OTUs + + ) + Warning encountered during diversity analysis:you have empty rows: their dissimilarities may be + meaningless in method “bray” + > #To run grouped bar plot function + > plot_group_bar <- group_bar_plots(core_1$final_otu_table_bef_filter, + + core_1$final_otu_aft_filter, 10) + Error in pm[[2]] : subscript out of bounds + Calls: group_bar_plots -> -> ggplotly.ggplot -> gg2list Execution halted ``` -# conquestr +# correlationfunnel
-* Version: 1.3.4 -* GitHub: NA -* Source code: https://github.com/cran/conquestr -* Date/Publication: 2024-07-24 06:00:01 UTC -* Number of recursive dependencies: 80 +* Version: 0.2.0 +* GitHub: https://github.com/business-science/correlationfunnel +* Source code: https://github.com/cran/correlationfunnel +* Date/Publication: 2020-06-09 04:40:03 UTC +* Number of recursive dependencies: 115 -Run `revdepcheck::cloud_details(, "conquestr")` for more info +Run `revdepcheck::cloud_details(, "correlationfunnel")` for more info
## Newly broken -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘plotting.Rmd’ - ... - > myRout <- ConQuestRout() - no rout file provided, loading the example rout file instead - - > myPlot <- plotRout(myRout) - - > myPlot - - ... - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘data-cleaning-functions-in-conquestr.Rmd’ using ‘UTF-8’... OK - ‘generateResponses.Rmd’ using ‘UTF-8’... OK - ‘intro-to-conquestr.Rmd’ using ‘UTF-8’... OK - ‘itanal-in-conquestr.Rmd’ using ‘UTF-8’... OK - ‘plotting.Rmd’ using ‘UTF-8’... failed - ‘responseProbs.Rmd’ using ‘UTF-8’... OK - ‘test_item_review_sheet_markdown.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘data-cleaning-functions-in-conquestr.Rmd’ using rmarkdown - --- finished re-building ‘data-cleaning-functions-in-conquestr.Rmd’ - - --- re-building ‘generateResponses.Rmd’ using rmarkdown - ``` - -# CoreMicrobiomeR - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/CoreMicrobiomeR -* Date/Publication: 2024-04-03 20:03:02 UTC -* Number of recursive dependencies: 91 - -Run `revdepcheck::cloud_details(, "CoreMicrobiomeR")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘CoreMicrobiomeR-Ex.R’ failed - The error most likely occurred in: - - > ### Name: group_bar_plots - > ### Title: Grouped Bar Plots Based on Sample Size - > ### Aliases: group_bar_plots - > - > ### ** Examples - > - > #To run input data - ... - + top_percentage = 10 # Adjust the percentage as needed for core/non-core OTUs - + ) - Warning encountered during diversity analysis:you have empty rows: their dissimilarities may be - meaningless in method “bray” - > #To run grouped bar plot function - > plot_group_bar <- group_bar_plots(core_1$final_otu_table_bef_filter, - + core_1$final_otu_aft_filter, 10) - Error in pm[[2]] : subscript out of bounds - Calls: group_bar_plots -> -> ggplotly.ggplot -> gg2list - Execution halted - ``` - -# correlationfunnel - -
- -* Version: 0.2.0 -* GitHub: https://github.com/business-science/correlationfunnel -* Source code: https://github.com/cran/correlationfunnel -* Date/Publication: 2020-06-09 04:40:03 UTC -* Number of recursive dependencies: 116 - -Run `revdepcheck::cloud_details(, "correlationfunnel")` for more info - -
- -## Newly broken - -* checking tests ... ERROR +* checking tests ... ERROR ``` Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. @@ -4562,7 +3839,7 @@ Run `revdepcheck::cloud_details(, "correlationfunnel")` for more info * GitHub: NA * Source code: https://github.com/cran/corrViz * Date/Publication: 2023-06-30 11:40:07 UTC -* Number of recursive dependencies: 140 +* Number of recursive dependencies: 128 Run `revdepcheck::cloud_details(, "corrViz")` for more info @@ -4641,125 +3918,6 @@ Run `revdepcheck::cloud_details(, "corrViz")` for more info doc 6.7Mb ``` -# corx - -
- -* Version: 1.0.7.2 -* GitHub: https://github.com/conig/corx -* Source code: https://github.com/cran/corx -* Date/Publication: 2023-06-16 04:10:02 UTC -* Number of recursive dependencies: 125 - -Run `revdepcheck::cloud_details(, "corx")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(corx) - > - > test_check("corx") - [ FAIL 2 | WARN 1 | SKIP 0 | PASS 69 ] - - ══ Failed tests ════════════════════════════════════════════════════════════════ - ... - 14. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 15. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 16. └─base::.handleSimpleError(...) - 17. └─purrr (local) h(simpleError(msg, call)) - 18. └─cli::cli_abort(...) - 19. └─rlang::abort(...) - - [ FAIL 2 | WARN 1 | SKIP 0 | PASS 69 ] - Error: Test failures - Execution halted - ``` - -# cosinor2 - -
- -* Version: 0.2.1 -* GitHub: https://github.com/amutak/cosinor2 -* Source code: https://github.com/cran/cosinor2 -* Date/Publication: 2018-10-15 16:10:03 UTC -* Number of recursive dependencies: 78 - -Run `revdepcheck::cloud_details(, "cosinor2")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘cosinor2-Ex.R’ failed - The error most likely occurred in: - - > ### Name: cosinor.PR - > ### Title: Percent Rhythm - > ### Aliases: cosinor.PR - > - > ### ** Examples - > - > fit.temperature<-cosinor.lm(Temperature~time(Time), period = 24, data = temperature_zg) - ... - 1 0.9838823 0.9680243 0 - > - > fit.november<-population.cosinor.lm(data = PANAS_november, time = PANAS_time, - + period = 7) - MESOR Amplitude Acrophase - 1 1.435419 0.2662682 -5.544496 - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: population.cosinor.lm ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘cosinor2.Rmd’ - ... - Loading required package: cosinor - - > fit.panas.cosinor <- population.cosinor.lm(data = PANAS_november, - + time = PANAS_time, period = 7) - MESOR Amplitude Acrophase - 1 1.435419 0.2662682 -5.544496 - - When sourcing ‘cosinor2.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘cosinor2.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘cosinor2.Rmd’ using rmarkdown - - Quitting from lines 47-48 [unnamed-chunk-2] (cosinor2.Rmd) - Error: processing vignette 'cosinor2.Rmd' failed with diagnostics: - invalid line type: must be length 2, 4, 6 or 8 - --- failed re-building ‘cosinor2.Rmd’ - - SUMMARY: processing the following file failed: - ‘cosinor2.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - # CoSMoS
@@ -4768,7 +3926,7 @@ Run `revdepcheck::cloud_details(, "cosinor2")` for more info * GitHub: https://github.com/TycheLab/CoSMoS * Source code: https://github.com/cran/CoSMoS * Date/Publication: 2021-05-29 23:20:08 UTC -* Number of recursive dependencies: 81 +* Number of recursive dependencies: 80 Run `revdepcheck::cloud_details(, "CoSMoS")` for more info @@ -4781,15 +3939,15 @@ Run `revdepcheck::cloud_details(, "CoSMoS")` for more info Errors in running code in vignettes: when running code in ‘vignette.Rmd’ ... - `stat_bin()` using `bins = 30`. Pick better value with `binwidth`. - - > precip_ggamma <- analyzeTS(TS = precip, season = "month", - + dist = "ggamma", acsID = "weibull", lag.max = 12) - > reportTS(aTS = precip_ggamma, method = "dist") + theme_light() + > ggplot(data = dta, mapping = aes(x = time, y = value)) + + + geom_line() + facet_grid(facets = variable ~ ., scales = "free_y") + + + theme_li .... [TRUNCATED] When sourcing ‘vignette.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 + Error: The `facets` argument of `facet_grid()` was deprecated in ggplot2 2.2.0 + and is now defunct. + ℹ Please use the `rows` argument instead. Execution halted ‘vignette.Rmd’ using ‘UTF-8’... failed @@ -4809,7 +3967,7 @@ Run `revdepcheck::cloud_details(, "CoSMoS")` for more info * GitHub: https://github.com/BioGenies/countfitteR * Source code: https://github.com/cran/countfitteR * Date/Publication: 2020-09-30 21:30:02 UTC -* Number of recursive dependencies: 93 +* Number of recursive dependencies: 90 Run `revdepcheck::cloud_details(, "countfitteR")` for more info @@ -4827,80 +3985,17 @@ Run `revdepcheck::cloud_details(, "countfitteR")` for more info > library(countfitteR) > > test_check("countfitteR") - [ FAIL 1 | WARN 6 | SKIP 0 | PASS 34 ] - - ══ Failed tests ════════════════════════════════════════════════════════════════ - ── Failure ('testing.R:45:3'): plot_fit ──────────────────────────────────────── - p$labels[[1]] not equal to "x". - target is NULL, current is character + [ FAIL 1 | WARN 6 | SKIP 0 | PASS 32 ] - [ FAIL 1 | WARN 6 | SKIP 0 | PASS 34 ] - Error: Test failures - Execution halted - ``` - -# coursekata - -
- -* Version: 0.18.0 -* GitHub: https://github.com/coursekata/coursekata-r -* Source code: https://github.com/cran/coursekata -* Date/Publication: 2024-08-16 20:20:02 UTC -* Number of recursive dependencies: 119 - -Run `revdepcheck::cloud_details(, "coursekata")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘coursekata-Ex.R’ failed - The error most likely occurred in: - - > ### Name: middle - > ### Title: Find a percentage of a distribution - > ### Aliases: middle tails lower upper - > - > ### ** Examples - > - > ... - > tails(1:10, .5) - [1] TRUE TRUE FALSE FALSE FALSE FALSE FALSE FALSE TRUE TRUE - > - > sampling_distribution <- do(1000) * mean(rnorm(100, 5, 10)) - > sampling_distribution %>% - + gf_histogram(~mean, data = sampling_distribution, fill = ~ middle(mean, .68)) %>% - + gf_refine(scale_fill_manual(values = c("blue", "coral"))) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: %>% ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(coursekata) - Loading required package: dslabs - Loading required package: fivethirtyeight - Some larger datasets need to be installed separately, like senators and - house_district_forecast. To install these, we recommend you install the - fivethirtyeightdata package by running: - ... - • gf_model-visual/gf-violin-cond-mod-y-on-x-pred-on-color.svg - • gf_model-visual/gf-violin-cond-mod-y-on-x-pred-on-facet.svg - • gf_model-visual/gf-violin-cond-mod-y-on-y-pred-on-color.svg - • gf_model-visual/gf-violin-cond-mod-y-on-y-pred-on-facet.svg - • gf_model-visual/gf-violin-cond-mod-y-on-y.svg - • gf_model-visual/gf-violin-horizontal-mull-mod-y-on-x.svg - • gf_model-visual/gf-violin-mull-mod-y-on-x-2.svg - • gf_model-visual/gf-violin-null-mod-y-on-y.svg + Error in `p$labels[[1]]`: subscript out of bounds + Backtrace: + ▆ + 1. └─testthat::expect_equal(p$labels[[1]], "x") at testing.R:45:3 + 2. └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. └─rlang::eval_bare(expr, quo_get_env(quo)) + + [ FAIL 1 | WARN 6 | SKIP 0 | PASS 32 ] Error: Test failures Execution halted ``` @@ -4913,7 +4008,7 @@ Run `revdepcheck::cloud_details(, "coursekata")` for more info * GitHub: https://github.com/cmu-delphi/covidcast * Source code: https://github.com/cran/covidcast * Date/Publication: 2023-07-12 23:40:06 UTC -* Number of recursive dependencies: 93 +* Number of recursive dependencies: 92 Run `revdepcheck::cloud_details(, "covidcast")` for more info @@ -4949,24 +4044,22 @@ Run `revdepcheck::cloud_details(, "covidcast")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘external-data.Rmd’ + when running code in ‘plotting-signals.Rmd’ ... - Warning: Metadata for signal mean and standard deviation not available; defaulting to observed mean and standard deviation to set plot range. - Warning in ggplot2::guide_colorbar(title = NULL, horizontal = TRUE, barheight = legend_height, : - Arguments in `...` must be used. - ✖ Problematic argument: • horizontal = TRUE ℹ Did you misspell an argument name? - ... - Error: Rate limit exceeded when fetching data from API anonymously. See the "API keys" section of the `covidcast_signal()` documentation for information on registering for an API key. - ℹ Message from server: - ℹ Rate limit exceeded for anonymous queries. To remove this limit, register a free API key at https://api.delphi.cmu.edu/epidata/admin/registration_form + When sourcing ‘plotting-signals.R’: + Error: Problem while setting up geom aesthetics. + ℹ Error occurred in the 5th layer. + Caused by error in `check_aesthetics()`: + ! Aesthetics must be either length 1 or the same as the data (3078). + ✖ Fix the following mappings: `fill`. Execution halted ‘correlation-utils.Rmd’ using ‘UTF-8’... OK ‘covidcast.Rmd’ using ‘UTF-8’... OK - ‘external-data.Rmd’ using ‘UTF-8’... failed + ‘external-data.Rmd’ using ‘UTF-8’... OK ‘multi-signals.Rmd’ using ‘UTF-8’... OK ‘plotting-signals.Rmd’ using ‘UTF-8’... failed ``` @@ -4978,22 +4071,6 @@ Run `revdepcheck::cloud_details(, "covidcast")` for more info --- finished re-building ‘correlation-utils.Rmd’ --- re-building ‘covidcast.Rmd’ using rmarkdown - - Quitting from lines 38-45 [unnamed-chunk-1] (covidcast.Rmd) - Error: processing vignette 'covidcast.Rmd' failed with diagnostics: - Rate limit exceeded when fetching data from API anonymously. See the "API keys" section of the `covidcast_signal()` documentation for information on registering for an API key. - ℹ Message from server: - ... - ℹ Message from server: - ℹ Rate limit exceeded for anonymous queries. To remove this limit, register a free API key at https://api.delphi.cmu.edu/epidata/admin/registration_form - --- failed re-building ‘plotting-signals.Rmd’ - - SUMMARY: processing the following files failed: - ‘covidcast.Rmd’ ‘external-data.Rmd’ ‘multi-signals.Rmd’ - ‘plotting-signals.Rmd’ - - Error: Vignette re-building failed. - Execution halted ``` ## In both @@ -5003,17 +4080,17 @@ Run `revdepcheck::cloud_details(, "covidcast")` for more info Note: found 20 marked UTF-8 strings ``` -# Coxmos +# creditmodel
-* Version: 1.0.2 -* GitHub: https://github.com/BiostatOmics/Coxmos -* Source code: https://github.com/cran/Coxmos -* Date/Publication: 2024-03-25 20:32:38 UTC -* Number of recursive dependencies: 194 +* Version: 1.3.1 +* GitHub: NA +* Source code: https://github.com/cran/creditmodel +* Date/Publication: 2022-01-07 11:32:41 UTC +* Number of recursive dependencies: 71 -Run `revdepcheck::cloud_details(, "Coxmos")` for more info +Run `revdepcheck::cloud_details(, "creditmodel")` for more info
@@ -5021,316 +4098,186 @@ Run `revdepcheck::cloud_details(, "Coxmos")` for more info * checking examples ... ERROR ``` - Running examples in ‘Coxmos-Ex.R’ failed + Running examples in ‘creditmodel-Ex.R’ failed The error most likely occurred in: - > ### Name: getAutoKM - > ### Title: getAutoKM - > ### Aliases: getAutoKM + > ### Name: char_to_num + > ### Title: character to number + > ### Aliases: char_to_num > > ### ** Examples > - > data("X_proteomic") - ... - > X_train <- X_proteomic[index_train,1:50] - > Y_train <- Y_proteomic[index_train,] - > X_test <- X_proteomic[-index_train,1:50] - > Y_test <- Y_proteomic[-index_train,] - > splsicox.model <- splsicox(X_train, Y_train, n.comp = 2, penalty = 0.5, x.center = TRUE, - + x.scale = TRUE) - > getAutoKM(type = "LP", model = splsicox.model) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: getAutoKM ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > dat_sub = lendingclub[c('dti_joint', 'emp_length')] + > str(dat_sub) + 'data.frame': 31766 obs. of 2 variables: + $ dti_joint : chr "Missing" "Missing" "9.02" "Missing" ... + $ emp_length: chr "3 years" "2 years" "2 years" "10+ years" ... + > #variables that are converted to numbers containing strings + > dat_sub = char_to_num(dat_sub) + Error in is.element(class(x), types) : unused argument (types) + Calls: char_to_num -> get_names -> unique -> sapply -> lapply -> FUN Execution halted ``` -## In both - * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘Coxmos-MO-pipeline.Rmd’ + when running code in ‘introduction.Rmd’ ... + > library(creditmodel) + Package 'creditmodel' version 1.3.1 - $proteomic + > B_model = training_model(dat = UCICreditCard, model_name = "UCICreditCard", + + target = "default.payment.next.month", x_list = NULL, occur_time .... [TRUNCATED] + ── Building ─────────────────────────────────────────────────── UCICreditCard ── + When sourcing ‘introduction.R’: + Error: unused argument (c("LR", "XGB", "GBM", "RF")) + Execution halted - > LST_KM_RES_LP <- getAutoKM(type = "LP", model = lst_models$`SB.sPLS-DRCOX`, - + comp = 1:4, top = 10, ori_data = T, BREAKTIME = NULL, only_sig = .... [TRUNCATED] + ‘introduction.Rmd’ using ‘UTF-8’... failed + ``` + +* checking whether package ‘creditmodel’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(x, names(mat_nas_shadow))': unused argument (names(mat_nas_shadow)) + Note: possible error in 'is.element(x, names(corr_random_num))': unused argument (names(corr_random_num)) + Note: possible error in 'is.element(x, colnames(corr_random_char))': unused argument (colnames(corr_random_char)) + Note: possible error in 'is.element(class(dm_x), ': unused argument (c("Date", "numeric", "integer", "double")) + Note: possible error in 'is.element(x, c("cyan", ': unused argument (c("cyan", "grey", "green", "red", "blue", "purple")) + Note: possible error in 'is.element(class(dat), ': unused argument (c("data.table", "list", "tbl_df", "tbl", "matrix")) + Note: possible error in 'is.element(occur_time, ': unused argument (names(dat)) + Note: possible error in 'is.element(class(dat_x), ': unused argument (c("integer", "numeric", "double")) + Note: possible error in 'is.element(class(dat_x), ': unused argument (c("Date")) + ... + Note: possible error in 'is.element("mins", unit)': unused argument (unit) + Note: possible error in 'is.element("hours", unit)': unused argument (unit) + Note: possible error in 'is.element("weeks", unit)': unused argument (unit) + Note: possible error in 'is.element(split_type, ': unused argument (c("OOT", "Random", "byRow")) + Note: possible error in 'is.element(algorithm, ': unused argument (c("LR", "XGB", "GBM", "RF")) + Note: possible error in 'is.element(feature_filter[["filter"]], ': unused argument (c("IV", "PSI", "XGB", "COR")) + See ‘/tmp/workdir/creditmodel/new/creditmodel.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + analysis_nas : : possible error in is.element(x, + names(mat_nas_shadow)): unused argument (names(mat_nas_shadow)) + analysis_nas : : possible error in is.element(x, + names(corr_random_num)): unused argument (names(corr_random_num)) + analysis_nas : : possible error in is.element(x, + colnames(corr_random_char)): unused argument + (colnames(corr_random_char)) + analysis_outliers: possible error in is.element(class(dm_x), c("Date", + "numeric", "integer", "double")): unused argument (c("Date", + "numeric", "integer", "double")) + ... + "GBM", "RF")): unused argument (c("LR", "XGB", "GBM", "RF")) + training_model: possible error in is.element(missing_proc, c("median", + "avg_dist", "default")): unused argument (c("median", "avg_dist", + "default")) + training_model: possible error in + is.element(feature_filter[["filter"]], c("IV", "PSI", "XGB", "COR")): + unused argument (c("IV", "PSI", "XGB", "COR")) + xgb_params_search: possible error in is.element(method, + c("random_search", "grid_search", "local_search")): unused argument + (c("random_search", "grid_search", "local_search")) + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘introduction.Rmd’ using rmarkdown - ... - Warning in data("Y_proteomic") : data set ‘Y_proteomic’ not found + Quitting from lines 31-79 [unnamed-chunk-1] (introduction.Rmd) + Error: processing vignette 'introduction.Rmd' failed with diagnostics: + unused argument (c("LR", "XGB", "GBM", "RF")) + --- failed re-building ‘introduction.Rmd’ - > X <- X_proteomic + SUMMARY: processing the following file failed: + ‘introduction.Rmd’ - When sourcing ‘Coxmos-pipeline.R’: - Error: object 'X_proteomic' not found + Error: Vignette re-building failed. Execution halted - - ‘Coxmos-MO-pipeline.Rmd’ using ‘UTF-8’... failed - ‘Coxmos-pipeline.Rmd’ using ‘UTF-8’... failed ``` +## In both + * checking installed package size ... NOTE ``` - installed size is 7.4Mb + installed size is 7.6Mb sub-directories of 1Mb or more: R 1.5Mb - data 2.5Mb - doc 2.9Mb + data 5.5Mb ``` -# cpr +# cricketr
-* Version: 0.4.0 -* GitHub: https://github.com/dewittpe/cpr -* Source code: https://github.com/cran/cpr -* Date/Publication: 2024-02-15 15:40:02 UTC -* Number of recursive dependencies: 95 +* Version: 0.0.26 +* GitHub: https://github.com/tvganesh/cricketr +* Source code: https://github.com/cran/cricketr +* Date/Publication: 2021-03-23 05:30:15 UTC +* Number of recursive dependencies: 58 -Run `revdepcheck::cloud_details(, "cpr")` for more info +Run `revdepcheck::cloud_details(, "cricketr")` for more info
## Newly broken -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘cpr.Rmd’ - ... - Warning: Removed 25 rows containing missing values or values outside the scale range - (`geom_rug()`). - Warning: Removed 26 rows containing missing values or values outside the scale range - (`geom_rug()`). - Warning: Removed 38 rows containing missing values or values outside the scale range - (`geom_rug()`). - - When sourcing ‘cpr.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘cnr.Rmd’ using ‘UTF-8’... OK - ‘cpr.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE +* checking whether package ‘cricketr’ can be installed ... WARNING ``` - Error(s) in re-building vignettes: - --- re-building ‘cnr.Rmd’ using rmarkdown + Found the following significant warnings: + Note: possible error in 'is.element(1, homeOrAway)': unused argument (homeOrAway) + Note: possible error in 'is.element(2, homeOrAway)': unused argument (homeOrAway) + Note: possible error in 'is.element(3, homeOrAway)': unused argument (homeOrAway) + Note: possible error in 'is.element(1, result)': unused argument (result) + Note: possible error in 'is.element(2, result)': unused argument (result) + Note: possible error in 'is.element(3, result)': unused argument (result) + Note: possible error in 'is.element(4, result)': unused argument (result) + Note: possible error in 'is.element(5, result)': unused argument (result) + See ‘/tmp/workdir/cricketr/new/cricketr.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + getTeamData: possible error in is.element(1, homeOrAway): unused + argument (homeOrAway) + getTeamData: possible error in is.element(2, homeOrAway): unused + argument (homeOrAway) + getTeamData: possible error in is.element(3, homeOrAway): unused + argument (homeOrAway) + getTeamData: possible error in is.element(1, result): unused argument + (result) + getTeamData: possible error in is.element(2, result): unused argument + (result) + getTeamData: possible error in is.element(3, result): unused argument + (result) + getTeamData: possible error in is.element(4, result): unused argument + (result) + getTeamData: possible error in is.element(5, result): unused argument + (result) ``` -## In both +# crosshap -* checking tests ... ERROR - ``` - Running ‘test-bsplineD.R’ - Running ‘test-bsplines.R’ - Running ‘test-btensor.R’ - Running ‘test-build_tensor.R’ - Running ‘test-cn.R’ - Running ‘test-cnr.R’ - Running ‘test-coef_vcov.R’ - Running the tests in ‘tests/test-coef_vcov.R’ failed. - Complete output: - > # Tests for extracting coefficients and vcov matrix from regression fits - ... - + stopifnot(identical(names(COEF_VCOV), c("theta", "coef", "vcov_theta", "vcov"))) - + stopifnot(identical(COEF_VCOV$theta, numeric(0))) - + stopifnot(identical(COEF_VCOV$coef, fixef(fit))) - + stopifnot(identical(COEF_VCOV$vcov_theta, matrix(0)[FALSE, FALSE])) - + stopifnot(identical(COEF_VCOV$vcov, as.matrix(vcov(fit)))) - + }) - Error in initializePtr() : - function 'cholmod_factor_ldetA' not provided by package 'Matrix' - Calls: with ... initialize -> -> initializePtr -> .Call - Execution halted - ``` - -* checking installed package size ... NOTE - ``` - installed size is 6.6Mb - sub-directories of 1Mb or more: - doc 1.6Mb - libs 4.1Mb - ``` - -# cpsvote - -
- -* Version: 0.1.0 -* GitHub: https://github.com/Reed-EVIC/cpsvote -* Source code: https://github.com/cran/cpsvote -* Date/Publication: 2020-11-05 16:00:02 UTC -* Number of recursive dependencies: 90 - -Run `revdepcheck::cloud_details(, "cpsvote")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘voting.Rmd’ - ... - + .... [TRUNCATED] - - > library(usmap) - - > cps16 %>% as_survey_design(weights = turnout_weight) %>% - + mutate(state = STATE) %>% group_by(state) %>% summarize(turnout = survey_mean(hurach .... [TRUNCATED] - - When sourcing ‘voting.R’: - Error: argument is of length zero - Execution halted - - ‘add-variables.Rmd’ using ‘UTF-8’... OK - ‘background.Rmd’ using ‘UTF-8’... OK - ‘basics.Rmd’ using ‘UTF-8’... OK - ‘voting.Rmd’ using ‘UTF-8’... failed - ``` - -# crimeutils - -
- -* Version: 0.5.1 -* GitHub: https://github.com/jacobkap/crimeutils -* Source code: https://github.com/cran/crimeutils -* Date/Publication: 2022-12-07 15:10:07 UTC -* Number of recursive dependencies: 103 - -Run `revdepcheck::cloud_details(, "crimeutils")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘crimeutils-Ex.R’ failed - The error most likely occurred in: - - > ### Name: scale_linetype_crim - > ### Title: A set of linetypes - > ### Aliases: scale_linetype_crim - > - > ### ** Examples - > - > ggplot2::ggplot(mtcars, ggplot2::aes(x = mpg, y = hp, linetype = as.character(cyl))) + - + ggplot2::geom_line(size = 1) + - + scale_linetype_crim() + - + theme_crim() - Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. - ℹ Please use `linewidth` instead. - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -# crmPack - -
- -* Version: 1.0.6 -* GitHub: https://github.com/openpharma/crmPack -* Source code: https://github.com/cran/crmPack -* Date/Publication: 2024-06-26 15:00:14 UTC -* Number of recursive dependencies: 70 - -Run `revdepcheck::cloud_details(, "crmPack")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘crmPack-Ex.R’ failed - The error most likely occurred in: - - > ### Name: DataMixture-class - > ### Title: Class for the data with mixture sharing - > ### Aliases: DataMixture-class .DataMixture - > ### Keywords: classes - > - > ### ** Examples - > - ... - + refDose = 50) - > - > nodata <- Data(doseGrid=doseGrid) - > - > priorSamples <- mcmc(nodata, model, options) - > plot(priorSamples, model, nodata) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘example.Rnw’ - ... - [1] -5.070681 - - > newDLTmodel@phi2 - [1] 1.125107 - - > print(plot(samples, model, data)) - - When sourcing ‘example.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘guidelines.Rmd’ using ‘UTF-8’... OK - ‘example.Rnw’ using ‘UTF-8’... failed - ``` - -## In both - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘guidelines.Rmd’ using rmarkdown - --- finished re-building ‘guidelines.Rmd’ - - --- re-building ‘example.Rnw’ using Sweave - Loading required package: ggplot2 - Registered S3 method overwritten by 'crmPack': - method from - print.gtable gtable - Type crmPackHelp() to open help browser - ... - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - - --- failed re-building ‘example.Rnw’ - - SUMMARY: processing the following file failed: - ‘example.Rnw’ - - Error: Vignette re-building failed. - Execution halted - ``` - -# crosshap - -
+
* Version: 1.4.0 * GitHub: https://github.com/jacobimarsh/crosshap * Source code: https://github.com/cran/crosshap * Date/Publication: 2024-03-31 15:40:02 UTC -* Number of recursive dependencies: 117 +* Number of recursive dependencies: 116 Run `revdepcheck::cloud_details(, "crosshap")` for more info @@ -5363,6 +4310,38 @@ Run `revdepcheck::cloud_details(, "crosshap")` for more info Execution halted ``` +# CRTgeeDR + +
+ +* Version: 2.0.1 +* GitHub: NA +* Source code: https://github.com/cran/CRTgeeDR +* Date/Publication: 2022-09-06 07:28:24 UTC +* Number of recursive dependencies: 28 + +Run `revdepcheck::cloud_details(, "CRTgeeDR")` for more info + +
+ +## Newly broken + +* checking whether package ‘CRTgeeDR’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(id, dropid)': unused argument (dropid) + See ‘/tmp/workdir/CRTgeeDR/new/CRTgeeDR.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + geeDREstimation: possible error in is.element(id, dropid): unused + argument (dropid) + ``` + # ctrialsgov
@@ -5371,7 +4350,7 @@ Run `revdepcheck::cloud_details(, "crosshap")` for more info * GitHub: NA * Source code: https://github.com/cran/ctrialsgov * Date/Publication: 2021-10-18 16:00:02 UTC -* Number of recursive dependencies: 100 +* Number of recursive dependencies: 99 Run `revdepcheck::cloud_details(, "ctrialsgov")` for more info @@ -5419,7 +4398,7 @@ Run `revdepcheck::cloud_details(, "ctrialsgov")` for more info * GitHub: https://github.com/huizezhang-sherry/cubble * Source code: https://github.com/cran/cubble * Date/Publication: 2024-08-27 15:20:02 UTC -* Number of recursive dependencies: 145 +* Number of recursive dependencies: 132 Run `revdepcheck::cloud_details(, "cubble")` for more info @@ -5430,14 +4409,14 @@ Run `revdepcheck::cloud_details(, "cubble")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘cb5match.Rmd’ + when running code in ‘cb6interactive.Rmd’ ... - > p2 <- ggplot(res_tm_long, aes(x = date, y = matched, - + group = type, color = type)) + geom_line() + facet_wrap(vars(group)) + - + scale_colo .... [TRUNCATED] + + ymax .... [TRUNCATED] + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. - > (p1 | p2) + patchwork::plot_layout(guides = "collect") + - + plot_annotation(tag_levels = "a") & theme(legend.position = "bottom") + > ts_interactive <- highlight(ggplotly(ts_static, width = 600, + + height = 300), on = "plotly_selected", opacityDim = 0.012) ... Error: subscript out of bounds @@ -5447,7 +4426,7 @@ Run `revdepcheck::cloud_details(, "cubble")` for more info ‘cb2create.Rmd’ using ‘UTF-8’... OK ‘cb3tsibblesf.Rmd’ using ‘UTF-8’... OK ‘cb4glyph.Rmd’ using ‘UTF-8’... OK - ‘cb5match.Rmd’ using ‘UTF-8’... failed + ‘cb5match.Rmd’ using ‘UTF-8’... OK ‘cb6interactive.Rmd’ using ‘UTF-8’... failed ‘cb7misc.Rmd’ using ‘UTF-8’... OK ``` @@ -5477,17 +4456,17 @@ Run `revdepcheck::cloud_details(, "cubble")` for more info doc 1.4Mb ``` -# curtailment +# DAISIE
-* Version: 0.2.6 -* GitHub: https://github.com/martinlaw/curtailment -* Source code: https://github.com/cran/curtailment -* Date/Publication: 2023-10-25 15:50:04 UTC -* Number of recursive dependencies: 36 +* Version: 4.4.1 +* GitHub: https://github.com/rsetienne/DAISIE +* Source code: https://github.com/cran/DAISIE +* Date/Publication: 2023-10-21 23:10:10 UTC +* Number of recursive dependencies: 118 -Run `revdepcheck::cloud_details(, "curtailment")` for more info +Run `revdepcheck::cloud_details(, "DAISIE")` for more info
@@ -5495,88 +4474,52 @@ Run `revdepcheck::cloud_details(, "curtailment")` for more info * checking examples ... ERROR ``` - Running examples in ‘curtailment-Ex.R’ failed + Running examples in ‘DAISIE-Ex.R’ failed The error most likely occurred in: - > ### Name: drawDiagramGeneric - > ### Title: drawDiagramGeneric - > ### Aliases: drawDiagramGeneric + > ### Name: DAISIE_plot_input + > ### Title: DAISIE tree plot + > ### Aliases: DAISIE_plot_input > > ### ** Examples > - > go <- cbind(6:8, rep(8,3)) + > ... - 4. └─ggplot2:::ggplot_build.ggplot(x) - 5. └─layout$setup(data, plot$data, plot$plot_env) - 6. └─ggplot2 (local) setup(..., self = self) - 7. └─self$coord$setup_params(data) - 8. └─ggplot2 (local) setup_params(..., self = self) - 9. └─ggplot2:::parse_coord_expand(expand = self$expand %||% TRUE) - 10. └─ggplot2:::check_logical(expand) - 11. └─ggplot2:::stop_input_type(...) - 12. └─rlang::abort(message, ..., call = call, arg = arg) + ℹ Did you misspell an argument name? + Scale for y is already present. + Adding another scale for y, which will replace the existing scale. + Joining with `by = join_by(label)` + Warning: Removed 1 row containing missing values or values outside the scale range + (`geom_point()`). + Error in grid.Call.graphics(C_rect, x$x, x$y, x$width, x$height, resolveHJust(x$just, : + invalid hex digit in 'color' or 'lty' + Calls: ... drawDetails -> drawDetails.rect -> grid.Call.graphics Execution halted ``` -# dabestr - -
- -* Version: 2023.9.12 -* GitHub: https://github.com/ACCLAB/dabestr -* Source code: https://github.com/cran/dabestr -* Date/Publication: 2023-10-13 11:50:06 UTC -* Number of recursive dependencies: 85 - -Run `revdepcheck::cloud_details(, "dabestr")` for more info - -
- -## Newly broken +## In both -* checking running R code from vignettes ... ERROR +* checking package dependencies ... NOTE ``` - Errors in running code in vignettes: - when running code in ‘tutorial_deltadelta.Rmd’ - ... - > paired_delta2.mean_diff <- load(df, x = Treatment, - + y = Measurement, experiment = Genotype, colour = Rep, delta2 = TRUE, - + idx = list(c(" ..." ... [TRUNCATED] - - > dabest_plot(paired_delta2.mean_diff, raw_marker_size = 0.5, - + raw_marker_alpha = 0.3) - - ... - Error: argument is of length zero - Execution halted - - ‘datasets.Rmd’ using ‘UTF-8’... OK - ‘plot_aesthetics.Rmd’ using ‘UTF-8’... OK - ‘tutorial_basics.Rmd’ using ‘UTF-8’... OK - ‘tutorial_deltadelta.Rmd’ using ‘UTF-8’... failed - ‘tutorial_minimeta.Rmd’ using ‘UTF-8’... failed - ‘tutorial_proportion_plots.Rmd’ using ‘UTF-8’... OK - ‘tutorial_repeated_measures.Rmd’ using ‘UTF-8’... failed + Package which this enhances but not available for checking: ‘doMC’ ``` -* checking re-building of vignette outputs ... NOTE +* checking installed package size ... NOTE ``` - Error(s) in re-building vignettes: - --- re-building ‘datasets.Rmd’ using rmarkdown - --- finished re-building ‘datasets.Rmd’ - - --- re-building ‘plot_aesthetics.Rmd’ using rmarkdown + installed size is 37.6Mb + sub-directories of 1Mb or more: + libs 35.5Mb ``` # DAISIEprep
-* Version: 0.4.0 +* Version: 1.0.0 * GitHub: https://github.com/joshwlambert/DAISIEprep * Source code: https://github.com/cran/DAISIEprep -* Date/Publication: 2024-04-02 11:30:06 UTC -* Number of recursive dependencies: 149 +* Date/Publication: 2024-12-18 00:20:02 UTC +* Number of recursive dependencies: 148 Run `revdepcheck::cloud_details(, "DAISIEprep")` for more info @@ -5593,7 +4536,7 @@ Run `revdepcheck::cloud_details(, "DAISIEprep")` for more info > library(DAISIEprep) > > test_check("DAISIEprep") - [ FAIL 4 | WARN 2 | SKIP 14 | PASS 2211 ] + [ FAIL 4 | WARN 4 | SKIP 14 | PASS 2235 ] ══ Skipped tests (14) ══════════════════════════════════════════════════════════ ... @@ -5604,22 +4547,22 @@ Run `revdepcheck::cloud_details(, "DAISIEprep")` for more info ── Failure ('test-plot_phylod.R:18:3'): plot_phylod runs silent without error ── `plot_phylod(phylod = phylod, node_pies = TRUE)` produced warnings. - [ FAIL 4 | WARN 2 | SKIP 14 | PASS 2211 ] + [ FAIL 4 | WARN 4 | SKIP 14 | PASS 2235 ] Error: Test failures Execution halted ``` -# dbmss +# daltoolbox
-* Version: 2.9-2 -* GitHub: https://github.com/EricMarcon/dbmss -* Source code: https://github.com/cran/dbmss -* Date/Publication: 2024-08-24 11:00:02 UTC -* Number of recursive dependencies: 96 +* Version: 1.1.727 +* GitHub: https://github.com/cefet-rj-dal/daltoolbox +* Source code: https://github.com/cran/daltoolbox +* Date/Publication: 2024-11-25 05:10:02 UTC +* Number of recursive dependencies: 108 -Run `revdepcheck::cloud_details(, "dbmss")` for more info +Run `revdepcheck::cloud_details(, "daltoolbox")` for more info
@@ -5627,148 +4570,221 @@ Run `revdepcheck::cloud_details(, "dbmss")` for more info * checking examples ... ERROR ``` - Running examples in ‘dbmss-Ex.R’ failed + Running examples in ‘daltoolbox-Ex.R’ failed The error most likely occurred in: - > ### Name: DEnvelope - > ### Title: Estimation of the confidence envelope of the D function under - > ### its null hypothesis - > ### Aliases: DEnvelope + > ### Name: plot_ts_pred + > ### Title: Plot a time series chart with predictions + > ### Aliases: plot_ts_pred > > ### ** Examples > + > data(sin_data) ... - > r <- 0:30 - > NumberOfSimulations <- 20 - > Alpha <- .05 - > # Plot the envelope (after normalization by pi.r^2) - > autoplot(DEnvelope(X, r, NumberOfSimulations, Alpha, - + "V. Americana", "Q. Rosea", Intertype = TRUE), ./(pi*r^2) ~ r) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics + > samp <- ts_sample(ts, test_size= 5) + > io_train <- ts_projection(samp$train) + > io_test <- ts_projection(samp$test) + > + > model <- ts_arima() + > model <- fit(model, x=io_train$input, y=io_train$output) + Error in is.element("drift", names(obj$model$coef)) : + unused argument (names(obj$model$coef)) + Calls: fit -> fit.ts_arima Execution halted ``` -* checking running R code from vignettes ... ERROR +* checking whether package ‘daltoolbox’ can be installed ... WARNING ``` - Errors in running code in vignettes: - when running code in ‘dbmss.Rmd’ - ... - - > autoplot(paracou16, labelSize = expression("Basal area (" ~ - + cm^2 ~ ")"), labelColor = "Species") - - > autoplot(Mhat(paracou16, ReferenceType = "V. Americana", - + NeighborType = "Q. Rosea"), main = "") - - When sourcing ‘dbmss.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘dbmss.Rmd’ using ‘UTF-8’... failed + Found the following significant warnings: + Note: possible error in 'is.element("drift", names(obj$model$coef))': unused argument (names(obj$model$coef)) + See ‘/tmp/workdir/daltoolbox/new/daltoolbox.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. ``` -* checking re-building of vignette outputs ... NOTE +* checking R code for possible problems ... NOTE ``` - Error(s) in re-building vignettes: - --- re-building ‘dbmss.Rmd’ using rmarkdown + fit.ts_arima: possible error in is.element("drift", + names(obj$model$coef)): unused argument (names(obj$model$coef)) ``` -# deeptime +# dawaR
-* Version: 2.0.0 -* GitHub: https://github.com/willgearty/deeptime -* Source code: https://github.com/cran/deeptime -* Date/Publication: 2024-08-19 07:00:43 UTC -* Number of recursive dependencies: 197 +* Version: 0.2.7 +* GitHub: https://github.com/aleksanderbl29/dawaR +* Source code: https://github.com/cran/dawaR +* Date/Publication: 2024-12-08 00:00:06 UTC +* Number of recursive dependencies: 150 -Run `revdepcheck::cloud_details(, "deeptime")` for more info +Run `revdepcheck::cloud_details(, "dawaR")` for more info
## Newly broken +* checking examples ... ERROR + ``` + Running examples in ‘dawaR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: get_data + > ### Title: Get data from section + > ### Aliases: get_data + > + > ### ** Examples + > + > if (connection_check()) { + ... + + x <- get_data("regioner") + + head(x) + + } + ✖ Request failed: HTTP 504 Gateway Timeout. + ✖ The API returned a error. + ✖ No content will be returned + Error in do.call(rbind.data.frame, response) : + second argument must be a list + Calls: get_data -> do.call + Execution halted + ``` + +## Newly fixed + * checking tests ... ERROR ``` Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: - > library(testthat) - > library(deeptime) - > - > test_check("deeptime") - Scale for y is already present. - Adding another scale for y, which will replace the existing scale. - Scale for y is already present. + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html ... - • patterns/geo-pattern2-new.svg - • patterns/scale-fill-geopattern-labels-new.svg - • patterns/scale-fill-geopattern-limits-new.svg - • patterns/scale-fill-geopattern-na-new.svg - • patterns/scale-fill-geopattern-na2-new.svg - • points_range/geom-points-range-aes-new.svg - • points_range/geom-points-range-bg-new.svg - • points_range/geom-points-range-h-new.svg + ── Error ('test-get_data.R:55:5'): get_data(section = 'regioner') snapshot ───── + Error in `do.call(rbind.data.frame, response)`: second argument must be a list + Backtrace: + ▆ + 1. └─testthat::expect_snapshot(get_data(section = "regioner")) at test-get_data.R:55:5 + 2. └─rlang::cnd_signal(state$error) + + [ FAIL 1 | WARN 0 | SKIP 48 | PASS 10 ] Error: Test failures Execution halted ``` -* checking running R code from vignettes ... ERROR +## In both + +* checking re-building of vignette outputs ... NOTE ``` - Errors in running code in vignettes: - when running code in ‘coord_geo.Rmd’ + Error(s) in re-building vignettes: ... - + y = n)) + scale_x_reverse("Age (Ma)") + ylab("Coral Genera") + - + coord_geo(xlim = .... [TRUNCATED] - - > ggplot(coral_div) + geom_line(aes(x = stage_age, y = n)) + - + scale_x_reverse("Age (Ma)") + ylab("Coral Genera") + coord_geo(dat = "periods", - + .... [TRUNCATED] + --- re-building ‘dawaR.Rmd’ using rmarkdown + Quitting from lines 62-70 [municipality_map] (dawaR.Rmd) + Error: processing vignette 'dawaR.Rmd' failed with diagnostics: + Problem while computing aesthetics. + ℹ Error occurred in the 1st layer. + Caused by error: + ! object 'regionsnavn' not found ... - Error: argument is of length zero - Execution halted + --- finished re-building ‘renv-issues.Rmd’ + + --- re-building ‘status.Rmd’ using rmarkdown + --- finished re-building ‘status.Rmd’ + + SUMMARY: processing the following file failed: + ‘dawaR.Rmd’ - ‘coord.Rmd’ using ‘UTF-8’... OK - ‘coord_geo.Rmd’ using ‘UTF-8’... failed - ‘geo.Rmd’ using ‘UTF-8’... OK - ‘ggarrange2.Rmd’ using ‘UTF-8’... OK - ‘phylogenies.Rmd’ using ‘UTF-8’... OK - ‘time.Rmd’ using ‘UTF-8’... failed - ‘traits.Rmd’ using ‘UTF-8’... OK + Error: Vignette re-building failed. + Execution halted ``` -* checking re-building of vignette outputs ... NOTE +# DDPNA + +
+ +* Version: 0.3.3 +* GitHub: https://github.com/liukf10/DDPNA +* Source code: https://github.com/cran/DDPNA +* Date/Publication: 2024-03-14 03:20:15 UTC +* Number of recursive dependencies: 153 + +Run `revdepcheck::cloud_details(, "DDPNA")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR ``` - Error(s) in re-building vignettes: - --- re-building ‘coord.Rmd’ using rmarkdown + Running examples in ‘DDPNA-Ex.R’ failed + The error most likely occurred in: + + > ### Name: MaxQprotein + > ### Title: read proteomic quantification data and seperate the protein + > ### information and quantification information. + > ### Aliases: MaxQprotein + > + > ### ** Examples + > + > data(ProteomicData) + > # example for MaxQ Data + > MaxQdata <- MaxQprotein(ProteomicData$MaxQ) + Error in is.element("Potential.contaminant", colnames(infile)) : + unused argument (colnames(infile)) + Calls: MaxQprotein -> removeConRev + Execution halted ``` -## In both +* checking whether package ‘DDPNA’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element("Potential.contaminant", ': unused argument (colnames(infile)) + Note: possible error in 'is.element("+", unique(infile$Potential.contaminant))': unused argument (unique(infile$Potential.contaminant)) + Note: possible error in 'is.element("Reverse", ': unused argument (colnames(infile)) + Note: possible error in 'is.element("+", unique(infile$Reverse))': unused argument (unique(infile$Reverse)) + Note: possible error in 'is.element(IDname, colname)': unused argument (colname) + Note: possible error in 'is.element(QuanCol, colname)': unused argument (colname) + See ‘/tmp/workdir/DDPNA/new/DDPNA.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` -* checking installed package size ... NOTE +* checking R code for possible problems ... NOTE ``` - installed size is 5.9Mb - sub-directories of 1Mb or more: - R 2.8Mb - doc 1.8Mb - help 1.1Mb + MaxQprotein : removeConRev: possible error in + is.element("Potential.contaminant", colnames(infile)): unused + argument (colnames(infile)) + MaxQprotein : removeConRev: possible error in is.element("+", + unique(infile$Potential.contaminant)): unused argument + (unique(infile$Potential.contaminant)) + MaxQprotein : removeConRev: possible error in is.element("Reverse", + colnames(infile)): unused argument (colnames(infile)) + MaxQprotein : removeConRev: possible error in is.element("+", + unique(infile$Reverse)): unused argument (unique(infile$Reverse)) + MaxQprotein: possible error in is.element(IDname, colname): unused + argument (colname) + MaxQprotein: possible error in is.element(QuanCol, colname): unused + argument (colname) ``` -# descriptio +# Deducer
-* Version: 1.3 -* GitHub: https://github.com/nicolas-robette/descriptio -* Source code: https://github.com/cran/descriptio -* Date/Publication: 2024-03-07 11:00:02 UTC -* Number of recursive dependencies: 98 +* Version: 0.7-9 +* GitHub: NA +* Source code: https://github.com/cran/Deducer +* Date/Publication: 2015-12-29 22:16:31 +* Number of recursive dependencies: 118 -Run `revdepcheck::cloud_details(, "descriptio")` for more info +Run `revdepcheck::cloud_details(, "Deducer")` for more info
@@ -5776,82 +4792,239 @@ Run `revdepcheck::cloud_details(, "descriptio")` for more info * checking examples ... ERROR ``` - Running examples in ‘descriptio-Ex.R’ failed + Running examples in ‘Deducer-Ex.R’ failed The error most likely occurred in: - > ### Name: ggassoc_crosstab - > ### Title: Proportional area plot - > ### Aliases: ggassoc_crosstab - > ### Keywords: multivariate aplot + > ### Name: sort.data.frame + > ### Title: Sort Data + > ### Aliases: sort.data.frame > > ### ** Examples > - > data(Movies) - > ggassoc_crosstab(data=Movies, mapping=ggplot2::aes(Genre, Country)) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ggassoc_crosstab ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > data(mtcars) + > + > #sort by the number of cylenders + > sort(mtcars, by= ~cyl) + Error in is.element(substring(formc, 1, 1), c("+", "-")) : + unused argument (c("+", "-")) + Calls: sort -> sort -> sort.data.frame Execution halted ``` -## In both +* checking whether package ‘Deducer’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(substring(formc, ': unused argument (c("+", "-")) + See ‘/tmp/workdir/Deducer/new/Deducer.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` -* checking Rd cross-references ... NOTE +* checking R code for possible problems ... NOTE ``` - Packages unavailable to check Rd xrefs: ‘FactoMineR’, ‘vcd’ + sort.data.frame: possible error in is.element(substring(formc, 1, 1), + c("+", "-")): unused argument (c("+", "-")) ``` -# directlabels +# deeptime
-* Version: 2024.1.21 -* GitHub: https://github.com/tdhock/directlabels -* Source code: https://github.com/cran/directlabels -* Date/Publication: 2024-01-24 19:20:07 UTC -* Number of recursive dependencies: 82 +* Version: 2.1.0 +* GitHub: https://github.com/willgearty/deeptime +* Source code: https://github.com/cran/deeptime +* Date/Publication: 2024-10-25 23:30:02 UTC +* Number of recursive dependencies: 197 -Run `revdepcheck::cloud_details(, "directlabels")` for more info +Run `revdepcheck::cloud_details(, "deeptime")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘deeptime-Ex.R’ failed + The error most likely occurred in: + + > ### Name: facet_wrap_color + > ### Title: Wrap a 1d ribbon of panels into 2d with colored strips + > ### Aliases: facet_wrap_color FacetWrapColor + > ### Keywords: datasets + > + > ### ** Examples + > + ... + is.element + + > df <- data.frame(x = 1:10, y = 1:10, period = c("Permian", "Triassic")) + > ggplot(df) + + + geom_point(aes(x, y)) + + + facet_wrap_color(vars(period), colors = periods) + Error in asNamespace("ggplot2")$wrap_as_facets_list(...) : + attempt to apply non-function + Calls: facet_wrap_color -> wrap_as_facets_list + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(deeptime) + > + > test_check("deeptime") + Scale for y is already present. + Adding another scale for y, which will replace the existing scale. + Scale for y is already present. + ... + • patterns/geo-pattern2-new.svg + • patterns/scale-fill-geopattern-labels-new.svg + • patterns/scale-fill-geopattern-limits-new.svg + • patterns/scale-fill-geopattern-na-new.svg + • patterns/scale-fill-geopattern-na2-new.svg + • points_range/geom-points-range-aes-new.svg + • points_range/geom-points-range-bg-new.svg + • points_range/geom-points-range-h-new.svg + Error: Test failures + Execution halted + ``` + +# desplot + +
+ +* Version: 1.10 +* GitHub: https://github.com/kwstat/desplot +* Source code: https://github.com/cran/desplot +* Date/Publication: 2023-03-09 23:20:06 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "desplot")` for more info
## Newly broken +* checking examples ... ERROR + ``` + Running examples in ‘desplot-Ex.R’ failed + The error most likely occurred in: + + > ### Name: desplot + > ### Title: Plot the layout/data of a field experiment. + > ### Aliases: desplot ggdesplot + > + > ### ** Examples + > + > if(require(agridat)){ + ... + + desplot(yates.oats, + + block ~ col+row, + + col=nitro, text=gen, cex=1, out1=block, + + out2=gen, out2.gpar=list(col = "gray50", lwd = 1, lty = 1)) + + + + } + Loading required package: agridat + Error in is.element(x, dn) : unused argument (dn) + Calls: desplot -> checkvars + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(desplot) + > + > test_check("desplot") + [ FAIL 7 | WARN 0 | SKIP 0 | PASS 10 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ── Error ('test_desplot.R:142:1'): (code run outside of `test_that()`) ───────── + Error in `is.element(x, dn)`: unused argument (dn) + Backtrace: + ▆ + 1. └─desplot::desplot(...) at test_desplot.R:142:1 + 2. └─desplot (local) checkvars(col.string, dn) + + [ FAIL 7 | WARN 0 | SKIP 0 | PASS 10 ] + Error: Test failures + Execution halted + ``` + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘examples.Rmd’ + when running code in ‘desplot_examples.Rmd’ ... - Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. - ℹ Please use `linewidth` instead. - `geom_smooth()` using method = 'loess' and formula = 'y ~ x' + > if (is.element("x", names(yates.oats))) yates.oats <- transform(yates.oats, + + col = x, row = y) - When sourcing ‘examples.R’: - Error: Problem while computing stat. - ℹ Error occurred in the 3rd layer. - Caused by error in `get()`: - ! object 'last.qp' of mode 'function' was not found + > desplot(yates.oats, block ~ col + row, col = nitro, + + text = gen, cex = 1, out1 = block, out2 = gen, out2.gpar = list(col = "gray50", + + .... [TRUNCATED] + + When sourcing ‘desplot_examples.R’: + Error: unused argument (dn) Execution halted - ‘examples.Rmd’... failed + ‘desplot_examples.Rmd’ using ‘UTF-8’... failed + ``` + +* checking whether package ‘desplot’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(x, dn)': unused argument (dn) + See ‘/tmp/workdir/desplot/new/desplot.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + desplot : checkvars: possible error in is.element(x, dn): unused + argument (dn) + ggdesplot : checkvars: possible error in is.element(x, dn): unused + argument (dn) ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘examples.Rmd’ using knitr + ... + --- re-building ‘desplot_examples.Rmd’ using rmarkdown + + Quitting from lines 30-39 [yates] (desplot_examples.Rmd) + Error: processing vignette 'desplot_examples.Rmd' failed with diagnostics: + unused argument (dn) + --- failed re-building ‘desplot_examples.Rmd’ + + SUMMARY: processing the following file failed: + ‘desplot_examples.Rmd’ + + Error: Vignette re-building failed. + Execution halted ``` -# disto +# diceR
-* Version: 0.2.0 -* GitHub: https://github.com/talegari/disto -* Source code: https://github.com/cran/disto -* Date/Publication: 2018-08-02 12:50:02 UTC -* Number of recursive dependencies: 115 +* Version: 2.2.0 +* GitHub: https://github.com/AlineTalhouk/diceR +* Source code: https://github.com/cran/diceR +* Date/Publication: 2024-01-22 21:22:46 UTC +* Number of recursive dependencies: 155 -Run `revdepcheck::cloud_details(, "disto")` for more info +Run `revdepcheck::cloud_details(, "diceR")` for more info
@@ -5859,84 +5032,171 @@ Run `revdepcheck::cloud_details(, "disto")` for more info * checking examples ... ERROR ``` - Running examples in ‘disto-Ex.R’ failed + Running examples in ‘diceR-Ex.R’ failed The error most likely occurred in: - > ### Name: plot.disto - > ### Title: Plot a disto object - > ### Aliases: plot.disto + > ### Name: graphs + > ### Title: Graphical Displays + > ### Aliases: graphs graph_cdf graph_delta_area graph_heatmap graph_tracking + > ### graph_all > > ### ** Examples > - > temp <- stats::dist(iris[,1:4]) ... - > dio <- disto(objectname = "temp") - > plot(dio, type = "heatmap") - > plot(dio, type = "dendrogram") - Warning: The `` argument of `guides()` cannot be `FALSE`. Use "none" instead as - of ggplot2 3.3.4. - ℹ The deprecated feature was likely used in the factoextra package. - Please report the issue at . - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + 7. │ ├─purrr:::call_with_cleanup(...) + 8. │ └─diceR (local) .f(...) + 9. ├─base::loadNamespace(x) + 10. │ └─base (local) runHook(".onLoad", env, package.lib, package) + 11. │ └─base::stop(...) + 12. └─base::.handleSimpleError(...) + 13. └─purrr (local) h(simpleError(msg, call)) + 14. └─cli::cli_abort(...) + 15. └─rlang::abort(...) Execution halted ``` +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(diceR) + > + > test_check("diceR") + Selecting k and imputing non-clustered cases + Computing consensus functions + Evaluating output with consensus function results + ... + 18. │ └─base (local) runHook(".onLoad", env, package.lib, package) + 19. │ └─base::stop(...) + 20. └─base::.handleSimpleError(...) + 21. └─purrr (local) h(simpleError(msg, call)) + 22. └─cli::cli_abort(...) + 23. └─rlang::abort(...) + + [ FAIL 9 | WARN 7 | SKIP 0 | PASS 91 ] + Error: Test failures + Execution halted + ``` + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘vignette_disto.Rmd’ + when running code in ‘overview.Rmd’ ... + > hm <- graph_heatmap(pam.4) - > plot(dio, type = "dendrogram") - Warning: The `` argument of `guides()` cannot be `FALSE`. Use "none" instead as - of ggplot2 3.3.4. - ℹ The deprecated feature was likely used in the factoextra package. - Please report the issue at . - - When sourcing ‘vignette_disto.R’: - Error: argument is of length zero + When sourcing ‘overview.R’: + Error: ℹ In index: 1. + ℹ With name: PAM_Euclidean k=4. + Caused by error: + ! .onLoad failed in loadNamespace() for 'NMF', details: + call: is.element(models, models.wraps) + error: unused argument (models.wraps) Execution halted - ‘vignette_disto.Rmd’ using ‘UTF-8’... failed + ‘overview.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: ... - --- re-building ‘vignette_disto.Rmd’ using rmarkdown + --- re-building ‘overview.Rmd’ using rmarkdown - Quitting from lines 42-72 [unnamed-chunk-1] (vignette_disto.Rmd) - Error: processing vignette 'vignette_disto.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘vignette_disto.Rmd’ + Quitting from lines 169-170 [graph_heatmap] (overview.Rmd) + Error: processing vignette 'overview.Rmd' failed with diagnostics: + ℹ In index: 1. + ℹ With name: PAM_Euclidean k=4. + Caused by error: + ! .onLoad failed in loadNamespace() for 'NMF', details: + call: is.element(models, models.wraps) + error: unused argument (models.wraps) + --- failed re-building ‘overview.Rmd’ SUMMARY: processing the following file failed: - ‘vignette_disto.Rmd’ + ‘overview.Rmd’ Error: Vignette re-building failed. Execution halted ``` -## In both +# directlabels -* checking dependencies in R code ... NOTE +
+ +* Version: 2024.1.21 +* GitHub: https://github.com/tdhock/directlabels +* Source code: https://github.com/cran/directlabels +* Date/Publication: 2024-01-24 19:20:07 UTC +* Number of recursive dependencies: 81 + +Run `revdepcheck::cloud_details(, "directlabels")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR ``` - Namespaces in Imports field not imported from: - ‘dplyr’ ‘proxy’ - All declared Imports should be used. + Running examples in ‘directlabels-Ex.R’ failed + The error most likely occurred in: + + > ### Name: qp.labels + > ### Title: Make a Positioning Method for non-overlapping lineplot labels + > ### Aliases: qp.labels + > + > ### ** Examples + > + > SegCost$error <- factor(SegCost$error,c("FP","FN","E","I")) + ... + ! The `panel.margin` argument of `theme()` was deprecated in ggplot2 + 2.2.0 and is now defunct. + ℹ Please use the `panel.spacing` argument instead. + Backtrace: + ▆ + 1. └─ggplot2::theme(panel.margin = grid::unit(0, "lines")) + 2. └─lifecycle::deprecate_stop("2.2.0", "theme(panel.margin)", "theme(panel.spacing)") + 3. └─lifecycle:::deprecate_stop0(msg) + 4. └─rlang::cnd_signal(...) + Execution halted + ``` + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘examples.Rmd’ + ... + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + `geom_smooth()` using method = 'loess' and formula = 'y ~ x' + + When sourcing ‘examples.R’: + Error: Problem while computing stat. + ℹ Error occurred in the 3rd layer. + Caused by error in `get()`: + ! object 'last.qp' of mode 'function' was not found + Execution halted + + ‘examples.Rmd’... failed + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘examples.Rmd’ using knitr ``` # distributional
-* Version: 0.4.0 +* Version: 0.5.0 * GitHub: https://github.com/mitchelloharawild/distributional * Source code: https://github.com/cran/distributional -* Date/Publication: 2024-02-07 13:30:02 UTC -* Number of recursive dependencies: 64 +* Date/Publication: 2024-09-17 06:20:02 UTC +* Number of recursive dependencies: 120 Run `revdepcheck::cloud_details(, "distributional")` for more info @@ -5977,7 +5237,7 @@ Run `revdepcheck::cloud_details(, "distributional")` for more info * GitHub: https://github.com/dtm2451/dittoViz * Source code: https://github.com/cran/dittoViz * Date/Publication: 2024-02-02 00:00:12 UTC -* Number of recursive dependencies: 99 +* Number of recursive dependencies: 98 Run `revdepcheck::cloud_details(, "dittoViz")` for more info @@ -6018,34 +5278,34 @@ Run `revdepcheck::cloud_details(, "dittoViz")` for more info > library(testthat) > library(dittoViz) Loading required package: ggplot2 - > test_check("dittoViz") - [ FAIL 89 | WARN 2 | SKIP 0 | PASS 63 ] - ══ Failed tests ════════════════════════════════════════════════════════════════ + Attaching package: 'ggplot2' + + The following object is masked from 'package:base': ... - 6. └─dittoViz:::.yPlot_add_data_y_direction(...) - 7. └─ggplot2:::`+.gg`(p, do.call(geom_boxplot, boxplot.args)) - 8. └─ggplot2:::add_ggplot(e1, e2, e2name) - 9. ├─ggplot2::ggplot_add(object, p, objectname) - 10. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 11. └─ggplot2:::new_layer_names(object, names(plot$layers)) + 2. └─dittoViz::freqPlot(...) + 3. └─dittoViz::yPlot(...) + 4. └─dittoViz:::.warn_or_apply_plotly(p, plots) + 5. ├─plotly::ggplotly(p, tooltip = "text") + 6. └─plotly:::ggplotly.ggplot(p, tooltip = "text") + 7. └─plotly::gg2list(...) - [ FAIL 89 | WARN 2 | SKIP 0 | PASS 63 ] + [ FAIL 29 | WARN 0 | SKIP 0 | PASS 252 ] Error: Test failures Execution halted ``` -# dotwhisker +# divent
-* Version: 0.8.2 -* GitHub: https://github.com/fsolt/dotwhisker -* Source code: https://github.com/cran/dotwhisker -* Date/Publication: 2024-06-07 12:20:06 UTC -* Number of recursive dependencies: 72 +* Version: 0.4-4 +* GitHub: https://github.com/EricMarcon/divent +* Source code: https://github.com/cran/divent +* Date/Publication: 2024-11-06 16:10:08 UTC +* Number of recursive dependencies: 95 -Run `revdepcheck::cloud_details(, "dotwhisker")` for more info +Run `revdepcheck::cloud_details(, "divent")` for more info
@@ -6053,253 +5313,392 @@ Run `revdepcheck::cloud_details(, "dotwhisker")` for more info * checking examples ... ERROR ``` - Running examples in ‘dotwhisker-Ex.R’ failed + Running examples in ‘divent-Ex.R’ failed The error most likely occurred in: - > ### Name: small_multiple - > ### Title: Generate a 'Small Multiple' Plot of Regression Results - > ### Aliases: small_multiple + > ### Name: accum_div_phylo + > ### Title: Phylogenetic Diversity Accumulation of a Community + > ### Aliases: accum_div_phylo accum_ent_phylo accum_ent_phylo.numeric + > ### accum_ent_phylo.abundances accum_div_phylo.numeric + > ### accum_div_phylo.abundances > > ### ** Examples - > - > library(broom) ... - + m[[i]] <- update(m[[i-1]], paste(". ~ . +", ordered_vars[i])) - + m123456_df <- rbind(m123456_df, m[[i]] %>% tidy %>% by_2sd(mtcars) %>% - + mutate(model = paste("Model", i))) - + } - > - > # Generate a 'small multiple' plot - > small_multiple(m123456_df) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: small_multiple ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + 11. │ └─base::withCallingHandlers(...) + 12. └─ggplot2 (local) f(l = layers[[i]], d = data[[i]]) + 13. └─l$compute_geom_2(d, theme = plot$theme) + 14. └─ggplot2 (local) compute_geom_2(..., self = self) + 15. └─self$geom$use_defaults(...) + 16. └─ggplot2 (local) use_defaults(..., self = self) + 17. └─ggplot2:::check_aesthetics(new_params, nrow(data)) + 18. └─cli::cli_abort(...) + 19. └─rlang::abort(...) Execution halted ``` * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘dotwhisker-vignette.Rmd’ + when running code in ‘divent.Rmd’ ... - + wt = "Weight", cyl = "Cylinders", disp = "Displacement", - + .... [TRUNCATED] - > small_multiple(m123456_df) + theme_bw(base_size = 4) + - + ylab("Coefficient Estimate") + geom_hline(yintercept = 0, - + colour = "grey60", li .... [TRUNCATED] + > autoplot(paracou_6_abd[1, ]) - ... - - > small_multiple(results_df, show_stats = FALSE) + scale_x_discrete(limits = model_names) + - + theme_bw() + ylab("Coefficient Estimate") + geom_hl .... [TRUNCATED] - - When sourcing ‘kl2007_examples.R’: - Error: argument is of length zero + When sourcing ‘divent.R’: + Error: Problem while setting up geom aesthetics. + ℹ Error occurred in the 1st layer. + Caused by error in `check_aesthetics()`: + ! Aesthetics must be either length 1 or the same as the data (189). + ✖ Fix the following mappings: `shape` and `size`. Execution halted - ‘dotwhisker-vignette.Rmd’ using ‘UTF-8’... failed - ‘kl2007_examples.Rmd’ using ‘ASCII’... failed + ‘divent.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘dotwhisker-vignette.Rmd’ using rmarkdown + ... + --- re-building ‘divent.Rmd’ using rmarkdown + + Quitting from lines 59-60 [plot_paracou6] (divent.Rmd) + Error: processing vignette 'divent.Rmd' failed with diagnostics: + Problem while setting up geom aesthetics. + ℹ Error occurred in the 1st layer. + Caused by error in `check_aesthetics()`: + ! Aesthetics must be either length 1 or the same as the data (189). + ✖ Fix the following mappings: `shape` and `size`. + --- failed re-building ‘divent.Rmd’ + + SUMMARY: processing the following file failed: + ‘divent.Rmd’ + + Error: Vignette re-building failed. + Execution halted ``` -# DRomics +## In both + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘dbmss’ + ``` + +# doBy
-* Version: 2.5-2 -* GitHub: https://github.com/aursiber/DRomics -* Source code: https://github.com/cran/DRomics -* Date/Publication: 2024-01-31 09:30:02 UTC -* Number of recursive dependencies: 153 +* Version: 4.6.24 +* GitHub: https://github.com/hojsgaard/doBy +* Source code: https://github.com/cran/doBy +* Date/Publication: 2024-10-07 23:20:12 UTC +* Number of recursive dependencies: 84 -Run `revdepcheck::cloud_details(, "DRomics")` for more info +Run `revdepcheck::cloud_details(, "doBy")` for more info
## Newly broken +* checking whether package ‘doBy’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(substring(formc, ': unused argument (c("+", "-")) + See ‘/tmp/workdir/doBy/new/doBy.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + orderBy: possible error in is.element(substring(formc, 1, 1), c("+", + "-")): unused argument (c("+", "-")) + ``` + +## In both + * checking examples ... ERROR ``` - Running examples in ‘DRomics-Ex.R’ failed + Running examples in ‘doBy-Ex.R’ failed The error most likely occurred in: - > ### Name: PCAdataplot - > ### Title: Performs and plots the results of a PCA on omic data - > ### Aliases: PCAdataplot + > ### Name: by-order + > ### Title: Ordering (sorting) rows of a data frame + > ### Aliases: by-order order_by orderBy + > ### Keywords: utilities > > ### ** Examples > > - ... - Number of items: 100 - Identifiers of the first 20 items: - [1] "1" "2" "3" "4" "5.1" "6.1" "7.1" "8.1" "9.1" "10.1" - [11] "11.1" "12.1" "13.1" "14.1" "15" "16.1" "17.1" "18.1" "19.1" "20.1" - Data were normalized between arrays using the following method: cyclicloess - > plot(o) - > PCAdataplot(o) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: PCAdataplot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > orderBy(~ conc + Treatment, CO2) + Error in is.element(substring(formc, 1, 1), c("+", "-")) : + unused argument (c("+", "-")) + Calls: orderBy Execution halted ``` -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘DRomics_vignette.Rmd’ using rmarkdown - ``` - -## In both - * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘DRomics_vignette.Rmd’ + when running code in ‘doby.rmd’ ... - [16] "ENSDARG00000100660" "ENSDARG00000113107" "ENSDARG00000099787" - [19] "ENSDARG00000112451" "ENSDARG00000070546" - Data were normalized with respect to library size and tranformed using - the following method: rlog + > myfun1 <- function(x) { + + c(m = mean(x), s = sd(x)) + + } - > PCAdataplot(o, batch = zebraf$batch) + theme_bw() + > summaryBy(cbind(mpg, cyl, lh = log(hp)) ~ vs, data = mtcars, + + FUN = myfun1) - When sourcing ‘DRomics_vignette.R’: - Error: argument is of length zero + ... + > fm.mix <- lmer(uptake ~ conc + Treatment + Type + + + (1 | Plant), data = CO2.ubal) + + When sourcing ‘linest_lsmeans.R’: + Error: function 'cholmod_factor_ldetA' not provided by package 'Matrix' Execution halted - ‘DRomics_vignette.Rmd’ using ‘UTF-8’... failed + ‘doby.rmd’ using ‘UTF-8’... failed + ‘linest_lsmeans.rnw’ using ‘UTF-8’... failed + ‘section_fun.rmd’ using ‘UTF-8’... OK ``` * checking installed package size ... NOTE ``` - installed size is 6.2Mb + installed size is 8.2Mb sub-directories of 1Mb or more: - doc 2.9Mb + data 7.0Mb + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘doby.rmd’ using knitr + + Quitting from lines 70-75 [unnamed-chunk-4] (doby.rmd) + Error: processing vignette 'doby.rmd' failed with diagnostics: + unused argument (c("+", "-")) + --- failed re-building ‘doby.rmd’ + + --- re-building ‘linest_lsmeans.rnw’ using knitr + ... + --- failed re-building ‘linest_lsmeans.rnw’ + + --- re-building ‘section_fun.rmd’ using knitr + --- finished re-building ‘section_fun.rmd’ + + SUMMARY: processing the following files failed: + ‘doby.rmd’ ‘linest_lsmeans.rnw’ + + Error: Vignette re-building failed. + Execution halted ``` -# dtwclust +# DoseFinding
-* Version: 6.0.0 -* GitHub: https://github.com/asardaes/dtwclust -* Source code: https://github.com/cran/dtwclust -* Date/Publication: 2024-07-23 08:50:02 UTC -* Number of recursive dependencies: 96 +* Version: 1.2-1 +* GitHub: https://github.com/openpharma/DoseFinding +* Source code: https://github.com/cran/DoseFinding +* Date/Publication: 2024-08-23 16:20:09 UTC +* Number of recursive dependencies: 103 -Run `revdepcheck::cloud_details(, "dtwclust")` for more info +Run `revdepcheck::cloud_details(, "DoseFinding")` for more info
## Newly broken +* checking examples ... ERROR + ``` + Running examples in ‘DoseFinding-Ex.R’ failed + The error most likely occurred in: + + > ### Name: DoseFinding-package + > ### Title: DoseFinding: Planning and Analyzing Dose Finding Experiments + > ### Aliases: DoseFinding DoseFinding-package + > ### Keywords: internal + > + > ### ** Examples + > + ... + > data(IBScovars) + > + > ## perform (model based) multiple contrast test + > ## define candidate dose-response shapes + > models <- Mods(linear = NULL, emax = 0.2, quadratic = -0.17, + + doses = c(0, 1, 2, 3, 4)) + Error in is.element(x, c("emax", "quadratic", "exponential")) : + unused argument (c("emax", "quadratic", "exponential")) + Calls: Mods -> fullMod -> modCount -> lapply -> FUN + Execution halted + ``` + * checking tests ... ERROR ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. + Running ‘testgFit.R’ + Running the tests in ‘tests/testgFit.R’ failed. Complete output: - > library(dtwclust) - Loading required package: proxy - - Attaching package: 'proxy' - - The following objects are masked from 'package:stats': - - ... - 7. └─dtwclust (local) .local(x, y = y, ...) - 8. └─ggplot2:::`+.gg`(gg, do_call(ggrepel::geom_label_repel, labels)) - 9. └─ggplot2:::add_ggplot(e1, e2, e2name) - 10. ├─ggplot2::ggplot_add(object, p, objectname) - 11. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 12. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 1 | WARN 0 | SKIP 15 | PASS 1930 ] - Error: Test failures + > require("DoseFinding") + Loading required package: DoseFinding + > data(IBScovars) + > lmfit <- lm(resp~factor(dose)+gender, data=IBScovars) + > cf <- coef(lmfit)[-c(6)] + > vcv <- vcov(lmfit)[-c(6), -c(6)] + > lmfit2 <- lm(resp~as.factor(dose)-1+gender, data=IBScovars) + > cf2 <- coef(lmfit2)[-c(6)] + > vcv2 <- vcov(lmfit2)[-c(6), -c(6)] + > dose <- c(0:4) + > + > ## test fitting all available models + > fitMod(dose[-1], cf[-1], S=vcv[-1,-1], model="linear", placAdj=TRUE,type="general") + Error in is.element(modelNum, 1:4) : unused argument (1:4) + Calls: fitMod -> fitMod.raw Execution halted ``` -## In both - -* checking re-building of vignette outputs ... WARNING +* checking running R code from vignettes ... ERROR ``` - Error(s) in re-building vignettes: - --- re-building ‘parallelization-considerations.Rmd’ using rmarkdown_notangle - --- finished re-building ‘parallelization-considerations.Rmd’ + Errors in running code in vignettes: + when running code in ‘analysis_normal.Rmd’ + ... + + > doses <- c(0, 12.5, 25, 50, 100) + + > mods <- Mods(emax = c(2.6, 12.5), sigEmax = c(30.5, + + 3.5), quadratic = -0.00776, placEff = 1.25, maxEff = 0.15, + + doses = doses) + + ... + When sourcing ‘sample_size.R’: + Error: unused argument (c("emax", "quadratic", "exponential")) + Execution halted - --- re-building ‘timing-experiments.Rmd’ using rmarkdown_notangle + ‘analysis_normal.Rmd’ using ‘UTF-8’... failed + ‘binary_data.Rmd’ using ‘UTF-8’... failed + ‘faq.Rmd’ using ‘UTF-8’... OK + ‘mult_regimen.Rmd’ using ‘UTF-8’... failed + ‘overview.Rmd’ using ‘UTF-8’... failed + ‘sample_size.Rmd’ using ‘UTF-8’... failed ``` -* checking installed package size ... NOTE +* checking whether package ‘DoseFinding’ can be installed ... WARNING ``` - installed size is 15.5Mb - sub-directories of 1Mb or more: - R 1.5Mb - doc 2.1Mb - libs 11.1Mb + Found the following significant warnings: + Note: possible error in 'is.element(modelNum, ': unused argument (1:4) + Note: possible error in 'is.element(names(data), ': unused argument (usedVars) + Note: possible error in 'is.element(nm, c("emax", ': unused argument (c("emax", "exponential", "quadratic")) + Note: possible error in 'is.element(nm, c("logistic", ': unused argument (c("logistic", "betaMod", "sigEmax")) + Note: possible error in 'is.element(type, c("TD", ': unused argument (c("TD", "ED")) + Note: possible error in 'is.element(x, c("emax", ': unused argument (c("emax", "quadratic", "exponential")) + Note: possible error in 'is.element(x, c("sigEmax", ': unused argument (c("sigEmax", "logistic", "betaMod")) + Note: possible error in 'is.element(optimizer, ': unused argument (c("Nelder-Mead", "nlminb")) + Note: possible error in 'is.element(model, "linInt")': unused argument ("linInt") + ... + Note: possible error in 'is.element("S", namargs)': unused argument (namargs) + Note: possible error in 'is.element("df", namargs)': unused argument (namargs) + Note: possible error in 'is.element("n", namargs)': unused argument (namargs) + Note: possible error in 'is.element("sigma", namargs)': unused argument (namargs) + Note: possible error in 'is.element(tms, names(newdata))': unused argument (names(newdata)) + Note: possible error in 'is.element(model, c("logistic", ': unused argument (c("logistic", "linlog")) + See ‘/tmp/workdir/DoseFinding/new/DoseFinding.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + fitMod.raw: possible error in is.element(modelNum, 1:4): unused + argument (1:4) + fitMod.raw: possible error in is.element(names(data), usedVars): unused + argument (usedVars) + fullMod: possible error in is.element(nm, c("emax", "exponential", + "quadratic")): unused argument (c("emax", "exponential", + "quadratic")) + fullMod: possible error in is.element(nm, c("logistic", "betaMod", + "sigEmax")): unused argument (c("logistic", "betaMod", "sigEmax")) + getSimEst: possible error in is.element(type, c("TD", "ED")): unused + ... + sampSizeMCT: possible error in is.element("placAdj", namargs): unused + argument (namargs) + sampSizeMCT: possible error in is.element("S", namargs): unused + argument (namargs) + sampSizeMCT: possible error in is.element("df", namargs): unused + argument (namargs) + sampSizeMCT: possible error in is.element("n", namargs): unused + argument (namargs) + sampSizeMCT: possible error in is.element("sigma", namargs): unused + argument (namargs) ``` -* checking for GNU extensions in Makefiles ... NOTE +* checking re-building of vignette outputs ... NOTE ``` - GNU make is a SystemRequirements. + Error(s) in re-building vignettes: + --- re-building ‘analysis_normal.Rmd’ using rmarkdown ``` -# duke +# dotsViolin
-* Version: 0.0.3 -* GitHub: https://github.com/aidangildea/duke -* Source code: https://github.com/cran/duke -* Date/Publication: 2023-12-15 21:50:16 UTC -* Number of recursive dependencies: 89 +* Version: 0.0.1 +* GitHub: NA +* Source code: https://github.com/cran/dotsViolin +* Date/Publication: 2023-10-30 13:20:02 UTC +* Number of recursive dependencies: 39 -Run `revdepcheck::cloud_details(, "duke")` for more info +Run `revdepcheck::cloud_details(, "dotsViolin")` for more info
## Newly broken -* checking tests ... ERROR +* checking examples ... ERROR ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > # This file is part of the standard setup for testthat. - > # It is recommended that you do not modify it. - > # - > # Where should you do additional test configuration? - > # Learn more about the roles of various files in: - > # * https://r-pkgs.org/tests.html - > # * https://testthat.r-lib.org/reference/test_package.html#special-files + Running examples in ‘dotsViolin-Ex.R’ failed + The error most likely occurred in: + + > ### Name: dots_and_violin + > ### Title: Makes a composite dot-plot and violin-plot + > ### Aliases: dots_and_violin + > ### Keywords: dot-plot violin-plot + > + > ### ** Examples + > ... - 2. │ └─testthat:::expect_condition_matching(...) - 3. │ └─testthat:::quasi_capture(...) - 4. │ ├─testthat (local) .capture(...) - 5. │ │ └─base::withCallingHandlers(...) - 6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) - 7. └─testthat::expect_equal(ggplot2::layer_data(p3)$fill[9], "#B5B5B5") - - [ FAIL 1 | WARN 9 | SKIP 0 | PASS 27 ] - Error: Test failures - Execution halted + 29. │ └─ggplot2 (local) draw_group(...) + 30. │ ├─ggplot2:::ggname(...) + 31. │ │ └─grid::grobName(grob, prefix) + 32. │ └─ggplot2:::dotstackGrob(...) + 33. └─base::.handleSimpleError(...) + 34. └─rlang (local) h(simpleError(msg, call)) + 35. └─handlers[[1L]](cnd) + 36. └─cli::cli_abort(...) + 37. └─rlang::abort(...) + Execution halted ``` -# easysurv +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 2 marked UTF-8 strings + ``` + +# dr4pl
-* Version: 2.0.1 -* GitHub: https://github.com/Maple-Health-Group/easysurv -* Source code: https://github.com/cran/easysurv -* Date/Publication: 2024-06-21 10:30:06 UTC -* Number of recursive dependencies: 156 +* Version: 2.0.0 +* GitHub: NA +* Source code: https://github.com/cran/dr4pl +* Date/Publication: 2021-08-17 16:10:18 UTC +* Number of recursive dependencies: 149 -Run `revdepcheck::cloud_details(, "easysurv")` for more info +Run `revdepcheck::cloud_details(, "dr4pl")` for more info
@@ -6307,77 +5706,106 @@ Run `revdepcheck::cloud_details(, "easysurv")` for more info * checking examples ... ERROR ``` - Running examples in ‘easysurv-Ex.R’ failed + Running examples in ‘dr4pl-Ex.R’ failed The error most likely occurred in: - > ### Name: get_km - > ### Title: Generate Kaplan-Meier estimates - > ### Aliases: get_km + > ### Name: IC + > ### Title: Obtain Inhibitory Concentrations (IC) of a dose-response curve + > ### Aliases: IC > > ### ** Examples > - > km_results <- get_km( - ... - Poor Poor 228 145 3.101736 0.1772520 2.183562 1.978082 2.619178 - Median follow-up - Good 4.452055 - Medium 4.712329 - Poor 4.115068 - - Error in .construct_risktable(x, geom_blank.times = NULL, geom_blank.risktable_stats = "{n.risk}", : - argument "risktable_height" is missing, with no default - Calls: ... ggsurvfit_build -> -> .construct_risktable + > data.test <- data.frame(x = c(0.0001, 0.001, 0.01, 0.1, 1), + + y = c(10, 9, 5, 1, 0)) + > obj.dr4pl <- dr4pl(y ~ x, + + data = data.test) + Error in is.element(method.init, types.method.init) : + unused argument (types.method.init) + Calls: dr4pl -> dr4pl.formula -> dr4pl.default Execution halted ``` * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘easysurv.Rmd’ + when running code in ‘walk_through_in_R.Rmd’ ... - Median follow-up - Tab+Vis 2.217659 - Tab->Vis 2.220397 - Tab 2.308008 - Vis 2.198494 + + }, warning = function(war) { + + print(paste(sep = " ", war)) + + }, error .... [TRUNCATED] + [1] "simpleWarning in log(dose/parmMat[, 4]): NaNs produced\n" + > dr4pl.error.1 <- dr4pl(Response ~ Dose, data = drc_error_1) - When sourcing ‘easysurv.R’: - Error: argument "risktable_height" is missing, with no default + When sourcing ‘walk_through_in_R.R’: + Error: unused argument (types.method.init) Execution halted - ‘easysurv.Rmd’ using ‘UTF-8’... failed + ‘dr4pl_derivatives.Rmd’ using ‘UTF-8’... OK + ‘walk_through_in_R.Rmd’ using ‘UTF-8’... failed + ``` + +* checking whether package ‘dr4pl’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(trend, types.trend)': unused argument (types.trend) + Note: possible error in 'is.element(method.init, ': unused argument (types.method.init) + Note: possible error in 'is.element(method.robust, ': unused argument (types.method.robust) + Note: possible error in 'is.element(method.optim, ': unused argument (types.method.optim) + Note: possible error in 'is.element(method.robust, ': unused argument (c("absolute", "Huber")) + See ‘/tmp/workdir/dr4pl/new/dr4pl.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + FindInitialParms: possible error in is.element(trend, types.trend): + unused argument (types.trend) + FindInitialParms: possible error in is.element(method.init, + types.method.init): unused argument (types.method.init) + FindInitialParms: possible error in is.element(method.robust, + types.method.robust): unused argument (types.method.robust) + dr4pl.default: possible error in is.element(method.init, + types.method.init): unused argument (types.method.init) + dr4pl.default: possible error in is.element(method.optim, + types.method.optim): unused argument (types.method.optim) + dr4pl.default: possible error in is.element(trend, types.trend): unused + argument (types.trend) + dr4pl.default: possible error in is.element(method.robust, + c("absolute", "Huber")): unused argument (c("absolute", "Huber")) ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - ... - --- re-building ‘easysurv.Rmd’ using rmarkdown - - Quitting from lines 149-157 [km] (easysurv.Rmd) - Error: processing vignette 'easysurv.Rmd' failed with diagnostics: - argument "risktable_height" is missing, with no default - --- failed re-building ‘easysurv.Rmd’ - - SUMMARY: processing the following file failed: - ‘easysurv.Rmd’ + --- re-building ‘dr4pl_derivatives.Rmd’ using rmarkdown + --- finished re-building ‘dr4pl_derivatives.Rmd’ - Error: Vignette re-building failed. - Execution halted + --- re-building ‘walk_through_in_R.Rmd’ using rmarkdown + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) confint.dr4pl.Rd:49: Escaped LaTeX specials: \& + checkRd: (-1) gof-dr4pl.Rd:40: Escaped LaTeX specials: \& + checkRd: (-1) vcov.dr4pl.Rd:61: Escaped LaTeX specials: \& ``` -# EGAnet +# DRomics
-* Version: 2.0.7 -* GitHub: https://github.com/hfgolino/EGAnet -* Source code: https://github.com/cran/EGAnet -* Date/Publication: 2024-09-02 20:00:01 UTC -* Number of recursive dependencies: 190 +* Version: 2.6-2 +* GitHub: https://github.com/lbbe-software/DRomics +* Source code: https://github.com/cran/DRomics +* Date/Publication: 2024-10-16 09:50:02 UTC +* Number of recursive dependencies: 151 -Run `revdepcheck::cloud_details(, "EGAnet")` for more info +Run `revdepcheck::cloud_details(, "DRomics")` for more info
@@ -6385,50 +5813,156 @@ Run `revdepcheck::cloud_details(, "EGAnet")` for more info * checking examples ... ERROR ``` - Running examples in ‘EGAnet-Ex.R’ failed + Running examples in ‘DRomics-Ex.R’ failed The error most likely occurred in: - > ### Name: dimensionStability - > ### Title: Dimension Stability Statistics from 'bootEGA' - > ### Aliases: dimensionStability + > ### Name: bmdfilter + > ### Title: Filtering BMDs according to estimation quality + > ### Aliases: bmdfilter > > ### ** Examples > - > # Load data + > ... - 16. │ └─e1 %+% e2 - 17. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 18. │ ├─ggplot2::ggplot_add(object, p, objectname) - 19. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 20. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 21. └─base::.handleSimpleError(...) - 22. └─purrr (local) h(simpleError(msg, call)) - 23. └─cli::cli_abort(...) - 24. └─rlang::abort(...) + > + > ### (1.a) Examples on BMD.xfold (with some undefined BMD.xfold values) + > + > # Plot of BMDs with no filtering + > subres <- bmdfilter(b$res, BMDfilter = "none") + > bmdplot(subres, BMDtype = "xfold", point.size = 3, add.CI = TRUE) + Error in is.element(c("id", "BMD.xfold"), cnames) : + unused argument (cnames) + Calls: bmdplot Execution halted ``` +* checking whether package ‘DRomics’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(c("BMD.zSD"), ': unused argument (cnames) + Note: possible error in 'is.element(c("BMD.zSD.upper", ': unused argument (cnames) + Note: possible error in 'is.element(c("BMD.xfold"), ': unused argument (cnames) + Note: possible error in 'is.element(c("BMD.xfold.upper", ': unused argument (cnames) + Note: possible error in 'is.element(c("id", "BMD.zSD"), ': unused argument (cnames) + Note: possible error in 'is.element(c("id", "BMD.xfold"), ': unused argument (cnames) + Note: possible error in 'is.element(shapeby, cnames)': unused argument (cnames) + Note: possible error in 'is.element(colorby, cnames)': unused argument (cnames) + Note: possible error in 'is.element(facetby, cnames)': unused argument (cnames) + ... + Note: possible error in 'is.element(c("id", "model", ': unused argument (cnames) + Note: possible error in 'is.element(c("BMD.zSD", ': unused argument (cnames) + Note: possible error in 'is.element(c("BMD.xfold", ': unused argument (cnames) + Note: possible error in 'is.element(group, cnames)': unused argument (cnames) + Note: possible error in 'is.element(explev, cnames)': unused argument (cnames) + Note: possible error in 'is.element(c("trend"), ': unused argument (cnames) + See ‘/tmp/workdir/DRomics/new/DRomics.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + bmdfilter: possible error in is.element(c("BMD.zSD"), cnames): unused + argument (cnames) + bmdfilter: possible error in is.element(c("BMD.zSD.upper", + "BMD.zSD.lower"), cnames): unused argument (cnames) + bmdfilter: possible error in is.element(c("BMD.xfold"), cnames): unused + argument (cnames) + bmdfilter: possible error in is.element(c("BMD.xfold.upper", + "BMD.xfold.lower"), cnames): unused argument (cnames) + bmdplot: possible error in is.element(c("id", "BMD.zSD"), cnames): + unused argument (cnames) + ... + sensitivityplot: possible error in is.element(group, cnames): unused + argument (cnames) + sensitivityplot: possible error in is.element(colorby, cnames): unused + argument (cnames) + trendplot: possible error in is.element(group, cnames): unused argument + (cnames) + trendplot: possible error in is.element(c("trend"), cnames): unused + argument (cnames) + trendplot: possible error in is.element(facetby, cnames): unused + argument (cnames) + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘DRomics_vignette.Rmd’ using rmarkdown + ``` + ## In both +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘DRomics_vignette.Rmd’ + ... + 6 8.90 5.47 8.19 + + > plot(r, BMDtype = "zSD", plottype = "ecdf") + theme_bw() + + > bmdplotwithgradient(r$res, BMDtype = "zSD", facetby = "trend", + + shapeby = "model", line.size = 1.2, scaling = TRUE) + + When sourcing ‘DRomics_vignette.R’: + Error: unused argument (cnames) + Execution halted + + ‘DRomics_vignette.Rmd’ using ‘UTF-8’... failed + ``` + * checking installed package size ... NOTE ``` - installed size is 5.6Mb + installed size is 5.8Mb sub-directories of 1Mb or more: - R 1.5Mb - data 3.5Mb + doc 2.5Mb ``` -# EGM +# drpop
-* Version: 0.1.0 -* GitHub: https://github.com/shah-in-boots/EGM -* Source code: https://github.com/cran/EGM -* Date/Publication: 2024-05-23 16:10:05 UTC -* Number of recursive dependencies: 77 +* Version: 0.0.3 +* GitHub: NA +* Source code: https://github.com/cran/drpop +* Date/Publication: 2021-11-05 21:10:02 UTC +* Number of recursive dependencies: 78 -Run `revdepcheck::cloud_details(, "EGM")` for more info +Run `revdepcheck::cloud_details(, "drpop")` for more info + +
+ +## Newly broken + +* checking whether package ‘drpop’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(condvar, colnames(data))': unused argument (colnames(data)) + See ‘/tmp/workdir/drpop/new/drpop.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + popsize_cond: possible error in is.element(condvar, colnames(data)): + unused argument (colnames(data)) + ``` + +# duke + +
+ +* Version: 0.0.3 +* GitHub: https://github.com/aidangildea/duke +* Source code: https://github.com/cran/duke +* Date/Publication: 2023-12-15 21:50:16 UTC +* Number of recursive dependencies: 88 + +Run `revdepcheck::cloud_details(, "duke")` for more info
@@ -6439,128 +5973,136 @@ Run `revdepcheck::cloud_details(, "EGM")` for more info Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: - > library(testthat) - > library(EGM) - Loading required package: vctrs - Loading required package: data.table - > EGM::set_wfdb_path("/usr/local/bin") - > - > test_check("EGM") + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/tests.html + > # * https://testthat.r-lib.org/reference/test_package.html#special-files ... - ══ Failed tests ════════════════════════════════════════════════════════════════ - ── Failure ('test-ggm.R:63:2'): theming works ────────────────────────────────── - g$labels$x (`actual`) not equal to "sample" (`expected`). - - `actual` is NULL - `expected` is a character vector ('sample') + 2. │ └─testthat:::expect_condition_matching(...) + 3. │ └─testthat:::quasi_capture(...) + 4. │ ├─testthat (local) .capture(...) + 5. │ │ └─base::withCallingHandlers(...) + 6. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 7. └─testthat::expect_equal(ggplot2::layer_data(p3)$fill[9], "#B5B5B5") - [ FAIL 1 | WARN 0 | SKIP 19 | PASS 43 ] + [ FAIL 1 | WARN 9 | SKIP 0 | PASS 27 ] Error: Test failures Execution halted ``` -# emmeans +# dymo
-* Version: 1.10.4 -* GitHub: https://github.com/rvlenth/emmeans -* Source code: https://github.com/cran/emmeans -* Date/Publication: 2024-08-21 03:00:01 UTC -* Number of recursive dependencies: 159 +* Version: 1.1.0 +* GitHub: NA +* Source code: https://github.com/cran/dymo +* Date/Publication: 2022-05-05 08:00:02 UTC +* Number of recursive dependencies: 147 -Run `revdepcheck::cloud_details(, "emmeans")` for more info +Run `revdepcheck::cloud_details(, "dymo")` for more info
## Newly broken -* checking examples ... ERROR +* checking whether package ‘dymo’ can be installed ... WARNING ``` - Running examples in ‘emmeans-Ex.R’ failed - The error most likely occurred in: - - > ### Name: auto.noise - > ### Title: Auto Pollution Filter Noise - > ### Aliases: auto.noise - > ### Keywords: datasets - > - > ### ** Examples - > - > # (Based on belief that noise/10 is in decibel units) - > noise.lm <- lm(noise/10 ~ size * type * side, data = auto.noise) - > - > # Interaction plot of predictions - > emmip(noise.lm, type ~ size | side) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: emmip ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted + Found the following significant warnings: + Warning: replacing previous import ‘ggplot2::is.scale’ by ‘greybox::is.scale’ when loading ‘dymo’ + See ‘/tmp/workdir/dymo/new/dymo.Rcheck/00install.out’ for details. + ``` + +# dynr + +
+ +* Version: 0.1.16-105 +* GitHub: https://github.com/mhunter1/dynr +* Source code: https://github.com/cran/dynr +* Date/Publication: 2023-11-28 05:20:05 UTC +* Number of recursive dependencies: 148 + +Run `revdepcheck::cloud_details(, "dynr")` for more info + +
+ +## Newly broken + +* checking whether package ‘dynr’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(id, id_toplot)': unused argument (id_toplot) + See ‘/tmp/workdir/dynr/new/dynr.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + autoplot.dynrTaste: possible error in is.element(id, id_toplot): unused + argument (id_toplot) ``` ## In both -* checking running R code from vignettes ... ERROR +* checking Rd files ... WARNING ``` - Errors in running code in vignettes: - when running code in ‘basics.Rmd’ - ... - 'emmGrid' object with variables: - source = fish, soy, skim - percent = 9, 12, 15, 18 - Transformation: “inverse” - - > emmip(RG4, source ~ percent, style = "factor") - - ... - ‘messy-data.Rmd’ using ‘UTF-8’... failed - ‘models.Rmd’ using ‘UTF-8’... OK - ‘predictions.Rmd’ using ‘UTF-8’... failed - ‘re-engineering-clds.rmd’ using ‘UTF-8’... OK - ‘sophisticated.Rmd’ using ‘UTF-8’... failed - ‘transformations.Rmd’ using ‘UTF-8’... failed - ‘utilities.Rmd’ using ‘UTF-8’... OK - ‘vignette-topics.Rmd’ using ‘UTF-8’... OK - ‘xplanations.Rmd’ using ‘UTF-8’... failed - ‘xtending.Rmd’ using ‘UTF-8’... OK + prepare_Rd: ABI version mismatch: + lme4 was built with Matrix ABI version 1 + Current Matrix ABI version is 0 + Please re-install lme4 from source or restore original ‘Matrix’ package ``` -* checking package dependencies ... NOTE +* checking installed package size ... NOTE ``` - Packages which this enhances but not available for checking: - 'CARBayes', 'coxme', 'gee', 'geepack', 'MCMCglmm', 'MCMCpack', - 'mice', 'pscl', 'rstanarm', 'sommer' + installed size is 10.1Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 6.0Mb + doc 1.4Mb ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘AQuickStart.Rmd’ using rmarkdown - --- finished re-building ‘AQuickStart.Rmd’ + --- re-building ‘linearSDE.Rmd’ using rmarkdown + --- finished re-building ‘linearSDE.Rmd’ - --- re-building ‘FAQs.Rmd’ using rmarkdown - --- finished re-building ‘FAQs.Rmd’ + --- re-building ‘InstallationForDevelopers.Rnw’ using Sweave + Error: processing vignette 'InstallationForDevelopers.Rnw' failed with diagnostics: + Running 'texi2dvi' on 'InstallationForDevelopers.tex' failed. + LaTeX errors: + ! LaTeX Error: File `menukeys.sty' not found. - --- re-building ‘basics.Rmd’ using rmarkdown + ... + {bm}%bm^^M + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘NonlinearContinuousTimeModels.Rnw’ - Quitting from lines 260-262 [unnamed-chunk-13] (basics.Rmd) - Error: processing vignette 'basics.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘basics.Rmd’ + SUMMARY: processing the following files failed: + ‘InstallationForDevelopers.Rnw’ ‘InstallationForUsers.Rnw’ + ‘LinearDiscreteTimeModels.Rnw’ ‘NonlinearContinuousTimeModels.Rnw’ - --- re-building ‘comparisons.Rmd’ using rmarkdown + Error: Vignette re-building failed. + Execution halted ``` -# EMMIXmfa +# easysurv
-* Version: 2.0.14 -* GitHub: https://github.com/suren-rathnayake/EMMIXmfa -* Source code: https://github.com/cran/EMMIXmfa -* Date/Publication: 2024-01-25 20:30:02 UTC -* Number of recursive dependencies: 59 +* Version: 2.0.1 +* GitHub: https://github.com/Maple-Health-Group/easysurv +* Source code: https://github.com/cran/easysurv +* Date/Publication: 2024-06-21 10:30:06 UTC +* Number of recursive dependencies: 155 -Run `revdepcheck::cloud_details(, "EMMIXmfa")` for more info +Run `revdepcheck::cloud_details(, "easysurv")` for more info
@@ -6568,29 +6110,107 @@ Run `revdepcheck::cloud_details(, "EMMIXmfa")` for more info * checking examples ... ERROR ``` - Running examples in ‘EMMIXmfa-Ex.R’ failed + Running examples in ‘easysurv-Ex.R’ failed The error most likely occurred in: - > ### Name: factor_scores - > ### Title: Computes Factor Scores - > ### Aliases: factor_scores factor_scores.mcfa factor_scores.mctfa - > ### plot.emmix - > ### Keywords: cluster multivariate models + > ### Name: get_km + > ### Title: Generate Kaplan-Meier estimates + > ### Aliases: get_km > > ### ** Examples - ... - > Y <- iris[-c(sel_subset), -5] - > Y <- as.matrix(Y) - > clust <- predict(model, Y) > - > fa_scores <- factor_scores(model, Y) - > # Visualizing new data in factor space - > plot_factors(fa_scores, type = "Umean", clust = clust) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot_factors ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > km_results <- get_km( + ... + Poor Poor 228 145 3.101736 0.1772520 2.183562 1.978082 2.619178 + Median follow-up + Good 4.452055 + Medium 4.712329 + Poor 4.115068 + + Error in .construct_risktable(x, geom_blank.times = NULL, geom_blank.risktable_stats = "{n.risk}", : + argument "risktable_height" is missing, with no default + Calls: ... ggsurvfit_build -> -> .construct_risktable + Execution halted + ``` + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘easysurv.Rmd’ + ... + Median follow-up + Tab+Vis 2.217659 + Tab->Vis 2.220397 + Tab 2.308008 + Vis 2.198494 + + + When sourcing ‘easysurv.R’: + Error: argument "risktable_height" is missing, with no default + Execution halted + + ‘easysurv.Rmd’ using ‘UTF-8’... failed + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘easysurv.Rmd’ using rmarkdown + + Quitting from lines 149-157 [km] (easysurv.Rmd) + Error: processing vignette 'easysurv.Rmd' failed with diagnostics: + argument "risktable_height" is missing, with no default + --- failed re-building ‘easysurv.Rmd’ + + SUMMARY: processing the following file failed: + ‘easysurv.Rmd’ + + Error: Vignette re-building failed. Execution halted ``` +# EGM + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/shah-in-boots/EGM +* Source code: https://github.com/cran/EGM +* Date/Publication: 2024-05-23 16:10:05 UTC +* Number of recursive dependencies: 76 + +Run `revdepcheck::cloud_details(, "EGM")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(EGM) + Loading required package: vctrs + Loading required package: data.table + > EGM::set_wfdb_path("/usr/local/bin") + > + > test_check("EGM") + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-ggm.R:63:2'): theming works ────────────────────────────────── + g$labels$x (`actual`) not equal to "sample" (`expected`). + + `actual` is NULL + `expected` is a character vector ('sample') + + [ FAIL 1 | WARN 0 | SKIP 19 | PASS 43 ] + Error: Test failures + Execution halted + ``` + # entropart
@@ -6599,7 +6219,7 @@ Run `revdepcheck::cloud_details(, "EMMIXmfa")` for more info * GitHub: https://github.com/EricMarcon/entropart * Source code: https://github.com/cran/entropart * Date/Publication: 2024-08-26 19:30:09 UTC -* Number of recursive dependencies: 125 +* Number of recursive dependencies: 128 Run `revdepcheck::cloud_details(, "entropart")` for more info @@ -6673,57 +6293,6 @@ Run `revdepcheck::cloud_details(, "entropart")` for more info Execution halted ``` -# EnvStats - -
- -* Version: 3.0.0 -* GitHub: https://github.com/alexkowa/EnvStats -* Source code: https://github.com/cran/EnvStats -* Date/Publication: 2024-08-24 23:10:05 UTC -* Number of recursive dependencies: 79 - -Run `revdepcheck::cloud_details(, "EnvStats")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘EnvStats-Ex.R’ failed - The error most likely occurred in: - - > ### Name: geom_stripchart - > ### Title: 1-D Scatter Plots with Confidence Intervals Using ggplot2 - > ### Aliases: geom_stripchart - > ### Keywords: hplot htest - > - > ### ** Examples - > - ... - > - > p + geom_stripchart() + - + labs(x = "Number of Cylinders", y = "Miles per Gallon") - Warning: The `fun.y` argument of `stat_summary()` is deprecated as of ggplot2 3.3.0. - ℹ Please use the `fun` argument instead. - ℹ The deprecated feature was likely used in the EnvStats package. - Please report the issue to the authors. - Error in if (new_name %in% existing) { : argument is of length zero - Calls: +.gg ... ggplot_add.list -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 7.8Mb - sub-directories of 1Mb or more: - R 3.5Mb - help 3.5Mb - ``` - # epiCleanr
@@ -6732,7 +6301,7 @@ Run `revdepcheck::cloud_details(, "EnvStats")` for more info * GitHub: https://github.com/truenomad/epiCleanr * Source code: https://github.com/cran/epiCleanr * Date/Publication: 2023-09-28 12:20:05 UTC -* Number of recursive dependencies: 130 +* Number of recursive dependencies: 129 Run `revdepcheck::cloud_details(, "epiCleanr")` for more info @@ -6820,11 +6389,11 @@ Run `revdepcheck::cloud_details(, "epiphy")` for more info
-* Version: 0.4.0 +* Version: 0.5.0 * GitHub: NA * Source code: https://github.com/cran/EQUALSTATS -* Date/Publication: 2024-09-06 16:10:15 UTC -* Number of recursive dependencies: 120 +* Date/Publication: 2024-09-23 08:30:02 UTC +* Number of recursive dependencies: 131 Run `revdepcheck::cloud_details(, "EQUALSTATS")` for more info @@ -6864,17 +6433,17 @@ Run `revdepcheck::cloud_details(, "EQUALSTATS")` for more info Package unavailable to check Rd xrefs: ‘lmerTest’ ``` -# ergm.multi +# esci
-* Version: 0.2.1 -* GitHub: https://github.com/statnet/ergm.multi -* Source code: https://github.com/cran/ergm.multi -* Date/Publication: 2024-02-20 23:20:05 UTC -* Number of recursive dependencies: 82 +* Version: 1.0.6 +* GitHub: https://github.com/rcalinjageman/esci +* Source code: https://github.com/cran/esci +* Date/Publication: 2024-12-21 16:00:02 UTC +* Number of recursive dependencies: 92 -Run `revdepcheck::cloud_details(, "ergm.multi")` for more info +Run `revdepcheck::cloud_details(, "esci")` for more info
@@ -6882,91 +6451,13 @@ Run `revdepcheck::cloud_details(, "ergm.multi")` for more info * checking examples ... ERROR ``` - Running examples in ‘ergm.multi-Ex.R’ failed + Running examples in ‘esci-Ex.R’ failed The error most likely occurred in: - > ### Name: gofN - > ### Title: Linear model diagnostics for multinetwork linear models - > ### Aliases: gofN [.gofN augment.gofN summary.gofN - > - > ### ** Examples - > - > data(samplk) - ... - > - > ### If 'ggplot2' and 'ggrepel' are installed, illustrate the autoplot() method. - > if(require("ggplot2") && requireNamespace("ggrepel")){ - + autoplot(fit.gof) - + } - Loading required package: ggplot2 - Loading required namespace: ggrepel - Error in if (new_name %in% existing) { : argument is of length zero - Calls: autoplot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘Goeyvaerts_reproduction.Rmd’ - ... - [1] 0.9763295 - - - - > autoplot(gof.wd) - Loading required namespace: ggrepel - - When sourcing ‘Goeyvaerts_reproduction.R’: - Error: argument is of length zero - Execution halted - - ‘Goeyvaerts_reproduction.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘Goeyvaerts_reproduction.Rmd’ using rmarkdown - - Quitting from lines 157-158 [unnamed-chunk-16] (Goeyvaerts_reproduction.Rmd) - Error: processing vignette 'Goeyvaerts_reproduction.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘Goeyvaerts_reproduction.Rmd’ - - SUMMARY: processing the following file failed: - ‘Goeyvaerts_reproduction.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -# esci - -
- -* Version: 1.0.3 -* GitHub: https://github.com/rcalinjageman/esci -* Source code: https://github.com/cran/esci -* Date/Publication: 2024-07-08 21:40:10 UTC -* Number of recursive dependencies: 93 - -Run `revdepcheck::cloud_details(, "esci")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘esci-Ex.R’ failed - The error most likely occurred in: - - > ### Name: estimate_mdiff_2x2_between - > ### Title: Estimates for a 2x2 between-subjects design with a continuous - > ### outcome variable - > ### Aliases: estimate_mdiff_2x2_between + > ### Name: estimate_mdiff_2x2_between + > ### Title: Estimates for a 2x2 between-subjects design with a continuous + > ### outcome variable + > ### Aliases: estimate_mdiff_2x2_between > > ### ** Examples > @@ -6992,9 +6483,9 @@ Run `revdepcheck::cloud_details(, "esci")` for more info > library(esci) > > test_check("esci") - Loading required package: Matrix - Loading required package: metadat - Loading required package: numDeriv + [1] "WARNING: ratio-scale scores cannot be negative" + [1] "WARNING: ratio-scale scores cannot be negative" + [1] "WARNING: ratio-scale scores cannot be negative" ... 17. │ └─self$geom$use_defaults(...) 18. └─base::.handleSimpleError(...) @@ -7003,7 +6494,7 @@ Run `revdepcheck::cloud_details(, "esci")` for more info 21. └─cli::cli_abort(...) 22. └─rlang::abort(...) - [ FAIL 14 | WARN 0 | SKIP 0 | PASS 3182 ] + [ FAIL 3 | WARN 0 | SKIP 52 | PASS 2889 ] Error: Test failures Execution halted ``` @@ -7016,7 +6507,7 @@ Run `revdepcheck::cloud_details(, "esci")` for more info * GitHub: https://github.com/MichaelLLi/evalITR * Source code: https://github.com/cran/evalITR * Date/Publication: 2023-08-25 23:10:06 UTC -* Number of recursive dependencies: 167 +* Number of recursive dependencies: 166 Run `revdepcheck::cloud_details(, "evalITR")` for more info @@ -7072,7 +6563,7 @@ Run `revdepcheck::cloud_details(, "evalITR")` for more info * GitHub: https://github.com/JMSLab/eventstudyr * Source code: https://github.com/cran/eventstudyr * Date/Publication: 2024-03-04 15:00:02 UTC -* Number of recursive dependencies: 98 +* Number of recursive dependencies: 100 Run `revdepcheck::cloud_details(, "eventstudyr")` for more info @@ -7105,89 +6596,6 @@ Run `revdepcheck::cloud_details(, "eventstudyr")` for more info Execution halted ``` -# EvoPhylo - -
- -* Version: 0.3.2 -* GitHub: https://github.com/tiago-simoes/EvoPhylo -* Source code: https://github.com/cran/EvoPhylo -* Date/Publication: 2022-11-03 17:00:02 UTC -* Number of recursive dependencies: 145 - -Run `revdepcheck::cloud_details(, "EvoPhylo")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘EvoPhylo-Ex.R’ failed - The error most likely occurred in: - - > ### Name: make_clusters - > ### Title: Estimate and plot character partitions - > ### Aliases: make_clusters plot.cluster_df - > - > ### ** Examples - > - > # See vignette("char-part") for how to use this - ... - > # tSNE (3 dimensions; default is 2) - > cluster_df_tsne <- make_clusters(Dmatrix, k = 3, tsne = TRUE, - + tsne_dim = 2) - > - > # Plot clusters, plots divided into 2 rows, and increasing - > # overlap of text labels (default = 10) - > plot(cluster_df_tsne, nrow = 2, max.overlaps = 20) - Error in identicalUnits(x) : object is not a unit - Calls: ... assemble_guides -> guides_build -> unit.c -> identicalUnits - Execution halted - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘char-part.Rmd’ using rmarkdown - ``` - -## In both - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘char-part.Rmd’ - ... - + collapse = TRUE, dpi = 300) - - > devtools::load_all(".") - - When sourcing ‘char-part.R’: - Error: Could not find a root 'DESCRIPTION' file that starts with '^Package' in - '/tmp/Rtmp6FtfyP/file1a7972246c9b/vignettes'. - ... - ℹ Are you in your project directory and does your project have a 'DESCRIPTION' - file? - Execution halted - - ‘char-part.Rmd’ using ‘UTF-8’... failed - ‘data_treatment.Rmd’ using ‘UTF-8’... OK - ‘fbd-params.Rmd’ using ‘UTF-8’... failed - ‘offset_handling.Rmd’ using ‘UTF-8’... failed - ‘rates-selection_BEAST2.Rmd’ using ‘UTF-8’... failed - ‘rates-selection_MrBayes.Rmd’ using ‘UTF-8’... failed - ``` - -* checking installed package size ... NOTE - ``` - installed size is 6.8Mb - sub-directories of 1Mb or more: - data 2.5Mb - doc 1.6Mb - extdata 2.4Mb - ``` - # expirest
@@ -7196,7 +6604,7 @@ Run `revdepcheck::cloud_details(, "EvoPhylo")` for more info * GitHub: https://github.com/piusdahinden/expirest * Source code: https://github.com/cran/expirest * Date/Publication: 2024-03-25 16:30:02 UTC -* Number of recursive dependencies: 46 +* Number of recursive dependencies: 45 Run `revdepcheck::cloud_details(, "expirest")` for more info @@ -7233,11 +6641,11 @@ Run `revdepcheck::cloud_details(, "expirest")` for more info
-* Version: 1.0.1 +* Version: 1.0.2 * GitHub: https://github.com/PERSIMUNE/explainer * Source code: https://github.com/cran/explainer -* Date/Publication: 2024-04-18 09:00:02 UTC -* Number of recursive dependencies: 183 +* Date/Publication: 2024-09-30 17:30:02 UTC +* Number of recursive dependencies: 186 Run `revdepcheck::cloud_details(, "explainer")` for more info @@ -7278,67 +6686,6 @@ Run `revdepcheck::cloud_details(, "explainer")` for more info All declared Imports should be used. ``` -# exuber - -
- -* Version: 1.0.2 -* GitHub: https://github.com/kvasilopoulos/exuber -* Source code: https://github.com/cran/exuber -* Date/Publication: 2023-03-22 23:10:02 UTC -* Number of recursive dependencies: 101 - -Run `revdepcheck::cloud_details(, "exuber")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘exuber.Rmd’ - ... - 370 1 1 1 0 - 371 1 1 0 0 - 372 1 1 0 0 - - > autoplot(est_stocks) - Using `radf_crit` for `cv`. - - ... - - > autoplot(estimation, crit_values) - - When sourcing ‘plotting.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘exuber.Rmd’ using ‘UTF-8’... failed - ‘plotting.Rmd’ using ‘UTF-8’... failed - ‘simulation.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘exuber.Rmd’ using rmarkdown - - Quitting from lines 73-74 [plot-radf] (exuber.Rmd) - Error: processing vignette 'exuber.Rmd' failed with diagnostics: - invalid line type: must be length 2, 4, 6 or 8 - --- failed re-building ‘exuber.Rmd’ - - --- re-building ‘plotting.Rmd’ using rmarkdown - - Quitting from lines 58-59 [autoplot-basic] (plotting.Rmd) - Error: processing vignette 'plotting.Rmd' failed with diagnostics: - invalid line type: must be length 2, 4, 6 or 8 - --- failed re-building ‘plotting.Rmd’ - - --- re-building ‘simulation.Rmd’ using rmarkdown - ``` - # ezEDA
@@ -7347,7 +6694,7 @@ Run `revdepcheck::cloud_details(, "exuber")` for more info * GitHub: https://github.com/kviswana/ezEDA * Source code: https://github.com/cran/ezEDA * Date/Publication: 2021-06-29 04:40:10 UTC -* Number of recursive dependencies: 92 +* Number of recursive dependencies: 79 Run `revdepcheck::cloud_details(, "ezEDA")` for more info @@ -7380,42 +6727,6 @@ Run `revdepcheck::cloud_details(, "ezEDA")` for more info Execution halted ``` -# ezplot - -
- -* Version: 0.7.13 -* GitHub: NA -* Source code: https://github.com/cran/ezplot -* Date/Publication: 2024-01-28 11:30:05 UTC -* Number of recursive dependencies: 109 - -Run `revdepcheck::cloud_details(, "ezplot")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ezplot-Ex.R’ failed - The error most likely occurred in: - - > ### Name: model_plot - > ### Title: model_plot - > ### Aliases: model_plot - > - > ### ** Examples - > - > y = rnorm(26) - > df = data.frame(ID = 1:26, actual = y + rnorm(26), fitted = y, id = letters) - > model_plot(df, "ID", "actual", "fitted") - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - # fable.prophet
@@ -7424,7 +6735,7 @@ Run `revdepcheck::cloud_details(, "ezplot")` for more info * GitHub: https://github.com/mitchelloharawild/fable.prophet * Source code: https://github.com/cran/fable.prophet * Date/Publication: 2020-08-20 09:30:03 UTC -* Number of recursive dependencies: 114 +* Number of recursive dependencies: 113 Run `revdepcheck::cloud_details(, "fable.prophet")` for more info @@ -7437,15 +6748,15 @@ Run `revdepcheck::cloud_details(, "fable.prophet")` for more info Errors in running code in vignettes: when running code in ‘intro.Rmd’ ... - 9 Domestic mdl 2019 Dec sample[5000] 5338093. - 10 Domestic mdl 2020 Jan sample[5000] 4888643. + 9 Domestic mdl 2019 Dec sample[5000] 5336974. + 10 Domestic mdl 2020 Jan sample[5000] 4886604. # ℹ 62 more rows > fc %>% autoplot(lax_passengers) When sourcing ‘intro.R’: Error: unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, - NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NULL + NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, N Execution halted ‘intro.Rmd’ using ‘UTF-8’... failed @@ -7468,11 +6779,11 @@ Run `revdepcheck::cloud_details(, "fable.prophet")` for more info
-* Version: 0.4.2 +* Version: 0.5.0 * GitHub: https://github.com/tidyverts/fabletools * Source code: https://github.com/cran/fabletools -* Date/Publication: 2024-04-22 11:22:41 UTC -* Number of recursive dependencies: 106 +* Date/Publication: 2024-09-17 07:30:02 UTC +* Number of recursive dependencies: 107 Run `revdepcheck::cloud_details(, "fabletools")` for more info @@ -7500,7 +6811,7 @@ Run `revdepcheck::cloud_details(, "fabletools")` for more info > fc %>% autoplot(aus_production) Error in use_defaults(..., self = self) : unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, - NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NU + NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, Calls: ... -> -> compute_geom_2 -> Execution halted ``` @@ -7525,52 +6836,11 @@ Run `revdepcheck::cloud_details(, "fabletools")` for more info ── Failure ('test-graphics.R:346:3'): autoplot_dcmp_ts() ─────────────────────── `print(p)` produced warnings. - [ FAIL 4 | WARN 5 | SKIP 1 | PASS 267 ] + [ FAIL 4 | WARN 5 | SKIP 1 | PASS 266 ] Error: Test failures Execution halted ``` -# factoextra - -
- -* Version: 1.0.7 -* GitHub: https://github.com/kassambara/factoextra -* Source code: https://github.com/cran/factoextra -* Date/Publication: 2020-04-01 21:20:02 UTC -* Number of recursive dependencies: 116 - -Run `revdepcheck::cloud_details(, "factoextra")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘factoextra-Ex.R’ failed - The error most likely occurred in: - - > ### Name: eclust - > ### Title: Visual enhancement of clustering analysis - > ### Aliases: eclust - > - > ### ** Examples - > - > # Load and scale data - ... - 12. │ └─ggplot2:::`+.gg`(...) - 13. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 14. │ ├─ggplot2::ggplot_add(object, p, objectname) - 15. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 16. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 17. └─base::.handleSimpleError(...) - 18. └─purrr (local) h(simpleError(msg, call)) - 19. └─cli::cli_abort(...) - 20. └─rlang::abort(...) - Execution halted - ``` - # fairmodels
@@ -7579,7 +6849,7 @@ Run `revdepcheck::cloud_details(, "factoextra")` for more info * GitHub: https://github.com/ModelOriented/fairmodels * Source code: https://github.com/cran/fairmodels * Date/Publication: 2022-08-23 19:50:06 UTC -* Number of recursive dependencies: 87 +* Number of recursive dependencies: 86 Run `revdepcheck::cloud_details(, "fairmodels")` for more info @@ -7600,29 +6870,29 @@ Run `revdepcheck::cloud_details(, "fairmodels")` for more info Welcome to DALEX (version: 2.4.3). Find examples and detailed introduction at: http://ema.drwhy.ai/ ... - [ FAIL 1 | WARN 1 | SKIP 0 | PASS 312 ] + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 312 ] ══ Failed tests ════════════════════════════════════════════════════════════════ ── Failure ('test_plot_density.R:14:3'): Test plot_density ───────────────────── plt$labels$x not equal to "probability". target is NULL, current is character - [ FAIL 1 | WARN 1 | SKIP 0 | PASS 312 ] + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 312 ] Error: Test failures Execution halted ``` -# fastR2 +# FCPS
-* Version: 1.2.4 -* GitHub: https://github.com/rpruim/fastR2 -* Source code: https://github.com/cran/fastR2 -* Date/Publication: 2023-11-09 06:30:03 UTC -* Number of recursive dependencies: 165 +* Version: 1.3.4 +* GitHub: https://github.com/Mthrun/FCPS +* Source code: https://github.com/cran/FCPS +* Date/Publication: 2023-10-19 13:20:02 UTC +* Number of recursive dependencies: 269 -Run `revdepcheck::cloud_details(, "fastR2")` for more info +Run `revdepcheck::cloud_details(, "FCPS")` for more info
@@ -7630,134 +6900,92 @@ Run `revdepcheck::cloud_details(, "fastR2")` for more info * checking examples ... ERROR ``` - Running examples in ‘fastR2-Ex.R’ failed + Running examples in ‘FCPS-Ex.R’ failed The error most likely occurred in: - > ### Name: ACTgpa - > ### Title: ACT scores and GPA - > ### Aliases: ACTgpa - > ### Keywords: datasets + > ### Name: SOTAclustering + > ### Title: SOTA Clustering + > ### Aliases: SOTAclustering sotaClustering + > ### Keywords: SOTAclustering > > ### ** Examples > - > - > gf_point(GPA ~ ACT, data = ACTgpa) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: gf_point ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > #Does Work + > data('Hepta') + > out=SOTAclustering(Hepta$Data,ClusterNo=7) + Error in is.element(i, clust) : unused argument (clust) + Calls: SOTAclustering -> sota -> trainLeaves Execution halted ``` +* checking whether package ‘FCPS’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(i, clust)': unused argument (clust) + See ‘/tmp/workdir/FCPS/new/FCPS.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + trainLeaves: possible error in is.element(i, clust): unused argument + (clust) + ``` + ## In both * checking installed package size ... NOTE ``` - installed size is 6.1Mb + installed size is 11.1Mb sub-directories of 1Mb or more: - data 2.0Mb - snippet 3.7Mb + data 6.5Mb + doc 3.9Mb ``` -# faux +# fdANOVA
-* Version: 1.2.1 -* GitHub: https://github.com/debruine/faux -* Source code: https://github.com/cran/faux -* Date/Publication: 2023-04-20 07:00:11 UTC -* Number of recursive dependencies: 132 +* Version: 0.1.2 +* GitHub: NA +* Source code: https://github.com/cran/fdANOVA +* Date/Publication: 2018-08-29 19:54:26 UTC +* Number of recursive dependencies: 70 -Run `revdepcheck::cloud_details(, "faux")` for more info +Run `revdepcheck::cloud_details(, "fdANOVA")` for more info
## Newly broken -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘codebook.Rmd’ using rmarkdown - --- finished re-building ‘codebook.Rmd’ - - --- re-building ‘continuous.Rmd’ using rmarkdown - ``` - -## In both - * checking examples ... ERROR ``` - Running examples in ‘faux-Ex.R’ failed + Running examples in ‘fdANOVA-Ex.R’ failed The error most likely occurred in: - > ### Name: beta2norm - > ### Title: Convert beta to normal - > ### Aliases: beta2norm + > ### Name: fanova.tests + > ### Title: Tests for FANOVA Problem + > ### Aliases: fanova.tests + > ### Keywords: Multivariate Test > > ### ** Examples > + ... + + own.basis = own.basis, + + own.cross.prod.mat = own.cross.prod.mat))) > - > x <- rbeta(10000, 2, 3) - > y <- beta2norm(x) - shape1 was set to 1.96704823352025 - shape2 was set to 2.94110338061547 - > g <- ggplot2::ggplot() + ggplot2::geom_point(ggplot2::aes(x, y)) - > ggExtra::ggMarginal(g, type = "histogram") - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > # the tests based on random projections with the Gaussian white noise generated for projections + > fanova4 <- fanova.tests(x.gait, group.label.gait, test = "TRP", + + params = list(paramTRP = list(k = c(1, 2), B.TRP = 2))) + Error in is.element(substring(formc, 1, 1), c("+", "-")) : + unused argument (c("+", "-")) + Calls: fanova.tests ... pf -> anova.statistic.quick -> -> orderBy Execution halted ``` -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(faux) - - ************ - Welcome to faux. For support and examples visit: - https://debruine.github.io/faux/ - - Get and set global package options with: faux_options() - ... - 6. └─methods (local) ``(...) - 7. └─methods::new(def, ...) - 8. ├─methods::initialize(value, ...) - 9. └─methods::initialize(value, ...) - 10. └─.Object$initialize(...) - 11. └─lme4 (local) initializePtr() - - [ FAIL 20 | WARN 6 | SKIP 14 | PASS 1331 ] - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘norta.Rmd’ - ... - - > p <- ggplot(dat, aes(uniform_var, poisson_var)) + - + geom_point() + geom_smooth() - - > ggMarginal(p, type = "histogram") - `geom_smooth()` using method = 'gam' and formula = 'y ~ s(x, bs = "cs")' - - ... - Error: argument is of length zero - Execution halted - - ‘codebook.Rmd’ using ‘UTF-8’... OK - ‘continuous.Rmd’ using ‘UTF-8’... OK - ‘contrasts.Rmd’ using ‘UTF-8’... OK - ‘norta.Rmd’ using ‘UTF-8’... failed - ‘rnorm_multi.Rmd’ using ‘UTF-8’... OK - ‘sim_design.Rmd’ using ‘UTF-8’... OK - ‘sim_df.Rmd’ using ‘UTF-8’... OK - ``` - -# fddm +# fddm
@@ -7765,7 +6993,7 @@ Run `revdepcheck::cloud_details(, "faux")` for more info * GitHub: https://github.com/rtdists/fddm * Source code: https://github.com/cran/fddm * Date/Publication: 2024-07-02 16:00:07 UTC -* Number of recursive dependencies: 93 +* Number of recursive dependencies: 92 Run `revdepcheck::cloud_details(, "fddm")` for more info @@ -7812,11 +7040,11 @@ Run `revdepcheck::cloud_details(, "fddm")` for more info
-* Version: 0.3.2 +* Version: 0.4.1 * GitHub: https://github.com/tidyverts/feasts * Source code: https://github.com/cran/feasts -* Date/Publication: 2024-03-15 09:10:02 UTC -* Number of recursive dependencies: 101 +* Date/Publication: 2024-09-25 23:40:02 UTC +* Number of recursive dependencies: 100 Run `revdepcheck::cloud_details(, "feasts")` for more info @@ -7834,7 +7062,7 @@ Run `revdepcheck::cloud_details(, "feasts")` for more info Loading required package: fabletools > > test_check("feasts") - [ FAIL 2 | WARN 1 | SKIP 0 | PASS 101 ] + [ FAIL 2 | WARN 1 | SKIP 0 | PASS 100 ] ... ── Error ('test-graphics.R:192:3'): gg_tsdisplay() plots ─────────────────────── @@ -7844,52 +7072,11 @@ Run `revdepcheck::cloud_details(, "feasts")` for more info Component "x": 1 string mismatch Component "y": 1 string mismatch - [ FAIL 2 | WARN 1 | SKIP 0 | PASS 101 ] + [ FAIL 2 | WARN 1 | SKIP 0 | PASS 100 ] Error: Test failures Execution halted ``` -# fergm - -
- -* Version: 1.1.4 -* GitHub: https://github.com/benjamin-w-campbell/fergm -* Source code: https://github.com/cran/fergm -* Date/Publication: 2018-10-17 22:20:11 UTC -* Number of recursive dependencies: 101 - -Run `revdepcheck::cloud_details(, "fergm")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘fergm-Ex.R’ failed - The error most likely occurred in: - - > ### Name: coef_posterior_density - > ### Title: Plots the posterior density for FERGM model terms. - > ### Aliases: coef_posterior_density - > ### Keywords: FERGM interpret summary - > - > ### ** Examples - > - ... - > data("ergm.fit") - > data("fergm.fit") - > data("mesa") - > - > # rstan functions - > # Histogram of the posterior - > rstan::stan_hist(fergm.fit$stan.fit, par = "beta") - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - # ffp
@@ -7898,7 +7085,7 @@ Run `revdepcheck::cloud_details(, "fergm")` for more info * GitHub: https://github.com/Reckziegel/FFP * Source code: https://github.com/cran/ffp * Date/Publication: 2022-09-29 15:10:06 UTC -* Number of recursive dependencies: 107 +* Number of recursive dependencies: 106 Run `revdepcheck::cloud_details(, "ffp")` for more info @@ -7923,85 +7110,11 @@ Run `revdepcheck::cloud_details(, "ffp")` for more info > scenario_density(x, p, 500) Error in use_defaults(..., self = self) : unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, - NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(), NULL, + NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(), NU Calls: ... -> -> compute_geom_2 -> Execution halted ``` -# fic - -
- -* Version: 1.0.0 -* GitHub: https://github.com/chjackson/fic -* Source code: https://github.com/cran/fic -* Date/Publication: 2019-04-13 08:32:39 UTC -* Number of recursive dependencies: 119 - -Run `revdepcheck::cloud_details(, "fic")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘linear.Rnw’ - ... - - > library(ggplot2) - - > if (requireNamespace("GGally", quietly = TRUE)) { - + GGally::ggpairs(mtcars[, c("mpg", "am", "wt", "qsec", "disp", - + "hp")], aes(colour .... [TRUNCATED] - - ... - When sourcing 'linear.R': - Error: argument is of length zero - Execution halted - - ‘fic.Rnw’ using ‘UTF-8’... OK - ‘linear.Rnw’ using ‘UTF-8’... failed - ‘loss.Rnw’ using ‘UTF-8’... OK - ‘multistate.Rnw’ using ‘UTF-8’... OK - ‘skewnormal.Rnw’ using ‘UTF-8’... OK - ‘survival.Rnw’ using ‘UTF-8’... OK - ``` - -## In both - -* checking dependencies in R code ... NOTE - ``` - Namespace in Imports field not imported from: ‘numDeriv’ - All declared Imports should be used. - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘fic.Rnw’ using knitr - Error: processing vignette 'fic.Rnw' failed with diagnostics: - Running 'texi2dvi' on 'fic.tex' failed. - LaTeX errors: - ! LaTeX Error: File `grfext.sty' not found. - - Type X to quit or to proceed, - or enter new name. (Default extension: sty) - - ... - --- finished re-building ‘skewnormal.Rnw’ - - --- re-building ‘survival.Rnw’ using knitr - --- finished re-building ‘survival.Rnw’ - - SUMMARY: processing the following files failed: - ‘fic.Rnw’ ‘linear.Rnw’ ‘multistate.Rnw’ - - Error: Vignette re-building failed. - Execution halted - ``` - # fido
@@ -8010,7 +7123,7 @@ Run `revdepcheck::cloud_details(, "fic")` for more info * GitHub: https://github.com/jsilve24/fido * Source code: https://github.com/cran/fido * Date/Publication: 2024-06-05 21:30:06 UTC -* Number of recursive dependencies: 134 +* Number of recursive dependencies: 133 Run `revdepcheck::cloud_details(, "fido")` for more info @@ -8036,7 +7149,7 @@ Run `revdepcheck::cloud_details(, "fido")` for more info Adding another scale for colour, which will replace the existing scale. Error in use_defaults(..., self = self) : unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, - NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 1, NULL, NULL, NULL, c(0, 2.2, 0, 0), NULL, TRUE), NULL + NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 1, NULL, NULL, NULL, c(0, 2.2, 0, 0), NULL, TRUE), N Calls: ... -> -> compute_geom_2 -> Execution halted ``` @@ -8093,10 +7206,10 @@ Run `revdepcheck::cloud_details(, "fido")` for more info * checking installed package size ... NOTE ``` - installed size is 106.5Mb + installed size is 106.6Mb sub-directories of 1Mb or more: data 4.0Mb - libs 100.6Mb + libs 100.8Mb ``` * checking re-building of vignette outputs ... NOTE @@ -8111,111 +7224,94 @@ Run `revdepcheck::cloud_details(, "fido")` for more info --- re-building ‘non-linear-models.Rmd’ using rmarkdown ``` -# fitdistrplus +# FielDHub
-* Version: 1.2-1 -* GitHub: https://github.com/lbbe-software/fitdistrplus -* Source code: https://github.com/cran/fitdistrplus -* Date/Publication: 2024-07-12 12:20:02 UTC -* Number of recursive dependencies: 108 +* Version: 1.4.2 +* GitHub: https://github.com/DidierMurilloF/FielDHub +* Source code: https://github.com/cran/FielDHub +* Date/Publication: 2024-07-26 20:20:06 UTC +* Number of recursive dependencies: 113 -Run `revdepcheck::cloud_details(, "fitdistrplus")` for more info +Run `revdepcheck::cloud_details(, "FielDHub")` for more info
## Newly broken -* checking examples ... ERROR +* checking running R code from vignettes ... ERROR ``` - Running examples in ‘fitdistrplus-Ex.R’ failed - The error most likely occurred in: + Errors in running code in vignettes: + when running code in ‘RCBD_augmented.Rmd’ + ... + 7 7 Cassava_2022 FARGO 2025 1007 1 7 1 1 4 CH4 + 8 8 Cassava_2022 FARGO 2025 1008 1 8 0 1 44 G44 + 9 9 Cassava_2022 FARGO 2025 1009 1 9 0 1 23 G23 + 10 10 Cassava_2022 FARGO 2025 1010 1 10 0 1 113 G113 + + > plot(aug_RCBD) - > ### Name: CIcdfplot - > ### Title: Empirical cumulative distribution function with pointwise - > ### confidence intervals on probabilities or on quantiles - > ### Aliases: CIcdfplot - > ### Keywords: distribution - > - > ### ** Examples - ... - > f1 <- fitdist(s1, "exp") - > b1 <- bootdist(f1, niter= 11) #voluntarily low to decrease computation time - > - > # plot 95 percent bilateral confidence intervals on y values (probabilities) - > CIcdfplot(b1, CI.level= 95/100, CI.output = "probability") - > if (ggplotEx) CIcdfplot(b1, CI.level= 95/100, CI.output = "probability", plotstyle = "ggplot") - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘t-CIcdfplot.R’ - Running the tests in ‘tests/t-CIcdfplot.R’ failed. - Complete output: - > library(fitdistrplus) - Loading required package: MASS - Loading required package: survival - > - > nbboot <- 201 - > nbboot <- 10 - > ggplotEx <- requireNamespace("ggplot2", quietly = TRUE) ... - 97.5 % 2.152084 2.778622 - > - > par(mfrow=c(1,2)) - > CIcdfplot(b1, CI.level=95/100, CI.output = "probability", CI.fill="grey80", CI.col="black") - > CIcdfplot(b1, CI.level=95/100, CI.output = "quantile", datacol="blue") - > if(ggplotEx) CIcdfplot(b1, CI.level=95/100, CI.output = "probability", CI.fill="grey80", CI.col="black", plotstyle = "ggplot") - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted + + ‘RCBD_augmented.Rmd’ using ‘UTF-8’... failed + ‘alpha_lattice.Rmd’ using ‘UTF-8’... failed + ‘diagonal_arrangement.Rmd’ using ‘UTF-8’... failed + ‘full_factorial.Rmd’ using ‘UTF-8’... failed + ‘multi_location_prep.Rmd’ using ‘UTF-8’... failed + ‘partially_replicated.Rmd’ using ‘UTF-8’... failed + ‘rcbd.Rmd’ using ‘UTF-8’... failed + ‘row_column.Rmd’ using ‘UTF-8’... failed + ‘split_plot.Rmd’ using ‘UTF-8’... failed ``` -* checking running R code from vignettes ... ERROR +* checking re-building of vignette outputs ... NOTE ``` - Errors in running code in vignettes: - when running code in ‘FAQ.Rmd’ - ... + Error(s) in re-building vignettes: + --- re-building ‘RCBD_augmented.Rmd’ using rmarkdown - > dcomp <- denscomp(list(fitW, fitln, fitg), legendtext = c("Weibull", - + "lognormal", "gamma"), xlab = "serving sizes (g)", xlim = c(0, - + 25 .... [TRUNCATED] + Quitting from lines 210-211 [unnamed-chunk-12] (RCBD_augmented.Rmd) + Error: processing vignette 'RCBD_augmented.Rmd' failed with diagnostics: + unused argument (dn) + --- failed re-building ‘RCBD_augmented.Rmd’ - > dcomp + ggplot2::theme_minimal() + ggplot2::ggtitle("Ground beef fits") + --- re-building ‘alpha_lattice.Rmd’ using rmarkdown - When sourcing ‘FAQ.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted + ... + --- failed re-building ‘split_plot.Rmd’ + + SUMMARY: processing the following files failed: + ‘RCBD_augmented.Rmd’ ‘alpha_lattice.Rmd’ ‘diagonal_arrangement.Rmd’ + ‘full_factorial.Rmd’ ‘multi_location_prep.Rmd’ + ‘partially_replicated.Rmd’ ‘rcbd.Rmd’ ‘row_column.Rmd’ + ‘split_plot.Rmd’ - ‘FAQ.Rmd’ using ‘UTF-8’... failed - ‘Optimalgo.Rmd’ using ‘UTF-8’... OK - ‘fitdistrplus_vignette.Rmd’ using ‘UTF-8’... OK - ‘starting-values.Rmd’ using ‘UTF-8’... OK + Error: Vignette re-building failed. + Execution halted ``` -* checking re-building of vignette outputs ... NOTE +## In both + +* checking installed package size ... NOTE ``` - Error(s) in re-building vignettes: - --- re-building ‘FAQ.Rmd’ using rmarkdown + installed size is 5.3Mb + sub-directories of 1Mb or more: + R 1.5Mb + doc 1.8Mb + help 1.1Mb ``` -# fitlandr +# figuRes2
-* Version: 0.1.0 -* GitHub: https://github.com/Sciurus365/fitlandr -* Source code: https://github.com/cran/fitlandr -* Date/Publication: 2023-02-10 10:40:02 UTC -* Number of recursive dependencies: 123 +* Version: 1.0.0 +* GitHub: https://github.com/gcicc/figures2 +* Source code: https://github.com/cran/figuRes2 +* Date/Publication: 2022-09-09 08:02:55 UTC +* Number of recursive dependencies: 112 -Run `revdepcheck::cloud_details(, "fitlandr")` for more info +Run `revdepcheck::cloud_details(, "figuRes2")` for more info
@@ -8223,23 +7319,49 @@ Run `revdepcheck::cloud_details(, "fitlandr")` for more info * checking examples ... ERROR ``` - Running examples in ‘fitlandr-Ex.R’ failed + Running examples in ‘figuRes2-Ex.R’ failed The error most likely occurred in: - > ### Name: fit_2d_vf - > ### Title: Estimate a 2D vector field - > ### Aliases: fit_2d_vf + > ### Name: theme_grey2_nomargins + > ### Title: figuRes2 themes + > ### Aliases: theme_grey2_nomargins theme_grey2_default_margins + > ### theme_bw2_nomargins theme_bw2_default_margins theme_table_nomargins > > ### ** Examples > - > # generate data - > single_output_grad <- simlandr::sim_fun_grad(length = 200, seed = 1614) - > # fit the vector field - > v2 <- fit_2d_vf(single_output_grad, x = "x", y = "y", method = "MVKE") - > plot(v2) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + ... + ▆ + 1. ├─ggplot2::theme_set(theme_grey2_nomargins()) + 2. │ └─ggplot2:::check_object(new, is.theme, "a {.cls theme} object") + 3. │ └─ggplot2 (local) check_fun(x) + 4. └─figuRes2::theme_grey2_nomargins() + 5. └─ggplot2::theme(...) + 6. └─lifecycle::deprecate_stop(...) + 7. └─lifecycle:::deprecate_stop0(msg) + 8. └─rlang::cnd_signal(...) + Execution halted + ``` + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘basics.Rmd’ + ... + Your page setup allocates: 0.1 inches to the bottom margin. + Your page setup allocates: a rectangle, 10.8 inches wide by 8.3 inches tall for graphics/tables. + + > theme_set(theme_grey2_nomargins()) + + When sourcing ‘basics.R’: + Error: The `axis.ticks.margin` argument of `theme()` was deprecated in ggplot2 + 2.0.0 and is now defunct. + ℹ Please set `margin` property of `axis.text` instead Execution halted + + ‘basics.Rmd’ using ‘UTF-8’... failed + ‘forest-plots.Rmd’ using ‘UTF-8’... OK + ‘km.Rmd’ using ‘UTF-8’... OK + ‘large-scale.Rmd’ using ‘UTF-8’... OK ``` # flexsurv @@ -8250,7 +7372,7 @@ Run `revdepcheck::cloud_details(, "fitlandr")` for more info * GitHub: https://github.com/chjackson/flexsurv * Source code: https://github.com/cran/flexsurv * Date/Publication: 2024-08-17 05:50:02 UTC -* Number of recursive dependencies: 147 +* Number of recursive dependencies: 150 Run `revdepcheck::cloud_details(, "flexsurv")` for more info @@ -8258,20 +7380,45 @@ Run `revdepcheck::cloud_details(, "flexsurv")` for more info ## Newly broken +* checking tests ... ERROR + ``` + Running ‘test_base.R’ + Running the tests in ‘tests/test_base.R’ failed. + Complete output: + > test_partial <- FALSE + > + > if (test_partial) + + options( + + warnPartialMatchArgs = TRUE, + + warnPartialMatchAttr = TRUE, + + warnPartialMatchDollar = TRUE + ... + ══ Skipped tests (1) ═══════════════════════════════════════════════════════════ + • On CRAN (1): 'test_standsurv.R:276:3' + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Error ('test_custom.R:14:1'): (code run outside of `test_that()`) ─────────── + Error in `is.element("eha", installed.packages()[, 1])`: unused argument (installed.packages()[, 1]) + + [ FAIL 1 | WARN 0 | SKIP 1 | PASS 705 ] + Error: Test failures + Execution halted + ``` + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: when running code in ‘standsurv.Rmd’ ... - 5 0 967 Good 2.649315 68.74975 25110 1986-05-18 female Good - 6 0 629 Good 1.723288 64.53328 23570 1987-03-07 female Good - - > km <- survfit(Surv(recyrs, censrec) ~ group2, data = bc) > kmsurvplot <- ggsurvplot(km) + > kmsurvplot + xlab("Time from diagnosis (years)") + Warning in eval(ei, envir) : + Incompatible methods ("+.ggsurv", "+.gg") for "+" + When sourcing ‘standsurv.R’: - Error: argument is of length zero + Error: non-numeric argument to binary operator Execution halted ‘standsurv.Rmd’ using ‘UTF-8’... failed @@ -8299,7 +7446,7 @@ Run `revdepcheck::cloud_details(, "flexsurv")` for more info Quitting from lines 113-116 [unnamed-chunk-4] (standsurv.Rmd) Error: processing vignette 'standsurv.Rmd' failed with diagnostics: - argument is of length zero + non-numeric argument to binary operator --- failed re-building ‘standsurv.Rmd’ --- re-building ‘flexsurv.Rnw’ using knitr @@ -8325,7 +7472,7 @@ Run `revdepcheck::cloud_details(, "flexsurv")` for more info * GitHub: https://github.com/LMJL-Alea/flipr * Source code: https://github.com/cran/flipr * Date/Publication: 2023-08-23 09:00:02 UTC -* Number of recursive dependencies: 107 +* Number of recursive dependencies: 106 Run `revdepcheck::cloud_details(, "flipr")` for more info @@ -8384,58 +7531,17 @@ Run `revdepcheck::cloud_details(, "flipr")` for more info libs 1.4Mb ``` -# FLOPART +# forestmodel
-* Version: 2024.6.19 +* Version: 0.6.2 * GitHub: NA -* Source code: https://github.com/cran/FLOPART -* Date/Publication: 2024-06-20 21:30:10 UTC -* Number of recursive dependencies: 55 - -Run `revdepcheck::cloud_details(, "FLOPART")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘comparison.Rmd’ - ... - - > if (require("ggplot2")) { - + ggplot() + ggtitle("Models with label constraints (FLOPART) and without (penalty values)") + - + scale_fill_m .... [TRUNCATED] - Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. - ℹ Please use `linewidth` instead. - - When sourcing ‘comparison.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘comparison.Rmd’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘comparison.Rmd’ using knitr - ``` - -# fmesher - -
- -* Version: 0.1.7 -* GitHub: https://github.com/inlabru-org/fmesher -* Source code: https://github.com/cran/fmesher -* Date/Publication: 2024-07-01 13:00:02 UTC -* Number of recursive dependencies: 93 +* Source code: https://github.com/cran/forestmodel +* Date/Publication: 2020-07-19 11:50:03 UTC +* Number of recursive dependencies: 57 -Run `revdepcheck::cloud_details(, "fmesher")` for more info +Run `revdepcheck::cloud_details(, "forestmodel")` for more info
@@ -8443,76 +7549,74 @@ Run `revdepcheck::cloud_details(, "fmesher")` for more info * checking examples ... ERROR ``` - Running examples in ‘fmesher-Ex.R’ failed + Running examples in ‘forestmodel-Ex.R’ failed The error most likely occurred in: - > ### Name: fm_mesh_1d - > ### Title: Make a 1D mesh object - > ### Aliases: fm_mesh_1d + > ### Name: forest_rma + > ### Title: Generate a forest plot from a meta-analysis + > ### Aliases: forest_rma > > ### ** Examples > - > if (require("ggplot2")) { + > if (require("metafor")) { ... - + boundary = c("neumann", "free"), - + degree = 2 - + ) - + ggplot() + - + geom_fm(data = m, xlim = c(0.5, 10.5)) - + } - Loading required package: ggplot2 - Error in if (new_name %in% existing) { : argument is of length zero - Calls: +.gg ... ggplot_add.list -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘basic_use.Rmd’ - ... - - > plot(mesh2) + Loading required package: metadat + Loading required package: numDeriv - > suppressPackageStartupMessages(library(ggplot2)) + Loading the 'metafor' package (version 4.6-0). For an + introduction to the package please type: help(metafor) - > ggplot() + geom_fm(data = mesh2) - - When sourcing ‘basic_use.R’: - Error: argument is of length zero + Error in h(simpleError(msg, call)) : + error in evaluating the argument 'x' in selecting a method for function 'print': unused argument (c("OR", "PETO", "D2OR", "D2ORN", "D2ORL")) + Calls: print ... default_forest_panels -> %||% -> rma_setlab -> .handleSimpleError -> h Execution halted - - ‘basic_use.Rmd’ using ‘UTF-8’... failed - ‘fmesher_library.Rmd’ using ‘UTF-8’... OK - ‘inla_conversion.Rmd’ using ‘UTF-8’... OK ``` -* checking re-building of vignette outputs ... NOTE +* checking whether package ‘forestmodel’ can be installed ... WARNING ``` - Error(s) in re-building vignettes: - --- re-building ‘basic_use.Rmd’ using rmarkdown + Found the following significant warnings: + Note: possible error in 'is.element(measure, c("OR", ': unused argument (c("OR", "PETO", "D2OR", "D2ORN", "D2ORL")) + Note: possible error in 'is.element(measure, c("SMD", ': unused argument (c("SMD", "SMDH", "PBIT", "OR2D", "OR2DN", "OR2DL")) + Note: possible error in 'is.element(measure, c("COR", ': unused argument (c("COR", "UCOR", "RTET", "RBIS")) + Note: possible error in 'is.element(measure, c("SMCC", ': unused argument (c("SMCC", "SMCR", "SMCRH")) + See ‘/tmp/workdir/forestmodel/new/forestmodel.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + rma_setlab: possible error in is.element(measure, c("OR", "PETO", + "D2OR", "D2ORN", "D2ORL")): unused argument (c("OR", "PETO", "D2OR", + "D2ORN", "D2ORL")) + rma_setlab: possible error in is.element(measure, c("SMD", "SMDH", + "PBIT", "OR2D", "OR2DN", "OR2DL")): unused argument (c("SMD", "SMDH", + "PBIT", "OR2D", "OR2DN", "OR2DL")) + rma_setlab: possible error in is.element(measure, c("COR", "UCOR", + "RTET", "RBIS")): unused argument (c("COR", "UCOR", "RTET", "RBIS")) + rma_setlab: possible error in is.element(measure, c("SMCC", "SMCR", + "SMCRH")): unused argument (c("SMCC", "SMCR", "SMCRH")) ``` ## In both -* checking installed package size ... NOTE +* checking LazyData ... NOTE ``` - installed size is 12.5Mb - sub-directories of 1Mb or more: - libs 10.5Mb + 'LazyData' is specified without a 'data' directory ``` -# fmf +# frailtyEM
-* Version: 1.1.1 -* GitHub: NA -* Source code: https://github.com/cran/fmf -* Date/Publication: 2020-09-03 07:32:12 UTC -* Number of recursive dependencies: 175 +* Version: 1.0.1 +* GitHub: https://github.com/tbalan/frailtyEM +* Source code: https://github.com/cran/frailtyEM +* Date/Publication: 2019-09-22 13:00:10 UTC +* Number of recursive dependencies: 78 -Run `revdepcheck::cloud_details(, "fmf")` for more info +Run `revdepcheck::cloud_details(, "frailtyEM")` for more info
@@ -8520,124 +7624,72 @@ Run `revdepcheck::cloud_details(, "fmf")` for more info * checking examples ... ERROR ``` - Running examples in ‘fmf-Ex.R’ failed + Running examples in ‘frailtyEM-Ex.R’ failed The error most likely occurred in: - > ### Name: plot - > ### Title: PCA Plot of the Noise Score of Each Individual - > ### Aliases: plot + > ### Name: summary.emfrail + > ### Title: Summary for 'emfrail' objects + > ### Aliases: summary.emfrail > > ### ** Examples > - > + > data("bladder") ... - 17. │ └─ggplot2:::`+.gg`(...) - 18. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 19. │ ├─ggplot2::ggplot_add(object, p, objectname) - 20. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 21. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 22. └─base::.handleSimpleError(...) - 23. └─purrr (local) h(simpleError(msg, call)) - 24. └─cli::cli_abort(...) - 25. └─rlang::abort(...) + filter + + The following object is masked from ‘package:graphics’: + + layout + + > ggplotly(pl2) + Error in pm[[2]] : subscript out of bounds + Calls: ggplotly -> ggplotly.ggplot -> gg2list Execution halted ``` ## In both -* checking C++ specification ... NOTE +* checking LazyData ... NOTE ``` - Specified C++11: please drop specification unless essential - ``` - -# forestly - -
- -* Version: 0.1.1 -* GitHub: https://github.com/Merck/forestly -* Source code: https://github.com/cran/forestly -* Date/Publication: 2024-07-08 19:40:02 UTC -* Number of recursive dependencies: 84 - -Run `revdepcheck::cloud_details(, "forestly")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘forest-plot-static.Rmd’ - ... - Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : - conversion failure on 'Treatment← Favor →Placebo' in 'mbcsToSbcs': dot substituted for - Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : - conversion failure on 'Treatment← Favor →Placebo' in 'mbcsToSbcs': dot substituted for <86> - Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : - conversion failure on 'Treatment← Favor →Placebo' in 'mbcsToSbcs': dot substituted for <92> - - When sourcing ‘forest-plot-static.R’: - Error: object is not a unit - Execution halted - - ‘forest-plot-static.Rmd’ using ‘UTF-8’... failed - ‘forestly-cran.Rmd’ using ‘UTF-8’... OK + 'LazyData' is specified without a 'data' directory ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘forest-plot-static.Rmd’ using rmarkdown - ``` - -# FossilSim - -
- -* Version: 2.4.0 -* GitHub: NA -* Source code: https://github.com/cran/FossilSim -* Date/Publication: 2024-09-05 19:40:02 UTC -* Number of recursive dependencies: 155 - -Run `revdepcheck::cloud_details(, "FossilSim")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘FossilSim-Ex.R’ failed - The error most likely occurred in: + --- re-building ‘frailtyEM_manual.Rnw’ using Sweave + Loading required package: survival - > ### Name: plot.fbdrange - > ### Title: Plot oriented tree with stratigraphic ranges - > ### Aliases: plot.fbdrange - > - > ### ** Examples - > - > tree_file <- system.file("extdata", "fbdrange.trees", package = "FossilSim") - > fbdr <- get_fbdrange_from_file(tree_file) - > p <- plot(fbdr, smart.labels = TRUE) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + Attaching package: ‘ggplot2’ + + The following object is masked from ‘package:base’: + + is.element + + ... + l.179 \RequirePackage{grfext}\relax + ^^M + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘frailtyEM_manual.Rnw’ + + SUMMARY: processing the following file failed: + ‘frailtyEM_manual.Rnw’ + + Error: Vignette re-building failed. Execution halted ``` -# FPDclustering +# gapmap
-* Version: 2.3.1 -* GitHub: NA -* Source code: https://github.com/cran/FPDclustering -* Date/Publication: 2024-01-30 00:10:06 UTC -* Number of recursive dependencies: 104 +* Version: 1.0.0 +* GitHub: https://github.com/evanbiederstedt/gapmap +* Source code: https://github.com/cran/gapmap +* Date/Publication: 2024-01-22 20:50:02 UTC +* Number of recursive dependencies: 55 -Run `revdepcheck::cloud_details(, "FPDclustering")` for more info +Run `revdepcheck::cloud_details(, "gapmap")` for more info
@@ -8645,149 +7697,90 @@ Run `revdepcheck::cloud_details(, "FPDclustering")` for more info * checking examples ... ERROR ``` - Running examples in ‘FPDclustering-Ex.R’ failed + Running examples in ‘gapmap-Ex.R’ failed The error most likely occurred in: - > ### Name: GPDC - > ### Title: Gaussian PD-Clustering - > ### Aliases: GPDC + > ### Name: gapmap + > ### Title: Function to draw a gapped cluster heatmap + > ### Aliases: gapmap > > ### ** Examples > - > #Load the data + > set.seed(1234) ... - > #Results - > table(res$label,ais$sex) - - f m - 1 95 1 - 2 5 101 - > plot(res) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + ℹ Please use the `panel.spacing` argument instead. + Backtrace: + ▆ + 1. └─gapmap::gapmap(m = as.matrix(distxy), d_row = rev(dend), d_col = dend) + 2. └─gapmap::gap_dendrogram(...) + 3. └─ggplot2::theme(...) + 4. └─lifecycle::deprecate_stop("2.2.0", "theme(panel.margin)", "theme(panel.spacing)") + 5. └─lifecycle:::deprecate_stop0(msg) + 6. └─rlang::cnd_signal(...) Execution halted ``` -# frailtyEM - -
- -* Version: 1.0.1 -* GitHub: https://github.com/tbalan/frailtyEM -* Source code: https://github.com/cran/frailtyEM -* Date/Publication: 2019-09-22 13:00:10 UTC -* Number of recursive dependencies: 78 - -Run `revdepcheck::cloud_details(, "frailtyEM")` for more info - -
- -## Newly broken - -* checking examples ... ERROR +* checking running R code from vignettes ... ERROR ``` - Running examples in ‘frailtyEM-Ex.R’ failed - The error most likely occurred in: + Errors in running code in vignettes: + when running code in ‘simple_example.Rmd’ + ... + ℹ See also `vignette("ggplot2-in-packages")` for more information. + ℹ The deprecated feature was likely used in the gapmap package. + Please report the issue at + . - > ### Name: summary.emfrail - > ### Title: Summary for 'emfrail' objects - > ### Aliases: summary.emfrail - > - > ### ** Examples - > - > data("bladder") + When sourcing ‘simple_example.R’: + Error: The `panel.margin` argument of `theme()` was deprecated in ggplot2 2.2.0 ... - filter + . - The following object is masked from ‘package:graphics’: - - layout - - > ggplotly(pl2) - Error in pm[[2]] : subscript out of bounds - Calls: ggplotly -> ggplotly.ggplot -> gg2list + When sourcing ‘tcga_example.R’: + Error: The `panel.margin` argument of `theme()` was deprecated in ggplot2 2.2.0 + and is now defunct. + ℹ Please use the `panel.spacing` argument instead. Execution halted - ``` - -## In both - -* checking LazyData ... NOTE - ``` - 'LazyData' is specified without a 'data' directory + + ‘simple_example.Rmd’ using ‘UTF-8’... failed + ‘tcga_example.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘frailtyEM_manual.Rnw’ using Sweave - Loading required package: survival - Loading required package: gridExtra - Warning: The `` argument of `guides()` cannot be `FALSE`. Use - "none" instead as of ggplot2 3.3.4. - Warning: Removed 2 rows containing missing values or values outside - the scale range (`geom_path()`). - Warning in data("kidney") : data set ‘kidney’ not found - Warning in emfrail(Surv(time, status) ~ age + sex + cluster(id), data = kidney, : + ... + --- re-building ‘simple_example.Rmd’ using rmarkdown + + Quitting from lines 36-38 [unnamed-chunk-3] (simple_example.Rmd) + Error: processing vignette 'simple_example.Rmd' failed with diagnostics: + The `panel.margin` argument of `theme()` was deprecated in ggplot2 2.2.0 + and is now defunct. + ℹ Please use the `panel.spacing` argument instead. + --- failed re-building ‘simple_example.Rmd’ ... - l.179 \RequirePackage{grfext}\relax - ^^M - ! ==> Fatal error occurred, no output PDF file produced! - --- failed re-building ‘frailtyEM_manual.Rnw’ + The `panel.margin` argument of `theme()` was deprecated in ggplot2 2.2.0 + and is now defunct. + ℹ Please use the `panel.spacing` argument instead. + --- failed re-building ‘tcga_example.Rmd’ - SUMMARY: processing the following file failed: - ‘frailtyEM_manual.Rnw’ + SUMMARY: processing the following files failed: + ‘simple_example.Rmd’ ‘tcga_example.Rmd’ Error: Vignette re-building failed. Execution halted ``` -# funcharts - -
- -* Version: 1.5.0 -* GitHub: https://github.com/unina-sfere/funcharts -* Source code: https://github.com/cran/funcharts -* Date/Publication: 2024-07-19 12:00:31 UTC -* Number of recursive dependencies: 127 - -Run `revdepcheck::cloud_details(, "funcharts")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘funcharts-Ex.R’ failed - The error most likely occurred in: - - > ### Name: pca_mfd - > ### Title: Multivariate functional principal components analysis - > ### Aliases: pca_mfd - > - > ### ** Examples - > - > library(funcharts) - > mfdobj <- data_sim_mfd() - > pca_obj <- pca_mfd(mfdobj) - > plot_pca_mfd(pca_obj) - Error in identicalUnits(x) : object is not a unit - Calls: ... assemble_guides -> guides_build -> unit.c -> identicalUnits - Execution halted - ``` - -# FunnelPlotR +# gapminder
-* Version: 0.5.0 -* GitHub: https://github.com/nhs-r-community/FunnelPlotR -* Source code: https://github.com/cran/FunnelPlotR -* Date/Publication: 2024-04-12 08:40:02 UTC -* Number of recursive dependencies: 85 +* Version: 1.0.0 +* GitHub: https://github.com/jennybc/gapminder +* Source code: https://github.com/cran/gapminder +* Date/Publication: 2023-03-10 09:50:08 UTC +* Number of recursive dependencies: 65 -Run `revdepcheck::cloud_details(, "FunnelPlotR")` for more info +Run `revdepcheck::cloud_details(, "gapminder")` for more info
@@ -8795,108 +7788,128 @@ Run `revdepcheck::cloud_details(, "FunnelPlotR")` for more info * checking examples ... ERROR ``` - Running examples in ‘FunnelPlotR-Ex.R’ failed + Running examples in ‘gapminder-Ex.R’ failed The error most likely occurred in: - > ### Name: funnel_plot - > ### Title: Funnel plots for comparing institutional performance - > ### Aliases: funnel_plot + > ### Name: country_colors + > ### Title: Gapminder color schemes. + > ### Aliases: country_colors continent_colors + > ### Keywords: datasets > > ### ** Examples > - > # We will use the 'medpar' dataset from the 'COUNT' package. ... - > # Draw plot, returning just the plot object - > fp<-funnel_plot(medpar, denominator=prds, numerator=los, - + group = provnum, limit=95, title="An example funnel plot") - > - > # Methods for viewing/extracting - > print(fp) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: print ... drawDetails -> drawDetails.polyline -> grid.Call.graphics + and is now defunct. + ℹ Please use the `show.legend` argument instead. + Backtrace: + ▆ + 1. └─ggplot2::geom_line(lwd = 1, show_guide = FALSE) + 2. └─ggplot2::layer(...) + 3. └─lifecycle::deprecate_stop("2.0.0", "layer(show_guide)", "layer(show.legend)") + 4. └─lifecycle:::deprecate_stop0(msg) + 5. └─rlang::cnd_signal(...) Execution halted ``` +## In both + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘changing_funnel_plot_options.Rmd’ + when running code in ‘gapminder.Rmd’ ... - + family = "poisson", data = medpar) - > medpar$prds <- predict(mod, newdata = medpar, type = "response") + > head(continent_colors) + Africa Americas Asia Europe Oceania + "#7F3B08" "#A50026" "#40004B" "#276419" "#313695" - > funnel_plot(medpar, denominator = prds, numerator = los, - + group = provnum, limit = 99, label = "outlier", draw_unadjusted = TRUE) + > knitr::include_graphics("../man/figures/gapminder-color-scheme-ggplot2.png") - ... - + group = provnum, title = "Length of Stay Funnel plot for `medpar` data", - + draw .... [TRUNCATED] - Plotting using unadjusted limits - - When sourcing ‘funnel_plots.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 + When sourcing ‘gapminder.R’: + Error: Cannot find the file(s): "../man/figures/gapminder-color-scheme-ggplot2.png" Execution halted - ‘changing_funnel_plot_options.Rmd’ using ‘UTF-8’... failed - ‘funnel_plots.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘changing_funnel_plot_options.Rmd’ using rmarkdown - - Quitting from lines 33-49 [dtsetup] (changing_funnel_plot_options.Rmd) - Error: processing vignette 'changing_funnel_plot_options.Rmd' failed with diagnostics: - invalid line type: must be length 2, 4, 6 or 8 - --- failed re-building ‘changing_funnel_plot_options.Rmd’ - - --- re-building ‘funnel_plots.Rmd’ using rmarkdown + ‘gapminder.Rmd’ using ‘UTF-8’... failed ``` -# genekitr +# GEInter
-* Version: 1.2.8 -* GitHub: https://github.com/GangLiLab/genekitr -* Source code: https://github.com/cran/genekitr -* Date/Publication: 2024-09-06 13:00:06 UTC -* Number of recursive dependencies: 202 +* Version: 0.3.2 +* GitHub: NA +* Source code: https://github.com/cran/GEInter +* Date/Publication: 2022-05-19 06:50:19 UTC +* Number of recursive dependencies: 74 -Run `revdepcheck::cloud_details(, "genekitr")` for more info +Run `revdepcheck::cloud_details(, "GEInter")` for more info
## Newly broken +* checking whether package ‘GEInter’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(variable[t], ': unused argument (variable[1:(t - 1)]) + Note: possible error in 'is.element(E_type[1:q], ': unused argument (c("ED")) + Note: possible error in 'is.element(fit$v_type[1:q], ': unused argument (c("ED")) + Note: possible error in 'is.element(b[, 1], a[1])': unused argument (a[1]) + Note: possible error in 'is.element(b[, 2], a[2])': unused argument (a[2]) + See ‘/tmp/workdir/GEInter/new/GEInter.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + RobSBoosting: possible error in is.element(variable[t], variable[1:(t - + 1)]): unused argument (variable[1:(t - 1)]) + plot.Miss.boosting: possible error in is.element(E_type[1:q], c("ED")): + unused argument (c("ED")) + plot.RobSBoosting: possible error in is.element(fit$v_type[1:q], + c("ED")): unused argument (c("ED")) + which.column: possible error in is.element(b[, 1], a[1]): unused + argument (a[1]) + which.column: possible error in is.element(b[, 2], a[2]): unused + argument (a[2]) + ``` + +## In both + * checking examples ... ERROR ``` - Running examples in ‘genekitr-Ex.R’ failed + Running examples in ‘GEInter-Ex.R’ failed The error most likely occurred in: - > ### Name: plotVenn - > ### Title: Venn plot for groups of genes - > ### Aliases: plotVenn + > ### Name: Miss.boosting + > ### Title: Robust gene-environment interaction analysis approach via sparse + > ### boosting, where the missingness in environmental measurements is + > ### effectively accommodated using multiple imputation approach + > ### Aliases: Miss.boosting > > ### ** Examples - > - > k1 = requireNamespace("ComplexUpset",quietly = TRUE) ... - + use_venn = FALSE, - + main_text_size = 15, - + legend_text_size = 8, - + legend_position = 'left' - + ) - + } - Color length should be same with venn_list, auto assign colors... - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plotVenn ... ggplot_add.list -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > + > ##continuous + > E1[7,1]=NA + > fit1<-Miss.boosting(G,E1,Y,im_time=1,loop_time=100,num.knots=c(2),Boundary.knots, + + degree=c(2),v=0.1,tau=0.3,family="continuous",knots=knots,E_type=c("EC","EC","ED","ED")) + [1] "The 1 th impute" + Error in is.element(variable[t], variable[1:(t - 1)]) : + unused argument (variable[1:(t - 1)]) + Calls: Miss.boosting -> RobSBoosting Execution halted ``` +* checking installed package size ... NOTE + ``` + installed size is 7.4Mb + sub-directories of 1Mb or more: + data 7.0Mb + ``` + # geoheatmap
@@ -8905,7 +7918,7 @@ Run `revdepcheck::cloud_details(, "genekitr")` for more info * GitHub: NA * Source code: https://github.com/cran/geoheatmap * Date/Publication: 2024-09-05 15:40:02 UTC -* Number of recursive dependencies: 106 +* Number of recursive dependencies: 105 Run `revdepcheck::cloud_details(, "geoheatmap")` for more info @@ -8942,11 +7955,11 @@ Run `revdepcheck::cloud_details(, "geoheatmap")` for more info
-* Version: 0.1.4 +* Version: 0.1.5 * GitHub: https://github.com/AllanCameron/geomtextpath * Source code: https://github.com/cran/geomtextpath -* Date/Publication: 2024-06-13 06:40:02 UTC -* Number of recursive dependencies: 94 +* Date/Publication: 2025-01-14 17:40:02 UTC +* Number of recursive dependencies: 93 Run `revdepcheck::cloud_details(, "geomtextpath")` for more info @@ -8968,7 +7981,7 @@ Run `revdepcheck::cloud_details(, "geomtextpath")` for more info > ggplot(waterways) + ... 19. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) - 20. │ └─self$draw_panel(data, panel_params, coord, na.rm = FALSE, legend = "other") + 20. │ └─self$draw_panel(...) 21. │ └─geomtextpath (local) draw_panel(...) 22. │ └─geomtextpath:::sf_textgrob(...) 23. └─base::.handleSimpleError(...) @@ -8987,10 +8000,10 @@ Run `revdepcheck::cloud_details(, "geomtextpath")` for more info > library(testthat) > library(geomtextpath) Loading required package: ggplot2 - > - > test_check("geomtextpath") - [ FAIL 1 | WARN 0 | SKIP 4 | PASS 463 ] + Attaching package: 'ggplot2' + + The following object is masked from 'package:base': ... ══ Failed tests ════════════════════════════════════════════════════════════════ ── Error ('test-sf.R:91:3'): We can make grobs from sf features ──────────────── @@ -9004,66 +8017,52 @@ Run `revdepcheck::cloud_details(, "geomtextpath")` for more info Execution halted ``` -# geostan +# ggalign
-* Version: 0.6.2 -* GitHub: https://github.com/ConnorDonegan/geostan -* Source code: https://github.com/cran/geostan -* Date/Publication: 2024-06-04 09:45:37 UTC -* Number of recursive dependencies: 108 +* Version: 0.0.5 +* GitHub: https://github.com/Yunuuuu/ggalign +* Source code: https://github.com/cran/ggalign +* Date/Publication: 2024-11-14 08:00:02 UTC +* Number of recursive dependencies: 78 -Run `revdepcheck::cloud_details(, "geostan")` for more info +Run `revdepcheck::cloud_details(, "ggalign")` for more info
## Newly broken -* checking examples ... ERROR +* checking for code/documentation mismatches ... WARNING ``` - Running examples in ‘geostan-Ex.R’ failed - The error most likely occurred in: - - > ### Name: print.geostan_fit - > ### Title: print or plot a fitted geostan model - > ### Aliases: print.geostan_fit plot.geostan_fit - > - > ### ** Examples - > - > data(georgia) - ... - log(income) -1.013 0.001 0.019 -1.049 -1.029 -1.014 -0.998 -0.974 188 1.003 - - Samples were drawn using NUTS(diag_e) at Tue Sep 10 09:34:29 2024. - For each parameter, n_eff is a crude measure of effective sample size, - and Rhat is the potential scale reduction factor on split chains (at - convergence, Rhat=1). - > plot(fit) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted + Codoc mismatches from documentation object 'plot_theme': + plot_theme + Code: function(..., line, rect, text, title, geom, spacing, margins, + aspect.ratio, axis.title, axis.title.x, + axis.title.x.top, axis.title.x.bottom, axis.title.y, + axis.title.y.left, axis.title.y.right, axis.text, + axis.text.x, axis.text.x.top, axis.text.x.bottom, + axis.text.y, axis.text.y.left, axis.text.y.right, + axis.text.theta, axis.text.r, axis.ticks, + axis.ticks.x, axis.ticks.x.top, axis.ticks.x.bottom, + ... + strip.text.x.top, strip.text.y, strip.text.y.left, + strip.text.y.right, strip.switch.pad.grid, + strip.switch.pad.wrap, complete = FALSE, validate = + TRUE) + Argument names in code not in docs: + geom spacing margins + Mismatches in argument names (first 3): + Position: 6 Code: geom Docs: aspect.ratio + Position: 7 Code: spacing Docs: axis.title + Position: 8 Code: margins Docs: axis.title.x ``` ## In both -* checking installed package size ... NOTE - ``` - installed size is 129.8Mb - sub-directories of 1Mb or more: - libs 127.7Mb - ``` - -* checking dependencies in R code ... NOTE - ``` - Namespaces in Imports field not imported from: - ‘RcppParallel’ ‘rstantools’ - All declared Imports should be used. - ``` - -* checking for GNU extensions in Makefiles ... NOTE +* checking Rd cross-references ... NOTE ``` - GNU make is a SystemRequirements. + Packages unavailable to check Rd xrefs: ‘ComplexHeatmap’, ‘pheatmap’ ``` # GGally @@ -9074,7 +8073,7 @@ Run `revdepcheck::cloud_details(, "geostan")` for more info * GitHub: https://github.com/ggobi/ggally * Source code: https://github.com/cran/GGally * Date/Publication: 2024-02-14 00:53:32 UTC -* Number of recursive dependencies: 146 +* Number of recursive dependencies: 145 Run `revdepcheck::cloud_details(, "GGally")` for more info @@ -9082,31 +8081,6 @@ Run `revdepcheck::cloud_details(, "GGally")` for more info ## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘GGally-Ex.R’ failed - The error most likely occurred in: - - > ### Name: +.gg - > ### Title: Modify a 'ggmatrix' object by adding an 'ggplot2' object to all - > ### plots - > ### Aliases: +.gg add_to_ggmatrix - > - > ### ** Examples - > - ... - > p_ <- GGally::print_if_interactive - > data(tips) - > - > pm <- ggpairs(tips[, 2:4], ggplot2::aes(color = sex)) - > ## change to black and white theme - > pm + ggplot2::theme_bw() - `stat_bin()` using `bins = 30`. Pick better value with `binwidth`. - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - * checking tests ... ERROR ``` Running ‘spelling.R’ @@ -9120,14 +8094,14 @@ Run `revdepcheck::cloud_details(, "GGally")` for more info + test_check("GGally") + } ... - 20. │ └─grid:::grid.draw.grob(x$children[[i]], recording = FALSE) - 21. │ └─grDevices::recordGraphics(drawGrob(x), list(x = x), getNamespace("grid")) - 22. └─grid:::drawGrob(x) - 23. ├─grid::drawDetails(x, recording = FALSE) - 24. └─grid:::drawDetails.polyline(x, recording = FALSE) - 25. └─grid:::grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) + `expected` is a character vector ('tip') + ── Failure ('test-ggsurv.R:26:3'): multiple ──────────────────────────────────── + !is.null(a$labels$group) is not TRUE - [ FAIL 20 | WARN 1 | SKIP 22 | PASS 426 ] + `actual`: FALSE + `expected`: TRUE + + [ FAIL 3 | WARN 1 | SKIP 26 | PASS 477 ] Error: Test failures Execution halted ``` @@ -9140,7 +8114,7 @@ Run `revdepcheck::cloud_details(, "GGally")` for more info * GitHub: https://github.com/thomasp85/gganimate * Source code: https://github.com/cran/gganimate * Date/Publication: 2024-02-27 14:00:03 UTC -* Number of recursive dependencies: 97 +* Number of recursive dependencies: 96 Run `revdepcheck::cloud_details(, "gganimate")` for more info @@ -9156,10 +8130,10 @@ Run `revdepcheck::cloud_details(, "gganimate")` for more info > library(testthat) > library(gganimate) Loading required package: ggplot2 - > - > test_check("gganimate") - [ FAIL 1 | WARN 3 | SKIP 1 | PASS 5 ] + Attaching package: 'ggplot2' + + The following object is masked from 'package:base': ... 3. ├─gganimate::animate(p, nframes = 2) at test-anim_save.R:14:5 4. └─gganimate:::animate.gganim(p, nframes = 2) @@ -9185,7 +8159,7 @@ Run `revdepcheck::cloud_details(, "gganimate")` for more info ! no applicable method for 'element_grob' applied to an object of class "NULL" When sourcing ‘gganimate.R’: - Error: Provided file (/tmp/RtmpPBufaF/165c2292cd97/gganim_plot0001.png) does + Error: Provided file (/tmp/Rtmp2TPR8x/1a1142709f90/gganim_plot0001.png) does not exist Execution halted @@ -9198,251 +8172,45 @@ Run `revdepcheck::cloud_details(, "gganimate")` for more info --- re-building ‘gganimate.Rmd’ using rmarkdown ``` -# ggbrain +# ggblanket
-* Version: 0.8.1 -* GitHub: https://github.com/michaelhallquist/ggbrain -* Source code: https://github.com/cran/ggbrain -* Date/Publication: 2023-03-21 18:00:05 UTC -* Number of recursive dependencies: 74 +* Version: 12.1.0 +* GitHub: https://github.com/davidhodge931/ggblanket +* Source code: https://github.com/cran/ggblanket +* Date/Publication: 2025-01-27 09:00:12 UTC +* Number of recursive dependencies: 111 -Run `revdepcheck::cloud_details(, "ggbrain")` for more info +Run `revdepcheck::cloud_details(, "ggblanket")` for more info
## Newly broken -* checking running R code from vignettes ... ERROR +* checking examples ... ERROR ``` - Errors in running code in vignettes: - when running code in ‘ggbrain_introduction.Rmd’ - ... - - > gg_obj <- gg_base + geom_brain(definition = "underlay", - + fill_scale = scale_fill_gradient(low = "grey8", high = "grey62"), - + show_legend .... [TRUNCATED] - - > gg_obj$render() + Running examples in ‘ggblanket-Ex.R’ failed + The error most likely occurred in: + > ### Name: annotate_axis_line + > ### Title: Replace a axis line with an annotated segment + > ### Aliases: annotate_axis_line + > + > ### ** Examples + > + > library(dplyr) ... - - > plot(gg_obj) - - When sourcing ‘ggbrain_labels.R’: - Error: argument is of length zero + 25. │ │ └─rlang::list2(...) + 26. │ └─scales::alpha(coord$colour, coord$alpha) + 27. │ └─farver::decode_colour(colour, alpha = TRUE) + 28. │ └─farver:::decode_c(...) + 29. └─base::.handleSimpleError(``, "Unknown colour name: ~", base::quote(NULL)) + 30. └─rlang (local) h(simpleError(msg, call)) + 31. └─handlers[[1L]](cnd) + 32. └─cli::cli_abort(...) + 33. └─rlang::abort(...) Execution halted - - ‘ggbrain_aesthetics.Rmd’ using ‘UTF-8’... OK - ‘ggbrain_introduction.Rmd’ using ‘UTF-8’... failed - ‘ggbrain_labels.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘ggbrain_aesthetics.Rmd’ using rmarkdown - --- finished re-building ‘ggbrain_aesthetics.Rmd’ - - --- re-building ‘ggbrain_introduction.Rmd’ using rmarkdown - - Quitting from lines 238-239 [unnamed-chunk-16] (ggbrain_introduction.Rmd) - Error: processing vignette 'ggbrain_introduction.Rmd' failed with diagnostics: - argument is of length zero - ... - Quitting from lines 47-54 [unnamed-chunk-2] (ggbrain_labels.Rmd) - Error: processing vignette 'ggbrain_labels.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘ggbrain_labels.Rmd’ - - SUMMARY: processing the following files failed: - ‘ggbrain_introduction.Rmd’ ‘ggbrain_labels.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 10.8Mb - sub-directories of 1Mb or more: - doc 3.0Mb - extdata 1.6Mb - libs 5.5Mb - ``` - -# ggbreak - -
- -* Version: 0.1.2 -* GitHub: https://github.com/YuLab-SMU/ggbreak -* Source code: https://github.com/cran/ggbreak -* Date/Publication: 2023-06-26 05:40:02 UTC -* Number of recursive dependencies: 64 - -Run `revdepcheck::cloud_details(, "ggbreak")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ggbreak-Ex.R’ failed - The error most likely occurred in: - - > ### Name: scale_wrap - > ### Title: scale-wrap - > ### Aliases: scale_wrap - > - > ### ** Examples - > - > library(ggplot2) - > library(ggbreak) - > p <- ggplot(economics, aes(x=date, y = unemploy, colour = uempmed)) + - + geom_line() - > p + scale_wrap(n=4) - Error in identicalUnits(x) : object is not a unit - Calls: -> print.ggwrap - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ggbreak.Rmd’ - ... - > p1 + p2 - - > p2 + scale_x_break(c(18, 21)) - - > p1 + scale_x_break(c(7, 17), scales = 1.5) + scale_x_break(c(18, - + 21), scales = 2) - - When sourcing ‘ggbreak.R’: - Error: second argument must be a list - Execution halted - - ‘ggbreak.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘ggbreak.Rmd’ using rmarkdown - ``` - -# ggcharts - -
- -* Version: 0.2.1 -* GitHub: https://github.com/thomas-neitmann/ggcharts -* Source code: https://github.com/cran/ggcharts -* Date/Publication: 2020-05-20 00:40:02 UTC -* Number of recursive dependencies: 87 - -Run `revdepcheck::cloud_details(, "ggcharts")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ggcharts-Ex.R’ failed - The error most likely occurred in: - - > ### Name: bar_chart - > ### Title: Bar Chart - > ### Aliases: bar_chart column_chart - > - > ### ** Examples - > - > data(biomedicalrevenue) - > revenue2018 <- biomedicalrevenue[biomedicalrevenue$year == 2018, ] - > revenue_roche <- biomedicalrevenue[biomedicalrevenue$company == "Roche", ] - > - > ## By default bar_chart() creates a horizontal and sorted plot - > bar_chart(revenue2018, company, revenue) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: bar_chart ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(ggcharts) - Loading required package: ggplot2 - > - > test_check("ggcharts") - [ FAIL 1 | WARN 0 | SKIP 0 | PASS 4 ] - - ... - 4. └─ggcharts::bar_chart(revenue_2018, company, revenue) - 5. └─ggplot2:::`+.gg`(...) - 6. └─ggplot2:::add_ggplot(e1, e2, e2name) - 7. ├─ggplot2::ggplot_add(object, p, objectname) - 8. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 9. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 1 | WARN 0 | SKIP 0 | PASS 4 ] - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘customize.Rmd’ - ... - > dreaded_lang <- tibble::tribble(~language, ~pct, "VBA", - + 75.2, "Objective-C", 68.7, "Assembly", 64.4, "C", 57.5, "PHP", - + 54.2, "Erlang", .... [TRUNCATED] - - > (chart <- lollipop_chart(dreaded_lang, language, pct, - + highlight = "R")) - - ... - - > lollipop_chart(diamonds, cut, highlight = "Good") - - When sourcing ‘themes.R’: - Error: argument is of length zero - Execution halted - - ‘customize.Rmd’ using ‘UTF-8’... failed - ‘highlight.Rmd’ using ‘UTF-8’... failed - ‘themes.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘customize.Rmd’ using rmarkdown - - Quitting from lines 25-44 [unnamed-chunk-2] (customize.Rmd) - Error: processing vignette 'customize.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘customize.Rmd’ - - --- re-building ‘highlight.Rmd’ using rmarkdown - - Quitting from lines 37-44 [unnamed-chunk-2] (highlight.Rmd) - Error: processing vignette 'highlight.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘highlight.Rmd’ - - --- re-building ‘themes.Rmd’ using rmarkdown ``` # ggdark @@ -9453,7 +8221,7 @@ Run `revdepcheck::cloud_details(, "ggcharts")` for more info * GitHub: NA * Source code: https://github.com/cran/ggdark * Date/Publication: 2019-01-11 17:30:06 UTC -* Number of recursive dependencies: 46 +* Number of recursive dependencies: 45 Run `revdepcheck::cloud_details(, "ggdark")` for more info @@ -9518,6 +8286,29 @@ Run `revdepcheck::cloud_details(, "ggdark")` for more info 'LazyData' is specified without a 'data' directory ``` +# ggdemetra + +
+ +* Version: 0.2.8 +* GitHub: https://github.com/AQLT/ggdemetra +* Source code: https://github.com/cran/ggdemetra +* Date/Publication: 2024-02-04 14:50:02 UTC +* Number of recursive dependencies: 54 + +Run `revdepcheck::cloud_details(, "ggdemetra")` for more info + +
+ +## Newly broken + +* checking whether package ‘ggdemetra’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: `aes_()` was deprecated in ggplot2 3.0.0. + See ‘/tmp/workdir/ggdemetra/new/ggdemetra.Rcheck/00install.out’ for details. + ``` + # ggdist
@@ -9526,7 +8317,7 @@ Run `revdepcheck::cloud_details(, "ggdark")` for more info * GitHub: https://github.com/mjskay/ggdist * Source code: https://github.com/cran/ggdist * Date/Publication: 2024-03-05 05:30:23 UTC -* Number of recursive dependencies: 127 +* Number of recursive dependencies: 126 Run `revdepcheck::cloud_details(, "ggdist")` for more info @@ -9554,7 +8345,7 @@ Run `revdepcheck::cloud_details(, "ggdist")` for more info + stat_slabinterval(aes(alpha = !!p_(x))) Error in use_defaults(..., self = self) : unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, - NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NU + NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, Calls: ... -> -> compute_geom_2 -> Execution halted ``` @@ -9627,7 +8418,7 @@ Run `revdepcheck::cloud_details(, "ggdist")` for more info ℹ Error occurred in the 1st layer. Caused by error in `use_defaults()`: ! unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(7, 0, 0, 0), NULL, FALSE), list(NULL, NULL, NULL, NULL, NULL, - 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 7, 0, 0), NULL, FALSE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), + 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 7, 0, 0), NULL, FALSE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0 Execution halted ‘dotsinterval.Rmd’ using ‘UTF-8’... failed @@ -9645,98 +8436,6 @@ Run `revdepcheck::cloud_details(, "ggdist")` for more info help 1.5Mb ``` -# ggeasy - -
- -* Version: 0.1.4 -* GitHub: https://github.com/jonocarroll/ggeasy -* Source code: https://github.com/cran/ggeasy -* Date/Publication: 2023-03-12 10:00:23 UTC -* Number of recursive dependencies: 94 - -Run `revdepcheck::cloud_details(, "ggeasy")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ggeasy-Ex.R’ failed - The error most likely occurred in: - - > ### Name: easy_labs - > ### Title: Easily add ggplot labels using label attribute of 'data.frame' - > ### column - > ### Aliases: easy_labs - > - > ### ** Examples - > - ... - + ggplot2::geom_line(ggplot2::aes(colour=Species)) - > - > p - > - > p + easy_labs() - > p + easy_labs(title = "Plot Title", subtitle = 'Plot Subtitle', x = 'x axis label') - Error in utils::modifyList(p_labs, as.list(unlist(man_labs))) : - is.list(x) is not TRUE - Calls: +.gg ... ggplot_add.easy_labs -> easy_update_labs -> -> stopifnot - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(ggeasy) - > - > test_check("ggeasy") - [ FAIL 6 | WARN 0 | SKIP 1 | PASS 505 ] - - ══ Skipped tests (1) ═══════════════════════════════════════════════════════════ - ... - 1. └─ggeasy (local) expect_eqNe(easy_res$labels[sort(names(easy_res$labels))], hard_res$labels[sort(names(hard_res$labels))]) at test-labs.R:76:3 - 2. └─testthat::expect_equal(..., check.environment = FALSE) at test-labs.R:6:16 - - [ FAIL 6 | WARN 0 | SKIP 1 | PASS 505 ] - Deleting unused snapshots: - • labs/labels-attrib.svg - • labs/labels-manual.svg - • labs/labels-mytitle.svg - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘shortcuts.Rmd’ - ... - - > p1 <- p + labs(title = "default labels") - - > p2 <- p + easy_labs() + labs(title = "Replace titles with column labels") - - > p3 <- p + easy_labs(x = "My x axis") + labs(title = "Manually add x axis label") - - When sourcing ‘shortcuts.R’: - Error: is.list(x) is not TRUE - Execution halted - - ‘shortcuts.Rmd’ using ‘UTF-8’... failed - ‘tests_and_coverage.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘shortcuts.Rmd’ using rmarkdown - ``` - # ggedit
@@ -9745,7 +8444,7 @@ Run `revdepcheck::cloud_details(, "ggeasy")` for more info * GitHub: https://github.com/yonicd/ggedit * Source code: https://github.com/cran/ggedit * Date/Publication: 2024-03-04 14:40:02 UTC -* Number of recursive dependencies: 95 +* Number of recursive dependencies: 94 Run `revdepcheck::cloud_details(, "ggedit")` for more info @@ -9758,19 +8457,19 @@ Run `revdepcheck::cloud_details(, "ggedit")` for more info Running examples in ‘ggedit-Ex.R’ failed The error most likely occurred in: - > ### Name: dput.ggedit - > ### Title: Convert ggplot object to a string call - > ### Aliases: dput.ggedit + > ### Name: compare + > ### Title: compare + > ### Aliases: compare > > ### ** Examples > - > - > pList$pointSmooth #original compiled plot - `geom_smooth()` using formula = 'y ~ x' - Error in compute_geom_2(..., self = self) : - unused arguments (list(6), list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, - NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, - Calls: ... get_layer_key -> Map -> mapply -> -> + > compare(ggplot2::theme_bw(),ggplot2::theme_get()) + [1] "theme(panel.background=element_rect(fill='white'),panel.grid=element_line(arrow.fill=''#'*EBEBEBFF',colour=''#'*EBEBEBFF'),strip.background=element_rect(colour=''#'*333333FF'))" + > compare(ggplot2::theme_bw(),ggplot2::theme_get(),verbose=FALSE) + Error in parse(text = out) : :2:0: unexpected end of input + 1: theme(panel.background=element_rect(fill='white'),panel.grid=element_line(arrow.fill=''#'*EBEBEBFF',colour=''#'*EBEBEBFF'),strip.background=element_rect(colour=''#'*333333FF')) + ^ + Calls: compare -> eval -> parse Execution halted ``` @@ -9782,7 +8481,7 @@ Run `revdepcheck::cloud_details(, "ggedit")` for more info * GitHub: https://github.com/kiangkiangkiang/ggESDA * Source code: https://github.com/cran/ggESDA * Date/Publication: 2022-08-19 08:40:10 UTC -* Number of recursive dependencies: 214 +* Number of recursive dependencies: 218 Run `revdepcheck::cloud_details(, "ggESDA")` for more info @@ -9795,162 +8494,43 @@ Run `revdepcheck::cloud_details(, "ggESDA")` for more info Running examples in ‘ggESDA-Ex.R’ failed The error most likely occurred in: - > ### Name: BLOOD - > ### Title: BLOOD data example - > ### Aliases: BLOOD - > ### Keywords: datasets + > ### Name: ggInterval_scatter + > ### Title: scatter plot for two continuous interval data + > ### Aliases: ggInterval_scatter > > ### ** Examples > - > data(BLOOD) - > ggInterval_minmax(BLOOD, aes(x = Hematocrit)) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ggInterval_minmax ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ggESDA.Rmd’ - ... - [1] "knit_image_paths" "knit_asis" - - > CONCEPT <- rep(c("FRA", "HUS", "INC", "ISA", "JPL", - + "KHA", "LOT", "PHI", "ROM"), each = 3) - - > p <- ggInterval_PCA(facedata, poly = T, concepts_group = CONCEPT) - - When sourcing ‘ggESDA.R’: - Error: argument is of length zero - Execution halted - - ‘ggESDA.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘ggESDA.Rmd’ using rmarkdown - - Quitting from lines 390-406 [ggInterval_PCA] (ggESDA.Rmd) - Error: processing vignette 'ggESDA.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘ggESDA.Rmd’ - - SUMMARY: processing the following file failed: - ‘ggESDA.Rmd’ - - Error: Vignette re-building failed. + > a<-rnorm(1000,0,5) + ... + 11. │ └─base::withCallingHandlers(...) + 12. └─ggplot2 (local) f(l = layers[[i]], d = data[[i]]) + 13. └─l$compute_geom_2(d, theme = plot$theme) + 14. └─ggplot2 (local) compute_geom_2(..., self = self) + 15. └─self$geom$use_defaults(...) + 16. └─ggplot2 (local) use_defaults(..., self = self) + 17. └─ggplot2:::check_aesthetics(new_params, nrow(data)) + 18. └─cli::cli_abort(...) + 19. └─rlang::abort(...) Execution halted ``` -# ggExtra +# ggfixest
-* Version: 0.10.1 -* GitHub: https://github.com/daattali/ggExtra -* Source code: https://github.com/cran/ggExtra -* Date/Publication: 2023-08-21 14:40:02 UTC -* Number of recursive dependencies: 117 +* Version: 0.2.0 +* GitHub: https://github.com/grantmcdermott/ggfixest +* Source code: https://github.com/cran/ggfixest +* Date/Publication: 2025-01-22 01:00:02 UTC +* Number of recursive dependencies: 78 -Run `revdepcheck::cloud_details(, "ggExtra")` for more info +Run `revdepcheck::cloud_details(, "ggfixest")` for more info
## Newly broken -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ggExtra.Rmd’ - ... - - > p1 <- ggplot(df1, aes(x, y)) + geom_point() + theme_bw() - - > p1 - - > ggMarginal(p1) - - When sourcing ‘ggExtra.R’: - Error: argument is of length zero - Execution halted - - ‘ggExtra.Rmd’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘ggExtra.Rmd’ using rmarkdown - ``` - -## In both - -* checking dependencies in R code ... NOTE - ``` - Namespaces in Imports field not imported from: - ‘R6’ ‘scales’ ‘utils’ - All declared Imports should be used. - ``` - -# ggfacto - -
- -* Version: 0.3.1 -* GitHub: https://github.com/BriceNocenti/ggfacto -* Source code: https://github.com/cran/ggfacto -* Date/Publication: 2024-08-30 15:00:02 UTC -* Number of recursive dependencies: 164 - -Run `revdepcheck::cloud_details(, "ggfacto")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ggfacto-Ex.R’ failed - The error most likely occurred in: - - > ### Name: MCA2 - > ### Title: Multiple Correspondence Analysis - > ### Aliases: MCA2 - > - > ### ** Examples - > - > data(tea, package = "FactoMineR") - > res.mca <- MCA2(tea, active_vars = 1:18) - > - > res.mca %>% - + ggmca(tea, sup_vars = c("SPC"), ylim = c(NA, 1.2), text_repel = TRUE) %>% - + ggi() #to make the graph interactive - Error in if (new_name %in% existing) { : argument is of length zero - Calls: %>% ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -# ggfixest - -
- -* Version: 0.1.0 -* GitHub: https://github.com/grantmcdermott/ggfixest -* Source code: https://github.com/cran/ggfixest -* Date/Publication: 2023-12-14 08:00:06 UTC -* Number of recursive dependencies: 78 - -Run `revdepcheck::cloud_details(, "ggfixest")` for more info - -
- -## Newly broken - -* checking tests ... ERROR +* checking tests ... ERROR ``` Running ‘tinytest.R’ Running the tests in ‘tests/tinytest.R’ failed. @@ -9963,7 +8543,6 @@ Run `revdepcheck::cloud_details(, "ggfixest")` for more info + library(fixest) + setFixest_nthreads(1) ... - ----- FAILED[]: test_ggiplot.R<192--192> call| expect_snapshot_plot(p19a, label = "ggiplot_multi_complex_kitchen_iid") diff| 1774 info| Diff plot saved to: _tinysnapshot_review/ggiplot_multi_complex_kitchen_iid.png @@ -9971,79 +8550,11 @@ Run `revdepcheck::cloud_details(, "ggfixest")` for more info call| expect_snapshot_plot(p19b, label = "ggiplot_multi_complex_kitchen_iid") diff| 1774 info| Diff plot saved to: _tinysnapshot_review/ggiplot_multi_complex_kitchen_iid.png - Error: 16 out of 101 tests failed + Error: 5 out of 103 tests failed + In addition: There were 11 warnings (use warnings() to see them) Execution halted ``` -## In both - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ggiplot.Rmd’ - ... - > iplot(list(TWFE = est_twfe_grp, `Sun & Abraham (2020)` = est_sa20_grp), - + ref.line = -1, main = "Staggered treatment: Split mutli-sample") - The degrees of freedom for the t distribution could not be deduced. Using a Normal distribution instead. - Note that you can provide the argument `df.t` directly. - - When sourcing ‘ggiplot.R’: - Error: in iplot(list(TWFE = est_twfe_grp, `Sun & Abraham (2...: - The 1st element of 'object' raises and error: - Error in nb * sd : non-numeric argument to binary operator - Execution halted - - ‘ggiplot.Rmd’ using ‘UTF-8’... failed - ``` - -# ggfocus - -
- -* Version: 1.0.0 -* GitHub: https://github.com/Freguglia/ggfocus -* Source code: https://github.com/cran/ggfocus -* Date/Publication: 2020-01-23 13:20:02 UTC -* Number of recursive dependencies: 55 - -Run `revdepcheck::cloud_details(, "ggfocus")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘introduction_to_ggfocus.Rmd’ - ... - + geom_point() + scale_alpha_focus(c("A", "B"), alpha_other = 0.5) + - + scale_c .... [TRUNCATED] - - > ggplot(datasets::airquality, aes(x = Day, y = Temp, - + linetype = factor(Month), group = factor(Month))) + geom_line() + - + scale_linetype_f .... [TRUNCATED] - - When sourcing ‘introduction_to_ggfocus.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘introduction_to_ggfocus.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘introduction_to_ggfocus.Rmd’ using rmarkdown - ``` - -## In both - -* checking LazyData ... NOTE - ``` - 'LazyData' is specified without a 'data' directory - ``` - # ggforce
@@ -10084,9 +8595,9 @@ Run `revdepcheck::cloud_details(, "ggforce")` for more info * checking installed package size ... NOTE ``` - installed size is 27.8Mb + installed size is 27.3Mb sub-directories of 1Mb or more: - R 1.5Mb + R 1.0Mb help 1.2Mb libs 25.0Mb ``` @@ -10099,7 +8610,7 @@ Run `revdepcheck::cloud_details(, "ggforce")` for more info * GitHub: https://github.com/ProjectMOSAIC/ggformula * Source code: https://github.com/cran/ggformula * Date/Publication: 2023-11-09 12:30:07 UTC -* Number of recursive dependencies: 123 +* Number of recursive dependencies: 122 Run `revdepcheck::cloud_details(, "ggformula")` for more info @@ -10107,68 +8618,6 @@ Run `revdepcheck::cloud_details(, "ggformula")` for more info ## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘ggformula-Ex.R’ failed - The error most likely occurred in: - - > ### Name: discrete_breaks - > ### Title: Discrete Breaks - > ### Aliases: discrete_breaks - > - > ### ** Examples - > - > x <- rbinom(100, 100, 0.4) - > p <- gf_bar( ~ x) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: gf_bar ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(ggformula) - Loading required package: ggplot2 - Loading required package: scales - Loading required package: ggridges - - New to ggformula? Try the tutorials: - ... - • layer-factory/gf-text1.svg - • layer-factory/gf-text2.svg - • layer-factory/gf-tile1.svg - • layer-factory/proportions-within-all-dodge.svg - • layer-factory/proportions-within-fill-dodge.svg - • layer-factory/proportions-within-fill-facet-grid-and-group.svg - • layer-factory/proportions-within-fill-facet-grid.svg - • layer-factory/proportions-within-group-facet-grid.svg - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ggformula.Rmd’ - ... - - > theme_set(theme_light()) - - > library(ggformula) - - > gf_point(mpg ~ hp, data = mtcars) - - When sourcing ‘ggformula.R’: - Error: argument is of length zero - Execution halted - - ‘ggformula.Rmd’ using ‘UTF-8’... failed - ``` - * checking for code/documentation mismatches ... WARNING ``` Codoc mismatches from documentation object 'gf_abline': @@ -10194,24 +8643,6 @@ Run `revdepcheck::cloud_details(, "ggformula")` for more info Position: 17 Code: show.help Docs: inherit ``` -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘ggformula.Rmd’ using rmarkdown - - Quitting from lines 106-109 [simple-example] (ggformula.Rmd) - Error: processing vignette 'ggformula.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘ggformula.Rmd’ - - SUMMARY: processing the following file failed: - ‘ggformula.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - ## In both * checking Rd cross-references ... NOTE @@ -10227,7 +8658,7 @@ Run `revdepcheck::cloud_details(, "ggformula")` for more info * GitHub: https://github.com/sinhrks/ggfortify * Source code: https://github.com/cran/ggfortify * Date/Publication: 2024-04-17 04:30:04 UTC -* Number of recursive dependencies: 125 +* Number of recursive dependencies: 124 Run `revdepcheck::cloud_details(, "ggfortify")` for more info @@ -10235,25 +8666,6 @@ Run `revdepcheck::cloud_details(, "ggfortify")` for more info ## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘ggfortify-Ex.R’ failed - The error most likely occurred in: - - > ### Name: autoplot.cv.glmnet - > ### Title: Autoplot 'glmnet::cv.glmnet' - > ### Aliases: autoplot.cv.glmnet - > - > ### ** Examples - > - > if (requireNamespace("survival", quietly = TRUE)) { - + autoplot(glmnet::cv.glmnet(data.matrix(Orange[-3]), data.matrix(Orange[3]))) - + } - Error in if (new_name %in% existing) { : argument is of length zero - Calls: autoplot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - * checking tests ... ERROR ``` Running ‘test-all.R’ @@ -10267,79 +8679,29 @@ Run `revdepcheck::cloud_details(, "ggfortify")` for more info > test_check('ggfortify') Loading required package: ggfortify ... - 3. └─ggfortify:::autoplot.ts(original.data, columns = "Data", ...) - 4. └─ggplot2:::`+.gg`(p, do.call(geom_factory, args)) - 5. └─ggplot2:::add_ggplot(e1, e2, e2name) - 6. ├─ggplot2::ggplot_add(object, p, objectname) - 7. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 8. └─ggplot2:::new_layer_names(object, names(plot$layers)) - [ FAIL 32 | WARN 10 | SKIP 47 | PASS 358 ] + x[3]: "#595959FF" + y[3]: "grey35" + + x[4]: "#595959FF" + y[4]: "grey35" + + [ FAIL 5 | WARN 13 | SKIP 48 | PASS 734 ] Error: Test failures Execution halted ``` -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘basics.Rmd’ - ... - + warning = FALSE) - - > library(ggfortify) - Loading required package: ggplot2 - - > autoplot(AirPassengers) - - ... - Error: argument is of length zero - Execution halted - - ‘basics.Rmd’ using ‘UTF-8’... failed - ‘plot_dist.Rmd’ using ‘UTF-8’... failed - ‘plot_lm.Rmd’ using ‘UTF-8’... OK - ‘plot_map.Rmd’ using ‘UTF-8’... failed - ‘plot_pca.Rmd’ using ‘UTF-8’... OK - ‘plot_surv.Rmd’ using ‘UTF-8’... failed - ‘plot_ts.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘basics.Rmd’ using knitr - - Attaching package: 'zoo' - - The following objects are masked from 'package:base': - - as.Date, as.Date.numeric - - - ... - - Quitting from lines 20-22 [unnamed-chunk-1] (plot_dist.Rmd) - Error: processing vignette 'plot_dist.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘plot_dist.Rmd’ - - --- re-building ‘plot_lm.Rmd’ using knitr - --- finished re-building ‘plot_lm.Rmd’ - - --- re-building ‘plot_map.Rmd’ using knitr - ``` - -# gggenomes +# ggh4x
-* Version: 1.0.1 -* GitHub: https://github.com/thackl/gggenomes -* Source code: https://github.com/cran/gggenomes -* Date/Publication: 2024-08-30 11:40:02 UTC -* Number of recursive dependencies: 112 +* Version: 0.3.0 +* GitHub: https://github.com/teunbrand/ggh4x +* Source code: https://github.com/cran/ggh4x +* Date/Publication: 2024-12-15 17:20:02 UTC +* Number of recursive dependencies: 76 -Run `revdepcheck::cloud_details(, "gggenomes")` for more info +Run `revdepcheck::cloud_details(, "ggh4x")` for more info
@@ -10347,91 +8709,27 @@ Run `revdepcheck::cloud_details(, "gggenomes")` for more info * checking examples ... ERROR ``` - Running examples in ‘gggenomes-Ex.R’ failed + Running examples in ‘ggh4x-Ex.R’ failed The error most likely occurred in: - > ### Name: flip - > ### Title: Flip bins and sequences - > ### Aliases: flip flip_seqs sync + > ### Name: guide_stringlegend + > ### Title: String legend + > ### Aliases: guide_stringlegend > > ### ** Examples > - > library(patchwork) - ... - > p4 <- p %>% - + add_clusters(emale_cogs) %>% - + sync() + labs(caption = "shared orthologs") - Joining with `by = join_by(feat_id)` - Flipping: E4-10_086,E4-10_112,RCC970_016B + > p <- ggplot(mpg, aes(displ, hwy)) + + + geom_point(aes(colour = manufacturer)) > - > p0 + p1 + p2 + p3 + p4 + plot_layout(nrow = 1, guides = "collect") - Error in as.unit(value) : object is not coercible to a unit - Calls: ... assemble_guides -> guides_build -> [<- -> [<-.unit -> as.unit - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘flip.Rmd’ - ... - > p4 <- p %>% add_clusters(emale_cogs) %>% sync() + - + labs(caption = "shared orthologs") - Joining with `by = join_by(feat_id)` - Flipping: E4-10_086,E4-10_112,RCC970_016B - - > p0 + p1 + p2 + p3 + p4 + plot_layout(nrow = 1, guides = "collect") - - When sourcing ‘flip.R’: - Error: object is not coercible to a unit - Execution halted - - ‘emales.Rmd’ using ‘UTF-8’... OK - ‘flip.Rmd’ using ‘UTF-8’... failed - ‘gggenomes.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘emales.Rmd’ using rmarkdown - --- finished re-building ‘emales.Rmd’ - - --- re-building ‘flip.Rmd’ using rmarkdown - - Quitting from lines 17-44 [unnamed-chunk-2] (flip.Rmd) - Error: processing vignette 'flip.Rmd' failed with diagnostics: - object is not coercible to a unit - --- failed re-building ‘flip.Rmd’ - ... - virophages) - emale_tirs Terminal inverted repeats of 6 EMALE genomes - - --- finished re-building ‘gggenomes.Rmd’ - - SUMMARY: processing the following file failed: - ‘flip.Rmd’ - - Error: Vignette re-building failed. + > # String legend can be set in the `guides()` function + > p + guides(colour = guide_stringlegend(ncol = 2)) + Error in get_layer_key(...) : + unused argument (list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, + NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NULL, N + Calls: ... -> -> process_layers -> Execution halted ``` -# ggh4x - -
- -* Version: 0.2.8 -* GitHub: https://github.com/teunbrand/ggh4x -* Source code: https://github.com/cran/ggh4x -* Date/Publication: 2024-01-23 21:00:02 UTC -* Number of recursive dependencies: 77 - -Run `revdepcheck::cloud_details(, "ggh4x")` for more info - -
- -## Newly broken - * checking tests ... ERROR ``` Running ‘testthat.R’ @@ -10440,55 +8738,52 @@ Run `revdepcheck::cloud_details(, "ggh4x")` for more info > library(testthat) > library(ggh4x) Loading required package: ggplot2 - > - > test_check("ggh4x") - [ FAIL 1 | WARN 20 | SKIP 18 | PASS 757 ] - ... - ══ Failed tests ════════════════════════════════════════════════════════════════ - ── Failure ('test-facet_wrap2.R:64:3'): facet_wrap2() can some repeat axes ───── - sum(ctrl) (`actual`) not equal to 4L (`expected`). + Attaching package: 'ggplot2' - `actual`: 3 - `expected`: 4 + The following object is masked from 'package:base': + ... + 11. └─base::Map(...) + 12. └─base::mapply(FUN = f, ..., SIMPLIFY = FALSE) + 13. └─ggplot2 (local) ``(guide = dots[[1L]][[1L]], param = dots[[2L]][[1L]]) + 14. └─guide$process_layers(param, layers, data, theme) + 15. └─ggplot2 (local) process_layers(..., self = self) + 16. └─self$get_layer_key(params, layers[include], data[include], theme) - [ FAIL 1 | WARN 20 | SKIP 18 | PASS 757 ] + [ FAIL 1 | WARN 0 | SKIP 15 | PASS 663 ] Error: Test failures Execution halted ``` -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘Facets.Rmd’ using rmarkdown - ``` - -## In both - * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘Statistics.Rmd’ + when running code in ‘Miscellaneous.Rmd’ ... - > incorrect$x[15] <- sqrt(2) + + aest .... [TRUNCATED] - > ggplot(incorrect, aes(x, colour = group)) + stat_theodensity(distri = "nbinom") + > ggplot(diamonds, aes(price, carat, colour = clarity)) + + + geom_point(shape = ".") + scale_colour_brewer(palette = "Dark2", + + guide = "stri ..." ... [TRUNCATED] - When sourcing ‘Statistics.R’: - Error: Problem while computing stat. - ℹ Error occurred in the 1st layer. - Caused by error in `setup_params()`: - ! A discrete 'nbinom' distribution cannot be fitted to continuous data. + When sourcing ‘Miscellaneous.R’: + Error: unused argument (list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, + NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NULL, NUL Execution halted ‘Facets.Rmd’ using ‘UTF-8’... OK - ‘Miscellaneous.Rmd’ using ‘UTF-8’... OK - ‘PositionGuides.Rmd’ using ‘UTF-8’... OK - ‘Statistics.Rmd’ using ‘UTF-8’... failed + ‘Miscellaneous.Rmd’ using ‘UTF-8’... failed + ‘Statistics.Rmd’ using ‘UTF-8’... OK ‘ggh4x.Rmd’ using ‘UTF-8’... OK ``` -# gghighlight +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘Facets.Rmd’ using rmarkdown + ``` + +# gghighlight
@@ -10537,10 +8832,10 @@ Run `revdepcheck::cloud_details(, "gghighlight")` for more info > library(testthat) > library(gghighlight) Loading required package: ggplot2 - > - > test_check("gghighlight") - label_key: type - label_key: type + + Attaching package: 'ggplot2' + + The following object is masked from 'package:base': ... 15. └─cli::cli_abort(...) 16. └─rlang::abort(...) @@ -10579,56 +8874,14 @@ Run `revdepcheck::cloud_details(, "gghighlight")` for more info --- re-building ‘gghighlight.Rmd’ using rmarkdown ``` -# ggHoriPlot - -
- -* Version: 1.0.1 -* GitHub: https://github.com/rivasiker/ggHoriPlot -* Source code: https://github.com/cran/ggHoriPlot -* Date/Publication: 2022-10-11 16:22:33 UTC -* Number of recursive dependencies: 117 - -Run `revdepcheck::cloud_details(, "ggHoriPlot")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ggHoriPlot.Rmd’ - ... - > mid <- sum(range(dat_tab$y, na.rm = T))/2 - - > b <- plotAllLayers(dat_tab, mid, cutpoints$cuts, cutpoints$color) - - > b/a + plot_layout(guides = "collect", heights = c(6, - + 1)) - - When sourcing ‘ggHoriPlot.R’: - Error: object is not a unit - Execution halted - - ‘examples.Rmd’ using ‘UTF-8’... OK - ‘ggHoriPlot.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘examples.Rmd’ using rmarkdown - ``` - # ggiraph
-* Version: 0.8.10 +* Version: 0.8.12 * GitHub: https://github.com/davidgohel/ggiraph * Source code: https://github.com/cran/ggiraph -* Date/Publication: 2024-05-17 12:10:02 UTC +* Date/Publication: 2025-01-08 11:10:02 UTC * Number of recursive dependencies: 89 Run `revdepcheck::cloud_details(, "ggiraph")` for more info @@ -10642,23 +8895,23 @@ Run `revdepcheck::cloud_details(, "ggiraph")` for more info Running examples in ‘ggiraph-Ex.R’ failed The error most likely occurred in: - > ### Name: annotate_interactive - > ### Title: Create interactive annotations - > ### Aliases: annotate_interactive + > ### Name: geom_path_interactive + > ### Title: Create interactive observations connections + > ### Aliases: geom_path_interactive geom_line_interactive + > ### geom_step_interactive > > ### ** Examples > - > # add interactive annotation to a ggplot ------- ... - > - > gg <- ggplot(mtcars, aes(x = disp, y = qsec )) + - + geom_point(size=2) + - + annotate_interactive( - + "rect", xmin = 100, xmax = 400, fill = "red", - + data_id = "an_id", tooltip = "a tooltip", - + ymin = 18, ymax = 20, alpha = .5) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: +.gg ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + 20. │ └─base::lapply(...) + 21. │ └─ggplot2 (local) FUN(X[[i]], ...) + 22. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 23. │ └─self$draw_panel(...) + 24. └─base::.handleSimpleError(...) + 25. └─rlang (local) h(simpleError(msg, call)) + 26. └─handlers[[1L]](cnd) + 27. └─cli::cli_abort(...) + 28. └─rlang::abort(...) Execution halted ``` @@ -10673,17 +8926,17 @@ Run `revdepcheck::cloud_details(, "ggiraph")` for more info test-annotate_interactive.R... 0 tests test-annotate_interactive.R... 0 tests - test-annotate_interactive.R... 0 tests + Attaching package: 'ggplot2' ... - test-geom_density_interactive.R 8 tests OK 8ms - - test-geom_dotplot_interactive.R 0 tests - test-geom_dotplot_interactive.R 0 tests - test-geom_dotplot_interactive.R 0 tests - test-geom_dotplot_interactive.R 0 tests - test-geom_dotplot_interactive.R 0 tests - test-geom_dotplot_interactive.R 8 tests OK Error in if (new_name %in% existing) { : argument is of length zero - Calls: ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + 30. │ └─base::lapply(...) + 31. │ └─ggplot2 (local) FUN(X[[i]], ...) + 32. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 33. │ └─self$draw_panel(...) + 34. └─base::.handleSimpleError(...) + 35. └─rlang (local) h(simpleError(msg, call)) + 36. └─handlers[[1L]](cnd) + 37. └─cli::cli_abort(...) + 38. └─rlang::abort(...) Execution halted ``` @@ -10691,95 +8944,55 @@ Run `revdepcheck::cloud_details(, "ggiraph")` for more info * checking installed package size ... NOTE ``` - installed size is 9.9Mb + installed size is 8.1Mb sub-directories of 1Mb or more: R 1.5Mb - libs 7.1Mb + libs 5.2Mb ``` -# ggiraphExtra +# ggmap
-* 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: 111 +* Version: 4.0.0 +* GitHub: https://github.com/dkahle/ggmap +* Source code: https://github.com/cran/ggmap +* Date/Publication: 2023-11-19 08:10:02 UTC +* Number of recursive dependencies: 65 -Run `revdepcheck::cloud_details(, "ggiraphExtra")` for more info +Run `revdepcheck::cloud_details(, "ggmap")` for more info
## Newly broken -* checking examples ... ERROR +* checking whether package ‘ggmap’ can be installed ... WARNING ``` - 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) - ... - addLabelDf, getMapping - - > require(ggplot2) - Loading required package: ggplot2 - > require(ggiraph) - Loading required package: ggiraph - > ggAncova(radial,aes(age,NTAV,color=sex),interactive=TRUE) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ggAncova ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted + Found the following significant warnings: + Warning: `aes_()` was deprecated in ggplot2 3.0.0. + See ‘/tmp/workdir/ggmap/new/ggmap.Rcheck/00install.out’ for details. ``` -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ggPredict.Rmd’ - ... - - - > require(plyr) - Loading required package: plyr - - > ggPredict(fit, se = TRUE, interactive = TRUE) - - ... - - > ggPoints(aes(x = wt, y = mpg, color = am), data = mtcars, - + method = "lm", interactive = TRUE) - - When sourcing ‘introduction.R’: - Error: argument is of length zero - Execution halted - - ‘ggPredict.Rmd’ using ‘UTF-8’... failed - ‘introduction.Rmd’ using ‘UTF-8’... failed - ``` +## In both -* checking re-building of vignette outputs ... NOTE +* checking installed package size ... NOTE ``` - Error(s) in re-building vignettes: - --- re-building ‘ggPredict.Rmd’ using rmarkdown + installed size is 7.4Mb + sub-directories of 1Mb or more: + data 7.0Mb ``` -# ggmatplot +# ggmcmc
-* Version: 0.1.2 -* GitHub: https://github.com/xuan-liang/ggmatplot -* Source code: https://github.com/cran/ggmatplot -* Date/Publication: 2022-05-17 02:20:02 UTC -* Number of recursive dependencies: 81 +* Version: 1.5.1.1 +* GitHub: https://github.com/xfim/ggmcmc +* Source code: https://github.com/cran/ggmcmc +* Date/Publication: 2021-02-10 10:50:10 UTC +* Number of recursive dependencies: 74 -Run `revdepcheck::cloud_details(, "ggmatplot")` for more info +Run `revdepcheck::cloud_details(, "ggmcmc")` for more info
@@ -10787,84 +9000,54 @@ Run `revdepcheck::cloud_details(, "ggmatplot")` for more info * checking examples ... ERROR ``` - Running examples in ‘ggmatplot-Ex.R’ failed + Running examples in ‘ggmcmc-Ex.R’ failed The error most likely occurred in: - > ### Name: ggmatplot - > ### Title: ggmatplot - > ### Aliases: ggmatplot + > ### Name: ggs_geweke + > ### Title: Dotplot of the Geweke diagnostic, the standard Z-score + > ### Aliases: ggs_geweke > > ### ** Examples > - > - > # Define a data set - > iris_sub <- subset(iris, Species == "setosa") - > ggmatplot(iris_sub[, c(1, 3)], iris_sub[, c(2, 4)]) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ggmatplot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > data(linear) + > ggs_geweke(ggs(s)) + Error in grid.Call.graphics(C_polygon, x$x, x$y, index) : + invalid line type + Calls: ... drawDetails -> drawDetails.polygon -> grid.Call.graphics Execution halted ``` -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(ggmatplot) - Loading required package: ggplot2 - > library(tibble) - > library(stats) - > - > test_check("ggmatplot") - ... - • ggmatplot_parameters/single-color-scatterplot.svg - • ggmatplot_parameters/single-fill-density-plot.svg - • ggmatplot_parameters/single-linetype-line-plot.svg - • ggmatplot_parameters/single-shape-scatterplot.svg - • ggmatplot_parameters/three-color-violin-plot.svg - • ggmatplot_parameters/three-fill-color-violin-plot.svg - • ggmatplot_parameters/three-linetype-line-plot.svg - • ggmatplot_parameters/three-shape-scatterplot.svg - Error: Test failures - Execution halted - ``` +## In both * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘ggmatplot.Rmd’ + when running code in ‘using_ggmcmc.Rmd’ ... - 6 -0.5325916 -0.54457006 - > library(ggmatplot) - Loading required package: ggplot2 + > ggs_crosscorrelation(S) + + > ggs_Rhat(S) + xlab("R_hat") - > ggmatplot(x, z) + > ggs_geweke(S) - When sourcing ‘ggmatplot.R’: + ... + + par(mar = c(4, 4, 0.1, 0.1), cex .... [TRUNCATED] + + > knit_theme$set("print") + + When sourcing 'v70i09.R': Error: argument is of length zero Execution halted - ‘ggmatplot.Rmd’ using ‘UTF-8’... failed + ‘using_ggmcmc.Rmd’ using ‘UTF-8’... failed + ‘v70i09.Rnw’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - ... - --- re-building ‘ggmatplot.Rmd’ using rmarkdown - - Quitting from lines 47-50 [point-plot] (ggmatplot.Rmd) - Error: processing vignette 'ggmatplot.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘ggmatplot.Rmd’ - - SUMMARY: processing the following file failed: - ‘ggmatplot.Rmd’ - - Error: Vignette re-building failed. - Execution halted + --- re-building ‘using_ggmcmc.Rmd’ using rmarkdown ``` # ggmice @@ -10875,7 +9058,7 @@ Run `revdepcheck::cloud_details(, "ggmatplot")` for more info * GitHub: https://github.com/amices/ggmice * Source code: https://github.com/cran/ggmice * Date/Publication: 2023-08-07 14:20:02 UTC -* Number of recursive dependencies: 120 +* Number of recursive dependencies: 122 Run `revdepcheck::cloud_details(, "ggmice")` for more info @@ -10938,14 +9121,14 @@ Run `revdepcheck::cloud_details(, "ggmulti")` for more info > > if(require("dplyr")) { ... - The following objects are masked from ‘package:base’: intersect, setdiff, setequal, union + Warning: Duplicated aesthetics after name standardisation: PTS Error in use_defaults(..., self = self) : unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, - NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NU + NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, Calls: ... -> -> compute_geom_2 -> Execution halted ``` @@ -10961,7 +9144,7 @@ Run `revdepcheck::cloud_details(, "ggmulti")` for more info > library(ggmulti) Loading required package: ggplot2 - Attaching package: 'ggmulti' + Attaching package: 'ggplot2' ... 16. └─base::Map(...) 17. └─base::mapply(FUN = f, ..., SIMPLIFY = FALSE) @@ -10988,11 +9171,11 @@ Run `revdepcheck::cloud_details(, "ggmulti")` for more info # Bad: myquosure / rhs ... - > p When sourcing ‘highDim.R’: - Error: argument is of length zero + Error: unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(), NULL, list( + NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "#4D4D4DFF", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(), NULL, list(NULL, NULL, NULL, NULL, 0, NULL, NULL, NULL, c(0, 0, 0, 2.2), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 0.5, NULL, NULL, NULL, c(0, Execution halted ‘glyph.Rmd’ using ‘UTF-8’... failed @@ -11006,106 +9189,6 @@ Run `revdepcheck::cloud_details(, "ggmulti")` for more info --- re-building ‘glyph.Rmd’ using rmarkdown ``` -# ggpackets - -
- -* Version: 0.2.1 -* GitHub: https://github.com/dgkf/ggpackets -* Source code: https://github.com/cran/ggpackets -* Date/Publication: 2022-10-10 23:30:02 UTC -* Number of recursive dependencies: 76 - -Run `revdepcheck::cloud_details(, "ggpackets")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ggpackets-Ex.R’ failed - The error most likely occurred in: - - > ### Name: ggpacket - > ### Title: A container for lazy ggplot layers - > ### Aliases: ggpacket - > - > ### ** Examples - > - > library(ggplot2) - > - > # create a ggpacket directly, setting some fixed argument settings - > ggpk_simple <- ggpacket() %+% geom_line(color = "red") %+% geom_point() - > ggplot(mtcars, aes(x = wt, y = mpg)) + ggpk_simple() - Error in if (new_name %in% existing) { : argument is of length zero - Calls: +.gg ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > - > library(ggplot2) - > library(ggpackets) - - Attaching package: 'ggpackets' - - ... - 10. └─ggpackets (local) f(init, x[[i]]) - 11. └─ggplot2:::`+.gg`(gg, ggpk_i) - 12. └─ggplot2:::add_ggplot(e1, e2, e2name) - 13. ├─ggplot2::ggplot_add(object, p, objectname) - 14. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 15. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 4 | WARN 1 | SKIP 0 | PASS 27 ] - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘composing-functions.Rmd’ - ... - + geom_point(size = 3) - Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. - ℹ Please use `linewidth` instead. - - > ggplot(Loblolly) + aes(x = age, y = height, color = Seed) + - + ggpk_my_template() + ggtitle("Growth of Loblolly Pines") - - ... - > diamonds %>% sample_frac(0.01) %>% arrange(cut) %>% - + ggplot() + aes(color = cut) + ggpk_dot_matrix(size = 3, width = 30) - - When sourcing ‘miscellaneous-examples.R’: - Error: argument is of length zero - Execution halted - - ‘composing-functions.Rmd’ using ‘UTF-8’... failed - ‘ggpackets.Rmd’ using ‘UTF-8’... failed - ‘miscellaneous-examples.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘composing-functions.Rmd’ using rmarkdown - - Quitting from lines 58-62 [simple_ggpacket_output] (composing-functions.Rmd) - Error: processing vignette 'composing-functions.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘composing-functions.Rmd’ - - --- re-building ‘ggpackets.Rmd’ using rmarkdown - ``` - # ggparallel
@@ -11114,7 +9197,7 @@ Run `revdepcheck::cloud_details(, "ggpackets")` for more info * GitHub: https://github.com/heike/ggparallel * Source code: https://github.com/cran/ggparallel * Date/Publication: 2024-03-09 22:00:02 UTC -* Number of recursive dependencies: 51 +* Number of recursive dependencies: 50 Run `revdepcheck::cloud_details(, "ggparallel")` for more info @@ -11135,29 +9218,29 @@ Run `revdepcheck::cloud_details(, "ggparallel")` for more info > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview > # * https://testthat.r-lib.org/articles/special-files.html ... - 12. └─self$get_layer_key(params, layers[include], data[include], theme) - 13. └─ggplot2 (local) get_layer_key(...) - 14. └─base::Map(...) - 15. └─base::mapply(FUN = f, ..., SIMPLIFY = FALSE) - 16. └─ggplot2 (local) ``(layer = dots[[1L]][[1L]], df = dots[[2L]][[1L]]) - 17. └─layer$compute_geom_2(key, single_params, theme) + 12. │ └─ggplot2 (local) map_statistic(..., self = self) + 13. └─base::.handleSimpleError(...) + 14. └─rlang (local) h(simpleError(msg, call)) + 15. └─handlers[[1L]](cnd) + 16. └─cli::cli_abort(...) + 17. └─rlang::abort(...) [ FAIL 1 | WARN 0 | SKIP 0 | PASS 0 ] Error: Test failures Execution halted ``` -# ggparty +# ggplotlyExtra
-* Version: 1.0.0 -* GitHub: https://github.com/martin-borkovec/ggparty -* Source code: https://github.com/cran/ggparty -* Date/Publication: 2019-07-18 10:54:06 UTC -* Number of recursive dependencies: 115 +* Version: 0.0.1 +* GitHub: NA +* Source code: https://github.com/cran/ggplotlyExtra +* Date/Publication: 2019-12-02 16:20:06 UTC +* Number of recursive dependencies: 70 -Run `revdepcheck::cloud_details(, "ggparty")` for more info +Run `revdepcheck::cloud_details(, "ggplotlyExtra")` for more info
@@ -11165,89 +9248,47 @@ Run `revdepcheck::cloud_details(, "ggparty")` for more info * checking examples ... ERROR ``` - Running examples in ‘ggparty-Ex.R’ failed + Running examples in ‘ggplotlyExtra-Ex.R’ failed The error most likely occurred in: - > ### Name: geom_node_label - > ### Title: Draw (multi-line) labels at nodes - > ### Aliases: geom_node_label geom_node_info geom_node_splitvar + > ### Name: ggplotly_histogram + > ### Title: Clean 'ggplot2' Histogram to be Converted to 'Plotly' + > ### Aliases: ggplotly_histogram > > ### ** Examples > - > library(ggparty) + > ... - 30. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 31. │ ├─ggplot2::ggplot_add(object, p, objectname) - 32. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 33. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 34. └─base::.handleSimpleError(...) - 35. └─rlang (local) h(simpleError(msg, call)) - 36. └─handlers[[1L]](cnd) - 37. └─cli::cli_abort(...) - 38. └─rlang::abort(...) - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ggparty-graphic-partying.Rmd’ - ... - + 0.55 .... [TRUNCATED] - Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. - ℹ Please use `linewidth` instead. - - When sourcing ‘ggparty-graphic-partying.R’: - Error: Problem while converting geom to grob. - ℹ Error occurred in the 5th layer. - Caused by error in `if (new_name %in% existing) ...`: - ! argument is of length zero + + xlab("len") + `stat_bin()` using `bins = 30`. Pick better value with `binwidth`. + Warning in geom_bar(data = layerdata, mapping = aes(x = .data$x, y = .data$count, : + Ignoring unknown aesthetics: label1, label2, and label3 + > + > # convert `ggplot` object to `plotly` object + > ggplotly(p, tooltip = c("Range", "count", "density")) + Error in pm[[2]] : subscript out of bounds + Calls: ggplotly -> ggplotly.ggplot -> gg2list Execution halted - - ‘ggparty-graphic-partying.Rmd’ using ‘UTF-8’... failed - ‘on-the-edge.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘ggparty-graphic-partying.Rmd’ using rmarkdown - - Quitting from lines 42-122 [unnamed-chunk-2] (ggparty-graphic-partying.Rmd) - Error: processing vignette 'ggparty-graphic-partying.Rmd' failed with diagnostics: - Problem while converting geom to grob. - ℹ Error occurred in the 5th layer. - Caused by error in `if (new_name %in% existing) ...`: - ! argument is of length zero - --- failed re-building ‘ggparty-graphic-partying.Rmd’ - - --- re-building ‘on-the-edge.Rmd’ using rmarkdown ``` ## In both -* checking dependencies in R code ... NOTE - ``` - Namespace in Imports field not imported from: ‘survival’ - All declared Imports should be used. - ``` - * checking LazyData ... NOTE ``` 'LazyData' is specified without a 'data' directory ``` -# ggpicrust2 +# ggpol
-* Version: 1.7.3 -* GitHub: https://github.com/cafferychen777/ggpicrust2 -* Source code: https://github.com/cran/ggpicrust2 -* Date/Publication: 2023-11-08 16:10:02 UTC -* Number of recursive dependencies: 231 +* Version: 0.0.7 +* GitHub: https://github.com/erocoar/ggpol +* Source code: https://github.com/cran/ggpol +* Date/Publication: 2020-11-08 13:40:02 UTC +* Number of recursive dependencies: 54 -Run `revdepcheck::cloud_details(, "ggpicrust2")` for more info +Run `revdepcheck::cloud_details(, "ggpol")` for more info
@@ -11255,103 +9296,95 @@ Run `revdepcheck::cloud_details(, "ggpicrust2")` for more info * checking examples ... ERROR ``` - Running examples in ‘ggpicrust2-Ex.R’ failed + Running examples in ‘ggpol-Ex.R’ failed The error most likely occurred in: - > ### Name: pathway_pca - > ### Title: Perform Principal Component Analysis (PCA) on functional pathway - > ### abundance data and create visualizations of the PCA results. - > ### Aliases: pathway_pca + > ### Name: GeomConfmat + > ### Title: Confusion Matrix + > ### Aliases: GeomConfmat geom_confmat stat_confmat > > ### ** Examples > + > x <- sample(LETTERS[seq(4)], 50, replace = TRUE) ... - > - > # Create example metadata - > # Please ensure the sample IDs in the metadata have the column name "sample_name" - > metadata_example <- data.frame(sample_name = colnames(kegg_abundance_example), - + group = factor(rep(c("Control", "Treatment"), each = 5))) - > - > pca_plot <- pathway_pca(kegg_abundance_example, metadata_example, "group") - Error in identicalUnits(x) : object is not a unit - Calls: pathway_pca ... assemble_guides -> guides_build -> unit.c -> identicalUnits + 21. │ └─ggpol (local) draw_panel(...) + 22. │ └─base::lapply(GeomText$default_aes[missing_aes], rlang::eval_tidy) + 23. │ └─rlang (local) FUN(X[[i]], ...) + 24. ├─ggplot2::from_theme(fontsize) + 25. └─base::.handleSimpleError(...) + 26. └─rlang (local) h(simpleError(msg, call)) + 27. └─handlers[[1L]](cnd) + 28. └─cli::cli_abort(...) + 29. └─rlang::abort(...) Execution halted ``` ## In both -* checking package dependencies ... NOTE - ``` - Package suggested but not available for checking: ‘ComplexHeatmap’ +* checking dependencies in R code ... NOTE ``` - -* checking installed package size ... NOTE + Namespaces in Imports field not imported from: + ‘dplyr’ ‘grDevices’ + All declared Imports should be used. ``` - installed size is 5.5Mb - sub-directories of 1Mb or more: - R 2.1Mb - data 2.0Mb + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory ``` -# ggplotlyExtra +# ggpubr
-* Version: 0.0.1 -* GitHub: NA -* Source code: https://github.com/cran/ggplotlyExtra -* Date/Publication: 2019-12-02 16:20:06 UTC -* Number of recursive dependencies: 70 +* Version: 0.6.0 +* GitHub: https://github.com/kassambara/ggpubr +* Source code: https://github.com/cran/ggpubr +* Date/Publication: 2023-02-10 16:20:02 UTC +* Number of recursive dependencies: 91 -Run `revdepcheck::cloud_details(, "ggplotlyExtra")` for more info +Run `revdepcheck::cloud_details(, "ggpubr")` for more info
## Newly broken -* checking examples ... ERROR +* checking tests ... ERROR ``` - Running examples in ‘ggplotlyExtra-Ex.R’ failed - The error most likely occurred in: - - > ### Name: ggplotly_histogram - > ### Title: Clean 'ggplot2' Histogram to be Converted to 'Plotly' - > ### Aliases: ggplotly_histogram - > - > ### ** Examples - > - > + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggpubr) + Loading required package: ggplot2 + + Attaching package: 'ggplot2' + + The following object is masked from 'package:base': ... - + xlab("len") - `stat_bin()` using `bins = 30`. Pick better value with `binwidth`. - Warning in geom_bar(data = layerdata, mapping = aes(x = .data$x, y = .data$count, : - Ignoring unknown aesthetics: label1, label2, and label3 - > - > # convert `ggplot` object to `plotly` object - > ggplotly(p, tooltip = c("Range", "count", "density")) - Error in pm[[2]] : subscript out of bounds - Calls: ggplotly -> ggplotly.ggplot -> gg2list - Execution halted - ``` - -## In both - -* checking LazyData ... NOTE - ``` - 'LazyData' is specified without a 'data' directory + [6] 6 - 10 == -4 + [7] 19 - 9 == 10 + [9] 1 - 7 == -6 + [10] 6 - 7 == -1 + [11] 13 - 6 == 7 + ... + + [ FAIL 2 | WARN 5 | SKIP 0 | PASS 183 ] + Error: Test failures + Execution halted ``` -# ggPMX +# ggraph
-* Version: 1.2.11 -* GitHub: https://github.com/ggPMXdevelopment/ggPMX -* Source code: https://github.com/cran/ggPMX -* Date/Publication: 2023-11-30 16:10:06 UTC -* Number of recursive dependencies: 181 +* Version: 2.2.1 +* GitHub: https://github.com/thomasp85/ggraph +* Source code: https://github.com/cran/ggraph +* Date/Publication: 2024-03-07 12:40:02 UTC +* Number of recursive dependencies: 115 -Run `revdepcheck::cloud_details(, "ggPMX")` for more info +Run `revdepcheck::cloud_details(, "ggraph")` for more info
@@ -11359,93 +9392,82 @@ Run `revdepcheck::cloud_details(, "ggPMX")` for more info * checking examples ... ERROR ``` - Running examples in ‘ggPMX-Ex.R’ failed + Running examples in ‘ggraph-Ex.R’ failed The error most likely occurred in: - > ### Name: pmx_config - > ### Title: This function can be used to define the pmx configuration used - > ### in plots. e.g. Monolix/Nonmem - > ### Aliases: pmx_config + > ### Name: geom_conn_bundle + > ### Title: Create hierarchical edge bundles between node connections + > ### Aliases: geom_conn_bundle geom_conn_bundle2 geom_conn_bundle0 > > ### ** Examples > + > # Create a graph of the flare class system ... - + cats = c("SEX"), - + conts = c("WT0", "AGE0"), - + strats = "STUD" - + ) - NO FINEGRID FILE: - we will use instead predictions.txt for individual plots - Warning: Duplicated aesthetics after name standardisation: colour - Error in if (new_name %in% existing) { : argument is of length zero - Calls: pmx_mlx ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ggPMX-guide.Rmd’ - ... - - > work_dir <- file.path(theophylline, "Monolix") - - > input_data <- file.path(theophylline, "data_pk.csv") - - > ctr <- theophylline() - - When sourcing ‘ggPMX-guide.R’: - Error: argument is of length zero + + ) + + + geom_node_point(aes(filter = leaf, colour = class)) + + + scale_edge_colour_distiller('', direction = 1, guide = 'edge_direction') + + + coord_fixed() + + + ggforce::theme_no_axes() + Error in get_layer_key(...) : + unused argument (list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, list(), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, + 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 1, NULL, NULL, NULL, c(0, 2.2, 0, 0), NULL, TRUE), NULL, + Calls: ... -> -> process_layers -> Execution halted - - ‘ggPMX-guide.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - ... - --- re-building ‘ggPMX-guide.Rmd’ using rmarkdown - - Quitting from lines 25-37 [load_package] (ggPMX-guide.Rmd) - Error: processing vignette 'ggPMX-guide.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘ggPMX-guide.Rmd’ - - SUMMARY: processing the following file failed: - ‘ggPMX-guide.Rmd’ - - Error: Vignette re-building failed. - Execution halted + --- re-building ‘Edges.Rmd’ using rmarkdown ``` ## In both -* checking package dependencies ... NOTE +* checking running R code from vignettes ... ERROR ``` - Package suggested but not available for checking: ‘lixoftConnectors’ + Errors in running code in vignettes: + when running code in ‘Edges.Rmd’ + ... + Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : + font family 'Arial Narrow' not found in PostScript font database + Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : + font family 'Arial Narrow' not found in PostScript font database + Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : + font family 'Arial Narrow' not found in PostScript font database + + ... + font family 'Arial' not found in PostScript font database + + When sourcing ‘tidygraph.R’: + Error: invalid font type + Execution halted + + ‘Edges.Rmd’ using ‘UTF-8’... failed + ‘Layouts.Rmd’ using ‘UTF-8’... failed + ‘Nodes.Rmd’ using ‘UTF-8’... failed + ‘tidygraph.Rmd’ using ‘UTF-8’... failed ``` * checking installed package size ... NOTE ``` installed size is 8.9Mb sub-directories of 1Mb or more: - doc 1.1Mb - help 2.4Mb - testdata 4.8Mb + R 1.5Mb + doc 3.9Mb + libs 2.8Mb ``` -# ggpol +# ggredist
-* Version: 0.0.7 -* GitHub: https://github.com/erocoar/ggpol -* Source code: https://github.com/cran/ggpol -* Date/Publication: 2020-11-08 13:40:02 UTC -* Number of recursive dependencies: 54 +* Version: 0.0.2 +* GitHub: https://github.com/alarm-redist/ggredist +* Source code: https://github.com/cran/ggredist +* Date/Publication: 2022-11-23 11:20:02 UTC +* Number of recursive dependencies: 67 -Run `revdepcheck::cloud_details(, "ggpol")` for more info +Run `revdepcheck::cloud_details(, "ggredist")` for more info
@@ -11453,151 +9475,127 @@ Run `revdepcheck::cloud_details(, "ggpol")` for more info * checking examples ... ERROR ``` - Running examples in ‘ggpol-Ex.R’ failed + Running examples in ‘ggredist-Ex.R’ failed The error most likely occurred in: - > ### Name: GeomConfmat - > ### Title: Confusion Matrix - > ### Aliases: GeomConfmat geom_confmat stat_confmat + > ### Name: geom_district_text + > ### Title: Label Map Regions + > ### Aliases: geom_district_text geom_district_label + > ### stat_district_coordinates StatDistrictCoordinates GeomDistrictText + > ### Keywords: datasets > > ### ** Examples - > - > x <- sample(LETTERS[seq(4)], 50, replace = TRUE) ... - 21. │ └─ggpol (local) draw_panel(...) - 22. │ └─base::lapply(GeomText$default_aes[missing_aes], rlang::eval_tidy) - 23. │ └─rlang (local) FUN(X[[i]], ...) - 24. ├─ggplot2::from_theme(fontsize) - 25. └─base::.handleSimpleError(...) - 26. └─rlang (local) h(simpleError(msg, call)) - 27. └─handlers[[1L]](cnd) - 28. └─cli::cli_abort(...) - 29. └─rlang::abort(...) + 22. │ └─coord$transform(data, panel_params) + 23. │ └─ggplot2 (local) transform(..., self = self) + 24. │ └─ggplot2:::sf_rescale01(...) + 25. │ └─sf::st_normalize(x, c(x_range[1], y_range[1], x_range[2], y_range[2])) + 26. └─base::.handleSimpleError(...) + 27. └─rlang (local) h(simpleError(msg, call)) + 28. └─handlers[[1L]](cnd) + 29. └─cli::cli_abort(...) + 30. └─rlang::abort(...) Execution halted ``` -## In both - -* checking dependencies in R code ... NOTE - ``` - Namespaces in Imports field not imported from: - ‘dplyr’ ‘grDevices’ - All declared Imports should be used. - ``` - -* checking LazyData ... NOTE - ``` - 'LazyData' is specified without a 'data' directory - ``` - -# ggprism +# ggRtsy
-* Version: 1.0.5 -* GitHub: https://github.com/csdaw/ggprism -* Source code: https://github.com/cran/ggprism -* Date/Publication: 2024-03-21 10:50:02 UTC -* Number of recursive dependencies: 97 +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/ggRtsy +* Date/Publication: 2023-09-15 19:12:05 UTC +* Number of recursive dependencies: 68 -Run `revdepcheck::cloud_details(, "ggprism")` for more info +Run `revdepcheck::cloud_details(, "ggRtsy")` for more info
## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘ggprism-Ex.R’ failed - The error most likely occurred in: - - > ### Name: add_pvalue - > ### Title: Add p-values to a ggplot - > ### Aliases: add_pvalue - > - > ### ** Examples - > - > library(ggplot2) - ... - + "OJ", "VC", 0.0606, 36 - + ) - > - > # boxplot (or another geom...) - > ggplot(tg, aes(x = supp, y = len)) + - + geom_boxplot() + - + add_pvalue(two.means) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: +.gg ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - * checking tests ... ERROR ``` - Running ‘tinytest.R’ - Running the tests in ‘tests/tinytest.R’ failed. + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. Complete output: - > - > if ( requireNamespace("tinytest", quietly=TRUE) ){ - + tinytest::test_package("ggprism") - + } + > library(testthat) + > library(ggplot2) + + Attaching package: 'ggplot2' + + The following object is masked from 'package:base': + + ... + 13. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler) + 14. │ └─vctrs::vec_as_location(i, n, names = names, arg = arg, call = call) + 15. └─vctrs (local) ``() + 16. └─vctrs:::stop_subscript_oob(...) + 17. └─vctrs:::stop_subscript(...) + 18. └─rlang::abort(...) - test-add_pvalue.R............. 0 tests - test-add_pvalue.R............. 0 tests - ... - test-add_pvalue.R............. 0 tests - test-add_pvalue.R............. 0 tests - test-add_pvalue.R............. 0 tests - test-add_pvalue.R............. 0 tests - test-add_pvalue.R............. 0 tests - test-add_pvalue.R............. 0 tests - test-add_pvalue.R............. 0 tests - test-add_pvalue.R............. 0 tests Error in if (new_name %in% existing) { : argument is of length zero - Calls: ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 3 ] + Error: Test failures Execution halted ``` * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘ggprism.Rmd’ + when running code in ‘Vignette.Rmd’ ... - + p.adj = 0.0606, y.position = 36) - - > p1 <- ggplot(ToothGrowth, aes(x = factor(supp), y = len)) + - + geom_boxplot(aes(fill = factor(supp))) + scale_fill_prism(palette = "candy_bright ..." ... [TRUNCATED] - - > p2 <- p1 + add_pvalue(df_p_val) + |Antique White |(238, 223, 204) |#eedfcc | - ... + > RectangleFiller(plotExample, c("#e32636", "#9966cc", + + "#f4c2c2", "#e16827")) - When sourcing ‘pvalues.R’: - Error: argument is of length zero + When sourcing ‘Vignette.R’: + Error: Can't extract rows past the end. + ℹ Location 1 doesn't exist. + ℹ There are only 0 rows. Execution halted - ‘axes.Rmd’ using ‘UTF-8’... OK - ‘colours.Rmd’ using ‘UTF-8’... OK - ‘ggprism.Rmd’ using ‘UTF-8’... failed - ‘pvalues.Rmd’ using ‘UTF-8’... failed - ‘themes.Rmd’ using ‘UTF-8’... OK + ‘Vignette.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘axes.Rmd’ using rmarkdown - ``` - -# ggpubr - -
+ ... + --- re-building ‘Vignette.Rmd’ using rmarkdown + + Quitting from lines 48-49 [unnamed-chunk-2] (Vignette.Rmd) + Error: processing vignette 'Vignette.Rmd' failed with diagnostics: + Can't extract rows past the end. + ℹ Location 1 doesn't exist. + ℹ There are only 0 rows. + --- failed re-building ‘Vignette.Rmd’ + + SUMMARY: processing the following file failed: + ‘Vignette.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` -* Version: 0.6.0 -* GitHub: https://github.com/kassambara/ggpubr -* Source code: https://github.com/cran/ggpubr -* Date/Publication: 2023-02-10 16:20:02 UTC -* Number of recursive dependencies: 88 +## In both -Run `revdepcheck::cloud_details(, "ggpubr")` for more info +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 19 marked UTF-8 strings + ``` + +# ggseqplot + +
+ +* Version: 0.8.5 +* GitHub: https://github.com/maraab23/ggseqplot +* Source code: https://github.com/cran/ggseqplot +* Date/Publication: 2024-10-29 16:30:02 UTC +* Number of recursive dependencies: 127 + +Run `revdepcheck::cloud_details(, "ggseqplot")` for more info
@@ -11605,26 +9603,26 @@ Run `revdepcheck::cloud_details(, "ggpubr")` for more info * checking examples ... ERROR ``` - Running examples in ‘ggpubr-Ex.R’ failed + Running examples in ‘ggseqplot-Ex.R’ failed The error most likely occurred in: - > ### Name: add_summary - > ### Title: Add Summary Statistics onto a ggplot. - > ### Aliases: add_summary mean_se_ mean_sd mean_ci mean_range median_iqr - > ### median_hilow_ median_q1q3 median_mad median_range + > ### Name: ggseqtrplot + > ### Title: Sequence Transition Rate Plot + > ### Aliases: ggseqtrplot > > ### ** Examples > + > # Use example data from TraMineR: biofam data set ... - 10. │ └─ggplot2:::`+.gg`(...) - 11. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 12. │ ├─ggplot2::ggplot_add(object, p, objectname) - 13. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 14. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 15. └─base::.handleSimpleError(...) - 16. └─purrr (local) h(simpleError(msg, call)) - 17. └─cli::cli_abort(...) - 18. └─rlang::abort(...) + 8 7 7 Divorced + [>] sum of weights: 330.07 - min/max: 0/6.02881860733032 + [>] 300 sequences in the data set + [>] min/max sequence length: 16/16 + > + > # Basic transition rate plot (with adjusted x-axis labels) + > ggseqtrplot(biofam.seq, x_n.dodge = 2) + Error in ggseqtrplot(biofam.seq, x_n.dodge = 2) : + labsize must be a single number Execution halted ``` @@ -11634,36 +9632,61 @@ Run `revdepcheck::cloud_details(, "ggpubr")` for more info Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > library(ggpubr) - Loading required package: ggplot2 - > - > test_check("ggpubr") - [ FAIL 46 | WARN 3 | SKIP 0 | PASS 51 ] + > library(ggseqplot) + Loading required package: TraMineR + TraMineR stable version 2.2-11 (Built: 2024-12-09) + Website: http://traminer.unige.ch + Please type 'citation("TraMineR")' for citation information. ... - 13. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 14. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 15. └─base::.handleSimpleError(...) - 16. └─purrr (local) h(simpleError(msg, call)) - 17. └─cli::cli_abort(...) - 18. └─rlang::abort(...) + Backtrace: + ▆ + 1. ├─testthat::expect_s3_class(ggseqtrplot(biofam.seq), "ggplot") at test-ggseqtrplot.R:35:3 + 2. │ └─testthat::quasi_label(enquo(object), arg = "object") + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. └─ggseqplot::ggseqtrplot(biofam.seq) - [ FAIL 46 | WARN 3 | SKIP 0 | PASS 51 ] + [ FAIL 1 | WARN 16 | SKIP 0 | PASS 131 ] Error: Test failures Execution halted ``` -# ggrain +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘ggseqplot.Rmd’ + ... + Scale for fill is already present. + Adding another scale for fill, which will replace the existing scale. + Scale for fill is already present. + Adding another scale for fill, which will replace the existing scale. + + > ggseqtrplot(actcal.seq, group = actcal$sex) + + When sourcing ‘ggseqplot.R’: + Error: labsize must be a single number + Execution halted + + ‘ggseqplot.Rmd’ using ‘UTF-8’... failed + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘ggseqplot.Rmd’ using rmarkdown + ``` + +# ggside
-* Version: 0.0.4 -* GitHub: https://github.com/njudd/ggrain -* Source code: https://github.com/cran/ggrain -* Date/Publication: 2024-01-23 11:50:02 UTC -* Number of recursive dependencies: 63 +* Version: 0.3.1 +* GitHub: https://github.com/jtlandis/ggside +* Source code: https://github.com/cran/ggside +* Date/Publication: 2024-03-01 09:12:37 UTC +* Number of recursive dependencies: 75 -Run `revdepcheck::cloud_details(, "ggrain")` for more info +Run `revdepcheck::cloud_details(, "ggside")` for more info
@@ -11671,153 +9694,187 @@ Run `revdepcheck::cloud_details(, "ggrain")` for more info * checking examples ... ERROR ``` - Running examples in ‘ggrain-Ex.R’ failed + Running examples in ‘ggside-Ex.R’ failed The error most likely occurred in: - > ### Name: geom_rain - > ### Title: Raincloud Plots - > ### Aliases: geom_rain + > ### Name: geom_xsidebar + > ### Title: Side bar Charts + > ### Aliases: geom_xsidebar geom_*sidebar geom_ysidebar geom_xsidecol + > ### geom_ysidecol > > ### ** Examples > - > e1 <- ggplot(iris, aes(Species, Sepal.Width, fill = Species)) - > e1 + geom_rain() - Error in if (new_name %in% existing) { : argument is of length zero - Calls: +.gg ... ggplot_add.list -> ggplot_add -> ggplot_add.Layer -> new_layer_names + ... + + geom_point() + > + > #sidebar - uses StatCount + > p + + + geom_xsidebar() + + + geom_ysidebar() + Error in is.element(panel_type, c("x", "y")) : + unused argument (c("x", "y")) + Calls: ... -> draw_panel -> -> render_fg Execution halted ``` +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggplot2) + + Attaching package: 'ggplot2' + + The following object is masked from 'package:base': + + ... + • ops_meaningful/alpha-0-5-from-function.svg + • side_layers/boxplot2.svg + • vdiff_irisScatter/collapsed-histo.svg + • vdiff_irisScatter/facetgrid-collapsed-density.svg + • vdiff_irisScatter/facetgrid-histo.svg + • vdiff_irisScatter/facetgrid-side-density.svg + • vdiff_irisScatter/stacked-side-density.svg + • vdiff_irisScatter/yside-histo.svg + Error: Test failures + Execution halted + ``` + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘ggrain.Rmd’ + when running code in ‘ggside_aes_mapping.Rmd’ ... - > library(ggrain) - Loading required package: ggplot2 + +.gg ggplot2 - > ggplot(iris, aes(1, Sepal.Width)) + geom_rain() + - + theme_classic() + theme(axis.title.x = element_blank(), axis.text.x = element_blank(), - + .... [TRUNCATED] + > p <- ggplot(mpg, aes(displ, hwy, colour = class)) + + + geom_point(size = 2) + theme_bw() - When sourcing ‘ggrain.R’: - Error: argument is of length zero + > p + geom_xsidedensity() + geom_ysidedensity() + + ... + Warning in max(x) : no non-missing arguments to max; returning -Inf + Warning in min(x) : no non-missing arguments to min; returning Inf + Warning in max(x) : no non-missing arguments to max; returning -Inf + + When sourcing ‘ggside_basic_usage.R’: + Error: unused argument (c("x", "y")) Execution halted - ‘ggrain.Rmd’ using ‘UTF-8’... failed + ‘ggside_aes_mapping.Rmd’ using ‘UTF-8’... failed + ‘ggside_basic_usage.Rmd’ using ‘UTF-8’... failed + ``` + +* checking whether package ‘ggside’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(panel_type, ': unused argument (c("x", "y")) + Note: possible error in 'is.element(self$rescale, ': unused argument (suggested_var) + See ‘/tmp/workdir/ggside/new/ggside.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking for code/documentation mismatches ... WARNING + ``` + Codoc mismatches from documentation object 'geom_xsideabline': + geom_xsidehline + Code: function(mapping = NULL, data = NULL, position = "identity", + ..., yintercept, na.rm = FALSE, show.legend = NA) + Docs: function(mapping = NULL, data = NULL, ..., yintercept, na.rm = + FALSE, show.legend = NA) + Argument names in code not in docs: + position + Mismatches in argument names (first 3): + Position: 3 Code: position Docs: ... + ... + Docs: function(mapping = NULL, data = NULL, stat = "identity", + position = "identity", ..., lineend = "butt", linejoin + = "round", linemitre = 10, arrow = NULL, na.rm = + FALSE, show.legend = NA, inherit.aes = TRUE) + Argument names in code not in docs: + arrow.fill + Mismatches in argument names: + Position: 10 Code: arrow.fill Docs: na.rm + Position: 11 Code: na.rm Docs: show.legend + Position: 12 Code: show.legend Docs: inherit.aes + ``` + +* checking R code for possible problems ... NOTE + ``` + ggside_render_fg: possible error in is.element(panel_type, c("x", + "y")): unused argument (c("x", "y")) ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - ... - --- re-building ‘ggrain.Rmd’ using rmarkdown + --- re-building ‘ggside_aes_mapping.Rmd’ using rmarkdown - Quitting from lines 36-41 [most basic raincloud possible] (ggrain.Rmd) - Error: processing vignette 'ggrain.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘ggrain.Rmd’ + Quitting from lines 43-46 [ggside_updated_aes_usage] (ggside_aes_mapping.Rmd) + Error: processing vignette 'ggside_aes_mapping.Rmd' failed with diagnostics: + unused argument (c("x", "y")) + --- failed re-building ‘ggside_aes_mapping.Rmd’ - SUMMARY: processing the following file failed: - ‘ggrain.Rmd’ - - Error: Vignette re-building failed. - Execution halted + --- re-building ‘ggside_basic_usage.Rmd’ using rmarkdown ``` -# ggraph +# ggsmc
-* Version: 2.2.1 -* GitHub: https://github.com/thomasp85/ggraph -* Source code: https://github.com/cran/ggraph -* Date/Publication: 2024-03-07 12:40:02 UTC -* Number of recursive dependencies: 115 +* Version: 0.1.2.0 +* GitHub: https://github.com/richardgeveritt/ggsmc +* Source code: https://github.com/cran/ggsmc +* Date/Publication: 2024-07-27 17:00:02 UTC +* Number of recursive dependencies: 83 -Run `revdepcheck::cloud_details(, "ggraph")` for more info +Run `revdepcheck::cloud_details(, "ggsmc")` for more info
## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘ggraph-Ex.R’ failed - The error most likely occurred in: - - > ### Name: geom_conn_bundle - > ### Title: Create hierarchical edge bundles between node connections - > ### Aliases: geom_conn_bundle geom_conn_bundle2 geom_conn_bundle0 - > - > ### ** Examples - > - > # Create a graph of the flare class system - ... - + ) + - + geom_node_point(aes(filter = leaf, colour = class)) + - + scale_edge_colour_distiller('', direction = 1, guide = 'edge_direction') + - + coord_fixed() + - + ggforce::theme_no_axes() - Error in get_layer_key(...) : - unused argument (list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, list(), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, - 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 1, NULL, NULL, NULL, c(0, 2.2, 0, 0), NULL, TRUE), NULL, - Calls: ... -> -> process_layers -> - Execution halted - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘Edges.Rmd’ using rmarkdown - ``` - -## In both - * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘Edges.Rmd’ + when running code in ‘Visualising.Rmd’ ... - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family 'Arial Narrow' not found in PostScript font database - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family 'Arial Narrow' not found in PostScript font database - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family 'Arial Narrow' not found in PostScript font database + 20 /tmp/RtmpKyNdR5/b96ef7031e/gganim_plot0020.png - ... - font family 'Arial' not found in PostScript font database + > data(lv_output) - When sourcing ‘tidygraph.R’: - Error: invalid font type + > animate_reveal_time_series(lv_output, parameters = c("X", + + "Y"), alpha = 0.5, ylimits = c(0, 600), duration = 10) + + When sourcing ‘Visualising.R’: + Error: argument "theme" is missing, with no default Execution halted - ‘Edges.Rmd’ using ‘UTF-8’... failed - ‘Layouts.Rmd’ using ‘UTF-8’... failed - ‘Nodes.Rmd’ using ‘UTF-8’... failed - ‘tidygraph.Rmd’ using ‘UTF-8’... failed + ‘Visualising.Rmd’ using ‘UTF-8’... failed ``` -* checking installed package size ... NOTE +## In both + +* checking data for non-ASCII characters ... NOTE ``` - installed size is 8.9Mb - sub-directories of 1Mb or more: - R 1.5Mb - doc 3.9Mb - libs 2.8Mb + Note: found 175 marked UTF-8 strings ``` -# ggredist +# ggspatial
-* Version: 0.0.2 -* GitHub: https://github.com/alarm-redist/ggredist -* Source code: https://github.com/cran/ggredist -* Date/Publication: 2022-11-23 11:20:02 UTC -* Number of recursive dependencies: 67 +* Version: 1.1.9 +* GitHub: https://github.com/paleolimbot/ggspatial +* Source code: https://github.com/cran/ggspatial +* Date/Publication: 2023-08-17 15:32:38 UTC +* Number of recursive dependencies: 107 -Run `revdepcheck::cloud_details(, "ggredist")` for more info +Run `revdepcheck::cloud_details(, "ggspatial")` for more info
@@ -11825,127 +9882,65 @@ Run `revdepcheck::cloud_details(, "ggredist")` for more info * checking examples ... ERROR ``` - Running examples in ‘ggredist-Ex.R’ failed + Running examples in ‘ggspatial-Ex.R’ failed The error most likely occurred in: - > ### Name: geom_district_text - > ### Title: Label Map Regions - > ### Aliases: geom_district_text geom_district_label - > ### stat_district_coordinates StatDistrictCoordinates GeomDistrictText + > ### Name: annotation_spatial_hline + > ### Title: Projected horizontal and vertical lines + > ### Aliases: annotation_spatial_hline annotation_spatial_vline + > ### GeomSpatialXline > ### Keywords: datasets > > ### ** Examples ... - 22. │ └─coord$transform(data, panel_params) - 23. │ └─ggplot2 (local) transform(..., self = self) - 24. │ └─ggplot2:::sf_rescale01(...) - 25. │ └─sf::st_normalize(x, c(x_range[1], y_range[1], x_range[2], y_range[2])) - 26. └─base::.handleSimpleError(...) - 27. └─rlang (local) h(simpleError(msg, call)) - 28. └─handlers[[1L]](cnd) - 29. └─cli::cli_abort(...) - 30. └─rlang::abort(...) + 25. │ └─grid:::validGP(list(...)) + 26. │ └─grid (local) numnotnull("fontsize") + 27. │ └─grid (local) check.length(gparname) + 28. │ └─base::stop(...) + 29. └─base::.handleSimpleError(...) + 30. └─rlang (local) h(simpleError(msg, call)) + 31. └─handlers[[1L]](cnd) + 32. └─cli::cli_abort(...) + 33. └─rlang::abort(...) Execution halted ``` -# ggRtsy - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/ggRtsy -* Date/Publication: 2023-09-15 19:12:05 UTC -* Number of recursive dependencies: 69 - -Run `revdepcheck::cloud_details(, "ggRtsy")` for more info - -
- -## Newly broken - * checking tests ... ERROR ``` Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > library(ggplot2) - > library(dplyr) - - Attaching package: 'dplyr' + > library(ggspatial) + > + > test_check("ggspatial") + Linking to GEOS 3.12.1, GDAL 3.8.4, PROJ 9.4.0; sf_use_s2() is TRUE + [ FAIL 1 | WARN 1 | SKIP 22 | PASS 195 ] - The following object is masked from 'package:testthat': ... - 13. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler) - 14. │ └─vctrs::vec_as_location(i, n, names = names, arg = arg, call = call) - 15. └─vctrs (local) ``() - 16. └─vctrs:::stop_subscript_oob(...) - 17. └─vctrs:::stop_subscript(...) - 18. └─rlang::abort(...) + 33. │ └─base::stop(...) + 34. └─base::.handleSimpleError(...) + 35. └─rlang (local) h(simpleError(msg, call)) + 36. └─handlers[[1L]](cnd) + 37. └─cli::cli_abort(...) + 38. └─rlang::abort(...) - [ FAIL 1 | WARN 0 | SKIP 0 | PASS 3 ] + [ FAIL 1 | WARN 1 | SKIP 22 | PASS 195 ] Error: Test failures Execution halted ``` -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘Vignette.Rmd’ - ... - |Antique White |(238, 223, 204) |#eedfcc | - - > RectangleFiller(plotExample, c("#e32636", "#9966cc", - + "#f4c2c2", "#e16827")) - - When sourcing ‘Vignette.R’: - Error: Can't extract rows past the end. - ℹ Location 1 doesn't exist. - ℹ There are only 0 rows. - Execution halted - - ‘Vignette.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘Vignette.Rmd’ using rmarkdown - - Quitting from lines 48-49 [unnamed-chunk-2] (Vignette.Rmd) - Error: processing vignette 'Vignette.Rmd' failed with diagnostics: - Can't extract rows past the end. - ℹ Location 1 doesn't exist. - ℹ There are only 0 rows. - --- failed re-building ‘Vignette.Rmd’ - - SUMMARY: processing the following file failed: - ‘Vignette.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -## In both - -* checking data for non-ASCII characters ... NOTE - ``` - Note: found 19 marked UTF-8 strings - ``` - -# ggseqplot +# ggstatsplot
-* Version: 0.8.4 -* GitHub: https://github.com/maraab23/ggseqplot -* Source code: https://github.com/cran/ggseqplot -* Date/Publication: 2024-05-17 21:40:03 UTC -* Number of recursive dependencies: 128 +* Version: 0.13.0 +* GitHub: https://github.com/IndrajeetPatil/ggstatsplot +* Source code: https://github.com/cran/ggstatsplot +* Date/Publication: 2024-12-04 15:10:02 UTC +* Number of recursive dependencies: 176 -Run `revdepcheck::cloud_details(, "ggseqplot")` for more info +Run `revdepcheck::cloud_details(, "ggstatsplot")` for more info
@@ -11953,5035 +9948,247 @@ Run `revdepcheck::cloud_details(, "ggseqplot")` for more info * checking examples ... ERROR ``` - Running examples in ‘ggseqplot-Ex.R’ failed + Running examples in ‘ggstatsplot-Ex.R’ failed The error most likely occurred in: - > ### Name: ggseqrfplot - > ### Title: Relative Frequency Sequence Plot - > ### Aliases: ggseqrfplot + > ### Name: ggscatterstats + > ### Title: Scatterplot with marginal distributions and statistical results + > ### Aliases: ggscatterstats > > ### ** Examples > - > # Load additional library for fine-tuning the plots + > set.seed(123) ... - [>] Pseudo/medoid-based-F statistic: 6.870317, p-value: 3.09994e-08 + + ggplot2::geom_rug(sides = "b") > - > # ... with ggseqrfplot - > ggseqrfplot(biofam.seq, weighted = FALSE, diss = diss, k = 12, grp.meth="first") - [>] Using k=12 frequency groups with grp.meth='first' - [>] Pseudo/medoid-based-R2: 0.4620155 - [>] Pseudo/medoid-based-F statistic: 6.870317, p-value: 3.09994e-08 - Error in identicalUnits(x) : object is not a unit - Calls: ... assemble_guides -> guides_build -> unit.c -> identicalUnits + > # looking at the plot + > p + `stat_xsidebin()` using `bins = 30`. Pick better value with `binwidth`. + `stat_ysidebin()` using `bins = 30`. Pick better value with `binwidth`. + Error in is.element(panel_type, c("x", "y")) : + unused argument (c("x", "y")) + Calls: ... -> draw_panel -> -> render_fg Execution halted ``` -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(ggseqplot) - Loading required package: TraMineR - - TraMineR stable version 2.2-10 (Built: 2024-05-22) - Website: http://traminer.unige.ch - Please type 'citation("TraMineR")' for citation information. - ... - Backtrace: - ▆ - 1. ├─testthat::expect_s3_class(ggseqtrplot(biofam.seq), "ggplot") at test-ggseqtrplot.R:35:3 - 2. │ └─testthat::quasi_label(enquo(object), arg = "object") - 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) - 4. └─ggseqplot::ggseqtrplot(biofam.seq) - - [ FAIL 1 | WARN 1045 | SKIP 0 | PASS 131 ] - Error: Test failures - Execution halted - ``` +## In both * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘ggseqplot.Rmd’ + when running code in ‘ggstatsplot.Rmd’ ... - > p1 + p2 + plot_layout(guides = "collect") & scale_fill_manual(values = canva_palettes$`Fun and tropical`[1:4]) & - + theme_ipsum(base_family = "" .... [TRUNCATED] - Scale for fill is already present. - Adding another scale for fill, which will replace the existing scale. - Scale for fill is already present. - Adding another scale for fill, which will replace the existing scale. - When sourcing ‘ggseqplot.R’: - Error: object is not coercible to a unit + > try({ + + ggbetweenstats(iris, Species, Sepal.Length) + + }) + + > knitr::include_graphics("../man/figures/stats_reporting_format.png") + + When sourcing ‘ggstatsplot.R’: + Error: Cannot find the file(s): "../man/figures/stats_reporting_format.png" Execution halted - ‘ggseqplot.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘ggseqplot.Rmd’ using rmarkdown + ‘additional.Rmd’ using ‘UTF-8’... OK + ‘ggstatsplot.Rmd’ using ‘UTF-8’... failed ``` -# ggside +# ggswissmaps
-* Version: 0.3.1 -* GitHub: https://github.com/jtlandis/ggside -* Source code: https://github.com/cran/ggside -* Date/Publication: 2024-03-01 09:12:37 UTC -* Number of recursive dependencies: 76 +* Version: 0.1.1 +* GitHub: https://github.com/gibonet/ggswissmaps +* Source code: https://github.com/cran/ggswissmaps +* Date/Publication: 2016-10-29 10:48:24 +* Number of recursive dependencies: 71 -Run `revdepcheck::cloud_details(, "ggside")` for more info +Run `revdepcheck::cloud_details(, "ggswissmaps")` for more info
## Newly broken -* checking tests ... ERROR +* checking whether package ‘ggswissmaps’ can be installed ... WARNING ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(ggplot2) - > library(ggside) - Registered S3 method overwritten by 'ggside': - method from - +.gg ggplot2 - > - ... - • ops_meaningful/alpha-0-5-from-function.svg - • side_layers/boxplot2.svg - • vdiff_irisScatter/collapsed-histo.svg - • vdiff_irisScatter/facetgrid-collapsed-density.svg - • vdiff_irisScatter/facetgrid-histo.svg - • vdiff_irisScatter/facetgrid-side-density.svg - • vdiff_irisScatter/stacked-side-density.svg - • vdiff_irisScatter/yside-histo.svg - Error: Test failures - Execution halted + Found the following significant warnings: + Warning: `aes_string()` was deprecated in ggplot2 3.0.0. + See ‘/tmp/workdir/ggswissmaps/new/ggswissmaps.Rcheck/00install.out’ for details. ``` -* checking for code/documentation mismatches ... WARNING +* checking whether the namespace can be loaded with stated dependencies ... NOTE ``` - Codoc mismatches from documentation object 'geom_xsideabline': - geom_xsidehline - Code: function(mapping = NULL, data = NULL, position = "identity", - ..., yintercept, na.rm = FALSE, show.legend = NA) - Docs: function(mapping = NULL, data = NULL, ..., yintercept, na.rm = - FALSE, show.legend = NA) - Argument names in code not in docs: - position - Mismatches in argument names (first 3): - Position: 3 Code: position Docs: ... - ... - Docs: function(mapping = NULL, data = NULL, stat = "identity", - position = "identity", ..., lineend = "butt", linejoin - = "round", linemitre = 10, arrow = NULL, na.rm = - FALSE, show.legend = NA, inherit.aes = TRUE) - Argument names in code not in docs: - arrow.fill - Mismatches in argument names: - Position: 10 Code: arrow.fill Docs: na.rm - Position: 11 Code: na.rm Docs: show.legend - Position: 12 Code: show.legend Docs: inherit.aes + Warning: `aes_string()` was deprecated in ggplot2 3.0.0. + ℹ Please use tidy evaluation idioms with `aes()`. + ℹ See also `vignette("ggplot2-in-packages")` for more information. + ℹ The deprecated feature was likely used in the ggswissmaps package. + Please report the issue to the authors. + + A namespace must be able to be loaded with just the base namespace + loaded: otherwise if the namespace gets loaded by a saved object, the + session will be unable to start. + + Probably some imports need to be declared in the NAMESPACE file. ``` -# ggsmc +# ggtern
-* Version: 0.1.2.0 -* GitHub: https://github.com/richardgeveritt/ggsmc -* Source code: https://github.com/cran/ggsmc -* Date/Publication: 2024-07-27 17:00:02 UTC -* Number of recursive dependencies: 84 +* Version: 3.5.0 +* GitHub: NA +* Source code: https://github.com/cran/ggtern +* Date/Publication: 2024-03-24 21:50:02 UTC +* Number of recursive dependencies: 42 -Run `revdepcheck::cloud_details(, "ggsmc")` for more info +Run `revdepcheck::cloud_details(, "ggtern")` for more info
## Newly broken -* checking running R code from vignettes ... ERROR +* checking whether package ‘ggtern’ can be installed ... ERROR ``` - Errors in running code in vignettes: - when running code in ‘Visualising.Rmd’ - ... - 20 /tmp/RtmpuaCJEi/100d113de41a/gganim_plot0020.png - - > data(lv_output) - - > animate_reveal_time_series(lv_output, parameters = c("X", - + "Y"), alpha = 0.5, ylimits = c(0, 600), duration = 10) - - When sourcing ‘Visualising.R’: - Error: argument "theme" is missing, with no default - Execution halted - - ‘Visualising.Rmd’ using ‘UTF-8’... failed + Installation failed. + See ‘/tmp/workdir/ggtern/new/ggtern.Rcheck/00install.out’ for details. ``` -## In both +## Newly fixed -* checking data for non-ASCII characters ... NOTE +* checking Rd cross-references ... NOTE ``` - Note: found 175 marked UTF-8 strings + Package unavailable to check Rd xrefs: ‘chemometrics’ ``` -# ggspatial - -
- -* Version: 1.1.9 -* GitHub: https://github.com/paleolimbot/ggspatial -* Source code: https://github.com/cran/ggspatial -* Date/Publication: 2023-08-17 15:32:38 UTC -* Number of recursive dependencies: 108 - -Run `revdepcheck::cloud_details(, "ggspatial")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ggspatial-Ex.R’ failed - The error most likely occurred in: - - > ### Name: annotation_spatial_hline - > ### Title: Projected horizontal and vertical lines - > ### Aliases: annotation_spatial_hline annotation_spatial_vline - > ### GeomSpatialXline - > ### Keywords: datasets - > - > ### ** Examples - ... - 25. │ └─grid:::validGP(list(...)) - 26. │ └─grid (local) numnotnull("fontsize") - 27. │ └─grid (local) check.length(gparname) - 28. │ └─base::stop(...) - 29. └─base::.handleSimpleError(...) - 30. └─rlang (local) h(simpleError(msg, call)) - 31. └─handlers[[1L]](cnd) - 32. └─cli::cli_abort(...) - 33. └─rlang::abort(...) - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(ggspatial) - > - > test_check("ggspatial") - Linking to GEOS 3.10.2, GDAL 3.4.1, PROJ 8.2.1; sf_use_s2() is TRUE - [ FAIL 1 | WARN 1 | SKIP 22 | PASS 195 ] - - ... - 33. │ └─base::stop(...) - 34. └─base::.handleSimpleError(...) - 35. └─rlang (local) h(simpleError(msg, call)) - 36. └─handlers[[1L]](cnd) - 37. └─cli::cli_abort(...) - 38. └─rlang::abort(...) - - [ FAIL 1 | WARN 1 | SKIP 22 | PASS 195 ] - Error: Test failures - Execution halted - ``` - -# ggstatsplot - -
- -* Version: 0.12.4 -* GitHub: https://github.com/IndrajeetPatil/ggstatsplot -* Source code: https://github.com/cran/ggstatsplot -* Date/Publication: 2024-07-06 16:22:07 UTC -* Number of recursive dependencies: 174 - -Run `revdepcheck::cloud_details(, "ggstatsplot")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ggstatsplot-Ex.R’ failed - The error most likely occurred in: - - > ### Name: ggscatterstats - > ### Title: Scatterplot with marginal distributions and statistical results - > ### Aliases: ggscatterstats - > - > ### ** Examples - > - > set.seed(123) - ... - + iris, - + x = Sepal.Width, - + y = Petal.Length, - + label.var = Species, - + label.expression = Sepal.Length > 7.6 - + ) + - + ggplot2::geom_rug(sides = "b") - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ggscatterstats ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -## In both - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ggstatsplot.Rmd’ - ... - author = {Indrajeet Patil}, - title = {{Visualizations with statistical details: The {'ggstatsplot'} approach}}, - journal = {{Journal of Open Source Software}}, - } - - > ggbetweenstats(iris, Species, Sepal.Length) - - When sourcing ‘ggstatsplot.R’: - Error: argument is of length zero - Execution halted - - ‘additional.Rmd’ using ‘UTF-8’... OK - ‘ggstatsplot.Rmd’ using ‘UTF-8’... failed - ``` - -# ggtern - -
- -* Version: 3.5.0 -* GitHub: NA -* Source code: https://github.com/cran/ggtern -* Date/Publication: 2024-03-24 21:50:02 UTC -* Number of recursive dependencies: 42 - -Run `revdepcheck::cloud_details(, "ggtern")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ggtern-Ex.R’ failed - The error most likely occurred in: - - > ### Name: annotate - > ### Title: Create an annotation layer (ggtern version). - > ### Aliases: annotate - > - > ### ** Examples - > - > ggtern() + - ... - 3. ├─ggtern::ggplot_build(x) - 4. └─ggtern:::ggplot_build.ggplot(x) - 5. └─ggtern:::layers_add_or_remove_mask(plot) - 6. └─ggint$plot_theme(plot) - 7. └─ggplot2:::validate_theme(theme) - 8. └─base::mapply(...) - 9. └─ggplot2 (local) ``(...) - 10. └─cli::cli_abort(...) - 11. └─rlang::abort(...) - Execution halted - ``` - -## In both +## In both * checking package dependencies ... NOTE ``` Package which this enhances but not available for checking: ‘sp’ ``` -* checking Rd cross-references ... NOTE - ``` - Package unavailable to check Rd xrefs: ‘chemometrics’ - ``` - -# ggupset - -
- -* Version: 0.4.0 -* GitHub: https://github.com/const-ae/ggupset -* Source code: https://github.com/cran/ggupset -* Date/Publication: 2024-06-24 10:10:04 UTC -* Number of recursive dependencies: 46 - -Run `revdepcheck::cloud_details(, "ggupset")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ggupset-Ex.R’ failed - The error most likely occurred in: - - > ### Name: axis_combmatrix - > ### Title: Convert delimited text labels into a combination matrix axis - > ### Aliases: axis_combmatrix - > - > ### ** Examples - > - > library(ggplot2) - ... - Datsun 710 Cyl: 4_Gears: 4 - Hornet 4 Drive Cyl: 6_Gears: 3 - Hornet Sportabout Cyl: 8_Gears: 3 - Valiant Cyl: 6_Gears: 3 - > ggplot(mtcars, aes(x=combined)) + - + geom_bar() + - + axis_combmatrix(sep = "_") - Error in as.unit(e2) : object is not coercible to a unit - Calls: ... polylineGrob -> is.unit -> unit.c -> Ops.unit -> as.unit - Execution halted - ``` - -# ggVennDiagram +## Installation -
+### Devel -* Version: 1.5.2 -* GitHub: https://github.com/gaospecial/ggVennDiagram -* Source code: https://github.com/cran/ggVennDiagram -* Date/Publication: 2024-02-20 08:10:02 UTC -* Number of recursive dependencies: 98 +``` +* installing *source* package ‘ggtern’ ... +** package ‘ggtern’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** demo +** inst +** byte-compile and prepare package for lazy loading +Error in get(x, envir = ns, inherits = FALSE) : + object 'update_guides' not found +Error: unable to load R code in package ‘ggtern’ +Execution halted +ERROR: lazy loading failed for package ‘ggtern’ +* removing ‘/tmp/workdir/ggtern/new/ggtern.Rcheck/ggtern’ -Run `revdepcheck::cloud_details(, "ggVennDiagram")` for more info -
+``` +### CRAN -## Newly broken +``` +* installing *source* package ‘ggtern’ ... +** package ‘ggtern’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** demo +** inst +** byte-compile and prepare package for lazy loading +** help +*** installing help indices +** building package indices +** testing if installed package can be loaded from temporary location +** testing if installed package can be loaded from final location +** testing if installed package keeps a record of temporary installation path +* DONE (ggtern) -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘fully-customed.Rmd’ - ... - [1] "b" "c" "e" "h" "k" "q" "s" "y" - - - > ggVennDiagram(y, show_intersect = TRUE, set_color = "black") - Warning in geom_text(aes(label = .data$count, text = .data$item), data = region_label) : - Ignoring unknown aesthetics: text - - ... - Ignoring unknown aesthetics: text - - When sourcing ‘using-ggVennDiagram.R’: - Error: subscript out of bounds - Execution halted - - ‘VennCalculator.Rmd’ using ‘UTF-8’... OK - ‘fully-customed.Rmd’ using ‘UTF-8’... failed - ‘using-ggVennDiagram.Rmd’ using ‘UTF-8’... failed - ‘using-new-shapes.Rmd’ using ‘UTF-8’... OK - ``` -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘VennCalculator.Rmd’ using rmarkdown - --- finished re-building ‘VennCalculator.Rmd’ - - --- re-building ‘fully-customed.Rmd’ using rmarkdown - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 11.1Mb - sub-directories of 1Mb or more: - doc 9.5Mb - help 1.1Mb - ``` - -# GimmeMyPlot - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/GimmeMyPlot -* Date/Publication: 2023-10-18 16:10:02 UTC -* Number of recursive dependencies: 114 - -Run `revdepcheck::cloud_details(, "GimmeMyPlot")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘GimmeMyPlot-Ex.R’ failed - The error most likely occurred in: - - > ### Name: plot_violin - > ### Title: Violin plot - > ### Aliases: plot_violin - > - > ### ** Examples - > - > library(RColorBrewer) - ... - + width_text = 5, - + pch_colour = "gray30", - + pch_alpha = 0.5, - + width_title = 30, - + lwd = 1.25, - + digits = 2 - + ) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot_violin ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > # This file is part of the standard setup for testthat. - > # It is recommended that you do not modify it. - > # - > # Where should you do additional test configuration? - > # Learn more about the roles of various files in: - > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview - > # * https://testthat.r-lib.org/articles/special-files.html - ... - 4. └─GimmeMyPlot::plot_violin(df) - 5. └─ggplot2:::`+.gg`(...) - 6. └─ggplot2:::add_ggplot(e1, e2, e2name) - 7. ├─ggplot2::ggplot_add(object, p, objectname) - 8. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 9. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 1 | WARN 0 | SKIP 0 | PASS 1 ] - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘Tutorial.Rmd’ - ... - > df[, 3] <- runif(10, 1, 2) - - > colnames(df) <- paste0("X", seq(3)) - - > plot_violin(df, title = "Some random variables", colour = brewer.pal(9, - + "Set1")[seq(3)]) - - When sourcing ‘Tutorial.R’: - Error: argument is of length zero - Execution halted - - ‘Tutorial.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘Tutorial.Rmd’ using rmarkdown - - Quitting from lines 24-57 [violin] (Tutorial.Rmd) - Error: processing vignette 'Tutorial.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘Tutorial.Rmd’ - - SUMMARY: processing the following file failed: - ‘Tutorial.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -# giniVarCI - -
- -* Version: 0.0.1-3 -* GitHub: NA -* Source code: https://github.com/cran/giniVarCI -* Date/Publication: 2024-01-08 10:30:02 UTC -* Number of recursive dependencies: 81 - -Run `revdepcheck::cloud_details(, "giniVarCI")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘giniVarCI-Ex.R’ failed - The error most likely occurred in: - - > ### Name: fcompareCI - > ### Title: Comparisons of variance estimates and confidence intervals for - > ### the Gini index in finite populations - > ### Aliases: fcompareCI - > - > ### ** Examples - > - ... - > data(eusilc, package="laeken") - > y <- eusilc$eqIncome[eusilc$db040 == "Burgenland"] - > w <- eusilc$rb050[eusilc$db040 == "Burgenland"] - > - > # Estimation of the Gini index and confidence intervals using different methods. - > fcompareCI(y, w) - Error in grid.Call.graphics(C_segments, x$x0, x$y0, x$x1, x$y1, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: fcompareCI - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 12.5Mb - sub-directories of 1Mb or more: - libs 12.0Mb - ``` - -# gMCPLite - -
- -* Version: 0.1.5 -* GitHub: https://github.com/Merck/gMCPLite -* Source code: https://github.com/cran/gMCPLite -* Date/Publication: 2024-01-11 19:30:02 UTC -* Number of recursive dependencies: 108 - -Run `revdepcheck::cloud_details(, "gMCPLite")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘GraphicalMultiplicity.Rmd’ - ... - 0.8600 - 0.1400 - - - - > plot(os, plottype = "HR", xlab = "Events") - - When sourcing ‘GraphicalMultiplicity.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘GraphicalMultiplicity.Rmd’ using ‘UTF-8’... failed - ‘hGraph.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘GraphicalMultiplicity.Rmd’ using rmarkdown - ``` - -# gMOIP - -
- -* Version: 1.5.2 -* GitHub: https://github.com/relund/gMOIP -* Source code: https://github.com/cran/gMOIP -* Date/Publication: 2024-02-21 21:30:05 UTC -* Number of recursive dependencies: 113 - -Run `revdepcheck::cloud_details(, "gMOIP")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘gMOIP-Ex.R’ failed - The error most likely occurred in: - - > ### Name: convexHull - > ### Title: Find the convex hull of a set of points. - > ### Aliases: convexHull - > - > ### ** Examples - > - > ## 1D - ... - - $pts - p1 p2 pt vtx - 1 1 1 1 TRUE - 2 2 2 1 TRUE - - > plotHull2D(pts, drawPoints = TRUE) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plotHull2D ... ggplot_add.list -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘bi-objective_2x.Rmd’ - ... - - > b <- c(3, 27, 90) - - > obj <- matrix(c(7, -10, -10, -10), nrow = 2) - - > plotBiObj2D(A, b, obj, addTriangles = FALSE) - - ... - When sourcing ‘polytope_2d.R’: - Error: argument is of length zero - Execution halted - - ‘bi-objective_2x.Rmd’ using ‘UTF-8’... failed - ‘bi-objective_3x_ex1.Rmd’ using ‘UTF-8’... OK - ‘intro.Rmd’ using ‘UTF-8’... failed - ‘polytope_2d.Rmd’ using ‘UTF-8’... failed - ‘polytope_3d_ex1.Rmd’ using ‘UTF-8’... OK - ‘tri-objective.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘bi-objective_2x.Rmd’ using rmarkdown - - Quitting from lines 73-78 [2DLP] (bi-objective_2x.Rmd) - Error: processing vignette 'bi-objective_2x.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘bi-objective_2x.Rmd’ - - --- re-building ‘bi-objective_3x_ex1.Rmd’ using rmarkdown - ``` - -# GofCens - -
- -* Version: 1.1 -* GitHub: NA -* Source code: https://github.com/cran/GofCens -* Date/Publication: 2024-07-29 08:40:02 UTC -* Number of recursive dependencies: 93 - -Run `revdepcheck::cloud_details(, "GofCens")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘GofCens-Ex.R’ failed - The error most likely occurred in: - - > ### Name: kmPlot - > ### Title: Plot of the Kaplen-Meier and parametric estimations - > ### Aliases: kmPlot kmPlot.default kmPlot.formula kmPlot.probPlot - > ### kmPlot.probPlot - > - > ### ** Examples - > - ... - Scale: 10.039 - - > - > # Plots for censored data using ggplot2 - > data(colon) - Warning in data(colon) : data set ‘colon’ not found - > kmPlot(Surv(time, status) ~ 1, colon, distr= "lognormal", ggp = TRUE) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: kmPlot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -# greatR - -
- -* Version: 2.0.0 -* GitHub: https://github.com/ruthkr/greatR -* Source code: https://github.com/cran/greatR -* Date/Publication: 2024-04-09 22:40:07 UTC -* Number of recursive dependencies: 77 - -Run `revdepcheck::cloud_details(, "greatR")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘process-results.Rmd’ - ... - - > reg_summary$non_registered_genes - [1] "BRAA02G018970.3C" - - > plot(reg_summary, type = "registered", scatterplot_size = c(4, - + 3.5)) - - When sourcing ‘process-results.R’: - Error: object is not a unit - Execution halted - - ‘data-requirement.Rmd’ using ‘UTF-8’... OK - ‘process-results.Rmd’ using ‘UTF-8’... failed - ‘register-data-manually.Rmd’ using ‘UTF-8’... OK - ‘register-data.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘data-requirement.Rmd’ using rmarkdown - --- finished re-building ‘data-requirement.Rmd’ - - --- re-building ‘process-results.Rmd’ using rmarkdown - - Quitting from lines 76-81 [plot-summary-results] (process-results.Rmd) - Error: processing vignette 'process-results.Rmd' failed with diagnostics: - object is not a unit - ... - --- finished re-building ‘register-data-manually.Rmd’ - - --- re-building ‘register-data.Rmd’ using rmarkdown - --- finished re-building ‘register-data.Rmd’ - - SUMMARY: processing the following file failed: - ‘process-results.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -# Greymodels - -
- -* Version: 2.0.1 -* GitHub: https://github.com/havishaJ/Greymodels -* Source code: https://github.com/cran/Greymodels -* Date/Publication: 2022-12-05 12:42:35 UTC -* Number of recursive dependencies: 91 - -Run `revdepcheck::cloud_details(, "Greymodels")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘Greymodels-Ex.R’ failed - The error most likely occurred in: - - > ### Name: Plots - > ### Title: plots - > ### Aliases: plots plotrm plotsmv1 plotsmv2 plotsigndgm plots_mdbgm12 - > - > ### ** Examples - > - > # Plots - EPGM (1, 1) model - ... - + geom_point(data = set4, aes(x = CI, y = y), shape = 23, color = "black") + - + geom_line(data = xy1, aes(x = x, y = y,color = "Raw Data")) + - + geom_line(data = xy2, aes(x = x, y = y,color = "Fitted&Forecasts")) + - + geom_line(data = set3, aes(x = CI, y = y,color = "LowerBound"), linetype=2) + - + geom_line(data = set4, aes(x = CI, y = y,color = "UpperBound"), linetype=2) + - + scale_color_manual(name = "Label",values = colors) - > r <- ggplotly(p) - Error in pm[[2]] : subscript out of bounds - Calls: ggplotly -> ggplotly.ggplot -> gg2list - Execution halted - ``` - -# gsDesign - -
- -* Version: 3.6.4 -* GitHub: https://github.com/keaven/gsDesign -* Source code: https://github.com/cran/gsDesign -* Date/Publication: 2024-07-26 23:20:10 UTC -* Number of recursive dependencies: 102 - -Run `revdepcheck::cloud_details(, "gsDesign")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘gsDesign-Ex.R’ failed - The error most likely occurred in: - - > ### Name: summary.gsDesign - > ### Title: Bound Summary and Z-transformations - > ### Aliases: summary.gsDesign print.gsDesign gsBoundSummary xprint - > ### print.gsBoundSummary gsBValue gsDelta gsRR gsHR gsCPz - > ### Keywords: design - > - > ### ** Examples - ... - ~RR at bound 0.6605 0.6605 - P(Cross) if RR=1 0.0239 0.9761 - P(Cross) if RR=0.5 0.9000 0.1000 - > gsRR(z = xp$lower$bound, i = 1:3, xrr) - [1] 1.0732500 0.8211496 NA - > plot(xrr, plottype = "RR") - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(gsDesign) - > - > test_check("gsDesign") - Linear spending function with none = [ FAIL 15 | WARN 9 | SKIP 98 | PASS 1799 ] - - ══ Skipped tests (98) ══════════════════════════════════════════════════════════ - ... - 20. │ └─grid:::grid.draw.grob(x$children[[i]], recording = FALSE) - 21. │ └─grDevices::recordGraphics(drawGrob(x), list(x = x), getNamespace("grid")) - 22. └─grid:::drawGrob(x) - 23. ├─grid::drawDetails(x, recording = FALSE) - 24. └─grid:::drawDetails.polyline(x, recording = FALSE) - 25. └─grid:::grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) - - [ FAIL 15 | WARN 9 | SKIP 98 | PASS 1799 ] - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ConditionalPowerPlot.Rmd’ - ... - - > cp <- gsCP(x = update, i = 1, zi = -qnorm(p), theta = theta) - - > plot(cp, xval = hr, xlab = "Future HR", ylab = "Conditional Power/Error", - + main = "Conditional probability of crossing future bound", - + o .... [TRUNCATED] - - ... - ‘PoissonMixtureModel.Rmd’ using ‘UTF-8’... OK - ‘SpendingFunctionOverview.Rmd’ using ‘UTF-8’... OK - ‘SurvivalOverview.Rmd’ using ‘UTF-8’... OK - ‘VaccineEfficacy.Rmd’ using ‘UTF-8’... OK - ‘binomialSPRTExample.Rmd’ using ‘UTF-8’... OK - ‘gsDesignPackageOverview.Rmd’ using ‘UTF-8’... failed - ‘gsSurvBasicExamples.Rmd’ using ‘UTF-8’... failed - ‘hGraph.Rmd’ using ‘UTF-8’... OK - ‘nNormal.Rmd’ using ‘UTF-8’... OK - ‘toInteger.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘ConditionalErrorSpending.Rmd’ using rmarkdown - ``` - -# gtExtras - -
- -* Version: 0.5.0 -* GitHub: https://github.com/jthomasmock/gtExtras -* Source code: https://github.com/cran/gtExtras -* Date/Publication: 2023-09-15 22:32:06 UTC -* Number of recursive dependencies: 105 - -Run `revdepcheck::cloud_details(, "gtExtras")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(gtExtras) - Loading required package: gt - - Attaching package: 'gt' - - The following object is masked from 'package:testthat': - ... - ══ Failed tests ════════════════════════════════════════════════════════════════ - ── Failure ('test-gt_plt_bar.R:44:3'): gt_plt_bar svg is created and has specific values ── - `bar_neg_vals` (`actual`) not equal to c("49.19", "32.79", "16.40", "16.40", "32.79", "49.19") (`expected`). - - `actual`: "49.19" "32.79" "16.40" "0.00" "0.00" "0.00" - `expected`: "49.19" "32.79" "16.40" "16.40" "32.79" "49.19" - - [ FAIL 1 | WARN 14 | SKIP 23 | PASS 115 ] - Error: Test failures - Execution halted - ``` - -# HaploCatcher - -
- -* Version: 1.0.4 -* GitHub: NA -* Source code: https://github.com/cran/HaploCatcher -* Date/Publication: 2023-04-21 23:32:39 UTC -* Number of recursive dependencies: 112 - -Run `revdepcheck::cloud_details(, "HaploCatcher")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘An_Intro_to_HaploCatcher.Rmd’ - ... - > set.seed(NULL) - - > results1 <- auto_locus(geno_mat = geno_mat, gene_file = gene_comp, - + gene_name = "sst1_solid_stem", marker_info = marker_info, - + chromosom .... [TRUNCATED] - Loading required package: lattice - - When sourcing ‘An_Intro_to_HaploCatcher.R’: - Error: object is not a unit - Execution halted - - ‘An_Intro_to_HaploCatcher.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘An_Intro_to_HaploCatcher.Rmd’ using rmarkdown - - Quitting from lines 242-253 [example_models_1] (An_Intro_to_HaploCatcher.Rmd) - Error: processing vignette 'An_Intro_to_HaploCatcher.Rmd' failed with diagnostics: - object is not a unit - --- failed re-building ‘An_Intro_to_HaploCatcher.Rmd’ - - SUMMARY: processing the following file failed: - ‘An_Intro_to_HaploCatcher.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -# healthyR - -
- -* Version: 0.2.2 -* GitHub: https://github.com/spsanderson/healthyR -* Source code: https://github.com/cran/healthyR -* Date/Publication: 2024-07-01 13:20:02 UTC -* Number of recursive dependencies: 146 - -Run `revdepcheck::cloud_details(, "healthyR")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘getting-started.Rmd’ - ... - + .by = "month", .interactive = FALSE) - Warning: Ignoring unknown labels: - • `colour = "Legend"` - - > ts_alos_plt(.data = df_tbl, .date_col = Date, .value_col = Values, - + .by = "month", .interactive = TRUE) - - When sourcing ‘getting-started.R’: - Error: subscript out of bounds - Execution halted - - ‘getting-started.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘getting-started.Rmd’ using rmarkdown - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 6.6Mb - sub-directories of 1Mb or more: - data 2.5Mb - doc 3.7Mb - ``` - -# healthyR.ts - -
- -* Version: 0.3.0 -* GitHub: https://github.com/spsanderson/healthyR.ts -* Source code: https://github.com/cran/healthyR.ts -* Date/Publication: 2023-11-15 06:00:05 UTC -* Number of recursive dependencies: 200 - -Run `revdepcheck::cloud_details(, "healthyR.ts")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘healthyR.ts-Ex.R’ failed - The error most likely occurred in: - - > ### Name: tidy_fft - > ### Title: Tidy Style FFT - > ### Aliases: tidy_fft - > - > ### ** Examples - > - > suppressPackageStartupMessages(library(dplyr)) - ... - > a <- tidy_fft( - + .data = data_tbl, - + .value_col = value, - + .date_col = date_col, - + .harmonics = 3, - + .frequency = 12 - + ) - Error in pm[[2]] : subscript out of bounds - Calls: tidy_fft -> -> ggplotly.ggplot -> gg2list - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘using-tidy-fft.Rmd’ - ... - $ value 112, 118, 132, 129, 121, 135, 148, 148, 136, 119, 104, 118, 1… - - > suppressPackageStartupMessages(library(timetk)) - - > data_tbl %>% plot_time_series(.date_var = date_col, - + .value = value) - - When sourcing ‘using-tidy-fft.R’: - Error: subscript out of bounds - Execution halted - - ‘getting-started.Rmd’ using ‘UTF-8’... OK - ‘using-tidy-fft.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘getting-started.Rmd’ using rmarkdown - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 6.3Mb - sub-directories of 1Mb or more: - doc 5.2Mb - ``` - -# heatmaply - -
- -* Version: 1.5.0 -* GitHub: https://github.com/talgalili/heatmaply -* Source code: https://github.com/cran/heatmaply -* Date/Publication: 2023-10-06 20:50:02 UTC -* Number of recursive dependencies: 111 - -Run `revdepcheck::cloud_details(, "heatmaply")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(heatmaply) - Loading required package: plotly - Loading required package: ggplot2 - - Attaching package: 'plotly' - - ... - 4. │ │ └─base::withCallingHandlers(...) - 5. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) - 6. ├─heatmaply:::predict_colors(ggplotly(g), plot_method = "ggplot") - 7. ├─plotly::ggplotly(g) - 8. └─plotly:::ggplotly.ggplot(g) - 9. └─plotly::gg2list(...) - - [ FAIL 58 | WARN 0 | SKIP 0 | PASS 193 ] - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘heatmaply.Rmd’ - ... - - > library("heatmaply") - - > library("heatmaply") - - > heatmaply(mtcars) - - When sourcing ‘heatmaply.R’: - Error: subscript out of bounds - Execution halted - - ‘heatmaply.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘heatmaply.Rmd’ using rmarkdown - - Quitting from lines 109-111 [unnamed-chunk-5] (heatmaply.Rmd) - Error: processing vignette 'heatmaply.Rmd' failed with diagnostics: - subscript out of bounds - --- failed re-building ‘heatmaply.Rmd’ - - SUMMARY: processing the following file failed: - ‘heatmaply.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 5.5Mb - sub-directories of 1Mb or more: - doc 5.1Mb - ``` - -# hermiter - -
- -* Version: 2.3.1 -* GitHub: https://github.com/MikeJaredS/hermiter -* Source code: https://github.com/cran/hermiter -* Date/Publication: 2024-03-06 23:50:02 UTC -* Number of recursive dependencies: 79 - -Run `revdepcheck::cloud_details(, "hermiter")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘hermiter.Rmd’ - ... - > p2 <- ggplot(df_pdf_cdf) + geom_tile(aes(X, Y, fill = pdf_est)) + - + scale_fill_continuous_sequential(palette = "Oslo", breaks = seq(0, - + .... [TRUNCATED] - - > p1 + ggtitle("Actual PDF") + theme(legend.title = element_blank()) + - + p2 + ggtitle("Estimated PDF") + theme(legend.title = element_blank()) + .... [TRUNCATED] - - When sourcing ‘hermiter.R’: - Error: object is not a unit - Execution halted - - ‘hermiter.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘hermiter.Rmd’ using rmarkdown - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 6.8Mb - sub-directories of 1Mb or more: - R 2.6Mb - doc 1.9Mb - libs 2.0Mb - ``` - -* checking for GNU extensions in Makefiles ... NOTE - ``` - GNU make is a SystemRequirements. - ``` - -# heumilkr - -
- -* Version: 0.2.0 -* GitHub: https://github.com/lschneiderbauer/heumilkr -* Source code: https://github.com/cran/heumilkr -* Date/Publication: 2024-04-01 13:50:06 UTC -* Number of recursive dependencies: 80 - -Run `revdepcheck::cloud_details(, "heumilkr")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘clarke_wright_performance.Rmd’ - ... - + "F", "tai"), group_desc = c("Augerat A, 1995", "Augerat B, 1995", - + "Christofides and ..." ... [TRUNCATED] - - > ggMarginal(ggplot(merge(result, description, by = "group"), - + aes(x = n_site, y = clarke_wright_perf_xi, color = group_desc)) + - + geom_poi .... [TRUNCATED] - - When sourcing ‘clarke_wright_performance.R’: - Error: argument is of length zero - Execution halted - - ‘clarke_wright_performance.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘clarke_wright_performance.Rmd’ using rmarkdown - - Quitting from lines 69-97 [perf_scale_based_graph] (clarke_wright_performance.Rmd) - Error: processing vignette 'clarke_wright_performance.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘clarke_wright_performance.Rmd’ - - SUMMARY: processing the following file failed: - ‘clarke_wright_performance.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -# hilldiv - -
- -* Version: 1.5.1 -* GitHub: https://github.com/anttonalberdi/hilldiv -* Source code: https://github.com/cran/hilldiv -* Date/Publication: 2019-10-01 14:40:02 UTC -* Number of recursive dependencies: 144 - -Run `revdepcheck::cloud_details(, "hilldiv")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘hilldiv-Ex.R’ failed - The error most likely occurred in: - - > ### Name: div_test_plot - > ### Title: Diversity test plotting - > ### Aliases: div_test_plot - > ### Keywords: chart comparison hill numbers - > - > ### ** Examples - > - ... - 11. │ └─ggplot2:::`+.gg`(...) - 12. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 13. │ ├─ggplot2::ggplot_add(object, p, objectname) - 14. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 15. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 16. └─base::.handleSimpleError(...) - 17. └─purrr (local) h(simpleError(msg, call)) - 18. └─cli::cli_abort(...) - 19. └─rlang::abort(...) - Execution halted - ``` - -# hmclearn - -
- -* Version: 0.0.5 -* GitHub: NA -* Source code: https://github.com/cran/hmclearn -* Date/Publication: 2020-10-05 06:40:02 UTC -* Number of recursive dependencies: 97 - -Run `revdepcheck::cloud_details(, "hmclearn")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘hmclearn-Ex.R’ failed - The error most likely occurred in: - - > ### Name: hmclearn-plots - > ### Title: Plotting for MCMC visualization and diagnostics provided by - > ### 'bayesplot' package - > ### Aliases: hmclearn-plots mcmc_intervals mcmc_intervals.hmclearn - > ### mcmc_areas mcmc_areas.hmclearn mcmc_hist mcmc_hist.hmclearn - > ### mcmc_hist_by_chain mcmc_hist_by_chain.hmclearn mcmc_dens - > ### mcmc_dens.hmclearn mcmc_scatter mcmc_scatter.hmclearn mcmc_hex - ... - + param = list(y=y, X=X), - + parallel=FALSE, chains=2) - > - > mcmc_trace(f, burnin=100) - > mcmc_hist(f, burnin=100) - `stat_bin()` using `bins = 30`. Pick better value with `binwidth`. - > mcmc_intervals(f, burnin=100) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: mcmc_intervals ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -# HTLR - -
- -* Version: 0.4-4 -* GitHub: https://github.com/longhaiSK/HTLR -* Source code: https://github.com/cran/HTLR -* Date/Publication: 2022-10-22 12:47:53 UTC -* Number of recursive dependencies: 91 - -Run `revdepcheck::cloud_details(, "HTLR")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘simu.Rmd’ - ... - [1] "median" - - > post.t <- as.matrix(fit.t2, k = 2) - - > mcmc_intervals(post.t, pars = c("Intercept", "V1", - + "V2", "V3", "V1000")) - - When sourcing ‘simu.R’: - Error: argument is of length zero - Execution halted - - ‘simu.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘simu.Rmd’ using rmarkdown - ``` - -## In both - -* checking C++ specification ... NOTE - ``` - Specified C++11: please drop specification unless essential - ``` - -* checking installed package size ... NOTE - ``` - installed size is 8.8Mb - sub-directories of 1Mb or more: - data 2.0Mb - doc 1.1Mb - libs 5.4Mb - ``` - -# HVT - -
- -* Version: 24.5.2 -* GitHub: https://github.com/Mu-Sigma/HVT -* Source code: https://github.com/cran/HVT -* Date/Publication: 2024-05-15 08:50:21 UTC -* Number of recursive dependencies: 200 - -Run `revdepcheck::cloud_details(, "HVT")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘HVT-Ex.R’ failed - The error most likely occurred in: - - > ### Name: getTransitionProbability - > ### Title: Creating Transition Probabilities list - > ### Aliases: getTransitionProbability - > ### Keywords: Transition_or_Prediction - > - > ### ** Examples - > - ... - Ignoring unknown parameters: `check_overlap` - Scale for x is already present. - Adding another scale for x, which will replace the existing scale. - Scale for y is already present. - Adding another scale for y, which will replace the existing scale. - Warning in geom_polygon(data = boundaryCoords2, aes(x = bp.x, y = bp.y, : - Ignoring unknown aesthetics: text - Error in pm[[2]] : subscript out of bounds - Calls: scoreHVT -> -> ggplotly.ggplot -> gg2list - Execution halted - ``` - -# hypsoLoop - -
- -* Version: 0.2.0 -* GitHub: NA -* Source code: https://github.com/cran/hypsoLoop -* Date/Publication: 2022-02-08 09:00:02 UTC -* Number of recursive dependencies: 97 - -Run `revdepcheck::cloud_details(, "hypsoLoop")` for more info - -
- -## Newly broken - -* checking whether package ‘hypsoLoop’ can be installed ... WARNING - ``` - Found the following significant warnings: - Warning: replacing previous import ‘ggplot2::set_theme’ by ‘sjPlot::set_theme’ when loading ‘hypsoLoop’ - See ‘/tmp/workdir/hypsoLoop/new/hypsoLoop.Rcheck/00install.out’ for details. - ``` - -# ibdsim2 - -
- -* Version: 2.1.1 -* GitHub: https://github.com/magnusdv/ibdsim2 -* Source code: https://github.com/cran/ibdsim2 -* Date/Publication: 2024-09-08 07:40:02 UTC -* Number of recursive dependencies: 80 - -Run `revdepcheck::cloud_details(, "ibdsim2")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ibdsim2-Ex.R’ failed - The error most likely occurred in: - - > ### Name: plotSegmentDistribution - > ### Title: Scatter plots of IBD segment distributions - > ### Aliases: plotSegmentDistribution - > - > ### ** Examples - > - > - ... - Skip recomb : - - Total time used: 0.00288 secs - > - > # By default, the IBD segments of the "leaves" are computed and plotted - > plotSegmentDistribution(simPat, simMat, type = "ibd1", ids = 4:5, - + labels = c("HSpat", "HSmat")) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -# ICtest - -
- -* Version: 0.3-5 -* GitHub: NA -* Source code: https://github.com/cran/ICtest -* Date/Publication: 2022-05-18 07:30:29 UTC -* Number of recursive dependencies: 97 - -Run `revdepcheck::cloud_details(, "ICtest")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ICtest-Ex.R’ failed - The error most likely occurred in: - - > ### Name: ggplot.ictest - > ### Title: Scatterplot Matrix for a ictest Object using ggplot2 - > ### Aliases: ggplot.ictest - > ### Keywords: hplot - > - > ### ** Examples - > - ... - > # The aesthetics variables - > mapvar <- data.frame(iris[, 5]) - > colnames(mapvar) <- "species" - > - > TestCov <- PCAasymp(X, k = 2) - > ggplot(TestCov) - > ggplot(TestCov, aes(color = species), mapvar = mapvar, which = "k") - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 5.7Mb - sub-directories of 1Mb or more: - doc 2.5Mb - libs 2.9Mb - ``` - -# idiogramFISH - -
- -* Version: 2.0.13 -* GitHub: NA -* Source code: https://github.com/cran/idiogramFISH -* Date/Publication: 2023-08-22 16:50:02 UTC -* Number of recursive dependencies: 164 - -Run `revdepcheck::cloud_details(, "idiogramFISH")` for more info - -
- -## Newly broken - -* checking installed package size ... NOTE - ``` - installed size is 5.1Mb - sub-directories of 1Mb or more: - R 1.5Mb - doc 2.0Mb - ``` - -## In both - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘index.Rmd’ - ... - > if (requireNamespace("RCurl", quietly = TRUE)) { - + v <- sub("Version: ", "", readLines("../DESCRIPTION")[3]) - + pkg <- "idiogramFISH" - + l .... [TRUNCATED] - Warning in file(con, "r") : - cannot open file '../DESCRIPTION': No such file or directory - - When sourcing ‘index.R’: - Error: cannot open the connection - Execution halted - - ‘AVignette.Rmd’ using ‘UTF-8’... OK - ‘index.Rmd’ using ‘UTF-8’... failed - ``` - -# IDMIR - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/IDMIR -* Date/Publication: 2023-11-09 15:30:02 UTC -* Number of recursive dependencies: 112 - -Run `revdepcheck::cloud_details(, "IDMIR")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘IDMIR-Ex.R’ failed - The error most likely occurred in: - - > ### Name: PlotSurvival - > ### Title: PlotSurvival - > ### Aliases: PlotSurvival - > - > ### ** Examples - > - > # Obtain the example data - ... - > GEP<-GetData_Mirna("GEP") - > survival<-GetData_Mirna("survival") - > MiRNAs<-c("hsa-miR-21-5p","hsa-miR-26a-5p","hsa-miR-369-5p","hsa-miR-1238-3p","hsa-miR-10b-5p") - > # Run the function - > SingleMiRNA_CRData<-SingleMiRNA_CRModel(GEP, - + "hsa-miR-21-5p",survival,cutoff.point=NULL) - > PlotSurvival(SingleMiRNA_CRData) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: PlotSurvival ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘IDMIR.Rmd’ - ... - > survival <- GetData_Mirna("survival") - - > SingleMiRNA_CRData <- SingleMiRNA_CRModel(GEP, "hsa-miR-21-5p", - + cutoff.point = NULL, survival) - - > PlotSurvival(SingleMiRNA_CRData) - - When sourcing ‘IDMIR.R’: - Error: argument is of length zero - Execution halted - - ‘IDMIR.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘IDMIR.Rmd’ using rmarkdown - - Quitting from lines 120-130 [unnamed-chunk-7] (IDMIR.Rmd) - Error: processing vignette 'IDMIR.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘IDMIR.Rmd’ - - SUMMARY: processing the following file failed: - ‘IDMIR.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -# idopNetwork - -
- -* Version: 0.1.2 -* GitHub: https://github.com/cxzdsa2332/idopNetwork -* Source code: https://github.com/cran/idopNetwork -* Date/Publication: 2023-04-18 06:50:02 UTC -* Number of recursive dependencies: 77 - -Run `revdepcheck::cloud_details(, "idopNetwork")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘idopNetwork_vignette.Rmd’ - ... - - > qdODE_plot_base(ode.test) - - > ode.module = test_result$d1_module - - > qdODE_plot_all(ode.module) - - When sourcing ‘idopNetwork_vignette.R’: - Error: object is not a unit - Execution halted - - ‘idopNetwork_vignette.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘idopNetwork_vignette.Rmd’ using rmarkdown - ``` - -# ihclust - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/ihclust -* Date/Publication: 2022-04-27 07:20:02 UTC -* Number of recursive dependencies: 114 - -Run `revdepcheck::cloud_details(, "ihclust")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ihclust-Ex.R’ failed - The error most likely occurred in: - - > ### Name: ihclust - > ### Title: Iterative Hierarchical Clustering (IHC) - > ### Aliases: ihclust - > - > ### ** Examples - > - > # This is an example not using the permutation approach - ... - 12. │ └─ggplot2:::`+.gg`(p, do.call(geom_line, option)) - 13. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 14. │ ├─ggplot2::ggplot_add(object, p, objectname) - 15. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 16. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 17. └─base::.handleSimpleError(...) - 18. └─purrr (local) h(simpleError(msg, call)) - 19. └─cli::cli_abort(...) - 20. └─rlang::abort(...) - Execution halted - ``` - -# immunarch - -
- -* Version: 0.9.1 -* GitHub: https://github.com/immunomind/immunarch -* Source code: https://github.com/cran/immunarch -* Date/Publication: 2024-03-18 19:10:06 UTC -* Number of recursive dependencies: 198 - -Run `revdepcheck::cloud_details(, "immunarch")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘immunarch-Ex.R’ failed - The error most likely occurred in: - - > ### Name: geneUsageAnalysis - > ### Title: Post-analysis of V-gene and J-gene statistics: PCA, clustering, - > ### etc. - > ### Aliases: geneUsageAnalysis - > - > ### ** Examples - > - ... - 17. │ └─ggplot2:::`+.gg`(p, do.call(geom_line, option)) - 18. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 19. │ ├─ggplot2::ggplot_add(object, p, objectname) - 20. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 21. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 22. └─base::.handleSimpleError(...) - 23. └─purrr (local) h(simpleError(msg, call)) - 24. └─cli::cli_abort(...) - 25. └─rlang::abort(...) - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 10.6Mb - sub-directories of 1Mb or more: - R 1.5Mb - data 5.5Mb - doc 1.6Mb - ``` - -# incidental - -
- -* Version: 0.1 -* GitHub: NA -* Source code: https://github.com/cran/incidental -* Date/Publication: 2020-09-16 09:50:03 UTC -* Number of recursive dependencies: 67 - -Run `revdepcheck::cloud_details(, "incidental")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘incidental-tutorial.Rmd’ - ... - - > data_subset = do.call("rbind", model_df_list) - - > ggplot(data_subset, aes(x = Time, y = Reported)) + - + geom_point(color = "coral2", shape = 3) + geom_line(aes(x = Time, - + y = Ihat), color .... [TRUNCATED] - - When sourcing ‘incidental-tutorial.R’: - Error: `x` must be a vector, not a object. - Execution halted - - ‘incidental-tutorial.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘incidental-tutorial.Rmd’ using rmarkdown - ``` - -# infer - -
- -* Version: 1.0.7 -* GitHub: https://github.com/tidymodels/infer -* Source code: https://github.com/cran/infer -* Date/Publication: 2024-03-25 21:50:02 UTC -* Number of recursive dependencies: 127 - -Run `revdepcheck::cloud_details(, "infer")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘infer-Ex.R’ failed - The error most likely occurred in: - - > ### Name: shade_confidence_interval - > ### Title: Add information about confidence interval - > ### Aliases: shade_confidence_interval shade_ci - > - > ### ** Examples - > - > # find the point estimate---mean number of hours worked per week - ... - + type = "se") - > - > - > # and plot it! - > boot_dist %>% - + visualize() + - + shade_confidence_interval(ci) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: %>% ... ggplot_add.list -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > # This file is part of the standard setup for testthat. - > # It is recommended that you do not modify it. - > # - > # Where should you do additional test configuration? - > # Learn more about the roles of various files in: - > # * https://r-pkgs.org/tests.html - > # * https://testthat.r-lib.org/reference/test_package.html#special-files - ... - 18. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 19. │ ├─ggplot2::ggplot_add(object, p, objectname) - 20. │ └─ggplot2:::ggplot_add.list(object, p, objectname) - 21. │ ├─ggplot2::ggplot_add(o, plot, object_name) - 22. │ └─ggplot2:::ggplot_add.Layer(o, plot, object_name) - 23. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 24. └─base::.handleSimpleError(...) - 25. └─testthat (local) h(simpleError(msg, call)) - 26. └─rlang::abort(...) - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘anova.Rmd’ - ... - + generate(reps = 1000, type = "permute") %>% calculate( .... [TRUNCATED] - Dropping unused factor levels DK from the supplied explanatory variable - 'partyid'. - - > null_dist %>% visualize() + shade_p_value(observed_f_statistic, - + direction = "greater") - - ... - When sourcing ‘t_test.R’: - Error: argument is of length zero - Execution halted - - ‘anova.Rmd’ using ‘UTF-8’... failed - ‘chi_squared.Rmd’ using ‘UTF-8’... failed - ‘infer.Rmd’ using ‘UTF-8’... failed - ‘observed_stat_examples.Rmd’ using ‘UTF-8’... failed - ‘paired.Rmd’ using ‘UTF-8’... failed - ‘t_test.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘anova.Rmd’ using rmarkdown - ``` - -# injurytools - -
- -* Version: 1.0.3 -* GitHub: https://github.com/lzumeta/injurytools -* Source code: https://github.com/cran/injurytools -* Date/Publication: 2023-11-14 17:20:05 UTC -* Number of recursive dependencies: 155 - -Run `revdepcheck::cloud_details(, "injurytools")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘model-injury-data-ii.Rmd’ - ... - n events median 0.95LCL 0.95UCL - seasonb=2017/2018 23 16 265 152 NA - seasonb=2018/2019 19 17 106 84 165 - - > ggsurvplot(fit, data = injd_sub, palette = c("#E7B800", - + "#2E9FDF")) + xlab("Time [calendar days]") + ylab(expression("Survival probability ( ..." ... [TRUNCATED] - - When sourcing ‘model-injury-data-ii.R’: - Error: argument is of length zero - Execution halted - - ‘estimate-epi-measures.Rmd’ using ‘UTF-8’... OK - ‘model-injury-data-i.Rmd’ using ‘UTF-8’... OK - ‘model-injury-data-ii.Rmd’ using ‘UTF-8’... failed - ‘prepare-injury-data.Rmd’ using ‘UTF-8’... OK - ‘visualize-injury-data.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘estimate-epi-measures.Rmd’ using rmarkdown - --- finished re-building ‘estimate-epi-measures.Rmd’ - - --- re-building ‘model-injury-data-i.Rmd’ using rmarkdown - ``` - -# inlabru - -
- -* Version: 2.11.1 -* GitHub: https://github.com/inlabru-org/inlabru -* Source code: https://github.com/cran/inlabru -* Date/Publication: 2024-07-01 23:30:02 UTC -* Number of recursive dependencies: 141 - -Run `revdepcheck::cloud_details(, "inlabru")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘inlabru-Ex.R’ failed - The error most likely occurred in: - - > ### Name: seals - > ### Title: Seal pups - > ### Aliases: seals seals_sp - > ### Keywords: datasets - > - > ### ** Examples - > - > if (require(ggplot2, quietly = TRUE)) { - + ggplot() + - + geom_fm(data = seals_sp$mesh) + - + gg(seals_sp$points) - + } - Error in if (new_name %in% existing) { : argument is of length zero - Calls: +.gg ... ggplot_add.list -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -## In both - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > if (require(testthat, quietly = TRUE)) { - + test_check("inlabru") - + } - Loading required package: inlabru - Loading required package: fmesher - Starting 2 test processes - [ FAIL 2 | WARN 0 | SKIP 49 | PASS 144 ] - ... - 9. │ └─INLA:::expand.inla.stack.responses(responses) - 10. │ └─base::lapply(...) - 11. │ └─INLA (local) FUN(X[[i]], ...) - 12. │ └─dplyr::bind_rows(...) - 13. │ └─vctrs::vec_rbind(!!!dots, .names_to = .id, .error_call = current_env()) - 14. └─rlang::abort(message = message) - - [ FAIL 2 | WARN 0 | SKIP 49 | PASS 144 ] - Error: Test failures - Execution halted - ``` - -* checking package dependencies ... NOTE - ``` - Package which this enhances but not available for checking: ‘stars’ - ``` - -# insurancerating - -
- -* Version: 0.7.4 -* GitHub: https://github.com/mharinga/insurancerating -* Source code: https://github.com/cran/insurancerating -* Date/Publication: 2024-05-20 11:30:03 UTC -* Number of recursive dependencies: 133 - -Run `revdepcheck::cloud_details(, "insurancerating")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘insurancerating-Ex.R’ failed - The error most likely occurred in: - - > ### Name: autoplot.univariate - > ### Title: Automatically create a ggplot for objects obtained from - > ### univariate() - > ### Aliases: autoplot.univariate - > - > ### ** Examples - > - ... - > xzip <- univariate(MTPL, x = bm, severity = amount, nclaims = nclaims, - + exposure = exposure, by = zip) - > autoplot(xzip, show_plots = 1:2) - Warning: Removed 16 rows containing missing values or values outside the scale range - (`geom_point()`). - Warning: Removed 5 rows containing missing values or values outside the scale range - (`geom_line()`). - Error in identicalUnits(x) : object is not a unit - Calls: ... assemble_guides -> guides_build -> unit.c -> identicalUnits - Execution halted - ``` - -# inTextSummaryTable - -
- -* Version: 3.3.3 -* GitHub: https://github.com/openanalytics/inTextSummaryTable -* Source code: https://github.com/cran/inTextSummaryTable -* Date/Publication: 2024-06-12 18:30:02 UTC -* Number of recursive dependencies: 113 - -Run `revdepcheck::cloud_details(, "inTextSummaryTable")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(inTextSummaryTable) - > - > test_check("inTextSummaryTable") - [ FAIL 62 | WARN 0 | SKIP 0 | PASS 878 ] - - ══ Failed tests ════════════════════════════════════════════════════════════════ - ... - 6. └─inTextSummaryTable::subjectProfileSummaryPlot(...) - 7. └─ggplot2:::`+.gg`(gg, do.call(geom_line, argsGeomLine)) - 8. └─ggplot2:::add_ggplot(e1, e2, e2name) - 9. ├─ggplot2::ggplot_add(object, p, objectname) - 10. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 11. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 62 | WARN 0 | SKIP 0 | PASS 878 ] - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘inTextSummaryTable-aesthetics.Rmd’ - ... - - > summaryTable <- data.frame(visit = c(1, 2, 1, 2), - + TRT = c("A", "A", "B", "B"), statMean = rnorm(4)) - - > subjectProfileSummaryPlot(data = summaryTable, xVar = "visit", - + colorVar = "TRT") - - ... - Error: argument is of length zero - Execution halted - - ‘inTextSummaryTable-advanced.Rmd’ using ‘UTF-8’... OK - ‘inTextSummaryTable-aesthetics.Rmd’ using ‘UTF-8’... failed - ‘inTextSummaryTable-createTables.Rmd’ using ‘UTF-8’... OK - ‘inTextSummaryTable-exportTables.Rmd’ using ‘UTF-8’... OK - ‘inTextSummaryTable-introduction.Rmd’ using ‘UTF-8’... OK - ‘inTextSummaryTable-standardTables.Rmd’ using ‘UTF-8’... OK - ‘inTextSummaryTable-visualization.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘inTextSummaryTable-advanced.Rmd’ using rmarkdown - --- finished re-building ‘inTextSummaryTable-advanced.Rmd’ - - --- re-building ‘inTextSummaryTable-aesthetics.Rmd’ using rmarkdown - - Quitting from lines 211-224 [aesthetics-defaultsVisualization] (inTextSummaryTable-aesthetics.Rmd) - Error: processing vignette 'inTextSummaryTable-aesthetics.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘inTextSummaryTable-aesthetics.Rmd’ - ... - Error: processing vignette 'inTextSummaryTable-visualization.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘inTextSummaryTable-visualization.Rmd’ - - SUMMARY: processing the following files failed: - ‘inTextSummaryTable-aesthetics.Rmd’ - ‘inTextSummaryTable-visualization.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 10.3Mb - sub-directories of 1Mb or more: - doc 9.7Mb - ``` - -# inventorize - -
- -* Version: 1.1.1 -* GitHub: NA -* Source code: https://github.com/cran/inventorize -* Date/Publication: 2022-05-31 22:20:09 UTC -* Number of recursive dependencies: 71 - -Run `revdepcheck::cloud_details(, "inventorize")` for more info - -
- -## Newly broken - -* checking whether package ‘inventorize’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/inventorize/new/inventorize.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘inventorize’ ... -** package ‘inventorize’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** byte-compile and prepare package for lazy loading -Error in pm[[2]] : subscript out of bounds -Error: unable to load R code in package ‘inventorize’ -Execution halted -ERROR: lazy loading failed for package ‘inventorize’ -* removing ‘/tmp/workdir/inventorize/new/inventorize.Rcheck/inventorize’ - - -``` -### CRAN - -``` -* installing *source* package ‘inventorize’ ... -** package ‘inventorize’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** byte-compile and prepare package for lazy loading -Warning in qgamma(service_level, alpha, beta) : NaNs produced -** help -*** installing help indices -** building package indices -** testing if installed package can be loaded from temporary location -** testing if installed package can be loaded from final location -** testing if installed package keeps a record of temporary installation path -* DONE (inventorize) - - -``` -# IPV - -
- -* Version: 1.0.0 -* GitHub: https://github.com/NilsPetras/IPV -* Source code: https://github.com/cran/IPV -* Date/Publication: 2022-09-30 15:00:02 UTC -* Number of recursive dependencies: 82 - -Run `revdepcheck::cloud_details(, "IPV")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘IPV-Ex.R’ failed - The error most likely occurred in: - - > ### Name: nested_chart - > ### Title: Nested Chart - > ### Aliases: nested_chart - > - > ### ** Examples - > - > # as simple as that - ... - 6. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 7. └─ggplot2:::new_layer_names(object, names(plot$layers)) - 8. └─vctrs::vec_as_names(names, repair = "check_unique") - 9. └─vctrs (local) ``() - 10. └─vctrs:::validate_unique(names = names, arg = arg, call = call) - 11. └─vctrs:::stop_names_cannot_be_empty(names, call = call) - 12. └─vctrs:::stop_names(...) - 13. └─vctrs:::stop_vctrs(...) - 14. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ipv-vignette.Rmd’ - ... - Facet circle radius set to 0.211 based on the data. - cor_spacing set to 0.193 based on the data. - Relative scaling set to 3.78 based on the data. - Axis tick set to 0.1 based on the data. - dist_construct_label set to 0.5 based on the data. - - When sourcing ‘ipv-vignette.R’: - Error: Names can't be empty. - ✖ Empty name found at location 4. - Execution halted - - ‘ipv-vignette.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘ipv-vignette.Rmd’ using rmarkdown - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 8.0Mb - sub-directories of 1Mb or more: - data 7.0Mb - ``` - -# IRon - -
- -* Version: 0.1.4 -* GitHub: https://github.com/nunompmoniz/IRon -* Source code: https://github.com/cran/IRon -* Date/Publication: 2023-01-20 07:20:06 UTC -* Number of recursive dependencies: 81 - -Run `revdepcheck::cloud_details(, "IRon")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘IRon-Ex.R’ failed - The error most likely occurred in: - - > ### Name: sera - > ### Title: Squared Error-Relevance Area (SERA) - > ### Aliases: sera - > - > ### ** Examples - > - > library(IRon) - ... - 16. │ └─self$stat$setup_params(data, self$stat_params) - 17. │ └─ggplot2 (local) setup_params(...) - 18. │ └─base::match.fun(method) - 19. │ └─base::get(as.character(FUN), mode = "function", envir = envir) - 20. └─base::.handleSimpleError(...) - 21. └─rlang (local) h(simpleError(msg, call)) - 22. └─handlers[[1L]](cnd) - 23. └─cli::cli_abort(...) - 24. └─rlang::abort(...) - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 6.7Mb - sub-directories of 1Mb or more: - data 6.5Mb - ``` - -# irt - -
- -* Version: 0.2.9 -* GitHub: https://github.com/egonulates/irt -* Source code: https://github.com/cran/irt -* Date/Publication: 2024-02-20 20:40:02 UTC -* Number of recursive dependencies: 52 - -Run `revdepcheck::cloud_details(, "irt")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘irt-Ex.R’ failed - The error most likely occurred in: - - > ### Name: plot_distractor_icc - > ### Title: Plot Empirical Item or Test characteristic curve - > ### Aliases: plot_distractor_icc - > - > ### ** Examples - > - > n_item <- 10 # sample(8:12, 1) - ... - > raw_resp <- matrix(sample(LETTERS[1:4], n_item * n_theta, replace = TRUE), - + nrow = n_theta, ncol = n_item, - + dimnames = list(paste0("Examinee-", 1:n_theta), - + paste0("Item_", 1:n_item))) - > key <- sample(LETTERS[1:4], n_item, replace = TRUE) - > plot_distractor_icc(raw_resp, 3, key) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: plot_distractor_icc ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 20.3Mb - sub-directories of 1Mb or more: - R 1.5Mb - libs 18.0Mb - ``` - -# isoorbi - -
- -* Version: 1.3.1 -* GitHub: https://github.com/isoverse/isoorbi -* Source code: https://github.com/cran/isoorbi -* Date/Publication: 2024-08-27 05:10:03 UTC -* Number of recursive dependencies: 123 - -Run `revdepcheck::cloud_details(, "isoorbi")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘dual_inlet.Rmd’ - ... - |20230518_05_USGS32_vs_USGS34 | 16| 7|reference |changeover | NA| 10695| 11020| 65.019| 66.994| - |20230518_05_USGS32_vs_USGS34 | 17| 7|reference |data | NA| 11025| 12335| 67.025| 74.985| - - > orbi_plot_raw_data(df_w_blocks, isotopocules = "15N", - + y = ions.incremental) - - When sourcing ‘dual_inlet.R’: - ... - - When sourcing ‘shot_noise.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘dual_inlet.Rmd’ using ‘UTF-8’... failed - ‘flow_injection.Rmd’ using ‘UTF-8’... OK - ‘isoxl_demo.Rmd’ using ‘UTF-8’... OK - ‘quick_start.Rmd’ using ‘UTF-8’... OK - ‘shot_noise.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘dual_inlet.Rmd’ using rmarkdown - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 6.2Mb - sub-directories of 1Mb or more: - doc 2.0Mb - extdata 3.3Mb - ``` - -# ivDiag - -
- -* Version: 1.0.6 -* GitHub: NA -* Source code: https://github.com/cran/ivDiag -* Date/Publication: 2023-09-17 06:00:02 UTC -* Number of recursive dependencies: 90 - -Run `revdepcheck::cloud_details(, "ivDiag")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘ivDiag-Ex.R’ failed - The error most likely occurred in: - - > ### Name: ltz - > ### Title: Local-to-Zero Test - > ### Aliases: ltz - > - > ### ** Examples - > - > data(ivDiag) - > controls <- c('altitudine', 'escursione', 'costal', 'nearsea', 'population', - + 'pop2', 'gini_land', 'gini_income') - > ltz_out <- ltz(data = gsz, Y = "totassoc_p", D = "libero_comune_allnord", - + Z = "bishopcity", controls = controls, weights = "population", - + prior = c(0.178, 0.137)) - > plot_ltz(ltz_out) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot_ltz ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -# ivreg - -
- -* Version: 0.6-3 -* GitHub: https://github.com/zeileis/ivreg -* Source code: https://github.com/cran/ivreg -* Date/Publication: 2024-04-20 15:22:35 UTC -* Number of recursive dependencies: 127 - -Run `revdepcheck::cloud_details(, "ivreg")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘ivreg.Rmd’ - ... - | F | 204.932 | | - +----------------------+-----------+---------+ - | RMSE | 0.37 | 0.40 | - +----------------------+-----------+---------+ - - > modelplot(m_list, coef_omit = "Intercept|experience") - - When sourcing ‘ivreg.R’: - Error: argument is of length zero - Execution halted - - ‘Diagnostics-for-2SLS-Regression.Rmd’ using ‘UTF-8’... OK - ‘ivreg.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘Diagnostics-for-2SLS-Regression.Rmd’ using rmarkdown - ``` - -# jarbes - -
- -* Version: 2.2.1 -* GitHub: NA -* Source code: https://github.com/cran/jarbes -* Date/Publication: 2024-06-07 09:20:02 UTC -* Number of recursive dependencies: 111 - -Run `revdepcheck::cloud_details(, "jarbes")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘hmr.Rmd’ - ... - Warning: Contour data has duplicated x, y coordinates. - ℹ 15940 duplicated rows have been dropped. - Warning: Removed 161 rows containing non-finite outside the scale range - (`stat_contour()`). - Warning: Removed 92 rows containing missing values or values outside the scale range - (`geom_point()`). - - When sourcing ‘hmr.R’: - Error: argument is of length zero - Execution halted - - ‘bmeta.Rmd’ using ‘UTF-8’... OK - ‘hmr.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘bmeta.Rmd’ using rmarkdown - ``` - -# karel - -
- -* Version: 0.1.1 -* GitHub: https://github.com/mpru/karel -* Source code: https://github.com/cran/karel -* Date/Publication: 2022-03-26 21:50:02 UTC -* Number of recursive dependencies: 90 - -Run `revdepcheck::cloud_details(, "karel")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘karel-Ex.R’ failed - The error most likely occurred in: - - > ### Name: acciones - > ### Title: Acciones que Karel puede realizar - > ### Aliases: acciones avanzar girar_izquierda poner_coso juntar_coso - > ### girar_derecha darse_vuelta - > - > ### ** Examples - > - ... - 1. └─karel::ejecutar_acciones() - 2. ├─base::suppressWarnings(...) - 3. │ └─base::withCallingHandlers(...) - 4. ├─gganimate::animate(...) - 5. └─gganimate:::animate.gganim(...) - 6. └─args$renderer(frames_vars$frame_source, args$fps) - 7. └─gganimate:::png_dim(frames[1]) - 8. └─cli::cli_abort("Provided file ({file}) does not exist") - 9. └─rlang::abort(...) - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(karel) - > - > test_check("karel") - [ FAIL 2 | WARN 2 | SKIP 0 | PASS 78 ] - - ══ Failed tests ════════════════════════════════════════════════════════════════ - ... - 5. ├─gganimate::animate(...) - 6. └─gganimate:::animate.gganim(...) - 7. └─args$renderer(frames_vars$frame_source, args$fps) - 8. └─gganimate:::png_dim(frames[1]) - 9. └─cli::cli_abort("Provided file ({file}) does not exist") - 10. └─rlang::abort(...) - - [ FAIL 2 | WARN 2 | SKIP 0 | PASS 78 ] - Error: Test failures - Execution halted - ``` - -## In both - -* checking dependencies in R code ... NOTE - ``` - Namespace in Imports field not imported from: ‘gifski’ - All declared Imports should be used. - ``` - -# kDGLM - -
- -* Version: 1.2.0 -* GitHub: https://github.com/silvaneojunior/kDGLM -* Source code: https://github.com/cran/kDGLM -* Date/Publication: 2024-05-25 09:50:03 UTC -* Number of recursive dependencies: 136 - -Run `revdepcheck::cloud_details(, "kDGLM")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘kDGLM-Ex.R’ failed - The error most likely occurred in: - - > ### Name: forecast.fitted_dlm - > ### Title: Auxiliary function for forecasting - > ### Aliases: forecast.fitted_dlm - > - > ### ** Examples - > - > - ... - > forecast(fitted.data, 24, - + chickenPox = list(Total = rep(175, 24)), # Optional - + Vaccine.1.Covariate = rep(TRUE, 24), - + Vaccine.2.Covariate = rep(TRUE, 24) - + ) - Scale for y is already present. - Adding another scale for y, which will replace the existing scale. - Error in pm[[2]] : subscript out of bounds - Calls: forecast ... lapply -> -> ggplotly.ggplot -> gg2list - Execution halted - ``` - -## In both - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘fitting.Rmd’ - ... - > outcome <- Multinom(p = c("p.1", "p.2"), data = chickenPox[, - + c(2, 3, 5)]) - - > fitted.model <- fit_model(structure * 2, chickenPox = outcome) - - > forecast(fitted.model, t = 24, plot = "base") - - When sourcing ‘fitting.R’: - Error: Error: Missing extra argument: Vaccine.1.Covariate - Execution halted - - ‘example1.Rmd’ using ‘UTF-8’... OK - ‘fitting.Rmd’ using ‘UTF-8’... failed - ‘intro.Rmd’ using ‘UTF-8’... OK - ‘outcomes.Rmd’ using ‘UTF-8’... OK - ‘structures.Rmd’ using ‘UTF-8’... OK - ``` - -# KMEANS.KNN - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/KMEANS.KNN -* Date/Publication: 2024-05-17 09:20:12 UTC -* Number of recursive dependencies: 157 - -Run `revdepcheck::cloud_details(, "KMEANS.KNN")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘KMEANS.KNN-Ex.R’ failed - The error most likely occurred in: - - > ### Name: KMEANS_FUNCTION - > ### Title: KMEANS_FUNCTION - > ### Aliases: KMEANS_FUNCTION - > - > ### ** Examples - > - > data(iris) - ... - 12. │ └─ggplot2:::`+.gg`(...) - 13. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 14. │ ├─ggplot2::ggplot_add(object, p, objectname) - 15. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 16. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 17. └─base::.handleSimpleError(...) - 18. └─purrr (local) h(simpleError(msg, call)) - 19. └─cli::cli_abort(...) - 20. └─rlang::abort(...) - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > # This file is part of the standard setup for testthat. - > # It is recommended that you do not modify it. - > # - > # Where should you do additional test configuration? - > # Learn more about the roles of various files in: - > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview - > # * https://testthat.r-lib.org/articles/special-files.html - ... - 15. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 16. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 17. └─base::.handleSimpleError(...) - 18. └─purrr (local) h(simpleError(msg, call)) - 19. └─cli::cli_abort(...) - 20. └─rlang::abort(...) - - [ FAIL 1 | WARN 0 | SKIP 0 | PASS 11 ] - Error: Test failures - Execution halted - ``` - -# latentcor - -
- -* Version: 2.0.1 -* GitHub: NA -* Source code: https://github.com/cran/latentcor -* Date/Publication: 2022-09-05 20:50:02 UTC -* Number of recursive dependencies: 143 - -Run `revdepcheck::cloud_details(, "latentcor")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘latentcor-Ex.R’ failed - The error most likely occurred in: - - > ### Name: latentcor - > ### Title: Estimate latent correlation for mixed types. - > ### Aliases: latentcor - > - > ### ** Examples - > - > # Example 1 - truncated data type, same type for all variables - ... - > R_approx = latentcor(X = X, types = "tru", method = "approx")$R - > proc.time() - start_time - user system elapsed - 0.027 0.000 0.027 - > # Heatmap for latent correlation matrix. - > Heatmap_R_approx = latentcor(X = X, types = "tru", method = "approx", - + showplot = TRUE)$plotR - Error in pm[[2]] : subscript out of bounds - Calls: latentcor ... %>% -> layout -> ggplotly -> ggplotly.ggplot -> gg2list - Execution halted - ``` - -# lcars - -
- -* Version: 0.3.8 -* GitHub: https://github.com/leonawicz/lcars -* Source code: https://github.com/cran/lcars -* Date/Publication: 2023-09-10 04:10:02 UTC -* Number of recursive dependencies: 88 - -Run `revdepcheck::cloud_details(, "lcars")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘lcars-Ex.R’ failed - The error most likely occurred in: - - > ### Name: lcars_border - > ### Title: LCARS border plot - > ### Aliases: lcars_border - > - > ### ** Examples - > - > lcars_border() - ... - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family '0.5' not found in PostScript font database - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family '0.5' not found in PostScript font database - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family '0.5' not found in PostScript font database - Error in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - invalid font type - Calls: lcars_border ... drawDetails -> drawDetails.text -> grid.Call.graphics - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘lcars.Rmd’ - ... - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family '0.5' not found in PostScript font database - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family '0.5' not found in PostScript font database - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family '0.5' not found in PostScript font database - - When sourcing ‘lcars.R’: - Error: invalid font type - Execution halted - - ‘lcars.Rmd’ using ‘UTF-8’... failed - ``` - -# lemon - -
- -* Version: 0.4.9 -* GitHub: https://github.com/stefanedwards/lemon -* Source code: https://github.com/cran/lemon -* Date/Publication: 2024-02-08 08:00:08 UTC -* Number of recursive dependencies: 76 - -Run `revdepcheck::cloud_details(, "lemon")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘lemon-Ex.R’ failed - The error most likely occurred in: - - > ### Name: annotate_y_axis - > ### Title: Annotations on the axis - > ### Aliases: annotate_y_axis annotate_x_axis - > - > ### ** Examples - > - > library(ggplot2) - > - > p <- ggplot(mtcars, aes(mpg, hp, colour=disp)) + geom_point() - > - > l <- p + annotate_y_axis('mark at', y=200, tick=TRUE) - > l - Error in identicalUnits(x) : object is not a unit - Calls: ... polylineGrob -> is.unit -> unit.c -> identicalUnits - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(lemon) - > - > - > if (TRUE) { - + test_check("lemon") - + } #else { - ... - 17. ├─grid::unit.c(unit(1, "npc"), unit(1, "npc") - tick.length) - 18. └─grid:::Ops.unit(unit(1, "npc"), tick.length) - 19. └─grid:::as.unit(e2) - - [ FAIL 1 | WARN 0 | SKIP 3 | PASS 138 ] - Deleting unused snapshots: - • facet/facet-rep-wrap-spacing.svg - • facet_aux/facet-rep-wrap.svg - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘capped-axes.Rmd’ - ... - > p + coord_capped_cart(bottom = "right") - - > p + coord_capped_cart(bottom = "right", left = "none") - - > ggplot(dat1, aes(gp, y)) + geom_point(position = position_jitter(width = 0.2, - + height = 0)) + coord_capped_cart(left = "none", bottom = bracke .... [TRUNCATED] - - ... - When sourcing ‘legends.R’: - Error: Could not find panel named `panel-1-5`. - Execution halted - - ‘capped-axes.Rmd’ using ‘UTF-8’... failed - ‘facet-rep-labels.Rmd’ using ‘UTF-8’... failed - ‘geoms.Rmd’ using ‘UTF-8’... OK - ‘gtable_show_lemonade.Rmd’ using ‘UTF-8’... OK - ‘legends.Rmd’ using ‘UTF-8’... failed - ‘lemon_print.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘capped-axes.Rmd’ using rmarkdown - ``` - -# lfproQC - -
- -* Version: 0.2.0 -* GitHub: NA -* Source code: https://github.com/cran/lfproQC -* Date/Publication: 2024-09-06 13:00:02 UTC -* Number of recursive dependencies: 143 - -Run `revdepcheck::cloud_details(, "lfproQC")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘lfproQC-Ex.R’ failed - The error most likely occurred in: - - > ### Name: Boxplot_data - > ### Title: Creating Boxplot for a dataset - > ### Aliases: Boxplot_data - > - > ### ** Examples - > - > Boxplot_data(yeast_data) - Using Majority protein IDs as id variables - Warning: Removed 269 rows containing non-finite outside the scale range - (`stat_boxplot()`). - Error in pm[[2]] : subscript out of bounds - Calls: Boxplot_data -> -> ggplotly.ggplot -> gg2list - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘user_guide.Rmd’ - ... - > yeast$`Best combinations` - PCV_best_combination PEV_best_combination PMAD_best_combination - 1 knn_rlr lls_vsn lls_rlr - - > Boxplot_data(yeast$knn_rlr_data) - Using Majority protein IDs as id variables - - When sourcing ‘user_guide.R’: - Error: subscript out of bounds - Execution halted - - ‘user_guide.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘user_guide.Rmd’ using rmarkdown - - Quitting from lines 53-54 [unnamed-chunk-8] (user_guide.Rmd) - Error: processing vignette 'user_guide.Rmd' failed with diagnostics: - subscript out of bounds - --- failed re-building ‘user_guide.Rmd’ - - SUMMARY: processing the following file failed: - ‘user_guide.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 6.1Mb - sub-directories of 1Mb or more: - doc 5.8Mb - ``` - -# lgpr - -
- -* Version: 1.2.4 -* GitHub: https://github.com/jtimonen/lgpr -* Source code: https://github.com/cran/lgpr -* Date/Publication: 2023-09-24 06:50:02 UTC -* Number of recursive dependencies: 101 - -Run `revdepcheck::cloud_details(, "lgpr")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > # Short tests - > # - focus on testing that everything runs - > # - should take less than minute - > library(testthat) - > library(lgpr) - Attached lgpr 1.2.4, using rstan 2.32.6. Type ?lgpr to get started. - > - ... - 3. └─bayesplot::mcmc_areas(sf, regex_pars = regex_pars, ...) - 4. └─ggplot2:::`+.gg`(...) - 5. └─ggplot2:::add_ggplot(e1, e2, e2name) - 6. ├─ggplot2::ggplot_add(object, p, objectname) - 7. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 8. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 3 | WARN 1 | SKIP 0 | PASS 434 ] - Error: Test failures - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 156.9Mb - sub-directories of 1Mb or more: - R 1.5Mb - libs 155.0Mb - ``` - -* checking for GNU extensions in Makefiles ... NOTE - ``` - GNU make is a SystemRequirements. - ``` - -# LightLogR - -
- -* Version: 0.3.8 -* GitHub: https://github.com/tscnlab/LightLogR -* Source code: https://github.com/cran/LightLogR -* Date/Publication: 2024-07-04 17:00:02 UTC -* Number of recursive dependencies: 157 - -Run `revdepcheck::cloud_details(, "LightLogR")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘LightLogR-Ex.R’ failed - The error most likely occurred in: - - > ### Name: aggregate_Date - > ### Title: Aggregate dates to a single day - > ### Aliases: aggregate_Date - > - > ### ** Examples - > - > library(ggplot2) - > #gg_days without aggregation - > sample.data.environment %>% - + gg_days() - Error in if (new_name %in% existing) { : argument is of length zero - Calls: %>% ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -# LMoFit - -
- -* Version: 0.1.7 -* GitHub: NA -* Source code: https://github.com/cran/LMoFit -* Date/Publication: 2024-05-14 07:33:23 UTC -* Number of recursive dependencies: 62 - -Run `revdepcheck::cloud_details(, "LMoFit")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘LMoFit.Rmd’ - ... - - > lspace_BrIII - - When sourcing ‘LMoFit.R’: - Error: Problem while setting up geom aesthetics. - ℹ Error occurred in the 1st layer. - Caused by error in `compute_geom_2()`: - ! unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), NULL, NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, - c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 1, NULL, NULL, NULL, c(0, 2.2, 0, 0), NULL, TRUE), NULL, - Execution halted - - ‘LMoFit.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘LMoFit.Rmd’ using rmarkdown - - Quitting from lines 236-237 [unnamed-chunk-15] (LMoFit.Rmd) - Error: processing vignette 'LMoFit.Rmd' failed with diagnostics: - Problem while setting up geom aesthetics. - ℹ Error occurred in the 1st layer. - Caused by error in `compute_geom_2()`: - ! unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), NULL, NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, - ... - NULL, NULL, 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 0, NULL, NULL, NULL, NULL, NULL, TRUE), NULL, "right", NULL, NULL, NULL, "center", NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, c(0, 0, 0, 0), list(), 11, list("white", NA, NULL, NULL, TRUE), list(), 5.5, NULL, NULL, list("grey92", NULL, NULL, NULL, FALSE, TRUE), list(), list(), NULL, NULL, NULL, NULL, FALSE, list(NULL, "white", NULL, NULL, TRUE), list(NULL, NULL, NULL, 1.2, 0, 1, NULL, NULL, c(0, - 0, 5.5, 0), NULL, TRUE), "panel", list(NULL, NULL, NULL, NULL, 0, 1, NULL, NULL, c(0, 0, 5.5, 0), NULL, TRUE), list(NULL, NULL, NULL, 0.8, 1, 1, NULL, NULL, c(5.5, 0, 0, 0), NULL, TRUE), "panel", list(NULL, NULL, NULL, 1.2, 0.5, 0.5, NULL, NULL, NULL, NULL, TRUE), "topleft", NULL, c(5.5, 5.5, 5.5, 5.5), list("white", "black", 2, NULL, TRUE), NULL, NULL, "inherit", "inside", list(NULL, NULL, "grey10", 0.8, NULL, NULL, NULL, NULL, c(4.4, 4.4, 4.4, 4.4), NULL, TRUE), NULL, NULL, NULL, list(NULL, NULL, - NULL, NULL, NULL, NULL, -90, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, 90, NULL, NULL, NULL, TRUE), NULL, 2.75, 2.75, list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5))) - --- failed re-building ‘LMoFit.Rmd’ - - SUMMARY: processing the following file failed: - ‘LMoFit.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 7.0Mb - sub-directories of 1Mb or more: - data 6.5Mb - ``` - -# lnmixsurv - -
- -* Version: 3.1.6 -* GitHub: NA -* Source code: https://github.com/cran/lnmixsurv -* Date/Publication: 2024-09-03 15:20:08 UTC -* Number of recursive dependencies: 196 - -Run `revdepcheck::cloud_details(, "lnmixsurv")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > # This file is part of the standard setup for testthat. - > # It is recommended that you do not modify it. - > # - > # Where should you do additional test configuration? - > # Learn more about the roles of various files in: - > # * https://r-pkgs.org/tests.html - > # * https://testthat.r-lib.org/reference/test_package.html#special-files - ... - - Error in `pm[[2]]`: subscript out of bounds - Backtrace: - ▆ - 1. └─testthat::expect_snapshot(plot(mod1)) at test-survival_ln_mixture_em-methods.R:25:3 - 2. └─rlang::cnd_signal(state$error) - - [ FAIL 1 | WARN 0 | SKIP 7 | PASS 50 ] - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘expectation_maximization.Rmd’ - ... - + x, data = data, iter = 200, starting_seed = 20, number_em_search = 0) - - > gg <- plot_fit_on_data(model_em, data)$ggplot - - > plot(model_em) - Loading required namespace: plotly - - When sourcing ‘expectation_maximization.R’: - Error: subscript out of bounds - Execution halted - - ‘compare.Rmd’ using ‘UTF-8’... OK - ‘expectation_maximization.Rmd’ using ‘UTF-8’... failed - ‘intercept_only.Rmd’ using ‘UTF-8’... OK - ‘lnmixsurv.Rmd’ using ‘UTF-8’... OK - ‘parallel_computation.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘compare.Rmd’ using rmarkdown - - warning: solve(): system is singular; attempting approx solution - - warning: solve(): system is singular; attempting approx solution - - warning: solve(): system is singular; attempting approx solution - - warning: solve(): system is singular; attempting approx solution - ... - - warning: solve(): system is singular; attempting approx solution - - warning: solve(): system is singular; attempting approx solution - - warning: solve(): system is singular; attempting approx solution - - warning: solve(): system is singular; attempting approx solution - - warning: solve(): system is singular; attempting approx solution - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 10.0Mb - sub-directories of 1Mb or more: - doc 4.0Mb - libs 5.7Mb - ``` - -* checking dependencies in R code ... NOTE - ``` - Namespaces in Imports field not imported from: - ‘purrr’ ‘readr’ - All declared Imports should be used. - ``` - -* checking Rd cross-references ... NOTE - ``` - Package unavailable to check Rd xrefs: ‘rstanarm’ - ``` - -* checking for GNU extensions in Makefiles ... NOTE - ``` - GNU make is a SystemRequirements. - ``` - -# LocalControl - -
- -* Version: 1.1.4 -* GitHub: https://github.com/OHDSI/LocalControl -* Source code: https://github.com/cran/LocalControl -* Date/Publication: 2024-09-04 22:30:18 UTC -* Number of recursive dependencies: 41 - -Run `revdepcheck::cloud_details(, "LocalControl")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘LocalControl-jss-2020.Rnw’ - ... - Warning: A numeric `legend.position` argument in `theme()` was deprecated in - ggplot2 3.5.0. - ℹ Please use the `legend.position.inside` argument of `theme()` - instead. - - > grid.arrange(plotz$rad_1, plotz$rad_11, ncol = 1) - - When sourcing 'LocalControl-jss-2020.R': - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘LocalControl-jss-2020.Rnw’ using ‘UTF-8’... failed - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 5.2Mb - sub-directories of 1Mb or more: - doc 2.0Mb - libs 2.7Mb - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘LocalControl-jss-2020.Rnw’ using Sweave - Loading required package: data.table - Loading required package: colorspace - Loading required package: RColorBrewer - Loading required package: gridExtra - Loading required package: ggplot2 - Loading required package: rpart - Loading required package: rpart.plot - Loading required package: LocalControl - ... - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - - --- failed re-building 'LocalControl-jss-2020.Rnw' - - SUMMARY: processing the following file failed: - 'LocalControl-jss-2020.Rnw' - - Error: Vignette re-building failed. - Execution halted - ``` - -# LocalCop - -
- -* Version: 0.0.1 -* GitHub: https://github.com/mlysy/LocalCop -* Source code: https://github.com/cran/LocalCop -* Date/Publication: 2024-03-21 14:50:06 UTC -* Number of recursive dependencies: 92 - -Run `revdepcheck::cloud_details(, "LocalCop")` for more info - -
- -## Newly broken - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘LocalCop-vignette.Rmd’ using rmarkdown - ``` - -## In both - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘LocalCop-vignette.Rmd’ - ... - > tibble(x = x0, True = BiCopEta2Tau(family, eta = eta_fun(x0)), - + Fitted = BiCopEta2Tau(fitseq$eta, family = family)) %>% pivot_longer(True:Fitt .... [TRUNCATED] - Warning: Removed 51 rows containing missing values or values outside the scale range - (`geom_line()`). - Warning: Removed 51 rows containing missing values or values outside the scale range - (`geom_point()`). - - When sourcing ‘LocalCop-vignette.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘LocalCop-vignette.Rmd’ using ‘UTF-8’... failed - ``` - -* checking installed package size ... NOTE - ``` - installed size is 55.7Mb - sub-directories of 1Mb or more: - libs 55.3Mb - ``` - -# LongDat - -
- -* Version: 1.1.2 -* GitHub: https://github.com/CCY-dev/LongDat -* Source code: https://github.com/cran/LongDat -* Date/Publication: 2023-07-17 05:40:02 UTC -* Number of recursive dependencies: 135 - -Run `revdepcheck::cloud_details(, "LongDat")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘LongDat_cont_tutorial.Rmd’ - ... - - > test_plot <- cuneiform_plot(result_table = test_cont[[1]], - + title_size = 15) - [1] "Finished plotting successfully!" - - > test_plot - - ... - [1] "Finished plotting successfully!" - - > test_plot - - When sourcing ‘LongDat_disc_tutorial.R’: - Error: object is not coercible to a unit - Execution halted - - ‘LongDat_cont_tutorial.Rmd’ using ‘UTF-8’... failed - ‘LongDat_disc_tutorial.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘LongDat_cont_tutorial.Rmd’ using rmarkdown - Warning in eng_r(options) : - Failed to tidy R code in chunk 'unnamed-chunk-3'. Reason: - Error : The formatR package is required by the chunk option tidy = TRUE but not installed; tidy = TRUE will be ignored. - - Warning in eng_r(options) : - Failed to tidy R code in chunk 'unnamed-chunk-4'. Reason: - Error : The formatR package is required by the chunk option tidy = TRUE but not installed; tidy = TRUE will be ignored. - - ... - Quitting from lines 181-182 [unnamed-chunk-11] (LongDat_disc_tutorial.Rmd) - Error: processing vignette 'LongDat_disc_tutorial.Rmd' failed with diagnostics: - object is not coercible to a unit - --- failed re-building ‘LongDat_disc_tutorial.Rmd’ - - SUMMARY: processing the following files failed: - ‘LongDat_cont_tutorial.Rmd’ ‘LongDat_disc_tutorial.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -# longreadvqs - -
- -* Version: 0.1.3 -* GitHub: https://github.com/NakarinP/longreadvqs -* Source code: https://github.com/cran/longreadvqs -* Date/Publication: 2024-08-26 19:30:05 UTC -* Number of recursive dependencies: 131 - -Run `revdepcheck::cloud_details(, "longreadvqs")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘longreadvqs-Ex.R’ failed - The error most likely occurred in: - - > ### Name: vqscompare - > ### Title: Comparing viral quasispecies profile and operational taxonomic - > ### unit (OTU) classified by k-means clustering between samples - > ### Aliases: vqscompare - > - > ### ** Examples - > - ... - 13. │ └─ggplot2:::`+.gg`(...) - 14. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 15. │ ├─ggplot2::ggplot_add(object, p, objectname) - 16. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 17. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 18. └─base::.handleSimpleError(...) - 19. └─purrr (local) h(simpleError(msg, call)) - 20. └─cli::cli_abort(...) - 21. └─rlang::abort(...) - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘longreadvqs-vignette.Rmd’ - ... - - > comp <- vqscompare(samplelist = list(s1, s2, s3, s4_fix), - + lab_name = "Sample", kmeans.n = 10) - - When sourcing ‘longreadvqs-vignette.R’: - Error: ℹ In index: 1. - ℹ With name: Dim.2. - Caused by error in `if (new_name %in% existing) ...`: - ! argument is of length zero - Execution halted - - ‘longreadvqs-vignette.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘longreadvqs-vignette.Rmd’ using rmarkdown - ``` - -# lpdensity - -
- -* Version: 2.4 -* GitHub: NA -* Source code: https://github.com/cran/lpdensity -* Date/Publication: 2023-01-21 23:50:02 UTC -* Number of recursive dependencies: 28 - -Run `revdepcheck::cloud_details(, "lpdensity")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘lpdensity-Ex.R’ failed - The error most likely occurred in: - - > ### Name: lpdensity - > ### Title: Local Polynomial Density Estimation and Inference - > ### Aliases: lpdensity - > - > ### ** Examples - > - > # Generate a random sample - ... - 18 1.2878 0.6298 457 0.1749 0.0097 0.1222 , 0.2179 - 19 1.5768 0.6298 299 0.1221 0.0086 0.0863 , 0.1719 - ============================================================================= - > - > # Plot the estimates and confidence intervals - > plot(est1, legendTitle="My Plot", legendGroups=c("X")) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -# lspartition - -
- -* Version: 0.4 -* GitHub: NA -* Source code: https://github.com/cran/lspartition -* Date/Publication: 2019-08-08 22:40:06 UTC -* Number of recursive dependencies: 34 - -Run `revdepcheck::cloud_details(, "lspartition")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘lspartition-Ex.R’ failed - The error most likely occurred in: - - > ### Name: lsprobust.plot - > ### Title: Graphic Presentation of Results for 'lspartition' Package - > ### Aliases: lsprobust.plot - > - > ### ** Examples - > - > x <- runif(500) - > y <- sin(4*x)+rnorm(500) - > est <- lsprobust(y, x) - > lsprobust.plot(est) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -## In both - -* checking LazyData ... NOTE - ``` - 'LazyData' is specified without a 'data' directory - ``` - -# LSTbook - -
- -* Version: 0.5.0 -* GitHub: https://github.com/dtkaplan/LSTbook -* Source code: https://github.com/cran/LSTbook -* Date/Publication: 2024-02-23 19:20:15 UTC -* Number of recursive dependencies: 88 - -Run `revdepcheck::cloud_details(, "LSTbook")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > # This file is part of the standard setup for testthat. - > # It is recommended that you do not modify it. - > # - > # Where should you do additional test configuration? - > # Learn more about the roles of various files in: - > # * https://r-pkgs.org/tests.html - > # * https://testthat.r-lib.org/reference/test_package.html#special-files - ... - - [ FAIL 1 | WARN 1 | SKIP 4 | PASS 73 ] - Deleting unused snapshots: - • model_plot/four-facets.png - • pointplot/1-var-plot.png - • pointplot/bird-logistic-plot.png - • pointplot/color-and-facet-na.png - • pointplot/logistic-fun-plot.png - Error: Test failures - Execution halted - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘DAGs.Rmd’ using rmarkdown - ``` - -## In both - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘DAGs.Rmd’ - ... - 3 -1.35 -11.9 - 4 0.429 0.171 - 5 0.622 5.85 - 6 2.35 16.5 - - > Wrong_way <- datasim_make(x = rnorm(n, mean = 0, sd = 2)) - - ... - - > model_plot(height_model) - - When sourcing ‘modeling.R’: - Error: argument is of length zero - Execution halted - - ‘DAGs.Rmd’ using ‘UTF-8’... failed - ‘LSTbook.Rmd’ using ‘UTF-8’... OK - ‘modeling.Rmd’ using ‘UTF-8’... failed - ``` - -* checking loading without being on the library search path ... WARNING - ``` - Error: package or namespace load failed for ‘LSTbook’: - .onLoad failed in loadNamespace() for 'LSTbook', details: - call: loadNamespace(name) - error: there is no package called ‘mosaicData’ - Execution halted - - It looks like this package has a loading problem when not on .libPaths: - see the messages for details. - ``` - -* checking data for non-ASCII characters ... NOTE - ``` - Note: found 20 marked UTF-8 strings - ``` - -# manydata - -
- -* Version: 0.9.3 -* GitHub: https://github.com/globalgov/manydata -* Source code: https://github.com/cran/manydata -* Date/Publication: 2024-05-06 19:00:02 UTC -* Number of recursive dependencies: 130 - -Run `revdepcheck::cloud_details(, "manydata")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(manydata) - manydata 0.9.3 - Please see manydata.ch for more information. - Type 'citation("manydata")' for citing this R package in publications. - > - > test_check("manydata") - ... - ── Failure ('test_compare.R:8:3'): plot for compare_categories returns the correct output format ── - Names of `db` ('data', 'layers', 'scales', 'guides', 'mapping', 'theme', 'coordinates', 'facet', 'plot_env', 'layout', 'labels') don't match 'data', 'layers', 'scales', 'guides', 'mapping', 'theme', 'coordinates', 'facet', 'plot_env', 'layout' - ── Failure ('test_compare.R:74:3'): compare_missing() and plot_missing() returns the correct output format ── - `pl` has length 11, not length 10. - ── Failure ('test_compare.R:76:3'): compare_missing() and plot_missing() returns the correct output format ── - Names of `pl` ('data', 'layers', 'scales', 'guides', 'mapping', 'theme', 'coordinates', 'facet', 'plot_env', 'layout', 'labels') don't match 'data', 'layers', 'scales', 'guides', 'mapping', 'theme', 'coordinates', 'facet', 'plot_env', 'layout' - - [ FAIL 4 | WARN 0 | SKIP 3 | PASS 121 ] - Error: Test failures - Execution halted - ``` - -## In both - -* checking data for non-ASCII characters ... NOTE - ``` - Note: found 3 marked UTF-8 strings - ``` - -# manymome - -
- -* Version: 0.2.2 -* GitHub: https://github.com/sfcheung/manymome -* Source code: https://github.com/cran/manymome -* Date/Publication: 2024-06-05 23:30:03 UTC -* Number of recursive dependencies: 158 - -Run `revdepcheck::cloud_details(, "manymome")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘manymome-Ex.R’ failed - The error most likely occurred in: - - > ### Name: plot_effect_vs_w - > ### Title: Plot an Effect Against a Moderator - > ### Aliases: plot_effect_vs_w - > - > ### ** Examples - > - > - ... - + y = "y", - + m = "m", - + fit = fit_lm, - + sd_from_mean = seq(-2, 2, length.out = 10), - + boot_ci = TRUE, - + boot_out = boot_out_lm) - > p <- plot_effect_vs_w(out_lm) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plot_effect_vs_w ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -# mapbayr - -
- -* Version: 0.10.0 -* GitHub: https://github.com/FelicienLL/mapbayr -* Source code: https://github.com/cran/mapbayr -* Date/Publication: 2023-07-17 08:20:02 UTC -* Number of recursive dependencies: 68 - -Run `revdepcheck::cloud_details(, "mapbayr")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘mapbayr-Ex.R’ failed - The error most likely occurred in: - - > ### Name: mapbayr_plot - > ### Title: Make mapbayr plot - > ### Aliases: mapbayr_plot - > - > ### ** Examples - > - > aug <- data.frame( - ... - > obs <- data.frame( - + ID = 1, time = c(6, 20), evid = 0, - + mdv = c(0,1), DV = c(0.5, 5), cmt = 2 - + ) - > - > mapbayr_plot(aug, obs) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -# MBNMAdose - -
- -* Version: 0.4.3 -* GitHub: NA -* Source code: https://github.com/cran/MBNMAdose -* Date/Publication: 2024-04-18 12:42:47 UTC -* Number of recursive dependencies: 118 - -Run `revdepcheck::cloud_details(, "MBNMAdose")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘outputs-4.Rmd’ - ... - - > plot(trip.emax) - - When sourcing ‘outputs-4.R’: - Error: Problem while setting up geom aesthetics. - ℹ Error occurred in the 1st layer. - Caused by error in `use_defaults()`: - ... - Execution halted - - ‘consistencychecking-3.Rmd’ using ‘UTF-8’... OK - ‘dataexploration-1.Rmd’ using ‘UTF-8’... OK - ‘mbnmadose-overview.Rmd’ using ‘UTF-8’... OK - ‘metaregression-6.Rmd’ using ‘UTF-8’... OK - ‘nma_in_mbnmadose.Rmd’ using ‘UTF-8’... OK - ‘outputs-4.Rmd’ using ‘UTF-8’... failed - ‘predictions-5.Rmd’ using ‘UTF-8’... OK - ‘runmbnmadose-2.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘consistencychecking-3.Rmd’ using rmarkdown - ``` - -## In both - -* checking data for non-ASCII characters ... NOTE - ``` - Note: found 6 marked Latin-1 strings - ``` - -# MBNMAtime - -
- -* Version: 0.2.4 -* GitHub: NA -* Source code: https://github.com/cran/MBNMAtime -* Date/Publication: 2023-10-14 15:20:02 UTC -* Number of recursive dependencies: 106 - -Run `revdepcheck::cloud_details(, "MBNMAtime")` for more info - -
- -## Newly broken - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘consistencychecking-3.Rmd’ using rmarkdown - - Quitting from lines 141-146 [unnamed-chunk-8] (consistencychecking-3.Rmd) - Error: processing vignette 'consistencychecking-3.Rmd' failed with diagnostics: - unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, - NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 1, NULL, - NULL, NULL, c(0, 2.2, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 0, NULL, NULL, NULL, c(0, 0, 0, 2.2), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 0.5, NULL, NULL, NULL, c(0, 2.2, 0, 2.2), NULL, TRUE), list("grey20", NULL, NULL, NULL, FALSE, "grey20", TRUE), NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, 0.5, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, 0.75, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, list(), NULL, NULL, NULL, NULL, - NULL, NULL, NULL, NULL, list("transparent", NA, NULL, NULL, FALSE), NULL, 2, NULL, NULL, list("transparent", NA, NULL, NULL, FALSE), 1.2, NULL, NULL, NULL, NULL, NULL, NULL, NULL, 0.2, NULL, list(NULL, NULL, NULL, 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 0, NULL, NULL, NULL, NULL, NULL, TRUE), NULL, "right", NULL, NULL, NULL, "center", NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, 0, list(), 2, list(), list(NULL, "grey20", NULL, NULL, TRUE), NULL, NULL, - NULL, list("grey92", NULL, NULL, NULL, FALSE, "grey92", TRUE), list("grey95", NULL, NULL, NULL, FALSE, "grey95", FALSE), list("grey95", 0.5, NULL, NULL, FALSE, "grey95", FALSE), NULL, NULL, NULL, NULL, FALSE, list("white", NA, NULL, NULL, FALSE), list(NULL, NULL, NULL, 1.2, 0, 1, NULL, NULL, c(0, 0, 5.5, 0), NULL, TRUE), "panel", list(NULL, NULL, NULL, NULL, 0, 1, NULL, NULL, c(0, 0, 5.5, 0), NULL, TRUE), list(NULL, NULL, NULL, 0.8, 1, 1, NULL, NULL, c(5.5, 0, 0, 0), NULL, TRUE), "panel", list( - NULL, NULL, NULL, 1.2, 0.5, 0.5, NULL, NULL, NULL, NULL, TRUE), "topleft", NULL, NULL, list("lightsteelblue1", "black", NULL, NULL, FALSE), NULL, NULL, "on", "inside", list(NULL, NULL, "black", 0.8, NULL, NULL, NULL, NULL, c(4.4, 4.4, 4.4, 4.4), NULL, FALSE), NULL, NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, NULL, -90, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, 90, NULL, NULL, NULL, TRUE), NULL, 2.75, 2.75)) - --- failed re-building ‘consistencychecking-3.Rmd’ - - --- re-building ‘dataexploration-1.Rmd’ using rmarkdown - ``` - -## In both - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘consistencychecking-3.Rmd’ - ... - |-> direct | | 0.228| -0.213| 0.684| - |-> indirect | | -0.515| -0.891| -0.137| - | | | | | | - - > plot(nodesplit, plot.type = "forest") - - When sourcing ‘consistencychecking-3.R’: - ... - ! unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, - NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, - Execution halted - - ‘consistencychecking-3.Rmd’ using ‘UTF-8’... failed - ‘dataexploration-1.Rmd’ using ‘UTF-8’... failed - ‘mbnmatime-overview.Rmd’ using ‘UTF-8’... OK - ‘outputs-4.Rmd’ using ‘UTF-8’... failed - ‘predictions-5.Rmd’ using ‘UTF-8’... OK - ‘runmbnmatime-2.Rmd’ using ‘UTF-8’... OK - ``` - -# mecoturn - -
- -* Version: 0.3.0 -* GitHub: https://github.com/ChiLiubio/mecoturn -* Source code: https://github.com/cran/mecoturn -* Date/Publication: 2023-09-10 13:40:02 UTC -* Number of recursive dependencies: 109 - -Run `revdepcheck::cloud_details(, "mecoturn")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘mecoturn-Ex.R’ failed - The error most likely occurred in: - - > ### Name: betaturn - > ### Title: Analyze the 'turnover' of microbial communities. - > ### Aliases: betaturn - > - > ### ** Examples - > - > - ... - 13. │ └─ggplot2:::`+.gg`(...) - 14. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 15. │ ├─ggplot2::ggplot_add(object, p, objectname) - 16. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 17. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 18. └─base::.handleSimpleError(...) - 19. └─purrr (local) h(simpleError(msg, call)) - 20. └─cli::cli_abort(...) - 21. └─rlang::abort(...) - Execution halted - ``` - -# MetaNet - -
- -* Version: 0.1.2 -* GitHub: https://github.com/Asa12138/MetaNet -* Source code: https://github.com/cran/MetaNet -* Date/Publication: 2024-03-25 20:40:07 UTC -* Number of recursive dependencies: 151 - -Run `revdepcheck::cloud_details(, "MetaNet")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘MetaNet-Ex.R’ failed - The error most likely occurred in: - - > ### Name: as.ggig - > ### Title: Transfer an igraph object to a ggig - > ### Aliases: as.ggig - > - > ### ** Examples - > - > as.ggig(co_net, coors = c_net_layout(co_net)) -> ggig - > plot(ggig) - Warning: Removed 446 rows containing missing values or values outside the scale range - (`geom_text()`). - Error in grid.Call.graphics(C_segments, x$x0, x$y0, x$x1, x$y1, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.segments -> grid.Call.graphics - Execution halted - ``` - -# metR - -
- -* Version: 0.15.0 -* GitHub: https://github.com/eliocamp/metR -* Source code: https://github.com/cran/metR -* Date/Publication: 2024-02-09 00:40:02 UTC -* Number of recursive dependencies: 121 - -Run `revdepcheck::cloud_details(, "metR")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘metR-Ex.R’ failed - The error most likely occurred in: - - > ### Name: geom_contour_tanaka - > ### Title: Illuminated contours - > ### Aliases: geom_contour_tanaka GeomContourTanaka - > ### Keywords: datasets - > - > ### ** Examples - > - ... - 19. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) - 20. │ └─self$draw_panel(...) - 21. │ └─metR (local) draw_panel(...) - 22. │ └─metR:::stopf(...) - 23. │ └─base::stop(e) - 24. └─rlang (local) ``(``) - 25. └─handlers[[1L]](cnd) - 26. └─cli::cli_abort(...) - 27. └─rlang::abort(...) - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(metR) - > # library(vdiffr) - > - > on_cran <- !isTRUE(as.logical(Sys.getenv("NOT_CRAN", "false"))) - > if (on_cran) data.table::setDTthreads(2) - > - ... - • vis-streamline/streamline-ywrapped.svg - • vis-text-contour/labels-text.svg - • vis-text-contour/minsize.svg - • vis-text-contour/placement-fraction.svg - • vis-text-contour/placement-minmax-horizontal.svg - • vis-text-contour/placement-minmax-vertical.svg - • vis-text-contour/placement-n.svg - • vis-text-contour/text-contour-norotate.svg - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘Visualization-tools.Rmd’ - ... - - > ggplot(temperature[lev == 300], aes(lon, lat, z = air.z)) + - + geom_contour_fill() + geom_contour_tanaka() + scale_fill_divergent() - - When sourcing ‘Visualization-tools.R’: - Error: Problem while converting geom to grob. - ℹ Error occurred in the 2nd layer. - Caused by error: - ! geom_path: If you are using dotted or dashed lines, colour, size and linetype must be constant over the line. - Execution halted - - ‘Visualization-tools.Rmd’ using ‘UTF-8’... failed - ‘Working-with-data.Rmd’ using ‘UTF-8’... OK - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘Visualization-tools.Rmd’ using knitr - - Quitting from lines 241-245 [unnamed-chunk-16] (Visualization-tools.Rmd) - Error: processing vignette 'Visualization-tools.Rmd' failed with diagnostics: - Problem while converting geom to grob. - ℹ Error occurred in the 2nd layer. - Caused by error: - ! geom_path: If you are using dotted or dashed lines, colour, size and linetype must be constant over the line. - ... - --- failed re-building ‘Visualization-tools.Rmd’ - - --- re-building ‘Working-with-data.Rmd’ using knitr - --- finished re-building ‘Working-with-data.Rmd’ - - SUMMARY: processing the following file failed: - ‘Visualization-tools.Rmd’ - - Error: Vignette re-building failed. - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE - ``` - installed size is 6.6Mb - sub-directories of 1Mb or more: - R 1.5Mb - data 2.0Mb - doc 1.8Mb - ``` - -# metrica - -
- -* Version: 2.1.0 -* GitHub: https://github.com/adriancorrendo/metrica -* Source code: https://github.com/cran/metrica -* Date/Publication: 2024-06-30 14:20:02 UTC -* Number of recursive dependencies: 92 - -Run `revdepcheck::cloud_details(, "metrica")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘regression_case.Rmd’ - ... - + mutate(Year = seq(2001, 2020, by = 1)) - - > wheat_time %>% ggplot2::ggplot(aes(x = Year)) + geom_point(aes(y = pred, - + fill = "Predicted", shape = "Predicted")) + geom_point(aes(y = obs, .... [TRUNCATED] - Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. - ℹ Please use `linewidth` instead. - - ... - Execution halted - - ‘Cheatsheet.Rmd’ using ‘UTF-8’... OK - ‘JOSS_publication.Rmd’ using ‘UTF-8’... OK - ‘Shinyapp.Rmd’ using ‘UTF-8’... OK - ‘apsim_open.Rmd’ using ‘UTF-8’... OK - ‘available_metrics_classification.Rmd’ using ‘UTF-8’... OK - ‘available_metrics_regression.Rmd’ using ‘UTF-8’... OK - ‘classification_case.Rmd’ using ‘UTF-8’... OK - ‘regression_case.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘Cheatsheet.Rmd’ using rmarkdown - --- finished re-building ‘Cheatsheet.Rmd’ - - --- re-building ‘JOSS_publication.Rmd’ using rmarkdown - --- finished re-building ‘JOSS_publication.Rmd’ - - --- re-building ‘Shinyapp.Rmd’ using rmarkdown - --- finished re-building ‘Shinyapp.Rmd’ - - ... - --- re-building ‘apsim_open.Rmd’ using rmarkdown - --- finished re-building ‘apsim_open.Rmd’ - - --- re-building ‘available_metrics_classification.Rmd’ using rmarkdown - --- finished re-building ‘available_metrics_classification.Rmd’ - - --- re-building ‘available_metrics_regression.Rmd’ using rmarkdown - --- finished re-building ‘available_metrics_regression.Rmd’ - - --- re-building ‘classification_case.Rmd’ using rmarkdown - ``` - -# miceRanger - -
- -* Version: 1.5.0 -* GitHub: https://github.com/FarrellDay/miceRanger -* Source code: https://github.com/cran/miceRanger -* Date/Publication: 2021-09-06 15:20:02 UTC -* Number of recursive dependencies: 131 - -Run `revdepcheck::cloud_details(, "miceRanger")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘usingMiceRanger.Rmd’ - ... - > plotList <- lapply(plotVars, function(x) { - + missIndx <- is.na(ampIris[, get(x)]) - + impVsAmp <- data.table(originalData = iris[missIndx, x], .... [TRUNCATED] - - When sourcing ‘usingMiceRanger.R’: - Error: ℹ In index: 1. - ℹ With name: imputedData. - Caused by error in `if (new_name %in% existing) ...`: - ! argument is of length zero - Execution halted - - ‘diagnosticPlotting.Rmd’ using ‘UTF-8’... OK - ‘miceAlgorithm.Rmd’ using ‘UTF-8’... OK - ‘usingMiceRanger.Rmd’ using ‘UTF-8’... failed - ``` - -# microbial - -
- -* Version: 0.0.21 -* GitHub: NA -* Source code: https://github.com/cran/microbial -* Date/Publication: 2024-05-15 18:20:02 UTC -* Number of recursive dependencies: 179 - -Run `revdepcheck::cloud_details(, "microbial")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘microbial-Ex.R’ failed - The error most likely occurred in: - - > ### Name: plotalpha - > ### Title: plot alpha diversity - > ### Aliases: plotalpha - > - > ### ** Examples - > - > { - ... - 12. │ └─ggplot2:::`+.gg`(...) - 13. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 14. │ ├─ggplot2::ggplot_add(object, p, objectname) - 15. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 16. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 17. └─base::.handleSimpleError(...) - 18. └─purrr (local) h(simpleError(msg, call)) - 19. └─cli::cli_abort(...) - 20. └─rlang::abort(...) - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘microbial.Rmd’ - ... - > plotbar(phy, level = "Phylum") - - > plotalpha(physeq, group = "group") - - When sourcing ‘microbial.R’: - Error: ℹ In index: 1. - ℹ With name: val. - Caused by error in `if (new_name %in% existing) ...`: - ! argument is of length zero - Execution halted - - ‘microbial.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘microbial.Rmd’ using knitr - ``` - -# MicrobiomeSurv - -
- -* Version: 0.1.0 -* GitHub: https://github.com/N-T-Huyen/MicrobiomeSurv -* Source code: https://github.com/cran/MicrobiomeSurv -* Date/Publication: 2023-10-12 06:20:02 UTC -* Number of recursive dependencies: 158 - -Run `revdepcheck::cloud_details(, "MicrobiomeSurv")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘MicrobiomeSurv-Ex.R’ failed - The error most likely occurred in: - - > ### Name: EstimateHR - > ### Title: Classification, Survival Estimation and Visualization - > ### Aliases: EstimateHR - > - > ### ** Examples - > - > # Prepare data - ... - + Mean = TRUE) - > - > # Using the function - > est_HR_fam_shan_w3 = EstimateHR(Risk.Scores = lasso_fam_shan_w3$Risk.Scores, - + Data.Survival = lasso_fam_shan_w3$Data.Survival, - + Prognostic = prog_fam_shan_w3, Plots = TRUE, - + Mean = TRUE) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: EstimateHR ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -# migraph - -
- -* Version: 1.4.2 -* GitHub: https://github.com/stocnet/migraph -* Source code: https://github.com/cran/migraph -* Date/Publication: 2024-09-04 12:00:02 UTC -* Number of recursive dependencies: 99 - -Run `revdepcheck::cloud_details(, "migraph")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(manynet) - > library(migraph) - > - > test_check("migraph") - Starting 2 test processes - [ FAIL 2 | WARN 2 | SKIP 0 | PASS 46 ] - ... - `expected` is a character vector ('Statistic') - ── Failure ('test-model_tests.R:73:3'): qap plot works ───────────────────────── - qapplot$labels$x (`actual`) not identical to "Statistic" (`expected`). - - `actual` is NULL - `expected` is a character vector ('Statistic') - - [ FAIL 2 | WARN 2 | SKIP 0 | PASS 46 ] - Error: Test failures - Execution halted - ``` - -# mikropml - -
- -* Version: 1.6.1 -* GitHub: https://github.com/SchlossLab/mikropml -* Source code: https://github.com/cran/mikropml -* Date/Publication: 2023-08-21 15:10:05 UTC -* Number of recursive dependencies: 130 - -Run `revdepcheck::cloud_details(, "mikropml")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(mikropml) - > test_check("mikropml") - Fraction of data in the training set: 0.778 - Groups in the training set: A C D - Groups in the testing set: B - Fraction of data in the training set: 0.778 - ... - `names(expected)` is absent - ── Failure ('test-plot.R:140:3'): plot_mean_prc uses geom ribbon, line, and hline ── - ... %>% unlist() (`actual`) not equal to c(...) (`expected`). - - `names(actual)` is a character vector ('geom_ribbon1', 'geom_ribbon2', 'geom_ribbon3', 'geom_ribbon4', 'geom_line1', ...) - `names(expected)` is absent - - [ FAIL 2 | WARN 19 | SKIP 12 | PASS 314 ] - Error: Test failures - Execution halted - ``` - -# MiMIR - -
- -* Version: 1.5 -* GitHub: NA -* Source code: https://github.com/cran/MiMIR -* Date/Publication: 2024-02-01 08:50:02 UTC -* Number of recursive dependencies: 191 - -Run `revdepcheck::cloud_details(, "MiMIR")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘MiMIR-Ex.R’ failed - The error most likely occurred in: - - > ### Name: LOBOV_accuracies - > ### Title: LOBOV_accuracies - > ### Aliases: LOBOV_accuracies - > - > ### ** Examples - > - > require(pROC) - ... - 56 metabolites x 500 samples - | Pruning samples on5SD: - 56 metabolites x 500 samples - | Performing scaling ... DONE! - | Imputation ... DONE! - > p_avail<-colnames(b_p)[c(1:5)] - > LOBOV_accuracies(sur$surrogates, b_p, p_avail, MiMIR::acc_LOBOV) - Error in pm[[2]] : subscript out of bounds - Calls: LOBOV_accuracies -> -> ggplotly.ggplot -> gg2list - Execution halted - ``` - -# miRetrieve - -
- -* Version: 1.3.4 -* GitHub: NA -* Source code: https://github.com/cran/miRetrieve -* Date/Publication: 2021-09-18 17:30:02 UTC -* Number of recursive dependencies: 126 - -Run `revdepcheck::cloud_details(, "miRetrieve")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(miRetrieve) - > - > test_check("miRetrieve") - [ FAIL 1 | WARN 11 | SKIP 0 | PASS 202 ] - - ══ Failed tests ════════════════════════════════════════════════════════════════ - ... - Backtrace: - ▆ - 1. └─miRetrieve::compare_mir_terms_scatter(df_merged, "miR-21", title = "Test_title") at test-comparemirterms.R:56:1 - 2. ├─plotly::ggplotly(plot) - 3. └─plotly:::ggplotly.ggplot(plot) - 4. └─plotly::gg2list(...) - - [ FAIL 1 | WARN 11 | SKIP 0 | PASS 202 ] - Error: Test failures - Execution halted - ``` - -# MiscMetabar - -
- -* Version: 0.9.3 -* GitHub: https://github.com/adrientaudiere/MiscMetabar -* Source code: https://github.com/cran/MiscMetabar -* Date/Publication: 2024-09-09 09:20:01 UTC -* Number of recursive dependencies: 420 - -Run `revdepcheck::cloud_details(, "MiscMetabar")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘MiscMetabar-Ex.R’ failed - The error most likely occurred in: - - > ### Name: ggscatt_pq - > ### Title: Scatterplot with marginal distributions and statistical results - > ### against Hill diversity of phyloseq object - > ### Aliases: ggscatt_pq - > - > ### ** Examples - > - ... - + ) - + } - Loading required namespace: ggstatsplot - Taxa are now in columns. - Cleaning suppress 0 taxa and 0 samples. - Taxa are now in rows. - Joining with `by = join_by(Sample)` - Error in if (new_name %in% existing) { : argument is of length zero - Calls: ggscatt_pq ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(MiscMetabar) - Loading required package: phyloseq - Loading required package: ggplot2 - Loading required package: dada2 - Loading required package: Rcpp - Loading required package: dplyr - ... - 14. └─ggplot2:::add_ggplot(e1, e2, e2name) - 15. ├─ggplot2::ggplot_add(object, p, objectname) - 16. └─ggplot2:::ggplot_add.list(object, p, objectname) - 17. ├─ggplot2::ggplot_add(o, plot, object_name) - 18. └─ggplot2:::ggplot_add.Layer(o, plot, object_name) - 19. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 2 | WARN 0 | SKIP 76 | PASS 82 ] - Error: Test failures - Execution halted - ``` - -# misspi - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/misspi -* Date/Publication: 2023-10-17 09:50:02 UTC -* Number of recursive dependencies: 88 - -Run `revdepcheck::cloud_details(, "misspi")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘misspi-Ex.R’ failed - The error most likely occurred in: - - > ### Name: evaliq - > ### Title: Evaluate the Imputation Quality - > ### Aliases: evaliq - > - > ### ** Examples - > - > # A very quick example - ... - > # Default plot - > er.eval <- evaliq(x.true[na.idx], x.est[na.idx]) - `geom_smooth()` using formula = 'y ~ x' - > - > # Interactive plot - > er.eval <- evaliq(x.true[na.idx], x.est[na.idx], interactive = TRUE) - `geom_smooth()` using formula = 'y ~ x' - Error in pm[[2]] : subscript out of bounds - Calls: evaliq -> print -> ggplotly -> ggplotly.ggplot -> gg2list - Execution halted - ``` - -# mixpoissonreg - -
- -* Version: 1.0.0 -* GitHub: https://github.com/vpnsctl/mixpoissonreg -* Source code: https://github.com/cran/mixpoissonreg -* Date/Publication: 2021-03-10 19:50:06 UTC -* Number of recursive dependencies: 139 - -Run `revdepcheck::cloud_details(, "mixpoissonreg")` for more info - -
- -## Newly broken - -* checking examples ... ERROR - ``` - Running examples in ‘mixpoissonreg-Ex.R’ failed - The error most likely occurred in: - - > ### Name: autoplot.mixpoissonreg - > ### Title: Autoplot Method for 'mixpoissonreg' Objects - > ### Aliases: autoplot.mixpoissonreg autoplot - > - > ### ** Examples - > - > daysabs_prog <- mixpoissonregML(daysabs ~ prog, data = Attendance) - > autoplot(daysabs_prog) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: autoplot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(mixpoissonreg) - > - > test_check("mixpoissonreg") - - Negative Binomial Regression - Expectation-Maximization Algorithm - - ... - 2. └─mixpoissonreg:::autoplot.mixpoissonreg(fit_ml1, nrow = 2) - 3. └─ggplot2:::`+.gg`(...) - 4. └─ggplot2:::add_ggplot(e1, e2, e2name) - 5. ├─ggplot2::ggplot_add(object, p, objectname) - 6. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 7. └─ggplot2:::new_layer_names(object, names(plot$layers)) - - [ FAIL 1 | WARN 28 | SKIP 0 | PASS 35 ] - Error: Test failures - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘influence-mixpoissonreg.Rmd’ - ... - 5 2.747544 -0.2460342 -0.006644830 -0.4252217 -1.269154 - 6 2.746786 -0.2443429 -0.006641383 -0.4268347 -1.269387 - - > plot(fit, which = c(3, 4, 5)) - - > autoplot(fit, which = c(3, 4, 5)) - - ... - - When sourcing ‘tutorial-mixpoissonreg.R’: - Error: argument is of length zero - Execution halted - - ‘influence-mixpoissonreg.Rmd’ using ‘UTF-8’... failed - ‘intervals-mixpoissonreg.Rmd’ using ‘UTF-8’... OK - ‘ml-mixpoissonreg.Rmd’ using ‘UTF-8’... failed - ‘tidyverse-mixpoissonreg.Rmd’ using ‘UTF-8’... failed - ‘tutorial-mixpoissonreg.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘influence-mixpoissonreg.Rmd’ using rmarkdown - ``` - -# mizer +``` +# ggThemeAssist
-* Version: 2.5.1 -* GitHub: https://github.com/sizespectrum/mizer -* Source code: https://github.com/cran/mizer -* Date/Publication: 2024-03-08 23:10:02 UTC -* Number of recursive dependencies: 110 +* Version: 0.1.5 +* GitHub: https://github.com/calligross/ggthemeassist +* Source code: https://github.com/cran/ggThemeAssist +* Date/Publication: 2016-08-13 16:50:55 +* Number of recursive dependencies: 57 -Run `revdepcheck::cloud_details(, "mizer")` for more info +Run `revdepcheck::cloud_details(, "ggThemeAssist")` for more info
## Newly broken -* checking tests ... ERROR +* checking whether package ‘ggThemeAssist’ can be installed ... ERROR ``` - Running ‘spelling.R’ - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(mizer) - > - > test_check("mizer") - [ FAIL 10 | WARN 0 | SKIP 5 | PASS 1251 ] - - ... - • plots/plot-spectra.svg - • plots/plot-yield-by-gear.svg - • plots/plot-yield.svg - • plots/plotfishing-mortality.svg - • plots/plotfmort-truncated.svg - • plots/plotpredation-mortality.svg - • plots/plotpredmort-truncated.new.svg - • plots/plotpredmort-truncated.svg - Error: Test failures - Execution halted + Installation failed. + See ‘/tmp/workdir/ggThemeAssist/new/ggThemeAssist.Rcheck/00install.out’ for details. ``` -## In both +## Newly fixed -* checking installed package size ... NOTE +* checking LazyData ... NOTE ``` - installed size is 6.1Mb - sub-directories of 1Mb or more: - doc 1.5Mb - help 1.8Mb + 'LazyData' is specified without a 'data' directory ``` -# mlr3spatiotempcv +## Installation + +### Devel + +``` +* installing *source* package ‘ggThemeAssist’ ... +** package ‘ggThemeAssist’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in is.element("extrafont", installed.packages()[, 1]) : + unused argument (installed.packages()[, 1]) +Error: unable to load R code in package ‘ggThemeAssist’ +Execution halted +ERROR: lazy loading failed for package ‘ggThemeAssist’ +* removing ‘/tmp/workdir/ggThemeAssist/new/ggThemeAssist.Rcheck/ggThemeAssist’ + + +``` +### CRAN + +``` +* installing *source* package ‘ggThemeAssist’ ... +** package ‘ggThemeAssist’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +** help +*** installing help indices +** building package indices +** testing if installed package can be loaded from temporary location +** testing if installed package can be loaded from final location +** testing if installed package keeps a record of temporary installation path +* DONE (ggThemeAssist) + + +``` +# ggupset
-* Version: 2.3.1 -* GitHub: https://github.com/mlr-org/mlr3spatiotempcv -* Source code: https://github.com/cran/mlr3spatiotempcv -* Date/Publication: 2024-04-17 12:10:05 UTC -* Number of recursive dependencies: 167 +* Version: 0.4.0 +* GitHub: https://github.com/const-ae/ggupset +* Source code: https://github.com/cran/ggupset +* Date/Publication: 2024-06-24 10:10:04 UTC +* Number of recursive dependencies: 45 -Run `revdepcheck::cloud_details(, "mlr3spatiotempcv")` for more info +Run `revdepcheck::cloud_details(, "ggupset")` for more info
@@ -16989,67 +10196,100 @@ Run `revdepcheck::cloud_details(, "mlr3spatiotempcv")` for more info * checking examples ... ERROR ``` - Running examples in ‘mlr3spatiotempcv-Ex.R’ failed + Running examples in ‘ggupset-Ex.R’ failed The error most likely occurred in: - > ### Name: autoplot.ResamplingCustomCV - > ### Title: Visualization Functions for Non-Spatial CV Methods. - > ### Aliases: autoplot.ResamplingCustomCV plot.ResamplingCustomCV + > ### Name: axis_combmatrix + > ### Title: Convert delimited text labels into a combination matrix axis + > ### Aliases: axis_combmatrix > > ### ** Examples > - > if (mlr3misc::require_namespaces(c("sf", "patchwork"), quietly = TRUE)) { + > library(ggplot2) ... - + - + autoplot(resampling, task) + - + ggplot2::scale_x_continuous(breaks = seq(-79.085, -79.055, 0.01)) - + autoplot(resampling, task, fold_id = 1) - + autoplot(resampling, task, fold_id = c(1, 2)) * - + ggplot2::scale_x_continuous(breaks = seq(-79.085, -79.055, 0.01)) - + } - Error in identicalUnits(x) : object is not a unit - Calls: ... assemble_guides -> guides_build -> unit.c -> identicalUnits + Datsun 710 Cyl: 4_Gears: 4 + Hornet 4 Drive Cyl: 6_Gears: 3 + Hornet Sportabout Cyl: 8_Gears: 3 + Valiant Cyl: 6_Gears: 3 + > ggplot(mtcars, aes(x=combined)) + + + geom_bar() + + + axis_combmatrix(sep = "_") + Error in as.unit(e2) : object is not coercible to a unit + Calls: ... polylineGrob -> is.unit -> unit.c -> Ops.unit -> as.unit Execution halted ``` -## In both +# ggVennDiagram + +
+ +* Version: 1.5.2 +* GitHub: https://github.com/gaospecial/ggVennDiagram +* Source code: https://github.com/cran/ggVennDiagram +* Date/Publication: 2024-02-20 08:10:02 UTC +* Number of recursive dependencies: 97 + +Run `revdepcheck::cloud_details(, "ggVennDiagram")` for more info + +
+ +## Newly broken * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘spatiotemp-viz.Rmd’ + when running code in ‘fully-customed.Rmd’ ... + [1] "b" "c" "e" "h" "k" "q" "s" "y" - > knitr::opts_chunk$set(collapse = TRUE, comment = "#>") - > knitr::include_graphics("../man/figures/sptcv_cstf_multiplot.png") + > ggVennDiagram(y, show_intersect = TRUE, set_color = "black") + Warning in geom_text(aes(label = .data$count, text = .data$item), data = region_label) : + Ignoring unknown aesthetics: text + + ... + Ignoring unknown aesthetics: text - When sourcing ‘spatiotemp-viz.R’: - Error: Cannot find the file(s): "../man/figures/sptcv_cstf_multiplot.png" + When sourcing ‘using-ggVennDiagram.R’: + Error: subscript out of bounds Execution halted - ‘mlr3spatiotempcv.Rmd’ using ‘UTF-8’... OK - ‘spatiotemp-viz.Rmd’ using ‘UTF-8’... failed + ‘VennCalculator.Rmd’ using ‘UTF-8’... OK + ‘fully-customed.Rmd’ using ‘UTF-8’... failed + ‘using-ggVennDiagram.Rmd’ using ‘UTF-8’... failed + ‘using-new-shapes.Rmd’ using ‘UTF-8’... OK + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘VennCalculator.Rmd’ using rmarkdown + --- finished re-building ‘VennCalculator.Rmd’ + + --- re-building ‘fully-customed.Rmd’ using rmarkdown ``` +## In both + * checking installed package size ... NOTE ``` - installed size is 5.9Mb + installed size is 11.1Mb sub-directories of 1Mb or more: - data 3.5Mb + doc 9.5Mb + help 1.1Mb ``` -# mlr3viz +# Greymodels
-* Version: 0.9.0 -* GitHub: https://github.com/mlr-org/mlr3viz -* Source code: https://github.com/cran/mlr3viz -* Date/Publication: 2024-07-01 12:30:02 UTC -* Number of recursive dependencies: 142 +* Version: 2.0.1 +* GitHub: https://github.com/havishaJ/Greymodels +* Source code: https://github.com/cran/Greymodels +* Date/Publication: 2022-12-05 12:42:35 UTC +* Number of recursive dependencies: 89 -Run `revdepcheck::cloud_details(, "mlr3viz")` for more info +Run `revdepcheck::cloud_details(, "Greymodels")` for more info
@@ -17057,156 +10297,168 @@ Run `revdepcheck::cloud_details(, "mlr3viz")` for more info * checking examples ... ERROR ``` - Running examples in ‘mlr3viz-Ex.R’ failed + Running examples in ‘Greymodels-Ex.R’ failed The error most likely occurred in: - > ### Name: autoplot.OptimInstanceBatchSingleCrit - > ### Title: Plots for Optimization Instances - > ### Aliases: autoplot.OptimInstanceBatchSingleCrit + > ### Name: Plots + > ### Title: plots + > ### Aliases: plots plotrm plotsmv1 plotsmv2 plotsigndgm plots_mdbgm12 > > ### ** Examples > - > if (requireNamespace("mlr3") && requireNamespace("bbotk") && requireNamespace("patchwork")) { + > # Plots - EPGM (1, 1) model ... - INFO [09:22:56.650] [bbotk] 5.884797 2.2371095 -32.51896 - INFO [09:22:56.650] [bbotk] -7.841127 -0.8872557 -91.31148 - INFO [09:22:56.668] [bbotk] Finished optimizing after 20 evaluation(s) - INFO [09:22:56.669] [bbotk] Result: - INFO [09:22:56.670] [bbotk] x1 x2 x_domain y - INFO [09:22:56.670] [bbotk] - INFO [09:22:56.670] [bbotk] 2.582281 -2.940254 9.657379 - Error in identicalUnits(x) : object is not a unit - Calls: print ... assemble_guides -> guides_build -> unit.c -> identicalUnits + + geom_point(data = set4, aes(x = CI, y = y), shape = 23, color = "black") + + + geom_line(data = xy1, aes(x = x, y = y,color = "Raw Data")) + + + geom_line(data = xy2, aes(x = x, y = y,color = "Fitted&Forecasts")) + + + geom_line(data = set3, aes(x = CI, y = y,color = "LowerBound"), linetype=2) + + + geom_line(data = set4, aes(x = CI, y = y,color = "UpperBound"), linetype=2) + + + scale_color_manual(name = "Label",values = colors) + > r <- ggplotly(p) + Error in pm[[2]] : subscript out of bounds + Calls: ggplotly -> ggplotly.ggplot -> gg2list Execution halted ``` -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > if (requireNamespace("testthat", quietly = TRUE)) { - + library("testthat") - + library("mlr3viz") - + test_check("mlr3viz") - + } - Starting 2 test processes - [ FAIL 4 | WARN 1 | SKIP 24 | PASS 84 ] - ... - • TuningInstanceSingleCrit/tisc-surface-grid-50.svg - • TuningInstanceSingleCrit/tisc-surface-regr-lm.svg - • TuningInstanceSingleCrit/tisc-surface.svg - • plot_learner_prediction/learner-prediction-1d-se.svg - • plot_learner_prediction/learner-prediction-binary-prob.svg - • plot_learner_prediction/learner-prediction-binary-response.svg - • plot_learner_prediction/learner-prediction-categorical.svg - • plot_learner_prediction/learner-prediction-prob.svg - Error: Test failures - Execution halted - ``` - -# modeltime.resample +# GWASinspector
-* Version: 0.2.3 -* GitHub: https://github.com/business-science/modeltime.resample -* Source code: https://github.com/cran/modeltime.resample -* Date/Publication: 2023-04-12 15:50:02 UTC -* Number of recursive dependencies: 227 +* Version: 1.7.1 +* GitHub: NA +* Source code: https://github.com/cran/GWASinspector +* Date/Publication: 2024-05-06 18:20:10 UTC +* Number of recursive dependencies: 77 -Run `revdepcheck::cloud_details(, "modeltime.resample")` for more info +Run `revdepcheck::cloud_details(, "GWASinspector")` for more info
## Newly broken -* checking tests ... ERROR +* checking whether package ‘GWASinspector’ can be installed ... WARNING ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > - > # Machine Learning - > library(tidymodels) - ── Attaching packages ────────────────────────────────────── tidymodels 1.2.0 ── - ✔ broom 1.0.6 ✔ recipes 1.1.0 - ✔ dials 1.3.0 ✔ rsample 1.2.1 - ... - ▆ - 1. ├─m750_models_resample %>% ... at test-modeltime_fit_resamples.R:116:5 - 2. └─modeltime.resample::plot_modeltime_resamples(., .interactive = TRUE) - 3. ├─plotly::ggplotly(g) - 4. └─plotly:::ggplotly.ggplot(g) - 5. └─plotly::gg2list(...) - - [ FAIL 1 | WARN 4 | SKIP 0 | PASS 16 ] - Error: Test failures - Execution halted + Found the following significant warnings: + Note: possible error in 'is.element("hID", names(input.data))': unused argument (names(input.data)) + Note: possible error in 'is.element(toupper(config$supplementaryFiles$allele_ref_std_population), ': unused argument (c("COMMON", "EAS", "AMR", "AFR", "EUR", "SAS")) + Note: possible error in 'is.element("EFFECT", ': unused argument (original.File.Columns.upper) + Note: possible error in 'is.element("EFFECT", ': unused argument (renamed.File.Columns) + Note: possible error in 'is.element("ggplot2", ': unused argument (existing.packages) + Note: possible error in 'is.element("kableExtra", ': unused argument (existing.packages) + Note: possible error in 'is.element("rJava", existing.packages)': unused argument (existing.packages) + Note: possible error in 'is.element("RSQLite", ': unused argument (existing.packages) + Note: possible error in 'is.element("openxlsx", ': unused argument (existing.packages) + ... + Note: possible error in 'is.element("highDiffEAF", ': unused argument (names(dataset)) + Note: possible error in 'is.element("AF", names(dataset))': unused argument (names(dataset)) + Note: possible error in 'is.element("REF_RSID", ': unused argument (names(dataset)) + Note: possible error in 'is.element("EFFECT", ': unused argument (crucial.columns) + Note: possible error in 'is.element(EFFECT_ALL, ': unused argument (c("A", "G", "C", "T")) + Note: possible error in 'is.element(OTHER_ALL, ': unused argument (c("A", "G", "C", "T")) + See ‘/tmp/workdir/GWASinspector/new/GWASinspector.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + add_hIDcolumn: possible error in is.element("hID", names(input.data)): + unused argument (names(input.data)) + checkConfigFile: possible error in + is.element(toupper(config$supplementaryFiles$allele_ref_std_population), + c("COMMON", "EAS", "AMR", "AFR", "EUR", "SAS")): unused argument + (c("COMMON", "EAS", "AMR", "AFR", "EUR", "SAS")) + checkRequiredColumnNames: possible error in is.element("EFFECT", + original.File.Columns.upper): unused argument + (original.File.Columns.upper) + checkRequiredColumnNames: possible error in is.element("EFFECT", + ... + RSQLite::dbListFields(.QC$reference.data, "variants")): unused + argument (RSQLite::dbListFields(.QC$reference.data, "variants")) + validate_Inspector: possible error in is.element(population.Column, + tblFields): unused argument (tblFields) + variable_statistics_post_matching: possible error in is.element("CHR", + names(input.data)): unused argument (names(input.data)) + variantDiscrimination: possible error in is.element(EFFECT_ALL, c("A", + "G", "C", "T")): unused argument (c("A", "G", "C", "T")) + variantDiscrimination: possible error in is.element(OTHER_ALL, c("A", + "G", "C", "T")): unused argument (c("A", "G", "C", "T")) ``` ## In both -* checking dependencies in R code ... NOTE +* checking running R code from vignettes ... ERROR ``` - Namespaces in Imports field not imported from: - ‘crayon’ ‘dials’ ‘glue’ ‘parsnip’ - All declared Imports should be used. + Errors in running code in vignettes: + when running code in ‘GWASinspector.Rmd’ + ... + > knitr::opts_chunk$set(eval = FALSE, results = "hide", + + collapse = TRUE, comment = "#>", results = "asis") + + > install.packages("GWASinspector") + Installing package into ‘/tmp/RtmpR7P8mN/RLIBS_9831403b73’ + (as ‘lib’ is unspecified) + + When sourcing ‘GWASinspector.R’: + Error: trying to use CRAN without setting a mirror + Execution halted + + ‘GWASinspector.Rmd’ using ‘UTF-8’... failed ``` -# moreparty +# GWlasso
-* Version: 0.4 -* GitHub: NA -* Source code: https://github.com/cran/moreparty -* Date/Publication: 2023-11-22 14:30:02 UTC -* Number of recursive dependencies: 165 +* Version: 1.0.1 +* GitHub: https://github.com/nibortolum/GWlasso +* Source code: https://github.com/cran/GWlasso +* Date/Publication: 2024-11-22 09:30:07 UTC +* Number of recursive dependencies: 102 -Run `revdepcheck::cloud_details(, "moreparty")` for more info +Run `revdepcheck::cloud_details(, "GWlasso")` for more info
## Newly broken -* checking running R code from vignettes ... ERROR +* checking examples ... ERROR ``` - Errors in running code in vignettes: - when running code in ‘Titanic_example.Rmd’ - ... - 24 Age 57 0.3187270 - 25 Embarked Cherbourg 0.4603041 - [ reached 'max' / getOption("max.print") -- omitted 2 rows ] - - > ggForestEffects(pdep, vline = mean(pred_foret), xlab = "Probability of survival") + - + xlim(c(0, 1)) + Running examples in ‘GWlasso-Ex.R’ failed + The error most likely occurred in: - When sourcing ‘Titanic_example.R’: - Error: `x` must be a vector, not a object. + > ### Name: plot.gwlfit + > ### Title: Plot method for gwlfit object + > ### Aliases: plot.gwlfit + > + > ### ** Examples + > + > + ... + Warning in min(x) : no non-missing arguments to min; returning Inf + Warning in max(x) : no non-missing arguments to max; returning -Inf + Warning in min(d[d > tolerance]) : + no non-missing arguments to min; returning Inf + Warning in min(x) : no non-missing arguments to min; returning Inf + Warning in max(x) : no non-missing arguments to max; returning -Inf + Error in is.element(panel_type, c("x", "y")) : + unused argument (c("x", "y")) + Calls: ... -> draw_panel -> -> render_fg Execution halted - - ‘Titanic_example.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘Titanic_example.Rmd’ using rmarkdown ``` -# mosaicCalc +# harbinger
-* Version: 0.6.4 -* GitHub: https://github.com/ProjectMOSAIC/mosaicCalc -* Source code: https://github.com/cran/mosaicCalc -* Date/Publication: 2024-07-26 15:50:02 UTC -* Number of recursive dependencies: 128 +* Version: 1.1.707 +* GitHub: https://github.com/cefet-rj-dal/harbinger +* Source code: https://github.com/cran/harbinger +* Date/Publication: 2024-12-03 20:00:03 UTC +* Number of recursive dependencies: 175 -Run `revdepcheck::cloud_details(, "mosaicCalc")` for more info +Run `revdepcheck::cloud_details(, "harbinger")` for more info
@@ -17214,78 +10466,58 @@ Run `revdepcheck::cloud_details(, "mosaicCalc")` for more info * checking examples ... ERROR ``` - Running examples in ‘mosaicCalc-Ex.R’ failed + Running examples in ‘harbinger-Ex.R’ failed The error most likely occurred in: - > ### Name: box_set - > ### Title: Evenly spaced samples across a one- or two-dim domain - > ### Aliases: box_set + > ### Name: hanr_arima + > ### Title: Anomaly detector using ARIMA. + > ### Aliases: hanr_arima > > ### ** Examples > - > box_set(x*y ~ x & y, domain(x=0:1, y=0:1), n = 4) - ... - [1] 0 - > # a polygon - > poly <- tibble(x = c(1:9, 8:1), y = c(1, 2*(5:3), 2, -1, 17, 9, 8, 2:9)) - > boxes <- box_set(1 ~ x & y, poly, dx = 1) - > gf_polygon(y ~ x, data = poly, color="blue", fill="blue", alpha=0.2) %>% - + gf_rect((y - dy/3) + (y + dy/3) ~ (x - dx/3) + (x + dx/3), - + data = boxes) - Error in if (new_name %in% existing) { : argument is of length zero - Calls: %>% ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘Calculus_with_R.Rmd’ - ... - - > soln <- integrateODE(SIR, bounds(t = 0:20)) - Solution containing functions S(t), I(t). - - > traj_plot(S(t) ~ I(t), soln, color = "blue") %>% vectorfield_plot(SIR, - + bounds(I = 0:75, S = 60:400), transform = I, npts = 20, alpha = 0.6) - + > library(daltoolbox) ... - - > gf_point(flipper_length_mm ~ body_mass_g, data = palmerpenguins::penguins) - - When sourcing ‘quick-reference.R’: - Error: argument is of length zero + > + > # setting up time series regression model + > model <- hanr_arima() + > + > # fitting the model + > model <- fit(model, dataset$serie) + Error in is.element("drift", names(obj$model$coef)) : + unused argument (names(obj$model$coef)) + Calls: fit -> fit.hanr_arima Execution halted - - ‘Calculus_with_R.Rmd’ using ‘UTF-8’... failed - ‘Instructors.Rmd’ using ‘UTF-8’... failed - ‘quick-reference.Rmd’ using ‘UTF-8’... failed ``` -* checking re-building of vignette outputs ... NOTE +* checking whether package ‘harbinger’ can be installed ... WARNING ``` - Error(s) in re-building vignettes: - --- re-building ‘Calculus_with_R.Rmd’ using rmarkdown + Found the following significant warnings: + Note: possible error in 'is.element("drift", names(obj$model$coef))': unused argument (names(obj$model$coef)) + See ‘/tmp/workdir/harbinger/new/harbinger.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. ``` -## In both - -* checking data for non-ASCII characters ... NOTE +* checking R code for possible problems ... NOTE ``` - Note: found 56 marked UTF-8 strings + fit.hanr_arima: possible error in is.element("drift", + names(obj$model$coef)): unused argument (names(obj$model$coef)) + fit.hcp_cf_arima: possible error in is.element("drift", + names(obj$model$coef)): unused argument (names(obj$model$coef)) ``` -# mosaicData +# HCmodelSets
-* Version: 0.20.4 -* GitHub: https://github.com/ProjectMOSAIC/mosaicData -* Source code: https://github.com/cran/mosaicData -* Date/Publication: 2023-11-05 05:50:02 UTC -* Number of recursive dependencies: 56 +* Version: 1.1.3 +* GitHub: https://github.com/hhhelfer/HCmodelSets +* Source code: https://github.com/cran/HCmodelSets +* Date/Publication: 2023-03-15 18:00:09 UTC +* Number of recursive dependencies: 36 -Run `revdepcheck::cloud_details(, "mosaicData")` for more info +Run `revdepcheck::cloud_details(, "HCmodelSets")` for more info
@@ -17293,47 +10525,53 @@ Run `revdepcheck::cloud_details(, "mosaicData")` for more info * checking examples ... ERROR ``` - Running examples in ‘mosaicData-Ex.R’ failed + Running examples in ‘HCmodelSets-Ex.R’ failed The error most likely occurred in: - > ### Name: Birthdays - > ### Title: US Births in 1969 - 1988 - > ### Aliases: Birthdays + > ### Name: DGP + > ### Title: Data generating process used by Battey, H. S. & Cox, D. R. + > ### (2018). + > ### Aliases: DGP > > ### ** Examples > - > data(Birthdays) - ... - IQR, binom.test, cor, cor.test, cov, fivenum, median, prop.test, - quantile, sd, t.test, var - - The following objects are masked from ‘package:base’: - - max, mean, min, prod, range, sample, sum - - Error in if (new_name %in% existing) { : argument is of length zero - Calls: gf_point ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > ## Generates DGP + > ## Don't show: + > dgp = DGP(s=5, a=3, sigStrength=1, rho=0.9, n=20, intercept=5, noise=1, + + var=1, d=50, DGP.seed = 2019) + Error in is.element(type.response, c("S", "N")) : + unused argument (c("S", "N")) + Calls: DGP Execution halted ``` -## In both +* checking whether package ‘HCmodelSets’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(type.response, ': unused argument (c("S", "N")) + See ‘/tmp/workdir/HCmodelSets/new/HCmodelSets.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` -* checking data for non-ASCII characters ... NOTE +* checking R code for possible problems ... NOTE ``` - Note: found 7 marked UTF-8 strings + DGP: possible error in is.element(type.response, c("S", "N")): unused + argument (c("S", "N")) ``` -# mosaicModel +# healthyR
-* Version: 0.3.0 -* GitHub: NA -* Source code: https://github.com/cran/mosaicModel -* Date/Publication: 2017-09-22 16:21:41 UTC -* Number of recursive dependencies: 157 +* Version: 0.2.2 +* GitHub: https://github.com/spsanderson/healthyR +* Source code: https://github.com/cran/healthyR +* Date/Publication: 2024-07-01 13:20:02 UTC +* Number of recursive dependencies: 146 -Run `revdepcheck::cloud_details(, "mosaicModel")` for more info +Run `revdepcheck::cloud_details(, "healthyR")` for more info
@@ -17342,233 +10580,253 @@ Run `revdepcheck::cloud_details(, "mosaicModel")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘Basics.Rmd’ + when running code in ‘getting-started.Rmd’ ... - + out.width = "45%") - - > mtcars <- mtcars %>% mutate(transmission = ifelse(am, - + "manual", "automatic")) + + .by = "month", .interactive = FALSE) + Warning: Ignoring unknown labels: + • `colour = "Legend"` - > gf_point(mpg ~ hp, color = ~transmission, data = mtcars) + > ts_alos_plt(.data = df_tbl, .date_col = Date, .value_col = Values, + + .by = "month", .interactive = TRUE) - When sourcing ‘Basics.R’: - Error: argument is of length zero + When sourcing ‘getting-started.R’: + Error: subscript out of bounds Execution halted - ‘Basics.Rmd’ using ‘UTF-8’... failed + ‘getting-started.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - ... - --- re-building ‘Basics.Rmd’ using rmarkdown - - Quitting from lines 66-68 [fuel_intro] (Basics.Rmd) - Error: processing vignette 'Basics.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘Basics.Rmd’ - - SUMMARY: processing the following file failed: - ‘Basics.Rmd’ - - Error: Vignette re-building failed. - Execution halted + --- re-building ‘getting-started.Rmd’ using rmarkdown ``` ## In both -* checking dependencies in R code ... NOTE +* checking installed package size ... NOTE ``` - Namespaces in Imports field not imported from: - ‘MASS’ ‘caret’ ‘ggformula’ ‘knitr’ ‘testthat’ ‘tidyverse’ - All declared Imports should be used. + installed size is 6.6Mb + sub-directories of 1Mb or more: + data 2.5Mb + doc 3.7Mb ``` -# mppR +# healthyR.ts
-* Version: 1.5.0 -* GitHub: https://github.com/vincentgarin/mppR -* Source code: https://github.com/cran/mppR -* Date/Publication: 2024-02-22 17:20:02 UTC -* Number of recursive dependencies: 69 +* Version: 0.3.1 +* GitHub: https://github.com/spsanderson/healthyR.ts +* Source code: https://github.com/cran/healthyR.ts +* Date/Publication: 2024-10-11 23:00:03 UTC +* Number of recursive dependencies: 209 -Run `revdepcheck::cloud_details(, "mppR")` for more info +Run `revdepcheck::cloud_details(, "healthyR.ts")` for more info
## Newly broken +* checking examples ... ERROR + ``` + Running examples in ‘healthyR.ts-Ex.R’ failed + The error most likely occurred in: + + > ### Name: tidy_fft + > ### Title: Tidy Style FFT + > ### Aliases: tidy_fft + > + > ### ** Examples + > + > suppressPackageStartupMessages(library(dplyr)) + ... + > a <- tidy_fft( + + .data = data_tbl, + + .value_col = value, + + .date_col = date_col, + + .harmonics = 3, + + .frequency = 12 + + ) + Error in pm[[2]] : subscript out of bounds + Calls: tidy_fft -> -> ggplotly.ggplot -> gg2list + Execution halted + ``` + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘MPP_ME_QTL_detect.Rmd’ + when running code in ‘using-tidy-fft.Rmd’ ... - F2 -2.9970560 0.18508863 -0.00806081 0.1266095 - F283 10.2417600 1.78749082 -0.04223259 2.0862106 - DK105 0.1792433 0.03829626 NA NA + $ value 112, 118, 132, 129, 121, 135, 148, 148, 136, 119, 104, 118, 1… - > plot_QxEC(Qeff, EC = EC, env_id = c("CIAM", "TUM", - + "INRA", "KWS"), QTL = 2, EC_id = "cum rain", trait_id = "DMY") + > suppressPackageStartupMessages(library(timetk)) - When sourcing ‘MPP_ME_QTL_detect.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 + > data_tbl %>% plot_time_series(.date_var = date_col, + + .value = value) + + When sourcing ‘using-tidy-fft.R’: + Error: subscript out of bounds Execution halted - ‘MPP_ME_QTL_detect.Rmd’ using ‘UTF-8’... failed - ‘mppR_gen_vignette.Rmd’ using ‘UTF-8’... OK + ‘getting-started.Rmd’ using ‘UTF-8’... OK + ‘using-tidy-fft.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘MPP_ME_QTL_detect.Rmd’ using rmarkdown + --- re-building ‘getting-started.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.3Mb + sub-directories of 1Mb or more: + doc 5.3Mb ``` -# MSCMT +# heatmaply
-* Version: 1.4.0 -* GitHub: NA -* Source code: https://github.com/cran/MSCMT -* Date/Publication: 2024-03-19 10:20:02 UTC -* Number of recursive dependencies: 82 +* Version: 1.5.0 +* GitHub: https://github.com/talgalili/heatmaply +* Source code: https://github.com/cran/heatmaply +* Date/Publication: 2023-10-06 20:50:02 UTC +* Number of recursive dependencies: 110 -Run `revdepcheck::cloud_details(, "MSCMT")` for more info +Run `revdepcheck::cloud_details(, "heatmaply")` for more info
## Newly broken +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(heatmaply) + Loading required package: plotly + Loading required package: ggplot2 + + Attaching package: 'ggplot2' + + ... + 4. │ │ └─base::withCallingHandlers(...) + 5. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 6. ├─heatmaply:::predict_colors(ggplotly(g), plot_method = "ggplot") + 7. ├─plotly::ggplotly(g) + 8. └─plotly:::ggplotly.ggplot(g) + 9. └─plotly::gg2list(...) + + [ FAIL 58 | WARN 0 | SKIP 0 | PASS 193 ] + Error: Test failures + Execution halted + ``` + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘WorkingWithMSCMT.Rmd’ + when running code in ‘heatmaply.Rmd’ ... - (Predictor weights V are standardized by sum(V)=1) - - > library(ggplot2) + > library("heatmaply") + + > library("heatmaply") - > ggplot(res, type = "comparison") + > heatmaply(mtcars) - When sourcing ‘WorkingWithMSCMT.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 + When sourcing ‘heatmaply.R’: + Error: subscript out of bounds Execution halted - ‘CheckingSynth.Rmd’ using ‘UTF-8’... OK - ‘UsingTimeSeries.Rmd’ using ‘UTF-8’... OK - ‘WorkingWithMSCMT.Rmd’ using ‘UTF-8’... failed + ‘heatmaply.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: ... - --- re-building ‘CheckingSynth.Rmd’ using rmarkdown - --- finished re-building ‘CheckingSynth.Rmd’ - - --- re-building ‘UsingTimeSeries.Rmd’ using rmarkdown - --- finished re-building ‘UsingTimeSeries.Rmd’ - - --- re-building ‘WorkingWithMSCMT.Rmd’ using rmarkdown + --- re-building ‘heatmaply.Rmd’ using rmarkdown - ... - Quitting from lines 156-158 [unnamed-chunk-8] (WorkingWithMSCMT.Rmd) - Error: processing vignette 'WorkingWithMSCMT.Rmd' failed with diagnostics: - invalid line type: must be length 2, 4, 6 or 8 - --- failed re-building ‘WorkingWithMSCMT.Rmd’ + Quitting from lines 109-111 [unnamed-chunk-5] (heatmaply.Rmd) + Error: processing vignette 'heatmaply.Rmd' failed with diagnostics: + subscript out of bounds + --- failed re-building ‘heatmaply.Rmd’ SUMMARY: processing the following file failed: - ‘WorkingWithMSCMT.Rmd’ + ‘heatmaply.Rmd’ Error: Vignette re-building failed. Execution halted ``` -# mstate +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.5Mb + sub-directories of 1Mb or more: + doc 5.1Mb + ``` + +# heemod
-* Version: 0.3.3 -* GitHub: https://github.com/hputter/mstate -* Source code: https://github.com/cran/mstate -* Date/Publication: 2024-07-11 21:30:06 UTC -* Number of recursive dependencies: 114 +* Version: 1.0.2 +* GitHub: https://github.com/aphp/heemod +* Source code: https://github.com/cran/heemod +* Date/Publication: 2024-09-11 16:00:02 UTC +* Number of recursive dependencies: 139 -Run `revdepcheck::cloud_details(, "mstate")` for more info +Run `revdepcheck::cloud_details(, "heemod")` for more info
## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘mstate-Ex.R’ failed - The error most likely occurred in: - - > ### Name: plot.Cuminc - > ### Title: Plot method for Cuminc objects - > ### Aliases: plot.Cuminc - > - > ### ** Examples - > - > library(ggplot2) - ... - 4. └─ggplot2:::ggplot_build.ggplot(x) - 5. └─layout$setup(data, plot$data, plot$plot_env) - 6. └─ggplot2 (local) setup(..., self = self) - 7. └─self$coord$setup_params(data) - 8. └─ggplot2 (local) setup_params(..., self = self) - 9. └─ggplot2:::parse_coord_expand(expand = self$expand %||% TRUE) - 10. └─ggplot2:::check_logical(expand) - 11. └─ggplot2:::stop_input_type(...) - 12. └─rlang::abort(message, ..., call = call, arg = arg) - Execution halted - ``` - * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘visuals_demo.Rmd’ + when running code in ‘e_probabilistic.Rmd’ ... + Scale for colour is already present. + Adding another scale for colour, which will replace the existing scale. - > msf.WW <- msfit(object = c1, newdata = WW, trans = tmat) - - > plot(msf.WW) - - > plot(msf.WW, use.ggplot = TRUE) - - When sourcing ‘visuals_demo.R’: - Error: `expand` must be a logical vector, not the number 0. - Execution halted + > bcea <- run_bcea(pm, plot = TRUE, Kmax = 10000) + Loading required namespace: BCEA + No reference selected. Defaulting to first intervention. - ‘visuals_demo.Rmd’ using ‘UTF-8’... failed - ‘Tutorial.Rnw’ using ‘UTF-8’... OK - ``` - -## In both - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘visuals_demo.Rmd’ using rmarkdown + ... + ‘c_homogeneous.Rmd’ using ‘UTF-8’... OK + ‘d_non_homogeneous.Rmd’ using ‘UTF-8’... OK + ‘e_probabilistic.Rmd’ using ‘UTF-8’... failed + ‘f_sensitivity.Rmd’ using ‘UTF-8’... OK + ‘g_heterogeneity.Rmd’ using ‘UTF-8’... OK + ‘h_tabular.Rmd’ using ‘UTF-8’... OK + ‘i_reproduction.Rmd’ using ‘UTF-8’... OK + ‘j_survival.Rmd’ using ‘UTF-8’... OK + ‘j_survival_2_psa.Rmd’ using ‘UTF-8’... OK + ‘k_calibration.Rmd’ using ‘UTF-8’... OK ``` -# mtb +# hesim
-* Version: 0.1.8 -* GitHub: https://github.com/yh202109/mtb -* Source code: https://github.com/cran/mtb -* Date/Publication: 2022-10-20 17:22:35 UTC -* Number of recursive dependencies: 64 +* Version: 0.5.5 +* GitHub: https://github.com/hesim-dev/hesim +* Source code: https://github.com/cran/hesim +* Date/Publication: 2024-09-18 23:10:02 UTC +* Number of recursive dependencies: 106 -Run `revdepcheck::cloud_details(, "mtb")` for more info +Run `revdepcheck::cloud_details(, "hesim")` for more info
@@ -17580,63 +10838,87 @@ Run `revdepcheck::cloud_details(, "mtb")` for more info Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > library(mtb) + > library(hesim) > - > test_check("mtb") - [ FAIL 2 | WARN 13 | SKIP 0 | PASS 56 ] - - ══ Failed tests ════════════════════════════════════════════════════════════════ + > test_check("hesim") + sample = 1 + sample = 2 + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 1121 ] ... - - "yend" [6] - - "xmin" [7] - - "xmax" [8] - - "ymin" [9] - - "ymax" [10] - ... ... ... and 3 more ... + ── Failure ('test-plot.R:95:3'): autoplot.stateprobs() allows confidence intervals ── + p$labels$fill not equal to "strategy_id". + target is NULL, current is character + ── Failure ('test-plot.R:99:3'): autoplot.stateprobs() allows confidence intervals ── + p$labels$fill not equal to "strategy_id". + target is NULL, current is character - [ FAIL 2 | WARN 13 | SKIP 0 | PASS 56 ] + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 1121 ] Error: Test failures Execution halted ``` -# mulgar +## In both -
+* checking installed package size ... NOTE + ``` + installed size is 36.8Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 1.5Mb + doc 2.2Mb + libs 30.8Mb + ``` -* Version: 1.0.2 -* GitHub: https://github.com/dicook/mulgar -* Source code: https://github.com/cran/mulgar -* Date/Publication: 2023-08-25 22:00:02 UTC -* Number of recursive dependencies: 43 +# hmsidwR + +
-Run `revdepcheck::cloud_details(, "mulgar")` for more info +* Version: 1.1.2 +* GitHub: https://github.com/Fgazzelloni/hmsidwR +* Source code: https://github.com/cran/hmsidwR +* Date/Publication: 2024-11-13 15:00:02 UTC +* Number of recursive dependencies: 177 + +Run `revdepcheck::cloud_details(, "hmsidwR")` for more info
## Newly broken -* checking examples ... ERROR +* checking running R code from vignettes ... ERROR ``` - Running examples in ‘mulgar-Ex.R’ failed - The error most likely occurred in: + Errors in running code in vignettes: + when running code in ‘hmsidwR.Rmd’ + ... + The following object is masked from ‘package:graphics’: - > ### Name: ggmcbic - > ### Title: Produces an mclust summary plot with ggplot - > ### Aliases: ggmcbic - > - > ### ** Examples - > - > require(mclust) - ... - Type 'citation("mclust")' for citing this R package in publications. - > data(clusters) - > clusters_BIC <- mclustBIC(clusters[,1:5], G=2:6) - > ggmcbic(clusters_BIC) - Warning: Removed 5 rows containing missing values or values outside the scale range - (`geom_line()`). - Error in grid.Call.graphics(C_segments, x$x0, x$y0, x$x1, x$y1, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.segments -> grid.Call.graphics + layout + + + > plotly::ggplotly(id) + + When sourcing ‘hmsidwR.R’: + Error: subscript out of bounds + Execution halted + + ‘hmsidwR.Rmd’ using ‘UTF-8’... failed + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘hmsidwR.Rmd’ using rmarkdown + + Quitting from lines 52-84 [unnamed-chunk-6] (hmsidwR.Rmd) + Error: processing vignette 'hmsidwR.Rmd' failed with diagnostics: + subscript out of bounds + --- failed re-building ‘hmsidwR.Rmd’ + + SUMMARY: processing the following file failed: + ‘hmsidwR.Rmd’ + + Error: Vignette re-building failed. Execution halted ``` @@ -17644,22 +10926,28 @@ Run `revdepcheck::cloud_details(, "mulgar")` for more info * checking installed package size ... NOTE ``` - installed size is 8.8Mb + installed size is 7.2Mb sub-directories of 1Mb or more: - data 8.5Mb + data 3.0Mb + doc 4.0Mb + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 1686 marked UTF-8 strings ``` -# MultivariateAnalysis +# HVT
-* Version: 0.5.0 -* GitHub: NA -* Source code: https://github.com/cran/MultivariateAnalysis -* Date/Publication: 2024-04-08 18:40:03 UTC -* Number of recursive dependencies: 128 +* Version: 24.9.1 +* GitHub: https://github.com/Mu-Sigma/HVT +* Source code: https://github.com/cran/HVT +* Date/Publication: 2024-09-11 09:50:02 UTC +* Number of recursive dependencies: 209 -Run `revdepcheck::cloud_details(, "MultivariateAnalysis")` for more info +Run `revdepcheck::cloud_details(, "HVT")` for more info
@@ -17667,152 +10955,154 @@ Run `revdepcheck::cloud_details(, "MultivariateAnalysis")` for more info * checking examples ... ERROR ``` - Running examples in ‘MultivariateAnalysis-Ex.R’ failed + Running examples in ‘HVT-Ex.R’ failed The error most likely occurred in: - > ### Name: ContribuicaoRelativa - > ### Title: Contribuicao das variaveis independentes para o agrupamento - > ### Aliases: ContribuicaoRelativa + > ### Name: clustHVT + > ### Title: Performing Hierarchical Clustering Analysis + > ### Aliases: clustHVT + > ### Keywords: Clustering_Analysis > > ### ** Examples > - > ... - 12. │ └─ggplot2:::`+.gg`(p, do.call(geom_line, option)) - 13. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 14. │ ├─ggplot2::ggplot_add(object, p, objectname) - 15. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 16. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 17. └─base::.handleSimpleError(...) - 18. └─purrr (local) h(simpleError(msg, call)) - 19. └─cli::cli_abort(...) - 20. └─rlang::abort(...) + Ignoring unknown parameters: `check_overlap` + Scale for x is already present. + Adding another scale for x, which will replace the existing scale. + Scale for y is already present. + Adding another scale for y, which will replace the existing scale. + Warning in geom_polygon(data = boundaryCoords2, aes(x = bp.x, y = bp.y, : + Ignoring unknown aesthetics: text + Error in pm[[2]] : subscript out of bounds + Calls: scoreHVT -> -> ggplotly.ggplot -> gg2list Execution halted ``` -# mxfda +* checking whether package ‘HVT’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(T, unlist(ijresplt))': unused argument (unlist(ijresplt)) + See ‘/tmp/workdir/HVT/new/HVT.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + hvq: possible error in is.element(T, unlist(ijresplt)): unused argument + (unlist(ijresplt)) + ``` + +# hypsoLoop
-* Version: 0.2.1 -* GitHub: https://github.com/julia-wrobel/mxfda -* Source code: https://github.com/cran/mxfda -* Date/Publication: 2024-05-08 11:00:02 UTC -* Number of recursive dependencies: 221 +* Version: 0.2.0 +* GitHub: NA +* Source code: https://github.com/cran/hypsoLoop +* Date/Publication: 2022-02-08 09:00:02 UTC +* Number of recursive dependencies: 96 -Run `revdepcheck::cloud_details(, "mxfda")` for more info +Run `revdepcheck::cloud_details(, "hypsoLoop")` for more info
## Newly broken -* checking installed package size ... NOTE +* checking whether package ‘hypsoLoop’ can be installed ... WARNING ``` - installed size is 5.6Mb - sub-directories of 1Mb or more: - data 4.0Mb + Found the following significant warnings: + Warning: replacing previous import ‘ggplot2::set_theme’ by ‘sjPlot::set_theme’ when loading ‘hypsoLoop’ + See ‘/tmp/workdir/hypsoLoop/new/hypsoLoop.Rcheck/00install.out’ for details. ``` -# neatmaps +# iCARH
-* Version: 2.1.0 -* GitHub: https://github.com/PhilBoileau/neatmaps -* Source code: https://github.com/cran/neatmaps -* Date/Publication: 2019-05-12 19:10:03 UTC -* Number of recursive dependencies: 99 +* Version: 2.0.2.1 +* GitHub: NA +* Source code: https://github.com/cran/iCARH +* Date/Publication: 2020-08-27 07:50:07 UTC +* Number of recursive dependencies: 121 -Run `revdepcheck::cloud_details(, "neatmaps")` for more info +Run `revdepcheck::cloud_details(, "iCARH")` for more info
## Newly broken -* checking examples ... ERROR +* checking whether package ‘iCARH’ can be installed ... WARNING ``` - Running examples in ‘neatmaps-Ex.R’ failed - The error most likely occurred in: - - > ### Name: consClustResTable - > ### Title: Consensus Cluster Results in a Table - > ### Aliases: consClustResTable - > - > ### ** Examples - > - > # create the data frame using the network, node and edge attributes - ... - > df <- netsDataFrame(network_attr_df, - + node_attr_df, - + edge_df) - > - > # run the neatmap code on df - > neat_res <- neatmap(df, scale_df = "ecdf", max_k = 3, reps = 100, - + xlab = "vars", ylab = "nets", xlab_cex = 1, ylab_cex = 1) - Error in pm[[2]] : subscript out of bounds - Calls: neatmap ... %>% -> layout -> ggplotly -> ggplotly.ggplot -> gg2list - Execution halted + Found the following significant warnings: + Note: possible error in 'is.element(unique(paste0("cpd:", ': unused argument (igraph::get.vertex.attribute(x, "name")) + See ‘/tmp/workdir/iCARH/new/iCARH.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. ``` -## In both - -* checking installed package size ... NOTE +* checking R code for possible problems ... NOTE ``` - installed size is 6.3Mb + GetDistanceMat : : possible error in + is.element(unique(paste0("cpd:", unlist(metset))), + igraph::get.vertex.attribute(x, "name")): unused argument + (igraph::get.vertex.attribute(x, "name")) ``` -# neatStats +# ICSsmoothing
-* Version: 1.13.3 -* GitHub: https://github.com/gasparl/neatstats -* Source code: https://github.com/cran/neatStats -* Date/Publication: 2022-12-07 20:50:02 UTC -* Number of recursive dependencies: 129 +* Version: 1.2.8 +* GitHub: NA +* Source code: https://github.com/cran/ICSsmoothing +* Date/Publication: 2024-01-10 10:33:21 UTC +* Number of recursive dependencies: 63 -Run `revdepcheck::cloud_details(, "neatStats")` for more info +Run `revdepcheck::cloud_details(, "ICSsmoothing")` for more info
## Newly broken -* checking examples ... ERROR +* checking tests ... ERROR ``` - Running examples in ‘neatStats-Ex.R’ failed - The error most likely occurred in: - - > ### Name: peek_neat - > ### Title: Cursory Summaries and Plots per Group - > ### Aliases: peek_neat - > - > ### ** Examples - > - > + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ICSsmoothing) + Loading required package: polynom + Loading required package: ggplot2 + + Attaching package: 'ggplot2' + ... - 11. │ └─ggplot2:::`+.gg`(...) - 12. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 13. │ ├─ggplot2::ggplot_add(object, p, objectname) - 14. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 15. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 16. └─base::.handleSimpleError(...) - 17. └─purrr (local) h(simpleError(msg, call)) - 18. └─cli::cli_abort(...) - 19. └─rlang::abort(...) - Execution halted + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 13 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test_expl_spline.R:95:3'): cics_explicit works correctly. ───────── + `is_spline` not equal to TRUE. + 1 element mismatch + + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 13 ] + Error: Test failures + Execution halted ``` -# netcom +# incidental
-* Version: 2.1.7 -* GitHub: https://github.com/langendorfr/netcom -* Source code: https://github.com/cran/netcom -* Date/Publication: 2024-06-04 17:50:05 UTC -* Number of recursive dependencies: 103 +* Version: 0.1 +* GitHub: NA +* Source code: https://github.com/cran/incidental +* Date/Publication: 2020-09-16 09:50:03 UTC +* Number of recursive dependencies: 66 -Run `revdepcheck::cloud_details(, "netcom")` for more info +Run `revdepcheck::cloud_details(, "incidental")` for more info
@@ -17821,48 +11111,87 @@ Run `revdepcheck::cloud_details(, "netcom")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘tutorial.Rmd’ + when running code in ‘incidental-tutorial.Rmd’ ... - > networks <- c(networks_undisturbed, networks_disturbed) - > comparisons <- netcom::compare(networks, method = "align") + > data_subset = do.call("rbind", model_df_list) - > stats::prcomp(comparisons) %>% ggplot2::autoplot(data = tibble(Kind = c(rep("Undisturbed", - + num_networks), rep("Disturbed", num_networks))), c .... [TRUNCATED] + > ggplot(data_subset, aes(x = Time, y = Reported)) + + + geom_point(color = "coral2", shape = 3) + geom_line(aes(x = Time, + + y = Ihat), color .... [TRUNCATED] - When sourcing ‘tutorial.R’: - Error: argument is of length zero + When sourcing ‘incidental-tutorial.R’: + Error: `x` must be a vector, not a object. Execution halted - ‘tutorial.Rmd’ using ‘UTF-8’... failed + ‘incidental-tutorial.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘tutorial.Rmd’ using rmarkdown + --- re-building ‘incidental-tutorial.Rmd’ using rmarkdown + ``` + +# industRial + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/J-Ramalho/industRial +* Source code: https://github.com/cran/industRial +* Date/Publication: 2021-06-11 09:40:02 UTC +* Number of recursive dependencies: 192 + +Run `revdepcheck::cloud_details(, "industRial")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘industRial-Ex.R’ failed + The error most likely occurred in: + + > ### Name: theme_qcc + > ### Title: Custom theme "qcc" for the book industRial Data Science plots + > ### Aliases: theme_qcc + > + > ### ** Examples + > + > library(dplyr) + ... + Backtrace: + ▆ + 1. └─industRial::theme_qcc() + 2. ├─... %+replace% ... + 3. │ └─ggplot2::is.theme(e2) + 4. └─ggplot2::theme(...) + 5. └─lifecycle::deprecate_stop("2.2.0", "theme(panel.margin)", "theme(panel.spacing)") + 6. └─lifecycle:::deprecate_stop0(msg) + 7. └─rlang::cnd_signal(...) + Execution halted ``` ## In both -* checking dependencies in R code ... NOTE +* checking data for non-ASCII characters ... NOTE ``` - Namespaces in Imports field not imported from: - ‘ggfortify’ ‘ggplot2’ ‘ggraph’ ‘reshape2’ - All declared Imports should be used. + Note: found 2 marked UTF-8 strings ``` -# NetFACS +# infer
-* Version: 0.5.0 -* GitHub: NA -* Source code: https://github.com/cran/NetFACS -* Date/Publication: 2022-12-06 17:32:35 UTC -* Number of recursive dependencies: 101 +* Version: 1.0.7 +* GitHub: https://github.com/tidymodels/infer +* Source code: https://github.com/cran/infer +* Date/Publication: 2024-03-25 21:50:02 UTC +* Number of recursive dependencies: 126 -Run `revdepcheck::cloud_details(, "NetFACS")` for more info +Run `revdepcheck::cloud_details(, "infer")` for more info
@@ -17870,59 +11199,71 @@ Run `revdepcheck::cloud_details(, "NetFACS")` for more info * checking examples ... ERROR ``` - Running examples in ‘NetFACS-Ex.R’ failed + Running examples in ‘infer-Ex.R’ failed The error most likely occurred in: - > ### Name: network_conditional - > ### Title: Create a network based on conditional probabilities of dyads of - > ### elements - > ### Aliases: network_conditional + > ### Name: shade_confidence_interval + > ### Title: Add information about confidence interval + > ### Aliases: shade_confidence_interval shade_ci > > ### ** Examples > + > # find the point estimate---mean number of hours worked per week ... - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family 'Arial Narrow' not found in PostScript font database - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family 'Arial Narrow' not found in PostScript font database - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family 'Arial Narrow' not found in PostScript font database - Error in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - invalid font type - Calls: ... drawDetails -> drawDetails.text -> grid.Call.graphics + 10. │ └─ggplot2:::ggplot_add.list(object, p, objectname) + 11. │ ├─ggplot2::ggplot_add(o, plot, object_name) + 12. │ └─ggplot2:::ggplot_add.Layer(o, plot, object_name) + 13. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) + 14. │ └─vctrs::vec_as_names(names, repair = "check_unique") + 15. │ └─vctrs (local) ``() + 16. │ └─vctrs:::validate_unique(names = names, arg = arg, call = call) + 17. │ └─vctrs:::validate_minimal_names(names, n) + 18. └─rlang::abort(message = message, call = call) Execution halted ``` * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘netfacs_tutorial.Rmd’ + when running code in ‘infer.Rmd’ ... - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family 'Arial Narrow' not found in PostScript font database - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family 'Arial Narrow' not found in PostScript font database - Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : - font family 'Arial Narrow' not found in PostScript font database + # A tibble: 1 × 2 + lower_ci upper_ci + + 1 40.1 42.7 - When sourcing ‘netfacs_tutorial.R’: - Error: invalid font type + > visualize(t_dist) + shade_confidence_interval(theor_ci) + + ... + When sourcing ‘observed_stat_examples.R’: + Error: Names repair functions can't return `NA` values. Execution halted - ‘netfacs_tutorial.Rmd’ using ‘UTF-8’... failed + ‘anova.Rmd’ using ‘UTF-8’... OK + ‘chi_squared.Rmd’ using ‘UTF-8’... OK + ‘infer.Rmd’ using ‘UTF-8’... failed + ‘observed_stat_examples.Rmd’ using ‘UTF-8’... failed + ‘paired.Rmd’ using ‘UTF-8’... OK + ‘t_test.Rmd’ using ‘UTF-8’... OK + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘anova.Rmd’ using rmarkdown ``` -# neuroUp +# inferCSN
-* Version: 0.3.1 -* GitHub: https://github.com/eduardklap/neuroUp -* Source code: https://github.com/cran/neuroUp -* Date/Publication: 2024-08-28 08:20:05 UTC -* Number of recursive dependencies: 82 +* Version: 1.0.8 +* GitHub: https://github.com/mengxu98/inferCSN +* Source code: https://github.com/cran/inferCSN +* Date/Publication: 2024-08-24 05:30:02 UTC +* Number of recursive dependencies: 199 -Run `revdepcheck::cloud_details(, "neuroUp")` for more info +Run `revdepcheck::cloud_details(, "inferCSN")` for more info
@@ -17930,102 +11271,98 @@ Run `revdepcheck::cloud_details(, "neuroUp")` for more info * checking examples ... ERROR ``` - Running examples in ‘neuroUp-Ex.R’ failed + Running examples in ‘inferCSN-Ex.R’ failed The error most likely occurred in: - > ### Name: estim_corr - > ### Title: Estimate correlations - > ### Aliases: estim_corr + > ### Name: plot_dynamic_networks + > ### Title: Plot dynamic networks + > ### Aliases: plot_dynamic_networks > > ### ** Examples > - > data_gambling <- gambling + > data("example_matrix") ... - 8 100 -0.0787 -0.271 0.120 2 NA - 9 140 -0.0555 -0.219 0.111 2 NA - 10 221 -0.0405 -0.172 0.0920 2 NA - # ℹ 45 more rows - - $fig_corr - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics + + ) + > + > plot_dynamic_networks( + + network, + + celltypes_order = celltypes_order, + + plot_type = "ggplotly" + + ) + Error in pm[[2]] : subscript out of bounds + Calls: plot_dynamic_networks -> -> ggplotly.ggplot -> gg2list Execution halted ``` -* checking tests ... ERROR +## In both + +* checking installed package size ... NOTE ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > # This file is part of the standard setup for testthat. - > # It is recommended that you do not modify it. - > # - > # Where should you do additional test configuration? - > # Learn more about the roles of various files in: - > # * https://r-pkgs.org/tests.html - > # * https://testthat.r-lib.org/reference/test_package.html#special-files - ... - 25. └─grid:::grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) - - [ FAIL 2 | WARN 0 | SKIP 0 | PASS 10 ] - Deleting unused snapshots: - • estim_corr/create-fig-corr-nozero.svg - • estim_diff/create-fig-cohen-s-d.svg - • estim_diff/create-fig-d-nozero.svg - • estim_diff/create-fig-nozero.svg - Error: Test failures - Execution halted + installed size is 22.5Mb + sub-directories of 1Mb or more: + data 2.0Mb + libs 19.9Mb ``` +# injurytools + +
+ +* Version: 1.0.3 +* GitHub: https://github.com/lzumeta/injurytools +* Source code: https://github.com/cran/injurytools +* Date/Publication: 2023-11-14 17:20:05 UTC +* Number of recursive dependencies: 157 + +Run `revdepcheck::cloud_details(, "injurytools")` for more info + +
+ +## Newly broken + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘neuroUp.Rmd’ + when running code in ‘model-injury-data-ii.Rmd’ ... - > set.seed(1234) - - > feedback_estim <- estim_diff(feedback_data, c("mfg_learning", - + "mfg_application"), 20:271, 20, "Feedback middle frontal gyrus") + seasonb=2018/2019 19 17 106 84 165 - > feedback_estim$fig_diff + > ggsurvplot(fit, data = injd_sub, palette = c("#E7B800", + + "#2E9FDF")) + xlab("Time [calendar days]") + ylab(expression("Survival probability ( ..." ... [TRUNCATED] + Warning in eval(ei, envir) : + Incompatible methods ("+.ggsurv", "+.gg") for "+" - When sourcing ‘neuroUp.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 + When sourcing ‘model-injury-data-ii.R’: + Error: non-numeric argument to binary operator Execution halted - ‘neuroUp.Rmd’ using ‘UTF-8’... failed + ‘estimate-epi-measures.Rmd’ using ‘UTF-8’... OK + ‘model-injury-data-i.Rmd’ using ‘UTF-8’... OK + ‘model-injury-data-ii.Rmd’ using ‘UTF-8’... failed + ‘prepare-injury-data.Rmd’ using ‘UTF-8’... OK + ‘visualize-injury-data.Rmd’ using ‘UTF-8’... OK ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - ... - --- re-building ‘neuroUp.Rmd’ using rmarkdown - - Quitting from lines 92-93 [unnamed-chunk-5] (neuroUp.Rmd) - Error: processing vignette 'neuroUp.Rmd' failed with diagnostics: - invalid line type: must be length 2, 4, 6 or 8 - --- failed re-building ‘neuroUp.Rmd’ - - SUMMARY: processing the following file failed: - ‘neuroUp.Rmd’ + --- re-building ‘estimate-epi-measures.Rmd’ using rmarkdown + --- finished re-building ‘estimate-epi-measures.Rmd’ - Error: Vignette re-building failed. - Execution halted + --- re-building ‘model-injury-data-i.Rmd’ using rmarkdown ``` -# NHSRplotthedots +# inTextSummaryTable
-* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/NHSRplotthedots -* Date/Publication: 2021-11-03 20:20:10 UTC -* Number of recursive dependencies: 88 +* Version: 3.3.3 +* GitHub: https://github.com/openanalytics/inTextSummaryTable +* Source code: https://github.com/cran/inTextSummaryTable +* Date/Publication: 2024-06-12 18:30:02 UTC +* Number of recursive dependencies: 112 -Run `revdepcheck::cloud_details(, "NHSRplotthedots")` for more info +Run `revdepcheck::cloud_details(, "inTextSummaryTable")` for more info
@@ -18033,91 +11370,268 @@ Run `revdepcheck::cloud_details(, "NHSRplotthedots")` for more info * checking tests ... ERROR ``` - Running ‘spelling.R’ Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > library(NHSRplotthedots) + > library(inTextSummaryTable) > - > test_check("NHSRplotthedots") - [ FAIL 1 | WARN 733 | SKIP 3 | PASS 431 ] + > test_check("inTextSummaryTable") + [ FAIL 59 | WARN 0 | SKIP 0 | PASS 881 ] + ══ Failed tests ════════════════════════════════════════════════════════════════ ... + 5. │ └─rlang::eval_bare(quo_get_expr(.quo), quo_get_env(.quo)) + 6. └─inTextSummaryTable::subjectProfileSummaryPlot(...) + 7. ├─base::do.call(plyr::rbind.fill, ggplot_build(gg)$data) + 8. └─plyr (local) ``(``, ``) + 9. └─plyr:::output_template(dfs, nrows) + 10. └─plyr:::allocate_column(df[[var]], nrows, dfs, var) - `actual$type` is absent - `expected$type` is a character vector ('type') - - `actual$text` is absent - `expected$text` is a character vector ('text') - - [ FAIL 1 | WARN 733 | SKIP 3 | PASS 431 ] + [ FAIL 59 | WARN 0 | SKIP 0 | PASS 881 ] Error: Test failures Execution halted ``` +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘inTextSummaryTable-aesthetics.Rmd’ + ... + > subjectProfileSummaryPlot(data = summaryTable, xVar = "visit", + + colorVar = "TRT") + + When sourcing ‘inTextSummaryTable-aesthetics.R’: + Error: Problem while setting up geom aesthetics. + ℹ Error occurred in the 2nd layer. + Caused by error in `check_aesthetics()`: + ... + ✖ Fix the following mappings: `size`. + Execution halted + + ‘inTextSummaryTable-advanced.Rmd’ using ‘UTF-8’... OK + ‘inTextSummaryTable-aesthetics.Rmd’ using ‘UTF-8’... failed + ‘inTextSummaryTable-createTables.Rmd’ using ‘UTF-8’... OK + ‘inTextSummaryTable-exportTables.Rmd’ using ‘UTF-8’... OK + ‘inTextSummaryTable-introduction.Rmd’ using ‘UTF-8’... OK + ‘inTextSummaryTable-standardTables.Rmd’ using ‘UTF-8’... OK + ‘inTextSummaryTable-visualization.Rmd’ using ‘UTF-8’... failed + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘inTextSummaryTable-advanced.Rmd’ using rmarkdown + --- finished re-building ‘inTextSummaryTable-advanced.Rmd’ + + --- re-building ‘inTextSummaryTable-aesthetics.Rmd’ using rmarkdown + + Quitting from lines 211-224 [aesthetics-defaultsVisualization] (inTextSummaryTable-aesthetics.Rmd) + Error: processing vignette 'inTextSummaryTable-aesthetics.Rmd' failed with diagnostics: + Problem while setting up geom aesthetics. + ℹ Error occurred in the 2nd layer. + ... + ! Aesthetics must be either length 1 or the same as the data (28). + ✖ Fix the following mappings: `size`. + --- failed re-building ‘inTextSummaryTable-visualization.Rmd’ + + SUMMARY: processing the following files failed: + ‘inTextSummaryTable-aesthetics.Rmd’ + ‘inTextSummaryTable-visualization.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + ## In both -* checking dependencies in R code ... NOTE +* checking installed package size ... NOTE ``` - Namespaces in Imports field not imported from: - ‘NHSRdatasets’ ‘grid’ ‘utils’ - All declared Imports should be used. + installed size is 10.3Mb + sub-directories of 1Mb or more: + doc 9.7Mb ``` -# nichetools +# inti
-* Version: 0.3.1 -* GitHub: https://github.com/benjaminhlina/nichetools -* Source code: https://github.com/cran/nichetools -* Date/Publication: 2024-09-06 17:00:02 UTC -* Number of recursive dependencies: 119 +* Version: 0.6.6 +* GitHub: https://github.com/flavjack/inti +* Source code: https://github.com/cran/inti +* Date/Publication: 2024-09-03 18:00:02 UTC +* Number of recursive dependencies: 124 -Run `revdepcheck::cloud_details(, "nichetools")` for more info +Run `revdepcheck::cloud_details(, "inti")` for more info
## Newly broken +* checking whether package ‘inti’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(variable, ': unused argument (colums_to_recode) + See ‘/tmp/workdir/inti/new/inti.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + metamorphosis : rename_levels: possible error in is.element(variable, + colums_to_recode): unused argument (colums_to_recode) + ``` + +## In both + +* checking examples ... ERROR + ``` + Running examples in ‘inti-Ex.R’ failed + The error most likely occurred in: + + > ### Name: H2cal + > ### Title: Broad-sense heritability in plant breeding + > ### Aliases: H2cal + > + > ### ** Examples + > + > + ... + + , fixed.model = "0 + (1|bloque) + geno" + + , random.model = "1 + (1|bloque) + (1|geno)" + + , emmeans = TRUE + + , plot_diag = FALSE + + , outliers.rm = TRUE + + ) + Error in initializePtr() : + function 'cholmod_factor_ldetA' not provided by package 'Matrix' + Calls: H2cal ... initialize -> -> initializePtr -> .Call + Execution halted + ``` + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘using-nichetools-with-the-package-SIBER.Rmd’ + when running code in ‘heritability.Rmd’ ... - + option = "A", alpha = 0.75) + > library(inti) - > ggplot() + stat_pointinterval(data = bays_95_overlap, - + aes(x = group_1, y = prop_overlap, point_fill = group_2), - + interval_colour = "gre ..." ... [TRUNCATED] + > dt <- potato - When sourcing ‘using-nichetools-with-the-package-SIBER.R’: - Error: unused argument (theme = list(list("black", 0.681818181818182, 1, "butt", FALSE, "black", TRUE), list("white", "black", 0.681818181818182, 1, TRUE), list("", "plain", "black", 15, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list("black", "white", "#3366FF", 0.681818181818182, 0.681818181818182, 1, 1, "", 5.27189705271897, 2.04545454545455, 19, TRUE), 7.5, c(7.5, 7.5, 7.5, 7.5), NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, - NULL, c(3.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 3.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 3.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, c(0, 0, 0, 3.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(3, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, + > hr <- H2cal(data = dt, trait = "stemdw", gen.name = "geno", + + rep.n = 5, fixed.model = "0 + (1|bloque) + geno", random.model = "1 + (1|bloque) ..." ... [TRUNCATED] + + ... + When sourcing ‘heritability.R’: + Error: function 'cholmod_factor_ldetA' not provided by package 'Matrix' Execution halted - ‘using-nichetools-with-the-package-SIBER.Rmd’ using ‘UTF-8’... failed - ‘using-nichetools-with-the-package-nicheROVER.Rmd’ using ‘UTF-8’... OK + ‘apps.Rmd’ using ‘UTF-8’... OK + ‘heritability.Rmd’ using ‘UTF-8’... failed + ‘policy.Rmd’ using ‘UTF-8’... OK + ‘rticles.Rmd’ using ‘UTF-8’... OK + ‘tarpuy.Rmd’ using ‘UTF-8’... OK + ‘yupana.Rmd’ using ‘UTF-8’... OK ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘using-nichetools-with-the-package-SIBER.Rmd’ using rmarkdown + --- re-building ‘apps.Rmd’ using rmarkdown + --- finished re-building ‘apps.Rmd’ + + --- re-building ‘heritability.Rmd’ using rmarkdown + + Quitting from lines 105-116 [unnamed-chunk-2] (heritability.Rmd) + Error: processing vignette 'heritability.Rmd' failed with diagnostics: + function 'cholmod_factor_ldetA' not provided by package 'Matrix' + --- failed re-building ‘heritability.Rmd’ + ... + --- finished re-building ‘tarpuy.Rmd’ + + --- re-building ‘yupana.Rmd’ using rmarkdown + --- finished re-building ‘yupana.Rmd’ + + SUMMARY: processing the following file failed: + ‘heritability.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# inventorize + +
+ +* Version: 1.1.1 +* GitHub: NA +* Source code: https://github.com/cran/inventorize +* Date/Publication: 2022-05-31 22:20:09 UTC +* Number of recursive dependencies: 71 + +Run `revdepcheck::cloud_details(, "inventorize")` for more info + +
+ +## Newly broken + +* checking whether package ‘inventorize’ can be installed ... ERROR ``` + Installation failed. + See ‘/tmp/workdir/inventorize/new/inventorize.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘inventorize’ ... +** package ‘inventorize’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error in pm[[2]] : subscript out of bounds +Error: unable to load R code in package ‘inventorize’ +Execution halted +ERROR: lazy loading failed for package ‘inventorize’ +* removing ‘/tmp/workdir/inventorize/new/inventorize.Rcheck/inventorize’ + + +``` +### CRAN + +``` +* installing *source* package ‘inventorize’ ... +** package ‘inventorize’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Warning in qgamma(service_level, alpha, beta) : NaNs produced +Warning in qgamma(service_level, alpha, beta) : NaNs produced +** help +*** installing help indices +** building package indices +** testing if installed package can be loaded from temporary location +** testing if installed package can be loaded from final location +** testing if installed package keeps a record of temporary installation path +* DONE (inventorize) -# NIMAA + +``` +# IPV
-* Version: 0.2.1 -* GitHub: https://github.com/jafarilab/NIMAA -* Source code: https://github.com/cran/NIMAA -* Date/Publication: 2022-04-11 14:12:45 UTC -* Number of recursive dependencies: 177 +* Version: 1.0.0 +* GitHub: https://github.com/NilsPetras/IPV +* Source code: https://github.com/cran/IPV +* Date/Publication: 2022-09-30 15:00:02 UTC +* Number of recursive dependencies: 82 -Run `revdepcheck::cloud_details(, "NIMAA")` for more info +Run `revdepcheck::cloud_details(, "IPV")` for more info
@@ -18125,117 +11639,74 @@ Run `revdepcheck::cloud_details(, "NIMAA")` for more info * checking examples ... ERROR ``` - Running examples in ‘NIMAA-Ex.R’ failed + Running examples in ‘IPV-Ex.R’ failed The error most likely occurred in: - > ### Name: extractSubMatrix - > ### Title: Extract the non-missing submatrices from a given matrix. - > ### Aliases: extractSubMatrix + > ### Name: nested_chart + > ### Title: Nested Chart + > ### Aliases: nested_chart > > ### ** Examples > - > # load part of the beatAML data + > # as simple as that ... - + row.vars = "inhibitor") - binmatnest.temperature - 13.21221 - Size of Square: 66 rows x 66 columns - Size of Rectangular_row: 6 rows x 105 columns - Size of Rectangular_col: 99 rows x 2 columns - Size of Rectangular_element_max: 59 rows x 79 columns - Error in pm[[2]] : subscript out of bounds - Calls: extractSubMatrix ... plotSubmatrix -> print -> -> ggplotly.ggplot -> gg2list + 6. └─ggplot2:::ggplot_add.Layer(object, p, objectname) + 7. └─ggplot2:::new_layer_names(object, names(plot$layers)) + 8. └─vctrs::vec_as_names(names, repair = "check_unique") + 9. └─vctrs (local) ``() + 10. └─vctrs:::validate_unique(names = names, arg = arg, call = call) + 11. └─vctrs:::stop_names_cannot_be_empty(names, call = call) + 12. └─vctrs:::stop_names(...) + 13. └─vctrs:::stop_vctrs(...) + 14. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) Execution halted ``` -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(NIMAA) - Warning message: - In check_dep_version() : ABI version mismatch: - lme4 was built with Matrix ABI version 1 - Current Matrix ABI version is 0 - Please re-install lme4 from source or restore original 'Matrix' package - ... - 1. └─NIMAA::extractSubMatrix(...) at test-extract-nonmissing-submatrix.R:5:3 - 2. └─NIMAA:::plotSubmatrix(...) - 3. ├─base::print(plotly::ggplotly(p)) - 4. ├─plotly::ggplotly(p) - 5. └─plotly:::ggplotly.ggplot(p) - 6. └─plotly::gg2list(...) - - [ FAIL 1 | WARN 4 | SKIP 0 | PASS 7 ] - Error: Test failures - Execution halted - ``` - * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘NIMAA-vignette.Rmd’ + when running code in ‘ipv-vignette.Rmd’ ... + Facet circle radius set to 0.211 based on the data. + cor_spacing set to 0.193 based on the data. + Relative scaling set to 3.78 based on the data. + Axis tick set to 0.1 based on the data. + dist_construct_label set to 0.5 based on the data. - > beatAML_incidence_matrix <- plotIncMatrix(x = beatAML_data, - + index_nominal = c(2, 1), index_numeric = 3, print_skim = FALSE, - + plot_weigh .... [TRUNCATED] - - Na/missing values Proportion: 0.2603 - - When sourcing ‘NIMAA-vignette.R’: - Error: subscript out of bounds + When sourcing ‘ipv-vignette.R’: + Error: Names can't be empty. + ✖ Empty name found at location 4. Execution halted - ‘NIMAA-vignette.Rmd’ using ‘UTF-8’... failed + ‘ipv-vignette.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - ... - --- re-building ‘NIMAA-vignette.Rmd’ using rmarkdown - - Quitting from lines 49-57 [plotIncMatrix function] (NIMAA-vignette.Rmd) - Error: processing vignette 'NIMAA-vignette.Rmd' failed with diagnostics: - subscript out of bounds - --- failed re-building ‘NIMAA-vignette.Rmd’ - - SUMMARY: processing the following file failed: - ‘NIMAA-vignette.Rmd’ - - Error: Vignette re-building failed. - Execution halted + --- re-building ‘ipv-vignette.Rmd’ using rmarkdown ``` ## In both * checking installed package size ... NOTE ``` - installed size is 6.5Mb + installed size is 8.0Mb sub-directories of 1Mb or more: - data 2.0Mb - doc 4.0Mb - ``` - -* checking data for non-ASCII characters ... NOTE - ``` - Note: found 24 marked UTF-8 strings + data 7.0Mb ``` -# nonmem2R +# IRon
-* Version: 0.2.5 -* GitHub: NA -* Source code: https://github.com/cran/nonmem2R -* Date/Publication: 2024-03-11 17:30:02 UTC -* Number of recursive dependencies: 64 +* Version: 0.1.4 +* GitHub: https://github.com/nunompmoniz/IRon +* Source code: https://github.com/cran/IRon +* Date/Publication: 2023-01-20 07:20:06 UTC +* Number of recursive dependencies: 84 -Run `revdepcheck::cloud_details(, "nonmem2R")` for more info +Run `revdepcheck::cloud_details(, "IRon")` for more info
@@ -18243,66 +11714,49 @@ Run `revdepcheck::cloud_details(, "nonmem2R")` for more info * checking examples ... ERROR ``` - Running examples in ‘nonmem2R-Ex.R’ failed + Running examples in ‘IRon-Ex.R’ failed The error most likely occurred in: - > ### Name: vpcfig2 - > ### Title: Visual Predictive Check (VPC) based on Perl-speaks-NONMEM (PsN) - > ### generated VPC files (ggplot2-version). - > ### Aliases: vpcfig2 + > ### Name: sera + > ### Title: Squared Error-Relevance Area (SERA) + > ### Aliases: sera > > ### ** Examples > + > library(IRon) ... - VPC based on files: - /tmp/workdir/nonmem2R/new/nonmem2R.Rcheck/nonmem2R/extdata/vpctab004.dat - and - /tmp/workdir/nonmem2R/new/nonmem2R.Rcheck/nonmem2R/extdata/vpc_results.csv - Facetting was set using: - facet_wrap(~strata) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics + 16. │ └─self$stat$setup_params(data, self$stat_params) + 17. │ └─ggplot2 (local) setup_params(...) + 18. │ └─base::match.fun(method) + 19. │ └─base::get(as.character(FUN), mode = "function", envir = envir) + 20. └─base::.handleSimpleError(...) + 21. └─rlang (local) h(simpleError(msg, call)) + 22. └─handlers[[1L]](cnd) + 23. └─cli::cli_abort(...) + 24. └─rlang::abort(...) Execution halted ``` -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘VPCvignette.Rmd’ - ... - VPC based on files: - /tmp/workdir/nonmem2R/new/nonmem2R.Rcheck/nonmem2R/extdata/vpctab004.dat - and - /tmp/workdir/nonmem2R/new/nonmem2R.Rcheck/nonmem2R/extdata/vpc_results.csv - Facetting was set using: - facet_wrap(~strata) - - When sourcing ‘VPCvignette.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 - Execution halted - - ‘GOFvignette.Rmd’ using ‘UTF-8’... OK - ‘VPCvignette.Rmd’ using ‘UTF-8’... failed - ``` +## In both -* checking re-building of vignette outputs ... NOTE +* checking installed package size ... NOTE ``` - Error(s) in re-building vignettes: - --- re-building ‘GOFvignette.Rmd’ using rmarkdown + installed size is 6.7Mb + sub-directories of 1Mb or more: + data 6.5Mb ``` -# nphRCT +# isoorbi
-* Version: 0.1.1 -* GitHub: NA -* Source code: https://github.com/cran/nphRCT -* Date/Publication: 2024-06-27 12:30:02 UTC -* Number of recursive dependencies: 120 +* Version: 1.3.1 +* GitHub: https://github.com/isoverse/isoorbi +* Source code: https://github.com/cran/isoorbi +* Date/Publication: 2024-08-27 05:10:03 UTC +* Number of recursive dependencies: 122 -Run `revdepcheck::cloud_details(, "nphRCT")` for more info +Run `revdepcheck::cloud_details(, "isoorbi")` for more info
@@ -18311,47 +11765,76 @@ Run `revdepcheck::cloud_details(, "nphRCT")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘explanation.Rmd’ + when running code in ‘dual_inlet.Rmd’ ... + |20230518_05_USGS32_vs_USGS34 | 16| 7|reference |changeover | NA| 10695| 11020| 65.019| 66.994| + |20230518_05_USGS32_vs_USGS34 | 17| 7|reference |data | NA| 11025| 12335| 67.025| 74.985| - > km <- survfit(Surv(time, event) ~ arm, data = dat) - - > p_km <- survminer::ggsurvplot(km, data = dat, risk.table = TRUE, - + break.x.by = 6, legend.title = "", xlab = "Time (months)", - + ylab = "Ov ..." ... [TRUNCATED] + > orbi_plot_raw_data(df_w_blocks, isotopocules = "15N", + + y = ions.incremental) - When sourcing ‘explanation.R’: - Error: argument is of length zero + When sourcing ‘dual_inlet.R’: + Error: Names can't be empty. + ✖ Empty name found at location 1. Execution halted - ‘explanation.Rmd’ using ‘UTF-8’... failed - ‘weighted_log_rank_tests.Rmd’ using ‘UTF-8’... OK + ‘dual_inlet.Rmd’ using ‘UTF-8’... failed + ‘flow_injection.Rmd’ using ‘UTF-8’... OK + ‘isoxl_demo.Rmd’ using ‘UTF-8’... OK + ‘quick_start.Rmd’ using ‘UTF-8’... OK + ‘shot_noise.Rmd’ using ‘UTF-8’... OK ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘explanation.Rmd’ using rmarkdown - - Quitting from lines 44-73 [unnamed-chunk-1] (explanation.Rmd) - Error: processing vignette 'explanation.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘explanation.Rmd’ - - --- re-building ‘weighted_log_rank_tests.Rmd’ using rmarkdown + --- re-building ‘dual_inlet.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.2Mb + sub-directories of 1Mb or more: + doc 2.0Mb + extdata 3.3Mb ``` -# nprobust +# jenga
-* Version: 0.4.0 +* Version: 1.3.0 * GitHub: NA -* Source code: https://github.com/cran/nprobust -* Date/Publication: 2020-08-26 10:40:02 UTC -* Number of recursive dependencies: 30 +* Source code: https://github.com/cran/jenga +* Date/Publication: 2022-08-18 08:10:02 UTC +* Number of recursive dependencies: 111 + +Run `revdepcheck::cloud_details(, "jenga")` for more info + +
+ +## Newly broken + +* checking whether package ‘jenga’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘ggplot2::is.scale’ by ‘greybox::is.scale’ when loading ‘jenga’ + See ‘/tmp/workdir/jenga/new/jenga.Rcheck/00install.out’ for details. + ``` + +# karel + +
+ +* Version: 0.1.1 +* GitHub: https://github.com/mpru/karel +* Source code: https://github.com/cran/karel +* Date/Publication: 2022-03-26 21:50:02 UTC +* Number of recursive dependencies: 89 -Run `revdepcheck::cloud_details(, "nprobust")` for more info +Run `revdepcheck::cloud_details(, "karel")` for more info
@@ -18359,43 +11842,73 @@ Run `revdepcheck::cloud_details(, "nprobust")` for more info * checking examples ... ERROR ``` - Running examples in ‘nprobust-Ex.R’ failed + Running examples in ‘karel-Ex.R’ failed The error most likely occurred in: - > ### Name: nprobust.plot - > ### Title: Graphical Presentation of Results from 'nprobust' Package. - > ### Aliases: nprobust.plot + > ### Name: acciones + > ### Title: Acciones que Karel puede realizar + > ### Aliases: acciones avanzar girar_izquierda poner_coso juntar_coso + > ### girar_derecha darse_vuelta > > ### ** Examples > - > x <- runif(500) - > y <- sin(4*x) + rnorm(500) - > est <- lprobust(y,x) - > nprobust.plot(est) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics + ... + 1. └─karel::ejecutar_acciones() + 2. ├─base::suppressWarnings(...) + 3. │ └─base::withCallingHandlers(...) + 4. ├─gganimate::animate(...) + 5. └─gganimate:::animate.gganim(...) + 6. └─args$renderer(frames_vars$frame_source, args$fps) + 7. └─gganimate:::png_dim(frames[1]) + 8. └─cli::cli_abort("Provided file ({file}) does not exist") + 9. └─rlang::abort(...) Execution halted ``` +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(karel) + > + > test_check("karel") + [ FAIL 2 | WARN 2 | SKIP 0 | PASS 78 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + 5. ├─gganimate::animate(...) + 6. └─gganimate:::animate.gganim(...) + 7. └─args$renderer(frames_vars$frame_source, args$fps) + 8. └─gganimate:::png_dim(frames[1]) + 9. └─cli::cli_abort("Provided file ({file}) does not exist") + 10. └─rlang::abort(...) + + [ FAIL 2 | WARN 2 | SKIP 0 | PASS 78 ] + Error: Test failures + Execution halted + ``` + ## In both -* checking C++ specification ... NOTE +* checking dependencies in R code ... NOTE ``` - Specified C++11: please drop specification unless essential + Namespace in Imports field not imported from: ‘gifski’ + All declared Imports should be used. ``` -# nzelect +# kDGLM
-* Version: 0.4.0 -* GitHub: NA -* Source code: https://github.com/cran/nzelect -* Date/Publication: 2017-10-02 20:35:23 UTC -* Number of recursive dependencies: 95 +* Version: 1.2.0 +* GitHub: https://github.com/silvaneojunior/kDGLM +* Source code: https://github.com/cran/kDGLM +* Date/Publication: 2024-05-25 09:50:03 UTC +* Number of recursive dependencies: 136 -Run `revdepcheck::cloud_details(, "nzelect")` for more info +Run `revdepcheck::cloud_details(, "kDGLM")` for more info
@@ -18403,149 +11916,97 @@ Run `revdepcheck::cloud_details(, "nzelect")` for more info * checking examples ... ERROR ``` - Running examples in ‘nzelect-Ex.R’ failed + Running examples in ‘kDGLM-Ex.R’ failed The error most likely occurred in: - > ### Name: polls - > ### Title: New Zealand Opinion Polls - > ### Aliases: polls - > ### Keywords: datasets + > ### Name: forecast.fitted_dlm + > ### Title: Auxiliary function for forecasting + > ### Aliases: forecast.fitted_dlm > > ### ** Examples > + > ... - ℹ This can happen when ggplot fails to infer the correct grouping structure in - the data. - ℹ Did you forget to specify a `group` aesthetic or to convert a numerical - variable into a factor? - Warning: Removed 159 rows containing missing values or values outside the scale range - (`geom_line()`). - Error in grid.Call.graphics(C_segments, x$x0, x$y0, x$x1, x$y1, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.segments -> grid.Call.graphics - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘README.Rmd’ - ... - > proportions <- nzge %>% filter(election_year == 2014) %>% - + group_by(voting_place, voting_type) %>% summarise(`proportion Labour` = sum(votes[p .... [TRUNCATED] - `summarise()` has grouped output by 'voting_place'. You can override using the - `.groups` argument. - - > ggpairs(proportions, aes(colour = voting_type), columns = 3:5) - - When sourcing ‘README.R’: - Error: argument is of length zero - Execution halted - - ‘README.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘README.Rmd’ using rmarkdown - - Quitting from lines 64-82 [unnamed-chunk-3] (README.Rmd) - Error: processing vignette 'README.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘README.Rmd’ - - SUMMARY: processing the following file failed: - ‘README.Rmd’ - - Error: Vignette re-building failed. + Warning: `aes_string()` was deprecated in ggplot2 3.0.0. + ℹ Please use tidy evaluation idioms with `aes()`. + ℹ See also `vignette("ggplot2-in-packages")` for more information. + ℹ The deprecated feature was likely used in the kDGLM package. + Please report the issue at . + Scale for y is already present. + Adding another scale for y, which will replace the existing scale. + Error in pm[[2]] : subscript out of bounds + Calls: forecast ... lapply -> -> ggplotly.ggplot -> gg2list Execution halted ``` -## In both - -* checking installed package size ... NOTE - ``` - installed size is 5.3Mb - sub-directories of 1Mb or more: - data 5.0Mb - ``` - -* checking data for non-ASCII characters ... NOTE - ``` - Note: found 6409 marked UTF-8 strings - ``` - -# OBIC +# Keyboard
-* Version: 3.0.3 -* GitHub: https://github.com/AgroCares/Open-Bodem-Index-Calculator -* Source code: https://github.com/cran/OBIC -* Date/Publication: 2024-09-09 08:30:02 UTC -* Number of recursive dependencies: 75 +* Version: 0.1.3 +* GitHub: NA +* Source code: https://github.com/cran/Keyboard +* Date/Publication: 2022-08-11 10:10:17 UTC +* Number of recursive dependencies: 30 -Run `revdepcheck::cloud_details(, "OBIC")` for more info +Run `revdepcheck::cloud_details(, "Keyboard")` for more info
## Newly broken -* checking running R code from vignettes ... ERROR +* checking examples ... ERROR ``` - Errors in running code in vignettes: - when running code in ‘obic_workability.Rmd’ - ... - > gg2 <- ggplot(data = dt, aes(x = field, fill = field)) + - + geom_col(aes(y = I_P_WO)) + theme_bw() + theme(axis.text = element_text(size = 10, - .... [TRUNCATED] + Running examples in ‘Keyboard-Ex.R’ failed + The error most likely occurred in: + + > ### Name: select.mtd.comb.kb + > ### Title: Maximum Tolerated Dose (MTD) Selection for Drug-combination + > ### Trials + > ### Aliases: select.mtd.comb.kb + > + > ### ** Examples + > + ... + 0.15 0.19 0.27 NA NA + NA NA 0.50 NA NA - > (gg | gg2) + plot_layout(guides = "collect") + plot_annotation(caption = "Baseline workability scores.", - + theme = theme(plot.caption = element .... [TRUNCATED] + NOTE: no estimate is provided for the doses at which no patient was treated. - When sourcing ‘obic_workability.R’: - Error: object is not a unit + > plot_kb(sel.comb) + Error in is.element(strpattern, c("none", names(objectPlot))) : + unused argument (c("none", names(objectPlot))) + Calls: plot_kb Execution halted - - ‘description-of-the-columns.Rmd’ using ‘UTF-8’... OK - ‘obic_introduction.Rmd’ using ‘UTF-8’... OK - ‘obic_score_aggregation.Rmd’ using ‘UTF-8’... OK - ‘obic_water_functions.Rmd’ using ‘UTF-8’... OK - ‘obic_workability.Rmd’ using ‘UTF-8’... failed ``` -* checking re-building of vignette outputs ... NOTE +* checking whether package ‘Keyboard’ can be installed ... WARNING ``` - Error(s) in re-building vignettes: - --- re-building ‘description-of-the-columns.Rmd’ using rmarkdown - --- finished re-building ‘description-of-the-columns.Rmd’ - - --- re-building ‘obic_introduction.Rmd’ using rmarkdown + Found the following significant warnings: + Note: possible error in 'is.element(strpattern, ': unused argument (c("none", names(objectPlot))) + See ‘/tmp/workdir/Keyboard/new/Keyboard.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. ``` -## In both - -* checking installed package size ... NOTE +* checking R code for possible problems ... NOTE ``` - installed size is 6.0Mb - sub-directories of 1Mb or more: - data 4.0Mb - doc 1.4Mb + plot_kb: possible error in is.element(strpattern, c("none", + names(objectPlot))): unused argument (c("none", names(objectPlot))) ``` -# oceanic +# latentcor
-* Version: 0.1.7 +* Version: 2.0.1 * GitHub: NA -* Source code: https://github.com/cran/oceanic -* Date/Publication: 2024-06-11 03:40:02 UTC -* Number of recursive dependencies: 52 +* Source code: https://github.com/cran/latentcor +* Date/Publication: 2022-09-05 20:50:02 UTC +* Number of recursive dependencies: 142 -Run `revdepcheck::cloud_details(, "oceanic")` for more info +Run `revdepcheck::cloud_details(, "latentcor")` for more info
@@ -18553,54 +12014,40 @@ Run `revdepcheck::cloud_details(, "oceanic")` for more info * checking examples ... ERROR ``` - Running examples in ‘oceanic-Ex.R’ failed + Running examples in ‘latentcor-Ex.R’ failed The error most likely occurred in: - > ### Name: dotplot - > ### Title: dotplot - > ### Aliases: dotplot + > ### Name: latentcor + > ### Title: Estimate latent correlation for mixed types. + > ### Aliases: latentcor > > ### ** Examples > - > dotplot(141,23) + > # Example 1 - truncated data type, same type for all variables ... - 4. └─ggplot2:::ggplot_build.ggplot(x) - 5. └─layout$setup(data, plot$data, plot$plot_env) - 6. └─ggplot2 (local) setup(..., self = self) - 7. └─self$coord$setup_params(data) - 8. └─ggplot2 (local) setup_params(..., self = self) - 9. └─ggplot2:::parse_coord_expand(expand = self$expand %||% TRUE) - 10. └─ggplot2:::check_logical(expand) - 11. └─ggplot2:::stop_input_type(...) - 12. └─rlang::abort(message, ..., call = call, arg = arg) + > R_approx = latentcor(X = X, types = "tru", method = "approx")$R + > proc.time() - start_time + user system elapsed + 0.018 0.000 0.017 + > # Heatmap for latent correlation matrix. + > Heatmap_R_approx = latentcor(X = X, types = "tru", method = "approx", + + showplot = TRUE)$plotR + Error in pm[[2]] : subscript out of bounds + Calls: latentcor ... %>% -> layout -> ggplotly -> ggplotly.ggplot -> gg2list Execution halted ``` -## In both - -* checking installed package size ... NOTE - ``` - installed size is 8.1Mb - sub-directories of 1Mb or more: - data 8.0Mb - ``` - -* checking data for non-ASCII characters ... NOTE - ``` - Note: found 1242 marked UTF-8 strings - ``` - -# oddsratio +# lcars
-* Version: 2.0.1 -* GitHub: https://github.com/pat-s/oddsratio -* Source code: https://github.com/cran/oddsratio -* Date/Publication: 2020-05-24 22:00:02 UTC -* Number of recursive dependencies: 63 +* Version: 0.4.0 +* GitHub: https://github.com/leonawicz/lcars +* Source code: https://github.com/cran/lcars +* Date/Publication: 2024-09-11 22:52:42 UTC +* Number of recursive dependencies: 87 -Run `revdepcheck::cloud_details(, "oddsratio")` for more info +Run `revdepcheck::cloud_details(, "lcars")` for more info
@@ -18608,72 +12055,59 @@ Run `revdepcheck::cloud_details(, "oddsratio")` for more info * checking examples ... ERROR ``` - Running examples in ‘oddsratio-Ex.R’ failed + Running examples in ‘lcars-Ex.R’ failed The error most likely occurred in: - > ### Name: insert_or - > ### Title: Insert odds ratios of GAM(M)s into smoothing function - > ### Aliases: insert_or + > ### Name: lcars_border + > ### Title: LCARS border plot + > ### Aliases: lcars_border > > ### ** Examples > - > library(oddsratio) + > lcars_border() ... - 5. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 6. └─ggplot2:::new_layer_names(object, names(plot$layers)) - 7. └─vctrs::vec_as_names(names, repair = "check_unique") - 8. └─vctrs (local) ``() - 9. └─vctrs:::validate_unique(names = names, arg = arg, call = call) - 10. └─vctrs:::stop_names_cannot_be_empty(names, call = call) - 11. └─vctrs:::stop_names(...) - 12. └─vctrs:::stop_vctrs(...) - 13. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : + font family '0.5' not found in PostScript font database + Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : + font family '0.5' not found in PostScript font database + Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : + font family '0.5' not found in PostScript font database + Error in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : + invalid font type + Calls: lcars_border ... drawDetails -> drawDetails.text -> grid.Call.graphics Execution halted ``` * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘oddsratio.Rmd’ + when running code in ‘lcars.Rmd’ ... - + pred = "x2", values = c(0.4, 0.6)) - - > insert_or(plot, or_object2, or_yloc = 2.1, values_yloc = 2, - + line_col = "green4", text_col = "black", rect_col = "green4", - + rect_alpha = .... [TRUNCATED] + Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : + font family '0.5' not found in PostScript font database + Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : + font family '0.5' not found in PostScript font database + Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : + font family '0.5' not found in PostScript font database - When sourcing ‘oddsratio.R’: - Error: Names can't be empty. - ✖ Empty name found at location 1. + When sourcing ‘lcars.R’: + Error: invalid font type Execution halted - ‘oddsratio.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘oddsratio.Rmd’ using rmarkdown - ``` - -## In both - -* checking Rd cross-references ... NOTE - ``` - Package unavailable to check Rd xrefs: ‘gam’ + ‘lcars.Rmd’ using ‘UTF-8’... failed ``` -# ofpetrial +# lemon
-* Version: 0.1.1 -* GitHub: https://github.com/DIFM-Brain/ofpetrial -* Source code: https://github.com/cran/ofpetrial -* Date/Publication: 2024-05-15 08:50:03 UTC -* Number of recursive dependencies: 136 +* Version: 0.5.0 +* GitHub: https://github.com/stefanedwards/lemon +* Source code: https://github.com/cran/lemon +* Date/Publication: 2024-11-10 18:20:02 UTC +* Number of recursive dependencies: 75 -Run `revdepcheck::cloud_details(, "ofpetrial")` for more info +Run `revdepcheck::cloud_details(, "lemon")` for more info
@@ -18681,108 +12115,96 @@ Run `revdepcheck::cloud_details(, "ofpetrial")` for more info * checking examples ... ERROR ``` - Running examples in ‘ofpetrial-Ex.R’ failed + Running examples in ‘lemon-Ex.R’ failed The error most likely occurred in: - > ### Name: check_ortho_with_chars - > ### Title: Check the orthogonality with field/topographic characteristics - > ### Aliases: check_ortho_with_chars + > ### Name: annotate_y_axis + > ### Title: Annotations on the axis + > ### Aliases: annotate_y_axis annotate_x_axis > > ### ** Examples > - > data(td_single_input) + > library(ggplot2) ... - 33. │ └─ggplot2:::`+.gg`(init, x[[i]]) - 34. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 35. │ ├─ggplot2::ggplot_add(object, p, objectname) - 36. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 37. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 38. └─base::.handleSimpleError(...) - 39. └─purrr (local) h(simpleError(msg, call)) - 40. └─cli::cli_abort(...) - 41. └─rlang::abort(...) + is.element + + > + > p <- ggplot(mtcars, aes(mpg, hp, colour=disp)) + geom_point() + > + > l <- p + annotate_y_axis('mark at', y=200, tick=TRUE) + > l + Error in identicalUnits(x) : object is not a unit + Calls: ... polylineGrob -> is.unit -> unit.c -> identicalUnits Execution halted ``` - -# OmicNavigator - -
- -* Version: 1.13.13 -* GitHub: https://github.com/abbvie-external/OmicNavigator -* Source code: https://github.com/cran/OmicNavigator -* Date/Publication: 2023-08-25 20:40:02 UTC -* Number of recursive dependencies: 86 - -Run `revdepcheck::cloud_details(, "OmicNavigator")` for more info - -
- -## Newly broken - -* checking tests ... ERROR - ``` - Running ‘tinytest.R’ - Running the tests in ‘tests/tinytest.R’ failed. - Complete output: - > # Test files in inst/tinytest/ - > if (requireNamespace("tinytest", quietly = TRUE)) { - + suppressMessages(tinytest::test_package("OmicNavigator")) - + } - - testAdd.R..................... 0 tests - testAdd.R..................... 0 tests + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(lemon) + > + > + > if (TRUE) { + + test_check("lemon") + + } #else { ... - testPlot.R.................... 140 tests OK - testPlot.R.................... 140 tests OK - testPlot.R.................... 141 tests OK - testPlot.R.................... 141 tests OK - testPlot.R.................... 141 tests OK - testPlot.R.................... 142 tests OK - testPlot.R.................... 142 tests OK - testPlot.R.................... 143 tests OK Error in pm[[2]] : subscript out of bounds - Calls: suppressMessages ... plotStudy -> f -> -> ggplotly.ggplot -> gg2list + 13. └─gtable::gtable_add_row_space(panel_table, theme$panel.spacing.y %||% theme$panel.spacing) + 14. └─cli::cli_abort("{.arg height} must be of length 1 or nrow - 1") + 15. └─rlang::abort(...) + + [ FAIL 2 | WARN 13 | SKIP 3 | PASS 138 ] + Deleting unused snapshots: + • facet/facet-rep-wrap-spacing.svg + • facet_aux/facet-rep-wrap.svg + Error: Test failures Execution halted ``` -## In both - -* checking re-building of vignette outputs ... NOTE +* checking running R code from vignettes ... ERROR ``` - Error(s) in re-building vignettes: - --- re-building ‘OmicNavigatorAPI.Rnw’ using Sweave - OmicNavigator R package version: 1.13.13 - The app is not installed. Install it with installApp() - Installing study "ABC" in /tmp/RtmpFyTBK9/file1d2273c45a46 - Exporting study "ABC" as an R package - Note: No maintainer email was specified. Using the placeholder: Unknown - Calculating pairwise overlaps. This may take a while... - Exported study to /tmp/RtmpFyTBK9/ONstudyABC - Success! - ... - l.14 ^^M - - ! ==> Fatal error occurred, no output PDF file produced! - --- failed re-building ‘OmicNavigatorUsersGuide.Rnw’ + Errors in running code in vignettes: + when running code in ‘capped-axes.Rmd’ + ... + > p + coord_capped_cart(bottom = "right") - SUMMARY: processing the following files failed: - ‘OmicNavigatorAPI.Rnw’ ‘OmicNavigatorUsersGuide.Rnw’ + > p + coord_capped_cart(bottom = "right", left = "none") - Error: Vignette re-building failed. + > ggplot(dat1, aes(gp, y)) + geom_point(position = position_jitter(width = 0.2, + + height = 0)) + coord_capped_cart(left = "none", bottom = bracke .... [TRUNCATED] + + ... + When sourcing ‘legends.R’: + Error: Could not find panel named `panel-1-5`. Execution halted + + ‘capped-axes.Rmd’ using ‘UTF-8’... failed + ‘facet-rep-labels.Rmd’ using ‘UTF-8’... failed + ‘geoms.Rmd’ using ‘UTF-8’... OK + ‘gtable_show_lemonade.Rmd’ using ‘UTF-8’... OK + ‘legends.Rmd’ using ‘UTF-8’... failed + ‘lemon_print.Rmd’ using ‘UTF-8’... OK + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘capped-axes.Rmd’ using rmarkdown ``` -# omu +# lfproQC
-* Version: 1.1.2 -* GitHub: https://github.com/connor-reid-tiffany/Omu -* Source code: https://github.com/cran/omu -* Date/Publication: 2024-03-06 23:40:02 UTC -* Number of recursive dependencies: 129 +* Version: 1.4.0 +* GitHub: https://github.com/kabilansbio/lfproQC +* Source code: https://github.com/cran/lfproQC +* Date/Publication: 2024-10-10 13:10:02 UTC +* Number of recursive dependencies: 145 -Run `revdepcheck::cloud_details(, "omu")` for more info +Run `revdepcheck::cloud_details(, "lfproQC")` for more info
@@ -18790,302 +12212,277 @@ Run `revdepcheck::cloud_details(, "omu")` for more info * checking examples ... ERROR ``` - Running examples in ‘omu-Ex.R’ failed + Running examples in ‘lfproQC-Ex.R’ failed The error most likely occurred in: - > ### Name: PCA_plot - > ### Title: Create a PCA plot - > ### Aliases: PCA_plot + > ### Name: Boxplot_data + > ### Title: Creating Boxplot for a dataset + > ### Aliases: Boxplot_data > > ### ** Examples > - > PCA_plot(count_data = c57_nos2KO_mouse_countDF, metadata = c57_nos2KO_mouse_metadata, - + variable = "Treatment", color = "Treatment", response_variable = "Metabolite") - Error in if (new_name %in% existing) { : argument is of length zero - Calls: PCA_plot ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > Boxplot_data(yeast_data) + Using Majority protein IDs as id variables + Warning: Removed 269 rows containing non-finite outside the scale range + (`stat_boxplot()`). + Error in pm[[2]] : subscript out of bounds + Calls: Boxplot_data -> -> ggplotly.ggplot -> gg2list Execution halted ``` -* checking re-building of vignette outputs ... NOTE +* checking running R code from vignettes ... ERROR ``` - Error(s) in re-building vignettes: + Errors in running code in vignettes: + when running code in ‘user_guide.Rmd’ ... - --- re-building ‘Omu_vignette.Rmd’ using rmarkdown - - Quitting from lines 97-104 [unnamed-chunk-4] (Omu_vignette.Rmd) - Error: processing vignette 'Omu_vignette.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘Omu_vignette.Rmd’ + > yeast$`Best combinations` + PCV_best_combination PEV_best_combination PMAD_best_combination + 1 rlr_knn, rlr_lls vsn_lls rlr_lls - SUMMARY: processing the following file failed: - ‘Omu_vignette.Rmd’ + > Boxplot_data(yeast$rlr_knn_data) + Using Majority protein IDs as id variables - Error: Vignette re-building failed. + When sourcing ‘user_guide.R’: + Error: subscript out of bounds Execution halted + + ‘user_guide.Rmd’ using ‘UTF-8’... failed ``` -## In both - -* checking running R code from vignettes ... ERROR +* checking re-building of vignette outputs ... NOTE ``` - Errors in running code in vignettes: - when running code in ‘Omu_vignette.Rmd’ + Error(s) in re-building vignettes: ... + --- re-building ‘user_guide.Rmd’ using rmarkdown - > library(knitr) + Quitting from lines 55-56 [unnamed-chunk-8] (user_guide.Rmd) + Error: processing vignette 'user_guide.Rmd' failed with diagnostics: + subscript out of bounds + --- failed re-building ‘user_guide.Rmd’ - > load("../data/c57_nos2KO_mouse_countDF.rda") - Warning in readChar(con, 5L, useBytes = TRUE) : - cannot open compressed file '../data/c57_nos2KO_mouse_countDF.rda', probable reason 'No such file or directory' + SUMMARY: processing the following file failed: + ‘user_guide.Rmd’ - When sourcing ‘Omu_vignette.R’: - Error: cannot open the connection + Error: Vignette re-building failed. Execution halted - - ‘Omu_vignette.Rmd’ using ‘UTF-8’... failed ``` -# OncoBayes2 +# lilikoi
-* Version: 0.8-9 +* Version: 2.1.1 * GitHub: NA -* Source code: https://github.com/cran/OncoBayes2 -* Date/Publication: 2023-07-20 18:40:05 UTC -* Number of recursive dependencies: 100 +* Source code: https://github.com/cran/lilikoi +* Date/Publication: 2022-10-05 19:00:02 UTC +* Number of recursive dependencies: 215 -Run `revdepcheck::cloud_details(, "OncoBayes2")` for more info +Run `revdepcheck::cloud_details(, "lilikoi")` for more info
## Newly broken -* checking examples ... ERROR - ``` - Running examples in ‘OncoBayes2-Ex.R’ failed - The error most likely occurred in: - - > ### Name: plot_blrm - > ### Title: Plot a fitted model - > ### Aliases: plot_blrm plot_toxicity_curve plot_toxicity_intervals - > ### plot_toxicity_intervals_stacked plot_toxicity_curve.blrmfit - > ### plot_toxicity_curve.blrm_trial plot_toxicity_intervals.blrmfit - > ### plot_toxicity_intervals.blrm_trial - > ### plot_toxicity_intervals_stacked.blrmfit - ... - > # Plot the dose-toxicity curve - > plot_toxicity_curve(blrmfit, - + x = "drug_A", - + group = ~ group_id * drug_B, - + newdata = subset(dose_info_combo2, group_id == "trial_AB"), - + facet_args = list(ncol = 4)) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -## In both - -* checking installed package size ... NOTE +* checking whether package ‘lilikoi’ can be installed ... WARNING ``` - installed size is 76.7Mb - sub-directories of 1Mb or more: - libs 74.7Mb + Found the following significant warnings: + Note: possible error in 'is.element(method, c("knn"))': unused argument (c("knn")) + Note: possible error in 'is.element(method, c("standard", ': unused argument (c("standard", "quantile", "median", "knn")) + See ‘/tmp/workdir/lilikoi/new/lilikoi.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. ``` -* checking for GNU extensions in Makefiles ... NOTE +* checking R code for possible problems ... NOTE ``` - GNU make is a SystemRequirements. + lilikoi.preproc_knn: possible error in is.element(method, c("knn")): + unused argument (c("knn")) + lilikoi.preproc_norm: possible error in is.element(method, + c("standard", "quantile", "median", "knn")): unused argument + (c("standard", "quantile", "median", "knn")) ``` -# oncomsm +# LMoFit
-* Version: 0.1.4 -* GitHub: https://github.com/Boehringer-Ingelheim/oncomsm -* Source code: https://github.com/cran/oncomsm -* Date/Publication: 2023-04-17 07:00:02 UTC -* Number of recursive dependencies: 126 +* Version: 0.1.7 +* GitHub: NA +* Source code: https://github.com/cran/LMoFit +* Date/Publication: 2024-05-14 07:33:23 UTC +* Number of recursive dependencies: 62 -Run `revdepcheck::cloud_details(, "oncomsm")` for more info +Run `revdepcheck::cloud_details(, "LMoFit")` for more info
## Newly broken -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(dplyr) - - Attaching package: 'dplyr' - - The following objects are masked from 'package:stats': - - filter, lag - ... - 10. └─grid::unit.c(legend.box.margin[4], widths, legend.box.margin[2]) - 11. └─grid:::identicalUnits(x) - - [ FAIL 1 | WARN 0 | SKIP 2 | PASS 59 ] - Deleting unused snapshots: - • plots/plot-mstate-srp-model-2.svg - • plots/plot-mstate-srp-model-3.svg - • plots/plot-srp-model-2.svg - Error: Test failures - Execution halted - ``` - * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘avoiding-bias.Rmd’ + when running code in ‘LMoFit.Rmd’ ... - > mdl <- create_srpmodel(A = define_srp_prior(median_t_q05 = c(1, - + 4, 12), median_t_q95 = c(6, 8, 36), shape_q05 = c(0.99, 0.99, - + 0.99), s .... [TRUNCATED] - - > plot(mdl, confidence = 0.9) - - ... - - > plot(mdl, parameter_sample = smpl_prior, confidence = 0.75) + > lspace_BrIII - When sourcing ‘oncomsm.R’: - Error: object is not a unit + When sourcing ‘LMoFit.R’: + Error: Problem while setting up geom aesthetics. + ℹ Error occurred in the 1st layer. + Caused by error in `compute_geom_2()`: + ! unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), NULL, NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, + c(0, 0, 0, 2.75), NULL, TRUE), list(NULL, NULL, "grey30", 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.2, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.2, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 1, NULL, NULL, NULL, c(0, 2.2, 0, 0), NULL, TRUE), NULL, Execution halted - ‘avoiding-bias.Rmd’ using ‘UTF-8’... failed - ‘oncomsm.Rmd’ using ‘UTF-8’... failed - ‘prior-choice.Rmd’ using ‘UTF-8’... OK + ‘LMoFit.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘avoiding-bias.Rmd’ using rmarkdown - - Quitting from lines 35-46 [unnamed-chunk-2] (avoiding-bias.Rmd) - Error: processing vignette 'avoiding-bias.Rmd' failed with diagnostics: - object is not a unit - --- failed re-building ‘avoiding-bias.Rmd’ + ... + --- re-building ‘LMoFit.Rmd’ using rmarkdown - --- re-building ‘oncomsm.Rmd’ using rmarkdown + Quitting from lines 236-237 [unnamed-chunk-15] (LMoFit.Rmd) + Error: processing vignette 'LMoFit.Rmd' failed with diagnostics: + Problem while setting up geom aesthetics. + ℹ Error occurred in the 1st layer. + Caused by error in `compute_geom_2()`: + ! unused argument (theme = list(list("black", 0.5, 1, "butt", FALSE, TRUE), list("white", "black", 0.5, 1, TRUE), list("", "plain", "black", 11, 0.5, 0.5, 0, 0.9, c(0, 0, 0, 0), FALSE, TRUE), NULL, NULL, NULL, list(NULL, NULL, NULL, NULL, NULL, 1, NULL, NULL, c(2.75, 0, 0, 0), NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, 0, NULL, NULL, c(0, 0, 2.75, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, 90, NULL, c(0, 2.75, 0, 0), NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, NULL, 1, -90, NULL, + ... + NULL, NULL, 0.8, NULL, NULL, NULL, NULL, NULL, NULL, TRUE), NULL, list(NULL, NULL, NULL, NULL, 0, NULL, NULL, NULL, NULL, NULL, TRUE), NULL, "right", NULL, NULL, NULL, "center", NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, c(0, 0, 0, 0), list(), 11, list("white", NA, NULL, NULL, TRUE), list(), 5.5, NULL, NULL, list("grey92", NULL, NULL, NULL, FALSE, TRUE), list(), list(), NULL, NULL, NULL, NULL, FALSE, list(NULL, "white", NULL, NULL, TRUE), list(NULL, NULL, NULL, 1.2, 0, 1, NULL, NULL, c(0, + 0, 5.5, 0), NULL, TRUE), "panel", list(NULL, NULL, NULL, NULL, 0, 1, NULL, NULL, c(0, 0, 5.5, 0), NULL, TRUE), list(NULL, NULL, NULL, 0.8, 1, 1, NULL, NULL, c(5.5, 0, 0, 0), NULL, TRUE), "panel", list(NULL, NULL, NULL, 1.2, 0.5, 0.5, NULL, NULL, NULL, NULL, TRUE), "topleft", NULL, c(5.5, 5.5, 5.5, 5.5), list("white", "black", 2, NULL, TRUE), NULL, NULL, "inherit", "inside", list(NULL, NULL, "grey10", 0.8, NULL, NULL, NULL, NULL, c(4.4, 4.4, 4.4, 4.4), NULL, TRUE), NULL, NULL, NULL, list(NULL, NULL, + NULL, NULL, NULL, NULL, -90, NULL, NULL, NULL, TRUE), list(NULL, NULL, NULL, NULL, NULL, NULL, 90, NULL, NULL, NULL, TRUE), NULL, 2.75, 2.75, list("black", "white", "#3366FF", 0.5, 0.5, 1, 1, "", 3.86605783866058, 1.5, 19, TRUE), 5.5, c(5.5, 5.5, 5.5, 5.5))) + --- failed re-building ‘LMoFit.Rmd’ - Quitting from lines 211-215 [plotting-the-prior] (oncomsm.Rmd) - Error: processing vignette 'oncomsm.Rmd' failed with diagnostics: - object is not a unit - --- failed re-building ‘oncomsm.Rmd’ + SUMMARY: processing the following file failed: + ‘LMoFit.Rmd’ - --- re-building ‘prior-choice.Rmd’ using rmarkdown + Error: Vignette re-building failed. + Execution halted ``` ## In both * checking installed package size ... NOTE ``` - installed size is 59.2Mb + installed size is 7.0Mb sub-directories of 1Mb or more: - doc 1.1Mb - libs 57.0Mb - ``` - -* checking for GNU extensions in Makefiles ... NOTE - ``` - GNU make is a SystemRequirements. + data 6.5Mb ``` -# OneSampleLogRankTest +# LocalCop
-* Version: 0.9.2 -* GitHub: NA -* Source code: https://github.com/cran/OneSampleLogRankTest -* Date/Publication: 2024-02-03 12:30:15 UTC -* Number of recursive dependencies: 106 +* Version: 0.0.2 +* GitHub: https://github.com/mlysy/LocalCop +* Source code: https://github.com/cran/LocalCop +* Date/Publication: 2024-09-12 17:41:03 UTC +* Number of recursive dependencies: 91 -Run `revdepcheck::cloud_details(, "OneSampleLogRankTest")` for more info +Run `revdepcheck::cloud_details(, "LocalCop")` for more info
## Newly broken -* checking examples ... ERROR +* checking re-building of vignette outputs ... NOTE ``` - Running examples in ‘OneSampleLogRankTest-Ex.R’ failed - The error most likely occurred in: - - > ### Name: plotKM - > ### Title: Plot Kaplan-Meier Curve against Population - > ### Aliases: plotKM - > - > ### ** Examples - > - > # load data - > data(dataSurv_small) - > data(dataPop_2018_2021) - > - > plotKM(dataSurv_small, dataPop_2018_2021, type = "exact") - Error in if (new_name %in% existing) { : argument is of length zero - Calls: plotKM ... add_ggplot -> ggplot_add -> ggplot_add.Layer -> new_layer_names - Execution halted + Error(s) in re-building vignettes: + --- re-building ‘LocalCop.Rmd’ using rmarkdown ``` +## In both + * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘oneSampleLogRankTest.Rmd’ + when running code in ‘LocalCop.Rmd’ ... - $estimate - std_mort_ratio_est lwr upr - 1 1.531173 0.8302562 2.823816 + > tibble(x = x0, True = BiCopEta2Tau(family, eta = eta_fun(x0)), + + Fitted = BiCopEta2Tau(fitseq$eta, family = family)) %>% pivot_longer(True:Fitt .... [TRUNCATED] + Warning: Removed 51 rows containing missing values or values outside the scale range + (`geom_line()`). + Warning: Removed 51 rows containing missing values or values outside the scale range + (`geom_point()`). + When sourcing ‘LocalCop.R’: + Error: invalid line type: must be length 2, 4, 6 or 8 + Execution halted - > plotKM(dataSurv, dataPop_2018_2021_race_sex_eth, type = "approximate") + ‘LocalCop.Rmd’ using ‘UTF-8’... failed + ``` + +* checking installed package size ... NOTE + ``` + installed size is 56.2Mb + sub-directories of 1Mb or more: + libs 55.7Mb + ``` + +# lognorm + +
+ +* Version: 0.1.10 +* GitHub: https://github.com/bgctw/lognorm +* Source code: https://github.com/cran/lognorm +* Date/Publication: 2021-11-21 17:50:10 UTC +* Number of recursive dependencies: 73 + +Run `revdepcheck::cloud_details(, "lognorm")` for more info + +
+ +## Newly broken + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘lognorm.Rmd’ + ... + > ans %>% ggplot(aes(x, density, linetype = sigmaStar, + + color = sigmaStar)) + geom_area(data = ansNormal, aes(linetype = NA, + + color = NA), .... [TRUNCATED] + Warning: A numeric `legend.position` argument in `theme()` was deprecated in ggplot2 + 3.5.0. + ℹ Please use the `legend.position.inside` argument of `theme()` instead. - When sourcing ‘oneSampleLogRankTest.R’: - Error: argument is of length zero + When sourcing ‘lognorm.R’: + Error: invalid hex digit in 'color' or 'lty' Execution halted - ‘oneSampleLogRankTest.Rmd’ using ‘UTF-8’... failed + ‘lognorm.Rmd’ using ‘UTF-8’... failed + ‘lognormalDiff.Rmd’ using ‘UTF-8’... OK + ‘lognormalSum.Rmd’ using ‘UTF-8’... OK ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - ... - --- re-building ‘oneSampleLogRankTest.Rmd’ using rmarkdown + --- re-building ‘lognorm.Rmd’ using rmarkdown - Quitting from lines 74-77 [unnamed-chunk-3] (oneSampleLogRankTest.Rmd) - Error: processing vignette 'oneSampleLogRankTest.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘oneSampleLogRankTest.Rmd’ + Quitting from lines 51-78 [lognormalDensities] (lognorm.Rmd) + Error: processing vignette 'lognorm.Rmd' failed with diagnostics: + invalid hex digit in 'color' or 'lty' + --- failed re-building ‘lognorm.Rmd’ - SUMMARY: processing the following file failed: - ‘oneSampleLogRankTest.Rmd’ - - Error: Vignette re-building failed. - Execution halted + --- re-building ‘lognormalDiff.Rmd’ using rmarkdown ``` -# onpoint +# lsl
-* Version: 1.0.5 -* GitHub: https://github.com/r-spatialecology/onpoint -* Source code: https://github.com/cran/onpoint -* Date/Publication: 2024-01-10 14:03:06 UTC -* Number of recursive dependencies: 72 +* Version: 0.5.6 +* GitHub: NA +* Source code: https://github.com/cran/lsl +* Date/Publication: 2017-11-08 05:30:21 UTC +* Number of recursive dependencies: 38 -Run `revdepcheck::cloud_details(, "onpoint")` for more info +Run `revdepcheck::cloud_details(, "lsl")` for more info
@@ -19093,40 +12490,47 @@ Run `revdepcheck::cloud_details(, "onpoint")` for more info * checking examples ... ERROR ``` - Running examples in ‘onpoint-Ex.R’ failed + Running examples in ‘lsl-Ex.R’ failed The error most likely occurred in: - > ### Name: plot.env_summarized - > ### Title: plot.env_summarized - > ### Aliases: plot.env_summarized + > ### Name: lslSEM-class + > ### Title: A Reference Class for Learning a SEM model via penalized + > ### likelihood. + > ### Aliases: lslSEM-class lslSEM > > ### ** Examples > - > set.seed(42) ... - 39. - - Done. > - > x <- summarize_envelope(cluster_env) - > plot(x) - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics + > rc_sem <- lslSEM() + > rc_sem$input(raw = lavaan::HolzingerSwineford1939) + > rc_sem$specify(pattern = list(lambda = lambda)) + > rc_sem$learn(penalty = list(type = "l1", gamma = seq(.05, .10, .05)), variable = 7:15) + > rc_sem$draw(type = "individual", object = "lambda") + Error in is.element(path[, 1], theta_names_penalized) : + unused argument (theta_names_penalized) + Calls: Execution halted ``` -# ordbetareg +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# MAINT.Data
-* Version: 0.7.2 -* GitHub: https://github.com/saudiwin/ordbetareg_pack -* Source code: https://github.com/cran/ordbetareg -* Date/Publication: 2023-08-10 07:30:02 UTC -* Number of recursive dependencies: 174 +* Version: 2.7.1 +* GitHub: NA +* Source code: https://github.com/cran/MAINT.Data +* Date/Publication: 2023-04-04 08:10:02 UTC +* Number of recursive dependencies: 77 -Run `revdepcheck::cloud_details(, "ordbetareg")` for more info +Run `revdepcheck::cloud_details(, "MAINT.Data")` for more info
@@ -19134,148 +12538,220 @@ Run `revdepcheck::cloud_details(, "ordbetareg")` for more info * checking examples ... ERROR ``` - Running examples in ‘ordbetareg-Ex.R’ failed + Running examples in ‘MAINT.Data-Ex.R’ failed The error most likely occurred in: - > ### Name: pp_check_ordbeta - > ### Title: Accurate Posterior Predictive Plots for Ordbetareg Models - > ### Aliases: pp_check_ordbeta + > ### Name: ConfMat + > ### Title: Confussion Matrices for classification results + > ### Aliases: ConfMat + > ### Keywords: discriminant analysis error rates > > ### ** Examples > - > ... - 16. │ └─ggplot2 (local) setup_params(...) - 17. │ └─ggplot2:::make_summary_fun(...) - 18. │ └─rlang::as_function(fun.data) - 19. │ └─base::get(x, envir = env, mode = "function") - 20. └─base::.handleSimpleError(...) - 21. └─rlang (local) h(simpleError(msg, call)) - 22. └─handlers[[1L]](cnd) - 23. └─cli::cli_abort(...) - 24. └─rlang::abort(...) + > # on the temperatures by quarter in 60 Chinese meteorological stations. + > + > ChinaT <- IData(ChinaTemp[1:8],VarNames=c("T1","T2","T3","T4")) + > + > #Linear Discriminant Analysis + > + > ChinaT.lda <- lda(ChinaT,ChinaTemp$GeoReg) + Error in is.element(1, Config) : unused argument (Config) + Calls: lda -> lda -> .local -> IdtNmle Execution halted ``` -## In both +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > test_check("MAINT.Data") + Loading required package: MAINT.Data + Loading required package: Rcpp + + Attaching package: 'MAINT.Data' + + ... + ── Error ('test-mle.R:49:5'): mle computes correct standar errors for default Gaussian models ── + Error in `is.element(Conf, 1:4)`: unused argument (1:4) + Backtrace: + ▆ + 1. ├─MAINT.Data::mle(AbaloneIdt, CovCase = Cv) at test-mle.R:49:5 + 2. └─MAINT.Data::mle(AbaloneIdt, CovCase = Cv) + + [ FAIL 10 | WARN 24 | SKIP 0 | PASS 74 ] + Error: Test failures + Execution halted + ``` -* checking installed package size ... NOTE +* checking whether package ‘MAINT.Data’ can be installed ... WARNING ``` - installed size is 8.1Mb - sub-directories of 1Mb or more: - data 7.5Mb + Found the following significant warnings: + Note: possible error in 'is.element(4, CovCase)': unused argument (CovCase) + Note: possible error in 'is.element(model, names(x@allres$RepresHom))': unused argument (names(x@allres$RepresHom)) + Note: possible error in 'is.element(Conf, 1:4)': unused argument (1:4) + Note: possible error in 'is.element(ModE@ModelConfig[1], ': unused argument (RestMod) + Note: possible error in 'is.element(nCovCases + ': unused argument (RestMod) + Note: possible error in 'is.element(Config, 2:5)': unused argument (2:5) + Note: possible error in 'is.element(Config, 1:5)': unused argument (1:5) + Note: possible error in 'is.element(2, Config)': unused argument (Config) + Note: possible error in 'is.element(1, Config)': unused argument (Config) + ... + Note: possible error in 'is.element(5, Config)': unused argument (Config) + Note: possible error in 'is.element(4, Config)': unused argument (Config) + Note: possible error in 'is.element(3, Config)': unused argument (Config) + Note: possible error in 'is.element(x, Rewind)': unused argument (Rewind) + Note: possible error in 'is.element(Conf, 1:5)': unused argument (1:5) + Note: possible error in 'is.element(Config, c(1, ': unused argument (c(1, 4)) + See ‘/tmp/workdir/MAINT.Data/new/MAINT.Data.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + CovC1toRestCov: possible error in is.element(Config, 2:5): unused + argument (2:5) + GetCovPar: possible error in is.element(Config, 1:5): unused argument + (1:5) + GetSigmaPar: possible error in is.element(Config, 1:5): unused argument + (1:5) + IdtHetMxtNmle: possible error in is.element(2, Config): unused argument + (Config) + IdtNmle: possible error in is.element(1, Config): unused argument + (Config) + ... + summary,IdtMclust: possible error in is.element(model, + names(object@allres$RepresHom)): unused argument + (names(object@allres$RepresHom)) + summary,IdtMclust: possible error in is.element(model, + names(object@allres$RepresHet)): unused argument + (names(object@allres$RepresHet)) + testMod,IdtE: possible error in is.element(ModE@ModelConfig[1], + RestMod): unused argument (RestMod) + testMod,IdtE: possible error in is.element(nCovCases + 1, RestMod): + unused argument (RestMod) ``` -* checking data for non-ASCII characters ... NOTE +## In both + +* checking installed package size ... NOTE ``` - Note: found 36 marked UTF-8 strings + installed size is 19.3Mb + sub-directories of 1Mb or more: + R 3.5Mb + data 6.5Mb + libs 8.9Mb ``` -# packcircles +# MarketMatching
-* Version: 0.3.6 -* GitHub: https://github.com/mbedward/packcircles -* Source code: https://github.com/cran/packcircles -* Date/Publication: 2023-09-08 06:30:02 UTC -* Number of recursive dependencies: 57 +* Version: 1.2.1 +* GitHub: NA +* Source code: https://github.com/cran/MarketMatching +* Date/Publication: 2024-01-31 09:40:02 UTC +* Number of recursive dependencies: 73 -Run `revdepcheck::cloud_details(, "packcircles")` for more info +Run `revdepcheck::cloud_details(, "MarketMatching")` for more info
## Newly broken -* checking running R code from vignettes ... ERROR +* checking re-building of vignette outputs ... ERROR ``` - Errors in running code in vignettes: - when running code in ‘progressive_packing.Rmd’ + Error(s) in re-building vignettes: ... - + scale_fill_man .... [TRUNCATED] - - > if (requireNamespace("ggiraph")) { - + gg <- ggplot(data = dat.gg) + ggiraph::geom_polygon_interactive(aes(x, - + y, group = id, fill = fac .... [TRUNCATED] - Loading required namespace: ggiraph + --- re-building ‘MarketMatching-Vignette.Rmd’ using rmarkdown_notangle - When sourcing ‘progressive_packing.R’: - Error: argument is of length zero - Execution halted + Quitting from lines 79-105 [unnamed-chunk-1] (MarketMatching-Vignette.Rmd) + Error: processing vignette 'MarketMatching-Vignette.Rmd' failed with diagnostics: + unused argument (c("B", "M", "K")) + --- failed re-building ‘MarketMatching-Vignette.Rmd’ - ‘graph_packing.Rmd’ using ‘UTF-8’... OK - ‘intro.Rmd’ using ‘UTF-8’... OK - ‘progressive_packing.Rmd’ using ‘UTF-8’... failed - ``` - -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘graph_packing.Rmd’ using rmarkdown - --- finished re-building ‘graph_packing.Rmd’ + SUMMARY: processing the following file failed: + ‘MarketMatching-Vignette.Rmd’ - --- re-building ‘intro.Rmd’ using rmarkdown + Error: Vignette re-building failed. + Execution halted ``` -# pafr +# metacart
-* Version: 0.0.2 -* GitHub: https://github.com/dwinter/pafr -* Source code: https://github.com/cran/pafr -* Date/Publication: 2020-12-08 10:20:12 UTC -* Number of recursive dependencies: 110 +* Version: 2.0-3 +* GitHub: NA +* Source code: https://github.com/cran/metacart +* Date/Publication: 2020-07-10 11:30:05 UTC +* Number of recursive dependencies: 31 -Run `revdepcheck::cloud_details(, "pafr")` for more info +Run `revdepcheck::cloud_details(, "metacart")` for more info
## Newly broken -* checking tests ... ERROR +* checking examples ... ERROR ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(pafr) - Loading required package: ggplot2 - > - > test_check("pafr") - [ FAIL 6 | WARN 2 | SKIP 0 | PASS 70 ] - + Running examples in ‘metacart-Ex.R’ failed + The error most likely occurred in: + + > ### Name: FEmrt + > ### Title: Fixed effect meta-tree + > ### Aliases: FEmrt + > + > ### ** Examples + > + > data(dat.BCT2009) ... - ── Failure ('test_plot.r:11:5'): dotplot works produces a plot ───────────────── - unname(labs["xintercept"]) not equal to "xintercept". - target is NULL, current is character - ── Failure ('test_plot.r:12:5'): dotplot works produces a plot ───────────────── - unname(labs["yintercept"]) not equal to "yintercept". - target is NULL, current is character - - [ FAIL 6 | WARN 2 | SKIP 0 | PASS 70 ] - Error: Test failures - Execution halted + 1) root 106 253.03570 0.2294837 + 2) T1=0 69 168.39650 0.2018800 * + 3) T1=1 37 67.44715 0.3222563 + 6) T4=0 15 20.19503 0.1906789 * + 7) T4=1 22 23.85478 0.4377661 * + > summary(FEtree) + Error in is.element("FEmrt", class(object)) : + unused argument (class(object)) + Calls: summary -> summary.FEmrt + Execution halted ``` -## In both +* checking whether package ‘metacart’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element("FEmrt", class(object))': unused argument (class(object)) + Note: possible error in 'is.element("REmrt", class(object))': unused argument (class(object)) + See ‘/tmp/workdir/metacart/new/metacart.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` -* checking LazyData ... NOTE +* checking R code for possible problems ... NOTE ``` - 'LazyData' is specified without a 'data' directory + summary.FEmrt: possible error in is.element("FEmrt", class(object)): + unused argument (class(object)) + summary.REmrt: possible error in is.element("REmrt", class(object)): + unused argument (class(object)) ``` -# patchwork +# MetAlyzer
-* Version: 1.2.0 -* GitHub: https://github.com/thomasp85/patchwork -* Source code: https://github.com/cran/patchwork -* Date/Publication: 2024-01-08 14:40:02 UTC -* Number of recursive dependencies: 80 +* Version: 1.1.0 +* GitHub: https://github.com/nilsmechtel/MetAlyzer +* Source code: https://github.com/cran/MetAlyzer +* Date/Publication: 2024-12-06 14:00:02 UTC +* Number of recursive dependencies: 98 -Run `revdepcheck::cloud_details(, "patchwork")` for more info +Run `revdepcheck::cloud_details(, "MetAlyzer")` for more info
@@ -19283,81 +12759,162 @@ Run `revdepcheck::cloud_details(, "patchwork")` for more info * checking examples ... ERROR ``` - Running examples in ‘patchwork-Ex.R’ failed + Running examples in ‘MetAlyzer-Ex.R’ failed The error most likely occurred in: - > ### Name: free - > ### Title: Free a plot from alignment - > ### Aliases: free + > ### Name: plotly_scatter + > ### Title: Plotly Log2FC Scatter Plot + > ### Aliases: plotly_scatter > > ### ** Examples > - > # Sometimes you have a plot that defies good composition alginment, e.g. due - ... - > p1 / p2 > - > # We can fix this be using free - > free(p1) / p2 + ... + Warning: Partial NA coefficients for 2 probe(s) > - > # We can still collect guides like before - > free(p1) / p2 + plot_layout(guides = "collect") - Error in identicalUnits(x) : object is not a unit - Calls: ... assemble_guides -> guides_build -> unit.c -> identicalUnits + > p_scatter <- plotly_scatter(metalyzer_se) + Warning in geom_rect(data = rects_df, inherit.aes = FALSE, aes(xmin = .data$Start, : + Ignoring unknown aesthetics: text + Warning in geom_point(size = 0.5, aes(text = paste0(.data$Metabolite, "\nClass: ", : + Ignoring unknown aesthetics: text + Error in pm[[2]] : subscript out of bounds + Calls: plotly_scatter -> ggplotly -> ggplotly.ggplot -> gg2list Execution halted ``` -# pathviewr +# metR
-* Version: 1.1.7 -* GitHub: https://github.com/ropensci/pathviewr -* Source code: https://github.com/cran/pathviewr -* Date/Publication: 2023-03-08 08:10:05 UTC -* Number of recursive dependencies: 182 +* Version: 0.17.0 +* GitHub: https://github.com/eliocamp/metR +* Source code: https://github.com/cran/metR +* Date/Publication: 2025-01-13 19:50:02 UTC +* Number of recursive dependencies: 120 -Run `revdepcheck::cloud_details(, "pathviewr")` for more info +Run `revdepcheck::cloud_details(, "metR")` for more info
## Newly broken +* checking examples ... ERROR + ``` + Running examples in ‘metR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: geom_contour_tanaka + > ### Title: Illuminated contours + > ### Aliases: geom_contour_tanaka GeomContourTanaka + > ### Keywords: datasets + > + > ### ** Examples + > + ... + 19. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 20. │ └─self$draw_panel(...) + 21. │ └─metR (local) draw_panel(...) + 22. │ └─metR:::stopf(...) + 23. │ └─base::stop(e) + 24. └─rlang (local) ``(``) + 25. └─handlers[[1L]](cnd) + 26. └─cli::cli_abort(...) + 27. └─rlang::abort(...) + Execution halted + ``` + * checking tests ... ERROR ``` Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > library(pathviewr) - > #library(vdiffr) + > library(metR) + > # library(vdiffr) + > + > on_cran <- !isTRUE(as.logical(Sys.getenv("NOT_CRAN", "false"))) + > if (on_cran) data.table::setDTthreads(2) > - > test_check("pathviewr") - [ FAIL 2 | WARN 1 | SKIP 0 | PASS 286 ] - ... - ── Error ('test-plot_by_subject.R:168:3'): elev views wrangled correctly via tidyverse ── - Error in `expect_match(elev_all_plots[[3]][[4]][["labels"]][["x"]], "position_height")`: is.character(act$val) is not TRUE - Backtrace: - ▆ - 1. └─testthat::expect_match(...) at test-plot_by_subject.R:168:3 - 2. └─base::stopifnot(is.character(act$val)) + 26. │ └─metR:::stopf(...) + 27. │ └─base::stop(e) + 28. └─rlang (local) ``(``) + 29. └─handlers[[1L]](cnd) + 30. └─cli::cli_abort(...) + 31. └─rlang::abort(...) - [ FAIL 2 | WARN 1 | SKIP 0 | PASS 286 ] + [ FAIL 1 | WARN 1 | SKIP 19 | PASS 184 ] Error: Test failures Execution halted ``` -# patientProfilesVis +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘Visualization-tools.Rmd’ + ... + + > ggplot(temperature[lev == 300], aes(lon, lat, z = air.z)) + + + geom_contour_fill() + geom_contour_tanaka() + scale_fill_divergent() + + When sourcing ‘Visualization-tools.R’: + Error: Problem while converting geom to grob. + ℹ Error occurred in the 2nd layer. + Caused by error: + ! geom_path: If you are using dotted or dashed lines, colour, size and linetype must be constant over the line. + Execution halted + + ‘Visualization-tools.Rmd’ using ‘UTF-8’... failed + ‘Working-with-data.Rmd’ using ‘UTF-8’... OK + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘Visualization-tools.Rmd’ using knitr + + Quitting from lines 241-245 [unnamed-chunk-16] (Visualization-tools.Rmd) + Error: processing vignette 'Visualization-tools.Rmd' failed with diagnostics: + Problem while converting geom to grob. + ℹ Error occurred in the 2nd layer. + Caused by error: + ! geom_path: If you are using dotted or dashed lines, colour, size and linetype must be constant over the line. + ... + --- failed re-building ‘Visualization-tools.Rmd’ + + --- re-building ‘Working-with-data.Rmd’ using knitr + --- finished re-building ‘Working-with-data.Rmd’ + + SUMMARY: processing the following file failed: + ‘Visualization-tools.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.6Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 2.0Mb + doc 1.8Mb + ``` + +# mgcViz
-* Version: 2.0.9 -* GitHub: https://github.com/openanalytics/patientProfilesVis -* Source code: https://github.com/cran/patientProfilesVis -* Date/Publication: 2024-06-18 09:00:02 UTC -* Number of recursive dependencies: 102 +* Version: 0.1.11 +* GitHub: https://github.com/mfasiolo/mgcViz +* Source code: https://github.com/cran/mgcViz +* Date/Publication: 2023-10-06 10:50:02 UTC +* Number of recursive dependencies: 112 -Run `revdepcheck::cloud_details(, "patientProfilesVis")` for more info +Run `revdepcheck::cloud_details(, "mgcViz")` for more info
@@ -19366,42 +12923,43 @@ Run `revdepcheck::cloud_details(, "patientProfilesVis")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘patientProfiles-template-SDTM.Rmd’ + when running code in ‘mgcviz.rmd’ ... - > patientProfilesPlots <- c(patientProfilesPlots, list(MH = mhPlots)) + > v <- getViz(b) - > cmPlots <- subjectProfileIntervalPlot(data = dataAll$CM, - + paramVar = c("CMTRT", "CMDOSE", "CMDOSU", "CMROUTE", "CMDOSFRQ"), - + timeStartVa .... [TRUNCATED] - 171 record(s) with missing Study Day of Start of Medication and 208 record(s) with missing Study Day of End of Medication are imputed with minimal imputation. - - ... - + paramVar = "AETERM", timeStartVar = "AESTDY", timeEndVar = "AEENDY", - + colorVar = " ..." ... [TRUNCATED] - 3 record(s) with missing Study Day of Start of Adverse Event and 19 record(s) with missing Study Day of End of Adverse Event are imputed with minimal imputation. + > pl <- plotSlice(x = sm(v, 1), fix = list(z = seq(-2, + + 2, length.out = 3), x = c(-1, 0, 1))) - When sourcing ‘patientProfilesVis-introduction.R’: - Error: argument is of length zero + When sourcing ‘mgcviz.R’: + Error: The `facets` argument of `facet_grid()` was deprecated in ggplot2 2.2.0 + and is now defunct. + ℹ Please use the `rows` argument instead. Execution halted - ‘patientProfiles-template-SDTM.Rmd’ using ‘UTF-8’... failed - ‘patientProfilesVis-introduction.Rmd’ using ‘UTF-8’... failed + ‘mgcviz.rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` - Error(s) in re-building vignettes: - --- re-building ‘patientProfiles-template-SDTM.Rmd’ using rmarkdown - - Quitting from lines 129-153 [patientProfiles-concomitantMedications] (patientProfiles-template-SDTM.Rmd) - Error: processing vignette 'patientProfiles-template-SDTM.Rmd' failed with diagnostics: - argument is of length zero - --- failed re-building ‘patientProfiles-template-SDTM.Rmd’ - - --- re-building ‘patientProfilesVis-introduction.Rmd’ using rmarkdown + Error(s) in re-building vignettes: + --- re-building ‘mgcviz.rmd’ using rmarkdown ``` -## In both +# migraph + +
+ +* Version: 1.4.5 +* GitHub: https://github.com/stocnet/migraph +* Source code: https://github.com/cran/migraph +* Date/Publication: 2024-12-02 10:00:10 UTC +* Number of recursive dependencies: 97 + +Run `revdepcheck::cloud_details(, "migraph")` for more info + +
+ +## Newly broken * checking tests ... ERROR ``` @@ -19409,103 +12967,77 @@ Run `revdepcheck::cloud_details(, "patientProfilesVis")` for more info Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > library(patientProfilesVis) + > library(manynet) + > library(migraph) > - > test_check("patientProfilesVis") - [ FAIL 100 | WARN 0 | SKIP 20 | PASS 145 ] - - ══ Skipped tests (20) ══════════════════════════════════════════════════════════ + > test_check("migraph") + Starting 2 test processes + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 46 ] ... - 11. └─patientProfilesVis (local) .fun(piece, ...) - 12. └─ggplot2:::`+.gg`(...) - 13. └─ggplot2:::add_ggplot(e1, e2, e2name) - 14. ├─ggplot2::ggplot_add(object, p, objectname) - 15. └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 16. └─ggplot2:::new_layer_names(object, names(plot$layers)) + `expected` is a character vector ('Statistic') + ── Failure ('test-model_tests.R:73:3'): qap plot works ───────────────────────── + qapplot$labels$x (`actual`) not identical to "Statistic" (`expected`). + + `actual` is NULL + `expected` is a character vector ('Statistic') - [ FAIL 100 | WARN 0 | SKIP 20 | PASS 145 ] + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 46 ] Error: Test failures Execution halted ``` -* checking installed package size ... NOTE - ``` - installed size is 5.7Mb - sub-directories of 1Mb or more: - doc 5.2Mb - ``` - -# PCADSC +# mikropml
-* Version: 0.8.0 -* GitHub: https://github.com/annepetersen1/PCADSC -* Source code: https://github.com/cran/PCADSC -* Date/Publication: 2017-04-19 10:07:43 UTC -* Number of recursive dependencies: 35 +* Version: 1.6.1 +* GitHub: https://github.com/SchlossLab/mikropml +* Source code: https://github.com/cran/mikropml +* Date/Publication: 2023-08-21 15:10:05 UTC +* Number of recursive dependencies: 129 -Run `revdepcheck::cloud_details(, "PCADSC")` for more info +Run `revdepcheck::cloud_details(, "mikropml")` for more info
## Newly broken -* checking examples ... ERROR +* checking tests ... ERROR ``` - Running examples in ‘PCADSC-Ex.R’ failed - The error most likely occurred in: - - > ### Name: CEPlot - > ### Title: Cumulative eigenvalue plot - > ### Aliases: CEPlot - > - > ### ** Examples - > - > #load iris data + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(mikropml) + > test_check("mikropml") + Fraction of data in the training set: 0.778 + Groups in the training set: A C D + Groups in the testing set: B + Fraction of data in the training set: 0.778 ... - > CEPlot(irisPCADSC_fast) - Warning: The `guide` argument in `scale_*()` cannot be `FALSE`. This was deprecated in - ggplot2 3.3.4. - ℹ Please use "none" instead. - ℹ The deprecated feature was likely used in the PCADSC package. - Please report the issue at . - Error in grid.Call.graphics(C_lines, x$x, x$y, index, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.polyline -> grid.Call.graphics - Execution halted - ``` - -## In both - -* checking dependencies in R code ... NOTE - ``` - Namespaces in Imports field not imported from: - ‘Matrix’ ‘pander’ - All declared Imports should be used. - ``` - -* checking Rd cross-references ... NOTE - ``` - Package unavailable to check Rd xrefs: ‘data.table’ - ``` - -* checking LazyData ... NOTE - ``` - 'LazyData' is specified without a 'data' directory + `names(expected)` is absent + ── Failure ('test-plot.R:140:3'): plot_mean_prc uses geom ribbon, line, and hline ── + ... %>% unlist() (`actual`) not equal to c(...) (`expected`). + + `names(actual)` is a character vector ('geom_ribbon1', 'geom_ribbon2', 'geom_ribbon3', 'geom_ribbon4', 'geom_line1', ...) + `names(expected)` is absent + + [ FAIL 2 | WARN 19 | SKIP 12 | PASS 314 ] + Error: Test failures + Execution halted ``` -# pcutils +# MiMIR
-* Version: 0.2.6 -* GitHub: https://github.com/Asa12138/pcutils -* Source code: https://github.com/cran/pcutils -* Date/Publication: 2024-06-25 21:20:05 UTC -* Number of recursive dependencies: 281 +* Version: 1.5 +* GitHub: NA +* Source code: https://github.com/cran/MiMIR +* Date/Publication: 2024-02-01 08:50:02 UTC +* Number of recursive dependencies: 192 -Run `revdepcheck::cloud_details(, "pcutils")` for more info +Run `revdepcheck::cloud_details(, "MiMIR")` for more info
@@ -19513,88 +13045,40 @@ Run `revdepcheck::cloud_details(, "pcutils")` for more info * checking examples ... ERROR ``` - Running examples in ‘pcutils-Ex.R’ failed + Running examples in ‘MiMIR-Ex.R’ failed The error most likely occurred in: - > ### Name: gghist - > ### Title: gg histogram - > ### Aliases: gghist + > ### Name: LOBOV_accuracies + > ### Title: LOBOV_accuracies + > ### Aliases: LOBOV_accuracies > > ### ** Examples > - > if (requireNamespace("ggpubr")) { + > require(pROC) ... - 12. │ └─ggplot2:::`+.gg`(...) - 13. │ └─ggplot2:::add_ggplot(e1, e2, e2name) - 14. │ ├─ggplot2::ggplot_add(object, p, objectname) - 15. │ └─ggplot2:::ggplot_add.Layer(object, p, objectname) - 16. │ └─ggplot2:::new_layer_names(object, names(plot$layers)) - 17. └─base::.handleSimpleError(...) - 18. └─purrr (local) h(simpleError(msg, call)) - 19. └─cli::cli_abort(...) - 20. └─rlang::abort(...) - Execution halted - ``` - -# pdxTrees - -
- -* Version: 0.4.0 -* GitHub: https://github.com/mcconvil/pdxTrees -* Source code: https://github.com/cran/pdxTrees -* Date/Publication: 2020-08-17 14:00:02 UTC -* Number of recursive dependencies: 105 - -Run `revdepcheck::cloud_details(, "pdxTrees")` for more info - -
- -## Newly broken - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘pdxTrees-vignette.Rmd’ - ... - + y = Pollution_Removal_value, color = Mature_Size)) + geom_point(size = 2, - + .... [TRUNCATED] - - > berkeley_graph + transition_states(states = Mature_Size, - + transition_length = 10, state_length = 8) + enter_grow() + - + exit_shrink() - - When sourcing ‘pdxTrees-vignette.R’: - Error: argument "theme" is missing, with no default + 56 metabolites x 500 samples + | Pruning samples on5SD: + 56 metabolites x 500 samples + | Performing scaling ... DONE! + | Imputation ... DONE! + > p_avail<-colnames(b_p)[c(1:5)] + > LOBOV_accuracies(sur$surrogates, b_p, p_avail, MiMIR::acc_LOBOV) + Error in pm[[2]] : subscript out of bounds + Calls: LOBOV_accuracies -> -> ggplotly.ggplot -> gg2list Execution halted - - ‘pdxTrees-vignette.Rmd’ using ‘UTF-8’... failed ``` -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘pdxTrees-vignette.Rmd’ using rmarkdown - ``` - -## In both - -* checking LazyData ... NOTE - ``` - 'LazyData' is specified without a 'data' directory - ``` - -# personalized +# miRetrieve
-* Version: 0.2.7 -* GitHub: https://github.com/jaredhuling/personalized -* Source code: https://github.com/cran/personalized -* Date/Publication: 2022-06-27 20:20:03 UTC -* Number of recursive dependencies: 94 +* Version: 1.3.4 +* GitHub: NA +* Source code: https://github.com/cran/miRetrieve +* Date/Publication: 2021-09-18 17:30:02 UTC +* Number of recursive dependencies: 125 -Run `revdepcheck::cloud_details(, "personalized")` for more info +Run `revdepcheck::cloud_details(, "miRetrieve")` for more info
@@ -19605,37 +13089,37 @@ Run `revdepcheck::cloud_details(, "personalized")` for more info Running ‘testthat.R’ Running the tests in ‘tests/testthat.R’ failed. Complete output: - > Sys.setenv("R_TESTS" = "") > library(testthat) - > library(personalized) - Loading required package: glmnet - Loading required package: Matrix - Loaded glmnet 4.1-8 - Loading required package: mgcv + > library(miRetrieve) + > + > test_check("miRetrieve") + [ FAIL 1 | WARN 11 | SKIP 0 | PASS 202 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ ... - 4. └─personalized:::plot.subgroup_validated(subgrp.val, type = "stability") - 5. ├─plotly::subplot(...) - 6. │ └─plotly:::dots2plots(...) - 7. ├─plotly::ggplotly(p.primary, tooltip = paste0("tooltip", 1:4)) - 8. └─plotly:::ggplotly.ggplot(...) - 9. └─plotly::gg2list(...) + Backtrace: + ▆ + 1. └─miRetrieve::compare_mir_terms_scatter(df_merged, "miR-21", title = "Test_title") at test-comparemirterms.R:56:1 + 2. ├─plotly::ggplotly(plot) + 3. └─plotly:::ggplotly.ggplot(plot) + 4. └─plotly::gg2list(...) - [ FAIL 1 | WARN 2 | SKIP 0 | PASS 215 ] + [ FAIL 1 | WARN 11 | SKIP 0 | PASS 202 ] Error: Test failures Execution halted ``` -# phyloseqGraphTest +# MiscMetabar
-* Version: 0.1.1 -* GitHub: https://github.com/jfukuyama/phyloseqGraphTest -* Source code: https://github.com/cran/phyloseqGraphTest -* Date/Publication: 2024-02-05 19:00:02 UTC -* Number of recursive dependencies: 97 +* Version: 0.10.1 +* GitHub: https://github.com/adrientaudiere/MiscMetabar +* Source code: https://github.com/cran/MiscMetabar +* Date/Publication: 2024-10-07 21:40:01 UTC +* Number of recursive dependencies: 411 -Run `revdepcheck::cloud_details(, "phyloseqGraphTest")` for more info +Run `revdepcheck::cloud_details(, "MiscMetabar")` for more info
@@ -19643,77 +13127,65 @@ Run `revdepcheck::cloud_details(, "phyloseqGraphTest")` for more info * checking examples ... ERROR ``` - Running examples in ‘phyloseqGraphTest-Ex.R’ failed + Running examples in ‘MiscMetabar-Ex.R’ failed The error most likely occurred in: - > ### Name: plot_test_network - > ### Title: Plots the graph used for testing - > ### Aliases: plot_test_network + > ### Name: ggscatt_pq + > ### Title: Scatterplot with marginal distributions and statistical results + > ### against Hill diversity of phyloseq object + > ### Aliases: ggscatt_pq > > ### ** Examples > - > library(phyloseq) ... - > plot_test_network(gt) - Warning in fortify(data, ...) : - Arguments in `...` must be used. - ✖ Problematic argument: - • layout = layout - ℹ Did you misspell an argument name? - Error in grid.Call.graphics(C_segments, x$x0, x$y0, x$x1, x$y1, x$arrow) : - invalid line type: must be length 2, 4, 6 or 8 - Calls: ... drawDetails -> drawDetails.segments -> grid.Call.graphics - Execution halted - ``` - -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘gt_vignette.Rmd’ - ... - > plot_test_network(gt) - Warning in fortify(data, ...) : - Arguments in `...` must be used. - ✖ Problematic argument: - • layout = layout - ℹ Did you misspell an argument name? - - When sourcing ‘gt_vignette.R’: - Error: invalid line type: must be length 2, 4, 6 or 8 + Cleaning suppress 0 taxa and 0 samples. + Taxa are now in rows. + Joining with `by = join_by(Sample)` + [[1]] + `stat_xsidebin()` using `bins = 30`. Pick better value with `binwidth`. + `stat_ysidebin()` using `bins = 30`. Pick better value with `binwidth`. + Error in is.element(panel_type, c("x", "y")) : + unused argument (c("x", "y")) + Calls: ... -> draw_panel -> -> render_fg Execution halted - - ‘gt_vignette.Rmd’ using ‘UTF-8’... failed ``` -* checking re-building of vignette outputs ... NOTE +* checking tests ... ERROR ``` - Error(s) in re-building vignettes: - ... - --- re-building ‘gt_vignette.Rmd’ using rmarkdown - - Quitting from lines 175-176 [unnamed-chunk-5] (gt_vignette.Rmd) - Error: processing vignette 'gt_vignette.Rmd' failed with diagnostics: - invalid line type: must be length 2, 4, 6 or 8 - --- failed re-building ‘gt_vignette.Rmd’ - - SUMMARY: processing the following file failed: - ‘gt_vignette.Rmd’ - - Error: Vignette re-building failed. - Execution halted + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(MiscMetabar) + Loading required package: phyloseq + Loading required package: ggplot2 + + Attaching package: 'ggplot2' + + ... + 'test_tuckey.R:26:3', 'test_targets.R:5:3', 'test_targets.R:56:3', + 'test_targets.R:84:3', 'test_targets.R:101:3', 'test_targets.R:111:3' + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test_figures_beta_div.R:72:5'): graph_test_pq works ─────────────── + `graph_test_pq(data_fungi_mini, fact = "Tree_name")` produced warnings. + + [ FAIL 1 | WARN 1 | SKIP 75 | PASS 83 ] + Error: Test failures + Execution halted ``` -# PieGlyph +# misspi
-* Version: 1.0.0 -* GitHub: https://github.com/rishvish/PieGlyph -* Source code: https://github.com/cran/PieGlyph -* Date/Publication: 2024-06-28 12:00:02 UTC -* Number of recursive dependencies: 91 +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/misspi +* Date/Publication: 2023-10-17 09:50:02 UTC +* Number of recursive dependencies: 88 -Run `revdepcheck::cloud_details(, "PieGlyph")` for more info +Run `revdepcheck::cloud_details(, "misspi")` for more info
@@ -19721,29 +13193,45 @@ Run `revdepcheck::cloud_details(, "PieGlyph")` for more info * checking examples ... ERROR ``` - Running examples in ‘PieGlyph-Ex.R’ failed + Running examples in ‘misspi-Ex.R’ failed The error most likely occurred in: - > ### Name: geom_pie_interactive - > ### Title: Scatter plots with interactive pie-chart glyphs - > ### Aliases: geom_pie_interactive + > ### Name: evaliq + > ### Title: Evaluate the Imputation Quality + > ### Aliases: evaliq > > ### ** Examples > - > #' ## Load libraries + > # A very quick example ... - > # One of the interactive aesthetics is tooltip. It is set that by default - > # it shows the value and percentage of each slice in the pie-chart. - > # Hover over any pie-chart in the plot to see this - > plot_obj1 <- ggplot(data = plot_data, aes(x = system, y = response)) + - + geom_pie_interactive(slices = c("A", "B", "C", "D"), - + data = plot_data)+ - + theme_classic() - Error in if (new_name %in% existing) { : argument is of length zero - Calls: +.gg ... ggplot_add.list -> ggplot_add -> ggplot_add.Layer -> new_layer_names + > # Default plot + > er.eval <- evaliq(x.true[na.idx], x.est[na.idx]) + `geom_smooth()` using formula = 'y ~ x' + > + > # Interactive plot + > er.eval <- evaliq(x.true[na.idx], x.est[na.idx], interactive = TRUE) + `geom_smooth()` using formula = 'y ~ x' + Error in pm[[2]] : subscript out of bounds + Calls: evaliq -> print -> ggplotly -> ggplotly.ggplot -> gg2list Execution halted ``` +# mizer + +
+ +* Version: 2.5.3 +* GitHub: https://github.com/sizespectrum/mizer +* Source code: https://github.com/cran/mizer +* Date/Publication: 2024-10-17 07:10:09 UTC +* Number of recursive dependencies: 109 + +Run `revdepcheck::cloud_details(, "mizer")` for more info + +
+ +## Newly broken + * checking tests ... ERROR ``` Running ‘spelling.R’ @@ -19757,62 +13245,38 @@ Run `revdepcheck::cloud_details(, "PieGlyph")` for more info > # Learn more about the roles of various files in: > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview ... - • geom_pie_interactive/custom-tooltip.svg - • geom_pie_interactive/data-id.svg - • geom_pie_interactive/long-form-data-works.svg - • geom_pie_interactive/multiple-interactive-parameters.svg - • geom_pie_interactive/only-one-attribute.svg - • pie-grob/pie-grob-with-multiple-values-no-fill-works.svg - • pie-grob/pie-grob-with-single-non-zero-value-no-fill-works.svg - • pie-grob/pie-grob-with-single-non-zero-value-works.svg + • plots/plot-feeding-level.svg + • plots/plot-single-growth-curve.svg + • plots/plot-spectra.svg + • plots/plot-yield-by-gear.svg + • plots/plot-yield.svg + • plots/plotfishing-mortality.svg + • plots/plotfmort-truncated.svg + • plots/plotpredation-mortality.svg Error: Test failures Execution halted ``` -* checking re-building of vignette outputs ... NOTE - ``` - Error(s) in re-building vignettes: - --- re-building ‘PieGlyph.Rmd’ using rmarkdown - ``` - ## In both -* checking running R code from vignettes ... ERROR +* checking installed package size ... NOTE ``` - Errors in running code in vignettes: - when running code in ‘PieGlyph.Rmd’ - ... - + geom_pie_glyph(slices = "Attributes", values = "values") + - + theme_cla .... [TRUNCATED] - - > plot_obj <- ggplot(data = plot_data) + geom_pie_interactive(aes(x = system, - + y = response, data_id = system), slices = c("A", "B", "C", - + .... [TRUNCATED] - - ... - before plotting. - Execution halted - - ‘PieGlyph.Rmd’ using ‘UTF-8’... failed - ‘interactive-pie-glyphs.Rmd’ using ‘UTF-8’... failed - ‘multinomial-classification-example.Rmd’ using ‘UTF-8’... OK - ‘pie-lollipop-example.Rmd’ using ‘UTF-8’... OK - ‘spatial-example.Rmd’ using ‘UTF-8’... OK - ‘time-series-example.Rmd’ using ‘UTF-8’... failed - ‘unusual-situations.Rmd’ using ‘UTF-8’... failed + installed size is 5.5Mb + sub-directories of 1Mb or more: + help 1.8Mb ``` -# Plasmidprofiler +# MLEce
-* Version: 0.1.6 +* Version: 2.1.0 * GitHub: NA -* Source code: https://github.com/cran/Plasmidprofiler -* Date/Publication: 2017-01-06 01:10:47 -* Number of recursive dependencies: 90 +* Source code: https://github.com/cran/MLEce +* Date/Publication: 2023-09-27 14:50:06 UTC +* Number of recursive dependencies: 42 -Run `revdepcheck::cloud_details(, "Plasmidprofiler")` for more info +Run `revdepcheck::cloud_details(, "MLEce")` for more info
@@ -19820,40 +13284,52 @@ Run `revdepcheck::cloud_details(, "Plasmidprofiler")` for more info * checking examples ... ERROR ``` - Running examples in ‘Plasmidprofiler-Ex.R’ failed + Running examples in ‘MLEce-Ex.R’ failed The error most likely occurred in: - > ### Name: main - > ### Title: Main: Run everything - > ### Aliases: main + > ### Name: MLEce + > ### Title: Calculating MLEces for three different distributions + > ### Aliases: MLEce > > ### ** Examples > - > main(blastdata, - ... - Saving 12 x 7 in image - Warning: Vectorized input to `element_text()` is not officially supported. - ℹ Results may be unexpected or may change in future versions of ggplot2. - Warning in geom_tile(aes(x = Plasmid, y = Sample, label = AMR_gene, fill = Inc_group, : - Ignoring unknown aesthetics: label and text - Warning: Use of `report$Sureness` is discouraged. - ℹ Use `Sureness` instead. - Error in pm[[2]] : subscript out of bounds - Calls: main ... -> ggplotly -> ggplotly.ggplot -> gg2list + > #bivariate gamma distribution + > data_BiGam <- rBiGam(100, c(1,4,5)) + > res_BiGam <- MLEce(data_BiGam, "BiGam") + Error in is.element(distname, distlist) : unused argument (distlist) + Calls: MLEce Execution halted ``` -# platetools +* checking whether package ‘MLEce’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(distname, ': unused argument (distlist) + See ‘/tmp/workdir/MLEce/new/MLEce.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` + +* checking R code for possible problems ... NOTE + ``` + MLEce: possible error in is.element(distname, distlist): unused + argument (distlist) + benchMLEce: possible error in is.element(distname, distlist): unused + argument (distlist) + ``` + +# modeltime.resample
-* Version: 0.1.7 -* GitHub: https://github.com/swarchal/platetools -* Source code: https://github.com/cran/platetools -* Date/Publication: 2024-03-07 16:50:02 UTC -* Number of recursive dependencies: 48 +* Version: 0.2.3 +* GitHub: https://github.com/business-science/modeltime.resample +* Source code: https://github.com/cran/modeltime.resample +* Date/Publication: 2023-04-12 15:50:02 UTC +* Number of recursive dependencies: 234 -Run `revdepcheck::cloud_details(, "platetools")` for more info +Run `revdepcheck::cloud_details(, "modeltime.resample")` for more info
@@ -19865,36 +13341,45 @@ Run `revdepcheck::cloud_details(, "platetools")` for more info Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > library(platetools) > - > test_check("platetools") - [ FAIL 2 | WARN 1 | SKIP 4 | PASS 187 ] - - ══ Skipped tests (4) ═══════════════════════════════════════════════════════════ + > # Machine Learning + > library(tidymodels) + ── Attaching packages ────────────────────────────────────── tidymodels 1.2.0 ── + ✔ broom 1.0.7 ✔ recipes 1.1.0 + ✔ dials 1.3.0 ✔ rsample 1.2.1 ... - length(out96) not equal to length(ggplot()). - 1/1 mismatches - [1] 11 - 10 == 1 - ── Failure ('test-plot_wrapper.R:34:5'): returns expected ggplot object ──────── - names(out96) not equal to names(ggplot()). - Lengths differ: 11 is not 10 + ▆ + 1. ├─m750_models_resample %>% ... at test-modeltime_fit_resamples.R:116:5 + 2. └─modeltime.resample::plot_modeltime_resamples(., .interactive = TRUE) + 3. ├─plotly::ggplotly(g) + 4. └─plotly:::ggplotly.ggplot(g) + 5. └─plotly::gg2list(...) - [ FAIL 2 | WARN 1 | SKIP 4 | PASS 187 ] + [ FAIL 1 | WARN 4 | SKIP 0 | PASS 16 ] Error: Test failures Execution halted ``` -# PLNmodels +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘crayon’ ‘dials’ ‘glue’ ‘parsnip’ + All declared Imports should be used. + ``` + +# moreparty
-* Version: 1.2.0 -* GitHub: https://github.com/pln-team/PLNmodels -* Source code: https://github.com/cran/PLNmodels -* Date/Publication: 2024-03-05 15:50:03 UTC -* Number of recursive dependencies: 155 +* Version: 0.4 +* GitHub: NA +* Source code: https://github.com/cran/moreparty +* Date/Publication: 2023-11-22 14:30:02 UTC +* Number of recursive dependencies: 163 -Run `revdepcheck::cloud_details(, "PLNmodels")` for more info +Run `revdepcheck::cloud_details(, "moreparty")` for more info
@@ -19903,101 +13388,170 @@ Run `revdepcheck::cloud_details(, "PLNmodels")` for more info * checking running R code from vignettes ... ERROR ``` Errors in running code in vignettes: - when running code in ‘PLNPCA.Rmd’ + when running code in ‘Titanic_example.Rmd’ ... - 3 "$contrib" "contributions of the individuals" + 24 Age 57 0.3187270 + 25 Embarked Cherbourg 0.4603041 + [ reached 'max' / getOption("max.print") -- omitted 2 rows ] - > factoextra::fviz_pca_biplot(myPCA_ICL) + > ggForestEffects(pdep, vline = mean(pred_foret), xlab = "Probability of survival") + + + xlim(c(0, 1)) - When sourcing ‘PLNPCA.R’: - Error: ℹ In index: 1. - ℹ With name: y. - ... - ! argument is of length zero + When sourcing ‘Titanic_example.R’: + Error: `x` must be a vector, not a object. Execution halted - ‘Import_data.Rmd’ using ‘UTF-8’... OK - ‘PLN.Rmd’ using ‘UTF-8’... OK - ‘PLNLDA.Rmd’ using ‘UTF-8’... OK - ‘PLNPCA.Rmd’ using ‘UTF-8’... failed - ‘PLNmixture.Rmd’ using ‘UTF-8’... failed - ‘PLNnetwork.Rmd’ using ‘UTF-8’... OK - ‘Trichoptera.Rmd’ using ‘UTF-8’... OK + ‘Titanic_example.Rmd’ using ‘UTF-8’... failed ``` * checking re-building of vignette outputs ... NOTE ``` Error(s) in re-building vignettes: - --- re-building ‘Import_data.Rmd’ using rmarkdown - --- finished re-building ‘Import_data.Rmd’ + --- re-building ‘Titanic_example.Rmd’ using rmarkdown + ``` + +# mppR + +
+ +* Version: 1.5.0 +* GitHub: https://github.com/vincentgarin/mppR +* Source code: https://github.com/cran/mppR +* Date/Publication: 2024-02-22 17:20:02 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "mppR")` for more info + +
+ +## Newly broken + +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘mppR_gen_vignette.Rmd’ + ... + + > set.seed(89341) - --- re-building ‘PLN.Rmd’ using rmarkdown + > CV <- mpp_CV(pop.name = "USNAM", trait.name = "ULA", + + mppData = mppData, Q.eff = "cr", her = 0.4, Rep = 2, k = 5, + + verbose = FALSE, outp .... [TRUNCATED] + + When sourcing ‘mppR_gen_vignette.R’: + Error: unused argument (QTL.names) + Execution halted + + ‘MPP_ME_QTL_detect.Rmd’ using ‘UTF-8’... OK + ‘mppR_gen_vignette.Rmd’ using ‘UTF-8’... failed ``` -## In both +* checking whether package ‘mppR’ can be installed ... WARNING + ``` + Found the following significant warnings: + Note: possible error in 'is.element(mk.list, QTL.names)': unused argument (QTL.names) + See ‘/tmp/workdir/mppR/new/mppR.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. + ``` -* checking installed package size ... NOTE +* checking R code for possible problems ... NOTE ``` - installed size is 26.0Mb - sub-directories of 1Mb or more: - R 1.0Mb - data 3.5Mb - doc 2.1Mb - libs 18.6Mb + mpp_CV: possible error in is.element(mk.list, QTL.names): unused + argument (QTL.names) + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘MPP_ME_QTL_detect.Rmd’ using rmarkdown ``` -# plotBart +# MPTmultiverse
-* Version: 0.1.7 -* GitHub: https://github.com/priism-center/plotBart -* Source code: https://github.com/cran/plotBart -* Date/Publication: 2022-05-27 07:50:06 UTC -* Number of recursive dependencies: 94 +* Version: 0.4-2 +* GitHub: https://github.com/mpt-network/MPTmultiverse +* Source code: https://github.com/cran/MPTmultiverse +* Date/Publication: 2020-06-24 09:40:11 UTC +* Number of recursive dependencies: 99 -Run `revdepcheck::cloud_details(, "plotBart")` for more info +Run `revdepcheck::cloud_details(, "MPTmultiverse")` for more info
## Newly broken -* checking tests ... ERROR +* checking examples ... ERROR ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(vdiffr) - > library(plotBart) - Loading required package: bartCause - Loading required package: ggplot2 - > - > test_check("plotBart") # run tests - ... - • plots/mod-search.svg - • plots/overlappscoresdensity.svg - • plots/overlapvarsdensity.svg - • plots/pate.svg - • plots/sate.svg - • plots/supportchi.svg - • plots/supportsd.svg - • plots/waterfall2.svg - Error: Test failures - Execution halted + Running examples in ‘MPTmultiverse-Ex.R’ failed + The error most likely occurred in: + + > ### Name: fit_mpt + > ### Title: Multiverse Analysis for MPT Models + > ### Aliases: fit_mpt + > + > ### ** Examples + > + > + ... + Backtrace: + ▆ + 1. ├─base::plot(fit_all, which = "est") + 2. └─MPTmultiverse:::plot.multiverseMPT(fit_all, which = "est") + 3. └─MPTmultiverse:::plot_est(x, shapes = shapes) + 4. └─ggplot2::facet_grid(facets = ". ~ condition") + 5. └─lifecycle::deprecate_stop("2.2.0", "facet_grid(facets)", "facet_grid(rows)") + 6. └─lifecycle:::deprecate_stop0(msg) + 7. └─rlang::cnd_signal(...) + Execution halted ``` -# plotDK +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘introduction-bayen_kuhlmann_2011.rmd’ + ... + ℹ Please use tidy evaluation idioms with `aes()` + ℹ The deprecated feature was likely used in the MPTmultiverse package. + Please report the issue at + . + + When sourcing ‘introduction-bayen_kuhlmann_2011.R’: + Error: The `facets` argument of `facet_grid()` was deprecated in ggplot2 2.2.0 + and is now defunct. + ℹ Please use the `rows` argument instead. + Execution halted + + ‘introduction-bayen_kuhlmann_2011.rmd’ using ‘UTF-8’... failed + ``` + +* checking re-building of vignette outputs ... NOTE + ``` + Error(s) in re-building vignettes: + --- re-building ‘introduction-bayen_kuhlmann_2011.rmd’ using rmarkdown + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# mtb
-* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/plotDK -* Date/Publication: 2021-10-01 08:00:02 UTC -* Number of recursive dependencies: 86 +* Version: 0.1.8 +* GitHub: https://github.com/yh202109/mtb +* Source code: https://github.com/cran/mtb +* Date/Publication: 2022-10-20 17:22:35 UTC +* Number of recursive dependencies: 63 -Run `revdepcheck::cloud_details(, "plotDK")` for more info +Run `revdepcheck::cloud_details(, "mtb")` for more info
@@ -20009,49 +13563,68 @@ Run `revdepcheck::cloud_details(, "plotDK")` for more info Running the tests in ‘tests/testthat.R’ failed. Complete output: > library(testthat) - > library(plotDK) + > library(mtb) > - > test_check("plotDK") - [ FAIL 2 | WARN 0 | SKIP 0 | PASS 46 ] + > test_check("mtb") + + Attaching package: 'ggplot2' - ══ Failed tests ════════════════════════════════════════════════════════════════ ... - Error in `expect_setequal(c("x", "y", "group", "subgroup", "text", "fill"), - names(labels))`: `object` and `expected` must both be vectors - Backtrace: - ▆ - 1. └─testthat::expect_setequal(c("x", "y", "group", "subgroup", "text", "fill"), names(labels)) at test-plotDK.R:67:5 - 2. └─rlang::abort("`object` and `expected` must both be vectors") + - "yend" [6] + - "xmin" [7] + - "xmax" [8] + - "ymin" [9] + - "ymax" [10] + ... ... ... and 3 more ... - [ FAIL 2 | WARN 0 | SKIP 0 | PASS 46 ] + [ FAIL 2 | WARN 13 | SKIP 0 | PASS 56 ] Error: Test failures Execution halted ``` -## In both +# mudfold + +
+ +* Version: 1.1.21 +* GitHub: https://github.com/cran/mudfold +* Source code: https://github.com/cran/mudfold +* Date/Publication: 2022-11-24 09:30:02 UTC +* Number of recursive dependencies: 50 -* checking dependencies in R code ... NOTE +Run `revdepcheck::cloud_details(, "mudfold")` for more info + +
+ +## Newly broken + +* checking whether package ‘mudfold’ can be installed ... WARNING ``` - Namespace in Imports field not imported from: ‘mapproj’ - All declared Imports should be used. + Found the following significant warnings: + Note: possible error in 'is.element(visitSequence, ': unused argument (names(blocks)) + See ‘/tmp/workdir/mudfold/new/mudfold.Rcheck/00install.out’ for details. + Information on the location(s) of code generating the ‘Note’s can be + obtained by re-running with environment variable R_KEEP_PKG_SOURCE set + to ‘yes’. ``` -* checking data for non-ASCII characters ... NOTE +* checking R code for possible problems ... NOTE ``` - Note: found 12992 marked UTF-8 strings + check.visitSequence: possible error in is.element(visitSequence, + names(blocks)): unused argument (names(blocks)) ``` -# plotly +# mulgar
-* Version: 4.10.4 -* GitHub: https://github.com/plotly/plotly.R -* Source code: https://github.com/cran/plotly -* Date/Publication: 2024-01-13 22:40:02 UTC -* Number of recursive dependencies: 148 +* Version: 1.0.2 +* GitHub: https://github.com/dicook/mulgar +* Source code: https://github.com/cran/mulgar +* Date/Publication: 2023-08-25 22:00:02 UTC +* Number of recursive dependencies: 43 -Run `revdepcheck::cloud_details(, "plotly")` for more info +Run `revdepcheck::cloud_details(, "mulgar")` for more info
@@ -20059,372 +13632,348 @@ Run `revdepcheck::cloud_details(, "plotly")` for more info * checking examples ... ERROR ``` - Running examples in ‘plotly-Ex.R’ failed + Running examples in ‘mulgar-Ex.R’ failed The error most likely occurred in: - > ### Name: style - > ### Title: Modify trace(s) - > ### Aliases: style + > ### Name: ggmcbic + > ### Title: Produces an mclust summary plot with ggplot + > ### Aliases: ggmcbic > > ### ** Examples > - > ## Don't show: + > require(mclust) ... - + # this clobbers the previously supplied marker.line.color - + style(p, marker.line = list(width = 2.5), marker.size = 10) - + ## Don't show: - + }) # examplesIf - > (p <- ggplotly(qplot(data = mtcars, wt, mpg, geom = c("point", "smooth")))) - Warning: `qplot()` was deprecated in ggplot2 3.4.0. - `geom_smooth()` using method = 'loess' and formula = 'y ~ x' - Error in pm[[2]] : subscript out of bounds - Calls: ... eval -> eval -> ggplotly -> ggplotly.ggplot -> gg2list + Type 'citation("mclust")' for citing this R package in publications. + > data(clusters) + > clusters_BIC <- mclustBIC(clusters[,1:5], G=2:6) + > ggmcbic(clusters_BIC) + Warning: Removed 5 rows containing missing values or values outside the scale range + (`geom_line()`). + Error in grid.Call.graphics(C_segments, x$x0, x$y0, x$x1, x$y1, x$arrow) : + invalid line type: must be length 2, 4, 6 or 8 + Calls: ... drawDetails -> drawDetails.segments -> grid.Call.graphics Execution halted ``` -* checking tests ... ERROR - ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library("testthat") - > library("plotly") - Loading required package: ggplot2 - - Attaching package: 'plotly' - - The following object is masked from 'package:ggplot2': - ... - • plotly-subplot/subplot-bump-axis-annotation.svg - • plotly-subplot/subplot-bump-axis-image.svg - • plotly-subplot/subplot-bump-axis-shape-shared.svg - • plotly-subplot/subplot-bump-axis-shape.svg - • plotly-subplot/subplot-reposition-annotation.svg - • plotly-subplot/subplot-reposition-image.svg - • plotly-subplot/subplot-reposition-shape-fixed.svg - • plotly-subplot/subplot-reposition-shape.svg - Error: Test failures - Execution halted - ``` - ## In both * checking installed package size ... NOTE ``` - installed size is 7.1Mb + installed size is 8.8Mb sub-directories of 1Mb or more: - R 1.0Mb - htmlwidgets 4.0Mb + data 8.5Mb ``` -# pmartR +# MultiTraits
-* Version: 2.4.5 -* GitHub: https://github.com/pmartR/pmartR -* Source code: https://github.com/cran/pmartR -* Date/Publication: 2024-05-21 15:50:02 UTC -* Number of recursive dependencies: 148 +* Version: 0.2.0 +* GitHub: NA +* Source code: https://github.com/cran/MultiTraits +* Date/Publication: 2024-12-21 14:10:02 UTC +* Number of recursive dependencies: 138 -Run `revdepcheck::cloud_details(, "pmartR")` for more info +Run `revdepcheck::cloud_details(, "MultiTraits")` for more info
## Newly broken -* checking tests ... ERROR +* checking examples ... ERROR ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(pmartR) - > - > test_check("pmartR") - [ FAIL 1 | WARN 1 | SKIP 11 | PASS 2375 ] - - ══ Skipped tests (11) ══════════════════════════════════════════════════════════ + Running examples in ‘MultiTraits-Ex.R’ failed + The error most likely occurred in: + + > ### Name: CSR_plot + > ### Title: Create a ternary plot of CSR strategies + > ### Aliases: CSR_plot + > + > ### ** Examples + > + > data(PFF) ... - • plots/plot-spansres-color-high-color-low.svg - • plots/plot-spansres.svg - • plots/plot-statres-anova-volcano.svg - • plots/plot-statres-anova.svg - • plots/plot-statres-combined-volcano.svg - • plots/plot-statres-combined.svg - • plots/plot-statres-gtest.svg - • plots/plot-totalcountfilt.svg - Error: Test failures - Execution halted + 3. ├─ggtern::ggplot_build(x) + 4. └─ggtern:::ggplot_build.ggplot(x) + 5. └─ggtern:::layers_add_or_remove_mask(plot) + 6. └─ggint$plot_theme(plot) + 7. └─ggplot2:::validate_theme(theme) + 8. └─base::mapply(...) + 9. └─ggplot2 (local) ``(...) + 10. └─cli::cli_abort(...) + 11. └─rlang::abort(...) + Execution halted ``` -## In both +* checking running R code from vignettes ... ERROR + ``` + Errors in running code in vignettes: + when running code in ‘MultiTraits_tutorial.Rmd’ + ... + 4 490 20 16 30.293240 30.891427 38.81533 CSR + 5 51 14 31 4.068212 0.000000 95.93179 R + 6 66 27 13 5.131786 73.958953 20.90926 S/SR + + > CSR_plot(data = result, expand_margin = 1) + + When sourcing ‘MultiTraits_tutorial.R’: + Error: The `tern.axis.ticks.length.major` theme element must be a + object. + Execution halted + + ‘MultiTraits_tutorial.Rmd’ using ‘UTF-8’... failed + ``` -* checking installed package size ... NOTE +* checking re-building of vignette outputs ... NOTE ``` - installed size is 10.8Mb - sub-directories of 1Mb or more: - R 1.5Mb - help 1.5Mb - libs 6.7Mb + Error(s) in re-building vignettes: + ... + --- re-building ‘MultiTraits_tutorial.Rmd’ using rmarkdown + + Quitting from lines 106-120 [unnamed-chunk-4] (MultiTraits_tutorial.Rmd) + Error: processing vignette 'MultiTraits_tutorial.Rmd' failed with diagnostics: + The `tern.axis.ticks.length.major` theme element must be a + object. + --- failed re-building ‘MultiTraits_tutorial.Rmd’ + + SUMMARY: processing the following file failed: + ‘MultiTraits_tutorial.Rmd’ + + Error: Vignette re-building failed. + Execution halted ``` -# pmxTools +# mvSLOUCH
-* Version: 1.3 -* GitHub: https://github.com/kestrel99/pmxTools -* Source code: https://github.com/cran/pmxTools -* Date/Publication: 2023-02-21 16:00:08 UTC -* Number of recursive dependencies: 85 +* Version: 2.7.6 +* GitHub: NA +* Source code: https://github.com/cran/mvSLOUCH +* Date/Publication: 2023-11-20 18:20:06 UTC +* Number of recursive dependencies: 101 -Run `revdepcheck::cloud_details(, "pmxTools")` for more info +Run `revdepcheck::cloud_details(, "mvSLOUCH")` for more info
## Newly broken -* checking tests ... ERROR +* checking re-building of vignette outputs ... NOTE ``` - Running ‘testthat.R’ - Running the tests in ‘tests/testthat.R’ failed. - Complete output: - > library(testthat) - > library(pmxTools) - Loading required package: patchwork - > - > test_check("pmxTools") - [ FAIL 1 | WARN 1 | SKIP 12 | PASS 110 ] - + Error(s) in re-building vignettes: + --- re-building ‘mvSLOUCH_Carnivorans.Rmd’ using rmarkdown + trying URL 'datadryad.org/api/v2/datasets/doi%253A10.5061%252Fdryad.77tm4/download' + downloaded 51 KB + +