diff --git a/DESCRIPTION b/DESCRIPTION index be9f013c4a..1deed8f79e 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,6 +1,6 @@ Package: ggplot2 Title: Create Elegant Data Visualisations Using the Grammar of Graphics -Version: 3.5.2.9000 +Version: 3.5.2.9001 Authors@R: c( person("Hadley", "Wickham", , "hadley@posit.co", role = "aut", comment = c(ORCID = "0000-0003-4757-117X")), @@ -40,6 +40,7 @@ Imports: isoband, lifecycle (> 1.0.1), rlang (>= 1.1.0), + S7, scales (>= 1.4.0), stats, vctrs (>= 0.6.0), @@ -95,6 +96,7 @@ Collate: 'compat-plyr.R' 'utilities.R' 'aes.R' + 'all-classes.R' 'annotation-borders.R' 'utilities-checks.R' 'legend-draw.R' @@ -181,6 +183,8 @@ Collate: 'grob-dotstack.R' 'grob-null.R' 'grouping.R' + 'properties.R' + 'margins.R' 'theme-elements.R' 'guide-.R' 'guide-axis.R' @@ -204,7 +208,6 @@ Collate: 'layer-sf.R' 'layout.R' 'limits.R' - 'margins.R' 'performance.R' 'plot-build.R' 'plot-construction.R' diff --git a/NAMESPACE b/NAMESPACE index 2289af8fbe..5893c8bb5a 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -1,31 +1,35 @@ # Generated by roxygen2: do not edit by hand +S3method("$","ggplot2::element") +S3method("$","ggplot2::gg") +S3method("$","ggplot2::theme") S3method("$",ggproto) S3method("$",ggproto_parent) -S3method("$",theme) -S3method("$<-",uneval) -S3method("+",gg) +S3method("$<-","ggplot2::element") +S3method("$<-","ggplot2::gg") +S3method("$<-","ggplot2::mapping") +S3method("[","ggplot2::element") +S3method("[","ggplot2::gg") +S3method("[","ggplot2::mapping") S3method("[",mapped_discrete) -S3method("[",uneval) +S3method("[<-","ggplot2::element") +S3method("[<-","ggplot2::gg") +S3method("[<-","ggplot2::mapping") S3method("[<-",mapped_discrete) -S3method("[<-",uneval) +S3method("[[","ggplot2::element") +S3method("[[","ggplot2::gg") S3method("[[",ggproto) -S3method("[[<-",uneval) +S3method("[[<-","ggplot2::element") +S3method("[[<-","ggplot2::gg") +S3method("[[<-","ggplot2::mapping") S3method(.DollarNames,ggproto) S3method(as.data.frame,mapped_discrete) -S3method(as.gtable,ggplot) -S3method(as.gtable,ggplot_built) S3method(as.list,ggproto) S3method(autolayer,default) S3method(autoplot,default) S3method(c,mapped_discrete) S3method(drawDetails,zeroGrob) -S3method(element_grob,element_blank) -S3method(element_grob,element_line) -S3method(element_grob,element_point) -S3method(element_grob,element_polygon) -S3method(element_grob,element_rect) -S3method(element_grob,element_text) +S3method(element_grob,default) S3method(format,ggproto) S3method(format,ggproto_method) S3method(format,rd_section_aesthetics) @@ -52,30 +56,12 @@ S3method(fortify,sfg) S3method(fortify,summary.glht) S3method(fortify,tbl) S3method(fortify,tbl_df) -S3method(get_alt_text,ggplot) -S3method(get_alt_text,ggplot_built) -S3method(get_alt_text,gtable) S3method(ggplot,"function") S3method(ggplot,default) -S3method(ggplot_add,"NULL") -S3method(ggplot_add,"function") -S3method(ggplot_add,Coord) -S3method(ggplot_add,Facet) -S3method(ggplot_add,Guides) -S3method(ggplot_add,Layer) -S3method(ggplot_add,Scale) -S3method(ggplot_add,by) -S3method(ggplot_add,data.frame) S3method(ggplot_add,default) -S3method(ggplot_add,labels) -S3method(ggplot_add,list) -S3method(ggplot_add,theme) -S3method(ggplot_add,uneval) -S3method(ggplot_build,ggplot) -S3method(ggplot_build,ggplot_built) -S3method(ggplot_gtable,ggplot_built) +S3method(ggplot_build,default) +S3method(ggplot_gtable,default) S3method(grid.draw,absoluteGrob) -S3method(grid.draw,ggplot) S3method(grobHeight,absoluteGrob) S3method(grobHeight,zeroGrob) S3method(grobWidth,absoluteGrob) @@ -98,27 +84,22 @@ S3method(limits,numeric) S3method(makeContext,dotstackGrob) S3method(make_constructor,Geom) S3method(make_constructor,Stat) -S3method(merge_element,default) -S3method(merge_element,element) -S3method(merge_element,element_blank) -S3method(merge_element,margin) S3method(pattern_alpha,GridPattern) S3method(pattern_alpha,GridTilingPattern) S3method(pattern_alpha,default) S3method(pattern_alpha,list) -S3method(plot,ggplot) S3method(predictdf,default) S3method(predictdf,glm) S3method(predictdf,locfit) S3method(predictdf,loess) +S3method(print,"ggplot2::ggplot") +S3method(print,"ggplot2::mapping") +S3method(print,"ggplot2::theme") S3method(print,element) -S3method(print,ggplot) S3method(print,ggplot2_bins) S3method(print,ggproto) S3method(print,ggproto_method) S3method(print,rel) -S3method(print,theme) -S3method(print,uneval) S3method(scale_type,Date) S3method(scale_type,POSIXt) S3method(scale_type,character) @@ -132,7 +113,6 @@ S3method(scale_type,logical) S3method(scale_type,numeric) S3method(scale_type,ordered) S3method(scale_type,sfc) -S3method(summary,ggplot) S3method(vec_cast,character.mapped_discrete) S3method(vec_cast,double.mapped_discrete) S3method(vec_cast,factor.mapped_discrete) @@ -288,6 +268,7 @@ export(StatSummaryBin) export(StatSummaryHex) export(StatUnique) export(StatYdensity) +export(add_gg) export(aes) export(aes_) export(aes_all) @@ -311,8 +292,14 @@ export(autoplot) export(benchplot) export(binned_scale) export(borders) +export(build_ggplot) export(calc_element) export(check_device) +export(class_ggplot) +export(class_ggplot_built) +export(class_labels) +export(class_mapping) +export(class_theme) export(combine_vars) export(complete_theme) export(continuous_scale) @@ -334,6 +321,7 @@ export(cut_width) export(datetime_scale) export(derive) export(discrete_scale) +export(draw_element) export(draw_key_abline) export(draw_key_blank) export(draw_key_boxplot) @@ -353,6 +341,7 @@ export(draw_key_vline) export(draw_key_vpath) export(dup_axis) export(el_def) +export(element) export(element_blank) export(element_geom) export(element_grob) @@ -456,6 +445,7 @@ export(ggproto) export(ggproto_parent) export(ggsave) export(ggtitle) +export(gtable_ggplot) export(guide_axis) export(guide_axis_logticks) export(guide_axis_stack) @@ -762,6 +752,7 @@ export(transform_position) export(translate_shape_string) export(unit) export(update_geom_defaults) +export(update_ggplot) export(update_labels) export(update_stat_defaults) export(update_theme) @@ -773,11 +764,13 @@ export(xlim) export(ylab) export(ylim) export(zeroGrob) +if (getRversion() < "4.3.0") importFrom("S7", "@") import(grid) import(gtable) import(rlang) import(scales) import(vctrs) +importFrom(S7,convert) importFrom(grid,arrow) importFrom(grid,unit) importFrom(lifecycle,deprecated) diff --git a/NEWS.md b/NEWS.md index 54f8c1429a..894584924d 100644 --- a/NEWS.md +++ b/NEWS.md @@ -4,6 +4,7 @@ ### Breaking changes +* The S3 parts of ggplot2 have been replaced with S7 bits (#6352). * (breaking) `geom_violin(quantiles)` now has actual quantiles based on the data, rather than inferred quantiles based on the computed density. The `quantiles` parameter that replaces `draw_quantiles` now belongs to @@ -20,9 +21,10 @@ * Moved mgcv from Imports to Suggests * Moved tibble from Imports to Suggests * Removed glue dependency -* Default labels are derived in `ggplot_build()` rather than - in `ggplot_add.Layer()`. This may affect code that accessed the `plot$labels` - field (@teunbrand, #5894). +* Default labels are derived in `build_ggplot()` (previously `ggplot_build()`) + rather than in the layer method of `update_ggplot()` + (previously `ggplot_add.Layer()`). This may affect code that accessed the + `plot$labels` property (@teunbrand, #5894). ### Lifecycle changes diff --git a/R/aes.R b/R/aes.R index 33eae1de83..a4579cf2a5 100644 --- a/R/aes.R +++ b/R/aes.R @@ -46,8 +46,8 @@ NULL #' 'AsIs' variables. #' #' @family aesthetics documentation -#' @return A list with class `uneval`. Components of the list are either -#' quosures or constants. +#' @return An S7 object representing a list with class `mapping`. Components of +#' the list are either quosures or constants. #' @export #' @examples #' aes(x = mpg, y = wt) @@ -105,13 +105,12 @@ aes <- function(x, y, ...) { inject(aes(!!!args)) }) - aes <- new_aes(args, env = parent.frame()) - rename_aes(aes) + class_mapping(rename_aes(args), env = parent.frame()) } #' @export #' @rdname is_tests -is_mapping <- function(x) inherits(x, "uneval") +is_mapping <- function(x) S7::S7_inherits(x, class_mapping) # Wrap symbolic objects in quosures but pull out constants out of # quosures for backward-compatibility @@ -130,14 +129,10 @@ new_aesthetic <- function(x, env = globalenv()) { x } -new_aes <- function(x, env = globalenv()) { - check_object(x, is.list, "a {.cls list}") - x <- lapply(x, new_aesthetic, env = env) - structure(x, class = "uneval") -} #' @export -print.uneval <- function(x, ...) { +# TODO: should convert to proper S7 method once bug in S7 is resolved +`print.ggplot2::mapping` <- function(x, ...) { cat("Aesthetic mapping: \n") if (length(x) == 0) { @@ -152,26 +147,24 @@ print.uneval <- function(x, ...) { invisible(x) } +# TODO: should convert to proper S7 method once bug in S7 is resolved #' @export -"[.uneval" <- function(x, i, ...) { - new_aes(NextMethod()) +"[.ggplot2::mapping" <- function(x, i, ...) { + class_mapping(NextMethod()) } # If necessary coerce replacements to quosures for compatibility #' @export -"[[<-.uneval" <- function(x, i, value) { - new_aes(NextMethod()) +"[[<-.ggplot2::mapping" <- function(x, i, value) { + class_mapping(NextMethod()) } #' @export -"$<-.uneval" <- function(x, i, value) { - # Can't use NextMethod() because of a bug in R 3.1 - x <- unclass(x) - x[[i]] <- value - new_aes(x) +"$<-.ggplot2::mapping" <- function(x, i, value) { + class_mapping(NextMethod()) } #' @export -"[<-.uneval" <- function(x, i, value) { - new_aes(NextMethod()) +"[<-.ggplot2::mapping" <- function(x, i, value) { + class_mapping(NextMethod()) } #' Standardise aesthetic names @@ -212,8 +205,7 @@ substitute_aes <- function(x, fun = standardise_aes_symbols, ...) { x <- lapply(x, function(aesthetic) { as_quosure(fun(quo_get_expr(aesthetic), ...), env = environment(aesthetic)) }) - class(x) <- "uneval" - x + class_mapping(x) } # x is a quoted expression from inside aes() standardise_aes_symbols <- function(x) { @@ -311,7 +303,7 @@ aes_ <- function(x, y, ...) { } } mapping <- lapply(mapping, as_quosure_aes) - structure(rename_aes(mapping), class = "uneval") + class_mapping(rename_aes(mapping)) } #' @rdname aes_ @@ -337,7 +329,7 @@ aes_string <- function(x, y, ...) { new_aesthetic(x, env = caller_env) }) - structure(rename_aes(mapping), class = "uneval") + class_mapping(rename_aes(mapping)) } #' @export @@ -358,10 +350,9 @@ aes_all <- function(vars) { # Quosure the symbols in the empty environment because they can only # refer to the data mask - structure( - lapply(vars, function(x) new_quosure(as.name(x), emptyenv())), - class = c("unlabelled_uneval", "uneval") - ) + x <- class_mapping(lapply(vars, function(x) new_quosure(as.name(x), emptyenv()))) + class(x) <- union("unlabelled", class(x)) + x } #' Automatic aesthetic mapping diff --git a/R/all-classes.R b/R/all-classes.R new file mode 100644 index 0000000000..23fb806578 --- /dev/null +++ b/R/all-classes.R @@ -0,0 +1,199 @@ +# S3 classes -------------------------------------------------------------- + +# Meta classes: +# TODO: These should be replaced once R 4.3.0 is the minimum version as `+` +# dispatch should work as intended. +class_gg <- S7::new_class("gg", abstract = TRUE) +class_S3_gg <- S7::new_S3_class("gg") + +# Proper S3 classes we need awareness for +class_ggproto <- S7::new_S3_class("ggproto") +class_gtable <- S7::new_S3_class("gtable") + +# The important ggproto classes that we treat as S3 classes in S7 even though +# they are their own thing. +class_scale <- S7::new_S3_class("Scale") +class_guides <- S7::new_S3_class("Guides") +class_coord <- S7::new_S3_class("Coord") +class_facet <- S7::new_S3_class("Facet") +class_layer <- S7::new_S3_class("Layer") +class_layout <- S7::new_S3_class("Layout") +class_scales_list <- S7::new_S3_class("ScalesList") + +# User facing classes ----------------------------------------------------- + +#' The theme class +#' +#' The theme class holds information on how non-data elements of the plot +#' should be rendered. The preferred way to construct an object of this class +#' is through the [`theme()`] function. +#' +#' @param elements A named list containing theme elements. +#' @param complete A boolean value stating whether a theme is complete. +#' @param validate A boolean value stating whether a theme should still be +#' validated. +#' +#' @keywords internal +#' @export +class_theme <- S7::new_class( + "theme", class_S3_gg, + properties = list( + complete = S7::class_logical, + validate = S7::class_logical + ), + constructor = function(elements, complete, validate) { + S7::new_object( + elements, + complete = complete, + validate = validate + ) + } +) + +#' The labels class +#' +#' The labels class holds a list with label information to display as titles +#' of plot components. The preferred way to construct an object of the labels +#' class is to use the [`labs()`] function. +#' +#' @param labels A named list. +#' +#' @keywords internal +#' @export +class_labels <- S7::new_class( + "labels", parent = class_S3_gg, + constructor = function(labels) S7::new_object(labels), + validator = function(self) { + if (!is.list(self)) { + return("labels must be a list.") + } + if (!is_named2(self)) { + return("every label must be named.") + } + dups <- unique(names(self)[duplicated(names(self))]) + if (length(dups) > 0) { + dups <- oxford_comma(dups, final = "and") + return(paste0("labels cannot contain duplicate names (", dups, ").")) + } + return(NULL) + } +) + +#' The mapping class +#' +#' The mapping class holds a list of quoted expressions +#' ([quosures][rlang::topic-quosure]) or constants. An object is typically +#' constructed using the [`aes()`] function. +#' +#' @param x A list of quosures and constants. +#' @param env An environment for symbols that are not quosures or constants. +#' +#' @keywords internal +#' @export +class_mapping <- S7::new_class( + "mapping", parent = class_S3_gg, + constructor = function(x, env = globalenv()) { + check_object(x, is.list, "a {.cls list}") + x <- lapply(x, new_aesthetic, env = env) + x <- S7::new_object(x) + class(x) <- union(c("ggplot2::mapping", "uneval"), class(x)) + x + } +) + +#' The ggplot class +#' +#' The ggplot class collects the needed information to render a plot. +#' This class can be constructed using the [`ggplot()`] function. +#' +#' @param data A property containing any data coerced by [`fortify()`]. +#' @param layers A list of layer instances created by [`layer()`]. +#' @param scales A ScalesList ggproto object. +#' @param guides A Guides ggproto object created by [`guides()`]. +#' @param mapping A mapping class object created by [`aes()`]. +#' @param theme A theme class object created by [`theme()`]. +#' @param coordinates A Coord ggproto object created by `coord_*()` family of +#' functions. +#' @param facet A Facet ggproto object created by `facet_*()` family of +#' functions. +#' @param layout A Layout ggproto object. +#' @param labels A labels object created by [`labs()`]. +#' @param meta A list for additional metadata. This will be deprecated in the +#' future. +#' @param plot_env An environment. +#' +#' @keywords internal +#' @export +class_ggplot <- S7::new_class( + name = "ggplot", parent = class_gg, + properties = list( + data = S7::class_any, + layers = S7::class_list, + scales = class_scales_list, + guides = class_guides, + mapping = class_mapping, + theme = class_theme, + coordinates = class_coord, + facet = class_facet, + layout = class_layout, + labels = class_labels, + meta = S7::class_list, + plot_env = S7::class_environment + ), + constructor = function(data = waiver(), layers = list(), scales = NULL, + guides = NULL, mapping = aes(), theme = NULL, + coordinates = coord_cartesian(default = TRUE), + facet = facet_null(), layout = NULL, + labels = labs(), meta = list(), + plot_env = parent.frame()) { + S7::new_object( + S7::S7_object(), + data = data, + layers = layers, + scales = scales %||% scales_list(), + guides = guides %||% guides_list(), + mapping = mapping, + theme = theme %||% theme(), + coordinates = coordinates, + facet = facet, + layout = layout %||% ggproto(NULL, Layout), + labels = labels, + meta = meta, + plot_env = plot_env + ) + } +) + +#' The ggplot built class +#' +#' The ggplot built class is an intermediate class and represents a processed +#' ggplot object ready for rendering. It is constructed by calling +#' [`ggplot_build()`] on a [ggplot][class_ggplot] object and is not meant to be +#' instantiated directly. The class can be rendered to a gtable object by +#' calling the [`ggplot_gtable()`] function on a ggplot built class object. +#' +#' @param data A list of plain data frames; one for each layer. +#' @param layout A Layout ggproto object. +#' @param plot A completed ggplot class object. +#' +#' @keywords internal +#' @export +class_ggplot_built <- S7::new_class( + "ggplot_built", parent = class_gg, + properties = list( + data = S7::class_list, + layout = class_layout, + plot = class_ggplot + ), + constructor = function(data = NULL, layout = NULL, plot = NULL) { + if (is.null(data) || is.null(layout) || is.null(plot)) { + cli::cli_abort( + "The {.cls ggplot_built} class should be constructed by {.fn ggplot_build}." + ) + } + S7::new_object( + S7::S7_object(), + data = data, layout = layout, plot = plot + ) + } +) diff --git a/R/backports.R b/R/backports.R index 7ccedc4296..53ab2a6f7e 100644 --- a/R/backports.R +++ b/R/backports.R @@ -15,6 +15,10 @@ if (getRversion() < "3.3") { backport_unit_methods <- function() {} } +# enable usage of @name in package code +#' @rawNamespace if (getRversion() < "4.3.0") importFrom("S7", "@") +NULL + on_load(backport_unit_methods()) unitType <- function(x) { diff --git a/R/bench.R b/R/bench.R index 4d679b8e31..81835836ac 100644 --- a/R/bench.R +++ b/R/bench.R @@ -15,7 +15,7 @@ benchplot <- function(x) { x <- enquo(x) construct <- system.time(x <- eval_tidy(x)) - check_inherits(x, "ggplot") + check_inherits(x, "ggplot2::ggplot") build <- system.time(data <- ggplot_build(x)) render <- system.time(grob <- ggplot_gtable(data)) diff --git a/R/coord-sf.R b/R/coord-sf.R index 4d6e9c1490..51e0bfe17c 100644 --- a/R/coord-sf.R +++ b/R/coord-sf.R @@ -345,9 +345,9 @@ CoordSf <- ggproto("CoordSf", CoordCartesian, grobs <- list(element_render(theme, "panel.background")) } else { line_gp <- gg_par( - col = el$colour, - lwd = el$linewidth, - lty = el$linetype + col = el@colour, + lwd = el@linewidth, + lty = el@linetype ) grobs <- c( list(element_render(theme, "panel.background")), diff --git a/R/facet-.R b/R/facet-.R index ee36aa50c6..e4a010d612 100644 --- a/R/facet-.R +++ b/R/facet-.R @@ -958,9 +958,9 @@ is.facet <- function(x) { #' get_strip_labels(p + facet_grid(year ~ cyl)) get_strip_labels <- function(plot = get_last_plot()) { plot <- ggplot_build(plot) - layout <- plot$layout$layout - params <- plot$layout$facet_params - plot$plot$facet$format_strip_labels(layout, params) + layout <- plot@layout$layout + params <- plot@layout$facet_params + plot@plot@facet$format_strip_labels(layout, params) } # A "special" value, currently not used but could be used to determine @@ -1052,7 +1052,7 @@ check_vars <- function(x) { } # Native pipe have higher precedence than + so any type of gg object can be # expected here, not just ggplot - if (inherits(x, "gg")) { + if (S7::S7_inherits(x, class_gg)) { cli::cli_abort(c( "Please use {.fn vars} to supply facet variables.", "i" = "Did you use {.code %>%} or {.code |>} instead of {.code +}?" diff --git a/R/facet-grid-.R b/R/facet-grid-.R index 244ccc69f7..6f05fb0005 100644 --- a/R/facet-grid-.R +++ b/R/facet-grid-.R @@ -206,7 +206,7 @@ grid_as_facets_list <- function(rows, cols) { msg <- "{.arg rows} must be {.code NULL} or a {.fn vars} list if {.arg cols} is a {.fn vars} list." # Native pipe have higher precedence than + so any type of gg object can be # expected here, not just ggplot - if (inherits(rows, "gg")) { + if (S7::S7_inherits(rows, class_gg)) { msg <- c( msg, "i" = "Did you use {.code %>%} or {.code |>} instead of {.code +}?" diff --git a/R/geom-.R b/R/geom-.R index bcb8a49a21..339750450c 100644 --- a/R/geom-.R +++ b/R/geom-.R @@ -474,7 +474,7 @@ eval_from_theme <- function(aesthetics, theme, class = NULL) { return(aesthetics) } - element <- calc_element("geom", theme) %||% .default_geom_element + el <- calc_element("geom", theme) %||% .default_geom_element class <- setdiff(class, c("Geom", "ggproto", "gg")) if (length(class) > 0) { @@ -489,12 +489,12 @@ eval_from_theme <- function(aesthetics, theme, class = NULL) { # Inherit up to parent geom class if (length(class) > 0) { for (cls in rev(class)) { - element <- combine_elements(theme[[cls]], element) + el <- combine_elements(theme[[cls]], el) } } } - lapply(aesthetics[themed], eval_tidy, data = element) + lapply(aesthetics[themed], eval_tidy, data = S7::props(el)) } #' Graphical units diff --git a/R/geom-label.R b/R/geom-label.R index a49a1fbaed..15120bf6fd 100644 --- a/R/geom-label.R +++ b/R/geom-label.R @@ -87,7 +87,7 @@ GeomLabel <- ggproto("GeomLabel", Geom, data <- coord$transform(data, panel_params) data$vjust <- compute_just(data$vjust, data$y, data$x, data$angle) data$hjust <- compute_just(data$hjust, data$x, data$y, data$angle) - if (!is_margin("margin")) { + if (!is_margin(label.padding)) { label.padding <- rep(label.padding, length.out = 4) } diff --git a/R/grob-dotstack.R b/R/grob-dotstack.R index d3463c18bd..7bbcd28418 100644 --- a/R/grob-dotstack.R +++ b/R/grob-dotstack.R @@ -14,7 +14,7 @@ dotstackGrob <- function( y <- unit(y, default.units) if (!is.unit(dotdia)) dotdia <- unit(dotdia, default.units) - if (!unitType(dotdia) == "npc") + if (!isTRUE(unitType(dotdia) == "npc")) cli::cli_warn("Unit type of dotdia should be {.val npc}") grob(x = x, y = y, stackaxis = stackaxis, dotdia = dotdia, diff --git a/R/guide-.R b/R/guide-.R index fe3a65bbca..8b0cee001f 100644 --- a/R/guide-.R +++ b/R/guide-.R @@ -697,6 +697,8 @@ Guide <- ggproto( #' A grob representing tick marks. build_ticks = function(key, elements, params, position = params$position, length = elements$ticks_length) { + force(length) + # TODO: position logic is crooked, should this be reversed? if (!is_theme_element(elements)) { elements <- elements$ticks diff --git a/R/guide-axis-logticks.R b/R/guide-axis-logticks.R index 41fbbe4ab9..1a66637b31 100644 --- a/R/guide-axis-logticks.R +++ b/R/guide-axis-logticks.R @@ -121,7 +121,7 @@ guide_axis_logticks <- function( allow_null = TRUE ) check_bool(expanded) - check_inherits(short.theme, c("element_blank", "element_line")) + check_inherits(short.theme, c("ggplot2::element_blank", "ggplot2::element_line")) new_guide( available_aes = c("x", "y"), diff --git a/R/guide-axis-theta.R b/R/guide-axis-theta.R index e5c12e6cd8..796b406f96 100644 --- a/R/guide-axis-theta.R +++ b/R/guide-axis-theta.R @@ -154,7 +154,7 @@ GuideAxisTheta <- ggproto( } offset <- max(unit(0, "pt"), elements$major_length, elements$minor_length) - elements$offset <- offset + max(elements$text$margin %||% unit(0, "pt")) + elements$offset <- offset + max(try_prop(elements$text, "margin", default = unit(0, "pt"))) elements }, @@ -198,7 +198,7 @@ GuideAxisTheta <- ggproto( # Resolve text angle if (is_waiver(params$angle) || is.null(params$angle)) { - angle <- elements$text$angle + angle <- elements$text@angle } else { angle <- flip_text_angle(params$angle - rad2deg(key$theta)) } @@ -274,14 +274,14 @@ GuideAxisTheta <- ggproto( # Resolve text angle if (is_waiver(params$angle %||% waiver())) { - angle <- elements$text$angle + angle <- elements$text@angle } else { angle <- flip_text_angle(params$angle - rad2deg(key$theta)) } angle <- key$theta + deg2rad(angle) # Set margin - margin <- rep(max(elements$text$margin), length.out = 4) + margin <- rep(max(try_prop(elements$text, "margin", default = unit(0, "pt"))), length.out = 4) # Measure size of each individual label single_labels <- lapply(labels, function(lab) { diff --git a/R/guide-axis.R b/R/guide-axis.R index ae1784236f..5f5aa9b8b1 100644 --- a/R/guide-axis.R +++ b/R/guide-axis.R @@ -454,13 +454,13 @@ GuideAxis <- ggproto( # rather than dimensions of this axis alone. if (has_labels && params$position %in% c("left", "right")) { where <- layout$l[-c(1, length(layout$l))] - just <- with(elements$text, rotate_just(angle, hjust, vjust))$hjust %||% 0.5 + just <- rotate_just(element = elements$text)$hjust %||% 0.5 gt <- gtable_add_cols(gt, unit(just, "null"), pos = min(where) - 1) gt <- gtable_add_cols(gt, unit(1 - just, "null"), pos = max(where) + 1) } if (has_labels && params$position %in% c("top", "bottom")) { where <- layout$t[-c(1, length(layout$t))] - just <- with(elements$text, rotate_just(angle, hjust, vjust))$vjust %||% 0.5 + just <- rotate_just(element = elements$text)$vjust %||% 0.5 gt <- gtable_add_rows(gt, unit(1 - just, "null"), pos = min(where) - 1) gt <- gtable_add_rows(gt, unit(just, "null"), pos = max(where) + 1) } @@ -616,8 +616,8 @@ label_angle_heuristic <- function(element, position, angle) { hjust <- switch(position, left = cosine, right = 1 - cosine, top = 1 - sine, sine) vjust <- switch(position, left = 1 - sine, right = sine, top = 1 - cosine, cosine) - element$angle <- angle %||% element$angle - element$hjust <- hjust %||% element$hjust - element$vjust <- vjust %||% element$vjust + element@angle <- angle %||% try_prop(element, "angle") + element@hjust <- hjust %||% try_prop(element, "hjust") + element@vjust <- vjust %||% try_prop(element, "vjust") element } diff --git a/R/guide-custom.R b/R/guide-custom.R index c16260265e..d679a16759 100644 --- a/R/guide-custom.R +++ b/R/guide-custom.R @@ -113,7 +113,7 @@ GuideCustom <- ggproto( gt <- self$add_title( gt, title, title_position, - with(elems$title, rotate_just(angle, hjust, vjust)) + rotate_just(element = elems$title) ) # Add padding and background diff --git a/R/guide-legend.R b/R/guide-legend.R index 884b59cbf8..6378300c6d 100644 --- a/R/guide-legend.R +++ b/R/guide-legend.R @@ -326,7 +326,7 @@ GuideLegend <- ggproto( # Resolve title. The trick here is to override the main text element, so # that any settings declared in `legend.title` will be honoured but we have # custom defaults for the guide. - margin <- calc_element("text", theme)$margin + margin <- try_prop(calc_element("text", theme), "margin") title <- theme(text = element_text( hjust = 0, vjust = 0.5, margin = position_margin(title_position, margin, gap) @@ -574,7 +574,7 @@ GuideLegend <- ggproto( gt <- self$add_title( gt, grobs$title, elements$title_position, - with(elements$title, rotate_just(angle, hjust, vjust)) + rotate_just(element = elements$title) ) gt <- gtable_add_padding(gt, unit(elements$padding, "cm")) @@ -691,13 +691,17 @@ keep_key_data <- function(key, data, aes, show) { position_margin <- function(position, margin = NULL, gap = unit(0, "pt")) { margin <- margin %||% margin() - switch( + margin <- switch( position, top = replace(margin, 3, margin[3] + gap), bottom = replace(margin, 1, margin[1] + gap), left = replace(margin, 2, margin[2] + gap), right = replace(margin, 4, margin[4] + gap) ) + # We have to manually reconstitute the class because the 'simpleUnit' class + # might be dropped by the replacement operation. + class(margin) <- c("ggplot2::margin", class(margin), "S7_object") + margin } # Function implementing backward compatibility with the old way of specifying diff --git a/R/guides-.R b/R/guides-.R index 4c208506c0..a72e7d60db 100644 --- a/R/guides-.R +++ b/R/guides-.R @@ -835,7 +835,7 @@ get_guide_data <- function(plot = get_last_plot(), aesthetic, panel = 1L) { if (!aesthetic %in% c("x", "y", "x.sec", "y.sec", "theta", "r")) { # Non position guides: check if aesthetic in colnames of key - keys <- lapply(plot$plot$guides$params, `[[`, "key") + keys <- lapply(plot@plot@guides$params, `[[`, "key") keep <- vapply(keys, function(x) any(colnames(x) %in% aesthetic), logical(1)) keys <- switch(sum(keep) + 1, NULL, keys[[which(keep)]], keys[keep]) return(keys) @@ -843,12 +843,12 @@ get_guide_data <- function(plot = get_last_plot(), aesthetic, panel = 1L) { # Position guides: find the right layout entry check_number_whole(panel) - layout <- plot$layout$layout + layout <- plot@layout$layout select <- layout[layout$PANEL == panel, , drop = FALSE] if (nrow(select) == 0) { return(NULL) } - params <- plot$layout$panel_params[select$PANEL][[1]] + params <- plot@layout$panel_params[select$PANEL][[1]] # If panel params don't have guides, we probably have old coord system # that doesn't use the guide system. @@ -942,10 +942,12 @@ redistribute_null_units <- function(units, spacing, margin, type = "width") { # Get spacing between guides and margins in absolute units size <- switch(type, width = width_cm, height = height_cm) if (length(units) < 2) { + # When we have 1 guide, we don't need any spacing spacing <- unit(0, "cm") } else { spacing <- sum(rep(spacing, length.out = length(units) - 1)) } + margin <- switch(type, width = margin[c(2, 4)], height = margin[c(1, 3)]) margin <- sum(size(margin)) diff --git a/R/labels.R b/R/labels.R index 09f0490759..0c2cd1c7d4 100644 --- a/R/labels.R +++ b/R/labels.R @@ -12,7 +12,7 @@ #' update_labels(p, list(colour = "Fail silently")) update_labels <- function(p, labels) { p <- plot_clone(p) - p$labels <- defaults(labels, p$labels) + p@labels <- labs(!!!defaults(labels, p@labels)) p } @@ -26,9 +26,10 @@ setup_plot_labels <- function(plot, layers, data) { layer <- layers[[i]] mapping <- layer$computed_mapping - if (inherits(mapping, "unlabelled_uneval")) { + if (inherits(mapping, "unlabelled")) { next } + mapping <- mapping[have_name(mapping)] mapping <- strip_stage(mapping) mapping <- strip_dots(mapping, strip_pronoun = TRUE) @@ -75,7 +76,7 @@ setup_plot_labels <- function(plot, layers, data) { # Warn for spurious labels that don't have a mapping. # Note: sometimes, 'x' and 'y' might not have a mapping, like in # `geom_function()`. We can display these labels anyway, so we include them. - plot_labels <- plot$labels + plot_labels <- plot@labels known_labels <- c(names(labels), fn_fmls_names(labs), "x", "y") extra_labels <- setdiff(names(plot_labels), known_labels) @@ -115,7 +116,7 @@ setup_plot_labels <- function(plot, layers, data) { }) } - defaults(plot_labels, labels) + labs(!!!defaults(plot_labels, labels)) } #' Modify axis, legend, and plot labels @@ -188,21 +189,20 @@ setup_plot_labels <- function(plot, layers, data) { #' p + #' labs(title = "title") + #' labs(title = NULL) -labs <- function(..., title = waiver(), subtitle = waiver(), caption = waiver(), - tag = waiver(), dictionary = waiver(), alt = waiver(), - alt_insight = waiver()) { +labs <- function(..., title = waiver(), subtitle = waiver(), + caption = waiver(), tag = waiver(), dictionary = waiver(), + alt = waiver(), alt_insight = waiver()) { # .ignore_empty = "all" is needed to allow trailing commas, which is NOT a trailing comma for dots_list() as it's in ... args <- dots_list(..., title = title, subtitle = subtitle, caption = caption, - tag = tag, alt = allow_lambda(alt), alt_insight = alt_insight, - dictionary = dictionary, .ignore_empty = "all") + tag = tag, alt = allow_lambda(alt), alt_insight = alt_insight, + dictionary = dictionary, .ignore_empty = "all") is_waive <- vapply(args, is_waiver, logical(1)) args <- args[!is_waive] # remove duplicated arguments args <- args[!duplicated(names(args))] args <- rename_aes(args) - - structure(args, class = c("labels", "gg")) + class_labels(args) } #' @rdname labs @@ -238,18 +238,18 @@ ggtitle <- function(label, subtitle = waiver()) { get_labs <- function(plot = get_last_plot()) { plot <- ggplot_build(plot) - labs <- plot$plot$labels + labs <- plot@plot@labels xy_labs <- rename( - c(x = plot$layout$resolve_label(plot$layout$panel_scales_x[[1]], labs), - y = plot$layout$resolve_label(plot$layout$panel_scales_y[[1]], labs)), + c(x = plot@layout$resolve_label(plot@layout$panel_scales_x[[1]], labs), + y = plot@layout$resolve_label(plot@layout$panel_scales_y[[1]], labs)), c(x.primary = "x", x.secondary = "x.sec", y.primary = "y", y.secondary = "y.sec") ) labs <- defaults(xy_labs, labs) - guides <- plot$plot$guides + guides <- plot@plot@guides if (length(guides$aesthetics) == 0) { return(labs) } @@ -293,29 +293,29 @@ get_labs <- function(plot = get_last_plot()) { #' #' get_alt_text(p) #' -get_alt_text <- function(p, ...) { +get_alt_text <- S7::new_generic("get_alt_text", "p", fun = function(p, ...) { warn_dots_used() - UseMethod("get_alt_text") -} -#' @export -get_alt_text.ggplot <- function(p, ...) { - alt <- p$labels[["alt"]] %||% "" + S7::S7_dispatch() +}) + +S7::method(get_alt_text, class_ggplot) <- function(p, ...) { + alt <- p@labels[["alt"]] %||% "" if (!is.function(alt)) { return(alt) } - p$labels[["alt"]] <- NULL + p@labels[["alt"]] <- NULL build <- ggplot_build(p) - build$plot$labels[["alt"]] <- alt + build@plot@labels[["alt"]] <- alt get_alt_text(build) } -#' @export -get_alt_text.ggplot_built <- function(p, ...) { - alt <- p$plot$labels[["alt"]] %||% "" - p$plot$labels[["alt"]] <- NULL - if (is.function(alt)) alt(p$plot) else alt + +S7::method(get_alt_text, class_ggplot_built) <- function(p, ...) { + alt <- p@plot@labels[["alt"]] %||% "" + p@plot@labels[["alt"]] <- NULL + if (is.function(alt)) alt(p@plot) else alt } -#' @export -get_alt_text.gtable <- function(p, ...) { + +S7::method(get_alt_text, class_gtable) <- function(p, ...) { attr(p, "alt-label") %||% "" } @@ -365,8 +365,8 @@ get_alt_text.gtable <- function(p, ...) { #' generate_alt_text <- function(p) { # Combine titles - if (!is.null(p$labels$title %||% p$labels$subtitle)) { - title <- sub("\\.?$", "", c(p$labels$title, p$labels$subtitle)) + if (!is.null(p@labels$title %||% p@labels$subtitle)) { + title <- sub("\\.?$", "", c(p@labels$title, p@labels$subtitle)) if (length(title) == 2) { title <- paste0(title[1], ": ", title[2]) } @@ -382,7 +382,7 @@ generate_alt_text <- function(p) { axes <- safe_string(axes) # Get layer types - layers <- vapply(p$layers, function(l) snake_class(l$geom), character(1)) + layers <- vapply(p@layers, function(l) snake_class(l$geom), character(1)) layers <- sub("_", " ", sub("^geom_", "", unique0(layers))) if (length(layers) == 1) { layers <- paste0(" using a ", layers, " layer") @@ -393,8 +393,8 @@ generate_alt_text <- function(p) { # Combine alt <- paste0(title, "A plot", axes, layers, ".") - if (!is.null(p$labels$alt_insight)) { - alt <- paste0(alt, " ", p$labels$alt_insight) + if (!is.null(p@labels$alt_insight)) { + alt <- paste0(alt, " ", p@labels$alt_insight) } as.character(alt) } @@ -402,12 +402,12 @@ safe_string <- function(string) { if (length(string) == 0) "" else string } scale_description <- function(p, name) { - scale <- p$scales$get_scales(name) + scale <- p@scales$get_scales(name) if (is.null(scale)) { - lab <- p$labels[[name]] + lab <- p@labels[[name]] type <- "the" } else { - lab <- scale$make_title(scale$name %|W|% p$labels[[name]]) + lab <- scale$make_title(scale$name %|W|% p@labels[[name]]) type <- "a continuous" if (scale$is_discrete()) type <- "a discrete" if (inherits(scale, "ScaleBinned")) type <- "a binned" diff --git a/R/layer-sf.R b/R/layer-sf.R index 3a282e734f..65eeda8b38 100644 --- a/R/layer-sf.R +++ b/R/layer-sf.R @@ -44,13 +44,9 @@ LayerSf <- ggproto("LayerSf", Layer, # automatically determine the name of the geometry column # and add the mapping if it doesn't exist - if ((isTRUE(self$inherit.aes) && is.null(self$computed_mapping$geometry) && - is.null(plot$computed_mapping$geometry)) || - (!isTRUE(self$inherit.aes) && is.null(self$computed_mapping$geometry))) { - if (is_sf(data)) { - geometry_col <- attr(data, "sf_column") - self$computed_mapping$geometry <- sym(geometry_col) - } + if (is.null(self$computed_mapping$geometry) && is_sf(data)) { + geometry_col <- attr(data, "sf_column") + self$computed_mapping$geometry <- sym(geometry_col) } data }, diff --git a/R/layer.R b/R/layer.R index 9a28e2f4f0..1d4b780fa2 100644 --- a/R/layer.R +++ b/R/layer.R @@ -201,11 +201,21 @@ layer <- function(geom = NULL, stat = NULL, } validate_mapping <- function(mapping, call = caller_env()) { + # Upgrade any old S3 input to new S7 input + # TODO: deprecate this after a while + is_old_mapping <- !S7::S7_inherits(mapping) && inherits(mapping, "uneval") + if (is_old_mapping && is.list(mapping)) { + mapping <- aes(!!!mapping) + } + if (!is_mapping(mapping)) { - msg <- "{.arg mapping} must be created by {.fn aes}." + msg <- c( + "{.arg mapping} must be created by {.fn aes}.", + "x" = "You've supplied {.obj_type_friendly {mapping}}." + ) # Native pipe have higher precedence than + so any type of gg object can be # expected here, not just ggplot - if (inherits(mapping, "gg")) { + if (S7::S7_inherits(mapping, class_gg)) { msg <- c(msg, "i" = "Did you use {.code %>%} or {.code |>} instead of {.code +}?") } @@ -215,7 +225,7 @@ validate_mapping <- function(mapping, call = caller_env()) { } # For backward compatibility with pre-tidy-eval layers - new_aes(mapping) + class_mapping(mapping) } #' Layers @@ -485,18 +495,16 @@ Layer <- ggproto("Layer", NULL, setup_layer = function(self, data, plot) { # For annotation geoms, it is useful to be able to ignore the default aes if (isTRUE(self$inherit.aes)) { - self$computed_mapping <- defaults(self$mapping, plot$mapping) + self$computed_mapping <- class_mapping(defaults(self$mapping, plot@mapping)) # Inherit size as linewidth from global mapping if (self$geom$rename_size && - "size" %in% names(plot$mapping) && + "size" %in% names(plot@mapping) && !"linewidth" %in% names(self$computed_mapping) && "linewidth" %in% self$geom$aesthetics()) { - self$computed_mapping$size <- plot$mapping$size + self$computed_mapping$size <- plot@mapping$size 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" } else { self$computed_mapping <- self$mapping } @@ -544,7 +552,7 @@ Layer <- ggproto("Layer", NULL, # Evaluate aesthetics evaled <- eval_aesthetics(aesthetics, data) - plot$scales$add_defaults(evaled, plot$plot_env) + plot@scales$add_defaults(evaled, plot@plot_env) # Check for discouraged usage in mapping warn_for_aes_extract_usage(aesthetics, data[setdiff(names(data), "PANEL")]) @@ -659,7 +667,7 @@ Layer <- ggproto("Layer", NULL, if (length(new) == 0) return(data) # data needs to be non-scaled - data_orig <- plot$scales$backtransform_df(data) + data_orig <- plot@scales$backtransform_df(data) # Add map stat output to aesthetics stat_data <- eval_aesthetics( @@ -676,11 +684,11 @@ Layer <- ggproto("Layer", NULL, stat_data <- data_frame0(!!!stat_data) # Add any new scales, if needed - plot$scales$add_defaults(stat_data, plot$plot_env) + plot@scales$add_defaults(stat_data, plot@plot_env) # Transform the values, if the scale say it's ok # (see stat_spoke for one exception) if (self$stat$retransform) { - stat_data <- plot$scales$transform_df(stat_data) + stat_data <- plot@scales$transform_df(stat_data) } stat_data <- cleanup_mismatched_data(stat_data, nrow(data), "after_stat") data[names(stat_data)] <- stat_data diff --git a/R/margins.R b/R/margins.R index 561aefb7bd..15a27520a1 100644 --- a/R/margins.R +++ b/R/margins.R @@ -1,17 +1,35 @@ +#' @include properties.R + #' @param t,r,b,l Dimensions of each margin. (To remember order, think trouble). #' @param unit Default units of dimensions. Defaults to "pt" so it #' can be most easily scaled with the text. #' @rdname element #' @export -margin <- function(t = 0, r = 0, b = 0, l = 0, unit = "pt") { - u <- unit(c(t, r, b, l), unit) - class(u) <- c("margin", class(u)) - u -} +margin <- S7::new_class( + "margin", parent = S7::new_S3_class(c("simpleUnit", "unit", "unit_v2")), + constructor = function(t = 0, r = 0, b = 0, l = 0, unit = "pt") { + lens <- c(length(t), length(r), length(b), length(l)) + if (any(lens != 1)) { + incorrect <- c("t", "r", "b", "l")[lens != 1] + s <- if (length(incorrect) > 1) "s" else "" + cli::cli_warn(c( + "In {.fn margin}, the argument{s} {.and {.arg {incorrect}}} should \\ + have length 1, not length {.and {lens[lens != 1]}}.", + i = "Argument{s} get(s) truncated to length 1." + )) + t <- t[1] + r <- r[1] + b <- b[1] + l <- l[1] + } + u <- unit(c(t, r, b, l), unit) + S7::new_object(u) + } +) #' @export #' @rdname is_tests -is_margin <- function(x) inherits(x, "margin") +is_margin <- function(x) S7::S7_inherits(x, margin) is.margin <- function(x) lifecycle::deprecate_stop("3.5.2", "is.margin()", "is_margin()") #' @rdname element @@ -26,6 +44,27 @@ margin_auto <- function(t = 0, r = t, b = t, l = r, unit = "pt") { margin(t = t, r = r, b = b, l = l, unit) } +as_margin <- function(x, x_arg = caller_arg(x), call = caller_env()) { + if (is_margin(x)) { + return(x) + } + if (!is.unit(x)) { + cli::cli_abort( + "{.arg {x_arg}} must be a {.cls margin} class, \\ + not {.obj_type_friendly {x}}." + ) + } + if (length(x) != 4) { + x <- rep(x, length.out = 4) + } + type <- unitType(x) + if (is_unique(type)) { + type <- type[1] + } + x <- as.numeric(x) + margin(x[1], x[2], x[3], x[4], unit = type) +} + #' Create a text grob with the proper location and margins #' #' `titleGrob()` is called when creating titles and labels for axes, legends, @@ -173,7 +212,7 @@ heightDetails.titleGrob <- function(x) { #' @return A list with two components, `hjust` and `vjust`, containing the rotated hjust and vjust values #' #' @noRd -rotate_just <- function(angle, hjust, vjust) { +rotate_just <- function(angle = NULL, hjust = NULL, vjust = NULL, element = NULL) { ## Ideally we would like to do something like the following commented-out lines, ## but it currently yields unexpected results for angles other than 0, 90, 180, 270. ## Problems arise in particular in cases where the horizontal and the vertical @@ -188,6 +227,14 @@ rotate_just <- function(angle, hjust, vjust) { # #hnew <- cos(rad) * hjust - sin(rad) * vjust + (1 - cos(rad) + sin(rad)) / 2 #vnew <- sin(rad) * hjust + cos(rad) * vjust + (1 - cos(rad) - sin(rad)) / 2 + if (S7::S7_inherits(element)) { + element <- S7::props(element) + } + if (!is.null(element)) { + angle <- element$angle + hjust <- element$hjust + vjust <- element$vjust + } angle <- (angle %||% 0) %% 360 diff --git a/R/plot-build.R b/R/plot-build.R index 9cd01b54d5..d92ce633e2 100644 --- a/R/plot-build.R +++ b/R/plot-build.R @@ -1,9 +1,10 @@ #' Build ggplot for rendering. #' -#' `ggplot_build()` takes the plot object, and performs all steps necessary +#' `build_ggplot()` takes the plot object, and performs all steps necessary #' to produce an object that can be rendered. This function outputs two pieces: #' a list of data frames (one for each layer), and a panel object, which -#' contain all information about axis limits, breaks etc. +#' contain all information about axis limits, breaks etc. The `ggplot_build()` +#' function is vestigial and `build_ggplot()` should be used instead. #' #' `get_layer_data()`, `get_layer_grob()`, and `get_panel_scales()` are helper #' functions that return the data, grob, or scales associated with a given @@ -15,6 +16,7 @@ #' plot). In `get_panel_scales()`, the row of a facet to return scales for. #' @param j An integer. In `get_panel_scales()`, the column of a facet to return #' scales for. +#' @param ... Not currently in use. #' @seealso #' [print.ggplot()] and [benchplot()] for #' functions that contain the complete set of steps for generating @@ -23,44 +25,42 @@ #' The `r link_book("build step section", "internals#sec-ggplotbuild")` #' @keywords internal #' @export -ggplot_build <- function(plot) { - # Attaching the plot env to be fetched by deprecations etc. - attach_plot_env(plot$plot_env) - - UseMethod('ggplot_build') -} +build_ggplot <- S7::new_generic("build_ggplot", "plot", fun = function(plot, ...) { + env <- try_prop(plot, "plot_env") + if (!is.null(env)) { + attach_plot_env(env) + } + S7::S7_dispatch() +}) -#' @export -ggplot_build.ggplot_built <- function(plot) { - # This is a no-op - plot +S7::method(build_ggplot, class_ggplot_built) <- function(plot, ...) { + plot # This is a no-op } -#' @export -ggplot_build.ggplot <- function(plot) { +S7::method(build_ggplot, class_ggplot) <- function(plot, ...) { plot <- plot_clone(plot) - if (length(plot$layers) == 0) { + if (length(plot@layers) == 0) { plot <- plot + geom_blank() } - layers <- plot$layers + layers <- plot@layers data <- rep(list(NULL), length(layers)) - scales <- plot$scales + scales <- plot@scales # Allow all layers to make any final adjustments based # on raw input data and plot info - data <- by_layer(function(l, d) l$layer_data(plot$data), layers, data, "computing layer data") + data <- by_layer(function(l, d) l$layer_data(plot@data), layers, data, "computing layer data") data <- by_layer(function(l, d) l$setup_layer(d, plot), layers, data, "setting up layer") # Initialise panels, add extra data for margins & missing faceting # variables, and add on a PANEL variable to data - layout <- create_layout(plot$facet, plot$coordinates, plot$layout) - data <- layout$setup(data, plot$data, plot$plot_env) + layout <- create_layout(plot@facet, plot@coordinates, plot@layout) + data <- layout$setup(data, plot@data, plot@plot_env) # Compute aesthetics to produce data with generalised variable names data <- by_layer(function(l, d) l$compute_aesthetics(d, plot), layers, data, "computing aesthetics") - plot$labels <- setup_plot_labels(plot, layers, data) + plot@labels <- setup_plot_labels(plot, layers, data) data <- .ignore_data(data) # Transform all scales @@ -80,7 +80,7 @@ ggplot_build.ggplot <- function(plot) { data <- by_layer(function(l, d) l$map_statistic(d, plot), layers, data, "mapping stat to aesthetics") # Make sure missing (but required) aesthetics are added - plot$scales$add_missing(c("x", "y"), plot$plot_env) + plot@scales$add_missing(c("x", "y"), plot@plot_env) # Reparameterise geoms from (e.g.) y and width to ymin and ymax data <- by_layer(function(l, d) l$compute_geom_1(d), layers, data, "setting up geom") @@ -98,27 +98,27 @@ ggplot_build.ggplot <- function(plot) { data <- layout$map_position(data) # Hand off position guides to layout - layout$setup_panel_guides(plot$guides, plot$layers) + layout$setup_panel_guides(plot@guides, plot@layers) # Complete the plot's theme - plot$theme <- plot_theme(plot) + plot@theme <- plot_theme(plot) # Train and map non-position scales and guides npscales <- scales$non_position_scales() if (npscales$n() > 0) { - npscales$set_palettes(plot$theme) + npscales$set_palettes(plot@theme) lapply(data, npscales$train_df) - plot$guides <- plot$guides$build(npscales, plot$layers, plot$labels, data, plot$theme) + plot@guides <- plot@guides$build(npscales, plot@layers, plot@labels, data, plot@theme) data <- lapply(data, npscales$map_df) } else { # Only keep custom guides if there are no non-position scales - plot$guides <- plot$guides$get_custom() + plot@guides <- plot@guides$get_custom() } data <- .expose_data(data) # Fill in defaults etc. data <- by_layer( - function(l, d) l$compute_geom_2(d, theme = plot$theme), + function(l, d) l$compute_geom_2(d, theme = plot@theme), layers, data, "setting up geom aesthetics" ) @@ -129,51 +129,62 @@ ggplot_build.ggplot <- function(plot) { data <- layout$finish_data(data) # Consolidate alt-text - plot$labels$alt <- get_alt_text(plot) + plot@labels$alt <- get_alt_text(plot) - structure( - list(data = data, layout = layout, plot = plot), - class = "ggplot_built" - ) + build <- class_ggplot_built(data = data, layout = layout, plot = plot) + class(build) <- union(c("ggplot2::ggplot_built", "ggplot_built"), class(build)) + build } +# TODO: the S3 generic should be phased out once S7 is adopted more widely +#' @rdname build_ggplot #' @export -#' @rdname ggplot_build +ggplot_build <- function(plot, ...) { + UseMethod("ggplot_build") +} + +#' @export +ggplot_build.default <- function(plot, ...) { + build_ggplot(plot) +} + +#' @export +#' @rdname build_ggplot get_layer_data <- function(plot = get_last_plot(), i = 1L) { - ggplot_build(plot)$data[[i]] + ggplot_build(plot)@data[[i]] } #' @export -#' @rdname ggplot_build +#' @rdname build_ggplot layer_data <- get_layer_data #' @export -#' @rdname ggplot_build +#' @rdname build_ggplot get_panel_scales <- function(plot = get_last_plot(), i = 1L, j = 1L) { b <- ggplot_build(plot) - layout <- b$layout$layout + layout <- b@layout$layout selected <- layout[layout$ROW == i & layout$COL == j, , drop = FALSE] list( - x = b$layout$panel_scales_x[[selected$SCALE_X]], - y = b$layout$panel_scales_y[[selected$SCALE_Y]] + x = b@layout$panel_scales_x[[selected$SCALE_X]], + y = b@layout$panel_scales_y[[selected$SCALE_Y]] ) } #' @export -#' @rdname ggplot_build +#' @rdname build_ggplot layer_scales <- get_panel_scales #' @export -#' @rdname ggplot_build +#' @rdname build_ggplot get_layer_grob <- function(plot = get_last_plot(), i = 1L) { b <- ggplot_build(plot) - b$plot$layers[[i]]$draw_geom(b$data[[i]], b$layout) + b@plot@layers[[i]]$draw_geom(b@data[[i]], b@layout) } #' @export -#' @rdname ggplot_build +#' @rdname build_ggplot layer_grob <- get_layer_grob #' Build a plot with all the usual bits and pieces. @@ -184,6 +195,9 @@ layer_grob <- get_layer_grob #' to (e.g.) make the legend box 2 cm wide, or combine multiple plots into #' a single display, preserving aspect ratios across the plots. #' +#' The `ggplot_gtable()` function is vestigial and the `gtable_ggplot()` function +#' should be used instead. +#' #' @seealso #' [print.ggplot()] and [benchplot()] for #' for functions that contain the complete set of steps for generating @@ -194,45 +208,42 @@ layer_grob <- get_layer_grob #' @keywords internal #' @param data plot data generated by [ggplot_build()] #' @export -ggplot_gtable <- function(data) { - # Attaching the plot env to be fetched by deprecations etc. - attach_plot_env(data$plot$plot_env) +gtable_ggplot <- S7::new_generic("gtable_ggplot", "data", function(data) { + attach_plot_env(data@plot@plot_env) + S7::S7_dispatch() +}) - UseMethod('ggplot_gtable') -} - -#' @export -ggplot_gtable.ggplot_built <- function(data) { - plot <- data$plot - layout <- data$layout - data <- data$data - theme <- plot$theme +S7::method(gtable_ggplot, class_ggplot_built) <- function(data) { + plot <- data@plot + layout <- data@layout + data <- data@data + theme <- plot@theme - geom_grobs <- by_layer(function(l, d) l$draw_geom(d, layout), plot$layers, data, "converting geom to grob") + geom_grobs <- by_layer(function(l, d) l$draw_geom(d, layout), plot@layers, data, "converting geom to grob") - plot_table <- layout$render(geom_grobs, data, theme, plot$labels) + plot_table <- layout$render(geom_grobs, data, theme, plot@labels) # Legends - legend_box <- plot$guides$assemble(theme) + legend_box <- plot@guides$assemble(theme) plot_table <- table_add_legends(plot_table, legend_box, theme) # Title title <- element_render( - theme, "plot.title", plot$labels$title, + theme, "plot.title", plot@labels$title, margin_y = TRUE, margin_x = TRUE ) title_height <- grobHeight(title) # Subtitle subtitle <- element_render( - theme, "plot.subtitle", plot$labels$subtitle, + theme, "plot.subtitle", plot@labels$subtitle, margin_y = TRUE, margin_x = TRUE ) subtitle_height <- grobHeight(subtitle) # whole plot annotation caption <- element_render( - theme, "plot.caption", plot$labels$caption, + theme, "plot.caption", plot@labels$caption, margin_y = TRUE, margin_x = TRUE ) caption_height <- grobHeight(caption) @@ -283,7 +294,7 @@ ggplot_gtable.ggplot_built <- function(data) { plot_table <- gtable_add_grob(plot_table, caption, name = "caption", t = -1, b = -1, l = caption_l, r = caption_r, clip = "off") - plot_table <- table_add_tag(plot_table, plot$labels$tag, theme) + plot_table <- table_add_tag(plot_table, plot@labels$tag, theme) # Margins plot_margin <- calc_element("plot.margin", theme) %||% margin() @@ -298,11 +309,23 @@ ggplot_gtable.ggplot_built <- function(data) { } # add alt-text as attribute - attr(plot_table, "alt-label") <- plot$labels$alt + attr(plot_table, "alt-label") <- plot@labels$alt plot_table } +# TODO: the S3 generic should be phased out once S7 is adopted more widely +#' @rdname gtable_ggplot +#' @export +ggplot_gtable <- function(plot) { + UseMethod("ggplot_gtable") +} + +#' @export +ggplot_gtable.default <- function(plot) { + gtable_ggplot(plot) +} + #' Generate a ggplot2 plot grob. #' #' @param x ggplot2 object @@ -312,11 +335,8 @@ ggplotGrob <- function(x) { ggplot_gtable(ggplot_build(x)) } -#' @export -as.gtable.ggplot <- function(x, ...) ggplotGrob(x) - -#' @export -as.gtable.ggplot_built <- function(x, ...) ggplot_gtable(x) +S7::method(as.gtable, class_ggplot) <- function(x, ...) ggplotGrob(x) +S7::method(as.gtable, class_ggplot_built) <- function(x, ...) ggplot_gtable(x) # Apply function to layer and matching data by_layer <- function(f, layers, data, step = NULL) { @@ -392,21 +412,23 @@ table_add_tag <- function(table, label, theme) { if (location %in% c("plot", "panel")) { if (!is.numeric(position)) { + hjust <- try_prop(element, "hjust", default = 0.5) if (right || left) { - x <- (1 - element$hjust) * width + x <- (1 - hjust) * width if (right) { x <- unit(1, "npc") - x } } else { - x <- unit(element$hjust, "npc") + x <- unit(hjust, "npc") } if (top || bottom) { - y <- (1 - element$vjust) * height + vjust <- try_prop(element, "vjust", default = 0.5) + y <- (1 - vjust) * height if (top) { y <- unit(1, "npc") - y } } else { - y <- unit(element$vjust, "npc") + y <- unit(vjust, "npc") } } else { x <- unit(position[1], "npc") diff --git a/R/plot-construction.R b/R/plot-construction.R index b10a9f4387..33e74fb9d6 100644 --- a/R/plot-construction.R +++ b/R/plot-construction.R @@ -24,9 +24,8 @@ #' @param e1 An object of class [ggplot()] or a [theme()]. #' @param e2 A plot component, as described below. #' @seealso [theme()] -#' @export -#' @method + gg #' @rdname gg-add +#' @export #' @examples #' base <- #' ggplot(mpg, aes(displ, hwy)) + @@ -39,7 +38,7 @@ #' # Alternatively, you can add multiple components with a list. #' # This can be useful to return from a function. #' base + list(subset(mpg, fl == "p"), geom_smooth()) -"+.gg" <- function(e1, e2) { +add_gg <- function(e1, e2) { if (missing(e2)) { cli::cli_abort(c( "Cannot use {.code +} with a single argument.", @@ -52,6 +51,7 @@ e2name <- deparse(substitute(e2)) if (is_theme(e1)) add_theme(e1, e2, e2name) + # The `add_ggplot()` branch here is for backward compatibility with R < 4.3.0 else if (is_ggplot(e1)) add_ggplot(e1, e2, e2name) else if (is_ggproto(e1)) { cli::cli_abort(c( @@ -61,10 +61,29 @@ } } +if (getRversion() < "4.3.0") { + S7::method(`+`, list(class_S3_gg, S7::class_any)) <- add_gg +} + +S7::method(`+`, list(class_ggplot, S7::class_any)) <- function(e1, e2) { + e2name <- deparse(substitute(e2, env = caller_env(2))) + add_ggplot(e1, e2, e2name) +} + +S7::method(`+`, list(class_theme, S7::class_any)) <- function(e1, e2) { + e2name <- deparse(substitute(e2, env = caller_env(2))) + add_theme(e1, e2, e2name) +} + #' @rdname gg-add #' @export -"%+%" <- `+.gg` +"%+%" <- function(e1, e2) { + if (getRversion() >= "4.3.0") { + deprecate_soft0("4.0.0", I(" %+% x"), I(" + x")) + } + add_gg(e1, e2) +} add_ggplot <- function(p, object, objectname) { if (is.null(object)) return(p) @@ -77,18 +96,18 @@ add_ggplot <- function(p, object, objectname) { #' Add custom objects to ggplot #' #' This generic allows you to add your own methods for adding custom objects to -#' a ggplot with [+.gg]. +#' a ggplot with [+.gg][add_gg]. The `ggplot_add()` function is vestigial and +#' the `update_ggplot()` function should be used instead. #' #' @param object An object to add to the plot #' @param plot The ggplot object to add `object` to -#' @param object_name The name of the object to add #' #' @return A modified ggplot object #' @details -#' Custom methods for `ggplot_add()` are intended to update the `plot` variable +#' Custom methods for `update_ggplot()` are intended to update the `plot` variable #' using information from a custom `object`. This can become convenient when #' writing extensions that don't build on the pre-existing grammar like -#' layers, facets, coords and themes. The `ggplot_add()` function is never +#' layers, facets, coords and themes. The `update_ggplot()` function is never #' intended to be used directly, but it is triggered when an object is added #' to a plot via the `+` operator. Please note that the full `plot` object is #' exposed at this point, which comes with the responsibility of returning @@ -98,10 +117,11 @@ add_ggplot <- function(p, object, objectname) { #' @export #' @examples #' # making a new method for the generic -#' # in this example, we apply a text element to the text theme setting -#' ggplot_add.element_text <- function(object, plot, object_name) { -#' plot + theme(text = object) -#' } +#' # in this example, we enable adding text elements +#' S7::method(update_ggplot, list(element_text, class_ggplot)) <- +#' function(object, plot, ...) { +#' plot + theme(text = object) +#' } #' #' # we can now use `+` to add our object to a plot #' ggplot(mpg, aes(displ, cty)) + @@ -109,96 +129,115 @@ add_ggplot <- function(p, object, objectname) { #' element_text(colour = "red") #' #' # clean-up -#' rm(ggplot_add.element_text) -ggplot_add <- function(object, plot, object_name) { - UseMethod("ggplot_add") -} -#' @export -ggplot_add.default <- function(object, plot, object_name) { - cli::cli_abort("Can't add {.var {object_name}} to a {.cls ggplot} object.") -} -#' @export -ggplot_add.NULL <- function(object, plot, object_name) { - plot -} -#' @export -ggplot_add.data.frame <- function(object, plot, object_name) { - plot$data <- object - plot -} -#' @export -ggplot_add.function <- function(object, plot, object_name) { - cli::cli_abort(c( - "Can't add {.var {object_name}} to a {.cls ggplot} object", - "i" = "Did you forget to add parentheses, as in {.fn {object_name}}?" - )) -} -#' @export -ggplot_add.theme <- function(object, plot, object_name) { - plot$theme <- add_theme(plot$theme, object) - plot -} -#' @export -ggplot_add.Scale <- function(object, plot, object_name) { - plot$scales$add(object) - plot -} -#' @export -ggplot_add.labels <- function(object, plot, object_name) { - update_labels(plot, object) -} -#' @export -ggplot_add.Guides <- function(object, plot, object_name) { - if (is_guides(plot$guides)) { - # We clone the guides object to prevent modify-in-place of guides - old <- plot$guides +update_ggplot <- S7::new_generic("update_ggplot", c("object", "plot")) + +S7::method(update_ggplot, list(S7::class_any, class_ggplot)) <- + function(object, plot, object_name, ...) { + + if (!S7::S7_inherits(object) && inherits(object, "theme")) { + # For backward compatibility, we try to cast old S3 themes (lists with + # the class 'theme') to proper themes. People *should* use `theme()`, + # so we should be pushy here. + # TODO: Promote warning to error in future release. + cli::cli_warn(c( + "{object_name} is not a valid theme.", + "Please use {.fn theme} to construct themes." + )) + object <- theme(!!!object) + return(update_ggplot(object, plot)) + } + + cli::cli_abort("Can't add {.var {object_name}} to a {.cls ggplot} object.") + } + +S7::method(update_ggplot, list(S7::class_function, class_ggplot)) <- + function(object, plot, object_name, ...) { + cli::cli_abort(c( + "Can't add {.var {object_name}} to a {.cls ggplot} object", + "i" = "Did you forget to add parentheses, as in {.fn {object_name}}?" + )) + } + +S7::method(update_ggplot, list(NULL, class_ggplot)) <- + function(object, plot, ...) { plot } + +S7::method(update_ggplot, list(S7::class_data.frame, class_ggplot)) <- + function(object, plot, ...) { S7::set_props(plot, data = object) } + +S7::method(update_ggplot, list(class_scale, class_ggplot)) <- + function(object, plot, ...) { + plot@scales$add(object) + plot + } + +S7::method(update_ggplot, list(class_labels, class_ggplot)) <- + function(object, plot, ...) { update_labels(plot, object) } + +S7::method(update_ggplot, list(class_guides, class_ggplot)) <- + function(object, plot, ...) { + old <- plot@guides new <- ggproto(NULL, old) new$add(object) - plot$guides <- new - } else { - plot$guides <- object + plot@guides <- new + plot } - plot -} -#' @export -ggplot_add.uneval <- function(object, plot, object_name) { - plot$mapping <- defaults(object, plot$mapping) - # defaults() doesn't copy class, so copy it. - class(plot$mapping) <- class(object) - plot -} -#' @export -ggplot_add.Coord <- function(object, plot, object_name) { - if (!isTRUE(plot$coordinates$default)) { - cli::cli_inform("Coordinate system already present. Adding new coordinate system, which will replace the existing one.") + +S7::method(update_ggplot, list(class_mapping, class_ggplot)) <- + function(object, plot, ...) { + S7::set_props(plot, mapping = class_mapping(defaults(object, plot@mapping))) } - plot$coordinates <- object - plot -} -#' @export -ggplot_add.Facet <- function(object, plot, object_name) { - plot$facet <- object - plot -} -#' @export -ggplot_add.list <- function(object, plot, object_name) { - for (o in object) { - plot <- ggplot_add(o, plot, object_name) +S7::method(update_ggplot, list(class_theme, class_ggplot)) <- + function(object, plot, ...) { + S7::set_props(plot, theme = add_theme(plot@theme, object)) } - plot -} + +S7::method(update_ggplot, list(class_coord, class_ggplot)) <- + function(object, plot, ...) { + if (!isTRUE(plot@coordinates$default)) { + cli::cli_inform(c( + "Coordinate system already present.", + i = "Adding new coordinate system, which will replace the existing one." + )) + } + S7::set_props(plot, coordinates = object) + } + +S7::method(update_ggplot, list(class_facet, class_ggplot)) <- + function(object, plot, ...) { S7::set_props(plot, facet = object) } + +S7::method(update_ggplot, list(class_layer, class_ggplot)) <- + function(object, plot, ...) { + layers_names <- new_layer_names(object, names2(plot@layers)) + object <- setNames(append(plot@layers, object), layers_names) + S7::set_props(plot, layers = object) + } + +S7::method(update_ggplot, list(S7::class_list, class_ggplot)) <- + function(object, plot, object_name, ...) { + for (o in object) { + plot <- ggplot_add(o, plot, object_name) + } + plot + } + +S7::method(update_ggplot, list(S7::new_S3_class("by"), class_ggplot)) <- + function(object, plot, object_name, ...) { + ggplot_add(unclass(object), plot, object_name) + } + +# TODO: the S3 generic should be phased out once S7 is adopted more widely +# For backward compatibility, ggplot_add still exists but by default it wraps +# `update_ggplot()` +#' @rdname update_ggplot #' @export -ggplot_add.by <- function(object, plot, object_name) { - ggplot_add.list(object, plot, object_name) +ggplot_add <- function(object, plot, ...) { + UseMethod("ggplot_add") } #' @export -ggplot_add.Layer <- function(object, plot, object_name) { - layers_names <- new_layer_names(object, names2(plot$layers)) - plot$layers <- append(plot$layers, object) - names(plot$layers) <- layers_names - plot +ggplot_add.default <- function(object, plot, ...) { + update_ggplot(object = object, plot = plot, ...) } new_layer_names <- function(layer, existing) { diff --git a/R/plot.R b/R/plot.R index 5f38f63116..2c655f72c6 100644 --- a/R/plot.R +++ b/R/plot.R @@ -103,55 +103,51 @@ #' mapping = aes(x = group, y = group_mean), data = group_means_df, #' colour = 'red', size = 3 #' ) -ggplot <- function(data = NULL, mapping = aes(), ..., - environment = parent.frame()) { +ggplot <- function( + data = NULL, + mapping = aes(), + ..., + environment = parent.frame() +) { UseMethod("ggplot") } #' @export -ggplot.default <- function(data = NULL, mapping = aes(), ..., - environment = parent.frame()) { - if (!missing(mapping) && !is_mapping(mapping)) { - cli::cli_abort(c( - "{.arg mapping} must be created with {.fn aes}.", - "x" = "You've supplied {.obj_type_friendly {mapping}}." - )) +ggplot.default <- + function(data, mapping = aes(), ..., environment = parent.frame()) { + + if (!missing(mapping)) { + mapping <- validate_mapping(mapping) + } + if (missing(data)) { + data <- NULL } data <- fortify(data, ...) - p <- structure(list( + p <- class_ggplot( data = data, - layers = list(), - scales = scales_list(), - guides = guides_list(), mapping = mapping, - theme = list(), - coordinates = coord_cartesian(default = TRUE), - facet = facet_null(), - plot_env = environment, - layout = ggproto(NULL, Layout), - labels = list() - ), class = c("gg", "ggplot")) + plot_env = environment + ) + class(p) <- union(union(c("ggplot2::ggplot", "ggplot"), class(p)), "gg") set_last_plot(p) p } #' @export -ggplot.function <- function(data = NULL, mapping = aes(), ..., - environment = parent.frame()) { - # Added to avoid functions end in ggplot.default - cli::cli_abort(c( - "{.arg data} cannot be a function.", - "i" = "Have you misspelled the {.arg data} argument in {.fn ggplot}" - )) -} +ggplot.function <- function(data, ...) { + # Added to avoid functions end in ggplot.default + cli::cli_abort(c( + "{.arg data} cannot be a function.", + "i" = "Have you misspelled the {.arg data} argument in {.fn ggplot}?" + )) + } plot_clone <- function(plot) { p <- plot - p$scales <- plot$scales$clone() - + p@scales <- plot@scales$clone() p } @@ -160,7 +156,7 @@ plot_clone <- function(plot) { #' @keywords internal #' @export #' @name is_tests -is_ggplot <- function(x) inherits(x, "ggplot") +is_ggplot <- function(x) S7::S7_inherits(x, class_ggplot) #' @export #' @rdname is_tests @@ -184,7 +180,9 @@ is.ggplot <- function(x) { #' @keywords hplot #' @return Invisibly returns the original plot. #' @export -#' @method print ggplot +#' @method print ggplot2::ggplot +#' @name print.ggplot +#' @aliases print.ggplot2::ggplot plot.ggplot2::ggplot #' @examples #' colours <- c("class", "drv", "fl") #' @@ -198,7 +196,8 @@ is.ggplot <- function(x) { #' print(ggplot(mpg, aes(displ, hwy, colour = .data[[colour]])) + #' geom_point()) #' } -print.ggplot <- function(x, newpage = is.null(vp), vp = NULL, ...) { +# TODO: should convert to proper S7 method once bug in S7 is resolved +`print.ggplot2::ggplot` <- function(x, newpage = is.null(vp), vp = NULL, ...) { set_last_plot(x) if (newpage) grid.newpage() @@ -227,7 +226,60 @@ print.ggplot <- function(x, newpage = is.null(vp), vp = NULL, ...) { invisible(x) } -#' @rdname print.ggplot -#' @method plot ggplot + +S7::method(plot, class_ggplot) <- `print.ggplot2::ggplot` + +# The following extractors and subassignment operators are for a smooth +# transition and should be deprecated in the release cycle after 4.0.0 +# TODO: should convert to proper S7 method once bug in S7 is resolved + +#' @export +`$.ggplot2::gg` <- function(x, i) { + if (!S7::prop_exists(x, i) && S7::prop_exists(x, "meta")) { + # This is a trick to bridge a gap between S3 and S7. We're allowing + # for arbitrary fields by reading/writing to the 'meta' field when the + # index does not point to an actual property. + # The proper way to go about this is to implement new fields as properties + # of a ggplot subclass. + S7::prop(x, "meta")[[i]] + } else { + `[[`(S7::props(x), i) + } +} + +#' @export +`$<-.ggplot2::gg` <- function(x, i, value) { + if (!S7::prop_exists(x, i) && S7::prop_exists(x, "meta")) { + # See explanation in `$.ggplot2::gg` + S7::prop(x, "meta")[[i]] <- value + } else { + S7::props(x) <- `[[<-`(S7::props(x), i, value) + } + x +} + +#' @export +`[.ggplot2::gg` <- function(x, i) { + `[`(S7::props(x), i) +} + #' @export -plot.ggplot <- print.ggplot +`[<-.ggplot2::gg` <- function(x, i, value) { + S7::props(x) <- `[<-`(S7::props(x), i, value) + x +} + +#' @export +`[[.ggplot2::gg` <- `$.ggplot2::gg` + +#' @export +`[[<-.ggplot2::gg` <- `$<-.ggplot2::gg` + +#' @importFrom S7 convert +S7::method(convert, list(from = class_ggplot, to = S7::class_list)) <- + function(from, to) { + S7::props(from) + } + +S7::method(as.list, class_ggplot) <- function(x, ...) convert(x, S7::class_list) +rm(`as.list`) diff --git a/R/properties.R b/R/properties.R new file mode 100644 index 0000000000..7b828161a9 --- /dev/null +++ b/R/properties.R @@ -0,0 +1,101 @@ +property_boolean <- function(allow_null = FALSE, default = TRUE) { + class <- S7::class_logical + class <- if (allow_null) S7::new_union(class, NULL) else class + validator <- function(value) { + if ((allow_null && is.null(value)) || is_bool(value)) { + return(character()) + } + "must be a boolean" + } + S7::new_property( + class = class, + validator = validator, + default = default + ) +} + +property_choice <- function(options, allow_null = FALSE, default = NULL) { + force(options) + class <- S7::class_character + class <- if (allow_null) S7::new_union(class, NULL) else class + validator <- function(value) { + if (allow_null && is.null(value)) { + return(character()) + } + if (!is_character(value)) { + return(as_cli("must be a string, not {.obj_type_friendly {value}}")) + } + if (all(value %in% options)) { + return(character()) + } + as_cli("must be one of {.or {.val {options}}}") + } + S7::new_property( + class = class, + validator = validator, + default = default + ) +} + +# This is like `property_choice`, but allows for integers that mean `1 = plain`, +# `2 = bold`, `3 = italic`, `4 = bold italic`. +property_fontface <- function(allow_null = TRUE, default = NULL) { + options <- c("plain", "bold", "italic", "oblique", "bold.italic") + class <- S7::new_union(S7::class_character, S7::class_numeric) + class <- if (allow_null) S7::new_union(class, NULL) else class + validator <- function(value) { + if (allow_null && is.null(value)) { + return(character()) + } + if (is_integerish(value) && all(value %in% 1:4)) { + return(character()) + } + if (all(value %in% options)) { + return(character()) + } + as_cli("must be one of {.or {.val {options}}}.") + } + S7::new_property( + class = class, + validator = validator, + default = default + ) +} + +property_nullable <- function(class = S7::class_any, ...) { + S7::new_property( + class = S7::new_union(NULL, class), + ... + ) +} + +property_colour <- function( + allow_null = TRUE, + pattern = FALSE, + default = NULL +) { + # TODO: remove numeric option for editioning + class <- S7::new_union( + S7::class_character, # Hex codes and colour names, e.g. #FF000 or "red" + S7::class_logical, # For allowing NA, which means 'transparent' + S7::class_numeric # For `grDevices::palette()` indexing + ) + if (isTRUE(pattern)) { + class <- S7::new_union(class, S7::new_S3_class("GridPattern")) + } + if (isTRUE(allow_null)) { + class <- S7::new_union(class, NULL) + } + validator <- function(value) { + if (is.numeric(value) && !is_integerish(value)) { + return("cannot be a decimal number, but could be an integer.") + } + character() + } + S7::new_property( + class = class, + validator = validator, + default = default + ) +} + diff --git a/R/quick-plot.R b/R/quick-plot.R index 4dfa478be3..61e983843b 100644 --- a/R/quick-plot.R +++ b/R/quick-plot.R @@ -78,7 +78,7 @@ qplot <- function(x, y, ..., data, facets = NULL, margins = FALSE, is_constant <- (!names(exprs) %in% ggplot_global$all_aesthetics) | vapply(exprs, quo_is_call, logical(1), name = "I") - mapping <- new_aes(exprs[!is_missing & !is_constant], env = parent.frame()) + mapping <- class_mapping(exprs[!is_missing & !is_constant], env = parent.frame()) consts <- exprs[is_constant] diff --git a/R/save.R b/R/save.R index 2f2faec357..b4b1cc7226 100644 --- a/R/save.R +++ b/R/save.R @@ -244,7 +244,8 @@ get_plot_background <- function(plot, bg = NULL, default = "transparent") { if (!is_ggplot(plot)) { return(default) } - calc_element("plot.background", plot_theme(plot))$fill %||% default + bg <- calc_element("plot.background", plot_theme(plot)) + try_prop(bg, "fill") %||% "transparent" } validate_device <- function(device, filename = NULL, dpi = 300, call = caller_env()) { @@ -325,10 +326,7 @@ validate_device <- function(device, filename = NULL, dpi = 300, call = caller_en dev } -#' @export -grid.draw.ggplot <- function(x, recording = TRUE) { - print(x) -} +S7::method(grid.draw, class_ggplot) <- function(x, recording = TRUE) print(x) absorb_grdevice_args <- function(f) { function(..., type, antialias) { diff --git a/R/summarise-plot.R b/R/summarise-plot.R index 64d16ca7b2..87b8927777 100644 --- a/R/summarise-plot.R +++ b/R/summarise-plot.R @@ -62,8 +62,8 @@ NULL #' @rdname summarise_plot #' @export summarise_layout <- function(p) { - check_inherits(p, "ggplot_built") - l <- p$layout + check_inherits(p, "ggplot2::ggplot_built") + l <- p@layout layout <- l$layout layout <- data_frame0( @@ -99,7 +99,7 @@ summarise_layout <- function(p) { #' @rdname summarise_plot #' @export summarise_coord <- function(p) { - check_inherits(p, "ggplot_built") + check_inherits(p, "ggplot2::ggplot_built") # Given a transform object, find the log base; if the transform object is # NULL, or if it's not a log transform, return NA. @@ -112,9 +112,9 @@ summarise_coord <- function(p) { } list( - xlog = trans_get_log_base(p$layout$coord$trans$x), - ylog = trans_get_log_base(p$layout$coord$trans$y), - flip = inherits(p$layout$coord, "CoordFlip") + xlog = trans_get_log_base(p@layout$coord$trans$x), + ylog = trans_get_log_base(p@layout$coord$trans$y), + flip = inherits(p@layout$coord, "CoordFlip") ) } @@ -122,13 +122,13 @@ summarise_coord <- function(p) { #' @rdname summarise_plot #' @export summarise_layers <- function(p) { - check_inherits(p, "ggplot_built") + check_inherits(p, "ggplot2::ggplot_built") - # Default mappings. Make sure it's a regular list instead of an uneval + # Default mappings. Make sure it's a regular list instead of a mapping # object. - default_mapping <- unclass(p$plot$mapping) + default_mapping <- unclass(p@plot@mapping) - layer_mappings <- lapply(p$plot$layers, function(layer) { + layer_mappings <- lapply(p@plot@layers, function(layer) { defaults(layer$mapping, default_mapping) }) diff --git a/R/summary.R b/R/summary.R index 4a227a3599..8c3d252906 100644 --- a/R/summary.R +++ b/R/summary.R @@ -1,41 +1,43 @@ #' Displays a useful description of a ggplot object #' +#' @noRd #' @param object ggplot2 object to summarise #' @param ... other arguments ignored (for compatibility with generic) #' @keywords internal -#' @method summary ggplot -#' @export +#' @name summary.ggplot +#' @aliases summary.ggplot summary.ggplot2::ggplot +#' @usage summary(object, ...) #' @examples #' p <- ggplot(mtcars, aes(mpg, wt)) + #' geom_point() #' summary(p) -summary.ggplot <- function(object, ...) { +S7::method(summary, class_ggplot) <- function(object, ...) { wrap <- function(x) paste( paste(strwrap(x, exdent = 2), collapse = "\n"), "\n", sep = "" ) - if (!is.null(object$data)) { + if (!is.null(object@data)) { output <- paste( - "data: ", paste(names(object$data), collapse = ", "), - " [", nrow(object$data), "x", ncol(object$data), "] ", + "data: ", paste(names(object@data), collapse = ", "), + " [", nrow(object@data), "x", ncol(object@data), "] ", "\n", sep = "") cat(wrap(output)) } - if (length(object$mapping) > 0) { - cat("mapping: ", clist(object$mapping), "\n", sep = "") + if (length(object@mapping) > 0) { + cat("mapping: ", clist(object@mapping), "\n", sep = "") } - if (object$scales$n() > 0) { - cat("scales: ", paste(object$scales$input(), collapse = ", "), "\n") + if (object@scales$n() > 0) { + cat("scales: ", paste(object@scales$input(), collapse = ", "), "\n") } - vars <- object$facet$vars() + vars <- object@facet$vars() vars <- if (length(vars) > 0) paste0("~", vars) else "" cat("faceting: ", paste0(vars, collapse = ", "), "\n") - if (length(object$layers) > 0) + if (length(object@layers) > 0) cat("-----------------------------------\n") - invisible(lapply(object$layers, function(x) { + invisible(lapply(object@layers, function(x) { print(x) cat("\n") })) diff --git a/R/theme-current.R b/R/theme-current.R index c6848c7d76..e42f8c1e68 100644 --- a/R/theme-current.R +++ b/R/theme-current.R @@ -40,7 +40,7 @@ NULL #' @return `set_theme()`, `update_theme()`, and `replace_theme()` #' invisibly return the previous theme so you can easily save it, then #' later restore it. -#' @seealso [+.gg()] +#' @seealso [add_gg()] #' @export #' @examples #' p <- ggplot(mtcars, aes(mpg, wt)) + diff --git a/R/theme-defaults.R b/R/theme-defaults.R index 78946d028e..c46b09cffc 100644 --- a/R/theme-defaults.R +++ b/R/theme-defaults.R @@ -127,11 +127,12 @@ theme_grey <- function(base_size = 11, base_family = "", # by others line = element_line( colour = ink, linewidth = base_line_size, - linetype = 1, lineend = "butt" + linetype = 1, lineend = "butt", linejoin = "round" ), rect = element_rect( fill = paper, colour = ink, - linewidth = base_rect_size, linetype = 1 + linewidth = base_rect_size, linetype = 1, + linejoin = "round" ), text = element_text( family = base_family, face = "plain", @@ -153,7 +154,7 @@ theme_grey <- function(base_size = 11, base_family = "", polygon = element_polygon( fill = paper, colour = ink, - linewidth = base_rect_size, linetype = 1 + linewidth = base_rect_size, linetype = 1, linejoin = "round" ), geom = element_geom( @@ -525,7 +526,7 @@ theme_void <- function(base_size = 11, base_family = "", line = element_blank(), rect = element_rect( fill = paper, colour = NA, linewidth = 0, linetype = 1, - inherit.blank = FALSE + inherit.blank = FALSE, linejoin = "round" ), polygon = element_blank(), point = element_blank(), @@ -621,11 +622,11 @@ theme_test <- function(base_size = 11, base_family = "", t <- theme( line = element_line( colour = ink, linewidth = base_line_size, - linetype = 1, lineend = "butt" + linetype = 1, lineend = "butt", linejoin = "round" ), rect = element_rect( fill = paper, colour = ink, - linewidth = base_rect_size, linetype = 1 + linewidth = base_rect_size, linetype = 1, linejoin = "round" ), text = element_text( family = base_family, face = "plain", @@ -640,7 +641,7 @@ theme_test <- function(base_size = 11, base_family = "", ), polygon = element_polygon( fill = paper, colour = ink, - linewidth = base_rect_size, linetype = 1 + linewidth = base_rect_size, linetype = 1, linejoin = "round" ), title = element_text(family = header_family), spacing = unit(half_line, "pt"), diff --git a/R/theme-elements.R b/R/theme-elements.R index 887168f045..cb8bb15517 100644 --- a/R/theme-elements.R +++ b/R/theme-elements.R @@ -81,55 +81,118 @@ NULL #' @export #' @rdname element -element_blank <- function() { - structure( - list(), - class = c("element_blank", "element") - ) -} +element <- S7::new_class("element", abstract = TRUE) #' @export #' @rdname element -element_rect <- function(fill = NULL, colour = NULL, linewidth = NULL, - linetype = NULL, color = NULL, inherit.blank = FALSE, size = deprecated()) { - - if (lifecycle::is_present(size)) { - deprecate_warn0("3.4.0", "element_rect(size)", "element_rect(linewidth)") - linewidth <- size +element_blank <- S7::new_class( + "element_blank", + parent = element, + constructor = function() { + obj <- S7::new_object(S7::S7_object()) + class(obj) <- union( + union(c("ggplot2::element_blank", "element_blank"), class(obj)), + "element" + ) + obj } +) - if (!is.null(color)) colour <- color - structure( - list(fill = fill, colour = colour, linewidth = linewidth, linetype = linetype, - inherit.blank = inherit.blank), - class = c("element_rect", "element") - ) -} +# All properties are listed here so they can easily be recycled in the different +# element classes +#' @include properties.R +#' @include margins.R +element_props <- list( + fill = property_colour(pattern = TRUE), + colour = property_colour(pattern = FALSE), + family = property_nullable(S7::class_character), + hjust = property_nullable(S7::class_numeric), + vjust = property_nullable(S7::class_numeric), + angle = property_nullable(S7::class_numeric), + size = property_nullable(S7::class_numeric), + lineheight = property_nullable(S7::class_numeric), + margin = property_nullable(margin), + face = property_fontface(allow_null = TRUE), + linewidth = property_nullable(S7::class_numeric), + linetype = property_nullable(S7::class_numeric | S7::class_character), + lineend = property_choice(c("round", "butt", "square"), allow_null = TRUE), + linejoin = property_choice(c("round", "mitre", "bevel"), allow_null = TRUE), + shape = property_nullable(S7::class_numeric | S7::class_character), + arrow = property_nullable(S7::new_S3_class("arrow") | S7::class_logical), + arrow.fill = property_colour(pattern = FALSE), + debug = property_boolean(allow_null = TRUE, default = NULL), + inherit.blank = property_boolean(default = FALSE), + # These are reserved for future use + italic = property_nullable(S7::class_character), + fontweight = property_nullable(S7::class_numeric), + fontwidth = property_nullable(S7::class_numeric | S7::class_character) +) #' @export #' @rdname element -#' @param lineend Line end Line end style (round, butt, square) -#' @param arrow Arrow specification, as created by [grid::arrow()] -element_line <- function(colour = NULL, linewidth = NULL, linetype = NULL, - lineend = NULL, color = NULL, arrow = NULL, arrow.fill = NULL, - inherit.blank = FALSE, size = deprecated()) { - - if (lifecycle::is_present(size)) { - deprecate_warn0("3.4.0", "element_line(size)", "element_line(linewidth)") - linewidth <- size +element_rect <- S7::new_class( + "element_rect", parent = element, + properties = element_props[c("fill", "colour", + "linewidth", "linetype", "linejoin", + "inherit.blank")], + constructor = function(fill = NULL, colour = NULL, linewidth = NULL, + linetype = NULL, color = NULL, linejoin = NULL, + inherit.blank = FALSE, size = deprecated()){ + if (lifecycle::is_present(size)) { + deprecate_warn0("3.4.0", "element_rect(size)", "element_rect(linewidth)") + linewidth <- size + } + obj <- S7::new_object( + S7::S7_object(), + fill = fill, colour = color %||% colour, + linewidth = linewidth, linetype = linetype, linejoin = linejoin, + inherit.blank = inherit.blank + ) + class(obj) <- union( + union(c("ggplot2::element_rect", "element_rect"), class(obj)), + "element" + ) + obj } +) - colour <- color %||% colour - arrow.fill <- arrow.fill %||% colour - arrow <- arrow %||% FALSE - - structure( - list(colour = colour, linewidth = linewidth, linetype = linetype, lineend = lineend, - arrow = arrow, arrow.fill = arrow.fill, inherit.blank = inherit.blank), - class = c("element_line", "element") - ) -} - +#' @export +#' @rdname element +#' @param linejoin Line join style, one of `"round"`, `"mitre"` or `"bevel"`. +#' @param lineend Line end style, one of `"round"`, `"butt"` or `"square"`. +#' @param arrow Arrow specification, as created by [grid::arrow()] +element_line <- S7::new_class( + "element_line", parent = element, + properties = element_props[c( + "colour", "linewidth", "linetype", "lineend", "linejoin", + "arrow", "arrow.fill", + "inherit.blank" + )], + constructor = function(colour = NULL, linewidth = NULL, linetype = NULL, + lineend = NULL, color = NULL, linejoin = NULL, + arrow = NULL, arrow.fill = NULL, + inherit.blank = FALSE, size = deprecated()) { + if (lifecycle::is_present(size)) { + deprecate_warn0("3.4.0", "element_line(size)", "element_line(linewidth)") + linewidth <- size + } + colour <- color %||% colour + obj <- S7::new_object( + S7::S7_object(), + colour = colour, + linewidth = linewidth, linetype = linetype, lineend = lineend, + linejoin = linejoin, + arrow = arrow %||% FALSE, + arrow.fill = arrow.fill %||% colour, + inherit.blank = inherit.blank + ) + class(obj) <- union( + union(c("ggplot2::element_line", "element_line"), class(obj)), + "element" + ) + obj + } +) #' @param family The typeface to use. The validity of this value will depend on #' the graphics device being used for rendering the plot. See @@ -152,97 +215,135 @@ element_line <- function(colour = NULL, linewidth = NULL, linetype = NULL, #' is anchored. #' @export #' @rdname element -element_text <- function(family = NULL, face = NULL, colour = NULL, - size = NULL, hjust = NULL, vjust = NULL, angle = NULL, lineheight = NULL, - color = NULL, margin = NULL, debug = NULL, inherit.blank = FALSE) { - - if (!is.null(color)) colour <- color - - n <- max( - length(family), length(face), length(colour), length(size), - length(hjust), length(vjust), length(angle), length(lineheight) - ) - if (n > 1) { - cli::cli_warn(c( - "Vectorized input to {.fn element_text} is not officially supported.", - "i" = "Results may be unexpected or may change in future versions of ggplot2." - )) - } - - - structure( - list(family = family, face = face, colour = colour, size = size, +element_text <- S7::new_class( + "element_text", parent = element, + properties = element_props[c( + "family", "face", "italic", "fontweight", "fontwidth", + "colour", "size", "hjust", "vjust", "angle", "lineheight", + "margin", "debug", "inherit.blank" + )], + constructor = function(family = NULL, face = NULL, colour = NULL, + size = NULL, hjust = NULL, vjust = NULL, angle = NULL, + lineheight = NULL, color = NULL, margin = NULL, + debug = NULL, inherit.blank = FALSE) { + n <- max( + length(family), length(face), length(colour), length(size), + length(hjust), length(vjust), length(angle), length(lineheight) + ) + if (n > 1) { + cli::cli_warn(c( + "Vectorized input to {.fn element_text} is not officially supported.", + "i" = "Results may be unexpected or may change in future versions of ggplot2." + )) + } + if (!is_margin(margin) && !is.null(margin)) { + margin <- as_margin(margin) + cli::cli_warn( + "The {.arg margin} argument should be constructed using the \\ + {.fn margin} function." + ) + } + + colour <- color %||% colour + obj <- S7::new_object( + S7::S7_object(), + family = family, face = face, colour = colour, size = size, hjust = hjust, vjust = vjust, angle = angle, lineheight = lineheight, - margin = margin, debug = debug, inherit.blank = inherit.blank), - class = c("element_text", "element") - ) -} + margin = margin, debug = debug, inherit.blank = inherit.blank, + italic = NA_character_, fontweight = NA_real_, fontwidth = NA_real_ + ) + class(obj) <- union( + union(c("ggplot2::element_text", "element_text"), class(obj)), + "element" + ) + obj + } +) #' @export #' @rdname element -element_polygon <- function(fill = NULL, colour = NULL, linewidth = NULL, - linetype = NULL, color = NULL, - inherit.blank = FALSE) { - structure( - list( +element_polygon <- S7::new_class( + "element_polygon", parent = element, + properties = element_props[c( + "fill", "colour", "linewidth", "linetype", "linejoin", "inherit.blank" + )], + constructor = function(fill = NULL, colour = NULL, linewidth = NULL, + linetype = NULL, color = NULL, linejoin = NULL, + inherit.blank = FALSE) { + colour <- color %||% colour + S7::new_object( + S7::S7_object(), fill = fill, colour = color %||% colour, linewidth = linewidth, - linetype = linetype, inherit.blank = inherit.blank - ), - class = c("element_polygon", "element") - ) -} + linetype = linetype, linejoin = linejoin, inherit.blank = inherit.blank + ) + } +) #' @export #' @rdname element -element_point <- function(colour = NULL, shape = NULL, size = NULL, fill = NULL, - stroke = NULL, color = NULL, inherit.blank = FALSE) { - structure( - list( +element_point <- S7::new_class( + "element_point", parent = element, + properties = rename( + element_props[c( + "colour", "shape", "size", "fill", "linewidth", "inherit.blank" + )], + c("linewidth" = "stroke") + ), + constructor = function(colour = NULL, shape = NULL, size = NULL, fill = NULL, + stroke = NULL, color = NULL, inherit.blank = FALSE) { + S7::new_object( + S7::S7_object(), colour = color %||% colour, fill = fill, shape = shape, size = size, stroke = stroke, inherit.blank = inherit.blank - ), - class = c("element_point", "element") - ) -} + ) + } +) #' @param ink Foreground colour. #' @param paper Background colour. #' @param accent Accent colour. #' @export #' @rdname element -element_geom <- function( - # colours - ink = NULL, paper = NULL, accent = NULL, - # linewidth - linewidth = NULL, borderwidth = NULL, - # linetype - linetype = NULL, bordertype = NULL, - # text - family = NULL, fontsize = NULL, - # points - pointsize = NULL, pointshape = NULL, - - colour = NULL, color = NULL, fill = NULL) { - - if (!is.null(fontsize)) { - fontsize <- fontsize / .pt - } - - structure( - list( - ink = ink, - paper = paper, - accent = accent, +element_geom <- S7::new_class( + "element_geom", parent = element, + properties = list( + ink = element_props$colour, + paper = element_props$colour, + accent = element_props$colour, + linewidth = element_props$linewidth, + borderwidth = element_props$linewidth, + linetype = element_props$linetype, + bordertype = element_props$linetype, + family = element_props$family, + fontsize = element_props$size, + pointsize = element_props$size, + pointshape = element_props$shape, + colour = element_props$colour, + fill = element_props$fill + ), + constructor = function( + ink = NULL, paper = NULL, accent = NULL, + linewidth = NULL, borderwidth = NULL, + linetype = NULL, bordertype = NULL, + family = NULL, fontsize = NULL, + pointsize = NULL, pointshape = NULL, + colour = NULL, color = NULL, fill = NULL) { + + if (!is.null(fontsize)) { + fontsize <- fontsize / .pt + } + + S7::new_object( + S7::S7_object(), + ink = ink, paper = paper, accent = accent, linewidth = linewidth, borderwidth = borderwidth, linetype = linetype, bordertype = bordertype, family = family, fontsize = fontsize, pointsize = pointsize, pointshape = pointshape, - colour = color %||% colour, - fill = fill - ), - class = c("element_geom", "element") - ) -} + colour = color %||% colour, fill = fill + ) + } +) .default_geom_element <- element_geom( ink = "black", paper = "white", accent = "#3366FF", @@ -253,6 +354,9 @@ element_geom <- function( fill = NULL, colour = NULL ) +#' @export +print.element <- function(x, ...) utils::str(x) + #' @export #' @param type For testing elements: the type of element to expect. One of #' `"blank"`, `"rect"`, `"line"`, `"text"`, `"polygon"`, `"point"` or `"geom"`. @@ -260,23 +364,18 @@ element_geom <- function( is_theme_element <- function(x, type = "any") { switch( type %||% "any", - any = inherits(x, "element"), - rect = inherits(x, "element_rect"), - line = inherits(x, "element_line"), - text = inherits(x, "element_text"), - polygon = inherits(x, "element_polygon"), - point = inherits(x, "element_point"), - geom = inherits(x, "element_geom"), - blank = inherits(x, "element_blank"), - # We don't consider elements from extensions + any = S7::S7_inherits(x, element), + blank = S7::S7_inherits(x, element_blank), + rect = S7::S7_inherits(x, element_rect), + line = S7::S7_inherits(x, element_line), + text = S7::S7_inherits(x, element_text), + polygon = S7::S7_inherits(x, element_polygon), + point = S7::S7_inherits(x, element_point), + geom = S7::S7_inherits(x, element_geom), FALSE ) } -#' @export -print.element <- function(x, ...) utils::str(x) - - #' @param x A single number specifying size relative to parent element. #' @rdname element #' @export @@ -284,6 +383,45 @@ rel <- function(x) { structure(x, class = "rel") } +#' @export +`$.ggplot2::element` <- function(x, i) { + # deprecate_soft0("4.1.0", I("`$i`"), I("`@i`")) + `[[`(S7::props(x), i) +} + +#' @export +`[.ggplot2::element` <- function(x, i) { + # deprecate_soft0("4.1.0", I("`[i]`"), I("`S7::props(, i)`")) + `[`(S7::props(x), i) +} + +#' @export +`[[.ggplot2::element` <- function(x, i) { + # deprecate_soft0("4.1.0", I("`[[i]]`"), I("`S7::prop(, i)`")) + `[[`(S7::props(x), i) +} + +#' @export +`$<-.ggplot2::element` <- function(x, i, value) { + # deprecate_soft0("4.1.0", I("`$i <- value`"), I("`@i <- value`")) + S7::props(x) <- `[[<-`(S7::props(x), i, value) + x +} + +#' @export +`[<-.ggplot2::element` <- function(x, i, value) { + # deprecate_soft0("4.1.0", I("`[i] <- value`"), I("`S7::props()[i] <- value`")) + S7::props(x) <- `[<-`(S7::props(x), i, value) + x +} + +#' @export +`[[<-.ggplot2::element` <- function(x, i, value) { + # deprecate_soft0("4.1.0", I("`[[i]] <- value`"), I("S7::prop(, i) <- value")) + S7::props(x) <- `[[<-`(S7::props(x), i, value) + x +} + #' @export print.rel <- function(x, ...) print(noquote(paste(x, " *", sep = ""))) @@ -317,138 +455,155 @@ element_render <- function(theme, element, ..., name = NULL) { #' Generate grid grob from theme element #' +#' The `element_grob()` function is vestigial and `draw_element()` should +#' be used instead. +#' #' @param element Theme element, i.e. `element_rect` or similar. #' @param ... Other arguments to control specific of rendering. This is #' usually at least position. See the source code for individual methods. #' @keywords internal #' @export -element_grob <- function(element, ...) { - UseMethod("element_grob") -} - -#' @export -element_grob.element_blank <- function(element, ...) zeroGrob() - -#' @export -element_grob.element_rect <- function(element, x = 0.5, y = 0.5, - width = 1, height = 1, - fill = NULL, colour = NULL, linewidth = NULL, linetype = NULL, ..., size = deprecated()) { - - if (lifecycle::is_present(size)) { - deprecate_warn0("3.4.0", "element_grob.element_rect(size)", "element_grob.element_rect(linewidth)") - linewidth <- size - } +draw_element <- S7::new_generic("draw_element", "element") - # The gp settings can override element_gp - gp <- gg_par(lwd = linewidth, col = colour, fill = fill, lty = linetype) - element_gp <- gg_par(lwd = element$linewidth, col = element$colour, - fill = element$fill, lty = element$linetype) +S7::method(draw_element, element_blank) <- function(element, ...) zeroGrob() - rectGrob(x, y, width, height, gp = modify_list(element_gp, gp), ...) -} - - -#' @export -element_grob.element_text <- function(element, label = "", x = NULL, y = NULL, - family = NULL, face = NULL, colour = NULL, size = NULL, - hjust = NULL, vjust = NULL, angle = NULL, lineheight = NULL, - margin = NULL, margin_x = FALSE, margin_y = FALSE, ...) { +S7::method(draw_element, element_rect) <- + function(element, x = 0.5, y = 0.5, width = 1, height = 1, + fill = NULL, colour = NULL, + linewidth = NULL, linetype = NULL, linejoin = NULL, + ..., size = deprecated()) { - if (is.null(label)) - return(zeroGrob()) - - vj <- vjust %||% element$vjust - hj <- hjust %||% element$hjust - margin <- margin %||% element$margin + if (lifecycle::is_present(size)) { + deprecate_warn0("3.4.0", "element_grob.element_rect(size)", "element_grob.element_rect(linewidth)") + linewidth <- size + } - angle <- angle %||% element$angle %||% 0 + gp <- gg_par(lwd = linewidth, col = colour, fill = fill, lty = linetype, linejoin = linejoin) + element_gp <- gg_par(lwd = element@linewidth, col = element@colour, + fill = element@fill, lty = element@linetype, + linejoin = element@linejoin) - # The gp settings can override element_gp - gp <- gg_par(fontsize = size, col = colour, - fontfamily = family, fontface = face, - lineheight = lineheight) - element_gp <- gg_par(fontsize = element$size, col = element$colour, - fontfamily = element$family, fontface = element$face, - lineheight = element$lineheight) - - titleGrob(label, x, y, hjust = hj, vjust = vj, angle = angle, - gp = modify_list(element_gp, gp), margin = margin, - margin_x = margin_x, margin_y = margin_y, debug = element$debug, ...) -} + rectGrob(x, y, width, height, gp = modify_list(element_gp, gp), ...) + } +S7::method(draw_element, element_text) <- + function(element, label = "", x = NULL, y = NULL, + family = NULL, face = NULL, colour = NULL, size = NULL, + hjust = NULL, vjust = NULL, angle = NULL, lineheight = NULL, + margin = NULL, margin_x = FALSE, margin_y = FALSE, ...) { + + if (is.null(label)) { + return(zeroGrob()) + } + if (is_theme_element(label)) { + cli::cli_warn("{.arg label} cannot be {.obj_type_friendly {label}}.") + return(zeroGrob()) + } + + vj <- vjust %||% element@vjust + hj <- hjust %||% element@hjust + margin <- margin %||% element@margin + + angle <- angle %||% element@angle %||% 0 + + # The gp settings can override element_gp + gp <- gg_par(fontsize = size, col = colour, + fontfamily = family, fontface = face, + lineheight = lineheight) + element_gp <- gg_par(fontsize = element@size, col = element@colour, + fontfamily = element@family, fontface = element@face, + lineheight = element@lineheight) + + titleGrob(label, x, y, hjust = hj, vjust = vj, angle = angle, + gp = modify_list(element_gp, gp), margin = margin, + margin_x = margin_x, margin_y = margin_y, debug = element@debug, ...) + } +S7::method(draw_element, element_line) <- + function(element, x = 0:1, y = 0:1, + colour = NULL, linewidth = NULL, linetype = NULL, lineend = NULL, + linejoin = NULL, arrow.fill = NULL, + default.units = "npc", id.lengths = NULL, ..., size = deprecated()) { + + if (lifecycle::is_present(size)) { + deprecate_warn0("3.4.0", "element_grob.element_line(size)", "element_grob.element_line(linewidth)") + linewidth <- size + } + + arrow <- if (is.logical(element@arrow) && !element@arrow) { + NULL + } else { + element@arrow + } + if (is.null(arrow)) { + arrow.fill <- colour + element@arrow.fill <- element@colour + } + + # The gp settings can override element_gp + gp <- gg_par( + col = colour, fill = arrow.fill %||% colour, + lwd = linewidth, lty = linetype, lineend = lineend, linejoin = linejoin + ) + element_gp <- gg_par( + col = element@colour, fill = element@arrow.fill %||% element@colour, + lwd = element@linewidth, lty = element@linetype, + lineend = element@lineend, linejoin = element@linejoin + ) -#' @export -element_grob.element_line <- function(element, x = 0:1, y = 0:1, - colour = NULL, linewidth = NULL, linetype = NULL, lineend = NULL, - arrow.fill = NULL, - default.units = "npc", id.lengths = NULL, ..., size = deprecated()) { - - if (lifecycle::is_present(size)) { - deprecate_warn0("3.4.0", "element_grob.element_line(size)", "element_grob.element_line(linewidth)") - linewidth <- size + polylineGrob( + x, y, default.units = default.units, + gp = modify_list(element_gp, gp), + id.lengths = id.lengths, arrow = arrow, ... + ) } - arrow <- if (is.logical(element[["arrow"]]) && !element[["arrow"]]) { - NULL - } else { - element[["arrow"]] - } - if (is.null(arrow)) { - arrow.fill <- colour - element$arrow.fill <- element$colour +S7::method(draw_element, element_polygon) <- + function(element, x = c(0, 0.5, 1, 0.5), + y = c(0.5, 1, 0.5, 0), fill = NULL, + colour = NULL, linewidth = NULL, + linetype = NULL, linejoin = NULL, ..., + id = NULL, id.lengths = NULL, + pathId = NULL, pathId.lengths = NULL) { + + gp <- gg_par(lwd = linewidth, col = colour, fill = fill, + lty = linetype, linejoin = linejoin) + element_gp <- gg_par(lwd = element@linewidth, col = element@colour, + fill = element@fill, lty = element@linetype, + linejoin = element@linejoin) + pathGrob( + x = x, y = y, gp = modify_list(element_gp, gp), ..., + # We swap the id logic so that `id` is always the (super)group id + # (consistent with `polygonGrob()`) and `pathId` always the subgroup id. + pathId = id, pathId.lengths = id.lengths, + id = pathId, id.lengths = pathId.lengths + ) } - # The gp settings can override element_gp - gp <- gg_par( - col = colour, fill = arrow.fill %||% colour, - lwd = linewidth, lty = linetype, lineend = lineend - ) - element_gp <- gg_par( - col = element$colour, fill = element$arrow.fill %||% element$colour, - lwd = element$linewidth, lty = element$linetype, - lineend = element$lineend - ) - - polylineGrob( - x, y, default.units = default.units, - gp = modify_list(element_gp, gp), - id.lengths = id.lengths, arrow = arrow, ... - ) -} +S7::method(draw_element, element_point) <- + function(element, x = 0.5, y = 0.5, colour = NULL, + shape = NULL, fill = NULL, size = NULL, + stroke = NULL, ..., + default.units = "npc") { + + gp <- gg_par(col = colour, fill = fill, pointsize = size, stroke = stroke) + element_gp <- gg_par(col = element@colour, fill = element@fill, + pointsize = element@size, stroke = element@stroke) + shape <- translate_shape_string(shape %||% element@shape %||% 19) + pointsGrob(x = x, y = y, pch = shape, gp = modify_list(element_gp, gp), + default.units = default.units, ...) + } +# TODO: the S3 generic should be phased out once S7 is adopted more widely +#' @rdname draw_element #' @export -element_grob.element_polygon <- function(element, x = c(0, 0.5, 1, 0.5), - y = c(0.5, 1, 0.5, 0), fill = NULL, - colour = NULL, linewidth = NULL, - linetype = NULL, ..., - id = NULL, id.lengths = NULL, - pathId = NULL, pathId.lengths = NULL) { - - gp <- gg_par(lwd = linewidth, col = colour, fill = fill, lty = linetype) - element_gp <- gg_par(lwd = element$linewidth, col = element$colour, - fill = element$fill, lty = element$linetype) - pathGrob( - x = x, y = y, gp = modify_list(element_gp, gp), ..., - # We swap the id logic so that `id` is always the (super)group id - # (consistent with `polygonGrob()`) and `pathId` always the subgroup id. - pathId = id, pathId.lengths = id.lengths, - id = pathId, id.lengths = pathId.lengths - ) +element_grob <- function(element, ...) { + UseMethod("element_grob") } #' @export -element_grob.element_point <- function(element, x = 0.5, y = 0.5, colour = NULL, - shape = NULL, fill = NULL, size = NULL, - stroke = NULL, ..., - default.units = "npc") { - - gp <- gg_par(col = colour, fill = fill, pointsize = size, stroke = stroke) - element_gp <- gg_par(col = element$colour, fill = element$fill, - pointsize = element$size, stroke = element$stroke) - shape <- translate_shape_string(shape %||% element$shape %||% 19) - pointsGrob(x = x, y = y, pch = shape, gp = modify_list(element_gp, gp), - default.units = default.units, ...) +element_grob.default <- function(element, ...) { + draw_element(element, ...) } #' Define and register new theme elements @@ -484,7 +639,7 @@ element_grob.element_point <- function(element, x = 0.5, y = 0.5, colour = NULL, #' # plot panels. To do so, it registers a new theme element `ggxyz.panel.annotation` #' register_theme_elements( #' ggxyz.panel.annotation = element_text(color = "blue", hjust = 0.95, vjust = 0.05), -#' element_tree = list(ggxyz.panel.annotation = el_def("element_text", "text")) +#' element_tree = list(ggxyz.panel.annotation = el_def(element_text, "text")) #' ) #' #' # Now the package can define a new coord that includes a panel annotation @@ -603,8 +758,8 @@ check_element_tree <- function(x, arg = caller_arg(x), call = caller_env()) { #' @details #' The function `el_def()` is used to define new or modified element types and #' element inheritance relationships for the element tree. -#' @param class The name of the element class. Examples are "element_line" or -#' "element_text" or "unit", or one of the two reserved keywords "character" or +#' @param class The name of the element class. Examples are `element_line` or +#' `element_text` or "unit", or one of the two reserved keywords "character" or #' "margin". The reserved keyword "character" implies a character #' or numeric vector, not a class called "character". The keyword #' "margin" implies a unit vector of length 4, as created by [margin()]. @@ -615,6 +770,27 @@ check_element_tree <- function(x, arg = caller_arg(x), call = caller_env()) { #' @keywords internal #' @export el_def <- function(class = NULL, inherit = NULL, description = NULL) { + if (is.character(class) && length(class) == 1) { + # Swap S3 class name for S7 class object + class <- switch( + class, + element = element, + element_blank = element_blank, + element_rect = element_rect, + element_line = element_line, + element_text = element_text, + element_polygon = element_polygon, + element_point = element_point, + element_geom = element_geom, + margin = margin, + class + ) + } + # margins often occur in c("unit", "margin", "rel"), we cannot use the + # S7 class here because we don't support heterogeneous lists + if (is.character(class) && length(class) > 1) { + class[class == "margin"] <- "ggplot2::margin" + } list(class = class, inherit = inherit, description = description) } @@ -623,43 +799,43 @@ el_def <- function(class = NULL, inherit = NULL, description = NULL) { # among them. It should not be read from directly, since users may modify the # current element tree stored in ggplot_global$element_tree .element_tree <- list( - line = el_def("element_line"), - rect = el_def("element_rect"), - text = el_def("element_text"), - point = el_def("element_point"), - polygon = el_def("element_polygon"), - geom = el_def("element_geom"), - title = el_def("element_text", "text"), + line = el_def(element_line), + rect = el_def(element_rect), + text = el_def(element_text), + point = el_def(element_point), + polygon = el_def(element_polygon), + geom = el_def(element_geom), + title = el_def(element_text, "text"), spacing = el_def("unit"), margins = el_def(c("margin", "unit")), - axis.line = el_def("element_line", "line"), - axis.text = el_def("element_text", "text"), - axis.title = el_def("element_text", "title"), - axis.ticks = el_def("element_line", "line"), + axis.line = el_def(element_line, "line"), + axis.text = el_def(element_text, "text"), + axis.title = el_def(element_text, "title"), + axis.ticks = el_def(element_line, "line"), legend.key.size = el_def(c("unit", "rel"), "spacing"), - panel.grid = el_def("element_line", "line"), - panel.grid.major = el_def("element_line", "panel.grid"), - panel.grid.minor = el_def("element_line", "panel.grid"), - strip.text = el_def("element_text", "text"), - - axis.line.x = el_def("element_line", "axis.line"), - axis.line.x.top = el_def("element_line", "axis.line.x"), - axis.line.x.bottom = el_def("element_line", "axis.line.x"), - axis.line.y = el_def("element_line", "axis.line"), - axis.line.y.left = el_def("element_line", "axis.line.y"), - axis.line.y.right = el_def("element_line", "axis.line.y"), - axis.line.theta = el_def("element_line", "axis.line.x"), - axis.line.r = el_def("element_line", "axis.line.y"), - - axis.text.x = el_def("element_text", "axis.text"), - axis.text.x.top = el_def("element_text", "axis.text.x"), - axis.text.x.bottom = el_def("element_text", "axis.text.x"), - axis.text.y = el_def("element_text", "axis.text"), - axis.text.y.left = el_def("element_text", "axis.text.y"), - axis.text.y.right = el_def("element_text", "axis.text.y"), - axis.text.theta = el_def("element_text", "axis.text.x"), - axis.text.r = el_def("element_text", "axis.text.y"), + panel.grid = el_def(element_line, "line"), + panel.grid.major = el_def(element_line, "panel.grid"), + panel.grid.minor = el_def(element_line, "panel.grid"), + strip.text = el_def(element_text, "text"), + + axis.line.x = el_def(element_line, "axis.line"), + axis.line.x.top = el_def(element_line, "axis.line.x"), + axis.line.x.bottom = el_def(element_line, "axis.line.x"), + axis.line.y = el_def(element_line, "axis.line"), + axis.line.y.left = el_def(element_line, "axis.line.y"), + axis.line.y.right = el_def(element_line, "axis.line.y"), + axis.line.theta = el_def(element_line, "axis.line.x"), + axis.line.r = el_def(element_line, "axis.line.y"), + + axis.text.x = el_def(element_text, "axis.text"), + axis.text.x.top = el_def(element_text, "axis.text.x"), + axis.text.x.bottom = el_def(element_text, "axis.text.x"), + axis.text.y = el_def(element_text, "axis.text"), + axis.text.y.left = el_def(element_text, "axis.text.y"), + axis.text.y.right = el_def(element_text, "axis.text.y"), + axis.text.theta = el_def(element_text, "axis.text.x"), + axis.text.r = el_def(element_text, "axis.text.y"), axis.ticks.length = el_def(c("unit", "rel"), "spacing"), axis.ticks.length.x = el_def(c("unit", "rel"), "axis.ticks.length"), @@ -671,28 +847,28 @@ el_def <- function(class = NULL, inherit = NULL, description = NULL) { axis.ticks.length.theta = el_def(c("unit", "rel"), "axis.ticks.length.x"), axis.ticks.length.r = el_def(c("unit", "rel"), "axis.ticks.length.y"), - axis.ticks.x = el_def("element_line", "axis.ticks"), - axis.ticks.x.top = el_def("element_line", "axis.ticks.x"), - axis.ticks.x.bottom = el_def("element_line", "axis.ticks.x"), - axis.ticks.y = el_def("element_line", "axis.ticks"), - axis.ticks.y.left = el_def("element_line", "axis.ticks.y"), - axis.ticks.y.right = el_def("element_line", "axis.ticks.y"), - axis.ticks.theta = el_def("element_line", "axis.ticks.x"), - axis.ticks.r = el_def("element_line", "axis.ticks.y"), - - axis.title.x = el_def("element_text", "axis.title"), - axis.title.x.top = el_def("element_text", "axis.title.x"), - axis.title.x.bottom = el_def("element_text", "axis.title.x"), - axis.title.y = el_def("element_text", "axis.title"), - axis.title.y.left = el_def("element_text", "axis.title.y"), - axis.title.y.right = el_def("element_text", "axis.title.y"), - - axis.minor.ticks.x.top = el_def("element_line", "axis.ticks.x.top"), - axis.minor.ticks.x.bottom = el_def("element_line", "axis.ticks.x.bottom"), - axis.minor.ticks.y.left = el_def("element_line", "axis.ticks.y.left"), - axis.minor.ticks.y.right = el_def("element_line", "axis.ticks.y.right"), - axis.minor.ticks.theta = el_def("element_line", "axis.ticks.theta"), - axis.minor.ticks.r = el_def("element_line", "axis.ticks.r"), + axis.ticks.x = el_def(element_line, "axis.ticks"), + axis.ticks.x.top = el_def(element_line, "axis.ticks.x"), + axis.ticks.x.bottom = el_def(element_line, "axis.ticks.x"), + axis.ticks.y = el_def(element_line, "axis.ticks"), + axis.ticks.y.left = el_def(element_line, "axis.ticks.y"), + axis.ticks.y.right = el_def(element_line, "axis.ticks.y"), + axis.ticks.theta = el_def(element_line, "axis.ticks.x"), + axis.ticks.r = el_def(element_line, "axis.ticks.y"), + + axis.title.x = el_def(element_text, "axis.title"), + axis.title.x.top = el_def(element_text, "axis.title.x"), + axis.title.x.bottom = el_def(element_text, "axis.title.x"), + axis.title.y = el_def(element_text, "axis.title"), + axis.title.y.left = el_def(element_text, "axis.title.y"), + axis.title.y.right = el_def(element_text, "axis.title.y"), + + axis.minor.ticks.x.top = el_def(element_line, "axis.ticks.x.top"), + axis.minor.ticks.x.bottom = el_def(element_line, "axis.ticks.x.bottom"), + axis.minor.ticks.y.left = el_def(element_line, "axis.ticks.y.left"), + axis.minor.ticks.y.right = el_def(element_line, "axis.ticks.y.right"), + axis.minor.ticks.theta = el_def(element_line, "axis.ticks.theta"), + axis.minor.ticks.r = el_def(element_line, "axis.ticks.r"), axis.minor.ticks.length = el_def(c("unit", "rel")), axis.minor.ticks.length.x = el_def(c("unit", "rel"), "axis.minor.ticks.length"), @@ -716,25 +892,25 @@ el_def <- function(class = NULL, inherit = NULL, description = NULL) { c("unit", "rel"), c("axis.minor.ticks.length.y", "axis.ticks.length.r") ), - legend.background = el_def("element_rect", "rect"), + legend.background = el_def(element_rect, "rect"), legend.margin = el_def(c("margin", "unit", "rel"), "margins"), legend.spacing = el_def(c("unit", "rel"), "spacing"), legend.spacing.x = el_def(c("unit", "rel"), "legend.spacing"), legend.spacing.y = el_def(c("unit", "rel"), "legend.spacing"), - legend.key = el_def("element_rect", "panel.background"), + legend.key = el_def(element_rect, "panel.background"), legend.key.height = el_def(c("unit", "rel"), "legend.key.size"), legend.key.width = el_def(c("unit", "rel"), "legend.key.size"), legend.key.spacing = el_def(c("unit", "rel"), "spacing"), legend.key.spacing.x = el_def(c("unit", "rel"), "legend.key.spacing"), legend.key.spacing.y = el_def(c("unit", "rel"), "legend.key.spacing"), legend.key.justification = el_def(c("character", "numeric", "integer")), - legend.frame = el_def("element_rect", "rect"), - legend.axis.line = el_def("element_line", "line"), - legend.ticks = el_def("element_line", "legend.axis.line"), + legend.frame = el_def(element_rect, "rect"), + legend.axis.line = el_def(element_line, "line"), + legend.ticks = el_def(element_line, "legend.axis.line"), legend.ticks.length = el_def(c("rel", "unit"), "legend.key.size"), - legend.text = el_def("element_text", "text"), + legend.text = el_def(element_text, "text"), legend.text.position = el_def("character"), - legend.title = el_def("element_text", "title"), + legend.title = el_def(element_text, "title"), legend.title.position = el_def("character"), legend.byrow = el_def("logical"), legend.position = el_def("character"), @@ -768,45 +944,45 @@ el_def <- function(class = NULL, inherit = NULL, description = NULL) { legend.box = el_def("character"), legend.box.just = el_def("character"), legend.box.margin = el_def(c("margin", "unit", "rel"), "margins"), - legend.box.background = el_def("element_rect", "rect"), + legend.box.background = el_def(element_rect, "rect"), legend.box.spacing = el_def(c("unit", "rel"), "spacing"), - panel.background = el_def("element_rect", "rect"), - panel.border = el_def("element_rect", "rect"), + panel.background = el_def(element_rect, "rect"), + panel.border = el_def(element_rect, "rect"), panel.spacing = el_def(c("unit", "rel"), "spacing"), panel.spacing.x = el_def(c("unit", "rel"), "panel.spacing"), panel.spacing.y = el_def(c("unit", "rel"), "panel.spacing"), - panel.grid.major.x = el_def("element_line", "panel.grid.major"), - panel.grid.major.y = el_def("element_line", "panel.grid.major"), - panel.grid.minor.x = el_def("element_line", "panel.grid.minor"), - panel.grid.minor.y = el_def("element_line", "panel.grid.minor"), + panel.grid.major.x = el_def(element_line, "panel.grid.major"), + panel.grid.major.y = el_def(element_line, "panel.grid.major"), + panel.grid.minor.x = el_def(element_line, "panel.grid.minor"), + panel.grid.minor.y = el_def(element_line, "panel.grid.minor"), panel.ontop = el_def("logical"), panel.widths = el_def("unit"), panel.heights = el_def("unit"), - strip.background = el_def("element_rect", "rect"), - strip.background.x = el_def("element_rect", "strip.background"), - strip.background.y = el_def("element_rect", "strip.background"), + strip.background = el_def(element_rect, "rect"), + strip.background.x = el_def(element_rect, "strip.background"), + strip.background.y = el_def(element_rect, "strip.background"), strip.clip = el_def("character"), - strip.text.x = el_def("element_text", "strip.text"), - strip.text.x.top = el_def("element_text", "strip.text.x"), - strip.text.x.bottom = el_def("element_text", "strip.text.x"), - strip.text.y = el_def("element_text", "strip.text"), - strip.text.y.left = el_def("element_text", "strip.text.y"), - strip.text.y.right = el_def("element_text", "strip.text.y"), + strip.text.x = el_def(element_text, "strip.text"), + strip.text.x.top = el_def(element_text, "strip.text.x"), + strip.text.x.bottom = el_def(element_text, "strip.text.x"), + strip.text.y = el_def(element_text, "strip.text"), + strip.text.y.left = el_def(element_text, "strip.text.y"), + strip.text.y.right = el_def(element_text, "strip.text.y"), strip.placement = el_def("character"), strip.placement.x = el_def("character", "strip.placement"), strip.placement.y = el_def("character", "strip.placement"), strip.switch.pad.grid = el_def(c("unit", "rel"), "spacing"), strip.switch.pad.wrap = el_def(c("unit", "rel"), "spacing"), - plot.background = el_def("element_rect", "rect"), - plot.title = el_def("element_text", "title"), + plot.background = el_def(element_rect, "rect"), + plot.title = el_def(element_text, "title"), plot.title.position = el_def("character"), - plot.subtitle = el_def("element_text", "text"), - plot.caption = el_def("element_text", "text"), + plot.subtitle = el_def(element_text, "text"), + plot.caption = el_def(element_text, "text"), plot.caption.position = el_def("character"), - plot.tag = el_def("element_text", "text"), + plot.tag = el_def(element_text, "text"), plot.tag.position = el_def(c("character", "numeric", "integer")), # Need to also accept numbers plot.tag.location = el_def("character"), plot.margin = el_def(c("margin", "unit", "rel"), "margins"), @@ -851,11 +1027,39 @@ check_element <- function(el, elname, element_tree, call = caller_env()) { # NULL values for elements are OK if (is.null(el)) return() - if ("margin" %in% eldef$class) { - if (!is.unit(el) && length(el) == 4) - cli::cli_abort("The {.var {elname}} theme element must be a {.cls unit} vector of length 4.", call = call) - } else if (!inherits(el, eldef$class) && !is_theme_element(el, "blank")) { - cli::cli_abort("The {.var {elname}} theme element must be a {.cls {eldef$class}} object.", call = call) + class <- eldef$class + if (inherits(class, "S7_class")) { + inherit_ok <- S7::S7_inherits(el, class) + # For backward compatibility + # TODO: deprecate next release cycle + old_s3_inherits <- inherits(el, class@name) + inherit_ok <- inherit_ok || old_s3_inherits + } else { + inherit_ok <- inherits(el, class) + } + + if (is.character(class) && any(c("margin", "ggplot2::margin") %in% class)) { + if ("rel" %in% class && is_rel(el)) { + return() + } + if (is.unit(el) && length(el) == 4) { + return() + } + cli::cli_abort( + "The {.var {elname}} theme element must be a {.cls unit} vector of length 4", + call = call + ) + } + + # Maybe we should check that `class` is an element class before approving of + # blank elements? + if (inherit_ok || is_theme_element(el, "blank")) { + return() } - invisible() + + class_name <- if (inherits(class, "S7_class")) class@name else class + cli::cli_abort( + "The {.var {elname}} theme element must be a {.cls {class_name}} object.", + call = call + ) } diff --git a/R/theme.R b/R/theme.R index 7f6c1b93fd..703d2a5326 100644 --- a/R/theme.R +++ b/R/theme.R @@ -217,7 +217,7 @@ #' @param validate `TRUE` to run `check_element()`, `FALSE` to bypass checks. #' @export #' @seealso -#' [+.gg()] and [%+replace%], +#' [add_gg()] and [%+replace%], #' [element_blank()], [element_line()], #' [element_rect()], and [element_text()] for #' details of the specific theme elements. @@ -490,18 +490,16 @@ theme <- function(..., # If complete theme set all non-blank elements to inherit from blanks if (complete) { elements <- lapply(elements, function(el) { - if (is_theme_element(el) && !is_theme_element(el, "blank")) { - el$inherit.blank <- TRUE + if (is_theme_element(el) && S7::prop_exists(el, "inherit.blank")) { + S7::prop(el, "inherit.blank") <- TRUE } el }) } - structure( - elements, - class = c("theme", "gg"), - complete = complete, - validate = validate - ) + + t <- class_theme(elements, complete = complete, validate = validate) + class(t) <- union("theme", class(t)) + t } fix_theme_deprecations <- function(elements) { @@ -592,7 +590,7 @@ validate_theme_palettes <- function(elements) { #' @export #' @rdname is_tests -is_theme <- function(x) inherits(x, "theme") +is_theme <- function(x) S7::S7_inherits(x, class_theme) #' @export #' @rdname is_tests @@ -603,12 +601,13 @@ is.theme <- function(x) { } # check whether theme is complete -is_theme_complete <- function(x) isTRUE(attr(x, "complete", exact = TRUE)) +is_theme_complete <- function(x) { + is_theme(x) && isTRUE(x@complete) +} # check whether theme should be validated is_theme_validate <- function(x) { - validate <- attr(x, "validate", exact = TRUE) - isTRUE(validate %||% TRUE) + !is_theme(x) || isTRUE(x@validate) } check_theme <- function(theme, tree = get_element_tree(), call = caller_env()) { @@ -648,21 +647,19 @@ complete_theme <- function(theme = NULL, default = theme_get()) { } check_object(default, is_theme, "a {.cls theme} object") theme <- plot_theme(list(theme = theme), default = default) - - # Using `theme(!!!theme)` drops `NULL` entries, so strip most attributes and - # construct a new theme - attributes(theme) <- list(names = attr(theme, "names")) - structure( - theme, - class = c("theme", "gg"), - complete = TRUE, # This theme is complete and has no missing elements - validate = FALSE # Settings have already been validated - ) + theme@complete <- TRUE + theme@validate <- FALSE + theme } # Combine plot defaults with current theme to get complete theme for a plot plot_theme <- function(x, default = get_theme()) { - theme <- x$theme + if (S7::S7_inherits(x)) { + theme <- x@theme + } else { + theme <- x$theme + } + # apply theme defaults appropriately if needed if (is_theme_complete(theme)) { @@ -724,13 +721,12 @@ add_theme <- function(t1, t2, t2name, call = caller_env()) { } ) - # make sure the "complete" attribute is set; this can be missing - # when t1 is an empty list - attr(t1, "complete") <- is_theme_complete(t1) + if (!is_theme(t1) && is.list(t1)) { + t1 <- theme(!!!t1) + } # Only validate if both themes should be validated - attr(t1, "validate") <- - is_theme_validate(t1) && is_theme_validate(t2) + t1@validate <- is_theme_validate(t1) && is_theme_validate(t2) t1 } @@ -766,7 +762,7 @@ calc_element <- function(element, theme, verbose = FALSE, skip_blank = FALSE, # If result is element_blank, we skip it if `skip_blank` is `TRUE`, # and otherwise we don't inherit anything from parents - if (inherits(el_out, "element_blank")) { + if (is_theme_element(el_out, "blank")) { if (isTRUE(skip_blank)) { el_out <- NULL } else { @@ -780,9 +776,18 @@ calc_element <- function(element, theme, verbose = FALSE, skip_blank = FALSE, # If the element is defined (and not just inherited), check that # it is of the class specified in element_tree - if (!is.null(el_out) && - !inherits(el_out, element_tree[[element]]$class)) { - cli::cli_abort("Theme element {.var {element}} must have class {.cls {ggplot_global$element_tree[[element]]$class}}.", call = call) + if (!is.null(el_out)) { + class <- element_tree[[element]]$class + if (inherits(class, "S7_class")) { + old_s3_inherit <- inherits(el_out, class@name) + if (!S7::S7_inherits(el_out, class) && !old_s3_inherit) { + cli::cli_abort("Theme element {.var {element}} must have class {.cls {class@name}}.", call = call) + } + } else { + if (!inherits(el_out, class)) { + cli::cli_abort("Theme element {.var {element}} must have class {.cls {ggplot_global$element_tree[[element]]$class}}.", call = call) + } + } } # Get the names of parents from the inheritance tree @@ -793,15 +798,23 @@ calc_element <- function(element, theme, verbose = FALSE, skip_blank = FALSE, if (verbose) cli::cli_inform("nothing (top level)") # Check that all the properties of this element are non-NULL - nullprops <- vapply(el_out, is.null, logical(1)) + if (is_theme_element(el_out)) { + nullprops <- lengths(S7::props(el_out)) == 0 + } else { + nullprops <- vapply(el_out, is.null, logical(1)) + } if (!any(nullprops)) { return(el_out) # no null properties, return element as is } # if we have null properties, try to fill in from ggplot_global$theme_default el_out <- combine_elements(el_out, ggplot_global$theme_default[[element]]) - nullprops <- vapply(el_out, is.null, logical(1)) - if (inherits(el_out, "element_geom")) { + if (is_theme_element(el_out)) { + nullprops <- lengths(S7::props(el_out)) == 0 + } else { + nullprops <- vapply(el_out, is.null, logical(1)) + } + if (is_theme_element(el_out, "geom")) { # Geom elements are expected to have NULL fill/colour, so allow these # to be missing nullprops[c("colour", "fill")] <- FALSE @@ -815,15 +828,19 @@ calc_element <- function(element, theme, verbose = FALSE, skip_blank = FALSE, # Calculate the parent objects' inheritance if (verbose) cli::cli_inform("{pnames}") + + # once we've started skipping blanks, we continue doing so until the end of the + # recursion; we initiate skipping blanks if we encounter an element that + # doesn't inherit blank. + skip_blank <- skip_blank || + (!is.null(el_out) && !isTRUE(try_prop(el_out, "inherit.blank"))) + parents <- lapply( pnames, calc_element, theme, verbose = verbose, - # once we've started skipping blanks, we continue doing so until the end of the - # recursion; we initiate skipping blanks if we encounter an element that - # doesn't inherit blank. - skip_blank = skip_blank || (!is.null(el_out) && !isTRUE(el_out$inherit.blank)), + skip_blank = skip_blank, call = call ) @@ -849,69 +866,74 @@ calc_element <- function(element, theme, verbose = FALSE, skip_blank = FALSE, #' # Adopt size but ignore colour #' merge_element(new, old) #' -merge_element <- function(new, old) { - UseMethod("merge_element") -} - -#' @rdname merge_element -#' @export -merge_element.default <- function(new, old) { - if (is.null(old) || inherits(old, "element_blank")) { +merge_element <- S7::new_generic( + "merge_element", dispatch_args = c("new", "old"), + fun = function(new, old, ...) { # If old is NULL or element_blank, then just return new - return(new) - } else if (is.null(new) || is.character(new) || is.numeric(new) || is.unit(new) || - is.logical(new) || is.function(new)) { - # If new is NULL, or a string, numeric vector, unit, or logical, just return it - return(new) + if (is.null(old) || is_theme_element(old, "blank")) { + return(new) + } + S7::S7_dispatch() } +) + +S7::method(merge_element, list(S7::class_any, S7::class_any)) <- + function(new, old, ...) { + if (is.null(new) || is.character(new) || is.numeric(new) || is.unit(new) || + is.logical(new) || is.function(new)) { + # If new is NULL, or a string, numeric vector, unit, or logical, just return it + return(new) + } - # otherwise we can't merge - cli::cli_abort("No method for merging {.cls {class(new)[1]}} into {.cls {class(old)[1]}}.") -} - -#' @rdname merge_element -#' @export -merge_element.element_blank <- function(new, old) { - # If new is element_blank, just return it - new -} - -#' @rdname merge_element -#' @export -merge_element.element <- function(new, old) { - if (is.null(old) || inherits(old, "element_blank")) { - # If old is NULL or element_blank, then just return new - return(new) + # otherwise we can't merge + cli::cli_abort("No method for merging {.cls {class(new)[1]}} into {.cls {class(old)[1]}}.") } - # actual merging can only happen if classes match - if (!inherits(new, class(old)[1])) { - cli::cli_abort("Only elements of the same class can be merged.") +S7::method(merge_element, list(element_blank, S7::class_any)) <- + function(new, old, ...) { + # If new is element_blank, just return it + new } - # Override NULL properties of new with the values in old - # Get logical vector of NULL properties in new - idx <- vapply(new, is.null, logical(1)) - # Get the names of TRUE items - idx <- names(idx[idx]) +S7::method(merge_element, list(element, S7::class_any)) <- + function(new, old, ...) { + # actual merging can only happen if classes match + if (!inherits(new, class(old)[1])) { + cli::cli_abort("Only elements of the same class can be merged.") + } + + # Override NULL properties of new with the values in old + # Get logical vector of NULL properties in new + idx <- lengths(S7::props(new)) == 0 + # Get the names of TRUE items + idx <- names(idx[idx]) - # Update non-NULL items - new[idx] <- old[idx] + # Update non-NULL items + S7::props(new)[idx] <- S7::props(old, idx) - new + new } -#' @rdname merge_element -#' @export -merge_element.margin <- function(new, old) { - if (is.null(old) || inherits(old, "element_blank")) { - return(new) +S7::method(merge_element, list(margin, S7::class_any)) <- + function(new, old, ...) { + if (anyNA(new)) { + new[is.na(new)] <- old[is.na(new)] + } + new } - if (anyNA(new)) { - new[is.na(new)] <- old[is.na(new)] + +# For backward compatibility +# TODO: in subsequent release cycle, start deprecation +S7::method(merge_element, list(S7::new_S3_class("element"), S7::class_any)) <- + function(new, old, ...) { + if (S7::S7_inherits(old)) { + old <- S7::props(old) + } + idx <- lengths(new) == 0 + idx <- names(idx[idx]) + new[idx] <- old[idx] + new } - new -} #' Combine the properties of two elements #' @@ -923,7 +945,7 @@ merge_element.margin <- function(new, old) { combine_elements <- function(e1, e2) { # If e2 is NULL, nothing to inherit - if (is.null(e2) || inherits(e1, "element_blank")) { + if (is.null(e2) || is_theme_element(e1, "blank")) { return(e1) } @@ -946,7 +968,7 @@ combine_elements <- function(e1, e2) { return(e1) } - if (inherits(e1, "margin") && inherits(e2, "margin")) { + if (is_margin(e1) && is_margin(e2)) { if (anyNA(e2)) { e2[is.na(e2)] <- unit(0, "pt") } @@ -955,6 +977,13 @@ combine_elements <- function(e1, e2) { } } + # Backward compatbility + # TODO: deprecate next release cycle + is_old_element <- !S7::S7_inherits(e1) && inherits(e1, "element") + if (is_old_element && is_theme_element(e2)) { + return(combine_s3_elements(e1, e2)) + } + # If neither of e1 or e2 are element_* objects, return e1 if (!is_theme_element(e1) && !is_theme_element(e2)) { return(e1) @@ -962,8 +991,8 @@ combine_elements <- function(e1, e2) { # If e2 is element_blank, and e1 inherits blank inherit everything from e2, # otherwise ignore e2 - if (inherits(e2, "element_blank")) { - if (e1$inherit.blank) { + if (is_theme_element(e2, "blank")) { + if (isTRUE(try_prop(e1, "inherit.blank"))) { return(e2) } else { return(e1) @@ -971,39 +1000,58 @@ combine_elements <- function(e1, e2) { } # If e1 has any NULL properties, inherit them from e2 - n <- names(e1)[vapply(e1, is.null, logical(1))] - e1[n] <- e2[n] + n <- S7::prop_names(e1)[lengths(S7::props(e1)) == 0] + S7::props(e1)[n] <- S7::props(e2)[n] # Calculate relative sizes - if (is_rel(e1$size)) { - e1$size <- e2$size * unclass(e1$size) + if (is_rel(try_prop(e1, "size"))) { + e1@size <- e2@size * unclass(e1@size) } # Calculate relative linewidth - if (is_rel(e1$linewidth)) { - e1$linewidth <- e2$linewidth * unclass(e1$linewidth) + if (is_rel(try_prop(e1, "linewidth"))) { + e1@linewidth <- e2@linewidth * unclass(e1@linewidth) } - if (inherits(e1, "element_text")) { - e1$margin <- combine_elements(e1$margin, e2$margin) + if (is_theme_element(e1, "text")) { + e1@margin <- combine_elements(e1@margin, e2@margin) } # If e2 is 'richer' than e1, fill e2 with e1 parameters is_subclass <- !any(inherits(e2, class(e1), which = TRUE) == 0) is_subclass <- is_subclass && length(setdiff(class(e2), class(e1))) > 0 if (is_subclass) { - new <- defaults(e1, e2) - e2[names(new)] <- new + new <- defaults(S7::props(e1), S7::props(e2)) + S7::props(e2)[names(new)] <- new return(e2) } e1 } +# For backward compatibility +# TODO: in subsequent release cycle, start deprecation +combine_s3_elements <- function(e1, e2) { + e1 <- merge_element(e1, e2) + if (S7::S7_inherits(e2)) { + e2 <- S7::props(e2) + } + if (is_rel(e1$size)) { + e1$size <- e2$size * unclass(e1$size) + } + if (is_rel(e1$linewidth)) { + e1$linewidth <- e2$linewidth * unclass(e1$linewidth) + } + if (inherits(e1, "element_text")) { + e1$margin <- combine_elements(e1$margin, e2$margin) + } + return(e1) +} + #' @export -`$.theme` <- function(x, ...) { +`$.ggplot2::theme` <- function(x, ...) { .subset2(x, ...) } #' @export -print.theme <- function(x, ...) utils::str(x) +`print.ggplot2::theme` <- function(x, ...) utils::str(x) diff --git a/R/utilities.R b/R/utilities.R index d4fd0ccef4..ec375b723e 100644 --- a/R/utilities.R +++ b/R/utilities.R @@ -907,3 +907,13 @@ compute_data_size <- function(data, size, default = 0.9, data[[target]] <- res * (default %||% 0.9) data } + +try_prop <- function(object, name, default = NULL) { + if (!S7::S7_inherits(object)) { + return(default) + } + if (!S7::prop_exists(object, name)) { + return(default) + } + S7::prop(object, name) +} diff --git a/R/zzz.R b/R/zzz.R index 398cb7d7b6..9bfffde0a6 100644 --- a/R/zzz.R +++ b/R/zzz.R @@ -30,6 +30,12 @@ on_load( vars <- dplyr::vars } ) + +on_load( + if (getRversion() > "4.3.0") registerS3method("+", "gg", add_gg) +) + +on_load(S7::methods_register()) .onLoad <- function(...) { run_on_load() } diff --git a/_pkgdown.yml b/_pkgdown.yml index 2cee098aa4..701eba5a8d 100644 --- a/_pkgdown.yml +++ b/_pkgdown.yml @@ -51,7 +51,7 @@ reference: contents: - ggplot - aes - - "`+.gg`" + - add_gg - ggsave - qplot diff --git a/man/aes.Rd b/man/aes.Rd index ed77c5d39e..adce5c7ad4 100644 --- a/man/aes.Rd +++ b/man/aes.Rd @@ -17,8 +17,8 @@ The names for x and y aesthetics are typically omitted because they are so common; all other aesthetics must be named.} } \value{ -A list with class \code{uneval}. Components of the list are either -quosures or constants. +An S7 object representing a list with class \code{mapping}. Components of +the list are either quosures or constants. } \description{ Aesthetic mappings describe how variables in the data are mapped to visual diff --git a/man/ggplot_build.Rd b/man/build_ggplot.Rd similarity index 83% rename from man/ggplot_build.Rd rename to man/build_ggplot.Rd index 239677f6ce..e5157679ee 100644 --- a/man/ggplot_build.Rd +++ b/man/build_ggplot.Rd @@ -1,6 +1,7 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/plot-build.R -\name{ggplot_build} +\name{build_ggplot} +\alias{build_ggplot} \alias{ggplot_build} \alias{get_layer_data} \alias{layer_data} @@ -10,7 +11,9 @@ \alias{layer_grob} \title{Build ggplot for rendering.} \usage{ -ggplot_build(plot) +build_ggplot(plot, ...) + +ggplot_build(plot, ...) get_layer_data(plot = get_last_plot(), i = 1L) @@ -27,6 +30,8 @@ layer_grob(plot = get_last_plot(), i = 1L) \arguments{ \item{plot}{ggplot object} +\item{...}{Not currently in use.} + \item{i}{An integer. In \code{get_layer_data()}, the data to return (in the order added to the plot). In \code{get_layer_grob()}, the grob to return (in the order added to the plot). In \code{get_panel_scales()}, the row of a facet to return scales for.} @@ -35,10 +40,11 @@ plot). In \code{get_panel_scales()}, the row of a facet to return scales for.} scales for.} } \description{ -\code{ggplot_build()} takes the plot object, and performs all steps necessary +\code{build_ggplot()} takes the plot object, and performs all steps necessary to produce an object that can be rendered. This function outputs two pieces: a list of data frames (one for each layer), and a panel object, which -contain all information about axis limits, breaks etc. +contain all information about axis limits, breaks etc. The \code{ggplot_build()} +function is vestigial and \code{build_ggplot()} should be used instead. } \details{ \code{get_layer_data()}, \code{get_layer_grob()}, and \code{get_panel_scales()} are helper diff --git a/man/class_ggplot.Rd b/man/class_ggplot.Rd new file mode 100644 index 0000000000..05b4f3e0df --- /dev/null +++ b/man/class_ggplot.Rd @@ -0,0 +1,54 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/all-classes.R +\name{class_ggplot} +\alias{class_ggplot} +\title{The ggplot class} +\usage{ +class_ggplot( + data = waiver(), + layers = list(), + scales = NULL, + guides = NULL, + mapping = aes(), + theme = NULL, + coordinates = coord_cartesian(default = TRUE), + facet = facet_null(), + layout = NULL, + labels = labs(), + meta = list(), + plot_env = parent.frame() +) +} +\arguments{ +\item{data}{A property containing any data coerced by \code{\link[=fortify]{fortify()}}.} + +\item{layers}{A list of layer instances created by \code{\link[=layer]{layer()}}.} + +\item{scales}{A ScalesList ggproto object.} + +\item{guides}{A Guides ggproto object created by \code{\link[=guides]{guides()}}.} + +\item{mapping}{A mapping class object created by \code{\link[=aes]{aes()}}.} + +\item{theme}{A theme class object created by \code{\link[=theme]{theme()}}.} + +\item{coordinates}{A Coord ggproto object created by \verb{coord_*()} family of +functions.} + +\item{facet}{A Facet ggproto object created by \verb{facet_*()} family of +functions.} + +\item{layout}{A Layout ggproto object.} + +\item{labels}{A labels object created by \code{\link[=labs]{labs()}}.} + +\item{meta}{A list for additional metadata. This will be deprecated in the +future.} + +\item{plot_env}{An environment.} +} +\description{ +The ggplot class collects the needed information to render a plot. +This class can be constructed using the \code{\link[=ggplot]{ggplot()}} function. +} +\keyword{internal} diff --git a/man/class_ggplot_built.Rd b/man/class_ggplot_built.Rd new file mode 100644 index 0000000000..4e87451998 --- /dev/null +++ b/man/class_ggplot_built.Rd @@ -0,0 +1,23 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/all-classes.R +\name{class_ggplot_built} +\alias{class_ggplot_built} +\title{The ggplot built class} +\usage{ +class_ggplot_built(data = NULL, layout = NULL, plot = NULL) +} +\arguments{ +\item{data}{A list of plain data frames; one for each layer.} + +\item{layout}{A Layout ggproto object.} + +\item{plot}{A completed ggplot class object.} +} +\description{ +The ggplot built class is an intermediate class and represents a processed +ggplot object ready for rendering. It is constructed by calling +\code{\link[=ggplot_build]{ggplot_build()}} on a \link[=class_ggplot]{ggplot} object and is not meant to be +instantiated directly. The class can be rendered to a gtable object by +calling the \code{\link[=ggplot_gtable]{ggplot_gtable()}} function on a ggplot built class object. +} +\keyword{internal} diff --git a/man/class_labels.Rd b/man/class_labels.Rd new file mode 100644 index 0000000000..57788e666d --- /dev/null +++ b/man/class_labels.Rd @@ -0,0 +1,17 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/all-classes.R +\name{class_labels} +\alias{class_labels} +\title{The labels class} +\usage{ +class_labels(labels) +} +\arguments{ +\item{labels}{A named list.} +} +\description{ +The labels class holds a list with label information to display as titles +of plot components. The preferred way to construct an object of the labels +class is to use the \code{\link[=labs]{labs()}} function. +} +\keyword{internal} diff --git a/man/class_mapping.Rd b/man/class_mapping.Rd new file mode 100644 index 0000000000..63f75456d3 --- /dev/null +++ b/man/class_mapping.Rd @@ -0,0 +1,19 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/all-classes.R +\name{class_mapping} +\alias{class_mapping} +\title{The mapping class} +\usage{ +class_mapping(x, env = globalenv()) +} +\arguments{ +\item{x}{A list of quosures and constants.} + +\item{env}{An environment for symbols that are not quosures or constants.} +} +\description{ +The mapping class holds a list of quoted expressions +(\link[rlang:topic-quosure]{quosures}) or constants. An object is typically +constructed using the \code{\link[=aes]{aes()}} function. +} +\keyword{internal} diff --git a/man/class_theme.Rd b/man/class_theme.Rd new file mode 100644 index 0000000000..ab3a03ef1d --- /dev/null +++ b/man/class_theme.Rd @@ -0,0 +1,22 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/all-classes.R +\name{class_theme} +\alias{class_theme} +\title{The theme class} +\usage{ +class_theme(elements, complete, validate) +} +\arguments{ +\item{elements}{A named list containing theme elements.} + +\item{complete}{A boolean value stating whether a theme is complete.} + +\item{validate}{A boolean value stating whether a theme should still be +validated.} +} +\description{ +The theme class holds information on how non-data elements of the plot +should be rendered. The preferred way to construct an object of this class +is through the \code{\link[=theme]{theme()}} function. +} +\keyword{internal} diff --git a/man/element_grob.Rd b/man/draw_element.Rd similarity index 73% rename from man/element_grob.Rd rename to man/draw_element.Rd index 589f3a3abc..0fe2510351 100644 --- a/man/element_grob.Rd +++ b/man/draw_element.Rd @@ -1,9 +1,12 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/theme-elements.R -\name{element_grob} +\name{draw_element} +\alias{draw_element} \alias{element_grob} \title{Generate grid grob from theme element} \usage{ +draw_element(element, ...) + element_grob(element, ...) } \arguments{ @@ -13,6 +16,7 @@ element_grob(element, ...) usually at least position. See the source code for individual methods.} } \description{ -Generate grid grob from theme element +The \code{element_grob()} function is vestigial and \code{draw_element()} should +be used instead. } \keyword{internal} diff --git a/man/element.Rd b/man/element.Rd index 6ee08dd20d..14a020db17 100644 --- a/man/element.Rd +++ b/man/element.Rd @@ -1,6 +1,10 @@ % Generated by roxygen2: do not edit by hand -% Please edit documentation in R/theme-elements.R, R/margins.R -\name{element} +% Please edit documentation in R/margins.R, R/theme-elements.R +\name{margin} +\alias{margin} +\alias{margin_part} +\alias{margin_auto} +\alias{element} \alias{element_blank} \alias{element_rect} \alias{element_line} @@ -9,11 +13,16 @@ \alias{element_point} \alias{element_geom} \alias{rel} -\alias{margin} -\alias{margin_part} -\alias{margin_auto} \title{Theme elements} \usage{ +margin(t = 0, r = 0, b = 0, l = 0, unit = "pt") + +margin_part(t = NA, r = NA, b = NA, l = NA, unit = "pt") + +margin_auto(t = 0, r = t, b = t, l = r, unit = "pt") + +element() + element_blank() element_rect( @@ -22,6 +31,7 @@ element_rect( linewidth = NULL, linetype = NULL, color = NULL, + linejoin = NULL, inherit.blank = FALSE, size = deprecated() ) @@ -32,6 +42,7 @@ element_line( linetype = NULL, lineend = NULL, color = NULL, + linejoin = NULL, arrow = NULL, arrow.fill = NULL, inherit.blank = FALSE, @@ -59,6 +70,7 @@ element_polygon( linewidth = NULL, linetype = NULL, color = NULL, + linejoin = NULL, inherit.blank = FALSE ) @@ -90,14 +102,13 @@ element_geom( ) rel(x) - -margin(t = 0, r = 0, b = 0, l = 0, unit = "pt") - -margin_part(t = NA, r = NA, b = NA, l = NA, unit = "pt") - -margin_auto(t = 0, r = t, b = t, l = r, unit = "pt") } \arguments{ +\item{t, r, b, l}{Dimensions of each margin. (To remember order, think trouble).} + +\item{unit}{Default units of dimensions. Defaults to "pt" so it +can be most easily scaled with the text.} + \item{fill}{Fill colour. \code{fill_alpha()} can be used to set the transparency of the fill.} @@ -111,6 +122,8 @@ integer (0:8), a name (blank, solid, dashed, dotted, dotdash, longdash, twodash), or a string with an even number (up to eight) of hexadecimal digits which give the lengths in consecutive positions in the string.} +\item{linejoin}{Line join style, one of \code{"round"}, \code{"mitre"} or \code{"bevel"}.} + \item{inherit.blank}{Should this element inherit the existence of an \code{element_blank} among its parents? If \code{TRUE} the existence of a blank element among its parents will cause this element to be blank as @@ -119,7 +132,7 @@ calculating final element state.} \item{size, fontsize, pointsize}{text size in pts, point size in mm.} -\item{lineend}{Line end Line end style (round, butt, square)} +\item{lineend}{Line end style, one of \code{"round"}, \code{"butt"} or \code{"square"}.} \item{arrow}{Arrow specification, as created by \code{\link[grid:arrow]{grid::arrow()}}} @@ -161,11 +174,6 @@ is anchored.} \item{accent}{Accent colour.} \item{x}{A single number specifying size relative to parent element.} - -\item{t, r, b, l}{Dimensions of each margin. (To remember order, think trouble).} - -\item{unit}{Default units of dimensions. Defaults to "pt" so it -can be most easily scaled with the text.} } \value{ An S3 object of class \code{element}, \code{rel}, or \code{margin}. diff --git a/man/get_theme.Rd b/man/get_theme.Rd index d3283d0e67..d8198c4197 100644 --- a/man/get_theme.Rd +++ b/man/get_theme.Rd @@ -120,5 +120,5 @@ rep_el$text } \seealso{ -\code{\link[=+.gg]{+.gg()}} +\code{\link[=add_gg]{add_gg()}} } diff --git a/man/gg-add.Rd b/man/gg-add.Rd index bd5e374caa..560f74de68 100644 --- a/man/gg-add.Rd +++ b/man/gg-add.Rd @@ -1,11 +1,11 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/plot-construction.R -\name{+.gg} -\alias{+.gg} +\name{add_gg} +\alias{add_gg} \alias{\%+\%} \title{Add components to a plot} \usage{ -\method{+}{gg}(e1, e2) +add_gg(e1, e2) e1 \%+\% e2 } diff --git a/man/ggplot_gtable.Rd b/man/gtable_ggplot.Rd similarity index 82% rename from man/ggplot_gtable.Rd rename to man/gtable_ggplot.Rd index 0d608a6622..67959e831b 100644 --- a/man/ggplot_gtable.Rd +++ b/man/gtable_ggplot.Rd @@ -1,10 +1,13 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/plot-build.R -\name{ggplot_gtable} +\name{gtable_ggplot} +\alias{gtable_ggplot} \alias{ggplot_gtable} \title{Build a plot with all the usual bits and pieces.} \usage{ -ggplot_gtable(data) +gtable_ggplot(data) + +ggplot_gtable(plot) } \arguments{ \item{data}{plot data generated by \code{\link[=ggplot_build]{ggplot_build()}}} @@ -19,6 +22,10 @@ This object is amenable to programmatic manipulation, should you want to (e.g.) make the legend box 2 cm wide, or combine multiple plots into a single display, preserving aspect ratios across the plots. } +\details{ +The \code{ggplot_gtable()} function is vestigial and the \code{gtable_ggplot()} function +should be used instead. +} \seealso{ \code{\link[=print.ggplot]{print.ggplot()}} and \code{\link[=benchplot]{benchplot()}} for for functions that contain the complete set of steps for generating diff --git a/man/is_tests.Rd b/man/is_tests.Rd index 140783b3f5..20b62e9ff7 100644 --- a/man/is_tests.Rd +++ b/man/is_tests.Rd @@ -1,7 +1,7 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/ggproto.R, R/aes.R, R/geom-.R, R/layer.R, -% R/coord-.R, R/facet-.R, R/stat-.R, R/theme-elements.R, R/guide-.R, -% R/guides-.R, R/margins.R, R/plot.R, R/position-.R, R/scale-.R, R/theme.R +% R/coord-.R, R/facet-.R, R/stat-.R, R/margins.R, R/theme-elements.R, +% R/guide-.R, R/guides-.R, R/plot.R, R/position-.R, R/scale-.R, R/theme.R \name{is_ggproto} \alias{is_ggproto} \alias{is.ggproto} @@ -13,10 +13,10 @@ \alias{is_facet} \alias{is.facet} \alias{is_stat} +\alias{is_margin} \alias{is_theme_element} \alias{is_guide} \alias{is_guides} -\alias{is_margin} \alias{is_tests} \alias{is_ggplot} \alias{is.ggplot} @@ -46,14 +46,14 @@ is.facet(x) # Deprecated is_stat(x) +is_margin(x) + is_theme_element(x, type = "any") is_guide(x) is_guides(x) -is_margin(x) - is_ggplot(x) is.ggplot(x) # Deprecated diff --git a/man/merge_element.Rd b/man/merge_element.Rd index ca993eeec3..3060360dc0 100644 --- a/man/merge_element.Rd +++ b/man/merge_element.Rd @@ -2,21 +2,9 @@ % Please edit documentation in R/theme.R \name{merge_element} \alias{merge_element} -\alias{merge_element.default} -\alias{merge_element.element_blank} -\alias{merge_element.element} -\alias{merge_element.margin} \title{Merge a parent element into a child element} \usage{ -merge_element(new, old) - -\method{merge_element}{default}(new, old) - -\method{merge_element}{element_blank}(new, old) - -\method{merge_element}{element}(new, old) - -\method{merge_element}{margin}(new, old) +merge_element(new, old, ...) } \arguments{ \item{new}{The child element in the theme hierarchy} diff --git a/man/print.ggplot.Rd b/man/print.ggplot.Rd index 1d558a3e9e..49b2b2dca7 100644 --- a/man/print.ggplot.Rd +++ b/man/print.ggplot.Rd @@ -2,12 +2,11 @@ % Please edit documentation in R/plot.R \name{print.ggplot} \alias{print.ggplot} -\alias{plot.ggplot} +\alias{print.ggplot2::ggplot} +\alias{plot.ggplot2::ggplot} \title{Explicitly draw plot} \usage{ -\method{print}{ggplot}(x, newpage = is.null(vp), vp = NULL, ...) - -\method{plot}{ggplot}(x, newpage = is.null(vp), vp = NULL, ...) +\method{print}{`ggplot2::ggplot`}(x, newpage = is.null(vp), vp = NULL, ...) } \arguments{ \item{x}{plot to display} diff --git a/man/register_theme_elements.Rd b/man/register_theme_elements.Rd index cdbbb25d70..0cb822e686 100644 --- a/man/register_theme_elements.Rd +++ b/man/register_theme_elements.Rd @@ -27,8 +27,8 @@ a list of named element definitions created with el_def().} \item{reset_current}{If \code{TRUE} (the default), the currently active theme is reset to the default theme.} -\item{class}{The name of the element class. Examples are "element_line" or -"element_text" or "unit", or one of the two reserved keywords "character" or +\item{class}{The name of the element class. Examples are \code{element_line} or +\code{element_text} or "unit", or one of the two reserved keywords "character" or "margin". The reserved keyword "character" implies a character or numeric vector, not a class called "character". The keyword "margin" implies a unit vector of length 4, as created by \code{\link[=margin]{margin()}}.} @@ -76,7 +76,7 @@ element inheritance relationships for the element tree. # plot panels. To do so, it registers a new theme element `ggxyz.panel.annotation` register_theme_elements( ggxyz.panel.annotation = element_text(color = "blue", hjust = 0.95, vjust = 0.05), - element_tree = list(ggxyz.panel.annotation = el_def("element_text", "text")) + element_tree = list(ggxyz.panel.annotation = el_def(element_text, "text")) ) # Now the package can define a new coord that includes a panel annotation diff --git a/man/summary.ggplot.Rd b/man/summary.ggplot.Rd deleted file mode 100644 index cf426610bc..0000000000 --- a/man/summary.ggplot.Rd +++ /dev/null @@ -1,22 +0,0 @@ -% Generated by roxygen2: do not edit by hand -% Please edit documentation in R/summary.R -\name{summary.ggplot} -\alias{summary.ggplot} -\title{Displays a useful description of a ggplot object} -\usage{ -\method{summary}{ggplot}(object, ...) -} -\arguments{ -\item{object}{ggplot2 object to summarise} - -\item{...}{other arguments ignored (for compatibility with generic)} -} -\description{ -Displays a useful description of a ggplot object -} -\examples{ -p <- ggplot(mtcars, aes(mpg, wt)) + - geom_point() -summary(p) -} -\keyword{internal} diff --git a/man/theme.Rd b/man/theme.Rd index 1a435c3ba4..c1a7213da7 100644 --- a/man/theme.Rd +++ b/man/theme.Rd @@ -534,7 +534,7 @@ p4 + aes(colour = drat) + } } \seealso{ -\code{\link[=+.gg]{+.gg()}} and \link{\%+replace\%}, +\code{\link[=add_gg]{add_gg()}} and \link{\%+replace\%}, \code{\link[=element_blank]{element_blank()}}, \code{\link[=element_line]{element_line()}}, \code{\link[=element_rect]{element_rect()}}, and \code{\link[=element_text]{element_text()}} for details of the specific theme elements. diff --git a/man/ggplot_add.Rd b/man/update_ggplot.Rd similarity index 62% rename from man/ggplot_add.Rd rename to man/update_ggplot.Rd index c71d6f863e..8f2e20c22b 100644 --- a/man/ggplot_add.Rd +++ b/man/update_ggplot.Rd @@ -1,30 +1,32 @@ % Generated by roxygen2: do not edit by hand % Please edit documentation in R/plot-construction.R -\name{ggplot_add} +\name{update_ggplot} +\alias{update_ggplot} \alias{ggplot_add} \title{Add custom objects to ggplot} \usage{ -ggplot_add(object, plot, object_name) +update_ggplot(object, plot, ...) + +ggplot_add(object, plot, ...) } \arguments{ \item{object}{An object to add to the plot} \item{plot}{The ggplot object to add \code{object} to} - -\item{object_name}{The name of the object to add} } \value{ A modified ggplot object } \description{ This generic allows you to add your own methods for adding custom objects to -a ggplot with \link{+.gg}. +a ggplot with \link[=add_gg]{+.gg}. The \code{ggplot_add()} function is vestigial and +the \code{update_ggplot()} function should be used instead. } \details{ -Custom methods for \code{ggplot_add()} are intended to update the \code{plot} variable +Custom methods for \code{update_ggplot()} are intended to update the \code{plot} variable using information from a custom \code{object}. This can become convenient when writing extensions that don't build on the pre-existing grammar like -layers, facets, coords and themes. The \code{ggplot_add()} function is never +layers, facets, coords and themes. The \code{update_ggplot()} function is never intended to be used directly, but it is triggered when an object is added to a plot via the \code{+} operator. Please note that the full \code{plot} object is exposed at this point, which comes with the responsibility of returning @@ -32,10 +34,11 @@ the plot intact. } \examples{ # making a new method for the generic -# in this example, we apply a text element to the text theme setting -ggplot_add.element_text <- function(object, plot, object_name) { - plot + theme(text = object) -} +# in this example, we enable adding text elements +S7::method(update_ggplot, list(element_text, class_ggplot)) <- + function(object, plot, ...) { + plot + theme(text = object) + } # we can now use `+` to add our object to a plot ggplot(mpg, aes(displ, cty)) + @@ -43,6 +46,5 @@ ggplot(mpg, aes(displ, cty)) + element_text(colour = "red") # clean-up -rm(ggplot_add.element_text) } \keyword{internal} diff --git a/revdep/README.md b/revdep/README.md index e69de29bb2..caa8380425 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -0,0 +1,677 @@ +# Revdeps + +## Failed to check (33) + +|package |version |error |warning |note | +|:--------------------|:-------|:------|:-------|:----| +|[bartMan](failures.md#bartman)|0.1.1 |__+1__ | | | +|bayesdfa |1.3.4 |1 | | | +|[bmstdr](failures.md#bmstdr)|0.8.2 |__+1__ | |-2 | +|[cocktailApp](failures.md#cocktailapp)|0.2.3 |__+1__ | |-1 | +|[coda.plot](failures.md#codaplot)|0.1.9 |__+1__ | | | +|ctsem |3.10.2 |1 | |1 | +|[deeptime](failures.md#deeptime)|2.1.0 |__+1__ | | | +|EcoEnsemble |1.1.2 |1 | | | +|fio |0.1.6 |1 | | | +|[GGally](failures.md#ggally)|2.2.1 |__+1__ | | | +|[ggmosaic](failures.md#ggmosaic)|0.3.3 |__+1__ | |-1 | +|[ggmulti](failures.md#ggmulti)|1.0.7 |__+1__ | | | +|ggRandomForests |2.2.1 |1 | | | +|[ggtern](failures.md#ggtern)|3.5.0 |__+1__ | |1 -1 | +|[inventorize](failures.md#inventorize)|1.1.2 |__+1__ | | | +|metabolic |? | | | | +|multinma |0.8.1 |1 | | | +|[MultiTraits](failures.md#multitraits)|0.5.0 |__+1__ | | | +|OpenMx |? | | | | +|[PieGlyph](failures.md#pieglyph)|1.0.0 |__+1__ | | | +|rmsb |1.1-2 |1 | | | +|rshift |3.1.2 |1 | | | +|RSP |0.4 |1 | | | +|rstanarm |2.32.1 |1 | | | +|[scplot](failures.md#scplot)|0.5.1 |__+1__ | | | +|StatTeacherAssistant |? | | | | +|streamDAG |? | | | | +|TestAnaAPP |1.1.2 |1 | | | +|[tidydr](failures.md#tidydr)|0.0.5 |__+1__ | | | +|[tricolore](failures.md#tricolore)|1.2.4 |__+1__ | |-1 | +|TriDimRegression |1.0.2 |1 | | | +|[webSDM](failures.md#websdm)|1.1-5 |__+1__ | | | +|[xpose](failures.md#xpose)|0.4.19 |__+1__ | | | + +## New problems (632) + +|package |version |error |warning |note | +|:----------------------|:---------|:---------|:--------|:------| +|[activAnalyzer](problems.md#activanalyzer)|2.1.2 |__+1__ | |1 | +|[actxps](problems.md#actxps)|1.6.0 |__+1__ | | | +|[adklakedata](problems.md#adklakedata)|0.6.1 |__+1__ | |1 | +|[adsoRptionCMF](problems.md#adsorptioncmf)|0.1.0 |__+1__ | | | +|[adw](problems.md#adw) |0.4.0 |__+2__ | | | +|[AeRobiology](problems.md#aerobiology)|2.0.1 |__+1__ | | | +|[afex](problems.md#afex)|1.4-1 |__+1__ | | | +|[AgroR](problems.md#agror)|1.3.6 |__+1__ | | | +|[AgroReg](problems.md#agroreg)|1.2.10 |__+1__ | | | +|[AgroTech](problems.md#agrotech)|1.0.2 |__+1__ | | | +|[airGR](problems.md#airgr)|1.7.6 |__+1__ | | | +|[AlleleShift](problems.md#alleleshift)|1.1-2 |__+1__ | | | +|[alookr](problems.md#alookr)|0.3.9 |__+1__ | | | +|[AnalysisLin](problems.md#analysislin)|0.1.2 |__+1__ | | | +|[andurinha](problems.md#andurinha)|0.0.2 |__+1__ | | | +|[animbook](problems.md#animbook)|1.0.0 |__+1__ | | | +|[ANN2](problems.md#ann2)|2.3.4 |__+1__ | |3 | +|[APackOfTheClones](problems.md#apackoftheclones)|1.2.4 |__+3__ |1 |1 | +|[APCtools](problems.md#apctools)|1.0.4 |__+3__ | | | +|[aplot](problems.md#aplot)|0.2.5 | |__+1__ | | +|[apm](problems.md#apm) |0.1.1 |__+2__ | | | +|[applicable](problems.md#applicable)|0.1.1 |__+1__ | | | +|[arena2r](problems.md#arena2r)|1.0.0 |__+1__ | |1 | +|[ARUtools](problems.md#arutools)|0.7.2 |__+3__ | | | +|[ASRgenomics](problems.md#asrgenomics)|1.1.4 |__+1__ | |1 | +|[assignPOP](problems.md#assignpop)|1.3.0 |__+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__ | | | +|[BAS](problems.md#bas) |1.7.5 |__+1__ | | | +|[BaseSet](problems.md#baseset)|1.0.0 |__+1__ | | | +|[BasketballAnalyzeR](problems.md#basketballanalyzer)|0.8.0 |__+1__ | |1 | +|[bayesAB](problems.md#bayesab)|1.1.3 |__+1__ | |1 | +|[bayesassurance](problems.md#bayesassurance)|0.1.0 |__+1__ | | | +|[BayesCVI](problems.md#bayescvi)|1.0.1 | |__+1__ | | +|[BayesERtools](problems.md#bayesertools)|0.2.1 |__+1__ | | | +|[BayesianFactorZoo](problems.md#bayesianfactorzoo)|0.0.0.3 |__+1__ | | | +|[BayesianReasoning](problems.md#bayesianreasoning)|0.4.2 |__+1__ | | | +|[BayesMallows](problems.md#bayesmallows)|2.2.3 |__+1__ | |1 | +|[BayesMultiMode](problems.md#bayesmultimode)|0.7.3 | |__+1__ |1 | +|[bayesplot](problems.md#bayesplot)|1.12.0 |__+1__ | |1 | +|[BCEA](problems.md#bcea)|2.4.7 |__+1__ | | | +|[bdsm](problems.md#bdsm)|0.2.1 |__+1__ |1 | | +|[BeeBDC](problems.md#beebdc)|1.2.1 |__+1__ | |1 | +|[benchr](problems.md#benchr)|0.2.5 |__+1__ | |2 | +|[BGGM](problems.md#bggm)|2.1.5 |__+2__ | |1 | +|[biclustermd](problems.md#biclustermd)|0.2.3 |__+1__ | |1 | +|[BIGL](problems.md#bigl)|1.9.3 |__+1__ | | | +|[biometryassist](problems.md#biometryassist)|1.2.2 |__+1__ | |2 | +|[BiVariAn](problems.md#bivarian)|1.0.1 |__+2__ | | | +|[blockCV](problems.md#blockcv)|3.1-5 |__+1__ | | | +|[bmgarch](problems.md#bmgarch)|2.0.0 |-1 | |__+3__ | +|[boxly](problems.md#boxly)|0.1.1 |__+1__ | | | +|[brolgar](problems.md#brolgar)|1.0.1 |__+2__ | | | +|[bullseye](problems.md#bullseye)|1.0.0 |__+2__ | | | +|[bvhar](problems.md#bvhar)|2.2.2 |__+1__ | |1 | +|[calibmsm](problems.md#calibmsm)|1.1.1 |__+1__ | | | +|[calmr](problems.md#calmr)|0.7.0 |__+1__ | | | +|[canvasXpress](problems.md#canvasxpress)|1.56.1 |__+1__ | | | +|[CARBayesST](problems.md#carbayesst)|4.0 |__+1__ |-1 |1 | +|[carbonr](problems.md#carbonr)|0.2.1 |__+1__ | |2 | +|[cartograflow](problems.md#cartograflow)|1.0.5 |__+1__ | | | +|[cartographr](problems.md#cartographr)|0.2.2 |__+1__ | |1 | +|[casebase](problems.md#casebase)|0.10.6 |__+2__ | | | +|[cats](problems.md#cats)|1.0.2 |__+1__ | |1 | +|[causact](problems.md#causact)|0.5.7 |__+1__ | | | +|[CausalImpact](problems.md#causalimpact)|1.3.0 |__+1__ | | | +|[centerline](problems.md#centerline)|0.2.2 |__+2__ | | | +|[Certara.Xpose.NLME](problems.md#certaraxposenlme)|2.0.2 |__+1__ | | | +|[cheem](problems.md#cheem)|0.4.0.0 |__+1__ | | | +|[ChemoSpec](problems.md#chemospec)|6.1.11 |__+1__ | | | +|[ChemoSpecUtils](problems.md#chemospecutils)|1.0.5 |__+1__ | | | +|[chillR](problems.md#chillr)|0.76 |__+1__ | | | +|[chronicle](problems.md#chronicle)|0.3 |__+2__ | |1 | +|[CINNA](problems.md#cinna)|1.2.2 |__+1__ | |1 | +|[circumplex](problems.md#circumplex)|1.0.0 |__+1__ | | | +|[classmap](problems.md#classmap)|1.2.4 | |__+1__ |1 | +|[clifro](problems.md#clifro)|3.2-5 |__+1__ | |1 | +|[climwin](problems.md#climwin)|1.2.3 |__+1__ | | | +|[clinDataReview](problems.md#clindatareview)|1.6.2 |__+3__ | |1 | +|[clinUtils](problems.md#clinutils)|0.2.0 |__+1__ | |1 | +|[clockSim](problems.md#clocksim)|0.1.2 | |__+1__ | | +|[clustcurv](problems.md#clustcurv)|2.0.2 |__+1__ | | | +|[clustrd](problems.md#clustrd)|1.4.0 |__+1__ | |1 | +|[clustTMB](problems.md#clusttmb)|0.1.0 |__+1__ | |1 | +|[cmcR](problems.md#cmcr)|0.1.11 |__+1__ | |1 | +|[cnmap](problems.md#cnmap)|0.1.0 |__+2__ | | | +|[CNVreg](problems.md#cnvreg)|1.0 |__+1__ | | | +|[coat](problems.md#coat)|0.2.0 |__+1__ | | | +|[CohortCharacteristics](problems.md#cohortcharacteristics)|1.0.0 |__+1__ | |2 | +|[CohortPlat](problems.md#cohortplat)|1.0.5 |__+2__ | | | +|[COINr](problems.md#coinr)|1.1.14 |__+2__ | | | +|[colorrepel](problems.md#colorrepel)|0.4.1 |__+1__ | | | +|[comparer](problems.md#comparer)|0.2.4 |__+1__ | |1 | +|[conquestr](problems.md#conquestr)|1.5.1 |__+1__ | | | +|[conserveR](problems.md#conserver)|1.0.4 |__+1__ | |2 | +|[constructive](problems.md#constructive)|1.1.0 |__+1__ | | | +|[contsurvplot](problems.md#contsurvplot)|0.2.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 | +|[CoSMoS](problems.md#cosmos)|2.1.0 |__+1__ | | | +|[countfitteR](problems.md#countfitter)|1.4 |__+1__ | |1 | +|[countries](problems.md#countries)|1.2.1 |__+1__ | |1 | +|[coveffectsplot](problems.md#coveffectsplot)|1.0.6 |__+1__ | | | +|[covidcast](problems.md#covidcast)|0.5.2 |__+2__ | |1 | +|[cowplot](problems.md#cowplot)|1.1.3 |__+1__ | | | +|[Coxmos](problems.md#coxmos)|1.1.3 |__+1__ | |1 | +|[crmPack](problems.md#crmpack)|1.0.6 |__+1__ |-1 | | +|[cry](problems.md#cry) |0.5.1 |__+2__ | |1 | +|[ctrialsgov](problems.md#ctrialsgov)|0.2.5 |__+1__ | |1 | +|[cubble](problems.md#cubble)|1.0.0 |__+1__ | |1 | +|[cutpointr](problems.md#cutpointr)|1.2.0 |__+1__ | | | +|[cvasi](problems.md#cvasi)|1.4.0 |__+1__ | | | +|[cvms](problems.md#cvms)|1.7.0 |__+1__ | | | +|[cylcop](problems.md#cylcop)|0.2.0 |__+1__ | |1 | +|[D2MCS](problems.md#d2mcs)|1.0.1 |__+1__ | | | +|[dabestr](problems.md#dabestr)|2025.3.14 |__+1__ | | | +|[daiquiri](problems.md#daiquiri)|1.1.1 |__+2__ | | | +|[DAISIEprep](problems.md#daisieprep)|1.0.0 |__+1__ | | | +|[daltoolbox](problems.md#daltoolbox)|1.2.707 | |__+1__ | | +|[dams](problems.md#dams)|0.3.0 |__+1__ | |1 | +|[dartR](problems.md#dartr)|2.9.9.5 |__+1__ | |2 | +|[Deducer](problems.md#deducer)|0.9-0 | |__+1__ | | +|[demodelr](problems.md#demodelr)|1.0.1 |__+1__ | | | +|[dendextend](problems.md#dendextend)|1.19.0 |__+1__ | |3 | +|[densityratio](problems.md#densityratio)|0.2.0 |__+1__ | |1 | +|[DescribeDisplay](problems.md#describedisplay)|0.2.11 |__+2__ | | | +|[DEXiR](problems.md#dexir)|1.0.2 |__+1__ | | | +|[diceR](problems.md#dicer)|3.0.0 |__+1__ | | | +|[DImodelsVis](problems.md#dimodelsvis)|1.0.1 |__+2__ | | | +|[directlabels](problems.md#directlabels)|2025.5.20 |__+1__ | | | +|[DiSCos](problems.md#discos)|0.1.1 |__+1__ | | | +|[discourseGT](problems.md#discoursegt)|1.2.0 |__+1__ | | | +|[distributions3](problems.md#distributions3)|0.2.2 |__+1__ | | | +|[dittoViz](problems.md#dittoviz)|1.0.3 |__+2__ | | | +|[dndR](problems.md#dndr)|3.0.0 |__+1__ | | | +|[dobin](problems.md#dobin)|1.0.4 |__+1__ | | | +|[donutsk](problems.md#donutsk)|0.1.1 |__+2__ | | | +|[dotsViolin](problems.md#dotsviolin)|0.0.1 |__+1__ | |1 | +|[dsld](problems.md#dsld)|0.2.2 |__+1__ | |1 | +|[duke](problems.md#duke)|0.0.3 |__+2__ | | | +|[easyalluvial](problems.md#easyalluvial)|0.3.2 |__+1__ | | | +|[easysurv](problems.md#easysurv)|2.0.1 |__+2__ | | | +|[ecocbo](problems.md#ecocbo)|0.12.0 |__+3__ | | | +|[ecochange](problems.md#ecochange)|2.9.3.3 |__+1__ | | | +|[EGAnet](problems.md#eganet)|2.3.0 |__+1__ | |1 | +|[EGM](problems.md#egm) |0.1.0 |__+1__ | | | +|[eks](problems.md#eks) |1.1.0 | |__+1__ | | +|[EMMIXmfa](problems.md#emmixmfa)|2.0.14 |__+1__ | | | +|[ENMTools](problems.md#enmtools)|1.1.2 |__+1__ | | | +|[epiCleanr](problems.md#epicleanr)|0.2.0 |__+1__ | |1 | +|[EpiForsk](problems.md#epiforsk)|0.1.1 |__+1__ | | | +|[epiphy](problems.md#epiphy)|0.5.0 |__+1__ | | | +|[epos](problems.md#epos)|1.1 |__+1__ | |2 | +|[EQUALSTATS](problems.md#equalstats)|0.5.0 |__+1__ | |1 | +|[equatiomatic](problems.md#equatiomatic)|0.3.6 |__+1__ | | | +|[errors](problems.md#errors)|0.4.3 |__+2__ | | | +|[eudract](problems.md#eudract)|1.0.4 |__+3__ | | | +|[eventstudyr](problems.md#eventstudyr)|1.1.3 |__+1__ | | | +|[EvoPhylo](problems.md#evophylo)|0.3.2 |__+2__ | |1 | +|[EWSmethods](problems.md#ewsmethods)|1.3.1 |__+2__ | | | +|[explainer](problems.md#explainer)|1.0.2 |__+1__ | |1 | +|[ez](problems.md#ez) |4.4-0 |__+1__ | |1 | +|[ezEDA](problems.md#ezeda)|0.1.1 |__+3__ | | | +|[EZFragility](problems.md#ezfragility)|1.0.3 |__+2__ | | | +|[ezplot](problems.md#ezplot)|0.7.13 |__+3__ | | | +|[fabletools](problems.md#fabletools)|0.5.0 |__+1__ | | | +|[fairmodels](problems.md#fairmodels)|1.2.1 |__+3__ | |1 | +|[fairness](problems.md#fairness)|1.2.2 | |__+1__ | | +|[faux](problems.md#faux)|1.2.2 |__+2__ | | | +|[fChange](problems.md#fchange)|2.0.0 |__+1__ | |1 | +|[feasts](problems.md#feasts)|0.4.1 |__+1__ | | | +|[fec16](problems.md#fec16)|0.1.4 |__+1__ | |1 | +|[fect](problems.md#fect)|1.0.0 |__+1__ | |3 | +|[fitbitViz](problems.md#fitbitviz)|1.0.6 |__+1__ | |1 | +|[flashlight](problems.md#flashlight)|0.9.0 |__+2__ | |1 | +|[flextable](problems.md#flextable)|0.9.9 |__+1__ | | | +|[flipr](problems.md#flipr)|0.3.3 |__+1__ | |1 | +|[fmeffects](problems.md#fmeffects)|0.1.4 |__+2__ | | | +|[fmf](problems.md#fmf) |1.1.1 | |__+1__ |1 | +|[foqat](problems.md#foqat)|2.0.8.2 |__+1__ | | | +|[forestly](problems.md#forestly)|0.1.2 |__+1__ | | | +|[forestPSD](problems.md#forestpsd)|1.0.0 |__+1__ | |1 | +|[formods](problems.md#formods)|0.2.0 |__+1__ | | | +|[FPDclustering](problems.md#fpdclustering)|2.3.5 |__+1__ | | | +|[fqar](problems.md#fqar)|0.5.4 |__+1__ | | | +|[frailtyEM](problems.md#frailtyem)|1.0.1 |__+1__ |1 |2 | +|[freqparcoord](problems.md#freqparcoord)|1.0.1 |__+1__ | | | +|[funcharts](problems.md#funcharts)|1.7.0 |__+2__ | |1 | +|[FunnelPlotR](problems.md#funnelplotr)|0.5.0 |__+3__ | | | +|[gapfill](problems.md#gapfill)|0.9.6-1 |__+1__ | |2 | +|[gapminder](problems.md#gapminder)|1.0.0 |__+1__ | | | +|[genekitr](problems.md#genekitr)|1.2.8 |__+1__ | | | +|[geneSLOPE](problems.md#geneslope)|0.38.2 | |__+1__ | | +|[geofacet](problems.md#geofacet)|0.2.1 | |__+1__ |1 | +|[geoheatmap](problems.md#geoheatmap)|0.1.0 |__+1__ | | | +|[geomtextpath](problems.md#geomtextpath)|0.1.5 |__+2__ | | | +|[gfoRmulaICE](problems.md#gformulaice)|0.1.0 |__+1__ | | | +|[gg.gap](problems.md#gggap)|1.3 |__+1__ | |1 | +|[gg1d](problems.md#gg1d)|0.1.0 |__+2__ | | | +|[ggalign](problems.md#ggalign)|1.0.2 |__+2__ |__+3__ |1 -1 | +|[gganimate](problems.md#gganimate)|1.0.9 |__+2__ |__+1__ | | +|[ggblend](problems.md#ggblend)|0.1.0 |__+1__ | | | +|[ggborderline](problems.md#ggborderline)|0.2.0 |__+1__ | | | +|[ggbrain](problems.md#ggbrain)|0.9.0 |__+1__ |__+1__ |1 | +|[ggbreak](problems.md#ggbreak)|0.1.4 |__+2__ |__+1__ | | +|[ggbump](problems.md#ggbump)|0.1.0 |__+1__ | |1 | +|[ggdark](problems.md#ggdark)|0.2.1 |__+2__ | |1 | +|[ggdemetra](problems.md#ggdemetra)|0.2.8 | |__+1__ | | +|[ggDoE](problems.md#ggdoe)|0.8 |__+1__ | | | +|[ggDoubleHeat](problems.md#ggdoubleheat)|0.1.2 |__+1__ | | | +|[ggeasy](problems.md#ggeasy)|0.1.5 |__+3__ |__+1__ | | +|[ggEDA](problems.md#ggeda)|0.1.0 |__+2__ | | | +|[ggedit](problems.md#ggedit)|0.4.1 |__+1__ | | | +|[ggfields](problems.md#ggfields)|0.0.6 |__+1__ | | | +|[ggFishPlots](problems.md#ggfishplots)|0.3.0 |__+1__ | | | +|[ggfixest](problems.md#ggfixest)|0.3.0 |__+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 | |__+1__ |1 | +|[ggfortify](problems.md#ggfortify)|0.4.17 |__+1__ | | | +|[ggfun](problems.md#ggfun)|0.1.8 | |__+1__ | | +|[ggfx](problems.md#ggfx)|1.0.1 | |__+1__ |1 | +|[gggap](problems.md#gggap)|1.0.1 |__+1__ | |1 | +|[gggenomes](problems.md#gggenomes)|1.0.1 |__+2__ | | | +|[ggghost](problems.md#ggghost)|0.2.2 |__+2__ | | | +|[gghalves](problems.md#gghalves)|0.1.4 |__+2__ | |1 | +|[gghighlight](problems.md#gghighlight)|0.4.1 |__+3__ |__+1__ | | +|[gghourglass](problems.md#gghourglass)|0.0.2 |__+2__ | | | +|[ggimage](problems.md#ggimage)|0.3.3 | |__+1__ | | +|[ggiraph](problems.md#ggiraph)|0.8.13 |__+2__ | |1 | +|[ggiraphExtra](problems.md#ggiraphextra)|0.3.0 |__+2__ | | | +|[gglogger](problems.md#gglogger)|0.1.5 |__+1__ | | | +|[ggmap](problems.md#ggmap)|4.0.1 | |__+1__ |1 | +|[ggmcmc](problems.md#ggmcmc)|1.5.1.1 |__+2__ |-1 | | +|[ggmice](problems.md#ggmice)|0.1.0 |__+1__ | | | +|[GGMncv](problems.md#ggmncv)|2.1.1 |__+1__ | |3 | +|[GGMnonreg](problems.md#ggmnonreg)|1.0.0 |__+1__ | |2 | +|[ggnewscale](problems.md#ggnewscale)|0.5.1 |__+1__ |__+1__ | | +|[ggpackets](problems.md#ggpackets)|0.2.1 |__+2__ |__+1__ | | +|[ggparallel](problems.md#ggparallel)|0.4.0 |__+1__ | | | +|[ggparty](problems.md#ggparty)|1.0.0 |__+3__ | |2 | +|[ggpath](problems.md#ggpath)|1.0.2 |__+2__ | | | +|[ggpedigree](problems.md#ggpedigree)|0.4.1 |__+3__ | |1 | +|[ggplot2.utils](problems.md#ggplot2utils)|0.3.2 |__+1__ | | | +|[ggPMX](problems.md#ggpmx)|1.2.11 |__+2__ | |2 | +|[ggpol](problems.md#ggpol)|0.0.7 |__+1__ | |2 | +|[ggprism](problems.md#ggprism)|1.0.6 |__+3__ | | | +|[ggpubr](problems.md#ggpubr)|0.6.0 |__+1__ | | | +|[ggquickeda](problems.md#ggquickeda)|0.3.1 |__+1__ | |1 | +|[ggraph](problems.md#ggraph)|2.2.1 |__+2__ |__+1__ |1 | +|[ggredist](problems.md#ggredist)|0.0.2 |__+1__ | | | +|[ggResidpanel](problems.md#ggresidpanel)|0.3.0 |__+3__ | | | +|[ggRtsy](problems.md#ggrtsy)|0.1.0 |__+2__ | |1 | +|[ggseas](problems.md#ggseas)|0.5.4 |__+1__ | | | +|[ggseqplot](problems.md#ggseqplot)|0.8.6 |__+3__ | | | +|[ggside](problems.md#ggside)|0.3.1 |__+3__ |__+2__ |__+1__ | +|[ggspatial](problems.md#ggspatial)|1.1.9 | |__+1__ | | +|[ggstatsplot](problems.md#ggstatsplot)|0.13.1 |__+1__ | | | +|[ggstream](problems.md#ggstream)|0.1.0 |__+1__ | |1 | +|[ggswissmaps](problems.md#ggswissmaps)|0.1.1 | |__+1__ |__+1__ | +|[ggtangle](problems.md#ggtangle)|0.0.6 |__+1__ |__+1__ | | +|[ggtext](problems.md#ggtext)|0.1.2 |__+1__ | | | +|[ggthemeUL](problems.md#ggthemeul)|0.1.3 |__+1__ | | | +|[ggtibble](problems.md#ggtibble)|1.0.1 |__+1__ | | | +|[ggVennDiagram](problems.md#ggvenndiagram)|1.5.2 |__+1__ | |1 | +|[ggview](problems.md#ggview)|0.2.1 | |__+1__ | | +|[GimmeMyPlot](problems.md#gimmemyplot)|0.1.0 |__+2__ | | | +|[gosset](problems.md#gosset)|1.4 |__+1__ | | | +|[grafify](problems.md#grafify)|5.0.0.1 |__+1__ | |2 | +|[graphPAF](problems.md#graphpaf)|2.0.0 |__+1__ | | | +|[gratia](problems.md#gratia)|0.10.0 |__+2__ | | | +|[Greymodels](problems.md#greymodels)|2.0.1 |__+1__ | | | +|[GRShiny](problems.md#grshiny)|1.0.0 |__+1__ | |1 | +|[grwat](problems.md#grwat)|0.0.4 |__+1__ | |1 | +|[gtExtras](problems.md#gtextras)|0.6.0 |__+1__ | | | +|[guideR](problems.md#guider)|0.4.0 |__+2__ | | | +|[handwriterRF](problems.md#handwriterrf)|1.1.1 |__+1__ | | | +|[harmony](problems.md#harmony)|1.2.3 |__+1__ | |1 | +|[hatchR](problems.md#hatchr)|0.3.2 |__+1__ | |1 | +|[healthyR](problems.md#healthyr)|0.2.2 |__+1__ | |1 | +|[healthyR.ai](problems.md#healthyrai)|0.1.1 |__+2__ | | | +|[healthyR.ts](problems.md#healthyrts)|0.3.1 |__+2__ | |1 | +|[heatmaply](problems.md#heatmaply)|1.5.0 |__+2__ | |2 | +|[hesim](problems.md#hesim)|0.5.5 |__+1__ | |1 | +|[hmer](problems.md#hmer)|1.6.0 |__+2__ | |1 | +|[hmsidwR](problems.md#hmsidwr)|1.1.2 |__+1__ | |2 | +|[hoopR](problems.md#hoopr)|2.1.0 | | |__+1__ | +|[hrbrthemes](problems.md#hrbrthemes)|0.8.7 |__+1__ | | | +|[hstats](problems.md#hstats)|1.2.1 |__+1__ | | | +|[HVT](problems.md#hvt) |25.2.3 |__+1__ | | | +|[hyperoverlap](problems.md#hyperoverlap)|1.1.1 | |__+1__ |1 | +|[hypervolume](problems.md#hypervolume)|3.1.5 | |__+1__ |1 | +|[hypsoLoop](problems.md#hypsoloop)|0.2.0 | |__+1__ | | +|[ibawds](problems.md#ibawds)|1.1.0 |__+1__ | |1 | +|[ichimoku](problems.md#ichimoku)|1.5.6 |__+1__ | | | +|[ICSClust](problems.md#icsclust)|0.1.0 |__+2__ | | | +|[ICtest](problems.md#ictest)|0.3-6 |__+2__ | |1 | +|[ImHD](problems.md#imhd)|0.1.0 | |__+1__ | | +|[implicitMeasures](problems.md#implicitmeasures)|0.2.1 |__+2__ | | | +|[imputeTS](problems.md#imputets)|3.3 |__+1__ |1 |1 | +|[imsig](problems.md#imsig)|1.1.3 |__+1__ | | | +|[incidence](problems.md#incidence)|1.7.5 |__+3__ | | | +|[infer](problems.md#infer)|1.0.8 |__+1__ |__+1__ | | +|[inferCSN](problems.md#infercsn)|1.1.7 |__+1__ | |1 | +|[inTextSummaryTable](problems.md#intextsummarytable)|3.3.3 |__+2__ | |1 | +|[iNZightTS](problems.md#inzightts)|2.0.0 |__+1__ | |1 | +|[ipsRdbs](problems.md#ipsrdbs)|1.0.0 |__+1__ | |1 | +|[IRon](problems.md#iron)|0.1.4 |__+1__ | |1 | +|[isoorbi](problems.md#isoorbi)|1.3.1 |__+1__ | |1 | +|[jskm](problems.md#jskm)|0.5.11 |__+1__ | | | +|[karel](problems.md#karel)|0.1.1 |__+2__ | |1 | +|[kDGLM](problems.md#kdglm)|1.2.7 |__+2__ | |1 | +|[khroma](problems.md#khroma)|1.16.0 |__+1__ | | | +|[lares](problems.md#lares)|5.2.13 |__+1__ | | | +|[latentcor](problems.md#latentcor)|2.0.1 |__+1__ | |1 | +|[latrend](problems.md#latrend)|1.6.1 |__+2__ | | | +|[lcars](problems.md#lcars)|0.4.0 |__+2__ | | | +|[legendry](problems.md#legendry)|0.2.2 | |__+3__ |__+2__ | +|[lemon](problems.md#lemon)|0.5.0 |__+3__ |__+1__ | | +|[lfproQC](problems.md#lfproqc)|1.4.0 |__+2__ | | | +|[lgpr](problems.md#lgpr)|1.2.4 |__+1__ | |3 | +|[lionfish](problems.md#lionfish)|1.0.27 |__+1__ | | | +|[listdown](problems.md#listdown)|0.5.7 |__+2__ | |2 | +|[LMD](problems.md#lmd) |1.0.0 |__+2__ | | | +|[lnmixsurv](problems.md#lnmixsurv)|3.1.6 |__+2__ | |4 | +|[longevity](problems.md#longevity)|1.2 |__+2__ | |1 | +|[LorenzRegression](problems.md#lorenzregression)|2.1.0 |__+1__ | | | +|[LSX](problems.md#lsx) |1.4.4 |__+1__ | |1 | +|[ltertools](problems.md#ltertools)|2.0.0 |__+1__ | | | +|[manydata](problems.md#manydata)|1.0.2 |__+1__ | | | +|[manymodelr](problems.md#manymodelr)|0.3.9 | |__+1__ | | +|[manynet](problems.md#manynet)|1.3.2 |__+2__ | |3 | +|[marquee](problems.md#marquee)|1.0.0 |__+1__ | |1 | +|[matsindf](problems.md#matsindf)|0.4.10 |__+1__ | | | +|[MaxWiK](problems.md#maxwik)|1.0.5 |__+1__ | | | +|[MBMethPred](problems.md#mbmethpred)|0.1.4.2 |__+1__ | |1 | +|[mcp](problems.md#mcp) |0.3.4 |__+2__ | | | +|[mcradds](problems.md#mcradds)|1.1.1 |__+3__ | | | +|[mcStats](problems.md#mcstats)|0.1.2 |__+1__ | |1 | +|[meme](problems.md#meme)|0.2.3 |__+1__ | | | +|[MendelianRandomization](problems.md#mendelianrandomization)|0.10.0 |__+1__ | |1 | +|[metagam](problems.md#metagam)|0.4.0 |__+1__ | | | +|[MetAlyzer](problems.md#metalyzer)|1.1.0 |__+1__ | | | +|[metan](problems.md#metan)|1.19.0 |__+1__ | | | +|[MetaNet](problems.md#metanet)|0.2.5 |__+1__ | | | +|[metanetwork](problems.md#metanetwork)|0.7.0 |__+2__ | | | +|[metaquant](problems.md#metaquant)|0.1.1 |__+1__ | | | +|[metR](problems.md#metr)|0.18.1 |__+3__ | |1 | +|[mgcViz](problems.md#mgcviz)|0.2.0 |__+2__ | | | +|[MIC](problems.md#mic) |1.1.0 |__+1__ | | | +|[microeco](problems.md#microeco)|1.15.0 |__+1__ | |1 | +|[migraph](problems.md#migraph)|1.4.5 |__+2__ | | | +|[mikropml](problems.md#mikropml)|1.6.1 |__+1__ | |1 | +|[MiMIR](problems.md#mimir)|1.5 |__+1__ | | | +|[miRetrieve](problems.md#miretrieve)|1.3.4 |__+1__ | | | +|[MiRNAQCD](problems.md#mirnaqcd)|1.1.3 |__+1__ | |1 | +|[MiscMetabar](problems.md#miscmetabar)|0.14.2 |__+3__ | |1 | +|[miscset](problems.md#miscset)|1.1.0 |__+1__ | | | +|[missingHE](problems.md#missinghe)|1.5.0 |__+2__ | |1 | +|[misspi](problems.md#misspi)|0.1.0 |__+1__ | | | +|[mistr](problems.md#mistr)|0.0.6 |__+1__ |-1 | | +|[mistral](problems.md#mistral)|2.2.2 | |__+1__ | | +|[misty](problems.md#misty)|0.7.2 |__+1__ | |1 | +|[MixLFA](problems.md#mixlfa)|1.0.0 |__+1__ | |1 | +|[mixpoissonreg](problems.md#mixpoissonreg)|1.0.0 |__+1__ | | | +|[mizer](problems.md#mizer)|2.5.3 |__+1__ | |1 | +|[MKpower](problems.md#mkpower)|1.0 |__+1__ | | | +|[mlergm](problems.md#mlergm)|0.8.1 |__+1__ | | | +|[mlr3spatiotempcv](problems.md#mlr3spatiotempcv)|2.3.2 |__+1__ | |1 | +|[mlr3viz](problems.md#mlr3viz)|0.10.1 |__+2__ | | | +|[mobr](problems.md#mobr)|3.0.0 |__+2__ | | | +|[modeldb](problems.md#modeldb)|0.3.0 |__+1__ | | | +|[modeltime.resample](problems.md#modeltimeresample)|0.2.3 |__+1__ | |1 | +|[Momocs](problems.md#momocs)|1.4.1 |__+1__ | | | +|[morseDR](problems.md#morsedr)|0.1.2 |__+1__ | | | +|[mpactr](problems.md#mpactr)|0.2.1 |__+2__ | |1 | +|[MRZero](problems.md#mrzero)|0.2.0 |__+1__ | | | +|[mshap](problems.md#mshap)|0.1.0 |__+1__ | |1 | +|[mtdesign](problems.md#mtdesign)|0.1.2 |__+1__ | | | +|[mulgar](problems.md#mulgar)|1.0.5 |__+1__ | | | +|[multilandr](problems.md#multilandr)|1.0.0 |__+1__ | | | +|[mvdalab](problems.md#mvdalab)|1.7 |__+1__ | | | +|[mverse](problems.md#mverse)|0.2.0 |__+1__ | |1 | +|[mvMAPIT](problems.md#mvmapit)|2.0.3 |__+1__ | |1 | +|[mxnorm](problems.md#mxnorm)|1.0.3 |__+1__ | |1 | +|[neatmaps](problems.md#neatmaps)|2.1.0 |__+1__ | |1 | +|[NeuralNetTools](problems.md#neuralnettools)|1.5.3 |__+2__ | | | +|[NHSRplotthedots](problems.md#nhsrplotthedots)|0.1.0 |__+1__ | |1 | +|[nichetools](problems.md#nichetools)|0.3.2 |__+1__ | | | +|[NiLeDAM](problems.md#niledam)|0.3 |__+1__ | | | +|[NIMAA](problems.md#nimaa)|0.2.1 |__+3__ | |2 | +|[nlmixr2plot](problems.md#nlmixr2plot)|3.0.1 |__+1__ | | | +|[nlmixr2rpt](problems.md#nlmixr2rpt)|0.2.0 |__+1__ | | | +|[noisemodel](problems.md#noisemodel)|1.0.2 |__+2__ | |1 | +|[nonmem2R](problems.md#nonmem2r)|0.2.5 |__+2__ | | | +|[normfluodbf](problems.md#normfluodbf)|2.0.0 |__+1__ | | | +|[NPflow](problems.md#npflow)|0.13.5 |__+1__ | |1 | +|[nzelect](problems.md#nzelect)|0.4.0 |__+1__ | |2 | +|[occCite](problems.md#occcite)|0.5.9 |__+1__ | |2 | +|[ofpetrial](problems.md#ofpetrial)|0.1.2 |__+1__ | | | +|[ogrdbstats](problems.md#ogrdbstats)|0.5.2 |__+2__ | | | +|[OmicNavigator](problems.md#omicnavigator)|1.15.0 |__+1__ |1 | | +|[opitools](problems.md#opitools)|1.8.0 |__+1__ | |1 | +|[ordinalsimr](problems.md#ordinalsimr)|0.2.1 |__+1__ | | | +|[ordr](problems.md#ordr)|0.1.1 |__+3__ | |2 | +|[OutliersO3](problems.md#outlierso3)|0.6.3 |__+2__ | | | +|[pacu](problems.md#pacu)|0.1.63 |__+1__ | |1 | +|[pafr](problems.md#pafr)|0.0.2 |__+1__ |__+1__ |1 | +|[palettes](problems.md#palettes)|0.2.1 |__+2__ | | | +|[panelView](problems.md#panelview)|1.1.18 |__+1__ | | | +|[ParamHelpers](problems.md#paramhelpers)|1.14.2 |__+1__ | | | +|[paramix](problems.md#paramix)|0.0.1 |__+1__ | | | +|[PAsso](problems.md#passo)|0.1.10 |__+1__ | |1 | +|[patchwork](problems.md#patchwork)|1.3.0 |__+2__ |__+1__ | | +|[Path.Analysis](problems.md#pathanalysis)|0.1 |__+1__ | |1 | +|[pathfindR](problems.md#pathfindr)|2.4.2 |__+1__ | | | +|[pathviewr](problems.md#pathviewr)|1.1.7 |__+1__ | | | +|[PatientLevelPrediction](problems.md#patientlevelprediction)|6.4.1 |__+1__ | | | +|[patientProfilesVis](problems.md#patientprofilesvis)|2.0.9 |1 __+1__ | |1 | +|[pcpr](problems.md#pcpr)|1.0.0 |__+1__ | | | +|[pcr](problems.md#pcr) |1.2.2 |__+1__ | | | +|[pdxTrees](problems.md#pdxtrees)|0.4.0 |__+1__ | |1 | +|[pedbp](problems.md#pedbp)|2.0.2 |__+1__ | |1 | +|[personalized](problems.md#personalized)|0.2.7 |__+1__ | |1 | +|[phylepic](problems.md#phylepic)|0.2.0 | |__+1__ | | +|[plantTracker](problems.md#planttracker)|1.1.0 |__+1__ | | | +|[Plasmidprofiler](problems.md#plasmidprofiler)|0.1.6 |__+1__ | | | +|[PLMIX](problems.md#plmix)|2.1.1 |__+1__ | |2 | +|[plotdap](problems.md#plotdap)|1.0.3 |__+2__ | | | +|[plotDK](problems.md#plotdk)|0.1.0 |__+1__ | |2 | +|[PlotFTIR](problems.md#plotftir)|1.2.0 |__+1__ | | | +|[plotly](problems.md#plotly)|4.10.4 |__+2__ | |1 | +|[plotor](problems.md#plotor)|0.6.0 |__+3__ | | | +|[plotROC](problems.md#plotroc)|2.3.1 |__+3__ | | | +|[plotthis](problems.md#plotthis)|0.7.0 |__+1__ | |1 | +|[pmartR](problems.md#pmartr)|2.5.0 |__+1__ | |1 | +|[pmxTools](problems.md#pmxtools)|1.3 |__+1__ | |2 | +|[pollster](problems.md#pollster)|0.1.6 |__+1__ | | | +|[poppr](problems.md#poppr)|2.9.6 |__+1__ |1 | | +|[PoweREST](problems.md#powerest)|0.1.0 |__+1__ | | | +|[PPforest](problems.md#ppforest)|0.1.3 |__+1__ | |2 | +|[PPQplan](problems.md#ppqplan)|1.1.0 |__+1__ | |2 | +|[ppseq](problems.md#ppseq)|0.2.5 |__+1__ | |1 | +|[PRECAST](problems.md#precast)|1.6.6 |__+1__ | |1 | +|[precintcon](problems.md#precintcon)|2.3.0 |__+1__ | | | +|[predint](problems.md#predint)|2.2.1 |__+1__ | | | +|[PredPsych](problems.md#predpsych)|0.4 | |__+1__ | | +|[predRupdate](problems.md#predrupdate)|0.2.0 |__+1__ | | | +|[probably](problems.md#probably)|1.1.0 |__+1__ | | | +|[processmapR](problems.md#processmapr)|0.5.6 |__+1__ | | | +|[psborrow](problems.md#psborrow)|0.2.2 |__+1__ |__+1__ | | +|[psc](problems.md#psc) |1.3.0 |__+1__ | | | +|[pscore](problems.md#pscore)|0.4.0 | |__+1__ | | +|[psyntur](problems.md#psyntur)|0.1.0 |__+1__ | | | +|[pubh](problems.md#pubh)|2.0.0 |__+1__ | | | +|[PvSTATEM](problems.md#pvstatem)|0.2.2 |__+2__ | | | +|[qad](problems.md#qad) |1.0.4 |__+1__ | |1 | +|[qdap](problems.md#qdap)|2.4.6 |__+1__ | |3 | +|[qgcompint](problems.md#qgcompint)|1.0.0 |__+1__ | | | +|[qicharts2](problems.md#qicharts2)|0.8.0 |__+1__ | | | +|[quantities](problems.md#quantities)|0.2.3 |__+1__ | | | +|[QuantNorm](problems.md#quantnorm)|1.0.5 |__+1__ | | | +|[quickPlot](problems.md#quickplot)|1.0.2 |__+2__ | |1 | +|[quickReg](problems.md#quickreg)|1.5.0 |__+1__ | |3 | +|[R4GoodPersonalFinances](problems.md#r4goodpersonalfinances)|1.0.0 |__+1__ | | | +|[r6qualitytools](problems.md#r6qualitytools)|1.0.1 |__+1__ | | | +|[radiant.model](problems.md#radiantmodel)|1.6.7 |__+1__ | | | +|[Radviz](problems.md#radviz)|0.9.4 |__+2__ | |1 | +|[RamanMP](problems.md#ramanmp)|1.0 |__+1__ | |1 | +|[randomForestExplainer](problems.md#randomforestexplainer)|0.10.1 |__+3__ | |1 | +|[rassta](problems.md#rassta)|1.0.6 |__+3__ | | | +|[rasterdiv](problems.md#rasterdiv)|0.3.6 |__+1__ | | | +|[rater](problems.md#rater)|1.3.1 |__+1__ | |3 | +|[ratlas](problems.md#ratlas)|0.1.0 |__+2__ | |1 | +|[rBiasCorrection](problems.md#rbiascorrection)|0.3.5 |__+2__ | | | +|[rbioacc](problems.md#rbioacc)|1.2.1 |__+1__ | |2 | +|[rbiom](problems.md#rbiom)|2.2.0 |-1 __+1__ | | | +|[reda](problems.md#reda)|0.5.4 |__+1__ | |3 | +|[regtomean](problems.md#regtomean)|1.2 | |__+1__ |1 | +|[rempsyc](problems.md#rempsyc)|0.1.9 |__+3__ | | | +|[reportRmd](problems.md#reportrmd)|0.1.1 |__+1__ | | | +|[ReturnCurves](problems.md#returncurves)|1.0.1 |__+2__ | | | +|[RevGadgets](problems.md#revgadgets)|1.2.1 |__+1__ | | | +|[ridgetorus](problems.md#ridgetorus)|1.0.2 |__+1__ | |1 | +|[rifreg](problems.md#rifreg)|0.1.0 |__+1__ | | | +|[RMixtComp](problems.md#rmixtcomp)|4.1.4 |__+1__ | | | +|[RMixtCompUtilities](problems.md#rmixtcomputilities)|4.1.6 |__+1__ | |1 | +|[rmweather](problems.md#rmweather)|0.2.62 |__+1__ | | | +|[RNAseqQC](problems.md#rnaseqqc)|0.2.1 |__+1__ | |1 | +|[roahd](problems.md#roahd)|1.4.3 |__+1__ | |2 | +|[robCompositions](problems.md#robcompositions)|2.4.1 |__+1__ |1 __+1__ |3 | +|[robustmatrix](problems.md#robustmatrix)|0.1.4 |__+1__ | | | +|[romic](problems.md#romic)|1.1.3 |__+1__ | |1 | +|[roptions](problems.md#roptions)|1.0.3 |__+1__ | |1 | +|[rPBK](problems.md#rpbk)|0.2.4 |__+1__ |1 |3 | +|[rrr](problems.md#rrr) |1.0.0 |__+2__ | |1 | +|[RSDA](problems.md#rsda)|3.2.4 | |__+1__ |1 | +|[RTIGER](problems.md#rtiger)|2.1.0 | |__+1__ | | +|[RtsEva](problems.md#rtseva)|1.0.0 |__+1__ | |1 | +|[RVA](problems.md#rva) |0.0.5 |__+1__ | |2 | +|[RVenn](problems.md#rvenn)|1.1.0 |__+1__ | |1 | +|[Rwtss](problems.md#rwtss)|0.9.2 |__+1__ | |1 | +|[rYWAASB](problems.md#rywaasb)|0.3 |__+1__ | |1 | +|[sageR](problems.md#sager)|0.6.1 |__+1__ | |1 | +|[saros](problems.md#saros)|1.5.4 |__+2__ | | | +|[scatterpie](problems.md#scatterpie)|0.2.4 | |__+1__ | | +|[scCustomize](problems.md#sccustomize)|3.0.1 |__+1__ | | | +|[scGate](problems.md#scgate)|1.7.0 |__+1__ |1 | | +|[schtools](problems.md#schtools)|0.4.1 |__+1__ | | | +|[scoringutils](problems.md#scoringutils)|2.1.0 |__+1__ | | | +|[SCpubr](problems.md#scpubr)|2.0.2 |__+1__ | | | +|[scRNAstat](problems.md#scrnastat)|0.1.1.1 |__+1__ |1 |1 | +|[scrutiny](problems.md#scrutiny)|0.5.0 |__+3__ | |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 | +|[seAMLess](problems.md#seamless)|0.1.1 |__+1__ | | | +|[sedproxy](problems.md#sedproxy)|0.7.5 |__+1__ | | | +|[see](problems.md#see) |0.11.0 |__+2__ | | | +|[seedreg](problems.md#seedreg)|1.0.3 |__+1__ | | | +|[SEI](problems.md#sei) |0.2.0 |__+2__ |-1 |1 | +|[seqHMM](problems.md#seqhmm)|2.0.0 |__+1__ |1 |1 | +|[SerolyzeR](problems.md#serolyzer)|1.2.0 |__+2__ | | | +|[Seurat](problems.md#seurat)|5.3.0 |__+1__ | |2 | +|[sglg](problems.md#sglg)|0.2.2 |__+1__ | | | +|[sgsR](problems.md#sgsr)|1.4.5 |__+1__ | | | +|[shadowtext](problems.md#shadowtext)|0.1.4 | |__+1__ | | +|[SHAPforxgboost](problems.md#shapforxgboost)|0.1.3 |__+2__ | | | +|[ShapleyOutlier](problems.md#shapleyoutlier)|0.1.2 |__+2__ | | | +|[shapviz](problems.md#shapviz)|0.9.7 |__+2__ | |1 | +|[shiny](problems.md#shiny)|1.10.0 |__+1__ | |1 | +|[shinyMixR](problems.md#shinymixr)|0.5.0 |__+2__ | | | +|[shinyMobile](problems.md#shinymobile)|2.0.1 |__+1__ | | | +|[simmr](problems.md#simmr)|0.5.1.217 |__+1__ | | | +|[SimNPH](problems.md#simnph)|0.5.7 |__+1__ | | | +|[simplecolors](problems.md#simplecolors)|0.1.2 |__+1__ | | | +|[sjPlot](problems.md#sjplot)|2.8.17 |__+1__ | | | +|[smallsets](problems.md#smallsets)|2.0.0 |__+3__ | |1 | +|[SmartEDA](problems.md#smarteda)|0.3.10 |__+2__ | |2 | +|[smer](problems.md#smer)|0.0.1 |__+1__ | |2 | +|[SOMbrero](problems.md#sombrero)|1.4-2 |__+1__ | | | +|[SoupX](problems.md#soupx)|1.6.2 |__+1__ | |1 | +|[spacejamr](problems.md#spacejamr)|0.2.1 |__+1__ | | | +|[spatialwarnings](problems.md#spatialwarnings)|3.1.0 |__+1__ | |1 | +|[spectralR](problems.md#spectralr)|0.1.3 |__+1__ | | | +|[spinifex](problems.md#spinifex)|0.3.8 |__+1__ | | | +|[sport](problems.md#sport)|0.2.1 |__+1__ | |1 | +|[sportyR](problems.md#sportyr)|2.2.2 |__+1__ | | | +|[SPUTNIK](problems.md#sputnik)|1.4.2 | |__+1__ | | +|[SqueakR](problems.md#squeakr)|1.3.0 |__+1__ | |1 | +|[ssd4mosaic](problems.md#ssd4mosaic)|1.0.3 |__+1__ | |1 | +|[sssc](problems.md#sssc)|1.0.0 | |__+1__ | | +|[starvz](problems.md#starvz)|0.8.2 |__+1__ | |1 | +|[states](problems.md#states)|0.3.2 |__+1__ | | | +|[statgenGWAS](problems.md#statgengwas)|1.0.11 |__+1__ | |1 | +|[statgenGxE](problems.md#statgengxe)|1.0.9 |__+1__ | |1 | +|[statgenHTP](problems.md#statgenhtp)|1.0.8 |__+2__ | |2 | +|[statgenIBD](problems.md#statgenibd)|1.0.8 |__+1__ | |2 | +|[statgenSTA](problems.md#statgensta)|1.0.14 |__+2__ | |2 | +|[statVisual](problems.md#statvisual)|1.2.1 |__+2__ | |1 | +|[StratifiedMedicine](problems.md#stratifiedmedicine)|1.0.5 |__+1__ | |1 | +|[stRoke](problems.md#stroke)|24.10.1 |__+1__ | |1 | +|[Superpower](problems.md#superpower)|0.2.3 |__+1__ | | | +|[surveyexplorer](problems.md#surveyexplorer)|0.2.0 |__+1__ | | | +|[survHE](problems.md#survhe)|2.0.4 |__+1__ | | | +|[survstan](problems.md#survstan)|0.0.7.1 |__+1__ | |3 | +|[symptomcheckR](problems.md#symptomcheckr)|0.1.3 |__+1__ | | | +|[synthpop](problems.md#synthpop)|1.9-1.1 |__+1__ |1 | | +|[tabledown](problems.md#tabledown)|1.0.0 |__+1__ | |1 | +|[tastypie](problems.md#tastypie)|0.1.1 |__+1__ | | | +|[TcGSA](problems.md#tcgsa)|0.12.10 | |__+1__ | | +|[TCIU](problems.md#tciu)|1.2.7 |__+2__ | |1 | +|[teal.widgets](problems.md#tealwidgets)|0.4.3 |__+1__ | | | +|[telraamStats](problems.md#telraamstats)|1.1.2 |__+2__ | |1 | +|[TestGardener](problems.md#testgardener)|3.3.5 |__+1__ | | | +|[thematic](problems.md#thematic)|0.1.6 |__+2__ | | | +|[tidycat](problems.md#tidycat)|0.1.2 |__+2__ | |1 | +|[tidyCDISC](problems.md#tidycdisc)|0.2.1 |__+1__ | |1 | +|[tidycomm](problems.md#tidycomm)|0.4.1 |__+2__ | | | +|[tidyEdSurvey](problems.md#tidyedsurvey)|0.1.3 |__+1__ | | | +|[tidyfit](problems.md#tidyfit)|0.7.4 |__+1__ | | | +|[tidypaleo](problems.md#tidypaleo)|0.1.3 | |__+1__ | | +|[tidyposterior](problems.md#tidyposterior)|1.0.1 |__+1__ | | | +|[tidysdm](problems.md#tidysdm)|1.0.0 |__+2__ | | | +|[timetk](problems.md#timetk)|2.9.0 |__+1__ | |1 | +|[tinyarray](problems.md#tinyarray)|2.4.3 |__+1__ | | | +|[tip](problems.md#tip) |0.1.0 |__+2__ | |1 | +|[tmt](problems.md#tmt) |0.3.4-0 |__+1__ | |1 | +|[TPMplt](problems.md#tpmplt)|0.1.6 | |__+1__ | | +|[track2KBA](problems.md#track2kba)|1.1.2 |__+1__ | | | +|[tradeoffaucdim](problems.md#tradeoffaucdim)|0.1.0 |__+1__ | |1 | +|[trajmsm](problems.md#trajmsm)|0.1.3 | |__+1__ | | +|[TransProR](problems.md#transpror)|1.0.3 |__+1__ | | | +|[treeheatr](problems.md#treeheatr)|0.2.1 |__+2__ | | | +|[trelliscopejs](problems.md#trelliscopejs)|0.2.6 |__+1__ |__+1__ | | +|[triplot](problems.md#triplot)|1.3.0 |__+2__ | |1 | +|[triptych](problems.md#triptych)|0.1.3 |__+1__ | | | +|[tsfeatures](problems.md#tsfeatures)|1.1.1 |__+1__ | | | +|[tsgc](problems.md#tsgc)|0.0 |__+1__ | | | +|[tsnet](problems.md#tsnet)|0.1.0 |__+1__ | |2 | +|[ufs](problems.md#ufs) |0.5.12 |__+1__ | | | +|[ulrb](problems.md#ulrb)|0.1.6 |__+1__ | | | +|[umiAnalyzer](problems.md#umianalyzer)|1.0.0 |__+1__ | | | +|[UnalR](problems.md#unalr)|1.0.0 |__+1__ | |2 | +|[ushr](problems.md#ushr)|0.2.3 |__+1__ | | | +|[usmap](problems.md#usmap)|0.8.0 |__+3__ | |1 | +|[utile.visuals](problems.md#utilevisuals)|0.3.3 |__+1__ | | | +|[vaccine](problems.md#vaccine)|1.3.0 |__+1__ | | | +|[vaccineff](problems.md#vaccineff)|1.0.0 |__+1__ | | | +|[valr](problems.md#valr)|0.8.3 |__+1__ | |1 | +|[vanquish](problems.md#vanquish)|1.0.0 | |__+1__ | | +|[VarSelLCM](problems.md#varsellcm)|2.1.3.1 |__+1__ | |1 | +|[vDiveR](problems.md#vdiver)|2.0.1 |__+1__ | |1 | +|[vip](problems.md#vip) |0.4.1 |__+1__ | |2 | +|[ViSiElse](problems.md#visielse)|1.2.2 |__+1__ | |2 | +|[visualpred](problems.md#visualpred)|0.1.1 | |__+1__ | | +|[vivaldi](problems.md#vivaldi)|1.0.1 |__+3__ | |1 | +|[vivid](problems.md#vivid)|0.2.9 |__+1__ | | | +|[voluModel](problems.md#volumodel)|0.2.2 |__+3__ | | | +|[vvshiny](problems.md#vvshiny)|0.1.1 |__+1__ | | | +|[washi](problems.md#washi)|0.2.0 |__+1__ | | | +|[wilson](problems.md#wilson)|2.4.2 |__+1__ | | | +|[windfarmGA](problems.md#windfarmga)|4.0.0 |__+1__ | | | +|[wql](problems.md#wql) |1.0.2 |__+2__ | | | +|[WRS2](problems.md#wrs2)|1.1-7 |__+1__ |-1 | | +|[WRTDStidal](problems.md#wrtdstidal)|1.1.4 |__+2__ | |1 | +|[xaringanthemer](problems.md#xaringanthemer)|0.4.3 |__+1__ | | | +|[xpose.xtras](problems.md#xposextras)|0.0.2 |__+3__ | |2 | +|[yamlet](problems.md#yamlet)|1.2.1 | |1 __+1__ | | +|[ZetaSuite](problems.md#zetasuite)|1.0.1 | |__+1__ |1 | + diff --git a/revdep/cran.md b/revdep/cran.md index d521f55150..0d99fc64f6 100644 --- a/revdep/cran.md +++ b/revdep/cran.md @@ -1,81 +1,100 @@ ## revdepcheck results -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 checked 5739 reverse dependencies (5737 from CRAN + 2 from Bioconductor), comparing R CMD check results across CRAN and dev versions of this package. - * We saw 347 new problems - * We failed to check 179 packages + * We saw 632 new problems + * We failed to check 31 packages Issues with CRAN packages are summarised below. ### New problems (This reports the first line of each new failure) -* ABHgenotypeR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* activAnalyzer + checking re-building of vignette outputs ... ERROR * actxps - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR * adklakedata checking examples ... ERROR -* adobeanalyticsr - checking whether package ‘adobeanalyticsr’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* adsoRptionCMF + checking examples ... ERROR * adw checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR * AeRobiology - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR -* agricolaeplotr - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* afex + checking re-building of vignette outputs ... ERROR + +* AgroR + checking examples ... ERROR + +* AgroReg + checking examples ... ERROR + +* AgroTech + checking examples ... ERROR + +* airGR + checking re-building of vignette outputs ... ERROR -* agridat +* AlleleShift + checking examples ... ERROR + +* alookr checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE * AnalysisLin checking examples ... ERROR +* andurinha + checking tests ... ERROR + * animbook checking examples ... ERROR * ANN2 checking tests ... ERROR -* APCI +* APackOfTheClones + checking examples ... ERROR checking tests ... ERROR + checking re-building of vignette outputs ... ERROR * APCtools checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* aplot + checking S3 generic/method consistency ... WARNING + +* apm + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR * applicable checking tests ... ERROR -* ARPALData +* arena2r + checking tests ... ERROR + +* ARUtools checking examples ... ERROR - checking whether package ‘ARPALData’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR -* arulesViz - checking whether package ‘arulesViz’ can be installed ... WARNING +* ASRgenomics + checking tests ... ERROR -* asremlPlus - checking whether package ‘asremlPlus’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* assignPOP + checking tests ... ERROR * autocogs checking tests ... ERROR @@ -84,34 +103,33 @@ Issues with CRAN packages are summarised below. checking examples ... ERROR checking tests ... ERROR -* autoTS - checking re-building of vignette outputs ... NOTE +* autoReg + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* BAS + checking re-building of vignette outputs ... ERROR + +* BaseSet + checking re-building of vignette outputs ... ERROR -* backShift +* BasketballAnalyzeR checking examples ... 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 * 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 +* bayesassurance + checking tests ... ERROR -* BayesGrowth - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* BayesCVI + checking whether package ‘BayesCVI’ can be installed ... WARNING -* BayesianMCPMod - checking examples ... ERROR +* BayesERtools checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + +* BayesianFactorZoo + checking examples ... ERROR * BayesianReasoning checking tests ... ERROR @@ -119,146 +137,197 @@ Issues with CRAN packages are summarised below. * BayesMallows checking tests ... ERROR +* BayesMultiMode + checking whether package ‘BayesMultiMode’ can be installed ... WARNING + * bayesplot checking tests ... ERROR * BCEA checking examples ... ERROR + +* bdsm checking tests ... ERROR - 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 +* BeeBDC + checking tests ... ERROR -* beastt - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* benchr + checking tests ... ERROR -* biclust +* BGGM checking examples ... ERROR - checking whether package ‘biclust’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking re-building of vignette outputs ... ERROR * biclustermd checking tests ... ERROR -* biodosetools +* BIGL + checking re-building of vignette outputs ... ERROR + +* biometryassist + checking tests ... ERROR + +* BiVariAn + checking examples ... ERROR + checking tests ... ERROR + +* blockCV checking tests ... ERROR +* bmgarch + checking installed package size ... NOTE + checking Rd files ... NOTE + checking for GNU extensions in Makefiles ... NOTE + * boxly checking tests ... ERROR * brolgar checking examples ... ERROR + checking re-building of vignette outputs ... ERROR -* cartograflow +* bullseye checking examples ... ERROR + checking re-building of vignette outputs ... ERROR -* cats - checking examples ... ERROR +* bvhar + checking re-building of vignette outputs ... ERROR -* CausalImpact - checking examples ... ERROR +* calibmsm + checking tests ... ERROR + +* calmr 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 -* celltrackR - checking re-building of vignette outputs ... NOTE +* canvasXpress + checking tests ... ERROR -* cellularautomata - checking running R code from vignettes ... ERROR +* CARBayesST + checking re-building of vignette outputs ... ERROR -* CensMFM - checking whether package ‘CensMFM’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* carbonr + checking tests ... ERROR -* CFO +* cartograflow checking examples ... ERROR - checking whether package ‘CFO’ can be installed ... WARNING - checking R code for possible problems ... NOTE -* changepoint.geo +* cartographr + checking tests ... ERROR + +* casebase + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* cats + checking examples ... ERROR + +* causact + checking tests ... ERROR + +* CausalImpact + checking tests ... ERROR + +* centerline + checking examples ... ERROR checking tests ... ERROR +* Certara.Xpose.NLME + checking examples ... ERROR + * cheem checking tests ... ERROR +* ChemoSpec + checking re-building of vignette outputs ... ERROR + +* ChemoSpecUtils + checking examples ... 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 + checking re-building of vignette outputs ... ERROR -* cjoint - checking examples ... ERROR +* CINNA + checking re-building of vignette outputs ... ERROR + +* circumplex 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 +* classmap + checking whether package ‘classmap’ can be installed ... WARNING -* clinDataReview - checking examples ... ERROR +* clifro + checking tests ... ERROR + +* climwin checking tests ... ERROR - checking re-building of vignette outputs ... NOTE -* clinDR +* clinDataReview checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR * clinUtils - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* clockSim + checking whether package ‘clockSim’ can be installed ... WARNING -* CLONETv2 - checking whether package ‘CLONETv2’ can be installed ... WARNING +* clustcurv + checking re-building of vignette outputs ... ERROR -* ClusROC +* clustrd checking examples ... ERROR - checking tests ... ERROR - checking whether package ‘ClusROC’ can be installed ... WARNING - checking R code for possible problems ... NOTE -* clustcurv - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* clustTMB + checking re-building of vignette outputs ... ERROR -* clustMD - checking whether package ‘clustMD’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* cmcR + checking tests ... ERROR * cnmap checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* CNVreg + checking re-building of vignette outputs ... ERROR -* codaredistlm +* coat checking examples ... ERROR -* codez - checking whether package ‘codez’ can be installed ... WARNING +* CohortCharacteristics + checking re-building of vignette outputs ... ERROR * CohortPlat checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* COINr + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR * colorrepel checking examples ... ERROR +* comparer + checking tests ... ERROR + +* conquestr + checking tests ... ERROR + +* conserveR + checking examples ... ERROR + +* constructive + checking tests ... ERROR + +* contsurvplot + checking tests ... ERROR + * CoreMicrobiomeR checking examples ... ERROR @@ -267,276 +336,368 @@ Issues with CRAN packages are summarised below. * corrViz checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR * CoSMoS - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR * countfitteR checking tests ... ERROR +* countries + checking tests ... ERROR + +* coveffectsplot + checking re-building of vignette outputs ... ERROR + * covidcast checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* cowplot + checking tests ... ERROR -* creditmodel +* Coxmos checking examples ... ERROR - 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 -* cricketr - checking whether package ‘cricketr’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* crmPack + checking re-building of vignette outputs ... ERROR -* crosshap +* cry checking examples ... ERROR - -* CRTgeeDR - checking whether package ‘CRTgeeDR’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking re-building of vignette outputs ... ERROR * ctrialsgov checking tests ... ERROR * cubble - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR -* DAISIE +* cutpointr + checking tests ... ERROR + +* cvasi + checking re-building of vignette outputs ... ERROR + +* cvms + checking tests ... ERROR + +* cylcop checking examples ... ERROR +* D2MCS + checking tests ... ERROR + +* dabestr + checking tests ... ERROR + +* daiquiri + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + * DAISIEprep checking tests ... ERROR * daltoolbox - checking examples ... ERROR checking whether package ‘daltoolbox’ can be installed ... WARNING - checking R code for possible problems ... NOTE -* dawaR - checking examples ... ERROR +* dams + checking re-building of vignette outputs ... ERROR -* DDPNA +* dartR 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 +* demodelr checking examples ... ERROR + +* dendextend checking tests ... ERROR -* desplot - checking examples ... ERROR +* densityratio 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 -* diceR +* DescribeDisplay checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* directlabels +* DEXiR checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* distributional - checking examples ... ERROR +* diceR + checking tests ... ERROR -* dittoViz +* DImodelsVis checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* directlabels + checking re-building of vignette outputs ... ERROR + +* DiSCos checking tests ... ERROR -* divent +* discourseGT 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 +* distributions3 + checking tests ... ERROR -* DoseFinding +* dittoViz 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 +* dndR + checking tests ... ERROR + +* dobin + checking re-building of vignette outputs ... ERROR -* dr4pl +* donutsk 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 + checking re-building of vignette outputs ... ERROR -* DRomics +* dotsViolin 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 -* drpop - checking whether package ‘drpop’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* dsld + checking examples ... ERROR * duke checking tests ... ERROR + checking re-building of vignette outputs ... 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 +* easyalluvial + checking tests ... ERROR * easysurv checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* ecocbo + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* ecochange + checking examples ... ERROR + +* EGAnet + checking examples ... ERROR * EGM checking tests ... ERROR -* entropart +* eks + checking S3 generic/method consistency ... WARNING + +* EMMIXmfa checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + +* ENMTools + checking tests ... ERROR * epiCleanr checking examples ... ERROR +* EpiForsk + checking re-building of vignette outputs ... ERROR + * epiphy checking examples ... ERROR +* epos + checking tests ... ERROR + * EQUALSTATS checking examples ... ERROR -* esci +* equatiomatic + checking re-building of vignette outputs ... ERROR + +* errors checking examples ... ERROR - checking tests ... ERROR + checking re-building of vignette outputs ... ERROR -* evalITR - checking re-building of vignette outputs ... NOTE +* eudract + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR * eventstudyr checking tests ... ERROR -* expirest +* EvoPhylo + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* EWSmethods checking tests ... ERROR + checking re-building of vignette outputs ... ERROR * explainer checking examples ... ERROR +* ez + checking examples ... ERROR + * ezEDA + checking examples ... ERROR checking tests ... ERROR + checking re-building of vignette outputs ... ERROR -* fable.prophet - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* EZFragility + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR -* fabletools +* ezplot checking examples ... ERROR checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* fabletools + checking tests ... ERROR * fairmodels + checking examples ... ERROR checking tests ... ERROR + checking re-building of vignette outputs ... ERROR -* FCPS - checking examples ... ERROR - checking whether package ‘FCPS’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* fairness + checking whether package ‘fairness’ can be installed ... WARNING -* fdANOVA +* faux checking examples ... ERROR + checking tests ... ERROR -* fddm - checking running R code from vignettes ... ERROR +* fChange + checking tests ... ERROR * feasts checking tests ... ERROR -* ffp - checking examples ... ERROR +* fec16 + checking re-building of vignette outputs ... ERROR -* fido +* fect checking examples ... ERROR - checking tests ... ERROR -* FielDHub - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* fitbitViz + checking tests ... ERROR -* figuRes2 +* flashlight checking examples ... ERROR - checking running R code from vignettes ... ERROR + checking re-building of vignette outputs ... ERROR -* flexsurv - checking tests ... ERROR - checking running R code from vignettes ... ERROR +* flextable + checking examples ... ERROR * flipr - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR -* forestmodel +* fmeffects checking examples ... ERROR - checking whether package ‘forestmodel’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking re-building of vignette outputs ... ERROR + +* fmf + checking whether package ‘fmf’ can be installed ... WARNING + +* foqat + checking re-building of vignette outputs ... ERROR + +* forestly + checking re-building of vignette outputs ... ERROR + +* forestPSD + checking examples ... ERROR + +* formods + checking tests ... ERROR + +* FPDclustering + checking examples ... ERROR + +* fqar + checking tests ... ERROR * frailtyEM checking examples ... ERROR -* gapmap +* freqparcoord checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + +* funcharts + checking examples ... ERROR + checking tests ... ERROR + +* FunnelPlotR + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* gapfill + checking tests ... ERROR * gapminder checking examples ... ERROR -* GEInter - checking whether package ‘GEInter’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* genekitr + checking examples ... ERROR + +* geneSLOPE + checking whether package ‘geneSLOPE’ can be installed ... WARNING + +* geofacet + checking S3 generic/method consistency ... WARNING * geoheatmap - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR * geomtextpath checking examples ... ERROR checking tests ... ERROR +* gfoRmulaICE + checking tests ... ERROR + +* gg.gap + checking examples ... ERROR + +* gg1d + checking examples ... ERROR + checking tests ... ERROR + * ggalign + checking examples ... ERROR + checking tests ... ERROR + checking S3 generic/method consistency ... WARNING + checking Rd cross-references ... WARNING checking for code/documentation mismatches ... WARNING -* GGally +* gganimate checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + checking S3 generic/method consistency ... WARNING -* gganimate +* ggblend checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* ggblanket +* ggborderline + checking examples ... ERROR + +* ggbrain + checking re-building of vignette outputs ... ERROR + checking S3 generic/method consistency ... WARNING + +* ggbreak checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + checking S3 generic/method consistency ... WARNING + +* ggbump + checking tests ... ERROR * ggdark checking examples ... ERROR @@ -545,20 +706,38 @@ Issues with CRAN packages are summarised below. * ggdemetra checking whether package ‘ggdemetra’ can be installed ... WARNING -* ggdist +* ggDoE + checking examples ... ERROR + +* ggDoubleHeat + checking examples ... ERROR + +* ggeasy + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + checking S3 generic/method consistency ... WARNING + +* ggEDA checking examples ... ERROR checking tests ... ERROR - checking re-building of vignette outputs ... NOTE * ggedit checking examples ... ERROR -* ggESDA +* ggfields + checking examples ... ERROR + +* ggFishPlots checking examples ... ERROR * ggfixest checking tests ... ERROR +* ggfocus + checking examples ... ERROR + checking S3 generic/method consistency ... WARNING + * ggforce checking examples ... ERROR @@ -568,199 +747,324 @@ Issues with CRAN packages are summarised below. * ggfortify checking tests ... ERROR -* ggh4x +* ggfun + checking S3 generic/method consistency ... WARNING + +* ggfx + checking S3 generic/method consistency ... WARNING + +* gggap + checking examples ... ERROR + +* gggenomes + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* ggghost checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + +* gghalves + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR * gghighlight checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + checking S3 generic/method consistency ... WARNING + +* gghourglass + checking examples ... ERROR + checking tests ... ERROR + +* ggimage + checking S3 generic/method consistency ... WARNING * ggiraph checking examples ... ERROR checking tests ... ERROR +* ggiraphExtra + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* gglogger + checking tests ... ERROR + * ggmap checking whether package ‘ggmap’ can be installed ... WARNING * ggmcmc checking examples ... ERROR + checking re-building of vignette outputs ... ERROR * ggmice - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* GGMncv + checking re-building of vignette outputs ... ERROR -* ggmulti +* GGMnonreg checking examples ... ERROR + +* ggnewscale checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking S3 generic/method consistency ... WARNING + +* ggpackets + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + checking S3 generic/method consistency ... WARNING * ggparallel checking tests ... ERROR -* ggplotlyExtra +* ggparty + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* ggpath + checking examples ... ERROR + checking tests ... ERROR + +* ggpedigree checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* ggplot2.utils + checking tests ... ERROR + +* ggPMX + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR * ggpol checking examples ... ERROR +* ggprism + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + * ggpubr checking tests ... ERROR +* ggquickeda + checking examples ... ERROR + * ggraph checking examples ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + checking S3 generic/method consistency ... WARNING * ggredist checking examples ... ERROR +* ggResidpanel + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + * ggRtsy checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* ggseas + checking tests ... ERROR * ggseqplot checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR * ggside checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking whether package ‘ggside’ can be installed ... WARNING + checking re-building of vignette outputs ... ERROR + checking S3 generic/method consistency ... 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 * ggspatial - checking examples ... ERROR - checking tests ... ERROR + checking S3 generic/method consistency ... WARNING * ggstatsplot - checking examples ... ERROR + checking tests ... ERROR + +* ggstream + checking tests ... 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 +* ggtangle + checking re-building of vignette outputs ... ERROR + checking S3 generic/method consistency ... WARNING + +* ggtext + checking re-building of vignette outputs ... ERROR + +* ggthemeUL + checking re-building of vignette outputs ... ERROR + +* ggtibble + checking tests ... ERROR * ggVennDiagram - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR -* Greymodels - checking examples ... ERROR +* ggview + checking S3 generic/method consistency ... WARNING -* GWASinspector - checking whether package ‘GWASinspector’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* GimmeMyPlot + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* gosset + checking re-building of vignette outputs ... ERROR + +* grafify + checking tests ... ERROR -* GWlasso +* graphPAF checking examples ... ERROR -* harbinger +* gratia checking examples ... ERROR - checking whether package ‘harbinger’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking tests ... ERROR -* HCmodelSets +* Greymodels checking examples ... ERROR - checking whether package ‘HCmodelSets’ can be installed ... WARNING - checking R code for possible problems ... NOTE + +* GRShiny + checking tests ... ERROR + +* grwat + checking tests ... ERROR + +* gtExtras + checking tests ... ERROR + +* guideR + checking examples ... ERROR + checking tests ... ERROR + +* handwriterRF + checking tests ... ERROR + +* harmony + checking re-building of vignette outputs ... ERROR + +* hatchR + checking tests ... ERROR * healthyR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* healthyR.ai + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR * healthyR.ts checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR * heatmaply checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* heemod - checking running R code from vignettes ... ERROR + checking re-building of vignette outputs ... ERROR * hesim checking tests ... ERROR +* hmer + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + * hmsidwR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* hoopR + checking installed package size ... NOTE + +* hrbrthemes + checking tests ... ERROR + +* hstats + checking examples ... ERROR * HVT checking examples ... ERROR - checking whether package ‘HVT’ can be installed ... WARNING - checking R code for possible problems ... NOTE + +* hyperoverlap + checking whether package ‘hyperoverlap’ can be installed ... WARNING + +* hypervolume + checking whether package ‘hypervolume’ can be installed ... WARNING * hypsoLoop checking whether package ‘hypsoLoop’ can be installed ... WARNING -* iCARH - checking whether package ‘iCARH’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* ibawds + checking tests ... ERROR -* ICSsmoothing +* ichimoku checking tests ... ERROR -* incidental - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* ICSClust + checking examples ... ERROR + checking tests ... ERROR -* industRial +* ICtest checking examples ... ERROR + checking re-building of vignette outputs ... ERROR -* infer +* ImHD + checking whether package ‘ImHD’ can be installed ... WARNING + +* implicitMeasures + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* imputeTS + checking tests ... ERROR + +* imsig checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* inferCSN +* incidence checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* infer + checking tests ... ERROR + checking S3 generic/method consistency ... WARNING -* injurytools - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* inferCSN + checking examples ... ERROR * inTextSummaryTable checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR -* inti - checking whether package ‘inti’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* iNZightTS + checking tests ... ERROR -* IPV - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* ipsRdbs + checking re-building of vignette outputs ... ERROR * IRon checking examples ... ERROR * isoorbi - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking tests ... ERROR -* jenga - checking whether package ‘jenga’ can be installed ... WARNING +* jskm + checking re-building of vignette outputs ... ERROR * karel checking examples ... ERROR @@ -768,224 +1072,422 @@ Issues with CRAN packages are summarised below. * kDGLM checking examples ... ERROR + checking re-building of vignette outputs ... ERROR -* Keyboard +* khroma + checking examples ... ERROR + +* lares checking examples ... ERROR - checking whether package ‘Keyboard’ can be installed ... WARNING - checking R code for possible problems ... NOTE * latentcor checking examples ... ERROR +* latrend + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + * lcars checking examples ... ERROR - checking running R code from vignettes ... ERROR + checking re-building of vignette outputs ... ERROR + +* legendry + checking whether the package can be loaded with stated dependencies ... WARNING + checking whether the package can be unloaded cleanly ... WARNING + checking whether the namespace can be loaded with stated dependencies ... WARNING + checking dependencies in R code ... NOTE + checking R code for possible problems ... NOTE * lemon checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + checking S3 generic/method consistency ... WARNING * lfproQC checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* 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 + checking re-building of vignette outputs ... ERROR -* LocalCop - checking re-building of vignette outputs ... NOTE +* lgpr + checking tests ... ERROR -* lognorm - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* lionfish + checking re-building of vignette outputs ... ERROR -* lsl +* listdown checking examples ... ERROR + checking tests ... ERROR -* MAINT.Data +* LMD checking examples ... ERROR - checking tests ... ERROR - checking whether package ‘MAINT.Data’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking re-building of vignette outputs ... ERROR -* MarketMatching +* lnmixsurv + checking tests ... ERROR checking re-building of vignette outputs ... ERROR -* metacart +* longevity checking examples ... ERROR - checking whether package ‘metacart’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking tests ... ERROR -* MetAlyzer +* LorenzRegression checking examples ... ERROR -* metR - checking examples ... ERROR +* LSX checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* mgcViz - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* migraph +* ltertools checking tests ... ERROR -* mikropml +* manydata checking tests ... ERROR -* MiMIR - checking examples ... ERROR - -* miRetrieve - checking tests ... ERROR +* manymodelr + checking whether package ‘manymodelr’ can be installed ... WARNING -* MiscMetabar +* manynet checking examples ... ERROR checking tests ... ERROR -* misspi +* marquee checking examples ... ERROR +* matsindf + checking re-building of vignette outputs ... ERROR + +* MaxWiK + checking re-building of vignette outputs ... ERROR + +* MBMethPred + checking tests ... ERROR + +* mcp + checking examples ... ERROR + checking tests ... ERROR + +* mcradds + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* mcStats + checking tests ... ERROR + +* meme + checking re-building of vignette outputs ... ERROR + +* MendelianRandomization + checking examples ... ERROR + +* metagam + checking re-building of vignette outputs ... ERROR + +* MetAlyzer + checking examples ... ERROR + +* metan + checking re-building of vignette outputs ... ERROR + +* MetaNet + checking examples ... ERROR + +* metanetwork + checking examples ... ERROR + checking tests ... ERROR + +* metaquant + checking examples ... ERROR + +* metR + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* mgcViz + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* MIC + checking examples ... ERROR + +* microeco + checking examples ... ERROR + +* migraph + checking examples ... ERROR + checking tests ... ERROR + +* mikropml + checking tests ... ERROR + +* MiMIR + checking examples ... ERROR + +* miRetrieve + checking tests ... ERROR + +* MiRNAQCD + checking tests ... ERROR + +* MiscMetabar + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* miscset + checking re-building of vignette outputs ... ERROR + +* missingHE + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* misspi + checking examples ... ERROR + +* mistr + checking re-building of vignette outputs ... ERROR + +* mistral + checking whether package ‘mistral’ can be installed ... WARNING + +* misty + checking examples ... ERROR + +* MixLFA + checking examples ... ERROR + +* mixpoissonreg + checking re-building of vignette outputs ... ERROR + * mizer checking tests ... ERROR -* MLEce +* MKpower checking examples ... ERROR - checking whether package ‘MLEce’ can be installed ... WARNING - checking R code for possible problems ... NOTE + +* mlergm + checking re-building of vignette outputs ... ERROR + +* mlr3spatiotempcv + checking tests ... ERROR + +* mlr3viz + checking examples ... ERROR + checking tests ... ERROR + +* mobr + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* modeldb + checking tests ... ERROR * modeltime.resample checking tests ... ERROR -* moreparty - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* Momocs + checking examples ... ERROR -* 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 +* morseDR + checking re-building of vignette outputs ... ERROR -* MPTmultiverse +* mpactr + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* MRZero checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* mtb +* mshap checking tests ... ERROR -* mudfold - checking whether package ‘mudfold’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* mtdesign + checking tests ... ERROR * mulgar checking examples ... ERROR -* MultiTraits +* multilandr checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* mvSLOUCH - checking re-building of vignette outputs ... NOTE +* mvdalab + checking examples ... ERROR -* naive - checking whether package ‘naive’ can be installed ... WARNING +* mverse + checking re-building of vignette outputs ... ERROR -* ncappc - checking whether package ‘ncappc’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* mvMAPIT + checking re-building of vignette outputs ... ERROR -* neatmaps - checking examples ... ERROR +* mxnorm + checking tests ... ERROR -* NetFACS +* neatmaps checking examples ... ERROR - checking running R code from vignettes ... ERROR -* NetworkInference +* NeuralNetTools 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 + checking re-building of vignette outputs ... ERROR * NHSRplotthedots checking tests ... ERROR * nichetools - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* NiLeDAM + checking tests ... ERROR * NIMAA checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* nlmixr2plot + checking tests ... ERROR + +* nlmixr2rpt + checking tests ... ERROR + +* noisemodel + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* nonmem2R + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* normfluodbf + checking tests ... ERROR + +* NPflow + checking examples ... ERROR * nzelect + checking re-building of vignette outputs ... ERROR + +* occCite + checking tests ... ERROR + +* ofpetrial checking examples ... ERROR -* oddsratio +* ogrdbstats checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR * OmicNavigator checking tests ... ERROR -* ordbetareg +* opitools checking examples ... ERROR +* ordinalsimr + checking tests ... ERROR + +* ordr + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* OutliersO3 + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* pacu + checking re-building of vignette outputs ... ERROR + * pafr checking tests ... ERROR + checking S3 generic/method consistency ... WARNING -* pathviewr +* palettes + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* panelView + checking examples ... ERROR + +* ParamHelpers checking tests ... ERROR -* pdxTrees - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* paramix + checking re-building of vignette outputs ... ERROR -* PeakError +* PAsso checking examples ... ERROR -* PeakSegJoint +* patchwork checking examples ... ERROR + checking tests ... ERROR + checking S3 generic/method consistency ... WARNING + +* Path.Analysis + checking re-building of vignette outputs ... ERROR + +* pathfindR + checking tests ... ERROR -* PeakSegOptimal +* pathviewr + checking tests ... ERROR + +* PatientLevelPrediction checking examples ... ERROR +* patientProfilesVis + checking re-building of vignette outputs ... ERROR + +* pcpr + checking re-building of vignette outputs ... ERROR + +* pcr + checking tests ... ERROR + +* pdxTrees + checking re-building of vignette outputs ... ERROR + +* pedbp + checking tests ... ERROR + * personalized checking tests ... ERROR +* phylepic + checking S3 generic/method consistency ... WARNING + +* plantTracker + checking re-building of vignette outputs ... ERROR + * Plasmidprofiler checking examples ... ERROR +* PLMIX + checking examples ... ERROR + +* plotdap + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + * plotDK checking tests ... ERROR * PlotFTIR - checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR * plotly checking examples ... ERROR checking tests ... ERROR +* plotor + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* plotROC + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + * plotthis checking examples ... ERROR @@ -995,43 +1497,38 @@ Issues with CRAN packages are summarised below. * pmxTools checking tests ... ERROR -* pogit - checking whether package ‘pogit’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* pollster + checking re-building of vignette outputs ... ERROR + +* poppr + checking examples ... ERROR + +* PoweREST + checking examples ... ERROR -* posterior - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* PPforest + checking re-building of vignette outputs ... ERROR * PPQplan - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR * ppseq - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* PRECAST + checking examples ... ERROR * precintcon checking examples ... ERROR -* pRecipe - checking whether package ‘pRecipe’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* predint + checking tests ... ERROR -* PReMiuM - checking whether package ‘PReMiuM’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* PredPsych + checking whether package ‘PredPsych’ can be installed ... WARNING -* 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 - checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* predRupdate + checking tests ... ERROR * probably checking tests ... ERROR @@ -1041,89 +1538,143 @@ Issues with CRAN packages are summarised below. * psborrow checking tests ... ERROR + checking whether package ‘psborrow’ can be installed ... WARNING -* PupilPre - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* psc + checking re-building of vignette outputs ... ERROR + +* pscore + checking whether package ‘pscore’ can be installed ... WARNING -* qgcomp +* psyntur + checking examples ... ERROR + +* pubh + checking examples ... ERROR + +* PvSTATEM 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 -* qpNCA +* qad checking tests ... 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 -* r2dii.plot +* qdap checking tests ... ERROR -* r4ss - checking whether package ‘r4ss’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* qgcompint + checking examples ... ERROR + +* qicharts2 + checking examples ... ERROR + +* quantities + checking re-building of vignette outputs ... ERROR + +* QuantNorm + checking examples ... ERROR + +* quickPlot + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* quickReg + checking re-building of vignette outputs ... ERROR + +* R4GoodPersonalFinances + checking examples ... ERROR * r6qualitytools checking examples ... ERROR - checking whether package ‘r6qualitytools’ can be installed ... WARNING - checking R code for possible problems ... NOTE + +* radiant.model + checking examples ... ERROR * Radviz checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* RamanMP + checking examples ... ERROR + +* randomForestExplainer + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR * rassta checking examples ... ERROR checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* rasterdiv + checking re-building of vignette outputs ... ERROR * rater checking tests ... ERROR * ratlas checking tests ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR -* RclusTool +* rBiasCorrection checking examples ... ERROR - checking whether package ‘RclusTool’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking tests ... ERROR + +* rbioacc + checking tests ... ERROR -* RDS +* rbiom checking examples ... ERROR - checking whether package ‘RDS’ can be installed ... WARNING - checking R code for possible problems ... NOTE + +* reda + checking tests ... ERROR * regtomean checking whether package ‘regtomean’ can be installed ... WARNING -* RKorAPClient +* rempsyc + checking examples ... ERROR checking tests ... ERROR + checking re-building of vignette outputs ... ERROR -* rmcfs - checking whether package ‘rmcfs’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* reportRmd + checking examples ... ERROR -* rnmamod +* ReturnCurves checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* RevGadgets 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 + +* ridgetorus + checking examples ... ERROR + +* rifreg + checking tests ... ERROR + +* RMixtComp + checking examples ... ERROR + +* RMixtCompUtilities + checking examples ... ERROR + +* rmweather + checking tests ... ERROR + +* RNAseqQC + checking re-building of vignette outputs ... ERROR * roahd checking examples ... ERROR -* robomit +* robCompositions checking examples ... ERROR - checking whether package ‘robomit’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking whether package ‘robCompositions’ can be installed ... WARNING + +* robustmatrix + checking re-building of vignette outputs ... ERROR * romic checking tests ... ERROR @@ -1131,19 +1682,66 @@ Issues with CRAN packages are summarised below. * roptions checking examples ... ERROR -* rsimsum - checking whether package ‘rsimsum’ can be installed ... WARNING +* rPBK + checking tests ... ERROR -* rSRD +* rrr checking examples ... ERROR - checking whether package ‘rSRD’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking re-building of vignette outputs ... ERROR + +* RSDA + checking whether package ‘RSDA’ can be installed ... WARNING -* saeRobust +* RTIGER + checking whether package ‘RTIGER’ can be installed ... WARNING + +* RtsEva checking examples ... ERROR + +* RVA + checking re-building of vignette outputs ... ERROR + +* RVenn + checking tests ... ERROR + +* Rwtss + checking tests ... ERROR + +* rYWAASB + checking re-building of vignette outputs ... ERROR + +* sageR + checking examples ... ERROR + +* saros + checking examples ... ERROR + checking tests ... ERROR + +* scatterpie + checking S3 generic/method consistency ... WARNING + +* scCustomize + checking examples ... ERROR + +* scGate + checking examples ... ERROR + +* schtools + checking re-building of vignette outputs ... ERROR + +* scoringutils + checking examples ... ERROR + +* SCpubr checking tests ... ERROR - checking whether package ‘saeRobust’ can be installed ... WARNING - checking R code for possible problems ... NOTE + +* scRNAstat + checking examples ... ERROR + +* scrutiny + checking examples ... ERROR + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR * scUtils checking tests ... ERROR @@ -1153,21 +1751,33 @@ Issues with CRAN packages are summarised below. * SDMtune checking tests ... ERROR - checking installed package size ... NOTE * seAMLess checking examples ... ERROR +* sedproxy + checking tests ... ERROR + +* see + checking examples ... ERROR + checking tests ... ERROR + * seedreg checking examples ... ERROR -* segen - checking whether package ‘segen’ can be installed ... WARNING +* SEI + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR -* sensitivity +* seqHMM + checking examples ... ERROR + +* SerolyzeR + checking examples ... ERROR + checking tests ... ERROR + +* Seurat checking examples ... ERROR - checking whether package ‘sensitivity’ can be installed ... WARNING - checking R code for possible problems ... NOTE * sglg checking examples ... ERROR @@ -1175,43 +1785,66 @@ Issues with CRAN packages are summarised below. * sgsR checking tests ... ERROR +* shadowtext + checking dependencies in R code ... WARNING + * SHAPforxgboost checking examples ... ERROR + checking re-building of vignette outputs ... ERROR -* SHELF - checking whether package ‘SHELF’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* ShapleyOutlier + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR -* signatureSurvival +* shapviz checking examples ... ERROR - checking whether package ‘signatureSurvival’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking re-building of vignette outputs ... ERROR -* SimNPH +* shiny checking tests ... ERROR -* simRestore +* shinyMixR checking tests ... ERROR + checking re-building of vignette outputs ... ERROR -* singleCellHaystack +* shinyMobile checking examples ... ERROR - checking whether package ‘singleCellHaystack’ can be installed ... WARNING - checking R code for possible problems ... NOTE -* SNPannotator - checking whether package ‘SNPannotator’ can be installed ... WARNING - checking R code for possible problems ... NOTE +* simmr + checking re-building of vignette outputs ... ERROR + +* SimNPH + checking tests ... ERROR + +* simplecolors + checking tests ... ERROR + +* sjPlot + checking re-building of vignette outputs ... ERROR -* soc.ca +* smallsets checking examples ... ERROR - checking whether package ‘soc.ca’ can be installed ... WARNING - checking R code for possible problems ... NOTE + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR -* SOMbrero +* SmartEDA checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* smer + checking re-building of vignette outputs ... ERROR + +* SOMbrero + checking tests ... ERROR + +* SoupX + checking re-building of vignette outputs ... ERROR + +* spacejamr + checking tests ... ERROR + +* spatialwarnings checking tests ... ERROR - checking whether package ‘SOMbrero’ can be installed ... WARNING - checking R code for possible problems ... NOTE * spectralR checking tests ... ERROR @@ -1219,115 +1852,206 @@ Issues with CRAN packages are summarised below. * spinifex checking tests ... ERROR -* spooky - checking whether package ‘spooky’ can be installed ... WARNING - * sport checking tests ... ERROR +* sportyR + checking tests ... ERROR + +* SPUTNIK + checking whether package ‘SPUTNIK’ can be installed ... WARNING + * SqueakR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* ssd4mosaic + checking tests ... ERROR + +* sssc + checking whether package ‘sssc’ can be installed ... WARNING + +* starvz + checking tests ... ERROR + +* states + checking tests ... ERROR * statgenGWAS checking tests ... ERROR +* statgenGxE + checking tests ... ERROR + * statgenHTP checking tests ... ERROR + checking re-building of vignette outputs ... ERROR -* Superpower +* statgenIBD + checking tests ... ERROR + +* statgenSTA + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* statVisual checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* StratifiedMedicine + checking re-building of vignette outputs ... ERROR + +* stRoke + checking tests ... ERROR + +* Superpower 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 tests ... ERROR + +* survHE + checking tests ... ERROR + +* survstan + checking re-building of vignette outputs ... ERROR + +* symptomcheckR + checking examples ... ERROR + +* synthpop checking examples ... ERROR * tabledown checking examples ... ERROR +* tastypie + checking tests ... ERROR + +* TcGSA + checking Rd cross-references ... WARNING + * TCIU checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR -* tcplfit2 - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* teal.widgets + checking tests ... ERROR -* tetragon - checking whether package ‘tetragon’ can be installed ... WARNING +* telraamStats + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR -* thematic +* TestGardener checking examples ... ERROR - checking tests ... ERROR -* tidybayes +* thematic checking examples ... ERROR + checking tests ... ERROR * tidycat checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR * tidyCDISC checking tests ... ERROR -* tidyplots - checking examples ... ERROR +* tidycomm + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* tidyEdSurvey checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* tidytreatment - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* tidyfit + checking re-building of vignette outputs ... ERROR + +* tidypaleo + checking S3 generic/method consistency ... WARNING -* timetk +* tidyposterior checking tests ... ERROR -* TOSTER +* tidysdm checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* timetk checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE -* TransProR +* tinyarray checking examples ... ERROR -* TreatmentPatterns +* tip + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR + +* tmt + checking tests ... ERROR + +* TPMplt + checking whether package ‘TPMplt’ can be installed ... WARNING + +* track2KBA + checking tests ... ERROR + +* tradeoffaucdim checking tests ... ERROR -* TreatmentSelection +* trajmsm + checking whether package ‘trajmsm’ can be installed ... WARNING + +* TransProR checking examples ... ERROR - checking whether package ‘TreatmentSelection’ can be installed ... WARNING - checking R code for possible problems ... NOTE + +* treeheatr + checking examples ... ERROR + checking re-building of vignette outputs ... ERROR * trelliscopejs checking tests ... ERROR + checking S3 generic/method consistency ... WARNING + +* triplot + checking examples ... ERROR + checking tests ... ERROR + +* triptych + checking examples ... ERROR -* tricolore +* tsfeatures + checking re-building of vignette outputs ... ERROR + +* tsgc checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE * tsnet checking tests ... ERROR -* UCSCXenaShiny - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE +* ufs + checking examples ... ERROR + +* ulrb + checking re-building of vignette outputs ... ERROR * umiAnalyzer checking examples ... ERROR +* UnalR + checking tests ... ERROR + +* ushr + checking examples ... ERROR + * usmap checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR + +* utile.visuals + checking examples ... ERROR + +* vaccine + checking tests ... ERROR * vaccineff checking tests ... ERROR @@ -1335,242 +2059,104 @@ Issues with CRAN packages are summarised below. * valr checking tests ... ERROR -* visOmopResults - checking tests ... ERROR +* vanquish + checking whether package ‘vanquish’ can be installed ... WARNING + +* VarSelLCM + checking re-building of vignette outputs ... ERROR + +* vDiveR + checking examples ... ERROR -* visvow +* vip checking tests ... ERROR - checking whether package ‘visvow’ can be installed ... WARNING - checking R code for possible problems ... NOTE + +* ViSiElse + checking re-building of vignette outputs ... ERROR + +* visualpred + checking whether package ‘visualpred’ can be installed ... WARNING * vivaldi checking examples ... ERROR checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR -* voluModel +* vivid checking examples ... ERROR - checking re-building of vignette outputs ... NOTE -* vvshiny +* voluModel + checking examples ... ERROR checking tests ... ERROR + checking re-building of vignette outputs ... ERROR -* VWPre - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE - -* WebAnalytics - checking examples ... ERROR +* vvshiny checking tests ... ERROR - checking whether package ‘WebAnalytics’ can be installed ... WARNING - checking R code for possible problems ... NOTE -* WhatsR - checking examples ... ERROR +* washi checking tests ... ERROR - checking whether package ‘WhatsR’ can be installed ... WARNING - checking R code for possible problems ... NOTE * wilson checking tests ... ERROR -* wordmap +* windfarmGA checking tests ... ERROR -* xpose +* wql checking examples ... ERROR - checking tests ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR -* xpose.xtras +* WRS2 + checking re-building of vignette outputs ... ERROR + +* WRTDStidal checking examples ... ERROR - checking running R code from vignettes ... ERROR - checking re-building of vignette outputs ... NOTE + checking re-building of vignette outputs ... ERROR -* yamlet +* xaringanthemer + checking re-building of vignette outputs ... ERROR + +* xpose.xtras checking examples ... ERROR checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* yamlet + checking S3 generic/method consistency ... WARNING + +* ZetaSuite + checking whether package ‘ZetaSuite’ can be installed ... WARNING ### Failed to check -* 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) +* bartMan (NA) +* bayesdfa (NA) +* bmstdr (NA) +* cocktailApp (NA) +* coda.plot (NA) +* ctsem (NA) +* deeptime (NA) +* EcoEnsemble (NA) +* fio (NA) +* GGally (NA) +* ggmosaic (NA) +* ggmulti (NA) +* ggRandomForests (NA) +* ggtern (NA) +* inventorize (NA) +* metabolic (NA) +* multinma (NA) +* MultiTraits (NA) +* PieGlyph (NA) +* rmsb (NA) +* rshift (NA) +* RSP (NA) +* rstanarm (NA) +* scplot (NA) +* streamDAG (NA) +* TestAnaAPP (NA) +* tidydr (NA) +* tricolore (NA) +* TriDimRegression (NA) +* webSDM (NA) +* xpose (NA) diff --git a/revdep/failures.md b/revdep/failures.md index d5b7b812fc..fc2d057c17 100644 --- a/revdep/failures.md +++ b/revdep/failures.md @@ -1,23 +1,23 @@ -# abctools +# bartMan
-* Version: 1.1.7 -* GitHub: https://github.com/dennisprangle/abctools -* Source code: https://github.com/cran/abctools -* Date/Publication: 2023-09-18 10:40:02 UTC -* Number of recursive dependencies: 75 +* 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: 134 -Run `revdepcheck::cloud_details(, "abctools")` for more info +Run `revdepcheck::cloud_details(, "bartMan")` for more info
-## In both +## Newly broken -* checking whether package ‘abctools’ can be installed ... ERROR +* checking whether package ‘bartMan’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/abctools/new/abctools.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/bartMan/new/bartMan.Rcheck/00install.out’ for details. ``` ## Installation @@ -25,147 +25,128 @@ Run `revdepcheck::cloud_details(, "abctools")` for more info ### Devel ``` -* installing *source* package ‘abctools’ ... -** package ‘abctools’ successfully unpacked and MD5 sums checked +* installing *source* package ‘bartMan’ ... +** package ‘bartMan’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c 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 -installing to /tmp/workdir/abctools/new/abctools.Rcheck/00LOCK-abctools/00new/abctools/libs ** R ** data -** inst +*** moving datasets to lazyload DB ** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘quantreg’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +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 ‘abctools’ -* removing ‘/tmp/workdir/abctools/new/abctools.Rcheck/abctools’ +ERROR: lazy loading failed for package ‘bartMan’ +* removing ‘/tmp/workdir/bartMan/new/bartMan.Rcheck/bartMan’ ``` ### CRAN ``` -* installing *source* package ‘abctools’ ... -** package ‘abctools’ successfully unpacked and MD5 sums checked +* installing *source* package ‘bartMan’ ... +** package ‘bartMan’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c 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 -installing to /tmp/workdir/abctools/old/abctools.Rcheck/00LOCK-abctools/00new/abctools/libs ** R ** data -** inst +*** moving datasets to lazyload DB ** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘quantreg’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘abctools’ -* removing ‘/tmp/workdir/abctools/old/abctools.Rcheck/abctools’ +** 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) ``` -# adjustedCurves +# bayesdfa
-* 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 +* Version: 1.3.4 +* GitHub: https://github.com/fate-ewi/bayesdfa +* Source code: https://github.com/cran/bayesdfa +* Date/Publication: 2025-03-22 20:30:21 UTC +* Number of recursive dependencies: 85 -Run `revdepcheck::cloud_details(, "adjustedCurves")` for more info +Run `revdepcheck::cloud_details(, "bayesdfa")` for more info
-## Error before installation +## In both -### Devel +* checking whether package ‘bayesdfa’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/bayesdfa/new/bayesdfa.Rcheck/00install.out’ for details. + ``` -``` -* using log directory ‘/tmp/workdir/adjustedCurves/new/adjustedCurves.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘adjustedCurves/DESCRIPTION’ ... OK -... ---- finished re-building ‘plot_customization.rmd’ +## Installation -SUMMARY: processing the following file failed: - ‘introduction.Rmd’ +### Devel -Error: Vignette re-building failed. +``` +* installing *source* package ‘bayesdfa’ ... +** package ‘bayesdfa’ successfully unpacked and MD5 sums checked +** using staged installation +Error in loadNamespace(x) : there is no package called ‘rstantools’ +Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart Execution halted - -* DONE -Status: 2 ERRORs, 1 WARNING, 3 NOTEs - - - +ERROR: configuration failed for package ‘bayesdfa’ +* removing ‘/tmp/workdir/bayesdfa/new/bayesdfa.Rcheck/bayesdfa’ ``` ### CRAN ``` -* using log directory ‘/tmp/workdir/adjustedCurves/old/adjustedCurves.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘adjustedCurves/DESCRIPTION’ ... OK -... ---- finished re-building ‘plot_customization.rmd’ - -SUMMARY: processing the following file failed: - ‘introduction.Rmd’ - -Error: Vignette re-building failed. +* installing *source* package ‘bayesdfa’ ... +** package ‘bayesdfa’ successfully unpacked and MD5 sums checked +** using staged installation +Error in loadNamespace(x) : there is no package called ‘rstantools’ +Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart Execution halted - -* DONE -Status: 2 ERRORs, 1 WARNING, 3 NOTEs - - - +ERROR: configuration failed for package ‘bayesdfa’ +* removing ‘/tmp/workdir/bayesdfa/old/bayesdfa.Rcheck/bayesdfa’ ``` -# animalEKF +# bmstdr
-* Version: 1.2 -* GitHub: NA -* Source code: https://github.com/cran/animalEKF -* Date/Publication: 2023-09-29 15:32:41 UTC -* Number of recursive dependencies: 76 +* Version: 0.8.2 +* GitHub: https://github.com/sujit-sahu/bmstdr +* Source code: https://github.com/cran/bmstdr +* Date/Publication: 2025-03-31 17:30:06 UTC +* Number of recursive dependencies: 206 -Run `revdepcheck::cloud_details(, "animalEKF")` for more info +Run `revdepcheck::cloud_details(, "bmstdr")` for more info
-## In both +## Newly broken -* checking whether package ‘animalEKF’ can be installed ... ERROR +* checking whether package ‘bmstdr’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/animalEKF/new/animalEKF.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/bmstdr/new/bmstdr.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking installed package size ... NOTE + ``` + installed size is 144.1Mb + sub-directories of 1Mb or more: + data 1.5Mb + libs 139.8Mb + ``` + +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. ``` ## Installation @@ -173,61 +154,84 @@ Run `revdepcheck::cloud_details(, "animalEKF")` for more info ### Devel ``` -* installing *source* package ‘animalEKF’ ... -** package ‘animalEKF’ successfully unpacked and MD5 sums checked +* installing *source* package ‘bmstdr’ ... +** package ‘bmstdr’ successfully unpacked and MD5 sums checked ** using staged installation -** R +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I'/usr/local/lib/R/site-library/RcppParallel/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, +... ** 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: .onLoad failed in loadNamespace() for 'rstan', details: + call: NULL + error: C stack usage 9964532 is too close to the limit Execution halted -ERROR: lazy loading failed for package ‘animalEKF’ -* removing ‘/tmp/workdir/animalEKF/new/animalEKF.Rcheck/animalEKF’ +ERROR: lazy loading failed for package ‘bmstdr’ +* removing ‘/tmp/workdir/bmstdr/new/bmstdr.Rcheck/bmstdr’ ``` ### CRAN ``` -* installing *source* package ‘animalEKF’ ... -** package ‘animalEKF’ successfully unpacked and MD5 sums checked +* installing *source* package ‘bmstdr’ ... +** package ‘bmstdr’ successfully unpacked and MD5 sums checked ** using staged installation -** R -** data -** inst +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I'/usr/local/lib/R/site-library/RcppParallel/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, +... ** 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 ‘animalEKF’ -* removing ‘/tmp/workdir/animalEKF/old/animalEKF.Rcheck/animalEKF’ +** 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 (bmstdr) ``` -# ANOM +# cocktailApp
-* Version: 0.5 -* 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: 63 +* Version: 0.2.3 +* GitHub: https://github.com/shabbychef/cocktailApp +* Source code: https://github.com/cran/cocktailApp +* Date/Publication: 2023-07-19 13:40:09 UTC +* Number of recursive dependencies: 94 -Run `revdepcheck::cloud_details(, "ANOM")` for more info +Run `revdepcheck::cloud_details(, "cocktailApp")` for more info
-## In both +## Newly broken -* checking whether package ‘ANOM’ can be installed ... ERROR +* checking whether package ‘cocktailApp’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/ANOM/new/ANOM.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/cocktailApp/new/cocktailApp.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 14729 marked UTF-8 strings ``` ## Installation @@ -235,63 +239,64 @@ Run `revdepcheck::cloud_details(, "ANOM")` for more info ### Devel ``` -* installing *source* package ‘ANOM’ ... -** package ‘ANOM’ successfully unpacked and MD5 sums checked +* installing *source* package ‘cocktailApp’ ... +** package ‘cocktailApp’ 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: .onLoad failed in loadNamespace() for 'ggtern', details: + call: NULL + error: object properties are invalid: +- @lineend must be or , not S3 Execution halted -ERROR: lazy loading failed for package ‘ANOM’ -* removing ‘/tmp/workdir/ANOM/new/ANOM.Rcheck/ANOM’ +ERROR: lazy loading failed for package ‘cocktailApp’ +* removing ‘/tmp/workdir/cocktailApp/new/cocktailApp.Rcheck/cocktailApp’ ``` ### CRAN ``` -* installing *source* package ‘ANOM’ ... -** package ‘ANOM’ successfully unpacked and MD5 sums checked +* installing *source* package ‘cocktailApp’ ... +** package ‘cocktailApp’ 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 ‘ANOM’ -* removing ‘/tmp/workdir/ANOM/old/ANOM.Rcheck/ANOM’ +** help +*** installing help indices +*** copying figures +** 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 (cocktailApp) ``` -# atRisk +# coda.plot
-* Version: 0.2.0 +* Version: 0.1.9 * GitHub: NA -* Source code: https://github.com/cran/atRisk -* Date/Publication: 2025-01-14 18:50:01 UTC -* Number of recursive dependencies: 37 +* Source code: https://github.com/cran/coda.plot +* Date/Publication: 2025-04-20 21:30:02 UTC +* Number of recursive dependencies: 42 -Run `revdepcheck::cloud_details(, "atRisk")` for more info +Run `revdepcheck::cloud_details(, "coda.plot")` for more info
-## In both +## Newly broken -* checking whether package ‘atRisk’ can be installed ... ERROR +* checking whether package ‘coda.plot’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/atRisk/new/atRisk.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/coda.plot/new/coda.plot.Rcheck/00install.out’ for details. ``` ## Installation @@ -299,213 +304,216 @@ Run `revdepcheck::cloud_details(, "atRisk")` for more info ### Devel ``` -* installing *source* package ‘atRisk’ ... -** package ‘atRisk’ successfully unpacked and MD5 sums checked +* installing *source* package ‘coda.plot’ ... +** package ‘coda.plot’ successfully unpacked and MD5 sums checked ** using staged installation ** R -** data -*** moving datasets to lazyload DB ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Error: .onLoad failed in loadNamespace() for 'ggtern', details: + call: NULL + error: object properties are invalid: +- @lineend must be or , not S3 Execution halted -ERROR: lazy loading failed for package ‘atRisk’ -* removing ‘/tmp/workdir/atRisk/new/atRisk.Rcheck/atRisk’ +ERROR: lazy loading failed for package ‘coda.plot’ +* removing ‘/tmp/workdir/coda.plot/new/coda.plot.Rcheck/coda.plot’ ``` ### CRAN ``` -* installing *source* package ‘atRisk’ ... -** package ‘atRisk’ successfully unpacked and MD5 sums checked +* installing *source* package ‘coda.plot’ ... +** package ‘coda.plot’ successfully unpacked and MD5 sums checked ** using staged installation ** R -** data -*** moving datasets to lazyload DB ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘atRisk’ -* removing ‘/tmp/workdir/atRisk/old/atRisk.Rcheck/atRisk’ +** 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 (coda.plot) ``` -# autoReg +# ctsem
-* 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 +* Version: 3.10.2 +* GitHub: https://github.com/cdriveraus/ctsem +* Source code: https://github.com/cran/ctsem +* Date/Publication: 2025-01-13 11:00:08 UTC +* Number of recursive dependencies: 158 -Run `revdepcheck::cloud_details(, "autoReg")` for more info +Run `revdepcheck::cloud_details(, "ctsem")` for more info
-## Error before installation +## In both + +* checking whether package ‘ctsem’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ctsem/new/ctsem.Rcheck/00install.out’ for details. + ``` + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘arules’ + ``` + +## Installation ### Devel ``` -* 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 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 ‘autoReg/DESCRIPTION’ ... OK -... -* 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: OK - +* installing *source* package ‘ctsem’ ... +** package ‘ctsem’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:202: stanExports_ctsm.o] Error 1 +ERROR: compilation failed for package ‘ctsem’ +* removing ‘/tmp/workdir/ctsem/new/ctsem.Rcheck/ctsem’ ``` ### CRAN ``` -* 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 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 ‘autoReg/DESCRIPTION’ ... OK -... -* 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: OK - +* installing *source* package ‘ctsem’ ... +** package ‘ctsem’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] + 654 | return internal::first_aligned::alignment),Derived>(m); + | ^~~~~~~~~ +g++: fatal error: Killed signal terminated program cc1plus +compilation terminated. +make: *** [/opt/R/4.4.0/lib/R/etc/Makeconf:202: stanExports_ctsm.o] Error 1 +ERROR: compilation failed for package ‘ctsem’ +* removing ‘/tmp/workdir/ctsem/old/ctsem.Rcheck/ctsem’ ``` -# AutoScore +# deeptime
-* 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 +* 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: 196 -Run `revdepcheck::cloud_details(, "AutoScore")` for more info +Run `revdepcheck::cloud_details(, "deeptime")` for more info
-## Error before installation +## Newly broken + +* checking whether package ‘deeptime’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/deeptime/new/deeptime.Rcheck/00install.out’ for details. + ``` + +## Installation ### Devel ``` -* 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 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 +* installing *source* package ‘deeptime’ ... +** package ‘deeptime’ 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 +** help +*** installing help indices ... -* 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. -* DONE -Status: 1 ERROR - - - +** testing if installed package can be loaded from temporary location +Error: package or namespace load failed for ‘deeptime’: + .onLoad failed in loadNamespace() for 'deeptime', details: + call: NULL + error: object properties are invalid: +- @hjust must be , , or , not +Error: loading failed +Execution halted +ERROR: loading failed +* removing ‘/tmp/workdir/deeptime/new/deeptime.Rcheck/deeptime’ ``` ### CRAN ``` -* 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 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 -... -* 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. -* DONE -Status: 1 ERROR - - - +* installing *source* package ‘deeptime’ ... +** package ‘deeptime’ 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 +** help +*** installing help indices +*** copying figures +** 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 (deeptime) ``` -# bartMan +# EcoEnsemble
-* 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 +* Version: 1.1.2 +* GitHub: https://github.com/CefasRepRes/EcoEnsemble +* Source code: https://github.com/cran/EcoEnsemble +* Date/Publication: 2025-03-18 18:20:02 UTC +* Number of recursive dependencies: 88 -Run `revdepcheck::cloud_details(, "bartMan")` for more info +Run `revdepcheck::cloud_details(, "EcoEnsemble")` for more info
-## Newly broken +## In both -* checking whether package ‘bartMan’ can be installed ... ERROR +* checking whether package ‘EcoEnsemble’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/bartMan/new/bartMan.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/00install.out’ for details. ``` ## Installation @@ -513,61 +521,77 @@ Run `revdepcheck::cloud_details(, "bartMan")` for more info ### Devel ``` -* installing *source* package ‘bartMan’ ... -** package ‘bartMan’ successfully unpacked and MD5 sums checked +* installing *source* package ‘EcoEnsemble’ ... +** package ‘EcoEnsemble’ 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’ +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::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.4.0/lib/R/etc/Makeconf:202: stanExports_ensemble_model_hierarchical.o] Error 1 +ERROR: compilation failed for package ‘EcoEnsemble’ +* removing ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/EcoEnsemble’ ``` ### CRAN ``` -* installing *source* package ‘bartMan’ ... -** package ‘bartMan’ successfully unpacked and MD5 sums checked +* installing *source* package ‘EcoEnsemble’ ... +** package ‘EcoEnsemble’ 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) +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::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.4.0/lib/R/etc/Makeconf:202: stanExports_ensemble_model_hierarchical.o] Error 1 +ERROR: compilation failed for package ‘EcoEnsemble’ +* removing ‘/tmp/workdir/EcoEnsemble/old/EcoEnsemble.Rcheck/EcoEnsemble’ ``` -# bayesDP +# fio
-* Version: 1.3.7 -* GitHub: https://github.com/graemeleehickey/bayesDP -* Source code: https://github.com/cran/bayesDP -* Date/Publication: 2025-01-12 11:40:10 UTC -* Number of recursive dependencies: 79 +* Version: 0.1.6 +* GitHub: https://github.com/albersonmiranda/fio +* Source code: https://github.com/cran/fio +* Date/Publication: 2025-04-06 07:50:02 UTC +* Number of recursive dependencies: 88 -Run `revdepcheck::cloud_details(, "bayesDP")` for more info +Run `revdepcheck::cloud_details(, "fio")` for more info
## In both -* checking whether package ‘bayesDP’ can be installed ... ERROR +* checking whether package ‘fio’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/bayesDP/new/bayesDP.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/fio/new/fio.Rcheck/00install.out’ for details. ``` ## Installation @@ -575,73 +599,59 @@ Run `revdepcheck::cloud_details(, "bayesDP")` for more info ### Devel ``` -* installing *source* package ‘bayesDP’ ... -** package ‘bayesDP’ successfully unpacked and MD5 sums checked +* installing *source* package ‘fio’ ... +** package ‘fio’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c bdplm.cpp -o bdplm.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c ppexp.cpp -o ppexp.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o bayesDP.so RcppExports.o bdplm.o ppexp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/bayesDP/new/bayesDP.Rcheck/00LOCK-bayesDP/00new/bayesDP/libs -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Error in eval(ei, envir) : +------------------ [UNSUPPORTED RUST VERSION]------------------ +- Minimum supported Rust version is 1.77. +- Installed Rust version is 1.75.0. +--------------------------------------------------------------- +Calls: source -> withVisible -> eval -> eval Execution halted -ERROR: lazy loading failed for package ‘bayesDP’ -* removing ‘/tmp/workdir/bayesDP/new/bayesDP.Rcheck/bayesDP’ +ERROR: configuration failed for package ‘fio’ +* removing ‘/tmp/workdir/fio/new/fio.Rcheck/fio’ ``` ### CRAN ``` -* installing *source* package ‘bayesDP’ ... -** package ‘bayesDP’ successfully unpacked and MD5 sums checked +* installing *source* package ‘fio’ ... +** package ‘fio’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c bdplm.cpp -o bdplm.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c ppexp.cpp -o ppexp.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o bayesDP.so RcppExports.o bdplm.o ppexp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/bayesDP/old/bayesDP.Rcheck/00LOCK-bayesDP/00new/bayesDP/libs -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace +Error in eval(ei, envir) : +------------------ [UNSUPPORTED RUST VERSION]------------------ +- Minimum supported Rust version is 1.77. +- Installed Rust version is 1.75.0. +--------------------------------------------------------------- +Calls: source -> withVisible -> eval -> eval Execution halted -ERROR: lazy loading failed for package ‘bayesDP’ -* removing ‘/tmp/workdir/bayesDP/old/bayesDP.Rcheck/bayesDP’ +ERROR: configuration failed for package ‘fio’ +* removing ‘/tmp/workdir/fio/old/fio.Rcheck/fio’ ``` -# BayesianFactorZoo +# GGally
-* Version: 0.0.0.3 -* GitHub: NA -* Source code: https://github.com/cran/BayesianFactorZoo -* Date/Publication: 2024-10-04 09:30:08 UTC -* Number of recursive dependencies: 74 +* Version: 2.2.1 +* 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: 144 -Run `revdepcheck::cloud_details(, "BayesianFactorZoo")` for more info +Run `revdepcheck::cloud_details(, "GGally")` for more info
-## In both +## Newly broken -* checking whether package ‘BayesianFactorZoo’ can be installed ... ERROR +* checking whether package ‘GGally’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/BayesianFactorZoo/new/BayesianFactorZoo.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/GGally/new/GGally.Rcheck/00install.out’ for details. ``` ## Installation @@ -649,139 +659,73 @@ Run `revdepcheck::cloud_details(, "BayesianFactorZoo")` for more info ### Devel ``` -* installing *source* package ‘BayesianFactorZoo’ ... -** package ‘BayesianFactorZoo’ successfully unpacked and MD5 sums checked +* installing *source* package ‘GGally’ ... +** package ‘GGally’ 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 in eval(exprs[i], envir) : object 'is.rel' not found +Error: unable to load R code in package ‘GGally’ Execution halted -ERROR: lazy loading failed for package ‘BayesianFactorZoo’ -* removing ‘/tmp/workdir/BayesianFactorZoo/new/BayesianFactorZoo.Rcheck/BayesianFactorZoo’ +ERROR: lazy loading failed for package ‘GGally’ +* removing ‘/tmp/workdir/GGally/new/GGally.Rcheck/GGally’ ``` ### CRAN ``` -* installing *source* package ‘BayesianFactorZoo’ ... -** package ‘BayesianFactorZoo’ successfully unpacked and MD5 sums checked +* installing *source* package ‘GGally’ ... +** package ‘GGally’ 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 ‘BayesianFactorZoo’ -* removing ‘/tmp/workdir/BayesianFactorZoo/old/BayesianFactorZoo.Rcheck/BayesianFactorZoo’ +** 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 (GGally) ``` -# BayesSurvive +# ggmosaic
-* Version: 0.0.2 -* 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: 118 +* Version: 0.3.3 +* GitHub: https://github.com/haleyjeppson/ggmosaic +* Source code: https://github.com/cran/ggmosaic +* Date/Publication: 2021-02-23 19:50:02 UTC +* Number of recursive dependencies: 74 -Run `revdepcheck::cloud_details(, "BayesSurvive")` for more info +Run `revdepcheck::cloud_details(, "ggmosaic")` for more info
-## Error before installation - -### Devel - -``` -* 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 -... -* 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 - -``` -* 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 -... -* 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 - - - - - -``` -# BCClong - -
- -* Version: 1.0.3 -* GitHub: NA -* Source code: https://github.com/cran/BCClong -* Date/Publication: 2024-06-24 00:00:02 UTC -* Number of recursive dependencies: 148 - -Run `revdepcheck::cloud_details(, "BCClong")` for more info +## Newly broken -
+* checking whether package ‘ggmosaic’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ggmosaic/new/ggmosaic.Rcheck/00install.out’ for details. + ``` -## In both +## Newly fixed -* checking whether package ‘BCClong’ can be installed ... ERROR +* checking dependencies in R code ... NOTE ``` - Installation failed. - See ‘/tmp/workdir/BCClong/new/BCClong.Rcheck/00install.out’ for details. + ':::' call which should be '::': ‘scales:::censor’ + See the note in ?`:::` about the use of this operator. + Unexported object imported by a ':::' call: ‘productplots:::bound’ + See the note in ?`:::` about the use of this operator. ``` ## Installation @@ -789,77 +733,66 @@ Run `revdepcheck::cloud_details(, "BCClong")` for more info ### Devel ``` -* installing *source* package ‘BCClong’ ... -** package ‘BCClong’ successfully unpacked and MD5 sums checked +* installing *source* package ‘ggmosaic’ ... +** package ‘ggmosaic’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c BCC.cpp -o BCC.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Likelihood.cpp -o Likelihood.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c c_which.cpp -o c_which.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o BCClong.so BCC.o Likelihood.o RcppExports.o c_which.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -... ** R ** data +*** 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 in get(x, envir = ns, inherits = FALSE) : + object 'is.waive' not found +Error: unable to load R code in package ‘ggmosaic’ Execution halted -ERROR: lazy loading failed for package ‘BCClong’ -* removing ‘/tmp/workdir/BCClong/new/BCClong.Rcheck/BCClong’ +ERROR: lazy loading failed for package ‘ggmosaic’ +* removing ‘/tmp/workdir/ggmosaic/new/ggmosaic.Rcheck/ggmosaic’ ``` ### CRAN ``` -* installing *source* package ‘BCClong’ ... -** package ‘BCClong’ successfully unpacked and MD5 sums checked +* installing *source* package ‘ggmosaic’ ... +** package ‘ggmosaic’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c BCC.cpp -o BCC.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Likelihood.cpp -o Likelihood.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c c_which.cpp -o c_which.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o BCClong.so BCC.o Likelihood.o RcppExports.o c_which.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -... ** R ** data +*** 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 ‘BCClong’ -* removing ‘/tmp/workdir/BCClong/old/BCClong.Rcheck/BCClong’ +** help +*** installing help indices +*** copying figures +** 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 (ggmosaic) ``` -# BGGM +# ggmulti
-* Version: 2.1.5 -* GitHub: https://github.com/donaldRwilliams/BGGM -* Source code: https://github.com/cran/BGGM -* Date/Publication: 2024-12-22 21:40:02 UTC -* Number of recursive dependencies: 211 +* Version: 1.0.7 +* GitHub: NA +* Source code: https://github.com/cran/ggmulti +* Date/Publication: 2024-04-09 09:40:05 UTC +* Number of recursive dependencies: 124 -Run `revdepcheck::cloud_details(, "BGGM")` for more info +Run `revdepcheck::cloud_details(, "ggmulti")` for more info
-## In both +## Newly broken -* checking whether package ‘BGGM’ can be installed ... ERROR +* checking whether package ‘ggmulti’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/BGGM/new/BGGM.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/ggmulti/new/ggmulti.Rcheck/00install.out’ for details. ``` ## Installation @@ -867,77 +800,66 @@ Run `revdepcheck::cloud_details(, "BGGM")` for more info ### Devel ``` -* installing *source* package ‘BGGM’ ... -** package ‘BGGM’ successfully unpacked and MD5 sums checked +* installing *source* package ‘ggmulti’ ... +** package ‘ggmulti’ successfully unpacked and MD5 sums checked ** using staged installation -configure: creating ./config.status -config.status: creating src/Makevars -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c bggm_fast.cpp -o bggm_fast.o -... +** 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 in get(x, envir = ns, inherits = FALSE) : + object 'new_aes' not found +Error: unable to load R code in package ‘ggmulti’ Execution halted -ERROR: lazy loading failed for package ‘BGGM’ -* removing ‘/tmp/workdir/BGGM/new/BGGM.Rcheck/BGGM’ +ERROR: lazy loading failed for package ‘ggmulti’ +* removing ‘/tmp/workdir/ggmulti/new/ggmulti.Rcheck/ggmulti’ ``` ### CRAN ``` -* installing *source* package ‘BGGM’ ... -** package ‘BGGM’ successfully unpacked and MD5 sums checked +* installing *source* package ‘ggmulti’ ... +** package ‘ggmulti’ successfully unpacked and MD5 sums checked ** using staged installation -configure: creating ./config.status -config.status: creating src/Makevars -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -DARMA_NO_DEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppDist/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -I../inst/include -fpic -g -O2 -c bggm_fast.cpp -o bggm_fast.o -... +** 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 ‘BGGM’ -* removing ‘/tmp/workdir/BGGM/old/BGGM.Rcheck/BGGM’ +** help +*** installing help indices +*** copying figures +** 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 (ggmulti) ``` -# binsreg +# ggRandomForests
-* Version: 1.1 -* GitHub: NA -* Source code: https://github.com/cran/binsreg -* Date/Publication: 2024-07-23 14:30:01 UTC -* Number of recursive dependencies: 35 +* Version: 2.2.1 +* GitHub: https://github.com/ehrlinger/ggRandomForests +* Source code: https://github.com/cran/ggRandomForests +* Date/Publication: 2022-09-01 09:10:45 UTC +* Number of recursive dependencies: 97 -Run `revdepcheck::cloud_details(, "binsreg")` for more info +Run `revdepcheck::cloud_details(, "ggRandomForests")` for more info
## In both -* checking whether package ‘binsreg’ can be installed ... ERROR +* checking whether package ‘ggRandomForests’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/binsreg/new/binsreg.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/ggRandomForests/new/ggRandomForests.Rcheck/00install.out’ for details. ``` ## Installation @@ -945,10766 +867,69 @@ Run `revdepcheck::cloud_details(, "binsreg")` for more info ### Devel ``` -* installing *source* package ‘binsreg’ ... -** package ‘binsreg’ successfully unpacked and MD5 sums checked +* installing *source* package ‘ggRandomForests’ ... +** package ‘ggRandomForests’ 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 +Error: object ‘var.select’ is not exported by 'namespace:randomForestSRC' Execution halted -ERROR: lazy loading failed for package ‘binsreg’ -* removing ‘/tmp/workdir/binsreg/new/binsreg.Rcheck/binsreg’ +ERROR: lazy loading failed for package ‘ggRandomForests’ +* removing ‘/tmp/workdir/ggRandomForests/new/ggRandomForests.Rcheck/ggRandomForests’ ``` ### CRAN ``` -* installing *source* package ‘binsreg’ ... -** package ‘binsreg’ successfully unpacked and MD5 sums checked +* installing *source* package ‘ggRandomForests’ ... +** package ‘ggRandomForests’ 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 +Error: object ‘var.select’ is not exported by 'namespace:randomForestSRC' Execution halted -ERROR: lazy loading failed for package ‘binsreg’ -* removing ‘/tmp/workdir/binsreg/old/binsreg.Rcheck/binsreg’ +ERROR: lazy loading failed for package ‘ggRandomForests’ +* removing ‘/tmp/workdir/ggRandomForests/old/ggRandomForests.Rcheck/ggRandomForests’ ``` -# bspcov +# ggtern
-* Version: 1.0.1 -* GitHub: https://github.com/statjs/bspcov -* Source code: https://github.com/cran/bspcov -* Date/Publication: 2024-11-13 20:10:02 UTC -* Number of recursive dependencies: 111 +* 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: 40 -Run `revdepcheck::cloud_details(, "bspcov")` for more info +Run `revdepcheck::cloud_details(, "ggtern")` for more info
-## In both +## Newly broken -* checking whether package ‘bspcov’ can be installed ... ERROR +* checking whether package ‘ggtern’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/bspcov/new/bspcov.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/ggtern/new/ggtern.Rcheck/00install.out’ for details. ``` -## Installation +## Newly fixed -### Devel - -``` -* installing *source* package ‘bspcov’ ... -** package ‘bspcov’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘bspcov’ -* removing ‘/tmp/workdir/bspcov/new/bspcov.Rcheck/bspcov’ - - -``` -### CRAN - -``` -* installing *source* package ‘bspcov’ ... -** package ‘bspcov’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘bspcov’ -* removing ‘/tmp/workdir/bspcov/old/bspcov.Rcheck/bspcov’ - - -``` -# BSTZINB - -
- -* Version: 1.0.1 -* GitHub: https://github.com/SumanM47/BSTZINB -* Source code: https://github.com/cran/BSTZINB -* Date/Publication: 2024-10-31 22:50:02 UTC -* Number of recursive dependencies: 110 - -Run `revdepcheck::cloud_details(, "BSTZINB")` for more info - -
- -## In both - -* checking whether package ‘BSTZINB’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/BSTZINB/new/BSTZINB.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘BSTZINB’ ... -** package ‘BSTZINB’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘BSTZINB’ -* removing ‘/tmp/workdir/BSTZINB/new/BSTZINB.Rcheck/BSTZINB’ - - -``` -### CRAN - -``` -* installing *source* package ‘BSTZINB’ ... -** package ‘BSTZINB’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘BSTZINB’ -* removing ‘/tmp/workdir/BSTZINB/old/BSTZINB.Rcheck/BSTZINB’ - - -``` -# BuyseTest - -
- -* Version: 3.0.5 -* GitHub: https://github.com/bozenne/BuyseTest -* Source code: https://github.com/cran/BuyseTest -* Date/Publication: 2024-10-13 21:40:02 UTC -* Number of recursive dependencies: 132 - -Run `revdepcheck::cloud_details(, "BuyseTest")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/BuyseTest/new/BuyseTest.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘BuyseTest/DESCRIPTION’ ... OK -... -* this is package ‘BuyseTest’ version ‘3.0.5’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘riskRegression’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/BuyseTest/old/BuyseTest.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘BuyseTest/DESCRIPTION’ ... OK -... -* this is package ‘BuyseTest’ version ‘3.0.5’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘riskRegression’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# 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: 106 - -Run `revdepcheck::cloud_details(, "CARBayesST")` for more info - -
- -## In both - -* checking whether package ‘CARBayesST’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/CARBayesST/new/CARBayesST.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘CARBayesST’ ... -** package ‘CARBayesST’ 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 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 -** 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 ‘CARBayesST’ -* removing ‘/tmp/workdir/CARBayesST/new/CARBayesST.Rcheck/CARBayesST’ - - -``` -### CRAN - -``` -* installing *source* package ‘CARBayesST’ ... -** package ‘CARBayesST’ 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 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 -** 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 ‘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 - -
- -* Version: 0.6.3 -* GitHub: https://github.com/ibecav/CGPfunctions -* Source code: https://github.com/cran/CGPfunctions -* Date/Publication: 2020-11-12 14:50:09 UTC -* Number of recursive dependencies: 155 - -Run `revdepcheck::cloud_details(, "CGPfunctions")` for more info - -
- -## In both - -* checking whether package ‘CGPfunctions’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/CGPfunctions/new/CGPfunctions.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘CGPfunctions’ ... -** package ‘CGPfunctions’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘CGPfunctions’ -* removing ‘/tmp/workdir/CGPfunctions/new/CGPfunctions.Rcheck/CGPfunctions’ - - -``` -### CRAN - -``` -* installing *source* package ‘CGPfunctions’ ... -** package ‘CGPfunctions’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘CGPfunctions’ -* removing ‘/tmp/workdir/CGPfunctions/old/CGPfunctions.Rcheck/CGPfunctions’ - - -``` -# cia - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/cia -* Number of recursive dependencies: 122 - -Run `revdepcheck::cloud_details(, "cia")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# cinaR - -
- -* Version: 0.2.3 -* 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: 171 - -Run `revdepcheck::cloud_details(, "cinaR")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/cinaR/new/cinaR.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 ‘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', 'fgsea' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/cinaR/old/cinaR.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 ‘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', 'fgsea' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# cmprskcoxmsm - -
- -* Version: 0.2.1 -* GitHub: NA -* Source code: https://github.com/cran/cmprskcoxmsm -* Date/Publication: 2021-09-04 05:50:02 UTC -* Number of recursive dependencies: 71 - -Run `revdepcheck::cloud_details(, "cmprskcoxmsm")` for more info - -
- -## In both - -* checking whether package ‘cmprskcoxmsm’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/cmprskcoxmsm/new/cmprskcoxmsm.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘cmprskcoxmsm’ ... -** package ‘cmprskcoxmsm’ 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 ‘cmprskcoxmsm’ -* removing ‘/tmp/workdir/cmprskcoxmsm/new/cmprskcoxmsm.Rcheck/cmprskcoxmsm’ - - -``` -### CRAN - -``` -* installing *source* package ‘cmprskcoxmsm’ ... -** package ‘cmprskcoxmsm’ 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 ‘cmprskcoxmsm’ -* removing ‘/tmp/workdir/cmprskcoxmsm/old/cmprskcoxmsm.Rcheck/cmprskcoxmsm’ - - -``` -# COMMA - -
- -* Version: 1.1.1 -* GitHub: NA -* Source code: https://github.com/cran/COMMA -* Date/Publication: 2024-12-13 21:10:02 UTC -* Number of recursive dependencies: 72 - -Run `revdepcheck::cloud_details(, "COMMA")` for more info - -
- -## In both - -* checking whether package ‘COMMA’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/COMMA/new/COMMA.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* 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]]) : - 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 ‘COMMA’ -* removing ‘/tmp/workdir/COMMA/new/COMMA.Rcheck/COMMA’ - - -``` -### CRAN - -``` -* installing *source* 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]]) : - 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 ‘COMMA’ -* removing ‘/tmp/workdir/COMMA/old/COMMA.Rcheck/COMMA’ - - -``` -# contsurvplot - -
- -* Version: 0.2.1 -* GitHub: https://github.com/RobinDenz1/contsurvplot -* Source code: https://github.com/cran/contsurvplot -* Date/Publication: 2023-08-15 08:00:03 UTC -* Number of recursive dependencies: 156 - -Run `revdepcheck::cloud_details(, "contsurvplot")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/contsurvplot/new/contsurvplot.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘contsurvplot/DESCRIPTION’ ... OK -... -* this is package ‘contsurvplot’ version ‘0.2.1’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘riskRegression’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/contsurvplot/old/contsurvplot.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘contsurvplot/DESCRIPTION’ ... OK -... -* this is package ‘contsurvplot’ version ‘0.2.1’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘riskRegression’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# counterfactuals - -
- -* Version: 0.1.6 -* GitHub: https://github.com/dandls/counterfactuals -* Source code: https://github.com/cran/counterfactuals -* Date/Publication: 2024-10-17 12:00:06 UTC -* Number of recursive dependencies: 217 - -Run `revdepcheck::cloud_details(, "counterfactuals")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/counterfactuals/new/counterfactuals.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘counterfactuals/DESCRIPTION’ ... OK -... -* checking examples ... OK -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... NONE - ‘how-to-add-new-cf-methods.html.asis’ using ‘UTF-8’... OK - ‘introduction.html.asis’ using ‘UTF-8’... OK - ‘other_models.html.asis’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 NOTE - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/counterfactuals/old/counterfactuals.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘counterfactuals/DESCRIPTION’ ... OK -... -* checking examples ... OK -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... NONE - ‘how-to-add-new-cf-methods.html.asis’ using ‘UTF-8’... OK - ‘introduction.html.asis’ using ‘UTF-8’... OK - ‘other_models.html.asis’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 NOTE - - - - - -``` -# CRMetrics - -
- -* Version: 0.3.2 -* GitHub: https://github.com/khodosevichlab/CRMetrics -* Source code: https://github.com/cran/CRMetrics -* Date/Publication: 2024-11-08 00:20:06 UTC -* Number of recursive dependencies: 242 - -Run `revdepcheck::cloud_details(, "CRMetrics")` for more info - -
- -## In both - -* checking whether package ‘CRMetrics’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/CRMetrics/new/CRMetrics.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘CRMetrics’ ... -** package ‘CRMetrics’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘CRMetrics’ -* removing ‘/tmp/workdir/CRMetrics/new/CRMetrics.Rcheck/CRMetrics’ - - -``` -### CRAN - -``` -* installing *source* package ‘CRMetrics’ ... -** package ‘CRMetrics’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘CRMetrics’ -* removing ‘/tmp/workdir/CRMetrics/old/CRMetrics.Rcheck/CRMetrics’ - - -``` -# ctsem - -
- -* Version: 3.10.2 -* GitHub: https://github.com/cdriveraus/ctsem -* Source code: https://github.com/cran/ctsem -* Date/Publication: 2025-01-13 11:00:08 UTC -* Number of recursive dependencies: 160 - -Run `revdepcheck::cloud_details(, "ctsem")` for more info - -
- -## In both - -* checking whether package ‘ctsem’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/ctsem/new/ctsem.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘ctsem’ ... -** package ‘ctsem’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 - - -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here -/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ctsm.o] Error 1 -ERROR: compilation failed for package ‘ctsem’ -* removing ‘/tmp/workdir/ctsem/new/ctsem.Rcheck/ctsem’ - - -``` -### CRAN - -``` -* installing *source* package ‘ctsem’ ... -** package ‘ctsem’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 - - -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ctsm_namespace::model_ctsm; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here -/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ctsm.o] Error 1 -ERROR: compilation failed for package ‘ctsem’ -* removing ‘/tmp/workdir/ctsem/old/ctsem.Rcheck/ctsem’ - - -``` -# dartR.base - -
- -* Version: 0.98 -* GitHub: NA -* Source code: https://github.com/cran/dartR.base -* Date/Publication: 2024-09-19 13:20:02 UTC -* Number of recursive dependencies: 288 - -Run `revdepcheck::cloud_details(, "dartR.base")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/dartR.base/new/dartR.base.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘dartR.base/DESCRIPTION’ ... OK -... -* this is package ‘dartR.base’ version ‘0.98’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘SNPassoc’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/dartR.base/old/dartR.base.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘dartR.base/DESCRIPTION’ ... OK -... -* this is package ‘dartR.base’ version ‘0.98’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘SNPassoc’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# dartR.captive - -
- -* 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(, "dartR.captive")` for more info - -
- -## Error before installation - -### Devel - -``` -* 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 -... -* 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 - -``` -* 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 -... -* 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 - - - - - -``` -# dartR.popgen - -
- -* 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(, "dartR.popgen")` for more info - -
- -## Error before installation - -### Devel - -``` -* 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 - -``` -* 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 - - - - - -``` -# dartR.sexlinked - -
- -* 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(, "dartR.sexlinked")` for more info - -
- -## Error before installation - -### Devel - -``` -* 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 - - - - - -``` -### CRAN - -``` -* 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 - - - - - -``` -# dartR.sim - -
- -* 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(, "dartR.sim")` for more info - -
- -## Error before installation - -### Devel - -``` -* 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 - -``` -* 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 - - - - - -``` -# dartR.spatial - -
- -* Version: 0.78 -* GitHub: NA -* 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(, "dartR.spatial")` for more info - -
- -## Error before installation - -### Devel - -``` -* 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 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.spatial/DESCRIPTION’ ... OK -... -* this is package ‘dartR.spatial’ version ‘0.78’ -* 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 - -``` -* 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 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.spatial/DESCRIPTION’ ... OK -... -* this is package ‘dartR.spatial’ version ‘0.78’ -* 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 - - - - - -``` -# DepthProc - -
- -* Version: 2.1.5 -* GitHub: https://github.com/zzawadz/DepthProc -* Source code: https://github.com/cran/DepthProc -* Date/Publication: 2022-02-03 20:30:02 UTC -* Number of recursive dependencies: 133 - -Run `revdepcheck::cloud_details(, "DepthProc")` for more info - -
- -## In both - -* checking whether package ‘DepthProc’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/DepthProc/new/DepthProc.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘DepthProc’ ... -** package ‘DepthProc’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Depth.cpp -o Depth.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationEstimators.cpp -o LocationEstimators.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepth.cpp -o LocationScaleDepth.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepthCPP.cpp -o LocationScaleDepthCPP.o -... -installing to /tmp/workdir/DepthProc/new/DepthProc.Rcheck/00LOCK-DepthProc/00new/DepthProc/libs -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘DepthProc’ -* removing ‘/tmp/workdir/DepthProc/new/DepthProc.Rcheck/DepthProc’ - - -``` -### CRAN - -``` -* installing *source* package ‘DepthProc’ ... -** package ‘DepthProc’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Depth.cpp -o Depth.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationEstimators.cpp -o LocationEstimators.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepth.cpp -o LocationScaleDepth.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c LocationScaleDepthCPP.cpp -o LocationScaleDepthCPP.o -... -installing to /tmp/workdir/DepthProc/old/DepthProc.Rcheck/00LOCK-DepthProc/00new/DepthProc/libs -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘DepthProc’ -* removing ‘/tmp/workdir/DepthProc/old/DepthProc.Rcheck/DepthProc’ - - -``` -# DFD - -
- -* 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(, "DFD")` for more info - -
- -## Error before installation - -### 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 - - - - - -``` -### 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 - - - - - -``` -# dMrs - -
- -* Version: 1.0.0 -* GitHub: NA -* 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(, "dMrs")` for more info - -
- -## Error before installation - -### 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 - - - - - -``` -### 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 - - - - - -``` -# DR.SC - -
- -* 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(, "DR.SC")` 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 - -### Devel - -``` -* 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 -** 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’ - - -``` -### CRAN - -``` -* 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 -** 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’ - - -``` -# dscoreMSM - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/dscoreMSM -* Date/Publication: 2024-12-13 16:40:02 UTC -* Number of recursive dependencies: 121 - -Run `revdepcheck::cloud_details(, "dscoreMSM")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/dscoreMSM/new/dscoreMSM.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘dscoreMSM/DESCRIPTION’ ... OK -... -* checking installed files from ‘inst/doc’ ... OK -* checking files in ‘vignettes’ ... OK -* checking examples ... OK -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘dscoreMSM.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: OK - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/dscoreMSM/old/dscoreMSM.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘dscoreMSM/DESCRIPTION’ ... OK -... -* checking installed files from ‘inst/doc’ ... OK -* checking files in ‘vignettes’ ... OK -* checking examples ... OK -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘dscoreMSM.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: OK - - - - - -``` -# DynForest - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/DynForest -* Number of recursive dependencies: 143 - -Run `revdepcheck::cloud_details(, "DynForest")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# easybgm - -
- -* Version: 0.2.1 -* GitHub: https://github.com/KarolineHuth/easybgm -* Source code: https://github.com/cran/easybgm -* Date/Publication: 2024-10-17 08:30:02 UTC -* Number of recursive dependencies: 180 - -Run `revdepcheck::cloud_details(, "easybgm")` for more info - -
- -## In both - -* checking whether package ‘easybgm’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/easybgm/new/easybgm.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘easybgm’ ... -** package ‘easybgm’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘easybgm’ -* removing ‘/tmp/workdir/easybgm/new/easybgm.Rcheck/easybgm’ - - -``` -### CRAN - -``` -* installing *source* package ‘easybgm’ ... -** package ‘easybgm’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘easybgm’ -* removing ‘/tmp/workdir/easybgm/old/easybgm.Rcheck/easybgm’ - - -``` -# EcoEnsemble - -
- -* Version: 1.1.0 -* GitHub: https://github.com/CefasRepRes/EcoEnsemble -* Source code: https://github.com/cran/EcoEnsemble -* Date/Publication: 2024-08-19 17:20:06 UTC -* Number of recursive dependencies: 90 - -Run `revdepcheck::cloud_details(, "EcoEnsemble")` for more info - -
- -## In both - -* checking whether package ‘EcoEnsemble’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘EcoEnsemble’ ... -** package ‘EcoEnsemble’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 - - -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o -In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ensemble_model_hierarchical_namespace::model_ensemble_model_hierarchical; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here -/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ensemble_model_hierarchical.o] Error 1 -ERROR: compilation failed for package ‘EcoEnsemble’ -* removing ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/EcoEnsemble’ - - -``` -### CRAN - -``` -* installing *source* package ‘EcoEnsemble’ ... -** package ‘EcoEnsemble’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 - - -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o -In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ensemble_model_hierarchical_namespace::model_ensemble_model_hierarchical; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here -/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ensemble_model_hierarchical.o] Error 1 -ERROR: compilation failed for package ‘EcoEnsemble’ -* removing ‘/tmp/workdir/EcoEnsemble/old/EcoEnsemble.Rcheck/EcoEnsemble’ - - -``` -# ecolottery - -
- -* Version: 1.0.0 -* GitHub: https://github.com/frmunoz/ecolottery -* Source code: https://github.com/cran/ecolottery -* Date/Publication: 2017-07-03 11:01:29 UTC -* Number of recursive dependencies: 87 - -Run `revdepcheck::cloud_details(, "ecolottery")` for more info - -
- -## In both - -* checking whether package ‘ecolottery’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘ecolottery’ ... -** package ‘ecolottery’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘ecolottery’ -* removing ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/ecolottery’ - - -``` -### CRAN - -``` -* installing *source* package ‘ecolottery’ ... -** package ‘ecolottery’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘ecolottery’ -* removing ‘/tmp/workdir/ecolottery/old/ecolottery.Rcheck/ecolottery’ - - -``` -# EpiEstim - -
- -* Version: 2.2-4 -* GitHub: https://github.com/mrc-ide/EpiEstim -* Source code: https://github.com/cran/EpiEstim -* Date/Publication: 2021-01-07 16:20:10 UTC -* Number of recursive dependencies: 90 - -Run `revdepcheck::cloud_details(, "EpiEstim")` for more info - -
- -## In both - -* checking whether package ‘EpiEstim’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/EpiEstim/new/EpiEstim.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘EpiEstim’ ... -** package ‘EpiEstim’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘EpiEstim’ -* removing ‘/tmp/workdir/EpiEstim/new/EpiEstim.Rcheck/EpiEstim’ - - -``` -### CRAN - -``` -* installing *source* package ‘EpiEstim’ ... -** package ‘EpiEstim’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘EpiEstim’ -* removing ‘/tmp/workdir/EpiEstim/old/EpiEstim.Rcheck/EpiEstim’ - - -``` -# evolqg - -
- -* Version: 0.3-4 -* GitHub: https://github.com/lem-usp/evolqg -* Source code: https://github.com/cran/evolqg -* Date/Publication: 2023-12-05 15:20:12 UTC -* Number of recursive dependencies: 110 - -Run `revdepcheck::cloud_details(, "evolqg")` for more info - -
- -## In both - -* checking whether package ‘evolqg’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/evolqg/new/evolqg.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘evolqg’ ... -** package ‘evolqg’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c fast_RS.cpp -o fast_RS.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o evolqg.so RcppExports.o fast_RS.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/evolqg/new/evolqg.Rcheck/00LOCK-evolqg/00new/evolqg/libs -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘evolqg’ -* removing ‘/tmp/workdir/evolqg/new/evolqg.Rcheck/evolqg’ - - -``` -### CRAN - -``` -* installing *source* package ‘evolqg’ ... -** package ‘evolqg’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c fast_RS.cpp -o fast_RS.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o evolqg.so RcppExports.o fast_RS.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/evolqg/old/evolqg.Rcheck/00LOCK-evolqg/00new/evolqg/libs -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘evolqg’ -* removing ‘/tmp/workdir/evolqg/old/evolqg.Rcheck/evolqg’ - - -``` -# EWSmethods - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/EWSmethods -* Number of recursive dependencies: 139 - -Run `revdepcheck::cloud_details(, "EWSmethods")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# flexrsurv - -
- -* Version: 2.0.18 -* GitHub: NA -* 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(, "flexrsurv")` for more info - -
- -## Error before installation - -### Devel - -``` -* 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 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 ‘flexrsurv/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: OK - - - - - -``` -### CRAN - -``` -* 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 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 ‘flexrsurv/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: OK - - - - - -``` -# fmx - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/fmx -* Number of recursive dependencies: 93 - -Run `revdepcheck::cloud_details(, "fmx")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# ForecastComb - -
- -* Version: 1.3.1 -* GitHub: https://github.com/ceweiss/ForecastComb -* Source code: https://github.com/cran/ForecastComb -* Date/Publication: 2018-08-07 13:50:08 UTC -* Number of recursive dependencies: 73 - -Run `revdepcheck::cloud_details(, "ForecastComb")` for more info - -
- -## In both - -* checking whether package ‘ForecastComb’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/ForecastComb/new/ForecastComb.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘ForecastComb’ ... -** package ‘ForecastComb’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘ForecastComb’ -* removing ‘/tmp/workdir/ForecastComb/new/ForecastComb.Rcheck/ForecastComb’ - - -``` -### CRAN - -``` -* installing *source* package ‘ForecastComb’ ... -** package ‘ForecastComb’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘ForecastComb’ -* removing ‘/tmp/workdir/ForecastComb/old/ForecastComb.Rcheck/ForecastComb’ - - -``` -# gap - -
- -* 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 - -
- -## 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) - - -``` -# invivoPKfit - -
- -* Version: 2.0.0 -* GitHub: NA -* Source code: https://github.com/cran/invivoPKfit -* Date/Publication: 2025-01-09 14:30:02 UTC -* Number of recursive dependencies: 172 - -Run `revdepcheck::cloud_details(, "invivoPKfit")` for more info - -
- -## In both - -* checking whether package ‘invivoPKfit’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/invivoPKfit/new/invivoPKfit.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘invivoPKfit’ ... -** package ‘invivoPKfit’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: object ‘expand1’ is not exported by 'namespace:Matrix' -Execution halted -ERROR: lazy loading failed for package ‘invivoPKfit’ -* removing ‘/tmp/workdir/invivoPKfit/new/invivoPKfit.Rcheck/invivoPKfit’ - - -``` -### CRAN - -``` -* installing *source* package ‘invivoPKfit’ ... -** package ‘invivoPKfit’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: object ‘expand1’ is not exported by 'namespace:Matrix' -Execution halted -ERROR: lazy loading failed for package ‘invivoPKfit’ -* removing ‘/tmp/workdir/invivoPKfit/old/invivoPKfit.Rcheck/invivoPKfit’ - - -``` -# iNZightPlots - -
- -* Version: 2.15.3 -* GitHub: https://github.com/iNZightVIT/iNZightPlots -* Source code: https://github.com/cran/iNZightPlots -* Date/Publication: 2023-10-14 05:00:02 UTC -* Number of recursive dependencies: 161 - -Run `revdepcheck::cloud_details(, "iNZightPlots")` for more info - -
- -## In both - -* checking whether package ‘iNZightPlots’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/iNZightPlots/new/iNZightPlots.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘iNZightPlots’ ... -** package ‘iNZightPlots’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘iNZightPlots’ -* removing ‘/tmp/workdir/iNZightPlots/new/iNZightPlots.Rcheck/iNZightPlots’ - - -``` -### CRAN - -``` -* installing *source* package ‘iNZightPlots’ ... -** package ‘iNZightPlots’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘iNZightPlots’ -* removing ‘/tmp/workdir/iNZightPlots/old/iNZightPlots.Rcheck/iNZightPlots’ - - -``` -# iNZightRegression - -
- -* Version: 1.3.4 -* GitHub: https://github.com/iNZightVIT/iNZightRegression -* Source code: https://github.com/cran/iNZightRegression -* Date/Publication: 2024-04-05 02:32:59 UTC -* Number of recursive dependencies: 162 - -Run `revdepcheck::cloud_details(, "iNZightRegression")` for more info - -
- -## In both - -* checking whether package ‘iNZightRegression’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/iNZightRegression/new/iNZightRegression.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘iNZightRegression’ ... -** package ‘iNZightRegression’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘iNZightRegression’ -* removing ‘/tmp/workdir/iNZightRegression/new/iNZightRegression.Rcheck/iNZightRegression’ - - -``` -### CRAN - -``` -* installing *source* package ‘iNZightRegression’ ... -** package ‘iNZightRegression’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘iNZightRegression’ -* removing ‘/tmp/workdir/iNZightRegression/old/iNZightRegression.Rcheck/iNZightRegression’ - - -``` -# IRexamples - -
- -* Version: 0.0.4 -* 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: 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 - -
- -* 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 ‘joineRML’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/joineRML/new/joineRML.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘joineRML’ ... -** package ‘joineRML’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c expW.cpp -o expW.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gammaUpdate.cpp -o gammaUpdate.o -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘joineRML’ -* removing ‘/tmp/workdir/joineRML/new/joineRML.Rcheck/joineRML’ - - -``` -### CRAN - -``` -* installing *source* package ‘joineRML’ ... -** package ‘joineRML’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c expW.cpp -o expW.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gammaUpdate.cpp -o gammaUpdate.o -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘joineRML’ -* removing ‘/tmp/workdir/joineRML/old/joineRML.Rcheck/joineRML’ - - -``` -# jsmodule - -
- -* Version: 1.6.1 -* GitHub: https://github.com/jinseob2kim/jsmodule -* Source code: https://github.com/cran/jsmodule -* Date/Publication: 2025-01-08 13:10:02 UTC -* Number of recursive dependencies: 241 - -Run `revdepcheck::cloud_details(, "jsmodule")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/jsmodule/new/jsmodule.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘jsmodule/DESCRIPTION’ ... OK -... -* checking tests ... OK - Running ‘testthat.R’ -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘jsmodule.Rmd’ using ‘UTF-8’... OK - ‘jsmodule_subgroup_cmprsk.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: OK - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/jsmodule/old/jsmodule.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘jsmodule/DESCRIPTION’ ... OK -... -* checking tests ... OK - Running ‘testthat.R’ -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘jsmodule.Rmd’ using ‘UTF-8’... OK - ‘jsmodule_subgroup_cmprsk.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: OK - - - - - -``` -# kmc - -
- -* Version: 0.4-2 -* GitHub: https://github.com/yfyang86/kmc -* Source code: https://github.com/cran/kmc -* Date/Publication: 2022-11-22 08:30:02 UTC -* Number of recursive dependencies: 60 - -Run `revdepcheck::cloud_details(, "kmc")` for more info - -
- -## In both - -* checking whether package ‘kmc’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/kmc/new/kmc.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘kmc’ ... -** package ‘kmc’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExport.cpp -o RcppExport.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc.cpp -o kmc.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc_init.c -o kmc_init.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c surv2.c -o surv2.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o kmc.so RcppExport.o kmc.o kmc_init.o surv2.o -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/kmc/new/kmc.Rcheck/00LOCK-kmc/00new/kmc/libs -** R -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘emplik’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘kmc’ -* removing ‘/tmp/workdir/kmc/new/kmc.Rcheck/kmc’ - - -``` -### CRAN - -``` -* installing *source* package ‘kmc’ ... -** package ‘kmc’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExport.cpp -o RcppExport.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc.cpp -o kmc.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c kmc_init.c -o kmc_init.o -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c surv2.c -o surv2.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o kmc.so RcppExport.o kmc.o kmc_init.o surv2.o -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/kmc/old/kmc.Rcheck/00LOCK-kmc/00new/kmc/libs -** R -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘emplik’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘kmc’ -* removing ‘/tmp/workdir/kmc/old/kmc.Rcheck/kmc’ - - -``` -# KMunicate - -
- -* Version: 0.2.5 -* GitHub: https://github.com/ellessenne/KMunicate-package -* Source code: https://github.com/cran/KMunicate -* Date/Publication: 2024-05-16 11:50:08 UTC -* Number of recursive dependencies: 171 - -Run `revdepcheck::cloud_details(, "KMunicate")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/KMunicate/new/KMunicate.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘KMunicate/DESCRIPTION’ ... OK -... -* checking for unstated dependencies in ‘tests’ ... OK -* checking tests ... OK - Running ‘testthat.R’ -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘KMunicate.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: OK - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/KMunicate/old/KMunicate.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘KMunicate/DESCRIPTION’ ... OK -... -* checking for unstated dependencies in ‘tests’ ... OK -* checking tests ... OK - Running ‘testthat.R’ -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘KMunicate.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: OK - - - - - -``` -# 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 - -``` -* 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’ - - -``` -### 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’ - - -``` -# Landmarking - -
- -* Version: 1.0.0 -* GitHub: https://github.com/isobelbarrott/Landmarking -* Source code: https://github.com/cran/Landmarking -* Date/Publication: 2022-02-15 20:00:07 UTC -* Number of recursive dependencies: 122 - -Run `revdepcheck::cloud_details(, "Landmarking")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/Landmarking/new/Landmarking.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘Landmarking/DESCRIPTION’ ... OK -... -* this is package ‘Landmarking’ version ‘1.0.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘riskRegression’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/Landmarking/old/Landmarking.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘Landmarking/DESCRIPTION’ ... OK -... -* this is package ‘Landmarking’ version ‘1.0.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘riskRegression’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# lavaSearch2 - -
- -* Version: 2.0.3 -* GitHub: https://github.com/bozenne/lavaSearch2 -* Source code: https://github.com/cran/lavaSearch2 -* Date/Publication: 2024-02-23 09:10:02 UTC -* Number of recursive dependencies: 149 - -Run `revdepcheck::cloud_details(, "lavaSearch2")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/lavaSearch2/new/lavaSearch2.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘lavaSearch2/DESCRIPTION’ ... OK -... - [ FAIL 1 | WARN 1 | SKIP 0 | PASS 266 ] - Error: Test failures - Execution halted -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... NONE - ‘overview.pdf.asis’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 ERROR, 1 NOTE - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/lavaSearch2/old/lavaSearch2.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘lavaSearch2/DESCRIPTION’ ... OK -... - [ FAIL 1 | WARN 1 | SKIP 0 | PASS 266 ] - Error: Test failures - Execution halted -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... NONE - ‘overview.pdf.asis’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 ERROR, 1 NOTE - - - - - -``` -# llbayesireg - -
- -* Version: 1.0.0 -* GitHub: NA -* Source code: https://github.com/cran/llbayesireg -* Date/Publication: 2019-04-04 16:20:03 UTC -* Number of recursive dependencies: 60 - -Run `revdepcheck::cloud_details(, "llbayesireg")` for more info - -
- -## In both - -* checking whether package ‘llbayesireg’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/llbayesireg/new/llbayesireg.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘llbayesireg’ ... -** package ‘llbayesireg’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘llbayesireg’ -* removing ‘/tmp/workdir/llbayesireg/new/llbayesireg.Rcheck/llbayesireg’ - - -``` -### CRAN - -``` -* installing *source* package ‘llbayesireg’ ... -** package ‘llbayesireg’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘llbayesireg’ -* removing ‘/tmp/workdir/llbayesireg/old/llbayesireg.Rcheck/llbayesireg’ - - -``` -# lnmixsurv - -
- -* Version: 3.1.6 -* GitHub: NA -* Source code: https://github.com/cran/lnmixsurv -* Date/Publication: 2024-09-03 15:20:08 UTC -* Number of recursive dependencies: 195 - -Run `revdepcheck::cloud_details(, "lnmixsurv")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/lnmixsurv/new/lnmixsurv.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘lnmixsurv/DESCRIPTION’ ... OK -... ---- finished re-building ‘parallel_computation.Rmd’ - -SUMMARY: processing the following file failed: - ‘expectation_maximization.Rmd’ - -Error: Vignette re-building failed. -Execution halted - -* DONE -Status: 2 ERRORs, 5 NOTEs - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/lnmixsurv/old/lnmixsurv.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘lnmixsurv/DESCRIPTION’ ... OK -... -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘compare.Rmd’ using ‘UTF-8’... OK - ‘expectation_maximization.Rmd’ using ‘UTF-8’... OK - ‘intercept_only.Rmd’ using ‘UTF-8’... OK - ‘lnmixsurv.Rmd’ using ‘UTF-8’... OK - ‘parallel_computation.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 4 NOTEs - - - - - -``` -# LorenzRegression - -
- -* Version: 2.1.0 -* GitHub: https://github.com/AlJacq/LorenzRegression -* Source code: https://github.com/cran/LorenzRegression -* Date/Publication: 2024-10-11 16:50:02 UTC -* Number of recursive dependencies: 83 - -Run `revdepcheck::cloud_details(, "LorenzRegression")` for more info - -
- -## In both - -* checking whether package ‘LorenzRegression’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/LorenzRegression/new/LorenzRegression.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘LorenzRegression’ ... -** package ‘LorenzRegression’ 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 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 -** 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 ‘LorenzRegression’ -* removing ‘/tmp/workdir/LorenzRegression/new/LorenzRegression.Rcheck/LorenzRegression’ - - -``` -### CRAN - -``` -* installing *source* package ‘LorenzRegression’ ... -** package ‘LorenzRegression’ 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 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 -** 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 ‘LorenzRegression’ -* removing ‘/tmp/workdir/LorenzRegression/old/LorenzRegression.Rcheck/LorenzRegression’ - - -``` -# lsirm12pl - -
- -* Version: 1.3.3 -* GitHub: NA -* Source code: https://github.com/cran/lsirm12pl -* Date/Publication: 2024-08-28 23:00:02 UTC -* Number of recursive dependencies: 123 - -Run `revdepcheck::cloud_details(, "lsirm12pl")` for more info - -
- -## In both - -* checking whether package ‘lsirm12pl’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/lsirm12pl/new/lsirm12pl.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘lsirm12pl’ ... -** package ‘lsirm12pl’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl.cpp -o lsirm1pl.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm2pl.cpp -o lsirm2pl.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsm.cpp -o lsm.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c utility_cpp.cpp -o utility_cpp.o -... -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘lsirm12pl’ -* removing ‘/tmp/workdir/lsirm12pl/new/lsirm12pl.Rcheck/lsirm12pl’ - - -``` -### CRAN - -``` -* installing *source* package ‘lsirm12pl’ ... -** package ‘lsirm12pl’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl.cpp -o lsirm1pl.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm2pl.cpp -o lsirm2pl.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsm.cpp -o lsm.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c utility_cpp.cpp -o utility_cpp.o -... -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘lsirm12pl’ -* removing ‘/tmp/workdir/lsirm12pl/old/lsirm12pl.Rcheck/lsirm12pl’ - - -``` -# MantaID - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/MantaID -* Number of recursive dependencies: 157 - -Run `revdepcheck::cloud_details(, "MantaID")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# MARVEL - -
- -* Version: 1.4.0 -* GitHub: NA -* Source code: https://github.com/cran/MARVEL -* Date/Publication: 2022-10-31 10:22:50 UTC -* Number of recursive dependencies: 229 - -Run `revdepcheck::cloud_details(, "MARVEL")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/MARVEL/new/MARVEL.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 ‘MARVEL/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 - ‘MARVEL.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 NOTE - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/MARVEL/old/MARVEL.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 ‘MARVEL/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 - ‘MARVEL.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -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 - -
- -* Version: 3.0 -* GitHub: NA -* Source code: https://github.com/cran/mbsts -* Date/Publication: 2023-01-07 01:10:02 UTC -* Number of recursive dependencies: 81 - -Run `revdepcheck::cloud_details(, "mbsts")` for more info - -
- -## In both - -* checking whether package ‘mbsts’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/mbsts/new/mbsts.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘mbsts’ ... -** package ‘mbsts’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘mbsts’ -* removing ‘/tmp/workdir/mbsts/new/mbsts.Rcheck/mbsts’ - - -``` -### CRAN - -``` -* installing *source* package ‘mbsts’ ... -** package ‘mbsts’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘mbsts’ -* removing ‘/tmp/workdir/mbsts/old/mbsts.Rcheck/mbsts’ - - -``` -# MendelianRandomization - -
- -* Version: 0.10.0 -* GitHub: NA -* 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(, "MendelianRandomization")` for more info - -
- -## In both - -* 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 - -``` -* 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’ - - -``` -# miWQS - -
- -* Version: 0.4.4 -* GitHub: https://github.com/phargarten2/miWQS -* Source code: https://github.com/cran/miWQS -* Date/Publication: 2021-04-02 21:50:02 UTC -* Number of recursive dependencies: 151 - -Run `revdepcheck::cloud_details(, "miWQS")` for more info - -
- -## In both - -* checking whether package ‘miWQS’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/miWQS/new/miWQS.Rcheck/00install.out’ for details. - ``` - -* checking package dependencies ... NOTE - ``` - Package suggested but not available for checking: ‘wqs’ - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘miWQS’ ... -** package ‘miWQS’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘miWQS’ -* removing ‘/tmp/workdir/miWQS/new/miWQS.Rcheck/miWQS’ - - -``` -### CRAN - -``` -* installing *source* package ‘miWQS’ ... -** package ‘miWQS’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘miWQS’ -* removing ‘/tmp/workdir/miWQS/old/miWQS.Rcheck/miWQS’ - - -``` -# mlmts - -
- -* Version: 1.1.2 -* GitHub: NA -* Source code: https://github.com/cran/mlmts -* Date/Publication: 2024-08-18 08:40:06 UTC -* Number of recursive dependencies: 244 - -Run `revdepcheck::cloud_details(, "mlmts")` for more info - -
- -## In both - -* checking whether package ‘mlmts’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/mlmts/new/mlmts.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘mlmts’ ... -** package ‘mlmts’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error : package or namespace load failed for ‘quantspec’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Error: unable to load R code in package ‘mlmts’ -Execution halted -ERROR: lazy loading failed for package ‘mlmts’ -* removing ‘/tmp/workdir/mlmts/new/mlmts.Rcheck/mlmts’ - - -``` -### CRAN - -``` -* installing *source* package ‘mlmts’ ... -** package ‘mlmts’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error : package or namespace load failed for ‘quantspec’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Error: unable to load R code in package ‘mlmts’ -Execution halted -ERROR: lazy loading failed for package ‘mlmts’ -* removing ‘/tmp/workdir/mlmts/old/mlmts.Rcheck/mlmts’ - - -``` -# mlr - -
- -* Version: 2.19.2 -* GitHub: https://github.com/mlr-org/mlr -* Source code: https://github.com/cran/mlr -* Date/Publication: 2024-06-12 10:50:02 UTC -* Number of recursive dependencies: 365 - -Run `revdepcheck::cloud_details(, "mlr")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/mlr/new/mlr.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘mlr/DESCRIPTION’ ... OK -... -* checking for unstated dependencies in ‘tests’ ... OK -* checking tests ... OK - Running ‘testthat.R’ -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘mlr.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 1 WARNING, 3 NOTEs - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/mlr/old/mlr.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘mlr/DESCRIPTION’ ... OK -... -* checking for unstated dependencies in ‘tests’ ... OK -* checking tests ... OK - Running ‘testthat.R’ -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘mlr.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 2 NOTEs - - - - - -``` -# MRZero - -
- -* Version: 0.2.0 -* GitHub: NA -* Source code: https://github.com/cran/MRZero -* Date/Publication: 2024-04-14 09:30:03 UTC -* Number of recursive dependencies: 82 - -Run `revdepcheck::cloud_details(, "MRZero")` for more info - -
- -## In both - -* checking whether package ‘MRZero’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/MRZero/new/MRZero.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘MRZero’ ... -** package ‘MRZero’ 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 ‘MRZero’ -* removing ‘/tmp/workdir/MRZero/new/MRZero.Rcheck/MRZero’ - - -``` -### CRAN - -``` -* installing *source* package ‘MRZero’ ... -** package ‘MRZero’ 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 ‘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 - -
- -* Version: 0.1.1 -* GitHub: https://github.com/JWiley/multilevelTools -* Source code: https://github.com/cran/multilevelTools -* Date/Publication: 2020-03-04 09:50:02 UTC -* Number of recursive dependencies: 170 - -Run `revdepcheck::cloud_details(, "multilevelTools")` for more info - -
- -## In both - -* checking whether package ‘multilevelTools’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/multilevelTools/new/multilevelTools.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘multilevelTools’ ... -** package ‘multilevelTools’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘multilevelTools’ -* removing ‘/tmp/workdir/multilevelTools/new/multilevelTools.Rcheck/multilevelTools’ - - -``` -### CRAN - -``` -* installing *source* package ‘multilevelTools’ ... -** package ‘multilevelTools’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘multilevelTools’ -* removing ‘/tmp/workdir/multilevelTools/old/multilevelTools.Rcheck/multilevelTools’ - - -``` -# multinma - -
- -* Version: 0.7.2 -* GitHub: https://github.com/dmphillippo/multinma -* Source code: https://github.com/cran/multinma -* Date/Publication: 2024-09-16 12:20:02 UTC -* Number of recursive dependencies: 151 - -Run `revdepcheck::cloud_details(, "multinma")` for more info - -
- -## In both - -* checking whether package ‘multinma’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/multinma/new/multinma.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘multinma’ ... -** package ‘multinma’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 - - -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_survival_param_namespace::model_survival_param; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here -/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_survival_param.o] Error 1 -ERROR: compilation failed for package ‘multinma’ -* removing ‘/tmp/workdir/multinma/new/multinma.Rcheck/multinma’ - - -``` -### CRAN - -``` -* installing *source* package ‘multinma’ ... -** package ‘multinma’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 - - -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_survival_param_namespace::model_survival_param; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’ -/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:0: required from here -/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_survival_param.o] Error 1 -ERROR: compilation failed for package ‘multinma’ -* removing ‘/tmp/workdir/multinma/old/multinma.Rcheck/multinma’ - - -``` -# 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 - - - - - -``` -### CRAN - -``` -* 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 - - - - - -``` -# NCA - -
- -* Version: 4.0.2 -* GitHub: NA -* Source code: https://github.com/cran/NCA -* Date/Publication: 2024-11-09 18:10:02 UTC -* Number of recursive dependencies: 98 - -Run `revdepcheck::cloud_details(, "NCA")` for more info - -
- -## In both - -* checking whether package ‘NCA’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/NCA/new/NCA.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘NCA’ ... -** package ‘NCA’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘NCA’ -* removing ‘/tmp/workdir/NCA/new/NCA.Rcheck/NCA’ - - -``` -### CRAN - -``` -* installing *source* package ‘NCA’ ... -** package ‘NCA’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘NCA’ -* removing ‘/tmp/workdir/NCA/old/NCA.Rcheck/NCA’ - - -``` -# netcmc - -
- -* Version: 1.0.2 -* GitHub: NA -* Source code: https://github.com/cran/netcmc -* Date/Publication: 2022-11-08 22:30:15 UTC -* Number of recursive dependencies: 60 - -Run `revdepcheck::cloud_details(, "netcmc")` for more info - -
- -## In both - -* checking whether package ‘netcmc’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/netcmc/new/netcmc.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘netcmc’ ... -** package ‘netcmc’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c choleskyDecompositionRcppConversion.cpp -o choleskyDecompositionRcppConversion.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleMatrixMultiplicationRcpp.cpp -o doubleMatrixMultiplicationRcpp.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleVectorMultiplicationRcpp.cpp -o doubleVectorMultiplicationRcpp.o -... -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c vectorVectorTransposeMultiplicationRcpp.cpp -o vectorVectorTransposeMultiplicationRcpp.o -g++ -std=gnu++11 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o netcmc.so RcppExports.o choleskyDecompositionRcppConversion.o doubleMatrixMultiplicationRcpp.o doubleVectorMultiplicationRcpp.o eigenValuesRcppConversion.o getDiagonalMatrix.o getExp.o getExpDividedByOnePlusExp.o getMeanCenteredRandomEffects.o getMultivariateBinomialNetworkLerouxDIC.o getMultivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariateGaussianNetworkLerouxDIC.o getMultivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariatePoissonNetworkLerouxDIC.o getMultivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getNonZeroEntries.o getSubvector.o getSubvectorIndecies.o getSumExpNetwork.o getSumExpNetworkIndecies.o getSumExpNetworkLeroux.o getSumExpNetworkLerouxIndecies.o getSumLogExp.o getSumLogExpIndecies.o getSumVector.o getTripletForm.o getUnivariateBinomialNetworkLerouxDIC.o getUnivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariateGaussianNetworkLerouxDIC.o getUnivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkDIC.o getUnivariatePoissonNetworkFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkLerouxDIC.o getUnivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getVectorMean.o matrixInverseRcppConversion.o matrixMatrixAdditionRcpp.o matrixMatrixSubtractionRcpp.o matrixVectorMultiplicationRcpp.o multivariateBinomialNetworkLerouxAllUpdate.o multivariateBinomialNetworkLerouxBetaUpdate.o multivariateBinomialNetworkLerouxRhoUpdate.o multivariateBinomialNetworkLerouxSingleUpdate.o multivariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o multivariateBinomialNetworkLerouxTauSquaredUpdate.o multivariateBinomialNetworkLerouxURandomEffectsUpdate.o multivariateBinomialNetworkLerouxVRandomEffectsUpdate.o multivariateBinomialNetworkLerouxVarianceCovarianceUUpdate.o multivariateBinomialNetworkRandAllUpdate.o multivariateBinomialNetworkRandSingleUpdate.o multivariateGaussianNetworkLerouxAllMHUpdate.o multivariateGaussianNetworkLerouxBetaUpdate.o multivariateGaussianNetworkLerouxRhoUpdate.o multivariateGaussianNetworkLerouxSigmaSquaredEUpdate.o multivariateGaussianNetworkLerouxSingleMHUpdate.o multivariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o multivariateGaussianNetworkLerouxTauSquaredUpdate.o multivariateGaussianNetworkLerouxURandomEffectsUpdate.o multivariateGaussianNetworkLerouxVarianceCovarianceUUpdate.o multivariateGaussianNetworkRandAllUpdate.o multivariateGaussianNetworkRandSingleUpdate.o multivariateGaussianNetworkRandVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxAllUpdate.o multivariatePoissonNetworkLerouxBetaUpdate.o multivariatePoissonNetworkLerouxRhoUpdate.o multivariatePoissonNetworkLerouxSingleUpdate.o multivariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o multivariatePoissonNetworkLerouxTauSquaredUpdate.o multivariatePoissonNetworkLerouxURandomEffectsUpdate.o multivariatePoissonNetworkLerouxVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxVarianceCovarianceUUpdate.o multivariatePoissonNetworkRandAllUpdate.o multivariatePoissonNetworkRandSingleUpdate.o sumMatrix.o univariateBinomialNetworkLerouxAllUpdate.o univariateBinomialNetworkLerouxBetaUpdate.o univariateBinomialNetworkLerouxRhoUpdate.o univariateBinomialNetworkLerouxSigmaSquaredUpdate.o univariateBinomialNetworkLerouxSingleUpdate.o univariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o univariateBinomialNetworkLerouxTauSquaredUpdate.o univariateBinomialNetworkLerouxURandomEffectsUpdate.o univariateGaussianNetworkLerouxAllMHUpdate.o univariateGaussianNetworkLerouxBetaUpdate.o univariateGaussianNetworkLerouxRhoUpdate.o univariateGaussianNetworkLerouxSigmaSquaredEUpdate.o univariateGaussianNetworkLerouxSigmaSquaredUUpdate.o univariateGaussianNetworkLerouxSingleMHUpdate.o univariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o univariateGaussianNetworkLerouxTauSquaredUpdate.o univariateGaussianNetworkLerouxURandomEffectsUpdate.o univariatePoissonNetworkLerouxAllUpdate.o univariatePoissonNetworkLerouxBetaUpdate.o univariatePoissonNetworkLerouxRhoUpdate.o univariatePoissonNetworkLerouxSigmaSquaredUpdate.o univariatePoissonNetworkLerouxSingleUpdate.o univariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o univariatePoissonNetworkLerouxTauSquaredUpdate.o univariatePoissonNetworkLerouxURandomEffectsUpdate.o vectorTransposeVectorMultiplicationRcpp.o vectorVectorTransposeMultiplicationRcpp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/netcmc/new/netcmc.Rcheck/00LOCK-netcmc/00new/netcmc/libs -** R -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘MCMCpack’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘netcmc’ -* removing ‘/tmp/workdir/netcmc/new/netcmc.Rcheck/netcmc’ - - -``` -### CRAN - -``` -* installing *source* package ‘netcmc’ ... -** package ‘netcmc’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c choleskyDecompositionRcppConversion.cpp -o choleskyDecompositionRcppConversion.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleMatrixMultiplicationRcpp.cpp -o doubleMatrixMultiplicationRcpp.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c doubleVectorMultiplicationRcpp.cpp -o doubleVectorMultiplicationRcpp.o -... -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c vectorVectorTransposeMultiplicationRcpp.cpp -o vectorVectorTransposeMultiplicationRcpp.o -g++ -std=gnu++11 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o netcmc.so RcppExports.o choleskyDecompositionRcppConversion.o doubleMatrixMultiplicationRcpp.o doubleVectorMultiplicationRcpp.o eigenValuesRcppConversion.o getDiagonalMatrix.o getExp.o getExpDividedByOnePlusExp.o getMeanCenteredRandomEffects.o getMultivariateBinomialNetworkLerouxDIC.o getMultivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariateGaussianNetworkLerouxDIC.o getMultivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getMultivariatePoissonNetworkLerouxDIC.o getMultivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getNonZeroEntries.o getSubvector.o getSubvectorIndecies.o getSumExpNetwork.o getSumExpNetworkIndecies.o getSumExpNetworkLeroux.o getSumExpNetworkLerouxIndecies.o getSumLogExp.o getSumLogExpIndecies.o getSumVector.o getTripletForm.o getUnivariateBinomialNetworkLerouxDIC.o getUnivariateBinomialNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariateGaussianNetworkLerouxDIC.o getUnivariateGaussianNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkDIC.o getUnivariatePoissonNetworkFittedValuesAndLikelihoodForDICEveryIteration.o getUnivariatePoissonNetworkLerouxDIC.o getUnivariatePoissonNetworkLerouxFittedValuesAndLikelihoodForDICEveryIteration.o getVectorMean.o matrixInverseRcppConversion.o matrixMatrixAdditionRcpp.o matrixMatrixSubtractionRcpp.o matrixVectorMultiplicationRcpp.o multivariateBinomialNetworkLerouxAllUpdate.o multivariateBinomialNetworkLerouxBetaUpdate.o multivariateBinomialNetworkLerouxRhoUpdate.o multivariateBinomialNetworkLerouxSingleUpdate.o multivariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o multivariateBinomialNetworkLerouxTauSquaredUpdate.o multivariateBinomialNetworkLerouxURandomEffectsUpdate.o multivariateBinomialNetworkLerouxVRandomEffectsUpdate.o multivariateBinomialNetworkLerouxVarianceCovarianceUUpdate.o multivariateBinomialNetworkRandAllUpdate.o multivariateBinomialNetworkRandSingleUpdate.o multivariateGaussianNetworkLerouxAllMHUpdate.o multivariateGaussianNetworkLerouxBetaUpdate.o multivariateGaussianNetworkLerouxRhoUpdate.o multivariateGaussianNetworkLerouxSigmaSquaredEUpdate.o multivariateGaussianNetworkLerouxSingleMHUpdate.o multivariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o multivariateGaussianNetworkLerouxTauSquaredUpdate.o multivariateGaussianNetworkLerouxURandomEffectsUpdate.o multivariateGaussianNetworkLerouxVarianceCovarianceUUpdate.o multivariateGaussianNetworkRandAllUpdate.o multivariateGaussianNetworkRandSingleUpdate.o multivariateGaussianNetworkRandVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxAllUpdate.o multivariatePoissonNetworkLerouxBetaUpdate.o multivariatePoissonNetworkLerouxRhoUpdate.o multivariatePoissonNetworkLerouxSingleUpdate.o multivariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o multivariatePoissonNetworkLerouxTauSquaredUpdate.o multivariatePoissonNetworkLerouxURandomEffectsUpdate.o multivariatePoissonNetworkLerouxVRandomEffectsUpdate.o multivariatePoissonNetworkLerouxVarianceCovarianceUUpdate.o multivariatePoissonNetworkRandAllUpdate.o multivariatePoissonNetworkRandSingleUpdate.o sumMatrix.o univariateBinomialNetworkLerouxAllUpdate.o univariateBinomialNetworkLerouxBetaUpdate.o univariateBinomialNetworkLerouxRhoUpdate.o univariateBinomialNetworkLerouxSigmaSquaredUpdate.o univariateBinomialNetworkLerouxSingleUpdate.o univariateBinomialNetworkLerouxSpatialRandomEffectsUpdate.o univariateBinomialNetworkLerouxTauSquaredUpdate.o univariateBinomialNetworkLerouxURandomEffectsUpdate.o univariateGaussianNetworkLerouxAllMHUpdate.o univariateGaussianNetworkLerouxBetaUpdate.o univariateGaussianNetworkLerouxRhoUpdate.o univariateGaussianNetworkLerouxSigmaSquaredEUpdate.o univariateGaussianNetworkLerouxSigmaSquaredUUpdate.o univariateGaussianNetworkLerouxSingleMHUpdate.o univariateGaussianNetworkLerouxSpatialRandomEffectsMHUpdate.o univariateGaussianNetworkLerouxTauSquaredUpdate.o univariateGaussianNetworkLerouxURandomEffectsUpdate.o univariatePoissonNetworkLerouxAllUpdate.o univariatePoissonNetworkLerouxBetaUpdate.o univariatePoissonNetworkLerouxRhoUpdate.o univariatePoissonNetworkLerouxSigmaSquaredUpdate.o univariatePoissonNetworkLerouxSingleUpdate.o univariatePoissonNetworkLerouxSpatialRandomEffectsUpdate.o univariatePoissonNetworkLerouxTauSquaredUpdate.o univariatePoissonNetworkLerouxURandomEffectsUpdate.o vectorTransposeVectorMultiplicationRcpp.o vectorVectorTransposeMultiplicationRcpp.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/netcmc/old/netcmc.Rcheck/00LOCK-netcmc/00new/netcmc/libs -** R -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘MCMCpack’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘netcmc’ -* removing ‘/tmp/workdir/netcmc/old/netcmc.Rcheck/netcmc’ - - -``` -# NetworkChange - -
- -* Version: 0.8 -* 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: 122 - -Run `revdepcheck::cloud_details(, "NetworkChange")` for more info - -
- -## In both - -* checking whether package ‘NetworkChange’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/NetworkChange/new/NetworkChange.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘NetworkChange’ ... -** package ‘NetworkChange’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘MCMCpack’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘NetworkChange’ -* removing ‘/tmp/workdir/NetworkChange/new/NetworkChange.Rcheck/NetworkChange’ - - -``` -### CRAN - -``` -* installing *source* package ‘NetworkChange’ ... -** package ‘NetworkChange’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘MCMCpack’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘NetworkChange’ -* removing ‘/tmp/workdir/NetworkChange/old/NetworkChange.Rcheck/NetworkChange’ - - -``` -# nlmeVPC - -
- -* Version: 2.6 -* GitHub: NA -* Source code: https://github.com/cran/nlmeVPC -* Date/Publication: 2022-12-22 05:20:02 UTC -* Number of recursive dependencies: 77 - -Run `revdepcheck::cloud_details(, "nlmeVPC")` for more info - -
- -## In both - -* checking whether package ‘nlmeVPC’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/nlmeVPC/new/nlmeVPC.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘nlmeVPC’ ... -** package ‘nlmeVPC’ 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 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 -** data -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘nlmeVPC’ -* removing ‘/tmp/workdir/nlmeVPC/new/nlmeVPC.Rcheck/nlmeVPC’ - - -``` -### CRAN - -``` -* installing *source* package ‘nlmeVPC’ ... -** package ‘nlmeVPC’ 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 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 -** data -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘nlmeVPC’ -* removing ‘/tmp/workdir/nlmeVPC/old/nlmeVPC.Rcheck/nlmeVPC’ - - -``` -# NMADiagT - -
- -* Version: 0.1.2 -* GitHub: NA -* Source code: https://github.com/cran/NMADiagT -* Date/Publication: 2020-02-26 07:00:02 UTC -* Number of recursive dependencies: 78 - -Run `revdepcheck::cloud_details(, "NMADiagT")` for more info - -
- -## In both - -* checking whether package ‘NMADiagT’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/NMADiagT/new/NMADiagT.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘NMADiagT’ ... -** package ‘NMADiagT’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘NMADiagT’ -* removing ‘/tmp/workdir/NMADiagT/new/NMADiagT.Rcheck/NMADiagT’ - - -``` -### CRAN - -``` -* installing *source* package ‘NMADiagT’ ... -** package ‘NMADiagT’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘NMADiagT’ -* removing ‘/tmp/workdir/NMADiagT/old/NMADiagT.Rcheck/NMADiagT’ - - -``` -# NMF - -
- -* Version: 0.28 -* GitHub: NA -* 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(, "NMF")` for more info - -
- -## Newly broken - -* checking whether package ‘NMF’ can be installed ... ERROR - ``` - Installation failed. - 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 - -### Devel - -``` -* installing *source* package ‘NMF’ ... -** package ‘NMF’ 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/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 ‘NMF’ -* removing ‘/tmp/workdir/NMF/new/NMF.Rcheck/NMF’ - - -``` -### CRAN - -``` -* installing *source* package ‘NMF’ ... -** package ‘NMF’ 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/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) - - -``` -# obliqueRSF - -
- -* Version: 0.1.2 -* GitHub: NA -* 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(, "obliqueRSF")` for more info - -
- -## Error before installation - -### Devel - -``` -* 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 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 ‘obliqueRSF/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: OK - - - - - -``` -### CRAN - -``` -* 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 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 ‘obliqueRSF/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: OK - - - - - -``` -# 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’ - -Error: Vignette re-building failed. -Execution halted - -* DONE -Status: 1 ERROR, 2 NOTEs - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/OlinkAnalyze/old/OlinkAnalyze.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘OlinkAnalyze/DESCRIPTION’ ... OK -... ---- finished re-building ‘plate_randomizer.Rmd’ - -SUMMARY: processing the following file failed: - ‘Vignett.Rmd’ - -Error: Vignette re-building failed. -Execution halted - -* DONE -Status: 1 ERROR, 2 NOTEs - - - - - -``` -# optweight - -
- -* Version: 0.2.5 -* GitHub: NA -* 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(, "optweight")` for more info - -
- -## In both - -* checking whether package ‘optweight’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/optweight/new/optweight.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘optweight’ ... -** package ‘optweight’ 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/new/optweight.Rcheck/optweight’ - - -``` -### CRAN - -``` -* installing *source* package ‘optweight’ ... -** package ‘optweight’ 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’ - - -``` -# OVtool - -
- -* Version: 1.0.3 -* GitHub: NA -* 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(, "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’ - - -``` -# pammtools - -
- -* Version: 0.5.93 -* GitHub: https://github.com/adibender/pammtools -* Source code: https://github.com/cran/pammtools -* Date/Publication: 2024-02-25 10:10:02 UTC -* Number of recursive dependencies: 124 - -Run `revdepcheck::cloud_details(, "pammtools")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/pammtools/new/pammtools.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘pammtools/DESCRIPTION’ ... OK -... -* checking data for non-ASCII characters ... OK -* checking LazyData ... OK -* checking data for ASCII and uncompressed saves ... OK -* checking R/sysdata.rda ... OK -* checking examples ... OK -* checking for unstated dependencies in ‘tests’ ... OK -* checking tests ... OK - Running ‘testthat.R’ -* DONE -Status: OK - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/pammtools/old/pammtools.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘pammtools/DESCRIPTION’ ... OK -... -* checking data for non-ASCII characters ... OK -* checking LazyData ... OK -* checking data for ASCII and uncompressed saves ... OK -* checking R/sysdata.rda ... OK -* checking examples ... OK -* checking for unstated dependencies in ‘tests’ ... OK -* checking tests ... OK - Running ‘testthat.R’ -* DONE -Status: OK - - - - - -``` -# paths - -
- -* 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(, "paths")` for more info - -
- -## In both - -* checking whether package ‘paths’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/paths/new/paths.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* 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 -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 ‘paths’ -* removing ‘/tmp/workdir/paths/new/paths.Rcheck/paths’ - - -``` -### CRAN - -``` -* 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 -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 ‘paths’ -* removing ‘/tmp/workdir/paths/old/paths.Rcheck/paths’ - - -``` -# PathwaySpace - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/PathwaySpace -* Number of recursive dependencies: 69 - -Run `revdepcheck::cloud_details(, "PathwaySpace")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# pcvr - -
- -* Version: 1.1.1.0 -* GitHub: https://github.com/danforthcenter/pcvr -* Source code: https://github.com/cran/pcvr -* Date/Publication: 2024-11-06 20:50:02 UTC -* Number of recursive dependencies: 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. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘pcvr’ ... -** package ‘pcvr’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘pcvr’ -* removing ‘/tmp/workdir/pcvr/new/pcvr.Rcheck/pcvr’ - - -``` -### CRAN - -``` -* installing *source* package ‘pcvr’ ... -** package ‘pcvr’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘pcvr’ -* removing ‘/tmp/workdir/pcvr/old/pcvr.Rcheck/pcvr’ - - -``` -# PLMIX - -
- -* Version: 2.1.1 -* GitHub: NA -* Source code: https://github.com/cran/PLMIX -* Date/Publication: 2019-09-04 11:50:02 UTC -* Number of recursive dependencies: 128 - -Run `revdepcheck::cloud_details(, "PLMIX")` for more info - -
- -## In both - -* checking whether package ‘PLMIX’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/PLMIX/new/PLMIX.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘PLMIX’ ... -** package ‘PLMIX’ 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 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 -** 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 ‘PLMIX’ -* removing ‘/tmp/workdir/PLMIX/new/PLMIX.Rcheck/PLMIX’ - - -``` -### CRAN - -``` -* installing *source* package ‘PLMIX’ ... -** package ‘PLMIX’ 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 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 -** 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 ‘PLMIX’ -* removing ‘/tmp/workdir/PLMIX/old/PLMIX.Rcheck/PLMIX’ - - -``` -# popstudy - -
- -* Version: 1.0.1 -* GitHub: NA -* Source code: https://github.com/cran/popstudy -* Date/Publication: 2023-10-17 23:50:02 UTC -* Number of recursive dependencies: 242 - -Run `revdepcheck::cloud_details(, "popstudy")` for more info - -
- -## In both - -* checking whether package ‘popstudy’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/popstudy/new/popstudy.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘popstudy’ ... -** package ‘popstudy’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘popstudy’ -* removing ‘/tmp/workdir/popstudy/new/popstudy.Rcheck/popstudy’ - - -``` -### CRAN - -``` -* installing *source* package ‘popstudy’ ... -** package ‘popstudy’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘popstudy’ -* removing ‘/tmp/workdir/popstudy/old/popstudy.Rcheck/popstudy’ - - -``` -# pould - -
- -* Version: 1.0.1 -* GitHub: NA -* Source code: https://github.com/cran/pould -* Date/Publication: 2020-10-16 13:50:03 UTC -* Number of recursive dependencies: 104 - -Run `revdepcheck::cloud_details(, "pould")` for more info - -
- -## Error before installation - -### Devel - -``` -* 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 - -``` -* 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 - - - - - -``` -# PoweREST - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/PoweREST -* Date/Publication: 2024-09-09 09:30:02 UTC -* Number of recursive dependencies: 171 - -Run `revdepcheck::cloud_details(, "PoweREST")` for more info - -
- -## In both - -* checking whether package ‘PoweREST’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/PoweREST/new/PoweREST.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘PoweREST’ ... -** package ‘PoweREST’ 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 ‘PoweREST’ -* removing ‘/tmp/workdir/PoweREST/new/PoweREST.Rcheck/PoweREST’ - - -``` -### CRAN - -``` -* installing *source* package ‘PoweREST’ ... -** package ‘PoweREST’ 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 ‘PoweREST’ -* removing ‘/tmp/workdir/PoweREST/old/PoweREST.Rcheck/PoweREST’ - - -``` -# powerly - -
- -* Version: 1.8.6 -* GitHub: https://github.com/mihaiconstantin/powerly -* Source code: https://github.com/cran/powerly -* Date/Publication: 2022-09-09 14:10:01 UTC -* Number of recursive dependencies: 169 - -Run `revdepcheck::cloud_details(, "powerly")` for more info - -
- -## In both - -* checking whether package ‘powerly’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/powerly/new/powerly.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘powerly’ ... -** package ‘powerly’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘powerly’ -* removing ‘/tmp/workdir/powerly/new/powerly.Rcheck/powerly’ - - -``` -### CRAN - -``` -* installing *source* package ‘powerly’ ... -** package ‘powerly’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘powerly’ -* removing ‘/tmp/workdir/powerly/old/powerly.Rcheck/powerly’ - - -``` -# pre - -
- -* Version: 1.0.7 -* GitHub: https://github.com/marjoleinF/pre -* Source code: https://github.com/cran/pre -* Date/Publication: 2024-01-12 19:30:02 UTC -* Number of recursive dependencies: 153 - -Run `revdepcheck::cloud_details(, "pre")` for more info - -
- -## In both - -* checking whether package ‘pre’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/pre/new/pre.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘pre’ ... -** package ‘pre’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘pre’ -* removing ‘/tmp/workdir/pre/new/pre.Rcheck/pre’ - - -``` -### CRAN - -``` -* installing *source* package ‘pre’ ... -** package ‘pre’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘pre’ -* removing ‘/tmp/workdir/pre/old/pre.Rcheck/pre’ - - -``` -# ProFAST - -
- -* Version: 1.4 -* 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: 248 - -Run `revdepcheck::cloud_details(, "ProFAST")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/ProFAST/new/ProFAST.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 ‘ProFAST/DESCRIPTION’ ... OK -... -* this is package ‘ProFAST’ version ‘1.4’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'DR.SC', 'PRECAST' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/ProFAST/old/ProFAST.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 ‘ProFAST/DESCRIPTION’ ... OK -... -* this is package ‘ProFAST’ version ‘1.4’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Packages required but not available: 'DR.SC', 'PRECAST' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# psbcSpeedUp - -
- -* Version: 2.0.7 -* 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: 119 - -Run `revdepcheck::cloud_details(, "psbcSpeedUp")` for more info - -
- -## Error before installation - -### Devel - -``` -* 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 -... -* 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 - -``` -* 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 -... -* 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 - - - - - -``` -# pscore - -
- -* Version: 0.4.0 -* GitHub: https://github.com/JWiley/score-project -* Source code: https://github.com/cran/pscore -* Date/Publication: 2022-05-13 22:30:02 UTC -* Number of recursive dependencies: 171 - -Run `revdepcheck::cloud_details(, "pscore")` for more info - -
- -## In both - -* checking whether package ‘pscore’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/pscore/new/pscore.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘pscore’ ... -** package ‘pscore’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘pscore’ -* removing ‘/tmp/workdir/pscore/new/pscore.Rcheck/pscore’ - - -``` -### CRAN - -``` -* installing *source* package ‘pscore’ ... -** package ‘pscore’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘pscore’ -* removing ‘/tmp/workdir/pscore/old/pscore.Rcheck/pscore’ - - -``` -# 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 - -
- -* Version: 1.0.1 -* 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: 110 - -Run `revdepcheck::cloud_details(, "qPCRtools")` for more info - -
- -## In both - -* checking whether package ‘qPCRtools’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/qPCRtools/new/qPCRtools.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘qPCRtools’ ... -** package ‘qPCRtools’ 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 ‘qPCRtools’ -* removing ‘/tmp/workdir/qPCRtools/new/qPCRtools.Rcheck/qPCRtools’ - - -``` -### CRAN - -``` -* installing *source* package ‘qPCRtools’ ... -** package ‘qPCRtools’ 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 ‘qPCRtools’ -* removing ‘/tmp/workdir/qPCRtools/old/qPCRtools.Rcheck/qPCRtools’ - - -``` -# qris - -
- -* Version: 1.1.1 -* GitHub: https://github.com/Kyuhyun07/qris -* Source code: https://github.com/cran/qris -* Date/Publication: 2024-03-05 14:40:03 UTC -* Number of recursive dependencies: 54 - -Run `revdepcheck::cloud_details(, "qris")` for more info - -
- -## In both - -* checking whether package ‘qris’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/qris/new/qris.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘qris’ ... -** package ‘qris’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Amat.cpp -o Amat.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c ghat.cpp -o ghat.o -... -installing to /tmp/workdir/qris/new/qris.Rcheck/00LOCK-qris/00new/qris/libs -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘qris’ -* removing ‘/tmp/workdir/qris/new/qris.Rcheck/qris’ - - -``` -### CRAN - -``` -* installing *source* package ‘qris’ ... -** package ‘qris’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++11 -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c Amat.cpp -o Amat.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c ghat.cpp -o ghat.o -... -installing to /tmp/workdir/qris/old/qris.Rcheck/00LOCK-qris/00new/qris/libs -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘qris’ -* removing ‘/tmp/workdir/qris/old/qris.Rcheck/qris’ - - -``` -# qte - -
- -* Version: 1.3.1 -* GitHub: NA -* Source code: https://github.com/cran/qte -* Date/Publication: 2022-09-01 14:30:02 UTC -* Number of recursive dependencies: 123 - -Run `revdepcheck::cloud_details(, "qte")` for more info - -
- -## In both - -* checking whether package ‘qte’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/qte/new/qte.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘qte’ ... -** package ‘qte’ 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 ‘qte’ -* removing ‘/tmp/workdir/qte/new/qte.Rcheck/qte’ - - -``` -### CRAN - -``` -* installing *source* package ‘qte’ ... -** package ‘qte’ 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 ‘qte’ -* removing ‘/tmp/workdir/qte/old/qte.Rcheck/qte’ - - -``` -# quantilogram - -
- -* Version: 3.1.1 -* GitHub: NA -* Source code: https://github.com/cran/quantilogram -* Date/Publication: 2024-08-27 12:40:02 UTC -* Number of recursive dependencies: 58 - -Run `revdepcheck::cloud_details(, "quantilogram")` for more info - -
- -## In both - -* checking whether package ‘quantilogram’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/quantilogram/new/quantilogram.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘quantilogram’ ... -** package ‘quantilogram’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘quantilogram’ -* removing ‘/tmp/workdir/quantilogram/new/quantilogram.Rcheck/quantilogram’ - - -``` -### CRAN - -``` -* installing *source* package ‘quantilogram’ ... -** package ‘quantilogram’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘quantilogram’ -* removing ‘/tmp/workdir/quantilogram/old/quantilogram.Rcheck/quantilogram’ - - -``` -# quid - -
- -* Version: 0.0.1 -* GitHub: NA -* Source code: https://github.com/cran/quid -* Date/Publication: 2021-12-09 09:00:02 UTC -* Number of recursive dependencies: 94 - -Run `revdepcheck::cloud_details(, "quid")` for more info - -
- -## In both - -* checking whether package ‘quid’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/quid/new/quid.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘quid’ ... -** package ‘quid’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘quid’ -* removing ‘/tmp/workdir/quid/new/quid.Rcheck/quid’ - - -``` -### CRAN - -``` -* installing *source* package ‘quid’ ... -** package ‘quid’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘quid’ -* removing ‘/tmp/workdir/quid/old/quid.Rcheck/quid’ - - -``` -# RcmdrPlugin.RiskDemo - -
- -* 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/RGraphSpace -* Number of recursive dependencies: 64 - -Run `revdepcheck::cloud_details(, "RGraphSpace")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# riskRegression - -
- -* Version: 2023.12.21 -* GitHub: https://github.com/tagteam/riskRegression -* Source code: https://github.com/cran/riskRegression -* Date/Publication: 2023-12-19 17:00:02 UTC -* Number of recursive dependencies: 185 - -Run `revdepcheck::cloud_details(, "riskRegression")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/riskRegression/new/riskRegression.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘riskRegression/DESCRIPTION’ ... OK -... -* this is package ‘riskRegression’ version ‘2023.12.21’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘rms’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/riskRegression/old/riskRegression.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘riskRegression/DESCRIPTION’ ... OK -... -* this is package ‘riskRegression’ version ‘2023.12.21’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘rms’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# rmlnomogram - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/rmlnomogram -* Number of recursive dependencies: 181 - -Run `revdepcheck::cloud_details(, "rmlnomogram")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# rms - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/rms -* Number of recursive dependencies: 148 - -Run `revdepcheck::cloud_details(, "rms")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# robber - -
- -* Version: 0.2.4 -* GitHub: https://github.com/Chabert-Liddell/robber -* Source code: https://github.com/cran/robber -* Date/Publication: 2024-02-07 13:50:02 UTC -* Number of recursive dependencies: 143 - -Run `revdepcheck::cloud_details(, "robber")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/robber/new/robber.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘robber/DESCRIPTION’ ... OK -... -* checking tests ... OK - Running ‘spelling.R’ - Running ‘testthat.R’ -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘topological-analysis.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: OK - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/robber/old/robber.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘robber/DESCRIPTION’ ... OK -... -* checking tests ... OK - Running ‘spelling.R’ - Running ‘testthat.R’ -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘topological-analysis.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: OK - - - - - -``` -# robmed - -
- -* Version: 1.2.0 -* GitHub: https://github.com/aalfons/robmed -* Source code: https://github.com/cran/robmed -* Date/Publication: 2024-12-10 00:00:02 UTC -* Number of recursive dependencies: 59 - -Run `revdepcheck::cloud_details(, "robmed")` for more info - -
- -## In both - -* checking whether package ‘robmed’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/robmed/new/robmed.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘robmed’ ... -** package ‘robmed’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘robmed’ -* removing ‘/tmp/workdir/robmed/new/robmed.Rcheck/robmed’ - - -``` -### CRAN - -``` -* installing *source* package ‘robmed’ ... -** package ‘robmed’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘robmed’ -* removing ‘/tmp/workdir/robmed/old/robmed.Rcheck/robmed’ - - -``` -# robmedExtra - -
- -* Version: 0.1.1 -* GitHub: https://github.com/aalfons/robmedExtra -* Source code: https://github.com/cran/robmedExtra -* Date/Publication: 2024-11-03 12:10:01 UTC -* Number of recursive dependencies: 91 - -Run `revdepcheck::cloud_details(, "robmedExtra")` for more info - -
- -## In both - -* checking whether package ‘robmedExtra’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/robmedExtra/new/robmedExtra.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘robmedExtra’ ... -** package ‘robmedExtra’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘robmed’ 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 ‘robmedExtra’ -* removing ‘/tmp/workdir/robmedExtra/new/robmedExtra.Rcheck/robmedExtra’ - - -``` -### CRAN - -``` -* installing *source* package ‘robmedExtra’ ... -** package ‘robmedExtra’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘robmed’ 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 ‘robmedExtra’ -* removing ‘/tmp/workdir/robmedExtra/old/robmedExtra.Rcheck/robmedExtra’ - - -``` -# RPPanalyzer - -
- -* Version: 1.4.9 -* GitHub: NA -* Source code: https://github.com/cran/RPPanalyzer -* Date/Publication: 2024-01-25 11:00:02 UTC -* Number of recursive dependencies: 82 - -Run `revdepcheck::cloud_details(, "RPPanalyzer")` for more info - -
- -## In both - -* checking whether package ‘RPPanalyzer’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/RPPanalyzer/new/RPPanalyzer.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘RPPanalyzer’ ... -** package ‘RPPanalyzer’ 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 ‘RPPanalyzer’ -* removing ‘/tmp/workdir/RPPanalyzer/new/RPPanalyzer.Rcheck/RPPanalyzer’ - - -``` -### CRAN - -``` -* installing *source* package ‘RPPanalyzer’ ... -** package ‘RPPanalyzer’ 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 ‘RPPanalyzer’ -* removing ‘/tmp/workdir/RPPanalyzer/old/RPPanalyzer.Rcheck/RPPanalyzer’ - - -``` -# RQdeltaCT - -
- -* Version: 1.3.0 -* GitHub: NA -* Source code: https://github.com/cran/RQdeltaCT -* Date/Publication: 2024-04-17 15:50:02 UTC -* Number of recursive dependencies: 163 - -Run `revdepcheck::cloud_details(, "RQdeltaCT")` for more info - -
- -## In both - -* checking whether package ‘RQdeltaCT’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/RQdeltaCT/new/RQdeltaCT.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘RQdeltaCT’ ... -** package ‘RQdeltaCT’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘RQdeltaCT’ -* removing ‘/tmp/workdir/RQdeltaCT/new/RQdeltaCT.Rcheck/RQdeltaCT’ - - -``` -### CRAN - -``` -* installing *source* package ‘RQdeltaCT’ ... -** package ‘RQdeltaCT’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘RQdeltaCT’ -* removing ‘/tmp/workdir/RQdeltaCT/old/RQdeltaCT.Rcheck/RQdeltaCT’ - - -``` -# RRPP - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/RRPP -* Number of recursive dependencies: 67 - -Run `revdepcheck::cloud_details(, "RRPP")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# rstanarm - -
- -* Version: 2.32.1 -* GitHub: https://github.com/stan-dev/rstanarm -* Source code: https://github.com/cran/rstanarm -* Date/Publication: 2024-01-18 23:00:03 UTC -* Number of recursive dependencies: 140 - -Run `revdepcheck::cloud_details(, "rstanarm")` for more info - -
- -## In both - -* checking whether package ‘rstanarm’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘rstanarm’ ... -** package ‘rstanarm’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 -"/opt/R/4.3.1/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan -Wrote C++ file "stan_files/bernoulli.cc" - - -... -/usr/local/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:0: required from here -/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stan_files/continuous.o] Error 1 -rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc -ERROR: compilation failed for package ‘rstanarm’ -* removing ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/rstanarm’ - - -``` -### CRAN - -``` -* installing *source* package ‘rstanarm’ ... -** package ‘rstanarm’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 -"/opt/R/4.3.1/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan -Wrote C++ file "stan_files/bernoulli.cc" - - -... -/usr/local/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:0: required from here -/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes] - 654 | return internal::first_aligned::alignment),Derived>(m); - | ^~~~~~~~~ -g++: fatal error: Killed signal terminated program cc1plus -compilation terminated. -make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stan_files/continuous.o] Error 1 -rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc -ERROR: compilation failed for package ‘rstanarm’ -* removing ‘/tmp/workdir/rstanarm/old/rstanarm.Rcheck/rstanarm’ - - -``` -# rTwig - -
- -* Version: 1.3.0 -* GitHub: https://github.com/aidanmorales/rTwig -* Source code: https://github.com/cran/rTwig -* Date/Publication: 2024-11-21 21:30:02 UTC -* Number of recursive dependencies: 141 - -Run `revdepcheck::cloud_details(, "rTwig")` for more info - -
- -## In both - -* checking whether package ‘rTwig’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/rTwig/new/rTwig.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘rTwig’ ... -** package ‘rTwig’ 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../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 -** 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 ‘rTwig’ -* removing ‘/tmp/workdir/rTwig/new/rTwig.Rcheck/rTwig’ - - -``` -### CRAN - -``` -* installing *source* package ‘rTwig’ ... -** package ‘rTwig’ 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../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 -** 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 ‘rTwig’ -* removing ‘/tmp/workdir/rTwig/old/rTwig.Rcheck/rTwig’ - - -``` -# RVA - -
- -* Version: 0.0.5 -* 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: 210 - -Run `revdepcheck::cloud_details(, "RVA")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/RVA/new/RVA.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 ‘RVA/DESCRIPTION’ ... OK -... -* this is package ‘RVA’ version ‘0.0.5’ -* 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/RVA/old/RVA.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 ‘RVA/DESCRIPTION’ ... OK -... -* this is package ‘RVA’ version ‘0.0.5’ -* 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 - - - - - -``` -# S4DM - -
- -* 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(, "S4DM")` for more info - -
- -## 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 - -``` -* 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’ - - -``` -# 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 - -``` -* 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’ - - -``` -# SCdeconR - -
- -* Version: 1.0.0 -* 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: 237 - -Run `revdepcheck::cloud_details(, "SCdeconR")` for more info - -
- -## In both - -* checking whether package ‘SCdeconR’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/SCdeconR/new/SCdeconR.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘SCdeconR’ ... -** package ‘SCdeconR’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** 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 ‘SCdeconR’ -* removing ‘/tmp/workdir/SCdeconR/new/SCdeconR.Rcheck/SCdeconR’ - - -``` -### CRAN - -``` -* installing *source* package ‘SCdeconR’ ... -** package ‘SCdeconR’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** 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 ‘SCdeconR’ -* removing ‘/tmp/workdir/SCdeconR/old/SCdeconR.Rcheck/SCdeconR’ - - -``` -# scGate - -
- -* Version: 1.6.2 -* 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: 180 - -Run `revdepcheck::cloud_details(, "scGate")` for more info - -
- -## In both - -* checking whether package ‘scGate’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/scGate/new/scGate.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘scGate’ ... -** package ‘scGate’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -Warning: namespace ‘Seurat’ is not available and has been replaced -by .GlobalEnv when processing object ‘query.seurat’ -Warning: namespace ‘Seurat’ is not available and has been replaced -by .GlobalEnv when processing object ‘query.seurat’ -** 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 ‘scGate’ -* removing ‘/tmp/workdir/scGate/new/scGate.Rcheck/scGate’ - - -``` -### CRAN - -``` -* installing *source* package ‘scGate’ ... -** package ‘scGate’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -Warning: namespace ‘Seurat’ is not available and has been replaced -by .GlobalEnv when processing object ‘query.seurat’ -Warning: namespace ‘Seurat’ is not available and has been replaced -by .GlobalEnv when processing object ‘query.seurat’ -** 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 ‘scGate’ -* removing ‘/tmp/workdir/scGate/old/scGate.Rcheck/scGate’ - - -``` -# SCIntRuler - -
- -* Version: 0.99.6 -* GitHub: https://github.com/yuelyu21/SCIntRuler -* Source code: https://github.com/cran/SCIntRuler -* Date/Publication: 2024-07-12 15:20:08 UTC -* Number of recursive dependencies: 202 - -Run `revdepcheck::cloud_details(, "SCIntRuler")` for more info - -
- -## In both - -* checking whether package ‘SCIntRuler’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/SCIntRuler/new/SCIntRuler.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘SCIntRuler’ ... -** package ‘SCIntRuler’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c crossdist.cpp -o crossdist.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o SCIntRuler.so RcppExports.o crossdist.o -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/SCIntRuler/new/SCIntRuler.Rcheck/00LOCK-SCIntRuler/00new/SCIntRuler/libs -** R -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘SCIntRuler’ -* removing ‘/tmp/workdir/SCIntRuler/new/SCIntRuler.Rcheck/SCIntRuler’ - - -``` -### CRAN - -``` -* installing *source* package ‘SCIntRuler’ ... -** package ‘SCIntRuler’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c crossdist.cpp -o crossdist.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o SCIntRuler.so RcppExports.o crossdist.o -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/SCIntRuler/old/SCIntRuler.Rcheck/00LOCK-SCIntRuler/00new/SCIntRuler/libs -** R -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘SCIntRuler’ -* removing ‘/tmp/workdir/SCIntRuler/old/SCIntRuler.Rcheck/SCIntRuler’ - - -``` -# scMappR - -
- -* Version: 1.0.11 -* GitHub: NA -* Source code: https://github.com/cran/scMappR -* Date/Publication: 2023-06-30 08:40:08 UTC -* Number of recursive dependencies: 241 - -Run `revdepcheck::cloud_details(, "scMappR")` for more info - -
- -## In both - -* checking whether package ‘scMappR’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/scMappR/new/scMappR.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘scMappR’ ... -** package ‘scMappR’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘scMappR’ -* removing ‘/tmp/workdir/scMappR/new/scMappR.Rcheck/scMappR’ - - -``` -### CRAN - -``` -* installing *source* package ‘scMappR’ ... -** package ‘scMappR’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘scMappR’ -* removing ‘/tmp/workdir/scMappR/old/scMappR.Rcheck/scMappR’ - - -``` -# scpi - -
- -* Version: 2.2.6 -* GitHub: NA -* Source code: https://github.com/cran/scpi -* Date/Publication: 2024-11-11 23:40:02 UTC -* Number of recursive dependencies: 96 - -Run `revdepcheck::cloud_details(, "scpi")` for more info - -
- -## In both - -* checking whether package ‘scpi’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/scpi/new/scpi.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘scpi’ ... -** package ‘scpi’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Warning in .recacheSubclasses(def@className, def, env) : - undefined subclass "pcorMatrix" of class "ConstVal"; definition not updated -Warning in .recacheSubclasses(def@className, def, env) : -... -Warning in .recacheSubclasses(def@className, def, env) : - undefined subclass "pcorMatrix" of class "ConstValORExpr"; definition not updated -Warning in .recacheSubclasses(def@className, def, env) : - undefined subclass "pcorMatrix" of class "ConstValORNULL"; definition not updated -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘scpi’ -* removing ‘/tmp/workdir/scpi/new/scpi.Rcheck/scpi’ - - -``` -### CRAN - -``` -* installing *source* package ‘scpi’ ... -** package ‘scpi’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Warning in .recacheSubclasses(def@className, def, env) : - undefined subclass "pcorMatrix" of class "ConstVal"; definition not updated -Warning in .recacheSubclasses(def@className, def, env) : -... -Warning in .recacheSubclasses(def@className, def, env) : - undefined subclass "pcorMatrix" of class "ConstValORExpr"; definition not updated -Warning in .recacheSubclasses(def@className, def, env) : - undefined subclass "pcorMatrix" of class "ConstValORNULL"; definition not updated -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘scpi’ -* removing ‘/tmp/workdir/scpi/old/scpi.Rcheck/scpi’ - - -``` -# SCpubr - -
- -* Version: 2.0.2 -* GitHub: https://github.com/enblacar/SCpubr -* Source code: https://github.com/cran/SCpubr -* Date/Publication: 2023-10-11 09:50:02 UTC -* Number of recursive dependencies: 301 - -Run `revdepcheck::cloud_details(, "SCpubr")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/SCpubr/new/SCpubr.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘SCpubr/DESCRIPTION’ ... OK -... -* checking for unstated dependencies in ‘tests’ ... OK -* checking tests ... OK - Running ‘testthat.R’ -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... NONE - ‘reference_manual.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 2 NOTEs - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/SCpubr/old/SCpubr.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘SCpubr/DESCRIPTION’ ... OK -... -* checking for unstated dependencies in ‘tests’ ... OK -* checking tests ... OK - Running ‘testthat.R’ -* checking for unstated dependencies in vignettes ... OK -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... NONE - ‘reference_manual.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 2 NOTEs - - - - - -``` -# scRNAstat - -
- -* Version: 0.1.1 -* GitHub: NA -* Source code: https://github.com/cran/scRNAstat -* Date/Publication: 2021-09-22 08:10:02 UTC -* Number of recursive dependencies: 156 - -Run `revdepcheck::cloud_details(, "scRNAstat")` for more info - -
- -## In both - -* checking whether package ‘scRNAstat’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/scRNAstat/new/scRNAstat.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘scRNAstat’ ... -** package ‘scRNAstat’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -Warning: namespace ‘Seurat’ is not available and has been replaced -by .GlobalEnv when processing object ‘AJ064_small_last_sce’ -Warning: namespace ‘SeuratObject’ is not available and has been replaced -by .GlobalEnv when processing object ‘AJ064_small_last_sce’ -... -by .GlobalEnv when processing object ‘AJ064_small_last_sce’ -Warning: namespace ‘DBI’ is not available and has been replaced -by .GlobalEnv when processing object ‘AJ064_small_last_sce’ -** 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 ‘scRNAstat’ -* removing ‘/tmp/workdir/scRNAstat/new/scRNAstat.Rcheck/scRNAstat’ - - -``` -### CRAN - -``` -* installing *source* package ‘scRNAstat’ ... -** package ‘scRNAstat’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -Warning: namespace ‘Seurat’ is not available and has been replaced -by .GlobalEnv when processing object ‘AJ064_small_last_sce’ -Warning: namespace ‘SeuratObject’ is not available and has been replaced -by .GlobalEnv when processing object ‘AJ064_small_last_sce’ -... -by .GlobalEnv when processing object ‘AJ064_small_last_sce’ -Warning: namespace ‘DBI’ is not available and has been replaced -by .GlobalEnv when processing object ‘AJ064_small_last_sce’ -** 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 ‘scRNAstat’ -* removing ‘/tmp/workdir/scRNAstat/old/scRNAstat.Rcheck/scRNAstat’ - - -``` -# sectorgap - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/sectorgap -* Date/Publication: 2024-01-22 17:40:02 UTC -* Number of recursive dependencies: 46 - -Run `revdepcheck::cloud_details(, "sectorgap")` for more info - -
- -## In both - -* checking whether package ‘sectorgap’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/sectorgap/new/sectorgap.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘sectorgap’ ... -** package ‘sectorgap’ 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 ‘sectorgap’ -* removing ‘/tmp/workdir/sectorgap/new/sectorgap.Rcheck/sectorgap’ - - -``` -### CRAN - -``` -* installing *source* package ‘sectorgap’ ... -** package ‘sectorgap’ 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 ‘sectorgap’ -* removing ‘/tmp/workdir/sectorgap/old/sectorgap.Rcheck/sectorgap’ - - -``` -# SEERaBomb - -
- -* Version: 2019.2 -* GitHub: NA -* Source code: https://github.com/cran/SEERaBomb -* Date/Publication: 2019-12-12 18:50:03 UTC -* Number of recursive dependencies: 185 - -Run `revdepcheck::cloud_details(, "SEERaBomb")` for more info - -
- -## In both - -* checking whether package ‘SEERaBomb’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/SEERaBomb/new/SEERaBomb.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘SEERaBomb’ ... -** package ‘SEERaBomb’ 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 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 -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘demography’ 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 ‘SEERaBomb’ -* removing ‘/tmp/workdir/SEERaBomb/new/SEERaBomb.Rcheck/SEERaBomb’ - - -``` -### CRAN - -``` -* installing *source* package ‘SEERaBomb’ ... -** package ‘SEERaBomb’ 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 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 -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘demography’ 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 ‘SEERaBomb’ -* removing ‘/tmp/workdir/SEERaBomb/old/SEERaBomb.Rcheck/SEERaBomb’ - - -``` -# semicmprskcoxmsm - -
- -* Version: 0.2.0 -* GitHub: NA -* Source code: https://github.com/cran/semicmprskcoxmsm -* Date/Publication: 2022-04-29 23:40:02 UTC -* Number of recursive dependencies: 70 - -Run `revdepcheck::cloud_details(, "semicmprskcoxmsm")` for more info - -
- -## In both - -* checking whether package ‘semicmprskcoxmsm’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/semicmprskcoxmsm/new/semicmprskcoxmsm.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘semicmprskcoxmsm’ ... -** package ‘semicmprskcoxmsm’ 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 ‘semicmprskcoxmsm’ -* removing ‘/tmp/workdir/semicmprskcoxmsm/new/semicmprskcoxmsm.Rcheck/semicmprskcoxmsm’ - - -``` -### CRAN - -``` -* installing *source* package ‘semicmprskcoxmsm’ ... -** package ‘semicmprskcoxmsm’ 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 ‘semicmprskcoxmsm’ -* removing ‘/tmp/workdir/semicmprskcoxmsm/old/semicmprskcoxmsm.Rcheck/semicmprskcoxmsm’ - - -``` -# SensMap - -
- -* Version: 0.7 -* GitHub: https://github.com/IbtihelRebhi/SensMap -* Source code: https://github.com/cran/SensMap -* Date/Publication: 2022-07-04 19:00:02 UTC -* Number of recursive dependencies: 148 - -Run `revdepcheck::cloud_details(, "SensMap")` for more info - -
- -## In both - -* checking whether package ‘SensMap’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/SensMap/new/SensMap.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘SensMap’ ... -** package ‘SensMap’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘SensMap’ -* removing ‘/tmp/workdir/SensMap/new/SensMap.Rcheck/SensMap’ - - -``` -### CRAN - -``` -* installing *source* package ‘SensMap’ ... -** package ‘SensMap’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘SensMap’ -* removing ‘/tmp/workdir/SensMap/old/SensMap.Rcheck/SensMap’ - - -``` -# Seurat - -
- -* Version: 5.2.1 -* GitHub: https://github.com/satijalab/seurat -* Source code: https://github.com/cran/Seurat -* Date/Publication: 2025-01-24 06:50:06 UTC -* Number of recursive dependencies: 281 - -Run `revdepcheck::cloud_details(, "Seurat")` for more info - -
- -## In both - -* checking whether package ‘Seurat’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/Seurat/new/Seurat.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘Seurat’ ... -** package ‘Seurat’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c ModularityOptimizer.cpp -o ModularityOptimizer.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RModularityOptimizer.cpp -o RModularityOptimizer.o -In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required -Execution halted -ERROR: lazy loading failed for package ‘Seurat’ -* removing ‘/tmp/workdir/Seurat/new/Seurat.Rcheck/Seurat’ - - -``` -### CRAN - -``` -* installing *source* package ‘Seurat’ ... -** package ‘Seurat’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -using C++17 -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c ModularityOptimizer.cpp -o ModularityOptimizer.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppProgress/include' -I/usr/local/include -fpic -g -O2 -c RModularityOptimizer.cpp -o RModularityOptimizer.o -In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, -... -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required -Execution halted -ERROR: lazy loading failed for package ‘Seurat’ -* removing ‘/tmp/workdir/Seurat/old/Seurat.Rcheck/Seurat’ - - -``` -# shinyTempSignal - -
- -* Version: 0.0.8 -* GitHub: https://github.com/YuLab-SMU/shinyTempSignal -* Source code: https://github.com/cran/shinyTempSignal -* Date/Publication: 2024-03-06 08:00:02 UTC -* Number of recursive dependencies: 134 - -Run `revdepcheck::cloud_details(, "shinyTempSignal")` for more info - -
- -## In both - -* checking whether package ‘shinyTempSignal’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/shinyTempSignal/new/shinyTempSignal.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘shinyTempSignal’ ... -** package ‘shinyTempSignal’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘shinyTempSignal’ -* removing ‘/tmp/workdir/shinyTempSignal/new/shinyTempSignal.Rcheck/shinyTempSignal’ - - -``` -### CRAN - -``` -* installing *source* package ‘shinyTempSignal’ ... -** package ‘shinyTempSignal’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘shinyTempSignal’ -* removing ‘/tmp/workdir/shinyTempSignal/old/shinyTempSignal.Rcheck/shinyTempSignal’ - - -``` -# sievePH - -
- -* Version: 1.1 -* 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: 76 - -Run `revdepcheck::cloud_details(, "sievePH")` for more info - -
- -## In both - -* checking whether package ‘sievePH’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/sievePH/new/sievePH.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* 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/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 ‘SiFINeT’ -* removing ‘/tmp/workdir/SiFINeT/new/SiFINeT.Rcheck/SiFINeT’ - - -``` -### CRAN - -``` -* 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/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 ‘SiFINeT’ -* removing ‘/tmp/workdir/SiFINeT/old/SiFINeT.Rcheck/SiFINeT’ - - -``` -# sigminer - -
- -* Version: 2.3.1 -* 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: 212 - -Run `revdepcheck::cloud_details(, "sigminer")` for more info - -
- -## 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 - -``` -* 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 -... -** 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 -ERROR: lazy loading failed for package ‘sigminer’ -* removing ‘/tmp/workdir/sigminer/new/sigminer.Rcheck/sigminer’ - - -``` -### CRAN - -``` -* 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 -... -** 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) - - -``` -# Signac - -
- -* Version: 1.14.0 -* GitHub: https://github.com/stuart-lab/signac -* Source code: https://github.com/cran/Signac -* Date/Publication: 2024-08-21 07:40:02 UTC -* Number of recursive dependencies: 246 - -Run `revdepcheck::cloud_details(, "Signac")` for more info - -
- -## In both - -* checking whether package ‘Signac’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/Signac/new/Signac.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘Signac’ ... -** package ‘Signac’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c filter.cpp -o filter.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c group.cpp -o group.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c split.cpp -o split.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c validate.cpp -o validate.o -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘Signac’ -* removing ‘/tmp/workdir/Signac/new/Signac.Rcheck/Signac’ - - -``` -### CRAN - -``` -* installing *source* package ‘Signac’ ... -** package ‘Signac’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c filter.cpp -o filter.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c group.cpp -o group.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c split.cpp -o split.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c validate.cpp -o validate.o -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘Signac’ -* removing ‘/tmp/workdir/Signac/old/Signac.Rcheck/Signac’ - - -``` -# SimplyAgree - -
- -* Version: 0.2.0 -* GitHub: https://github.com/arcaldwell49/SimplyAgree -* Source code: https://github.com/cran/SimplyAgree -* Date/Publication: 2024-03-21 14:20:06 UTC -* Number of recursive dependencies: 118 - -Run `revdepcheck::cloud_details(, "SimplyAgree")` for more info - -
- -## In both - -* checking whether package ‘SimplyAgree’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/SimplyAgree/new/SimplyAgree.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘SimplyAgree’ ... -** package ‘SimplyAgree’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘SimplyAgree’ -* removing ‘/tmp/workdir/SimplyAgree/new/SimplyAgree.Rcheck/SimplyAgree’ - - -``` -### CRAN - -``` -* installing *source* package ‘SimplyAgree’ ... -** package ‘SimplyAgree’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Warning in check_dep_version() : - ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘SimplyAgree’ -* removing ‘/tmp/workdir/SimplyAgree/old/SimplyAgree.Rcheck/SimplyAgree’ - - -``` -# 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-2 -* GitHub: https://github.com/isglobal-brge/SNPassoc -* Source code: https://github.com/cran/SNPassoc -* Date/Publication: 2024-10-28 17:30:02 UTC -* Number of recursive dependencies: 164 - -Run `revdepcheck::cloud_details(, "SNPassoc")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/SNPassoc/new/SNPassoc.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘SNPassoc/DESCRIPTION’ ... OK -... -* this is package ‘SNPassoc’ version ‘2.1-2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘haplo.stats’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/SNPassoc/old/SNPassoc.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘SNPassoc/DESCRIPTION’ ... OK -... -* this is package ‘SNPassoc’ version ‘2.1-2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘haplo.stats’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# snplinkage - -
- -* Version: 1.2.0 -* GitHub: NA -* Source code: https://github.com/cran/snplinkage -* Date/Publication: 2024-09-09 19:10:02 UTC -* Number of recursive dependencies: 155 - -Run `revdepcheck::cloud_details(, "snplinkage")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/snplinkage/new/snplinkage.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘snplinkage/DESCRIPTION’ ... OK -... -* this is package ‘snplinkage’ version ‘1.2.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘GWASTools’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/snplinkage/old/snplinkage.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘snplinkage/DESCRIPTION’ ... OK -... -* this is package ‘snplinkage’ version ‘1.2.0’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘GWASTools’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# 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.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(, "SpaCCI")` for more info - -
- -## In both - -* checking whether package ‘SpaCCI’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/SpaCCI/new/SpaCCI.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* 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 -** 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 ‘SpaCCI’ -* removing ‘/tmp/workdir/SpaCCI/new/SpaCCI.Rcheck/SpaCCI’ - - -``` -### CRAN - -``` -* 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 -** 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 ‘SpaCCI’ -* removing ‘/tmp/workdir/SpaCCI/old/SpaCCI.Rcheck/SpaCCI’ - - -``` -# sparsereg - -
- -* Version: 1.2 -* GitHub: NA -* Source code: https://github.com/cran/sparsereg -* Date/Publication: 2016-03-10 23:32:18 -* Number of recursive dependencies: 50 - -Run `revdepcheck::cloud_details(, "sparsereg")` for more info - -
- -## In both - -* checking whether package ‘sparsereg’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/sparsereg/new/sparsereg.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘sparsereg’ ... -** package ‘sparsereg’ 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 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 -** 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 ‘sparsereg’ -* removing ‘/tmp/workdir/sparsereg/new/sparsereg.Rcheck/sparsereg’ - - -``` -### CRAN - -``` -* installing *source* package ‘sparsereg’ ... -** package ‘sparsereg’ 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 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 -** 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 ‘sparsereg’ -* removing ‘/tmp/workdir/sparsereg/old/sparsereg.Rcheck/sparsereg’ - - -``` -# spectralAnalysis - -
- -* 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(, "spectralAnalysis")` for more info - -
- -## Newly broken - -* checking whether package ‘spectralAnalysis’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/spectralAnalysis/new/spectralAnalysis.Rcheck/00install.out’ for details. - ``` - -## Newly fixed - -* 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 - -``` -* 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) - - -``` -# spikeSlabGAM - -
- -* Version: 1.1-20 -* GitHub: https://github.com/fabian-s/spikeSlabGAM -* Source code: https://github.com/cran/spikeSlabGAM -* Date/Publication: 2024-10-22 17:30:02 UTC -* Number of recursive dependencies: 77 - -Run `revdepcheck::cloud_details(, "spikeSlabGAM")` for more info - -
- -## In both - -* checking whether package ‘spikeSlabGAM’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/spikeSlabGAM/new/spikeSlabGAM.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘spikeSlabGAM’ ... -** package ‘spikeSlabGAM’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c 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 -installing to /tmp/workdir/spikeSlabGAM/new/spikeSlabGAM.Rcheck/00LOCK-spikeSlabGAM/00new/spikeSlabGAM/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 ‘spikeSlabGAM’ -* removing ‘/tmp/workdir/spikeSlabGAM/new/spikeSlabGAM.Rcheck/spikeSlabGAM’ - - -``` -### CRAN - -``` -* installing *source* package ‘spikeSlabGAM’ ... -** package ‘spikeSlabGAM’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c 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 -installing to /tmp/workdir/spikeSlabGAM/old/spikeSlabGAM.Rcheck/00LOCK-spikeSlabGAM/00new/spikeSlabGAM/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 ‘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 - -
+* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘chemometrics’ + ``` ## In both -* checking whether package ‘stabiliser’ can be installed ... ERROR +* checking package dependencies ... NOTE ``` - Installation failed. - See ‘/tmp/workdir/stabiliser/new/stabiliser.Rcheck/00install.out’ for details. + Package which this enhances but not available for checking: ‘sp’ ``` ## Installation @@ -11712,63 +937,64 @@ Run `revdepcheck::cloud_details(, "stabiliser")` for more info ### Devel ``` -* installing *source* package ‘stabiliser’ ... -** package ‘stabiliser’ successfully unpacked and MD5 sums checked +* installing *source* package ‘ggtern’ ... +** package ‘ggtern’ successfully unpacked and MD5 sums checked ** using staged installation ** R ** data -*** moving datasets to lazyload DB +** demo ** 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 +Error in get(x, envir = ns, inherits = FALSE) : + object 'is.zero' not found +Error: unable to load R code in package ‘ggtern’ Execution halted -ERROR: lazy loading failed for package ‘stabiliser’ -* removing ‘/tmp/workdir/stabiliser/new/stabiliser.Rcheck/stabiliser’ +ERROR: lazy loading failed for package ‘ggtern’ +* removing ‘/tmp/workdir/ggtern/new/ggtern.Rcheck/ggtern’ ``` ### CRAN ``` -* installing *source* package ‘stabiliser’ ... -** package ‘stabiliser’ successfully unpacked and MD5 sums checked +* installing *source* package ‘ggtern’ ... +** package ‘ggtern’ successfully unpacked and MD5 sums checked ** using staged installation ** R ** data -*** moving datasets to lazyload DB +** demo ** 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’ +** 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) ``` -# statsr +# inventorize
-* 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 +* Version: 1.1.2 +* GitHub: NA +* Source code: https://github.com/cran/inventorize +* Date/Publication: 2025-05-28 13:20:02 UTC +* Number of recursive dependencies: 69 -Run `revdepcheck::cloud_details(, "statsr")` for more info +Run `revdepcheck::cloud_details(, "inventorize")` for more info
-## In both +## Newly broken -* checking whether package ‘statsr’ can be installed ... ERROR +* checking whether package ‘inventorize’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/statsr/new/statsr.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/inventorize/new/inventorize.Rcheck/00install.out’ for details. ``` ## Installation @@ -11776,200 +1002,50 @@ Run `revdepcheck::cloud_details(, "statsr")` for more info ### Devel ``` -* installing *source* package ‘statsr’ ... -** package ‘statsr’ successfully unpacked and MD5 sums checked +* installing *source* package ‘inventorize’ ... +** package ‘inventorize’ 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 +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 ‘statsr’ -* removing ‘/tmp/workdir/statsr/new/statsr.Rcheck/statsr’ +ERROR: lazy loading failed for package ‘inventorize’ +* removing ‘/tmp/workdir/inventorize/new/inventorize.Rcheck/inventorize’ ``` ### CRAN ``` -* installing *source* package ‘statsr’ ... -** package ‘statsr’ successfully unpacked and MD5 sums checked +* installing *source* package ‘inventorize’ ... +** package ‘inventorize’ 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(, "survex")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/survex/new/survex.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘survex/DESCRIPTION’ ... OK -... -  A new explainer has been created!  -> -> y <- cph_exp$y -> times <- cph_exp$times -> surv <- cph_exp$predict_survival_function(cph, cph_exp$data, times) -Error in loadNamespace(x) : there is no package called ‘riskRegression’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -* DONE -Status: 1 ERROR, 1 NOTE - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/survex/old/survex.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘survex/DESCRIPTION’ ... OK -... -  A new explainer has been created!  -> -> y <- cph_exp$y -> times <- cph_exp$times -> surv <- cph_exp$predict_survival_function(cph, cph_exp$data, times) -Error in loadNamespace(x) : there is no package called ‘riskRegression’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -* DONE -Status: 1 ERROR, 1 NOTE - - - +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) ``` -# survHE +# metabolic
-* 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 +* Version: 0.1.2 +* GitHub: https://github.com/fmmattioni/metabolic +* Source code: https://github.com/cran/metabolic +* Date/Publication: 2023-10-10 07:40:02 UTC +* Number of recursive dependencies: 136 -Run `revdepcheck::cloud_details(, "survHE")` for more info +Run `revdepcheck::cloud_details(, "metabolic")` for more info
@@ -11978,27 +1054,27 @@ Run `revdepcheck::cloud_details(, "survHE")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/survHE/new/survHE.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) +* using log directory ‘/tmp/workdir/metabolic/new/metabolic.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu * R was compiled by gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 * running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘survHE/DESCRIPTION’ ... OK +* checking for file ‘metabolic/DESCRIPTION’ ... OK ... -* checking package dependencies ... ERROR -Package required but not available: ‘rms’ - -Packages suggested but not available for checking: - 'survHEinla', 'survHEhmc' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* checking data for non-ASCII characters ... NOTE + Note: found 37 marked UTF-8 strings +* checking LazyData ... OK +* checking data for ASCII and uncompressed saves ... OK +* checking examples ... OK +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘spelling.R’ * DONE -Status: 1 ERROR +Status: 2 NOTEs @@ -12008,53 +1084,53 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/survHE/old/survHE.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) +* using log directory ‘/tmp/workdir/metabolic/old/metabolic.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu * R was compiled by gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 * running under: Ubuntu 24.04.1 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘survHE/DESCRIPTION’ ... OK +* checking for file ‘metabolic/DESCRIPTION’ ... OK ... -* checking package dependencies ... ERROR -Package required but not available: ‘rms’ - -Packages suggested but not available for checking: - 'survHEinla', 'survHEhmc' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* checking data for non-ASCII characters ... NOTE + Note: found 37 marked UTF-8 strings +* checking LazyData ... OK +* checking data for ASCII and uncompressed saves ... OK +* checking examples ... OK +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘spelling.R’ * DONE -Status: 1 ERROR +Status: 2 NOTEs ``` -# survidm +# multinma
-* Version: 1.3.2 -* GitHub: NA -* Source code: https://github.com/cran/survidm -* Date/Publication: 2021-06-24 23:20:02 UTC -* Number of recursive dependencies: 87 +* Version: 0.8.1 +* GitHub: https://github.com/dmphillippo/multinma +* Source code: https://github.com/cran/multinma +* Date/Publication: 2025-05-31 00:00:02 UTC +* Number of recursive dependencies: 149 -Run `revdepcheck::cloud_details(, "survidm")` for more info +Run `revdepcheck::cloud_details(, "multinma")` for more info
## In both -* checking whether package ‘survidm’ can be installed ... ERROR +* checking whether package ‘multinma’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/survidm/new/survidm.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/multinma/new/multinma.Rcheck/00install.out’ for details. ``` ## Installation @@ -12062,73 +1138,77 @@ Run `revdepcheck::cloud_details(, "survidm")` for more info ### Devel ``` -* installing *source* package ‘survidm’ ... -** package ‘survidm’ successfully unpacked and MD5 sums checked +* installing *source* package ‘multinma’ ... +** package ‘multinma’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/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 -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘survidm’ -* removing ‘/tmp/workdir/survidm/new/survidm.Rcheck/survidm’ +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::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.4.0/lib/R/etc/Makeconf:202: stanExports_survival_param.o] Error 1 +ERROR: compilation failed for package ‘multinma’ +* removing ‘/tmp/workdir/multinma/new/multinma.Rcheck/multinma’ ``` ### CRAN ``` -* installing *source* package ‘survidm’ ... -** package ‘survidm’ successfully unpacked and MD5 sums checked +* installing *source* package ‘multinma’ ... +** package ‘multinma’ successfully unpacked and MD5 sums checked ** using staged installation ** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/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 -** data -*** moving datasets to lazyload DB -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘survidm’ -* removing ‘/tmp/workdir/survidm/old/survidm.Rcheck/survidm’ +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/RcppParallel/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/usr/local/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o +In file included from /usr/local/lib/R/site-library/RcppEigen/include/Eigen/Core:205, +... +/usr/local/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:0: required from ‘double stan::mcmc::dense_e_metric::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.4.0/lib/R/etc/Makeconf:202: stanExports_survival_param.o] Error 1 +ERROR: compilation failed for package ‘multinma’ +* removing ‘/tmp/workdir/multinma/old/multinma.Rcheck/multinma’ ``` -# tempted +# MultiTraits
-* Version: 0.1.1 -* GitHub: https://github.com/pixushi/tempted -* Source code: https://github.com/cran/tempted -* Date/Publication: 2024-05-09 02:40:02 UTC -* Number of recursive dependencies: 37 +* Version: 0.5.0 +* GitHub: NA +* Source code: https://github.com/cran/MultiTraits +* Date/Publication: 2025-04-20 18:40:02 UTC +* Number of recursive dependencies: 137 -Run `revdepcheck::cloud_details(, "tempted")` for more info +Run `revdepcheck::cloud_details(, "MultiTraits")` for more info
-## In both +## Newly broken -* checking whether package ‘tempted’ can be installed ... ERROR +* checking whether package ‘MultiTraits’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/tempted/new/tempted.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/MultiTraits/new/MultiTraits.Rcheck/00install.out’ for details. ``` ## Installation @@ -12136,52 +1216,57 @@ Run `revdepcheck::cloud_details(, "tempted")` for more info ### Devel ``` -* installing *source* package ‘tempted’ ... -** package ‘tempted’ successfully unpacked and MD5 sums checked +* installing *source* package ‘MultiTraits’ ... +** package ‘MultiTraits’ 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 ‘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 +Error: .onLoad failed in loadNamespace() for 'ggtern', details: + call: NULL + error: object properties are invalid: +- @lineend must be or , not S3 Execution halted -ERROR: lazy loading failed for package ‘tempted’ -* removing ‘/tmp/workdir/tempted/new/tempted.Rcheck/tempted’ +ERROR: lazy loading failed for package ‘MultiTraits’ +* removing ‘/tmp/workdir/MultiTraits/new/MultiTraits.Rcheck/MultiTraits’ ``` ### CRAN ``` -* installing *source* package ‘tempted’ ... -** package ‘tempted’ successfully unpacked and MD5 sums checked +* installing *source* package ‘MultiTraits’ ... +** package ‘MultiTraits’ 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 ‘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 ‘tempted’ -* removing ‘/tmp/workdir/tempted/old/tempted.Rcheck/tempted’ +** help +*** installing help indices +*** copying figures +** 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 (MultiTraits) ``` -# TestAnaAPP +# OpenMx
-* Version: 1.1.2 -* GitHub: https://github.com/jiangyouxiang/TestAnaAPP -* Source code: https://github.com/cran/TestAnaAPP -* Date/Publication: 2024-11-09 04:00:02 UTC -* Number of recursive dependencies: 255 +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/OpenMx +* Number of recursive dependencies: 160 -Run `revdepcheck::cloud_details(, "TestAnaAPP")` for more info +Run `revdepcheck::cloud_details(, "OpenMx")` for more info
@@ -12190,27 +1275,7 @@ Run `revdepcheck::cloud_details(, "TestAnaAPP")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/TestAnaAPP/new/TestAnaAPP.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘TestAnaAPP/DESCRIPTION’ ... OK -... -* this is package ‘TestAnaAPP’ version ‘1.1.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘lordif’ -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR @@ -12220,53 +1285,33 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/TestAnaAPP/old/TestAnaAPP.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘TestAnaAPP/DESCRIPTION’ ... OK -... -* this is package ‘TestAnaAPP’ version ‘1.1.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘lordif’ -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR ``` -# tidydr +# PieGlyph
-* Version: 0.0.5 -* GitHub: https://github.com/YuLab-SMU/tidydr -* Source code: https://github.com/cran/tidydr -* Date/Publication: 2023-03-08 09:20:02 UTC -* Number of recursive dependencies: 79 +* 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: 88 -Run `revdepcheck::cloud_details(, "tidydr")` for more info +Run `revdepcheck::cloud_details(, "PieGlyph")` for more info
## Newly broken -* checking whether package ‘tidydr’ can be installed ... ERROR +* checking whether package ‘PieGlyph’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/tidydr/new/tidydr.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/PieGlyph/new/PieGlyph.Rcheck/00install.out’ for details. ``` ## Installation @@ -12274,61 +1319,62 @@ Run `revdepcheck::cloud_details(, "tidydr")` for more info ### Devel ``` -* installing *source* package ‘tidydr’ ... -** package ‘tidydr’ successfully unpacked and MD5 sums checked +* installing *source* package ‘PieGlyph’ ... +** package ‘PieGlyph’ successfully unpacked and MD5 sums checked ** using staged installation ** R ** inst ** byte-compile and prepare package for lazy loading -Error in get(x, envir = ns, inherits = FALSE) : - object 'len0_null' not found -Error: unable to load R code in package ‘tidydr’ +Error in get(x, envir = ns, inherits = FALSE) : + object 'is.waive' not found +Error: unable to load R code in package ‘PieGlyph’ Execution halted -ERROR: lazy loading failed for package ‘tidydr’ -* removing ‘/tmp/workdir/tidydr/new/tidydr.Rcheck/tidydr’ +ERROR: lazy loading failed for package ‘PieGlyph’ +* removing ‘/tmp/workdir/PieGlyph/new/PieGlyph.Rcheck/PieGlyph’ ``` ### CRAN ``` -* installing *source* package ‘tidydr’ ... -** package ‘tidydr’ successfully unpacked and MD5 sums checked +* installing *source* package ‘PieGlyph’ ... +** package ‘PieGlyph’ successfully unpacked and MD5 sums checked ** using staged installation ** R ** inst ** byte-compile and prepare package for lazy loading ** help *** installing help indices +*** copying figures ** 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 (tidydr) +* DONE (PieGlyph) ``` -# tidyEdSurvey +# rmsb
-* Version: 0.1.3 +* Version: 1.1-2 * GitHub: NA -* Source code: https://github.com/cran/tidyEdSurvey -* Date/Publication: 2024-05-14 20:20:03 UTC -* Number of recursive dependencies: 113 +* Source code: https://github.com/cran/rmsb +* Date/Publication: 2025-04-13 16:30:02 UTC +* Number of recursive dependencies: 137 -Run `revdepcheck::cloud_details(, "tidyEdSurvey")` for more info +Run `revdepcheck::cloud_details(, "rmsb")` for more info
## In both -* checking whether package ‘tidyEdSurvey’ can be installed ... ERROR +* checking whether package ‘rmsb’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/tidyEdSurvey/new/tidyEdSurvey.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/rmsb/new/rmsb.Rcheck/00install.out’ for details. ``` ## Installation @@ -12336,65 +1382,51 @@ Run `revdepcheck::cloud_details(, "tidyEdSurvey")` for more info ### Devel ``` -* installing *source* package ‘tidyEdSurvey’ ... -** package ‘tidyEdSurvey’ successfully unpacked and MD5 sums checked +* installing *source* package ‘rmsb’ ... +** package ‘rmsb’ successfully unpacked and MD5 sums checked ** using staged installation -** R -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘EdSurvey’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -In addition: Warning message: -In check_dep_version() : ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(x) : there is no package called ‘rstantools’ +Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart Execution halted -ERROR: lazy loading failed for package ‘tidyEdSurvey’ -* removing ‘/tmp/workdir/tidyEdSurvey/new/tidyEdSurvey.Rcheck/tidyEdSurvey’ +ERROR: configuration failed for package ‘rmsb’ +* removing ‘/tmp/workdir/rmsb/new/rmsb.Rcheck/rmsb’ ``` ### CRAN ``` -* installing *source* package ‘tidyEdSurvey’ ... -** package ‘tidyEdSurvey’ successfully unpacked and MD5 sums checked +* installing *source* package ‘rmsb’ ... +** package ‘rmsb’ successfully unpacked and MD5 sums checked ** using staged installation -** R -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘EdSurvey’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -In addition: Warning message: -In check_dep_version() : ABI version mismatch: -lme4 was built with Matrix ABI version 1 -Current Matrix ABI version is 0 -Please re-install lme4 from source or restore original ‘Matrix’ package +Error in loadNamespace(x) : there is no package called ‘rstantools’ +Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart Execution halted -ERROR: lazy loading failed for package ‘tidyEdSurvey’ -* removing ‘/tmp/workdir/tidyEdSurvey/old/tidyEdSurvey.Rcheck/tidyEdSurvey’ +ERROR: configuration failed for package ‘rmsb’ +* removing ‘/tmp/workdir/rmsb/old/rmsb.Rcheck/rmsb’ ``` -# tidyseurat +# rshift
-* Version: 0.8.0 -* GitHub: https://github.com/stemangiola/tidyseurat -* Source code: https://github.com/cran/tidyseurat -* Date/Publication: 2024-01-10 04:50:02 UTC -* Number of recursive dependencies: 196 +* Version: 3.1.2 +* GitHub: https://github.com/alexhroom/rshift +* Source code: https://github.com/cran/rshift +* Date/Publication: 2025-04-06 18:40:02 UTC +* Number of recursive dependencies: 35 -Run `revdepcheck::cloud_details(, "tidyseurat")` for more info +Run `revdepcheck::cloud_details(, "rshift")` for more info
## In both -* checking whether package ‘tidyseurat’ can be installed ... ERROR +* checking whether package ‘rshift’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/tidyseurat/new/tidyseurat.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/rshift/new/rshift.Rcheck/00install.out’ for details. ``` ## Installation @@ -12402,61 +1434,77 @@ Run `revdepcheck::cloud_details(, "tidyseurat")` for more info ### Devel ``` -* installing *source* package ‘tidyseurat’ ... -** package ‘tidyseurat’ successfully unpacked and MD5 sums checked +* installing *source* package ‘rshift’ ... +** package ‘rshift’ successfully unpacked and MD5 sums checked ** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required -Execution halted -ERROR: lazy loading failed for package ‘tidyseurat’ -* removing ‘/tmp/workdir/tidyseurat/new/tidyseurat.Rcheck/tidyseurat’ +Using cargo 1.75.0 +Using rustc 1.75.0 (82e1608df 2023-12-21) (built from a source tarball) +Building for CRAN. +Writing `src/Makevars`. +`tools/config.R` has finished. +** libs +using C compiler: ‘gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +... +export CARGO_HOME=/tmp/workdir/rshift/new/rshift.Rcheck/00_pkg_src/rshift/src/.cargo && \ +export PATH="/usr/local/sbin:/usr/local/bin:/usr/sbin:/usr/bin:/sbin:/bin:/root/.cargo/bin" && \ +RUSTFLAGS=" --print=native-static-libs" cargo build -j 2 --offline --lib --release --manifest-path=./rust/Cargo.toml --target-dir ./rust/target +error: failed to parse lock file at: /tmp/workdir/rshift/new/rshift.Rcheck/00_pkg_src/rshift/src/rust/Cargo.lock + +Caused by: + lock file version 4 requires `-Znext-lockfile-bump` +make: *** [Makevars:28: rust/target/release/librshift.a] Error 101 +ERROR: compilation failed for package ‘rshift’ +* removing ‘/tmp/workdir/rshift/new/rshift.Rcheck/rshift’ ``` ### CRAN ``` -* installing *source* package ‘tidyseurat’ ... -** package ‘tidyseurat’ successfully unpacked and MD5 sums checked +* installing *source* package ‘rshift’ ... +** package ‘rshift’ 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’ +Using cargo 1.75.0 +Using rustc 1.75.0 (82e1608df 2023-12-21) (built from a source tarball) +Building for CRAN. +Writing `src/Makevars`. +`tools/config.R` has finished. +** libs +using C compiler: ‘gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +... +export CARGO_HOME=/tmp/workdir/rshift/old/rshift.Rcheck/00_pkg_src/rshift/src/.cargo && \ +export PATH="/usr/local/sbin:/usr/local/bin:/usr/sbin:/usr/bin:/sbin:/bin:/root/.cargo/bin" && \ +RUSTFLAGS=" --print=native-static-libs" cargo build -j 2 --offline --lib --release --manifest-path=./rust/Cargo.toml --target-dir ./rust/target +error: failed to parse lock file at: /tmp/workdir/rshift/old/rshift.Rcheck/00_pkg_src/rshift/src/rust/Cargo.lock + +Caused by: + lock file version 4 requires `-Znext-lockfile-bump` +make: *** [Makevars:28: rust/target/release/librshift.a] Error 101 +ERROR: compilation failed for package ‘rshift’ +* removing ‘/tmp/workdir/rshift/old/rshift.Rcheck/rshift’ ``` -# tidyvpc +# RSP
-* 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 +* Version: 0.4 +* GitHub: NA +* Source code: https://github.com/cran/RSP +* Date/Publication: 2023-09-24 21:00:02 UTC +* Number of recursive dependencies: 238 -Run `revdepcheck::cloud_details(, "tidyvpc")` for more info +Run `revdepcheck::cloud_details(, "RSP")` for more info
## In both -* checking whether package ‘tidyvpc’ can be installed ... ERROR +* checking whether package ‘RSP’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/tidyvpc/new/tidyvpc.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/RSP/new/RSP.Rcheck/00install.out’ for details. ``` ## Installation @@ -12464,139 +1512,137 @@ Run `revdepcheck::cloud_details(, "tidyvpc")` for more info ### Devel ``` -* installing *source* package ‘tidyvpc’ ... -** package ‘tidyvpc’ successfully unpacked and MD5 sums checked +* installing *source* package ‘RSP’ ... +** package ‘RSP’ 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 in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘OpenMx’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart Execution halted -ERROR: lazy loading failed for package ‘tidyvpc’ -* removing ‘/tmp/workdir/tidyvpc/new/tidyvpc.Rcheck/tidyvpc’ +ERROR: lazy loading failed for package ‘RSP’ +* removing ‘/tmp/workdir/RSP/new/RSP.Rcheck/RSP’ ``` ### CRAN ``` -* installing *source* package ‘tidyvpc’ ... -** package ‘tidyvpc’ successfully unpacked and MD5 sums checked +* installing *source* package ‘RSP’ ... +** package ‘RSP’ 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 in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘OpenMx’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart Execution halted -ERROR: lazy loading failed for package ‘tidyvpc’ -* removing ‘/tmp/workdir/tidyvpc/old/tidyvpc.Rcheck/tidyvpc’ +ERROR: lazy loading failed for package ‘RSP’ +* removing ‘/tmp/workdir/RSP/old/RSP.Rcheck/RSP’ ``` -# tinyarray +# rstanarm
-* 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 +* Version: 2.32.1 +* GitHub: https://github.com/stan-dev/rstanarm +* Source code: https://github.com/cran/rstanarm +* Date/Publication: 2024-01-18 23:00:03 UTC +* Number of recursive dependencies: 140 -Run `revdepcheck::cloud_details(, "tinyarray")` for more info +Run `revdepcheck::cloud_details(, "rstanarm")` for more info
-## Error before installation +## In both -### Devel +* checking whether package ‘rstanarm’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/00install.out’ for details. + ``` -``` -* 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’ +## Installation -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR +### Devel +``` +* installing *source* package ‘rstanarm’ ... +** package ‘rstanarm’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 +"/opt/R/4.4.0/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan +Wrote C++ file "stan_files/bernoulli.cc" +... +/usr/local/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::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.4.0/lib/R/etc/Makeconf:202: stan_files/continuous.o] Error 1 +rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc +ERROR: compilation failed for package ‘rstanarm’ +* removing ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/rstanarm’ ``` ### CRAN ``` -* 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 - +* installing *source* package ‘rstanarm’ ... +** package ‘rstanarm’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 +"/opt/R/4.4.0/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan +Wrote C++ file "stan_files/bernoulli.cc" +... +/usr/local/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:0: required from here +/usr/local/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::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.4.0/lib/R/etc/Makeconf:202: stan_files/continuous.o] Error 1 +rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc +ERROR: compilation failed for package ‘rstanarm’ +* removing ‘/tmp/workdir/rstanarm/old/rstanarm.Rcheck/rstanarm’ ``` -# treeclim +# scplot
-* 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 +* Version: 0.5.1 +* GitHub: NA +* Source code: https://github.com/cran/scplot +* Date/Publication: 2025-03-01 13:10:03 UTC +* Number of recursive dependencies: 115 -Run `revdepcheck::cloud_details(, "treeclim")` for more info +Run `revdepcheck::cloud_details(, "scplot")` for more info
-## In both +## Newly broken -* checking whether package ‘treeclim’ can be installed ... ERROR +* checking whether package ‘scplot’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/treeclim/new/treeclim.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/scplot/new/scplot.Rcheck/00install.out’ for details. ``` ## Installation @@ -12604,207 +1650,172 @@ Run `revdepcheck::cloud_details(, "treeclim")` for more info ### Devel ``` -* installing *source* package ‘treeclim’ ... -** package ‘treeclim’ successfully unpacked and MD5 sums checked +* installing *source* package ‘scplot’ ... +** package ‘scplot’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun.cpp -o corfun.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_exact.cpp -o corfun_exact.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_noboot.cpp -o corfun_noboot.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c pcor.cpp -o pcor.o -... -** data -*** moving datasets to lazyload DB +** 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 +Warning: The `size` argument of `element_rect()` is deprecated as of ggplot2 3.4.0. +ℹ Please use the `linewidth` argument instead. +ℹ The deprecated feature was likely used in the scplot package. + Please report the issue to the authors. +Error in `class<-`(`*tmp*`, value = "list") : + cannot coerce type 'object' to vector of type 'list' +Error: unable to load R code in package ‘scplot’ Execution halted -ERROR: lazy loading failed for package ‘treeclim’ -* removing ‘/tmp/workdir/treeclim/new/treeclim.Rcheck/treeclim’ +ERROR: lazy loading failed for package ‘scplot’ +* removing ‘/tmp/workdir/scplot/new/scplot.Rcheck/scplot’ ``` ### CRAN ``` -* installing *source* package ‘treeclim’ ... -** package ‘treeclim’ successfully unpacked and MD5 sums checked +* installing *source* package ‘scplot’ ... +** package ‘scplot’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun.cpp -o corfun.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_exact.cpp -o corfun_exact.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c corfun_noboot.cpp -o corfun_noboot.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c pcor.cpp -o pcor.o -... -** data -*** moving datasets to lazyload DB +** 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 ‘treeclim’ -* removing ‘/tmp/workdir/treeclim/old/treeclim.Rcheck/treeclim’ +** help +*** installing help indices +*** copying figures +** 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 (scplot) ``` -# TriDimRegression +# StatTeacherAssistant
-* Version: 1.0.2 -* GitHub: https://github.com/alexander-pastukhov/tridim-regression -* Source code: https://github.com/cran/TriDimRegression -* Date/Publication: 2023-09-13 14:10:03 UTC -* Number of recursive dependencies: 98 +* Version: NA +* GitHub: NA +* Source code: https://github.com/cran/StatTeacherAssistant +* Number of recursive dependencies: 124 -Run `revdepcheck::cloud_details(, "TriDimRegression")` for more info +Run `revdepcheck::cloud_details(, "StatTeacherAssistant")` for more info
-## In both - -* checking whether package ‘TriDimRegression’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/TriDimRegression/new/TriDimRegression.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘TriDimRegression’ ... -** package ‘TriDimRegression’ successfully unpacked and MD5 sums checked -** using staged installation -Error in loadNamespace(x) : there is no package called ‘rstantools’ -Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: configuration failed for package ‘TriDimRegression’ -* removing ‘/tmp/workdir/TriDimRegression/new/TriDimRegression.Rcheck/TriDimRegression’ + + + + ``` ### CRAN ``` -* installing *source* package ‘TriDimRegression’ ... -** package ‘TriDimRegression’ successfully unpacked and MD5 sums checked -** using staged installation -Error in loadNamespace(x) : there is no package called ‘rstantools’ -Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: configuration failed for package ‘TriDimRegression’ -* removing ‘/tmp/workdir/TriDimRegression/old/TriDimRegression.Rcheck/TriDimRegression’ + + + + ``` -# TSrepr +# streamDAG
-* Version: 1.1.0 -* GitHub: https://github.com/PetoLau/TSrepr -* Source code: https://github.com/cran/TSrepr -* Date/Publication: 2020-07-13 06:50:15 UTC -* Number of recursive dependencies: 71 +* 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: 137 -Run `revdepcheck::cloud_details(, "TSrepr")` for more info +Run `revdepcheck::cloud_details(, "streamDAG")` for more info
-## In both - -* checking whether package ‘TSrepr’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/TSrepr/new/TSrepr.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘TSrepr’ ... -** package ‘TSrepr’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c FeatureClippingTrending.cpp -o FeatureClippingTrending.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c helpers.cpp -o helpers.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c measures.cpp -o measures.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c normalizations.cpp -o normalizations.o -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘TSrepr’ -* removing ‘/tmp/workdir/TSrepr/new/TSrepr.Rcheck/TSrepr’ +* using log directory ‘/tmp/workdir/streamDAG/new/streamDAG.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* 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 ``` -* installing *source* package ‘TSrepr’ ... -** package ‘TSrepr’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c FeatureClippingTrending.cpp -o FeatureClippingTrending.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c helpers.cpp -o helpers.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c measures.cpp -o measures.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c normalizations.cpp -o normalizations.o -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘TSrepr’ -* removing ‘/tmp/workdir/TSrepr/old/TSrepr.Rcheck/TSrepr’ +* using log directory ‘/tmp/workdir/streamDAG/old/streamDAG.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* 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 + + + ``` -# twang +# TestAnaAPP
-* Version: 2.6.1 -* GitHub: NA -* Source code: https://github.com/cran/twang -* Date/Publication: 2024-07-22 16:10:01 UTC -* Number of recursive dependencies: 53 +* Version: 1.1.2 +* GitHub: https://github.com/jiangyouxiang/TestAnaAPP +* Source code: https://github.com/cran/TestAnaAPP +* Date/Publication: 2024-11-09 04:00:02 UTC +* Number of recursive dependencies: 264 -Run `revdepcheck::cloud_details(, "twang")` for more info +Run `revdepcheck::cloud_details(, "TestAnaAPP")` for more info
## In both -* checking whether package ‘twang’ can be installed ... ERROR +* checking whether package ‘TestAnaAPP’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/twang/new/twang.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/TestAnaAPP/new/TestAnaAPP.Rcheck/00install.out’ for details. ``` ## Installation @@ -12812,73 +1823,59 @@ Run `revdepcheck::cloud_details(, "twang")` for more info ### Devel ``` -* installing *source* package ‘twang’ ... -** package ‘twang’ successfully unpacked and MD5 sums checked +* installing *source* package ‘TestAnaAPP’ ... +** package ‘TestAnaAPP’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c 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 -installing to /tmp/workdir/twang/new/twang.Rcheck/00LOCK-twang/00new/twang/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 in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘OpenMx’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart Execution halted -ERROR: lazy loading failed for package ‘twang’ -* removing ‘/tmp/workdir/twang/new/twang.Rcheck/twang’ +ERROR: lazy loading failed for package ‘TestAnaAPP’ +* removing ‘/tmp/workdir/TestAnaAPP/new/TestAnaAPP.Rcheck/TestAnaAPP’ ``` ### CRAN ``` -* installing *source* package ‘twang’ ... -** package ‘twang’ successfully unpacked and MD5 sums checked +* installing *source* package ‘TestAnaAPP’ ... +** package ‘TestAnaAPP’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -using C compiler: ‘gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c 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 -installing to /tmp/workdir/twang/old/twang.Rcheck/00LOCK-twang/00new/twang/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 in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : + there is no package called ‘OpenMx’ +Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart Execution halted -ERROR: lazy loading failed for package ‘twang’ -* removing ‘/tmp/workdir/twang/old/twang.Rcheck/twang’ +ERROR: lazy loading failed for package ‘TestAnaAPP’ +* removing ‘/tmp/workdir/TestAnaAPP/old/TestAnaAPP.Rcheck/TestAnaAPP’ ``` -# vdg +# tidydr
-* Version: 1.2.3 -* GitHub: NA -* Source code: https://github.com/cran/vdg -* Date/Publication: 2024-04-23 13:00:02 UTC -* Number of recursive dependencies: 45 +* Version: 0.0.5 +* GitHub: https://github.com/YuLab-SMU/tidydr +* Source code: https://github.com/cran/tidydr +* Date/Publication: 2023-03-08 09:20:02 UTC +* Number of recursive dependencies: 76 -Run `revdepcheck::cloud_details(, "vdg")` for more info +Run `revdepcheck::cloud_details(, "tidydr")` for more info
-## In both +## Newly broken -* checking whether package ‘vdg’ can be installed ... ERROR +* checking whether package ‘tidydr’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/vdg/new/vdg.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/tidydr/new/tidydr.Rcheck/00install.out’ for details. ``` ## Installation @@ -12886,106 +1883,68 @@ Run `revdepcheck::cloud_details(, "vdg")` for more info ### Devel ``` -* installing *source* package ‘vdg’ ... -** package ‘vdg’ successfully unpacked and MD5 sums checked +* installing *source* package ‘tidydr’ ... +** package ‘tidydr’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -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 ** R -** data -*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘quantreg’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required +Error in get(x, envir = ns, inherits = FALSE) : + object 'len0_null' not found +Error: unable to load R code in package ‘tidydr’ Execution halted -ERROR: lazy loading failed for package ‘vdg’ -* removing ‘/tmp/workdir/vdg/new/vdg.Rcheck/vdg’ +ERROR: lazy loading failed for package ‘tidydr’ +* removing ‘/tmp/workdir/tidydr/new/tidydr.Rcheck/tidydr’ ``` ### CRAN ``` -* installing *source* package ‘vdg’ ... -** package ‘vdg’ successfully unpacked and MD5 sums checked +* installing *source* package ‘tidydr’ ... +** package ‘tidydr’ successfully unpacked and MD5 sums checked ** using staged installation -** libs -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 ** R -** data -*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘quantreg’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Execution halted -ERROR: lazy loading failed for package ‘vdg’ -* removing ‘/tmp/workdir/vdg/old/vdg.Rcheck/vdg’ +** 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 (tidydr) ``` -# VecDep +# tricolore
-* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/VecDep -* Number of recursive dependencies: 100 +* Version: 1.2.4 +* GitHub: https://github.com/jschoeley/tricolore +* Source code: https://github.com/cran/tricolore +* Date/Publication: 2024-05-15 15:00:02 UTC +* Number of recursive dependencies: 105 -Run `revdepcheck::cloud_details(, "VecDep")` for more info +Run `revdepcheck::cloud_details(, "tricolore")` for more info
-## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# visa - -
- -* Version: 0.1.0 -* GitHub: https://github.com/kang-yu/visa -* Source code: https://github.com/cran/visa -* Date/Publication: 2021-04-20 07:20:02 UTC -* Number of recursive dependencies: 139 - -Run `revdepcheck::cloud_details(, "visa")` for more info +## Newly broken -
+* checking whether package ‘tricolore’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/tricolore/new/tricolore.Rcheck/00install.out’ for details. + ``` -## In both +## Newly fixed -* checking whether package ‘visa’ can be installed ... ERROR +* checking data for non-ASCII characters ... NOTE ``` - Installation failed. - See ‘/tmp/workdir/visa/new/visa.Rcheck/00install.out’ for details. + Note: found 2 marked UTF-8 strings ``` ## Installation @@ -12993,98 +1952,118 @@ Run `revdepcheck::cloud_details(, "visa")` for more info ### Devel ``` -* installing *source* package ‘visa’ ... -** package ‘visa’ successfully unpacked and MD5 sums checked +* installing *source* package ‘tricolore’ ... +** package ‘tricolore’ 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: .onLoad failed in loadNamespace() for 'ggtern', details: + call: NULL + error: object properties are invalid: +- @lineend must be or , not S3 Execution halted -ERROR: lazy loading failed for package ‘visa’ -* removing ‘/tmp/workdir/visa/new/visa.Rcheck/visa’ +ERROR: lazy loading failed for package ‘tricolore’ +* removing ‘/tmp/workdir/tricolore/new/tricolore.Rcheck/tricolore’ ``` ### CRAN ``` -* installing *source* package ‘visa’ ... -** package ‘visa’ successfully unpacked and MD5 sums checked +* installing *source* package ‘tricolore’ ... +** package ‘tricolore’ successfully unpacked and MD5 sums checked ** using staged installation ** R ** data *** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘visa’ -* removing ‘/tmp/workdir/visa/old/visa.Rcheck/visa’ +** 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 (tricolore) ``` -# VisualizeSimon2Stage +# TriDimRegression
-* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/VisualizeSimon2Stage -* Number of recursive dependencies: 36 +* Version: 1.0.2 +* GitHub: https://github.com/alexander-pastukhov/tridim-regression +* Source code: https://github.com/cran/TriDimRegression +* Date/Publication: 2023-09-13 14:10:03 UTC +* Number of recursive dependencies: 96 -Run `revdepcheck::cloud_details(, "VisualizeSimon2Stage")` for more info +Run `revdepcheck::cloud_details(, "TriDimRegression")` for more info
-## Error before installation - -### Devel - -``` +## In both +* checking whether package ‘TriDimRegression’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/TriDimRegression/new/TriDimRegression.Rcheck/00install.out’ for details. + ``` +## Installation +### Devel +``` +* installing *source* package ‘TriDimRegression’ ... +** package ‘TriDimRegression’ successfully unpacked and MD5 sums checked +** using staged installation +Error in loadNamespace(x) : there is no package called ‘rstantools’ +Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: configuration failed for package ‘TriDimRegression’ +* removing ‘/tmp/workdir/TriDimRegression/new/TriDimRegression.Rcheck/TriDimRegression’ ``` ### CRAN ``` - - - - +* installing *source* package ‘TriDimRegression’ ... +** package ‘TriDimRegression’ successfully unpacked and MD5 sums checked +** using staged installation +Error in loadNamespace(x) : there is no package called ‘rstantools’ +Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart +Execution halted +ERROR: configuration failed for package ‘TriDimRegression’ +* removing ‘/tmp/workdir/TriDimRegression/old/TriDimRegression.Rcheck/TriDimRegression’ ``` -# wppExplorer +# webSDM
-* 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 +* Version: 1.1-5 +* GitHub: https://github.com/giopogg/webSDM +* Source code: https://github.com/cran/webSDM +* Date/Publication: 2024-06-24 12:10:02 UTC +* Number of recursive dependencies: 194 -Run `revdepcheck::cloud_details(, "wppExplorer")` for more info +Run `revdepcheck::cloud_details(, "webSDM")` for more info
## Newly broken -* checking whether package ‘wppExplorer’ can be installed ... ERROR +* checking whether package ‘webSDM’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/wppExplorer/new/wppExplorer.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/webSDM/new/webSDM.Rcheck/00install.out’ for details. ``` ## Installation @@ -13092,27 +2071,27 @@ Run `revdepcheck::cloud_details(, "wppExplorer")` for more info ### Devel ``` -* installing *source* package ‘wppExplorer’ ... -** package ‘wppExplorer’ successfully unpacked and MD5 sums checked +* installing *source* package ‘webSDM’ ... +** package ‘webSDM’ 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’ +Error: .onLoad failed in loadNamespace() for 'rstan', details: + call: NULL + error: C stack usage 9964308 is too close to the limit Execution halted -ERROR: lazy loading failed for package ‘wppExplorer’ -* removing ‘/tmp/workdir/wppExplorer/new/wppExplorer.Rcheck/wppExplorer’ +ERROR: lazy loading failed for package ‘webSDM’ +* removing ‘/tmp/workdir/webSDM/new/webSDM.Rcheck/webSDM’ ``` ### CRAN ``` -* installing *source* package ‘wppExplorer’ ... -** package ‘wppExplorer’ successfully unpacked and MD5 sums checked +* installing *source* package ‘webSDM’ ... +** package ‘webSDM’ successfully unpacked and MD5 sums checked ** using staged installation ** R ** data @@ -13120,34 +2099,36 @@ ERROR: lazy loading failed for package ‘wppExplorer’ ** byte-compile and prepare package for lazy loading ** help *** installing help indices +*** copying figures ** 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 (wppExplorer) +* DONE (webSDM) ``` -# WRTDStidal +# xpose
-* Version: 1.1.4 -* GitHub: https://github.com/fawda123/WRTDStidal -* Source code: https://github.com/cran/WRTDStidal -* Date/Publication: 2023-10-20 09:00:11 UTC -* Number of recursive dependencies: 139 +* Version: 0.4.19 +* GitHub: https://github.com/UUPharmacometrics/xpose +* Source code: https://github.com/cran/xpose +* Date/Publication: 2025-01-07 20:00:02 UTC +* Number of recursive dependencies: 106 -Run `revdepcheck::cloud_details(, "WRTDStidal")` for more info +Run `revdepcheck::cloud_details(, "xpose")` for more info
-## In both +## Newly broken -* checking whether package ‘WRTDStidal’ can be installed ... ERROR +* checking whether package ‘xpose’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/WRTDStidal/new/WRTDStidal.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/xpose/new/xpose.Rcheck/00install.out’ for details. ``` ## Installation @@ -13155,75 +2136,50 @@ Run `revdepcheck::cloud_details(, "WRTDStidal")` for more info ### Devel ``` -* installing *source* package ‘WRTDStidal’ ... -** package ‘WRTDStidal’ successfully unpacked and MD5 sums checked +* installing *source* package ‘xpose’ ... +** package ‘xpose’ successfully unpacked and MD5 sums checked ** using staged installation ** R ** data *** moving datasets to lazyload DB +Error in get("print.ggplot", envir = asNamespace("ggplot2")) : + object 'print.ggplot' not found +Warning: namespace ‘xpose’ is not available and has been replaced +by .GlobalEnv when processing object ‘xpdb_ex_pk’ +... +Warning: namespace ‘xpose’ is not available and has been replaced +by .GlobalEnv when processing object ‘xpdb_ex_pk’ ** 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 in get("print.ggplot", envir = asNamespace("ggplot2")) : + object 'print.ggplot' not found +Error: unable to load R code in package ‘xpose’ Execution halted -ERROR: lazy loading failed for package ‘WRTDStidal’ -* removing ‘/tmp/workdir/WRTDStidal/new/WRTDStidal.Rcheck/WRTDStidal’ +ERROR: lazy loading failed for package ‘xpose’ +* removing ‘/tmp/workdir/xpose/new/xpose.Rcheck/xpose’ ``` ### CRAN ``` -* installing *source* package ‘WRTDStidal’ ... -** package ‘WRTDStidal’ successfully unpacked and MD5 sums checked +* installing *source* package ‘xpose’ ... +** package ‘xpose’ 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 ‘WRTDStidal’ -* removing ‘/tmp/workdir/WRTDStidal/old/WRTDStidal.Rcheck/WRTDStidal’ - - -``` -# xxdi - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/xxdi -* Number of recursive dependencies: 37 - -Run `revdepcheck::cloud_details(, "xxdi")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - +** help +*** installing help indices +*** copying figures +** 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 (xpose) ``` diff --git a/revdep/problems.md b/revdep/problems.md index e69de29bb2..24fde55d54 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -0,0 +1,32368 @@ +# activAnalyzer + +
+ +* Version: 2.1.2 +* GitHub: https://github.com/pydemull/activAnalyzer +* Source code: https://github.com/cran/activAnalyzer +* Date/Publication: 2024-09-23 23:40:02 UTC +* Number of recursive dependencies: 145 + +Run `revdepcheck::cloud_details(, "activAnalyzer")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘activAnalyzer.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.8Mb + sub-directories of 1Mb or more: + R 1.5Mb + doc 1.0Mb + extdata 2.0Mb + ``` + +# actxps + +
+ +* Version: 1.6.0 +* GitHub: https://github.com/mattheaphy/actxps +* Source code: https://github.com/cran/actxps +* Date/Publication: 2025-01-07 13:00:02 UTC +* Number of recursive dependencies: 130 + +Run `revdepcheck::cloud_details(, "actxps")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘actxps.Rmd’ using rmarkdown + + Quitting from actxps.Rmd:10-18 [setup] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `get()`: + ! object 'ggplot_build.ggplot' not found + --- + Backtrace: + ... + + Error: processing vignette 'transactions.Rmd' failed with diagnostics: + object 'ggplot_build.ggplot' not found + --- failed re-building ‘transactions.Rmd’ + + SUMMARY: processing the following files failed: + ‘actxps.Rmd’ ‘misc.Rmd’ ‘transactions.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# adklakedata + +
+ +* 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: 62 + +Run `revdepcheck::cloud_details(, "adklakedata")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘adklakedata-Ex.R’ failed + The error most likely occurred in: + + > ### Name: adk_lake_shapes + > ### Title: Return path to Lake Polygons Shapefile + > ### Aliases: adk_lake_shapes + > + > ### ** Examples + > + > 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 + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# adsoRptionCMF + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/adsoRptionCMF +* Date/Publication: 2025-06-05 10:00:05 UTC +* Number of recursive dependencies: 47 + +Run `revdepcheck::cloud_details(, "adsoRptionCMF")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘adsoRptionCMF-Ex.R’ failed + The error most likely occurred in: + + > ### Name: fit_freundlichLM + > ### Title: Freundlich Isotherm Linear Analysis + > ### Aliases: fit_freundlichLM + > + > ### ** Examples + > + > Ce <- c(0.01353, 0.04648, 0.13239, 0.27714, 0.41600, 0.63607, 0.80435, 1.10327, 1.58223) + ... + 17. │ └─l$compute_geom_2(d, theme = plot@theme) + 18. │ └─ggplot2 (local) compute_geom_2(..., self = self) + 19. │ └─self$geom$use_defaults(...) + 20. │ └─ggplot2 (local) use_defaults(..., self = self) + 21. │ └─ggplot2:::check_aesthetics(new_params, nrow(data)) + 22. │ └─vctrs::list_sizes(x) + 23. └─vctrs:::stop_scalar_type(``(``), "x$label", ``) + 24. └─vctrs:::stop_vctrs(...) + 25. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + Execution halted + ``` + +# 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: 60 + +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 re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Introduction.Rmd’ using rmarkdown + + Quitting from Introduction.Rmd:47-74 [unnamed-chunk-3] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `process_cpl_read_ogr()`: + ! package tibble not available: install first? + --- + Backtrace: + ... + + 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 + +
+ +* Version: 2.0.1 +* GitHub: NA +* Source code: https://github.com/cran/AeRobiology +* Date/Publication: 2019-06-03 06:20:03 UTC +* Number of recursive dependencies: 95 + +Run `revdepcheck::cloud_details(, "AeRobiology")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘my-vignette.Rmd’ using rmarkdown + ``` + +# afex + +
+ +* Version: 1.4-1 +* GitHub: https://github.com/singmann/afex +* Source code: https://github.com/cran/afex +* Date/Publication: 2024-09-01 16:10:02 UTC +* Number of recursive dependencies: 238 + +Run `revdepcheck::cloud_details(, "afex")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘afex_analysing_accuracy_data.Rmd’ using rmarkdown + ``` + +# AgroR + +
+ +* Version: 1.3.6 +* GitHub: NA +* Source code: https://github.com/cran/AgroR +* Date/Publication: 2024-04-24 02:20:18 UTC +* Number of recursive dependencies: 118 + +Run `revdepcheck::cloud_details(, "AgroR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘AgroR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: DBC.glm + > ### Title: Analysis: Randomized block design by glm + > ### Aliases: DBC.glm + > + > ### ** Examples + > + > data("aristolochia") + ... + trat prob SE asymp.LCL asymp.UCL .group + 15 15 0.00 0.00 0.00 0.00 d + 20 20 0.04 0.01 0.03 0.05 c + 25 25 0.47 0.02 0.44 0.51 b + 30 30 0.75 0.02 0.72 0.78 a + 35 35 0.54 0.02 0.50 0.57 b + Error in as.vector(x, "list") : + cannot coerce type 'object' to vector of type 'list' + Calls: DBC.glm -> as.list -> as.list.default + Execution halted + ``` + +# AgroReg + +
+ +* Version: 1.2.10 +* GitHub: NA +* Source code: https://github.com/cran/AgroReg +* Date/Publication: 2024-01-16 12:50:16 UTC +* Number of recursive dependencies: 116 + +Run `revdepcheck::cloud_details(, "AgroReg")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘AgroReg-Ex.R’ failed + The error most likely occurred in: + + > ### Name: adjust_scale + > ### Title: Utils: Adjust y and x scale + > ### Aliases: adjust_scale + > + > ### ** Examples + > + > library(AgroReg) + ... + > data("aristolochia") + > attach(aristolochia) + > a=LM(trat,resp) + + > b=LL(trat,resp,npar = "LL.3") + > a=plot_arrange(list(a,b),gray = TRUE) + Error in equation[[i]] <- plots[[i]][[3]]$plot$s : + replacement has length zero + Calls: plot_arrange + Execution halted + ``` + +# AgroTech + +
+ +* Version: 1.0.2 +* GitHub: NA +* Source code: https://github.com/cran/AgroTech +* Date/Publication: 2022-09-14 20:30:02 UTC +* Number of recursive dependencies: 43 + +Run `revdepcheck::cloud_details(, "AgroTech")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘AgroTech-Ex.R’ failed + The error most likely occurred in: + + > ### Name: markblue + > ### Title: Spray deposit (glowing blue marker) + > ### Aliases: markblue + > + > ### ** Examples + > + > data("example_markbluecurve") + ... + 4 0.6413714 ab + 1 0.6331792 ab + 2 0.4861496 b + 3 0.1564178 c + + + Error in as.vector(x, "list") : + cannot coerce type 'object' to vector of type 'list' + Calls: markblue ... eval -> eval -> dic.analysis -> as.list -> as.list.default + Execution halted + ``` + +# airGR + +
+ +* Version: 1.7.6 +* GitHub: NA +* Source code: https://github.com/cran/airGR +* Date/Publication: 2023-10-26 07:30:05 UTC +* Number of recursive dependencies: 96 + +Run `revdepcheck::cloud_details(, "airGR")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘V01_get_started.Rmd’ using rmarkdown + --- finished re-building ‘V01_get_started.Rmd’ + + --- re-building ‘V02.1_param_optim.Rmd’ using rmarkdown + ``` + +# AlleleShift + +
+ +* Version: 1.1-2 +* GitHub: NA +* Source code: https://github.com/cran/AlleleShift +* Date/Publication: 2023-10-28 21:50:12 UTC +* Number of recursive dependencies: 170 + +Run `revdepcheck::cloud_details(, "AlleleShift")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘AlleleShift-Ex.R’ failed + The error most likely occurred in: + + > ### Name: shift.dot.ggplot + > ### Title: Shifts of Allele Frequencies as Response to Climate Change + > ### Aliases: shift.dot.ggplot + > + > ### ** Examples + > + > + ... + Warning: Use of `freq.future$Allele.freq` is discouraged. + ℹ Use `Allele.freq` instead. + Warning: Use of `freq.future$Pop` is discouraged. + ℹ Use `Pop` instead. + Warning: Use of `freq.future$Freq.e2` is discouraged. + ℹ Use `Freq.e2` instead. + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +# alookr + +
+ +* Version: 0.3.9 +* GitHub: https://github.com/choonghyunryu/alookr +* Source code: https://github.com/cran/alookr +* Date/Publication: 2024-02-11 07:30:02 UTC +* Number of recursive dependencies: 169 + +Run `revdepcheck::cloud_details(, "alookr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘alookr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: compare_plot + > ### Title: Comparison plot of train set and test set + > ### Aliases: compare_plot + > + > ### ** Examples + > + > library(dplyr) + ... + > sb %>% + + compare_plot() + Warning: `unite_()` was deprecated in tidyr 1.2.0. + ℹ Please use `unite()` instead. + ℹ The deprecated feature was likely used in the ggmosaic package. + Please report the issue at . + Error in make_title(..., self = self) : + unused arguments ("dataset class", "x") + Calls: %>% ... labels -> -> resolve_label -> + Execution halted + ``` + +# AnalysisLin + +
+ +* Version: 0.1.2 +* GitHub: NA +* Source code: https://github.com/cran/AnalysisLin +* Date/Publication: 2024-01-30 00:10:10 UTC +* Number of recursive dependencies: 119 + +Run `revdepcheck::cloud_details(, "AnalysisLin")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘AnalysisLin-Ex.R’ failed + The error most likely occurred in: + + > ### Name: bar_plot + > ### Title: Bar Plots for Categorical Variables + > ### Aliases: bar_plot + > + > ### ** Examples + > + > data(iris) + > bar_plot(iris) + Error in pm[[2]] : subscript out of bounds + Calls: bar_plot ... plotly_build -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +# andurinha + +
+ +* Version: 0.0.2 +* GitHub: https://github.com/noemiallefs/andurinha +* Source code: https://github.com/cran/andurinha +* Date/Publication: 2020-08-13 08:40:02 UTC +* Number of recursive dependencies: 75 + +Run `revdepcheck::cloud_details(, "andurinha")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(andurinha) + > + > test_check("andurinha") + sample absMax + 1 A 0.465 + 2 B 0.402 + ... + ── Failure ('test_funtionsOutput.R:29:3'): plotPeaks return a ggplot objetc ──── + class(...) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + ── Failure ('test_funtionsOutput.R:32:3'): plotPeaks return a ggplot objetc ──── + class(...) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 43 ] + Error: Test failures + Execution halted + ``` + +# animbook + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/KrisanatA/animbook +* Source code: https://github.com/cran/animbook +* Date/Publication: 2023-12-05 17:50:07 UTC +* Number of recursive dependencies: 86 + +Run `revdepcheck::cloud_details(, "animbook")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘animbook-Ex.R’ failed + The error most likely occurred in: + + > ### Name: anim_animate + > ### Title: Modified the ggplot object + > ### Aliases: anim_animate + > + > ### ** Examples + > + > animbook <- anim_prep(data = osiris, id = ID, values = sales, time = year, group = japan) + > + > plot <- wallaby_plot(animbook) + You can now use the animbook::anim_animate() function to + transform it into an animated object + > + > animate <- anim_animate(plot) + Error in plot$plot_env : object of type 'object' is not subsettable + Calls: anim_animate + Execution halted + ``` + +# ANN2 + +
+ +* Version: 2.3.4 +* 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: 49 + +Run `revdepcheck::cloud_details(, "ANN2")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ANN2) + > + > # Only test if not on mac + > if (tolower(Sys.info()[["sysname"]]) != "darwin") { + + test_check("ANN2") + + } + ... + ── Failure ('test-plotting.R:59:3'): the reconstruction_plot.ANN() function works correctly ── + p_AE$labels$colour not equal to "col". + target is NULL, current is character + ── Failure ('test-plotting.R:77:3'): the compression_plot.ANN() function works correctly ── + p_AE$labels$colour not equal to "col". + target is NULL, current is character + + [ FAIL 5 | WARN 2 | SKIP 4 | PASS 143 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking C++ specification ... NOTE + ``` + Specified C++11: please drop specification unless essential + ``` + +* checking installed package size ... NOTE + ``` + installed size is 48.9Mb + sub-directories of 1Mb or more: + cereal 1.4Mb + libs 47.4Mb + ``` + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# APackOfTheClones + +
+ +* Version: 1.2.4 +* GitHub: https://github.com/Qile0317/APackOfTheClones +* Source code: https://github.com/cran/APackOfTheClones +* Date/Publication: 2024-11-18 22:30:02 UTC +* Number of recursive dependencies: 175 + +Run `revdepcheck::cloud_details(, "APackOfTheClones")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘APackOfTheClones-Ex.R’ failed + The error most likely occurred in: + + > ### Name: APOTCPlot + > ### Title: Various variations of visualizations of clonal expansion + > ### post-RunAPOTC + > ### Aliases: APOTCPlot + > + > ### ** Examples + > + ... + by .GlobalEnv when processing object ‘combined_pbmc’ + Warning: namespace ‘colorspace’ is not available and has been replaced + by .GlobalEnv when processing object ‘combined_pbmc’ + > + > combined_pbmc <- RunAPOTC( + + combined_pbmc, run_id = "run1", verbose = FALSE + + ) + > + > # plotting with default arguments will plot the latest "run1" + > clonal_packing_plot <- APOTCPlot(combined_pbmc) + ``` + +* 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 + ... + 27. │ └─vctrs:::stop_names(...) + 28. │ └─vctrs:::stop_vctrs(...) + 29. │ └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + 30. ├─APackOfTheClones:::name_latest_legend_layer(.) + 31. │ └─plt %>% name_latest_layer(.ApotcLegendLayerName) + 32. └─APackOfTheClones:::name_latest_layer(., .ApotcLegendLayerName) + + [ FAIL 5 | WARN 57 | SKIP 10 | PASS 239 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘APackOfTheClones-install.Rmd’ using rmarkdown + --- finished re-building ‘APackOfTheClones-install.Rmd’ + + --- re-building ‘APackOfTheClones-runs.Rmd’ using rmarkdown + ``` + +## In both + +* checking contents of ‘data’ directory ... WARNING + ``` + Output for data("combined_pbmc", package = "APackOfTheClones"): + Warning: namespace ‘colorspace’ is not available and has been replaced + by .GlobalEnv when processing object ‘combined_pbmc’ + Warning: namespace ‘colorspace’ is not available and has been replaced + by .GlobalEnv when processing object ‘combined_pbmc’ + Warning: namespace ‘colorspace’ is not available and has been replaced + by .GlobalEnv when processing object ‘combined_pbmc’ + Warning: namespace ‘colorspace’ is not available and has been replaced + by .GlobalEnv when processing object ‘combined_pbmc’ + ``` + +* checking installed package size ... NOTE + ``` + installed size is 7.6Mb + sub-directories of 1Mb or more: + help 1.1Mb + libs 5.3Mb + ``` + +# APCtools + +
+ +* 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: 113 + +Run `revdepcheck::cloud_details(, "APCtools")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘APCtools-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_densityMatrix + > ### Title: Create a matrix of density plots + > ### Aliases: plot_densityMatrix + > + > ### ** Examples + > + > library(APCtools) + ... + 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 + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(APCtools) + > + > test_check("APCtools") + Loading required package: nlme + This is mgcv 1.9-1. For overview type 'help("mgcv-package")'. + Excluding 9565 missing observations of mainTrip_distance... + ... + ▆ + 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 2 | WARN 51 | SKIP 0 | PASS 84 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘main_functionality.Rmd’ using rmarkdown + ``` + +# aplot + +
+ +* Version: 0.2.5 +* GitHub: https://github.com/YuLab-SMU/aplot +* Source code: https://github.com/cran/aplot +* Date/Publication: 2025-02-27 03:50:02 UTC +* Number of recursive dependencies: 48 + +Run `revdepcheck::cloud_details(, "aplot")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.axisAlign: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.alab: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# apm + +
+ +* Version: 0.1.1 +* GitHub: https://github.com/tl2624/apm +* Source code: https://github.com/cran/apm +* Date/Publication: 2025-05-22 20:00:02 UTC +* Number of recursive dependencies: 56 + +Run `revdepcheck::cloud_details(, "apm")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘apm-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.apm_pre_fits + > ### Title: Plot outputs of 'apm_pre()' + > ### Aliases: plot.apm_pre_fits + > + > ### ** Examples + > + > data("ptpdata") + ... + > + > plot(fits, type = "weights") + > + > plot(fits, type = "error", ncol = 2) + > + > plot(fits, type = "predict", model = ".optimal") + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘apm.Rmd’ using rmarkdown_notangle + ``` + +# 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: 115 + +Run `revdepcheck::cloud_details(, "applicable")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(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 + ``` + +# arena2r + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/pedroliman/arena2r +* Source code: https://github.com/cran/arena2r +* Date/Publication: 2018-10-19 15:30:03 UTC +* Number of recursive dependencies: 87 + +Run `revdepcheck::cloud_details(, "arena2r")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(arena2r) + > + > test_check("arena2r") + [ FAIL 3 | WARN 6 | SKIP 0 | PASS 4 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ── Failure ('tests_arena2r.R:31:3'): plots_sao_gerados ───────────────────────── + `plot_conf` has type 'object', not 'list'. + ── Failure ('tests_arena2r.R:32:3'): plots_sao_gerados ───────────────────────── + `plot_scat` has type 'object', not 'list'. + ── Failure ('tests_arena2r.R:33:3'): plots_sao_gerados ───────────────────────── + `plot_box` has type 'object', not 'list'. + + [ FAIL 3 | WARN 6 | SKIP 0 | PASS 4 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘purrr’ ‘shinyBS’ ‘shinydashboard’ ‘shinyjs’ + All declared Imports should be used. + ``` + +# ARUtools + +
+ +* Version: 0.7.2 +* GitHub: https://github.com/ARUtools/ARUtools +* Source code: https://github.com/cran/ARUtools +* Date/Publication: 2025-03-19 19:20:05 UTC +* Number of recursive dependencies: 141 + +Run `revdepcheck::cloud_details(, "ARUtools")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ARUtools-Ex.R’ failed + The error most likely occurred in: + + > ### Name: calc_selection_weights + > ### Title: Calculate Selection Weights + > ### Aliases: calc_selection_weights + > + > ### ** Examples + > + > s <- clean_site_index(example_sites_clean, + ... + + calc_sun() + Extracting ARU info... + Extracting Dates and Times... + Joining by columns `date_time_start` and `date_time_end` + > + > params <- sim_selection_weights() + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ARUtools) + > + > test_check("ARUtools") + sh: 1: sox: not found + Extracting Dates and Times... + ! Omitted 1 extra, non-json/GPS files + ... + 13. │ └─base::force(code) + 14. └─S7:::Ops.S7_object((p1 + p2)/p3, ggplot2::theme_minimal(base_size = 14)) + + [ FAIL 1 | WARN 0 | SKIP 5 | PASS 567 ] + Deleting unused snapshots: + • 08_selections/sim-selection-weights1.svg + • 08_selections/sim-selection-weights2.svg + • 08_selections/sim-selection-weights3.svg + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ARUtools.Rmd’ using rmarkdown + --- finished re-building ‘ARUtools.Rmd’ + + --- re-building ‘Misc.Rmd’ using rmarkdown + --- finished re-building ‘Misc.Rmd’ + + --- re-building ‘SubSample.Rmd’ using rmarkdown + + Quitting from SubSample.Rmd:115-124 [unnamed-chunk-5] + ... + --- finished re-building ‘spatial.Rmd’ + + --- re-building ‘timezones.Rmd’ using rmarkdown + --- finished re-building ‘timezones.Rmd’ + + SUMMARY: processing the following files failed: + ‘SubSample.Rmd’ ‘multisampling.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# 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: 137 + +Run `revdepcheck::cloud_details(, "ASRgenomics")` for more info + +
+ +## Newly broken + +* 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 + ... + `expected[2:2]`: "ggplot" + ── Failure ('test-qc.R:58:3'): filters work ──────────────────────────────────── + class(M_filter$plot.maf) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 5 | WARN 7 | SKIP 0 | PASS 258 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 8.9Mb + sub-directories of 1Mb or more: + data 8.5Mb + ``` + +# assignPOP + +
+ +* Version: 1.3.0 +* GitHub: https://github.com/alexkychen/assignPOP +* Source code: https://github.com/cran/assignPOP +* Date/Publication: 2024-03-13 08:30:02 UTC +* Number of recursive dependencies: 139 + +Run `revdepcheck::cloud_details(, "assignPOP")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(assignPOP) + > + > test_check("assignPOP") + + Correct assignment rates were estimated!! + A total of 3 assignment tests for 3 pops. + ... + ── Failure ('test_accuracy.R:8:3'): Calculate assignment accuracy for Monte-Carlo results ── + `plot` has type 'object', not 'list'. + ── Failure ('test_accuracy.R:18:3'): Calculate assignment accuracy for K-fold results ── + `plot` has type 'object', not 'list'. + ── Failure ('test_membership.R:5:3'): Plot membership probability ────────────── + `plot` has type 'object', not 'list'. + + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 39 ] + Error: Test failures + Execution halted + ``` + +# autocogs + +
+ +* Version: 0.1.4 +* 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: 71 + +Run `revdepcheck::cloud_details(, "autocogs")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(autocogs) + > + > test_check("autocogs") + [ FAIL 2 | WARN 1 | SKIP 0 | PASS 223 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + 8. └─autocogs (local) FUN(X[[i]], ...) + 9. └─base::lapply(...) + 10. └─autocogs (local) FUN(X[[i]], ...) + 11. ├─base::do.call(fn, args) + 12. └─autocogs (local) ``(...) + 13. └─base::do.call(loess, c(core_params, params$method.args)) + + [ FAIL 2 | WARN 1 | SKIP 0 | PASS 223 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘MASS’ ‘broom’ ‘diptest’ ‘ggplot2’ ‘hexbin’ ‘moments’ + All declared Imports should be used. + ``` + +# autoplotly + +
+ +* Version: 0.1.4 +* 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: 86 + +Run `revdepcheck::cloud_details(, "autoplotly")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘autoplotly-Ex.R’ failed + The error most likely occurred in: + + > ### Name: autoplotly + > ### Title: Automatic Visualization of Popular Statistical Results Using + > ### 'plotly.js' and 'ggplot2' + > ### Aliases: autoplotly + > + > ### ** Examples + > + ... + > p <- autoplotly(prcomp(iris[c(1, 2, 3, 4)]), data = iris, + + colour = 'Species', label = TRUE, label.size = 3, frame = 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 . + Error in pm[[2]] : subscript out of bounds + Calls: autoplotly ... autoplotly.default -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(autoplotly) + > + > test_check("autoplotly") + [ FAIL 3 | WARN 1 | SKIP 0 | PASS 1 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ▆ + 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 1 | SKIP 0 | PASS 1 ] + Error: Test failures + Execution halted + ``` + +# autoReg + +
+ +* 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: 217 + +Run `revdepcheck::cloud_details(, "autoReg")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘autoReg-Ex.R’ failed + The error most likely occurred in: + + > ### Name: modelPlot + > ### Title: Draw coefficients/odds ratio/hazard ratio plot + > ### Aliases: modelPlot + > + > ### ** Examples + > + > fit=lm(mpg~wt*hp+am,data=mtcars) + > modelPlot(fit,widths=c(1,0,2,3)) + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Automatic_Regression_Modeling.Rmd’ using rmarkdown + + Quitting from Automatic_Regression_Modeling.Rmd:141-143 [unnamed-chunk-15] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + ... + Error: processing vignette 'Getting_started.Rmd' failed with diagnostics: + Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + --- failed re-building ‘Getting_started.Rmd’ + + --- re-building ‘Statiastical_test_in_gaze.Rmd’ using rmarkdown + --- finished re-building ‘Statiastical_test_in_gaze.Rmd’ + + --- re-building ‘Survival.Rmd’ using rmarkdown + ``` + +# 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: 134 + +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) + + +``` +# BAS + +
+ +* Version: 1.7.5 +* GitHub: https://github.com/merliseclyde/BAS +* Source code: https://github.com/cran/BAS +* Date/Publication: 2024-11-28 11:50:02 UTC +* Number of recursive dependencies: 99 + +Run `revdepcheck::cloud_details(, "BAS")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘BAS-vignette.Rmd’ using rmarkdown + ``` + +# BaseSet + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/ropensci/BaseSet +* Source code: https://github.com/cran/BaseSet +* Date/Publication: 2025-02-17 20:10:11 UTC +* Number of recursive dependencies: 104 + +Run `revdepcheck::cloud_details(, "BaseSet")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘BaseSet.Rmd’ using rmarkdown + --- finished re-building ‘BaseSet.Rmd’ + + --- re-building ‘advanced.Rmd’ using rmarkdown + + Quitting from advanced.Rmd:72-91 [evidence_ontology] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `as.vector()`: + ... + --- failed re-building ‘advanced.Rmd’ + + --- re-building ‘fuzzy.Rmd’ using rmarkdown + --- finished re-building ‘fuzzy.Rmd’ + + SUMMARY: processing the following file failed: + ‘advanced.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# BasketballAnalyzeR + +
+ +* Version: 0.8.0 +* GitHub: https://github.com/sndmrc/BasketballAnalyzeR +* Source code: https://github.com/cran/BasketballAnalyzeR +* Date/Publication: 2025-04-18 03:40:02 UTC +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "BasketballAnalyzeR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘BasketballAnalyzeR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: assistnet + > ### Title: Investigates the network of assists-shots in a team + > ### Aliases: assistnet + > + > ### ** Examples + > + > PbP <- PbPmanipulation(PbP.BDB) + ... + > PbP.GSW <- subset(PbP, team=="GSW") + > out <- assistnet(PbP.GSW) + > plot(out) + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the BasketballAnalyzeR package. + Please report the issue at + . + Error: C stack usage 9963748 is too close to the limit + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.0Mb + sub-directories of 1Mb or more: + data 6.5Mb + ``` + +# bayesAB + +
+ +* 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: 70 + +Run `revdepcheck::cloud_details(, "bayesAB")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(bayesAB) + > + > test_check("bayesAB") + [ FAIL 1 | WARN 5 | 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 5 | SKIP 0 | PASS 140 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) plotDistributions.Rd:32: Lost braces + 32 | plot{...} functions are generated programmatically so the function calls in + | ^ + ``` + +# bayesassurance + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/jpan928/bayesassurance_rpackage +* Source code: https://github.com/cran/bayesassurance +* Date/Publication: 2022-06-17 10:40:17 UTC +* Number of recursive dependencies: 85 + +Run `revdepcheck::cloud_details(, "bayesassurance")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(bayesassurance) + > + > test_check("bayesassurance") + [1] 20 10 + [1] 30 10 + [1] 40 10 + ... + Error in `out$plot$labels`: object of type 'object' is not subsettable + Backtrace: + ▆ + 1. └─testthat::expect_identical(out$plot$labels$y, "Power/Assurance") at test-pwr_curves.R:114:3 + 2. └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. └─rlang::eval_bare(expr, quo_get_env(quo)) + + [ FAIL 15 | WARN 92 | SKIP 0 | PASS 125 ] + Error: Test failures + Execution halted + ``` + +# BayesCVI + +
+ +* Version: 1.0.1 +* GitHub: NA +* Source code: https://github.com/cran/BayesCVI +* Date/Publication: 2024-09-04 15:50:02 UTC +* Number of recursive dependencies: 31 + +Run `revdepcheck::cloud_details(, "BayesCVI")` for more info + +
+ +## Newly broken + +* checking whether package ‘BayesCVI’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘BayesCVI’ + See ‘/tmp/workdir/BayesCVI/new/BayesCVI.Rcheck/00install.out’ for details. + ``` + +# BayesERtools + +
+ +* Version: 0.2.1 +* GitHub: NA +* Source code: https://github.com/cran/BayesERtools +* Date/Publication: 2025-02-12 11:40:22 UTC +* Number of recursive dependencies: 216 + +Run `revdepcheck::cloud_details(, "BayesERtools")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + ── Failure ('test-plot_ermod.R:183:5'): plot_er show caption ─────────────────── + `plot_er(...)` produced warnings. + ── Failure ('test-plot_ermod.R:194:3'): plot_er show caption ─────────────────── + `plot_er(...)` produced warnings. + ── Failure ('test-plot_ermod.R:209:5'): plot_er_gof ──────────────────────────── + `plot_er_gof(ermod_bin, show_coef_exp = TRUE, show_caption = TRUE)` produced warnings. + + [ FAIL 8 | WARN 3 | SKIP 0 | PASS 143 ] + Error: Test failures + Execution halted + ``` + +# BayesianFactorZoo + +
+ +* Version: 0.0.0.3 +* GitHub: NA +* Source code: https://github.com/cran/BayesianFactorZoo +* Date/Publication: 2024-10-04 09:30:08 UTC +* Number of recursive dependencies: 72 + +Run `revdepcheck::cloud_details(, "BayesianFactorZoo")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘BayesianFactorZoo-Ex.R’ failed + The error most likely occurred in: + + > ### Name: BayesianFM + > ### Title: Bayesian Fama-MacBeth + > ### Aliases: BayesianFM + > + > ### ** Examples + > + > + ... + + theme(legend.position="bottom")+ + + theme(text = element_text(size = 26))+ + + xlab(bquote("Risk premium ("~lambda[strong]~")")) + + + ylab("Density" ) + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +# BayesianReasoning + +
+ +* 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(, "BayesianReasoning")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + 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 + + ... + `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 16 | SKIP 4 | PASS 115 ] + Error: Test failures + Execution halted + ``` + +# BayesMallows + +
+ +* 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: 79 + +Run `revdepcheck::cloud_details(, "BayesMallows")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + `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 + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 23.8Mb + sub-directories of 1Mb or more: + doc 2.7Mb + libs 20.2Mb + ``` + +# BayesMultiMode + +
+ +* Version: 0.7.3 +* GitHub: https://github.com/paullabonne/BayesMultiMode +* Source code: https://github.com/cran/BayesMultiMode +* Date/Publication: 2024-10-31 15:30:06 UTC +* Number of recursive dependencies: 105 + +Run `revdepcheck::cloud_details(, "BayesMultiMode")` for more info + +
+ +## Newly broken + +* checking whether package ‘BayesMultiMode’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: The `size` argument of `element_line()` is deprecated as of ggplot2 3.4.0. + See ‘/tmp/workdir/BayesMultiMode/new/BayesMultiMode.Rcheck/00install.out’ for details. + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.5Mb + sub-directories of 1Mb or more: + help 6.1Mb + ``` + +# bayesplot + +
+ +* Version: 1.12.0 +* GitHub: https://github.com/stan-dev/bayesplot +* Source code: https://github.com/cran/bayesplot +* Date/Publication: 2025-04-10 10:10:06 UTC +* Number of recursive dependencies: 127 + +Run `revdepcheck::cloud_details(, "bayesplot")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(bayesplot) + This is bayesplot version 1.12.0 + - Online documentation and vignettes at mc-stan.org/bayesplot + - bayesplot theme set to bayesplot::theme_default() + * Does _not_ affect other ggplot2 plots + * See ?bayesplot_theme_set for details on theme setting + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-mcmc-traces.R:59:3'): mcmc_trace options work ──────────────── + all(c("xmin", "xmax", "ymin", "ymax") %in% names(ll)) is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 1 | WARN 6 | SKIP 74 | PASS 1032 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 9.2Mb + sub-directories of 1Mb or more: + R 5.0Mb + doc 3.5Mb + ``` + +# BCEA + +
+ +* Version: 2.4.7 +* GitHub: https://github.com/n8thangreen/BCEA +* Source code: https://github.com/cran/BCEA +* Date/Publication: 2025-01-14 12:30:08 UTC +* Number of recursive dependencies: 124 + +Run `revdepcheck::cloud_details(, "BCEA")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘BCEA-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.bcea + > ### Title: Summary Plot of the Health Economic Analysis + > ### Aliases: plot.bcea + > ### Keywords: hplot + > + > ### ** Examples + > + ... + 21. │ │ └─base (local) tryCatchList(expr, classes, parentenv, handlers) + 22. │ │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]]) + 23. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler) + 24. │ └─base::withCallingHandlers(...) + 25. └─ggplot2::merge_element(t2[[item]], t1[[item]]) + 26. ├─S7::S7_dispatch() + 27. └─ggplot2 (local) `method(merge_element, list(class_any, class_any))`(new = ``, old = ``, ...) + 28. └─cli::cli_abort("No method for merging {.cls {class(new)[1]}} into {.cls {class(old)[1]}}.") + 29. └─rlang::abort(...) + Execution halted + ``` + +# bdsm + +
+ +* Version: 0.2.1 +* GitHub: NA +* Source code: https://github.com/cran/bdsm +* Date/Publication: 2025-05-02 18:50:02 UTC +* Number of recursive dependencies: 111 + +Run `revdepcheck::cloud_details(, "bdsm")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + [2] "ggplot" - + [3] "ggplot2::gg" - + [4] "S7_object" - + [5] "gg" | "gg" [1] + - "ggplot" [2] + [6] "ggarrange" | "ggarrange" [3] + + [ FAIL 10 | WARN 0 | SKIP 6 | PASS 69 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘bdsm_vignette.Rnw’ using Sweave + Error: processing vignette 'bdsm_vignette.Rnw' failed with diagnostics: + Running 'texi2dvi' on 'bdsm_vignette.tex' failed. + LaTeX errors: + ! LaTeX Error: File `vmargin.sty' not found. + + Type X to quit or to proceed, + or enter new name. (Default extension: sty) + ... + l.5 \usepackage + {amsmath}^^M + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘bdsm_vignette.Rnw’ + + SUMMARY: processing the following file failed: + ‘bdsm_vignette.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# BeeBDC + +
+ +* Version: 1.2.1 +* GitHub: https://github.com/jbdorey/BeeBDC +* Source code: https://github.com/cran/BeeBDC +* Date/Publication: 2024-11-04 04:10:02 UTC +* Number of recursive dependencies: 217 + +Run `revdepcheck::cloud_details(, "BeeBDC")` 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 + ... + attributes(testOut)$class (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + ── Failure ('test-summaryMaps.R:23:3'): summaryMaps expected class ───────────── + `testMap` has type 'object', not 'list'. + + [ FAIL 8 | WARN 5 | SKIP 0 | PASS 242 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 219 marked UTF-8 strings + ``` + +# benchr + +
+ +* Version: 0.2.5 +* GitHub: NA +* Source code: https://github.com/cran/benchr +* Date/Publication: 2020-03-07 06:30:03 UTC +* Number of recursive dependencies: 29 + +Run `revdepcheck::cloud_details(, "benchr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > if (requireNamespace("tinytest", quietly = TRUE)) { + + tinytest::test_package("benchr") + + } + + test-benchmark.R.............. 0 tests 0% 10 20 30 40 50 60 70 80 90 100% + [----|----|----|----|----|----|----|----|----|----| + **************************************************| + ... + call| expect_equal(class(pp2), c("gg", "ggplot")) + diff| Lengths (2, 5) differ (string compare on first 2) + diff| 1 string mismatch + ----- FAILED[attr]: test-plot.R<62--62> + call| expect_equal(pp2$labels, list(x = "replications", y = "time", + call| --> colour = NULL)) + diff| Attributes: < names for current but not for target > + diff| Attributes: < Length mismatch: comparison on first 0 components > + Error: 10 out of 176 tests failed + Execution halted + ``` + +## In both + +* checking C++ specification ... NOTE + ``` + Specified C++11: please drop specification unless essential + ``` + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# BGGM + +
+ +* Version: 2.1.5 +* GitHub: https://github.com/donaldRwilliams/BGGM +* Source code: https://github.com/cran/BGGM +* Date/Publication: 2024-12-22 21:40:02 UTC +* Number of recursive dependencies: 210 + +Run `revdepcheck::cloud_details(, "BGGM")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘BGGM-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_prior + > ### Title: Plot: Prior Distribution + > ### Aliases: plot_prior + > + > ### ** Examples + > + > # note: iter = 250 for demonstrative purposes + > + > plot_prior(prior_sd = 0.25, iter = 250) + Warning: `qplot()` was deprecated in ggplot2 3.4.0. + ℹ The deprecated feature was likely used in the BGGM package. + Please report the issue at . + Error: C stack usage 9961780 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘control.Rmd’ using rmarkdown + --- finished re-building ‘control.Rmd’ + + --- re-building ‘hyp_3_ways.Rmd’ using rmarkdown + --- finished re-building ‘hyp_3_ways.Rmd’ + + --- re-building ‘in_tandem.Rmd’ using rmarkdown + --- finished re-building ‘in_tandem.Rmd’ + + ... + --- finished re-building ‘test_sum.Rmd’ + + --- re-building ‘var_model.Rmd’ using rmarkdown + --- finished re-building ‘var_model.Rmd’ + + SUMMARY: processing the following file failed: + ‘ppc_custom.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 12.6Mb + sub-directories of 1Mb or more: + doc 3.4Mb + help 1.1Mb + libs 7.3Mb + ``` + +# 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: 82 + +Run `revdepcheck::cloud_details(, "biclustermd")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(biclustermd) + Loading required package: ggplot2 + Loading required package: tidyr + + Attaching package: 'tidyr' + + ... + ── 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. + Classes differ: 'mapped_discrete'/'numeric' is not 'numeric' + ── Failure ('test-autoplot_biclustermd.R:7:3'): autoplot_biclustermd() correctly plots cluster lines ── + ap$data[[4]]$yintercept[-1] not equal to cumsum(colSums(sbc$Q)) + 0.5. + Classes differ: 'mapped_discrete'/'numeric' is not 'numeric' + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 66 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘nycflights13’ + All declared Imports should be used. + ``` + +# BIGL + +
+ +* Version: 1.9.3 +* GitHub: https://github.com/openanalytics/BIGL +* Source code: https://github.com/cran/BIGL +* Date/Publication: 2024-08-01 08:20:02 UTC +* Number of recursive dependencies: 95 + +Run `revdepcheck::cloud_details(, "BIGL")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘analysis.Rmd’ using rmarkdown + ``` + +# biometryassist + +
+ +* Version: 1.2.2 +* GitHub: https://github.com/biometryhub/biometryassist +* Source code: https://github.com/cran/biometryassist +* Date/Publication: 2025-04-23 15:00:07 UTC +* Number of recursive dependencies: 82 + +Run `revdepcheck::cloud_details(, "biometryassist")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(biometryassist) + > + > test_check("biometryassist") + Starting 2 test processes + [ FAIL 1 | WARN 4 | SKIP 122 | PASS 170 ] + + ... + • resplot/resplot-for-asreml-pt-1.svg + • resplot/resplot-for-asreml-pt-2.svg + • resplot/resplot-for-asreml-pt-3.svg + • resplot/resplot-for-asreml-single.svg + • resplot/resplot-for-lme4.svg + • resplot/resplot-for-sommer-mmer.svg + • resplot/resplot-for-sommer-mmes.svg + • resplot/resplot-with-smaller-call.svg + Error: Test failures + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Packages which this enhances but not available for checking: + 'asreml', 'ARTool', 'lme4', 'sommer' + ``` + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘lme4’ + ``` + +# BiVariAn + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/AndresFloresG/BiVariAn +* Source code: https://github.com/cran/BiVariAn +* Date/Publication: 2025-03-05 13:10:02 UTC +* Number of recursive dependencies: 199 + +Run `revdepcheck::cloud_details(, "BiVariAn")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘BiVariAn-Ex.R’ failed + The error most likely occurred in: + + > ### Name: auto_bar_categ + > ### Title: Automatic generation of barplot with percentages + > ### Aliases: auto_bar_categ + > + > ### ** Examples + > + > data<-data.frame(categ = rep(letters[1:2], 10), + ... + 1. └─BiVariAn::auto_bar_categ(data = data, groupvar = "categ", lang_labs = "EN") + 2. └─BiVariAn (local) theme_func() + 3. ├─... %+replace% ... + 4. │ └─ggplot2::is_theme(e1) + 5. │ └─S7::S7_inherits(x, class_theme) + 6. └─ggprism::theme_prism(...) + 7. └─parent %+replace% t + 8. └─cli::cli_abort("{.code %+replace%} requires two theme objects") + 9. └─rlang::abort(...) + 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/testing-design.html#sec-tests-files-overview + ... + 4. │ └─ggplot2::is_theme(e1) + 5. │ └─S7::S7_inherits(x, class_theme) + 6. └─ggprism::theme_prism(...) + 7. └─parent %+replace% t + 8. └─cli::cli_abort("{.code %+replace%} requires two theme objects") + 9. └─rlang::abort(...) + + [ FAIL 8 | WARN 2 | SKIP 7 | PASS 100 ] + Error: Test failures + Execution halted + ``` + +# blockCV + +
+ +* Version: 3.1-5 +* GitHub: https://github.com/rvalavi/blockCV +* Source code: https://github.com/cran/blockCV +* Date/Publication: 2024-11-01 08:20:02 UTC +* Number of recursive dependencies: 146 + +Run `revdepcheck::cloud_details(, "blockCV")` 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 + ... + ── Failure ('test-cv_plot.R:20:13'): test that cv_plot function works ────────── + `plt` has type 'object', not 'list'. + ── Failure ('test-cv_similarity.R:23:13'): test that cv_similarity function works with cv_spatil ── + `plt` has type 'object', not 'list'. + ── Failure ('test-cv_similarity.R:39:13'): test that cv_similarity function works with cv_buffer ── + `plt` has type 'object', not 'list'. + + [ FAIL 3 | WARN 0 | SKIP 1 | PASS 316 ] + Error: Test failures + Execution halted + ``` + +# bmgarch + +
+ +* Version: 2.0.0 +* GitHub: https://github.com/ph-rast/bmgarch +* Source code: https://github.com/cran/bmgarch +* Date/Publication: 2023-09-12 00:40:02 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "bmgarch")` for more info + +
+ +## Newly broken + +* checking installed package size ... NOTE + ``` + installed size is 303.9Mb + sub-directories of 1Mb or more: + libs 303.0Mb + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) dot-pred_array_to_df.Rd:20: Lost braces; missing escapes or markup? + 20 | Helper function for as.data.frame.{fitted, forecast}. Converts predictive array to data.frame. + | ^ + ``` + +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. + ``` + +## Newly fixed + +* checking whether package ‘bmgarch’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/bmgarch/old/bmgarch.Rcheck/00install.out’ for details. + ``` + +# bmstdr + +
+ +* Version: 0.8.2 +* GitHub: https://github.com/sujit-sahu/bmstdr +* Source code: https://github.com/cran/bmstdr +* Date/Publication: 2025-03-31 17:30:06 UTC +* Number of recursive dependencies: 206 + +Run `revdepcheck::cloud_details(, "bmstdr")` for more info + +
+ +## Newly broken + +* checking whether package ‘bmstdr’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/bmstdr/new/bmstdr.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking installed package size ... NOTE + ``` + installed size is 144.1Mb + sub-directories of 1Mb or more: + data 1.5Mb + libs 139.8Mb + ``` + +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘bmstdr’ ... +** package ‘bmstdr’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I'/usr/local/lib/R/site-library/RcppParallel/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, +... +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error: .onLoad failed in loadNamespace() for 'rstan', details: + call: NULL + error: C stack usage 9964532 is too close to the limit +Execution halted +ERROR: lazy loading failed for package ‘bmstdr’ +* removing ‘/tmp/workdir/bmstdr/new/bmstdr.Rcheck/bmstdr’ + + +``` +### CRAN + +``` +* installing *source* package ‘bmstdr’ ... +** package ‘bmstdr’ successfully unpacked and MD5 sums checked +** using staged installation +** libs +using C++ compiler: ‘g++ (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0’ +using C++17 + + +g++ -std=gnu++17 -I"/opt/R/4.4.0/lib/R/include" -DNDEBUG -I"../inst/include" -I"/usr/local/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/usr/local/lib/R/site-library/BH/include' -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppEigen/include' -I'/usr/local/lib/R/site-library/rstan/include' -I'/usr/local/lib/R/site-library/StanHeaders/include' -I'/usr/local/lib/R/site-library/RcppParallel/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, +... +** byte-compile and prepare package for lazy loading +** 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 (bmstdr) + + +``` +# boxly + +
+ +* Version: 0.1.1 +* 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: 88 + +Run `revdepcheck::cloud_details(, "boxly")` 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 + ... + 16. ├─plotly::add_trace(...) + 17. │ └─plotly::add_data(p, data) + 18. │ └─plotly:::is.plotly(p) + 19. ├─plotly::ggplotly(p, tooltip = "text", dynamicTicks = TRUE) + 20. └─plotly:::ggplotly.ggplot(p, tooltip = "text", dynamicTicks = TRUE) + 21. └─plotly::gg2list(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 25 ] + 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 + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘exploratory-modelling.Rmd’ using rmarkdown + + Quitting from exploratory-modelling.Rmd:46-56 [use-gg-highlight] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + 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 + ``` + +# bullseye + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/cbhurley/bullseye +* Source code: https://github.com/cran/bullseye +* Date/Publication: 2025-05-09 10:10:02 UTC +* Number of recursive dependencies: 159 + +Run `revdepcheck::cloud_details(, "bullseye")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘bullseye-Ex.R’ failed + The error most likely occurred in: + + > ### Name: add_nobs_to_pairwise + > ### Title: Adds number of observations column to pairwise tibble + > ### Aliases: add_nobs_to_pairwise + > + > ### ** Examples + > + > irisc <- pairwise_scores(iris[40:150,], by= "Species") + ... + 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 + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘calc_pairwise.Rmd’ using rmarkdown + --- finished re-building ‘calc_pairwise.Rmd’ + + --- re-building ‘integrating.Rmd’ using rmarkdown + ``` + +# bvhar + +
+ +* Version: 2.2.2 +* GitHub: https://github.com/ygeunkim/bvhar +* Source code: https://github.com/cran/bvhar +* Date/Publication: 2025-02-28 09:40:08 UTC +* Number of recursive dependencies: 97 + +Run `revdepcheck::cloud_details(, "bvhar")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘bvhar.Rmd’ using rmarkdown + --- finished re-building ‘bvhar.Rmd’ + + --- re-building ‘forecasting.Rmd’ using rmarkdown + + Quitting from forecasting.Rmd:241-248 [predplot] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `as.vector()`: + ... + 68. └─grid:::validDetails.text(x) + 69. ├─base::as.character(x$label) + 70. └─base::as.character.default(x$label) + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'shrinkage.Rmd' failed with diagnostics: + cannot coerce type 'object' to vector of type 'character' + --- failed re-building ‘shrinkage.Rmd’ + + --- re-building ‘stochastic-volatility.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 172.9Mb + sub-directories of 1Mb or more: + libs 170.9Mb + ``` + +# calibmsm + +
+ +* Version: 1.1.1 +* GitHub: NA +* Source code: https://github.com/cran/calibmsm +* Date/Publication: 2024-06-14 09:40:02 UTC +* Number of recursive dependencies: 148 + +Run `revdepcheck::cloud_details(, "calibmsm")` 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 + ... + [2] "ggplot" - + [3] "ggplot2::gg" - + [4] "S7_object" - + [5] "gg" | "gg" [1] + - "ggplot" [2] + [6] "ggarrange" | "ggarrange" [3] + + [ FAIL 11 | WARN 10 | SKIP 16 | PASS 204 ] + Error: Test failures + Execution halted + ``` + +# calmr + +
+ +* Version: 0.7.0 +* GitHub: https://github.com/victor-navarro/calmr +* Source code: https://github.com/cran/calmr +* Date/Publication: 2025-05-11 21:30:02 UTC +* Number of recursive dependencies: 106 + +Run `revdepcheck::cloud_details(, "calmr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(calmr) + + Attaching package: 'calmr' + + The following object is masked from 'package:stats': + ... + ── Failure ('test-RSA.R:64:3'): plotting RSA with a test works ───────────────── + `plt` does not have names. + ── Failure ('test-graphs.R:15:3'): calmr_model_graph works ───────────────────── + `g` does not have names. + ── Failure ('test-graphs.R:25:3'): calmr_model_graph takes a trial ───────────── + `g` does not have names. + + [ FAIL 4 | WARN 5 | SKIP 0 | PASS 246 ] + Error: Test failures + Execution halted + ``` + +# canvasXpress + +
+ +* Version: 1.56.1 +* GitHub: https://github.com/neuhausi/canvasXpress +* Source code: https://github.com/cran/canvasXpress +* Date/Publication: 2025-04-08 19:30:02 UTC +* Number of recursive dependencies: 147 + +Run `revdepcheck::cloud_details(, "canvasXpress")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(canvasXpress) + > require(canvasXpress.data) + Loading required package: canvasXpress.data + > + > test_check("canvasXpress") + Loading required package: htmlwidgets + ... + 2. │ └─base::withCallingHandlers(...) + 3. └─canvasXpress::ggplot.as.list(gplot) + 4. └─canvasXpress:::gg_cxplot(o, "canvas", ...) + 5. └─canvasXpress:::gg_theme(o) + 6. ├─base::as.character(e[[a]]) + 7. └─base::as.character.default(e[[a]]) + + [ FAIL 9 | WARN 1 | SKIP 479 | PASS 58 ] + Error: Test failures + Execution halted + ``` + +# 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: 104 + +Run `revdepcheck::cloud_details(, "CARBayesST")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘CARBayesST.Rnw’ using Sweave + Linking to GEOS 3.12.1, GDAL 3.8.4, PROJ 9.4.0; sf_use_s2() is TRUE + + Attaching package: ‘dplyr’ + + The following objects are masked from ‘package:stats’: + + filter, lag + ... + Loading required package: ggplot2 + Error: processing vignette 'CARBayesST.Rnw' failed with diagnostics: + C stack usage 9962948 is too close to the limit + --- failed re-building ‘CARBayesST.Rnw’ + + SUMMARY: processing the following file failed: + ‘CARBayesST.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## Newly fixed + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + --- re-building ‘CARBayesST.Rnw’ using Sweave + Linking to GEOS 3.12.1, GDAL 3.8.4, PROJ 9.4.0; sf_use_s2() is TRUE + + Attaching package: ‘dplyr’ + + The following objects are masked from ‘package:stats’: + + filter, lag + + ... + l.11 ^^M + + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘CARBayesST.Rnw’ + + SUMMARY: processing the following file failed: + ‘CARBayesST.Rnw’ + + 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: + R 1.5Mb + libs 7.6Mb + ``` + +# carbonr + +
+ +* Version: 0.2.1 +* GitHub: NA +* Source code: https://github.com/cran/carbonr +* Date/Publication: 2024-10-16 18:10:09 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "carbonr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(carbonr) + > + > test_check("carbonr") + [ FAIL 3 | WARN 7 | SKIP 0 | PASS 117 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ── Failure ('test-output_display.R:15:3'): output_display generates gg/ggplot object ── + class(output1) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + ── Failure ('test-output_display.R:16:3'): output_display generates gg/ggplot object ── + class(output2) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 3 | WARN 7 | SKIP 0 | PASS 117 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘sp’ ‘tibble’ + All declared Imports should be used. + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 710 marked UTF-8 strings + ``` + +# cartograflow + +
+ +* Version: 1.0.5 +* 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: 99 + +Run `revdepcheck::cloud_details(, "cartograflow")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘cartograflow-Ex.R’ failed + The error most likely occurred in: + + > ### Name: flowgini + > ### Title: Analysis of flow concentration (Gini coefficient) + > ### Aliases: flowgini + > + > ### ** Examples + > + > library(cartograflow) + ... + ℹ Use `flowcum` instead. + Warning: Use of `x$linkcum` is discouraged. + ℹ Use `linkcum` instead. + Warning: Use of `x$flowcum` is discouraged. + ℹ Use `flowcum` instead. + Warning: Use of `x$flowcum` is discouraged. + ℹ Use `flowcum` instead. + Error in pm[[2]] : subscript out of bounds + Calls: flowgini ... %>% -> layout -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +# cartographr + +
+ +* Version: 0.2.2 +* GitHub: https://github.com/da-wi/cartographr +* Source code: https://github.com/cran/cartographr +* Date/Publication: 2024-06-28 14:50:09 UTC +* Number of recursive dependencies: 96 + +Run `revdepcheck::cloud_details(, "cartographr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + > test_check("cartographr") + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 106 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-utils.R:13:3'): add_attribution returns correct ggplot2 labs object ── + `result` inherits from 'ggplot2::labels'/'gg'/'S7_object' not 'labels'. + + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 106 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.3Mb + sub-directories of 1Mb or more: + data 3.5Mb + ``` + +# casebase + +
+ +* Version: 0.10.6 +* GitHub: https://github.com/sahirbhatnagar/casebase +* Source code: https://github.com/cran/casebase +* Date/Publication: 2024-08-17 23:20:05 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "casebase")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘casebase-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ERSPC + > ### Title: Data on the men in the European Randomized Study of Prostate + > ### Cancer Screening + > ### Aliases: ERSPC + > ### Keywords: datasets + > + > ### ** Examples + ... + + event = "DeadOfPrCa", + + exposure = "ScrArm") + 'Follow.Up.Time' will be used as the time variable + > + > plot(pt_object_strat, + + facet.params = list(ncol = 2)) + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘competingRisk.Rmd’ using rmarkdown + ``` + +# cats + +
+ +* Version: 1.0.2 +* GitHub: NA +* Source code: https://github.com/cran/cats +* Date/Publication: 2022-03-11 10:20:07 UTC +* Number of recursive dependencies: 81 + +Run `revdepcheck::cloud_details(, "cats")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘cats-Ex.R’ failed + The error most likely occurred in: + + > ### Name: trial_ocs + > ### Title: Calculates the operating characteristics of the cohort trial + > ### Aliases: trial_ocs + > + > ### ** Examples + > + > + ... + + safety_prob = safety_prob, Bayes_Sup1 = Bayes_Sup1, Bayes_Sup2 = Bayes_Sup2, + + cohort_offset = cohort_offset, sr_first_pos = sr_first_pos, + + missing_prob = missing_prob, cohort_fixed = cohort_fixed, accrual_type = accrual_type, + + accrual_param = accrual_param, hist_lag = hist_lag, analysis_times = analysis_times, + + time_trend = time_trend, cohorts_start = cohorts_start, cohorts_sim = cohorts_sim, + + iter = 2, coresnum = 1, save = FALSE, ret_list = TRUE, plot_ocs = TRUE + + ) + Error in pm[[2]] : subscript out of bounds + Calls: trial_ocs -> -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘epitools’ ‘forcats’ ‘purrr’ + All declared Imports should be used. + ``` + +# causact + +
+ +* Version: 0.5.7 +* GitHub: https://github.com/flyaflya/causact +* Source code: https://github.com/cran/causact +* Date/Publication: 2025-01-15 21:20:01 UTC +* Number of recursive dependencies: 99 + +Run `revdepcheck::cloud_details(, "causact")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(causact) + WARNING: The 'r-causact' Conda environment does not exist. To use the 'dag_numpyro()' function, you need to set up the 'r-causact' environment. Run install_causact_deps() when ready to set up the 'r-causact' environment. + + Attaching package: 'causact' + + The following objects are masked from 'package:stats': + ... + WARNING: The 'r-causact' Conda environment does not exist. To use the 'dag_numpyro()' function, you need to set up the 'r-causact' environment. Run install_causact_deps() when ready to set up the 'r-causact' environment. + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 60 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-dag_plot.R:4:3'): dag plot creates graph ───────────────────── + `plotGr` has type 'object', not 'list'. + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 60 ] + Error: Test failures + Execution halted + ``` + +# CausalImpact + +
+ +* 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: 74 + +Run `revdepcheck::cloud_details(, "CausalImpact")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘CausalImpact_import_test.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # 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 + > # + ... + Lengths differ: 5 is not 2 + ── Failure ('test-impact-plot.R:147:3'): CreateImpactPlot ────────────────────── + !isTRUE(all.equal(q1, q2, check.environment = FALSE)) is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 3 | WARN 4 | SKIP 0 | PASS 738 ] + Error: Test failures + Execution halted + ``` + +# centerline + +
+ +* Version: 0.2.2 +* GitHub: https://github.com/atsyplenkov/centerline +* Source code: https://github.com/cran/centerline +* Date/Publication: 2025-03-16 04:40:02 UTC +* Number of recursive dependencies: 109 + +Run `revdepcheck::cloud_details(, "centerline")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘centerline-Ex.R’ failed + The error most likely occurred in: + + > ### Name: geom_cnt_text + > ### Title: Plot label or text on centerline with ggplot2 + > ### Aliases: geom_cnt_text geom_cnt_label + > + > ### ** Examples + > + > ## Don't show: + ... + 24. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 25. │ └─self$draw_panel(...) + 26. │ └─geomtextpath (local) draw_panel(...) + 27. │ └─geomtextpath:::sf_textgrob(...) + 28. └─base::.handleSimpleError(...) + 29. └─rlang (local) h(simpleError(msg, call)) + 30. └─handlers[[1L]](cnd) + 31. └─cli::cli_abort(...) + 32. └─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 + ... + 6. └─base::lapply(...) + 7. └─ggplot2 (local) FUN(X[[i]], ...) + 8. ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 9. └─self$draw_panel(...) + 10. └─geomtextpath (local) draw_panel(...) + 11. └─geomtextpath:::sf_textgrob(...) + + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 245 ] + Error: Test failures + Execution halted + ``` + +# Certara.Xpose.NLME + +
+ +* Version: 2.0.2 +* GitHub: NA +* Source code: https://github.com/cran/Certara.Xpose.NLME +* Date/Publication: 2025-01-28 15:50:10 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "Certara.Xpose.NLME")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘Certara.Xpose.NLME-Ex.R’ failed + The error most likely occurred in: + + > ### Name: eta_vs_cov + > ### Title: ETAs vs covariate Plot + > ### Aliases: eta_vs_cov + > + > ### ** Examples + > + > eta_vs_cov(xpose::xpdb_ex_pk, + ... + 4. ├─purrr::map_if(...) + 5. │ └─purrr:::where_if(.x, .p) + 6. │ └─rlang::is_logical(.p) + 7. ├─stringr::str_detect(., "@") + 8. │ └─stringr:::check_lengths(string, pattern) + 9. │ └─vctrs::vec_size_common(...) + 10. └─vctrs:::stop_scalar_type(``(``), "string", ``) + 11. └─vctrs:::stop_vctrs(...) + 12. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + 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: 149 + +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() + 16. ├─plotly::ggplotly(...) + 17. └─plotly:::ggplotly.ggplot(...) + 18. └─plotly::gg2list(...) + + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 8 ] + Error: Test failures + Execution halted + ``` + +# ChemoSpec + +
+ +* Version: 6.1.11 +* GitHub: https://github.com/bryanhanson/ChemoSpec +* Source code: https://github.com/cran/ChemoSpec +* Date/Publication: 2025-04-15 15:00:09 UTC +* Number of recursive dependencies: 161 + +Run `revdepcheck::cloud_details(, "ChemoSpec")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ChemoSpec.Rmd’ using rmarkdown + + Quitting from ChemoSpec.Rmd:464-468 [load1] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + ... + Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + --- failed re-building ‘ChemoSpec.Rmd’ + + SUMMARY: processing the following file failed: + ‘ChemoSpec.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# ChemoSpecUtils + +
+ +* Version: 1.0.5 +* GitHub: https://github.com/bryanhanson/ChemoSpecUtils +* Source code: https://github.com/cran/ChemoSpecUtils +* Date/Publication: 2025-04-12 15:30:04 UTC +* Number of recursive dependencies: 99 + +Run `revdepcheck::cloud_details(, "ChemoSpecUtils")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ChemoSpecUtils-Ex.R’ failed + The error most likely occurred in: + + > ### Name: GraphicsOptions + > ### Title: Graphic Output Options in ChemoSpec and ChemoSpec2D + > ### Aliases: GraphicsOptions + > ### Keywords: utilities + > + > ### ** Examples + > + ... + ℹ Adding new coordinate system, which will replace the existing one. + 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 ChemoSpec package. + Please report the issue at . + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +# chillR + +
+ +* Version: 0.76 +* GitHub: NA +* Source code: https://github.com/cran/chillR +* Date/Publication: 2024-11-14 09:40:02 UTC +* Number of recursive dependencies: 134 + +Run `revdepcheck::cloud_details(, "chillR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + 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 + > + > ### ** 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: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +# chronicle + +
+ +* Version: 0.3 +* GitHub: NA +* Source code: https://github.com/cran/chronicle +* Date/Publication: 2021-06-25 05:00:02 UTC +* Number of recursive dependencies: 143 + +Run `revdepcheck::cloud_details(, "chronicle")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘chronicle-Ex.R’ failed + The error most likely occurred in: + + > ### Name: make_barplot + > ### Title: Create a bar plot from a data frame through ggplotly + > ### Aliases: make_barplot + > + > ### ** Examples + > + > make_barplot(dt = iris, bars = 'Species', value = 'Sepal.Length') + Error in pm[[2]] : subscript out of bounds + Calls: make_barplot -> -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘chronicle.Rmd’ using rmarkdown + + Quitting from chronicle.Rmd:37-67 [unnamed-chunk-3] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'chronicle.Rmd' failed with diagnostics: + ... + ℹ In index: 1. + Caused by error in `pm[[2]]`: + ! subscript out of bounds + --- failed re-building ‘chronicle.Rmd’ + + SUMMARY: processing the following file failed: + ‘chronicle.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘DT’ ‘dplyr’ ‘prettydoc’ ‘rmdformats’ ‘skimr’ + All declared Imports should be used. + ``` + +# CINNA + +
+ +* Version: 1.2.2 +* GitHub: NA +* Source code: https://github.com/cran/CINNA +* Date/Publication: 2023-08-08 16:40:02 UTC +* Number of recursive dependencies: 133 + +Run `revdepcheck::cloud_details(, "CINNA")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘CINNA.Rmd’ using rmarkdown + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘circlize’ ‘utils’ + All declared Imports should be used. + ``` + +# circumplex + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/jmgirard/circumplex +* Source code: https://github.com/cran/circumplex +* Date/Publication: 2024-10-28 04:30:02 UTC +* Number of recursive dependencies: 95 + +Run `revdepcheck::cloud_details(, "circumplex")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(circumplex) + > + > test_check("circumplex") + [ FAIL 4 | WARN 8 | SKIP 20 | PASS 97 ] + + ══ Skipped tests (20) ══════════════════════════════════════════════════════════ + ... + [ FAIL 4 | WARN 8 | SKIP 20 | PASS 97 ] + Deleting unused snapshots: + • ssm_plot/many-circle-repel.svg + • ssm_plot/many-curve-plots.svg + • ssm_plot/measure-contrast-circle-ssm.svg + • ssm_plot/measure-contrast-curve-ssm.svg + • ssm_plot/single-group-mean-ssm-no-palette.svg + • ssm_plot/single-group-mean-ssm-with-labels.svg + Error: Test failures + Execution halted + ``` + +# classmap + +
+ +* Version: 1.2.4 +* GitHub: NA +* Source code: https://github.com/cran/classmap +* Date/Publication: 2025-05-13 22:00:02 UTC +* Number of recursive dependencies: 133 + +Run `revdepcheck::cloud_details(, "classmap")` for more info + +
+ +## Newly broken + +* checking whether package ‘classmap’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘ggplot2::element’ by ‘e1071::element’ when loading ‘classmap’ + See ‘/tmp/workdir/classmap/new/classmap.Rcheck/00install.out’ for details. + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 9 marked UTF-8 strings + ``` + +# clifro + +
+ +* 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: 81 + +Run `revdepcheck::cloud_details(, "clifro")` 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 `'ggplot2::labels'/'gg'/'S7_object'` not `'character'`. + + [ FAIL 1 | WARN 1 | SKIP 4 | PASS 10 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) cf_save_kml.Rd:68: Lost braces + 68 | \code{\link{cf_find_station}} and code{vignette("choose-station")} for + | ^ + ``` + +# climwin + +
+ +* Version: 1.2.3 +* GitHub: https://github.com/LiamDBailey/climwin +* Source code: https://github.com/cran/climwin +* Date/Publication: 2020-05-26 09:50:06 UTC +* Number of recursive dependencies: 81 + +Run `revdepcheck::cloud_details(, "climwin")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(climwin) + Loading required package: ggplot2 + Loading required package: gridExtra + Loading required package: Matrix + > + > test_check("climwin") + ... + `expected`: TRUE + ── Failure ('testplotwin.R:15:3'): plotwin produces a graph ──────────────────── + attr(test, "class")[1] == "gg" is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 7 | WARN 762 | SKIP 3 | PASS 790 ] + Error: Test failures + Execution halted + ``` + +# clinDataReview + +
+ +* Version: 1.6.2 +* GitHub: https://github.com/openanalytics/clinDataReview +* Source code: https://github.com/cran/clinDataReview +* Date/Publication: 2025-04-11 22:10:02 UTC +* Number of recursive dependencies: 118 + +Run `revdepcheck::cloud_details(, "clinDataReview")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘clinDataReview-Ex.R’ failed + The error most likely occurred in: + + > ### Name: scatterplotClinData + > ### Title: Scatterplot of variables of interest for clinical data + > ### visualization. + > ### Aliases: scatterplotClinData + > + > ### ** Examples + > + ... + + data = dataPlot, + + xVar = "ADY", + + yVar = "LBSTRESN", + + aesPointVar = list(color = "TRTP", fill = "TRTP"), + + aesLineVar = list(group = "USUBJID", color = "TRTP"), + + labelVars = labelVars + + ) + Error in pm[[2]] : subscript out of bounds + Calls: scatterplotClinData -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(clinDataReview) + > + > test_check("clinDataReview") + adding: report.html (deflated 63%) + adding: report_dependencies11805cb65598/ (stored 0%) + adding: report_dependencies11805cb65598/file11804a6d6e97.html (deflated 8%) + ... + 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 31 | WARN 0 | SKIP 31 | PASS 466 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘clinDataReview-dataPreprocessing.Rmd’ using rmarkdown + --- finished re-building ‘clinDataReview-dataPreprocessing.Rmd’ + + --- re-building ‘clinDataReview-dataVisualization.Rmd’ using rmarkdown + + Quitting from clinDataReview-dataVisualization.Rmd:169-211 [timeProfiles] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ... + --- failed re-building ‘clinDataReview-dataVisualization.Rmd’ + + --- re-building ‘clinDataReview-reporting.Rmd’ using rmarkdown + --- finished re-building ‘clinDataReview-reporting.Rmd’ + + SUMMARY: processing the following file failed: + ‘clinDataReview-dataVisualization.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.7Mb + sub-directories of 1Mb or more: + doc 4.3Mb + ``` + +# clinUtils + +
+ +* Version: 0.2.0 +* 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: 108 + +Run `revdepcheck::cloud_details(, "clinUtils")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘clinUtils-vignette.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.7Mb + sub-directories of 1Mb or more: + doc 6.5Mb + ``` + +# clockSim + +
+ +* Version: 0.1.2 +* GitHub: https://github.com/yeyuan98/clockSim +* Source code: https://github.com/cran/clockSim +* Date/Publication: 2025-04-22 20:10:01 UTC +* Number of recursive dependencies: 79 + +Run `revdepcheck::cloud_details(, "clockSim")` for more info + +
+ +## Newly broken + +* checking whether package ‘clockSim’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: The `size` argument of `element_line()` is deprecated as of ggplot2 3.4.0. + See ‘/tmp/workdir/clockSim/new/clockSim.Rcheck/00install.out’ for details. + ``` + +# clustcurv + +
+ +* 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: 107 + +Run `revdepcheck::cloud_details(, "clustcurv")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘clustcurv.Rmd’ using rmarkdown + + Quitting from clustcurv.Rmd:92-94 [unnamed-chunk-5] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ! subscript out of bounds + --- + Backtrace: + ... + + Error: processing vignette 'clustcurv.Rmd' failed with diagnostics: + subscript out of bounds + --- failed re-building ‘clustcurv.Rmd’ + + SUMMARY: processing the following file failed: + ‘clustcurv.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# clustrd + +
+ +* Version: 1.4.0 +* GitHub: NA +* Source code: https://github.com/cran/clustrd +* Date/Publication: 2022-07-16 23:20:06 UTC +* Number of recursive dependencies: 62 + +Run `revdepcheck::cloud_details(, "clustrd")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘clustrd-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.clusmca + > ### Title: Plotting function for 'clusmca()' output. + > ### Aliases: plot.clusmca + > + > ### ** Examples + > + > data("mybond") + ... + Warning in fortify(data, ...) : Arguments in `...` must be used. + ✖ Problematic argument: + • labels = lbls + ℹ Did you misspell an argument name? + Warning in fortify(data, ...) : Arguments in `...` must be used. + ✖ Problematic argument: + • labels = lbls + ℹ Did you misspell an argument name? + Error: C stack usage 9965748 is too close to the limit + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) global_bootclus.Rd:38: Lost braces; missing escapes or markup? + 38 | \emph{Step 1. Resampling:} Draw bootstrap samples S_i and T_i of size \emph{n} from the data and use the original data, X, as evaluation set E_i = X. Apply the clustering method of choice to S_i and T_i and obtain C^{S_i} and C^{T_i}. + | ^ + checkRd: (-1) global_bootclus.Rd:38: Lost braces; missing escapes or markup? + 38 | \emph{Step 1. Resampling:} Draw bootstrap samples S_i and T_i of size \emph{n} from the data and use the original data, X, as evaluation set E_i = X. Apply the clustering method of choice to S_i and T_i and obtain C^{S_i} and C^{T_i}. + | ^ + checkRd: (-1) global_bootclus.Rd:40: Lost braces; missing escapes or markup? + 40 | \emph{Step 2. Mapping:} Assign each observation x_i to the closest centers of C^{S_i} and C^{T_i} using Euclidean distance, resulting in partitions C^{XS_i} and C^{XT_i}, where C^{XS_i} is the partition of the original data, X, predicted from clustering bootstrap sample S_i (same for T_i and C^{XT_i}). + | ^ + checkRd: (-1) global_bootclus.Rd:40: Lost braces; missing escapes or markup? + ... + | ^ + checkRd: (-1) local_bootclus.Rd:41: Lost braces; missing escapes or markup? + 41 | \emph{Step 3. Evaluation}: Obtain the maximum Jaccard agreement between each original cluster C_k and each one of the two bootstrap clusters, C_^k'{XS_i} and C_^k'{XT_i} as measure of agreement and stability, and take the average of each pair. + | ^ + checkRd: (-1) local_bootclus.Rd:54: Lost braces; missing escapes or markup? + 54 | \item{clust1}{Partitions, C^{XS_i} of the original data, X, predicted from clustering bootstrap sample S_i (see Details)} + | ^ + checkRd: (-1) local_bootclus.Rd:55: Lost braces; missing escapes or markup? + 55 | \item{clust2}{Partitions, C^{XT_i} of the original data, X, predicted from clustering bootstrap sample T_i (see Details)} + | ^ + ``` + +# clustTMB + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/Andrea-Havron/clustTMB +* Source code: https://github.com/cran/clustTMB +* Date/Publication: 2024-10-14 11:50:46 UTC +* Number of recursive dependencies: 153 + +Run `revdepcheck::cloud_details(, "clustTMB")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘CovarianceStructure.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 82.4Mb + sub-directories of 1Mb or more: + libs 81.9Mb + ``` + +# cmcR + +
+ +* Version: 0.1.11 +* GitHub: NA +* Source code: https://github.com/cran/cmcR +* Date/Publication: 2022-12-10 14:00:02 UTC +* Number of recursive dependencies: 121 + +Run `revdepcheck::cloud_details(, "cmcR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(cmcR) + > + > test_check("cmcR",reporter = SummaryReporter) + adding: bindata/ (stored 0%) + adding: bindata/data.bin (deflated 58%) + adding: main.xml (deflated 62%) + ... + + ── 2. Failure ('test-diagnosticTools.R:104:3'): diagnosticTools functions work a + all(unlist(purrr::map(cmcPlt_list, ~class(.) == c("gg", "ggplot")))) is not TRUE + + `actual`: FALSE + `expected`: TRUE + + ══ DONE ════════════════════════════════════════════════════════════════════════ + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.5Mb + sub-directories of 1Mb or more: + data 2.5Mb + doc 2.3Mb + ``` + +# cnmap + +
+ +* 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: 59 + +Run `revdepcheck::cloud_details(, "cnmap")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘cnmap-Ex.R’ failed + The error most likely occurred in: + + > ### Name: getMap + > ### Title: China Map Data from AutoNavi Map + > ### Aliases: getMap + > + > ### ** Examples + > + > 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 re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Introduction.Rmd’ using rmarkdown + + Quitting from Introduction.Rmd:28-35 [unnamed-chunk-3] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `process_cpl_read_ogr()`: + ! package tibble not available: install first? + --- + Backtrace: + ... + + 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 + ``` + +# CNVreg + +
+ +* Version: 1.0 +* GitHub: NA +* Source code: https://github.com/cran/CNVreg +* Date/Publication: 2025-03-10 16:50:21 UTC +* Number of recursive dependencies: 119 + +Run `revdepcheck::cloud_details(, "CNVreg")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘CNVReg_vig.Rmd’ using rmarkdown + + Quitting from CNVReg_vig.Rmd:322-378 [unnamed-chunk-17] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + ... + Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + --- failed re-building ‘CNVReg_vig.Rmd’ + + SUMMARY: processing the following file failed: + ‘CNVReg_vig.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# coat + +
+ +* Version: 0.2.0 +* GitHub: NA +* Source code: https://github.com/cran/coat +* Date/Publication: 2023-07-11 15:30:09 UTC +* Number of recursive dependencies: 53 + +Run `revdepcheck::cloud_details(, "coat")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘coat-Ex.R’ failed + The error most likely occurred in: + + > ### Name: print.coat + > ### Title: Methods for Conditional Method Agreement Trees (COAT) + > ### Aliases: print.coat coef.coat plot.coat node_baplot autoplot.coat + > + > ### ** Examples + > + > ## Don't show: + ... + Backtrace: + ▆ + 1. ├─ggplot2::autoplot(tr) + 2. └─coat:::autoplot.coat(tr) + 3. └─ggparty::ggparty(object, terminal_space = 0.5) + 4. ├─ggplot2::ggplot(data = plot_data, mapping = mapping) + 5. └─ggplot2:::ggplot.default(data = plot_data, mapping = mapping) + 6. └─cli::cli_abort(...) + 7. └─rlang::abort(...) + Execution halted + ``` + +# cocktailApp + +
+ +* Version: 0.2.3 +* GitHub: https://github.com/shabbychef/cocktailApp +* Source code: https://github.com/cran/cocktailApp +* Date/Publication: 2023-07-19 13:40:09 UTC +* Number of recursive dependencies: 94 + +Run `revdepcheck::cloud_details(, "cocktailApp")` for more info + +
+ +## Newly broken + +* checking whether package ‘cocktailApp’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/cocktailApp/new/cocktailApp.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 14729 marked UTF-8 strings + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘cocktailApp’ ... +** package ‘cocktailApp’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error: .onLoad failed in loadNamespace() for 'ggtern', details: + call: NULL + error: object properties are invalid: +- @lineend must be or , not S3 +Execution halted +ERROR: lazy loading failed for package ‘cocktailApp’ +* removing ‘/tmp/workdir/cocktailApp/new/cocktailApp.Rcheck/cocktailApp’ + + +``` +### CRAN + +``` +* installing *source* package ‘cocktailApp’ ... +** package ‘cocktailApp’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +** help +*** installing help indices +*** copying figures +** 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 (cocktailApp) + + +``` +# coda.plot + +
+ +* Version: 0.1.9 +* GitHub: NA +* Source code: https://github.com/cran/coda.plot +* Date/Publication: 2025-04-20 21:30:02 UTC +* Number of recursive dependencies: 42 + +Run `revdepcheck::cloud_details(, "coda.plot")` for more info + +
+ +## Newly broken + +* checking whether package ‘coda.plot’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/coda.plot/new/coda.plot.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘coda.plot’ ... +** package ‘coda.plot’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** byte-compile and prepare package for lazy loading +Error: .onLoad failed in loadNamespace() for 'ggtern', details: + call: NULL + error: object properties are invalid: +- @lineend must be or , not S3 +Execution halted +ERROR: lazy loading failed for package ‘coda.plot’ +* removing ‘/tmp/workdir/coda.plot/new/coda.plot.Rcheck/coda.plot’ + + +``` +### CRAN + +``` +* installing *source* package ‘coda.plot’ ... +** package ‘coda.plot’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** 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 (coda.plot) + + +``` +# CohortCharacteristics + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/darwin-eu/CohortCharacteristics +* Source code: https://github.com/cran/CohortCharacteristics +* Date/Publication: 2025-05-20 22:30:11 UTC +* Number of recursive dependencies: 188 + +Run `revdepcheck::cloud_details(, "CohortCharacteristics")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘summarise_characteristics.Rmd’ using rmarkdown + trying URL 'https://example-data.ohdsi.dev/GiBleed.zip' + Content type 'application/zip' length 6754786 bytes (6.4 MB) + ================================================== + downloaded 6.4 MB + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.1Mb + sub-directories of 1Mb or more: + doc 4.0Mb + help 1.8Mb + ``` + +* checking DESCRIPTION meta-information ... NOTE + ``` + Packages listed in more than one of Depends, Imports, Suggests, Enhances: + ‘reactable’ ‘DT’ + A package should be listed in only one of these fields. + ``` + +# CohortPlat + +
+ +* Version: 1.0.5 +* GitHub: NA +* Source code: https://github.com/cran/CohortPlat +* Date/Publication: 2022-02-14 09:30:02 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "CohortPlat")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘CohortPlat-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_trial + > ### Title: Plots the cohort trial study overview given stage data. + > ### Aliases: plot_trial + > + > ### ** Examples + > + > + ... + + stage_data = stage_data, cohort_random = cohort_random, cohorts_max = cohorts_max, + + sr_drugs_pos = sr_drugs_pos, target_rr = target_rr, sharing_type = sharing_type, + + safety_prob = safety_prob, Bayes_Sup = Bayes_Sup, prob_rr_transform = prob_rr_transform, + + cohort_offset = cohort_offset, Bayes_Fut = Bayes_Fut, sr_first_pos = sr_first_pos + + ) + > + > plot_trial(res_list, unit = "n") + Error in pm[[2]] : subscript out of bounds + Calls: plot_trial -> -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘my-vignette.Rmd’ using rmarkdown + + Quitting from my-vignette.Rmd:1042-1073 [unnamed-chunk-20] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ! subscript out of bounds + --- + Backtrace: + ... + + Error: processing vignette 'my-vignette.Rmd' failed with diagnostics: + subscript out of bounds + --- failed re-building ‘my-vignette.Rmd’ + + SUMMARY: processing the following file failed: + ‘my-vignette.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# COINr + +
+ +* Version: 1.1.14 +* GitHub: https://github.com/bluefoxr/COINr +* Source code: https://github.com/cran/COINr +* Date/Publication: 2024-05-21 16:00:02 UTC +* Number of recursive dependencies: 88 + +Run `revdepcheck::cloud_details(, "COINr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘COINr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_bar + > ### Title: Bar chart + > ### Aliases: plot_bar + > + > ### ** Examples + > + > # build example coin + > coin <- build_example_coin(up_to = "new_coin", quietly = TRUE) + > + > # bar plot of CO2 by GDP per capita group + > plot_bar(coin, dset = "Raw", iCode = "CO2", + + by_group = "GDPpc_group", axes_label = "iName") + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘adjustments.Rmd’ using rmarkdown + --- finished re-building ‘adjustments.Rmd’ + + --- re-building ‘aggregate.Rmd’ using rmarkdown + --- finished re-building ‘aggregate.Rmd’ + + --- re-building ‘analysis.Rmd’ using rmarkdown + --- finished re-building ‘analysis.Rmd’ + + --- re-building ‘coins.Rmd’ using rmarkdown + --- finished re-building ‘coins.Rmd’ + + --- re-building ‘data_selection.Rmd’ using rmarkdown + --- finished re-building ‘data_selection.Rmd’ + + --- re-building ‘denomination.Rmd’ using rmarkdown + ``` + +# colorrepel + +
+ +* 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: 88 + +Run `revdepcheck::cloud_details(, "colorrepel")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘colorrepel-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggplotly_background + > ### Title: Prepare ggplot object to ggplotly-compatible layer and image + > ### layer + > ### Aliases: ggplotly_background + > + > ### ** Examples + > + > 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 + ``` + +# comparer + +
+ +* Version: 0.2.4 +* GitHub: https://github.com/CollinErickson/comparer +* Source code: https://github.com/cran/comparer +* Date/Publication: 2024-10-02 22:50:03 UTC +* Number of recursive dependencies: 129 + +Run `revdepcheck::cloud_details(, "comparer")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(comparer) + Loading required package: GauPro + Loading required package: mixopt + Loading required package: dplyr + + Attaching package: 'dplyr' + ... + ── Error ('test_hype.R:296:1'): discrete params ──────────────────────────────── + + Error: C stack usage 9961748 is too close to the limit + ── Error ('test_hype.R:331:1'): hype with all params type ────────────────────── + + Error: C stack usage 9961620 is too close to the limit + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 401 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘DiceOptim’ + ``` + +# conquestr + +
+ +* Version: 1.5.1 +* GitHub: NA +* Source code: https://github.com/cran/conquestr +* Date/Publication: 2025-05-18 07:50:02 UTC +* Number of recursive dependencies: 78 + +Run `revdepcheck::cloud_details(, "conquestr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(conquestr) + > + > test_check("conquestr") + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 25 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-ConQuestRout.R:10:3'): Rout file is of correct type ────────── + `myRoutPlot` has type 'object', not 'list'. + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 25 ] + Error: Test failures + Execution halted + ``` + +# conserveR + +
+ +* Version: 1.0.4 +* GitHub: https://github.com/azizka/conserveR +* Source code: https://github.com/cran/conserveR +* Date/Publication: 2021-08-02 09:10:06 UTC +* Number of recursive dependencies: 50 + +Run `revdepcheck::cloud_details(, "conserveR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘conserveR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: map_selection + > ### Title: Map Selected Methods to Context + > ### Aliases: map_selection + > + > ### ** Examples + > + > data(edge) + > map_selection(edge) + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the conserveR package. + Please report the issue at . + Error: C stack usage 9962484 is too close to the limit + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘scales’ ‘sna’ + All declared Imports should be used. + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 244 marked UTF-8 strings + ``` + +# constructive + +
+ +* Version: 1.1.0 +* GitHub: https://github.com/cynkra/constructive +* Source code: https://github.com/cran/constructive +* Date/Publication: 2025-01-10 14:10:01 UTC +* Number of recursive dependencies: 112 + +Run `revdepcheck::cloud_details(, "constructive")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(constructive) + > + > test_check("constructive") + [ FAIL 6 | WARN 2 | SKIP 113 | PASS 24 ] + + ══ Skipped tests (113) ═════════════════════════════════════════════════════════ + ... + 13. │ └─constructive:::strip_theme(x) + 14. │ └─constructive:::`$<-`(`*tmp*`, size, value = NULL) + 15. │ └─constructive:::`[[<-`(...) + 16. └─rlang (local) ``(``) + 17. └─handlers[[1L]](cnd) + 18. └─rlang::abort(...) + + [ FAIL 6 | WARN 2 | SKIP 113 | PASS 24 ] + Error: Test failures + Execution halted + ``` + +# contsurvplot + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/RobinDenz1/contsurvplot +* Source code: https://github.com/cran/contsurvplot +* Date/Publication: 2023-08-15 08:00:03 UTC +* Number of recursive dependencies: 157 + +Run `revdepcheck::cloud_details(, "contsurvplot")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(contsurvplot) + Please cite as: + + Denz R, Timmesfeld N (2023). "Visualizing the (Causal) Effect of a Continuous Variable on a Time-To-Event Outcome." Epidemiology, 34 (5). doi: 10.1097/EDE.0000000000001630. + > library(survival) + > library(testthat) + > + ... + • plot_surv_contour/plot-change-horizon.svg + • plot_surv_contour/plot-cif.svg + • plot_surv_contour/plot-custom-colors.svg + • plot_surv_contour/plot-defaults.svg + • plot_surv_contour/plot-lots-of-stuff.svg + • plot_surv_contour/plot-panel-border-axis-dist.svg + • plot_surv_contour/plot-with-group.svg + • plot_surv_heatmap/plot-contour-lines.svg + Error: Test failures + Execution halted + ``` + +# 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: 89 + +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: 114 + +Run `revdepcheck::cloud_details(, "correlationfunnel")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(dplyr) + + Attaching package: 'dplyr' + + The following object is masked from 'package:testthat': + + ... + ▆ + 1. ├─correlationfunnel::plot_correlation_funnel(...) at test-plot_correlation_funnel.R:23:1 + 2. └─correlationfunnel:::plot_correlation_funnel.data.frame(...) + 3. ├─plotly::ggplotly(g, tooltip = "text") + 4. └─plotly:::ggplotly.ggplot(g, tooltip = "text") + 5. └─plotly::gg2list(...) + + [ FAIL 1 | WARN 3 | SKIP 0 | PASS 17 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘utils’ + All declared Imports should be used. + ``` + +# corrViz + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/corrViz +* Date/Publication: 2023-06-30 11:40:07 UTC +* Number of recursive dependencies: 127 + +Run `revdepcheck::cloud_details(, "corrViz")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘corrViz-Ex.R’ failed + The error most likely occurred in: + + > ### Name: animSolar + > ### Title: animSolar + > ### Aliases: animSolar + > + > ### ** Examples + > + > cm <- cor(mtcars) + ... + All aesthetics have length 1, but the data has 250 rows. + ℹ Please consider using `annotate()` or provide this layer with data containing + a single row. + Warning in geom_text(data = solar_system, aes(x = 0, y = 0, label = sun), : + All aesthetics have length 1, but the data has 250 rows. + ℹ Please consider using `annotate()` or provide this layer with data containing + a single row. + Error in pm[[2]] : subscript out of bounds + Calls: animSolar -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘corrViz.Rmd’ using rmarkdown + + Quitting from corrViz.Rmd:75-81 [heatmap] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ! subscript out of bounds + --- + Backtrace: + ... + + Error: processing vignette 'corrViz.Rmd' failed with diagnostics: + subscript out of bounds + --- failed re-building ‘corrViz.Rmd’ + + SUMMARY: processing the following file failed: + ‘corrViz.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.2Mb + sub-directories of 1Mb or more: + doc 6.7Mb + ``` + +# CoSMoS + +
+ +* Version: 2.1.0 +* 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: 78 + +Run `revdepcheck::cloud_details(, "CoSMoS")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘vignette.Rmd’ using rmarkdown + ``` + +# countfitteR + +
+ +* Version: 1.4 +* 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: 88 + +Run `revdepcheck::cloud_details(, "countfitteR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(countfitteR) + > + > test_check("countfitteR") + [ FAIL 1 | WARN 6 | SKIP 0 | PASS 32 ] + + ... + 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)) + 4. ├─p$labels[[1]] + 5. ├─S7:::`[[.S7_object`(p$labels, 1) + 6. └─base::NextMethod() + + [ FAIL 1 | WARN 6 | SKIP 0 | PASS 32 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) summary_fitlist.Rd:15: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) summary_fitlist.Rd:16: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) summary_fitlist.Rd:17: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) summary_fitlist.Rd:18: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) summary_fitlist.Rd:19: Lost braces in \itemize; \value handles \item{}{} directly + ``` + +# countries + +
+ +* Version: 1.2.1 +* GitHub: https://github.com/fbellelli/countries +* Source code: https://github.com/cran/countries +* Date/Publication: 2025-02-22 14:10:02 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "countries")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(countries) + > + > test_check("countries") + + In total 1 unique country names were provided + 1/1 have been matched with EXACT matching + ... + `expected[2:2]`: "ggplot" + ── Failure ('test_function_output.R:319:3'): output from quick_map() are as expected ── + class(quick_map(example, "test", col_na = "black")) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 9 | WARN 0 | SKIP 2 | PASS 137 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 9044 marked UTF-8 strings + ``` + +# coveffectsplot + +
+ +* Version: 1.0.6 +* GitHub: https://github.com/smouksassi/coveffectsplot +* Source code: https://github.com/cran/coveffectsplot +* Date/Publication: 2025-01-12 13:30:01 UTC +* Number of recursive dependencies: 138 + +Run `revdepcheck::cloud_details(, "coveffectsplot")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Exposure_Response_Example.Rmd’ using rmarkdown + ``` + +# covidcast + +
+ +* Version: 0.5.2 +* 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: 90 + +Run `revdepcheck::cloud_details(, "covidcast")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(covidcast) + We encourage COVIDcast API users to register on our mailing list: + https://lists.andrew.cmu.edu/mailman/listinfo/delphi-covidcast-api + We'll send announcements about new data sources, package updates, + server maintenance, and new features. + > + ... + • plot/default-county-choropleth.svg + • plot/default-hrr-choropleth-with-include.svg + • plot/default-msa-choropleth-with-include.svg + • plot/default-state-choropleth-with-include.svg + • plot/default-state-choropleth-with-range.svg + • plot/state-choropleth-with-no-metadata.svg + • plot/state-line-graph-with-range.svg + • plot/state-line-graph-with-stderrs.svg + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘correlation-utils.Rmd’ using rmarkdown + --- finished re-building ‘correlation-utils.Rmd’ + + --- re-building ‘covidcast.Rmd’ using rmarkdown + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 20 marked UTF-8 strings + ``` + +# cowplot + +
+ +* Version: 1.1.3 +* GitHub: https://github.com/wilkelab/cowplot +* Source code: https://github.com/cran/cowplot +* Date/Publication: 2024-01-22 23:22:51 UTC +* Number of recursive dependencies: 97 + +Run `revdepcheck::cloud_details(, "cowplot")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(cowplot) + > + > test_check("cowplot") + [ FAIL 1 | WARN 4 | SKIP 7 | PASS 54 ] + + ══ Skipped tests (7) ═══════════════════════════════════════════════════════════ + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test_ggdraw.R:7:3'): basic ggdraw usage ─────────────────────────── + methods::is(g) not equal to "gg". + 1/1 mismatches + x[1]: "ggplot2::ggplot" + y[1]: "gg" + + [ FAIL 1 | WARN 4 | SKIP 7 | PASS 54 ] + Error: Test failures + Execution halted + ``` + +# Coxmos + +
+ +* Version: 1.1.3 +* GitHub: https://github.com/BiostatOmics/Coxmos +* Source code: https://github.com/cran/Coxmos +* Date/Publication: 2025-06-02 18:02:02 UTC +* Number of recursive dependencies: 202 + +Run `revdepcheck::cloud_details(, "Coxmos")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘Coxmos-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_evaluation + > ### Title: plot_evaluation + > ### Aliases: plot_evaluation + > + > ### ** Examples + > + > data("X_proteomic") + ... + > Y_test <- Y_proteomic[-index_train,] + > coxEN.model <- coxEN(X_train, Y_train, x.center = TRUE, x.scale = TRUE) + Warning: from glmnet C++ code (error code -10013); Number of nonzero coefficients along the path exceeds pmax=7 at 13th lambda value; solutions for larger lambdas returned + > eval_results <- eval_Coxmos_models(lst_models = list("coxEN" = coxEN.model), X_test = X_test, + + Y_test = Y_test) + > plot_eval_results <- plot_evaluation(eval_results) + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.4Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 2.5Mb + doc 2.8Mb + ``` + +# 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: 56 + +Run `revdepcheck::cloud_details(, "crmPack")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + 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 + ... + chunk 25 (label = ggmcmc) + Error : C stack usage 9963748 is too close to the limit + + --- failed re-building ‘example.Rnw’ + + SUMMARY: processing the following file failed: + ‘example.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## Newly fixed + +* checking re-building of vignette outputs ... WARNING + ``` + 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 + ... + l.7 ^^M + + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘example.Rnw’ + + SUMMARY: processing the following file failed: + ‘example.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# cry + +
+ +* Version: 0.5.1 +* GitHub: NA +* Source code: https://github.com/cran/cry +* Date/Publication: 2022-10-10 08:00:05 UTC +* Number of recursive dependencies: 51 + +Run `revdepcheck::cloud_details(, "cry")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘cry-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_SHELX + > ### Title: Plot SHELXC log files + > ### Aliases: plot_SHELX + > + > ### ** Examples + > + > datadir <- system.file("extdata",package="cry") + > ## SHELXC + > shelxc_log <- file.path(datadir,"shelxc.log") + > shelxc <- read_SHELX_log(shelxc_log) + > plot_shelxc <- plot_SHELX(filename = shelxc, var = shelxc$I_sig, + + type = "shelxc", title_chart = "SHELXC") + Error in rep(yes, length.out = len) : + attempt to replicate an object of type 'object' + Calls: plot_SHELX -> ifelse -> ifelse -> ifelse + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘MTZ.Rmd’ using rmarkdown + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) calculate_cell_volume.Rd:16: Lost braces; missing escapes or markup? + 16 | V A real number. The volume (in angstroms^3 or angstroms^{-3}) + | ^ + ``` + +# ctrialsgov + +
+ +* Version: 0.2.5 +* GitHub: NA +* Source code: https://github.com/cran/ctrialsgov +* Date/Publication: 2021-10-18 16:00:02 UTC +* Number of recursive dependencies: 97 + +Run `revdepcheck::cloud_details(, "ctrialsgov")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ctrialsgov) + > + > test_check("ctrialsgov") + [NCT04553939] ible Local Advanved |Bladder| Cancer + [NCT03517995] of Sulforaphane in |Bladder| Cancer Chemoprevent + [NCT04210479] Comparison of |Bladder| Filling vs. Non-Fil + ... + ▆ + 1. ├─ctrialsgov::ctgov_to_plotly(p) at test-plot.R:12:3 + 2. └─ctrialsgov:::ctgov_to_plotly.ctgov_bar_plot(p) + 3. ├─plotly::ggplotly(p, tooltip = "text") + 4. └─plotly:::ggplotly.ggplot(p, tooltip = "text") + 5. └─plotly::gg2list(...) + + [ FAIL 1 | WARN 6 | SKIP 0 | PASS 43 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 1350 marked UTF-8 strings + ``` + +# cubble + +
+ +* Version: 1.0.0 +* 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: 131 + +Run `revdepcheck::cloud_details(, "cubble")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘cb1class.Rmd’ using rmarkdown + --- finished re-building ‘cb1class.Rmd’ + + --- re-building ‘cb2create.Rmd’ using rmarkdown + --- finished re-building ‘cb2create.Rmd’ + + --- re-building ‘cb3tsibblesf.Rmd’ using rmarkdown + --- finished re-building ‘cb3tsibblesf.Rmd’ + + --- re-building ‘cb4glyph.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 8.6Mb + sub-directories of 1Mb or more: + data 6.0Mb + doc 1.4Mb + ``` + +# cutpointr + +
+ +* Version: 1.2.0 +* GitHub: https://github.com/thie1e/cutpointr +* Source code: https://github.com/cran/cutpointr +* Date/Publication: 2024-12-10 22:50:02 UTC +* Number of recursive dependencies: 79 + +Run `revdepcheck::cloud_details(, "cutpointr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(cutpointr) + > + > test_check("cutpointr") + [ FAIL 105 | WARN 14 | SKIP 0 | PASS 337 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + class(tempplot5) not identical to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + Backtrace: + ▆ + 1. └─cutpointr (local) test_ggplot_functions(cp, do_plot_metric = FALSE) at test-cutpointr.R:1156:5 + 2. └─testthat::expect_identical(class(tempplot5), c("gg", "ggplot")) at test-cutpointr.R:22:5 + + [ FAIL 105 | WARN 14 | SKIP 0 | PASS 337 ] + Error: Test failures + Execution halted + ``` + +# cvasi + +
+ +* Version: 1.4.0 +* GitHub: https://github.com/cvasi-tktd/cvasi +* Source code: https://github.com/cran/cvasi +* Date/Publication: 2025-02-28 11:00:02 UTC +* Number of recursive dependencies: 94 + +Run `revdepcheck::cloud_details(, "cvasi")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘cvasi-1-manual.Rmd’ using rmarkdown + --- finished re-building ‘cvasi-1-manual.Rmd’ + + --- re-building ‘cvasi-2-howto.Rmd’ using rmarkdown + ``` + +# cvms + +
+ +* Version: 1.7.0 +* GitHub: https://github.com/ludvigolsen/cvms +* Source code: https://github.com/cran/cvms +* Date/Publication: 2025-03-07 11:30:07 UTC +* Number of recursive dependencies: 152 + +Run `revdepcheck::cloud_details(, "cvms")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(cvms) + > + > if (require("xpectr")) { + + test_check("cvms") + + } + Loading required package: xpectr + ... + names for target but not for current + ── Failure ('test_plotting_functions.R:359:3'): plot_confusion_matrix() with sum tiles, class order, and intensity_by percentage ── + `labels` not equal to list(...). + Attributes: < names for target but not for current > + Attributes: < Length mismatch: comparison on first 0 components > + Length mismatch: comparison on first 4 components + + [ FAIL 15 | WARN 0 | SKIP 71 | PASS 3602 ] + Error: Test failures + Execution halted + ``` + +# cylcop + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/r-lib/devtools +* Source code: https://github.com/cran/cylcop +* Date/Publication: 2022-10-29 22:00:21 UTC +* Number of recursive dependencies: 96 + +Run `revdepcheck::cloud_details(, "cylcop")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘cylcop-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_circ_hist + > ### Title: Circular Histogram of Turn Angles + > ### Aliases: plot_circ_hist + > + > ### ** Examples + > + > set.seed(123) + ... + 23. │ └─l$compute_geom_2(d, theme = plot@theme) + 24. │ └─ggplot2 (local) compute_geom_2(..., self = self) + 25. │ └─self$geom$use_defaults(...) + 26. │ └─ggplot2 (local) use_defaults(..., self = self) + 27. │ └─ggplot2:::check_aesthetics(new_params, nrow(data)) + 28. │ └─vctrs::list_sizes(x) + 29. └─vctrs:::stop_scalar_type(``(``), "x$label", ``) + 30. └─vctrs:::stop_vctrs(...) + 31. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) gammamix.Rd:47-48: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) gammamix.Rd:49-51: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) gammamix.Rd:52-53: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) gammamix.Rd:54-55: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) joint.Rd:41-42: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) joint.Rd:43-45: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) joint.Rd:46-47: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) lnormmix.Rd:44-45: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) lnormmix.Rd:46-48: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) lnormmix.Rd:49-50: Lost braces in \itemize; \value handles \item{}{} directly + ... + checkRd: (-1) vonmisesmix.Rd:45-46: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) vonmisesmix.Rd:47-48: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) weibullmix.Rd:44-45: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) weibullmix.Rd:46-48: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) weibullmix.Rd:49-50: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) weibullmix.Rd:51-52: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) wrappedcauchy.Rd:43-44: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) wrappedcauchy.Rd:45-47: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) wrappedcauchy.Rd:48-49: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) wrappedcauchy.Rd:50-51: Lost braces in \itemize; \value handles \item{}{} directly + ``` + +# D2MCS + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/drordas/D2MCS +* Source code: https://github.com/cran/D2MCS +* Date/Publication: 2022-08-23 11:40:02 UTC +* Number of recursive dependencies: 178 + +Run `revdepcheck::cloud_details(, "D2MCS")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘test_all.R’ + Running the tests in ‘tests/test_all.R’ failed. + Complete output: + > testthat::test_check("D2MCS") + Loading required package: D2MCS + [ FAIL 5 | WARN 6 | SKIP 15 | PASS 755 ] + + ══ Skipped tests (15) ══════════════════════════════════════════════════════════ + • On CRAN (2): 'test_D2MCS.R:129:3', 'test_D2MCS.R:213:3' + • {ranger} is not installed (13): 'test_D2MCS.R:411:3', + ... + ── Failure ('test_clustering.strategies.TypeBasedStrategy.R:226:3'): TypeBasedStrategy works ── + c("gg", "ggplot") not equal to class(strategyNoReal$plot()). + Lengths differ: 2 is not 5 + ── Failure ('test_clustering.strategies.TypeBasedStrategy.R:234:3'): TypeBasedStrategy works ── + c("gg", "ggplot") not equal to class(strategyNoBinary$plot()). + Lengths differ: 2 is not 5 + + [ FAIL 5 | WARN 6 | SKIP 15 | PASS 755 ] + Error: Test failures + Execution halted + ``` + +# dabestr + +
+ +* Version: 2025.3.14 +* GitHub: https://github.com/ACCLAB/dabestr +* Source code: https://github.com/cran/dabestr +* Date/Publication: 2025-02-26 12:50:02 UTC +* Number of recursive dependencies: 83 + +Run `revdepcheck::cloud_details(, "dabestr")` 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 + ... + • 001_plotter/two-groups-unpaired-mean-diff-colour-float-true.svg + • 001_plotter/two-groups-unpaired-mean-diff-float-false.svg + • 001_plotter/two-groups-unpaired-mean-diff-float-true.svg + • 002_forest_plot/deltadelta-forest-plot-mean-diff.svg + • 002_forest_plot/deltadelta-forest-plot-with-plot-kwargs.svg + • 002_forest_plot/minimeta-forest-plot-mean-diff.svg + • 002_forest_plot/minimeta-forest-plot-median-diff.svg + • 002_forest_plot/minimeta-forest-plot-with-plot-kwargs.svg + Error: Test failures + Execution halted + ``` + +# daiquiri + +
+ +* Version: 1.1.1 +* GitHub: https://github.com/ropensci/daiquiri +* Source code: https://github.com/cran/daiquiri +* Date/Publication: 2023-07-18 16:50:09 UTC +* Number of recursive dependencies: 105 + +Run `revdepcheck::cloud_details(, "daiquiri")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(daiquiri) + > + > test_check("daiquiri") + + Quitting from report_htmldoc.Rmd:466-528 [daiquiri-individual-fields] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + ... + 36. └─rlang::abort(message, ..., call = call, arg = arg) + + [ FAIL 4 | WARN 0 | SKIP 8 | PASS 472 ] + Deleting unused snapshots: + • aggregate_data/test_[ALL_FIELDS_COMBINED].csv + • aggregate_data/test_[DUPLICATES].csv + • aggregate_data/test_col1.csv + • aggregate_data/test_col2.csv + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘daiquiri.Rmd’ using rmarkdown + ``` + +# DAISIEprep + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/joshwlambert/DAISIEprep +* Source code: https://github.com/cran/DAISIEprep +* Date/Publication: 2024-12-18 00:20:02 UTC +* Number of recursive dependencies: 146 + +Run `revdepcheck::cloud_details(, "DAISIEprep")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(DAISIEprep) + > + > test_check("DAISIEprep") + [ FAIL 4 | WARN 2 | SKIP 14 | PASS 2235 ] + + ══ Skipped tests (14) ══════════════════════════════════════════════════════════ + ... + ── Failure ('test-plot_phylod.R:8:3'): plot_phylod runs silent without error ─── + `plot_phylod(phylod = phylod, node_pies = FALSE)` produced warnings. + ── Failure ('test-plot_phylod.R:13:3'): plot_phylod runs silent without error ── + `plot_phylod(phylod = phylod, node_pies = TRUE)` produced warnings. + ── 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 2235 ] + Error: Test failures + Execution halted + ``` + +# daltoolbox + +
+ +* Version: 1.2.707 +* GitHub: https://github.com/cefet-rj-dal/daltoolbox +* Source code: https://github.com/cran/daltoolbox +* Date/Publication: 2025-05-13 06:20:13 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "daltoolbox")` for more info + +
+ +## Newly broken + +* checking whether package ‘daltoolbox’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘daltoolbox’ + See ‘/tmp/workdir/daltoolbox/new/daltoolbox.Rcheck/00install.out’ for details. + ``` + +# dams + +
+ +* Version: 0.3.0 +* GitHub: https://github.com/jsta/dams +* Source code: https://github.com/cran/dams +* Date/Publication: 2020-05-20 16:00:03 UTC +* Number of recursive dependencies: 88 + +Run `revdepcheck::cloud_details(, "dams")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘dams.Rmd’ using rmarkdown + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 5 marked UTF-8 strings + ``` + +# dartR + +
+ +* Version: 2.9.9.5 +* GitHub: https://github.com/green-striped-gecko/dartR +* Source code: https://github.com/cran/dartR +* Date/Publication: 2025-03-25 09:50:02 UTC +* Number of recursive dependencies: 284 + +Run `revdepcheck::cloud_details(, "dartR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘dartR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: gl.dist.ind + > ### Title: Calculates a distance matrix for individuals defined in a + > ### genlight object + > ### Aliases: gl.dist.ind + > + > ### ** Examples + > + ... + Warning: The `size` argument of `element_line()` is deprecated as of ggplot2 3.4.0. + ℹ Please use the `linewidth` argument instead. + ℹ The deprecated feature was likely used in the dartR package. + Please report the issue at . + Warning: The `size` argument of `element_rect()` is deprecated as of ggplot2 3.4.0. + ℹ Please use the `linewidth` argument instead. + ℹ The deprecated feature was likely used in the dartR package. + Please report the issue at . + Error: C stack usage 9964164 is too close to the limit + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 9.9Mb + sub-directories of 1Mb or more: + R 3.5Mb + data 2.0Mb + help 3.5Mb + ``` + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘foreach’ + All declared Imports should be used. + ``` + +# Deducer + +
+ +* Version: 0.9-0 +* GitHub: NA +* Source code: https://github.com/cran/Deducer +* Date/Publication: 2025-05-07 13:50:06 UTC +* Number of recursive dependencies: 115 + +Run `revdepcheck::cloud_details(, "Deducer")` for more info + +
+ +## Newly broken + +* checking whether package ‘Deducer’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘Deducer’ + See ‘/tmp/workdir/Deducer/new/Deducer.Rcheck/00install.out’ for details. + ``` + +# deeptime + +
+ +* 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: 196 + +Run `revdepcheck::cloud_details(, "deeptime")` for more info + +
+ +## Newly broken + +* checking whether package ‘deeptime’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/deeptime/new/deeptime.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘deeptime’ ... +** package ‘deeptime’ 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 +** help +*** installing help indices +... +** testing if installed package can be loaded from temporary location +Error: package or namespace load failed for ‘deeptime’: + .onLoad failed in loadNamespace() for 'deeptime', details: + call: NULL + error: object properties are invalid: +- @hjust must be , , or , not +Error: loading failed +Execution halted +ERROR: loading failed +* removing ‘/tmp/workdir/deeptime/new/deeptime.Rcheck/deeptime’ + + +``` +### CRAN + +``` +* installing *source* package ‘deeptime’ ... +** package ‘deeptime’ 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 +** help +*** installing help indices +*** copying figures +** 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 (deeptime) + + +``` +# demodelr + +
+ +* Version: 1.0.1 +* GitHub: NA +* Source code: https://github.com/cran/demodelr +* Date/Publication: 2022-09-16 15:36:08 UTC +* Number of recursive dependencies: 67 + +Run `revdepcheck::cloud_details(, "demodelr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘demodelr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: phaseplane + > ### Title: Phase plane of differential equation. + > ### Aliases: phaseplane + > + > ### ** Examples + > + > # For a two variable system of differential equations we use the + > # formula notation for dx/dt and the dy/dt separately: + > system_eq <- c(dx ~ cos(y), + + dy ~ sin(x)) + > phaseplane(system_eq,x_var='x',y_var='y') + Error: C stack usage 9964276 is too close to the limit + Execution halted + ``` + +# dendextend + +
+ +* Version: 1.19.0 +* GitHub: https://github.com/talgalili/dendextend +* Source code: https://github.com/cran/dendextend +* Date/Publication: 2024-11-15 10:40:06 UTC +* Number of recursive dependencies: 129 + +Run `revdepcheck::cloud_details(, "dendextend")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > + > library(dendextend) + + --------------------- + Welcome to dendextend version 1.19.0 + Type citation('dendextend') for how to cite the package. + ... + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 872 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-ggdend.R:168:4'): ggplot doesn't have warnings for dendrograms ── + names(ggplot_build(g)) not identical to c("data", "layout", "plot"). + target is NULL, current is character + + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 872 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Packages which this enhances but not available for checking: + 'ggdendro', 'dendroextras', 'Hmisc', 'WGCNA', 'moduleColor', + 'distory', 'phangorn', 'zoo' + ``` + +* checking installed package size ... NOTE + ``` + installed size is 6.9Mb + sub-directories of 1Mb or more: + doc 5.8Mb + ``` + +* checking Rd cross-references ... NOTE + ``` + Packages unavailable to check Rd xrefs: ‘WGCNA’, ‘dendroextras’, ‘moduleColor’, ‘distory’, ‘phangorn’, ‘ggdendro’, ‘zoo’ + ``` + +# densityratio + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/thomvolker/densityratio +* Source code: https://github.com/cran/densityratio +* Date/Publication: 2025-05-19 13:30:05 UTC +* Number of recursive dependencies: 65 + +Run `revdepcheck::cloud_details(, "densityratio")` 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 + ... + ── Failure ('test-ulsif.R:78:3'): multidimensional ULSIF estimation, prediction works ── + plot_univariate(...) has type 'object', not 'list'. + ── Failure ('test-ulsif.R:83:3'): multidimensional ULSIF estimation, prediction works ── + plot_univariate(...) has type 'object', not 'list'. + ── Failure ('test-lhss.R:29:3'): multidimensional lhss estimation, prediction and plotting works ── + suppressWarnings(plot(dr)) has type 'object', not 'list'. + + [ FAIL 10 | WARN 0 | SKIP 0 | PASS 270 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 11.6Mb + sub-directories of 1Mb or more: + data 1.5Mb + libs 8.9Mb + ``` + +# DescribeDisplay + +
+ +* Version: 0.2.11 +* GitHub: https://github.com/ggobi/DescribeDisplay +* Source code: https://github.com/cran/DescribeDisplay +* Date/Publication: 2023-08-25 08:50:15 UTC +* Number of recursive dependencies: 61 + +Run `revdepcheck::cloud_details(, "DescribeDisplay")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘DescribeDisplay-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggplot.scatmat + > ### Title: Create a nice plots in a scatter plot matrix Create a nice + > ### looking plots in a matrix. The 1d sections along the diagonal have a + > ### smooth density while the values are compared to eachother within the + > ### matrix. + > ### Aliases: ggplot.scatmat + > ### Keywords: hplot + > + > ### ** Examples + > + > library(ggplot2) + > print(ggplot(dd_example("scatmat"))) + Error: C stack usage 9964292 is too close to the limit + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(DescribeDisplay) + > + > test_check("DescribeDisplay") + [ FAIL 1 | WARN 9 | SKIP 0 | PASS 0 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + 1. ├─ggplot2::ggplot(dd_example("timeseries")) at test-examples.R:11:3 + 2. └─DescribeDisplay:::ggplot.timeseries(dd_example("timeseries")) + 3. ├─ggplot2::ggplot(all, aesString) + 4. └─ggplot2:::ggplot.default(all, aesString) + 5. └─cli::cli_abort(...) + 6. └─rlang::abort(...) + + [ FAIL 1 | WARN 9 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted + ``` + +# DEXiR + +
+ +* Version: 1.0.2 +* GitHub: NA +* Source code: https://github.com/cran/DEXiR +* Date/Publication: 2024-09-17 16:30:09 UTC +* Number of recursive dependencies: 62 + +Run `revdepcheck::cloud_details(, "DEXiR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘DEXiR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggplot_parallel + > ### Title: ggplot_parallel + > ### Aliases: ggplot_parallel + > + > ### ** Examples + > + > if (requireNamespace("GGally", quietly = TRUE)) { + ... + + + + # Load "Car.dxi" + + CarDxi <- system.file("extdata", "Car.dxi", package = "DEXiR") + + Car <- read_dexi(CarDxi) + + + + # Plot all Car$alternatives with points and lines + + ggplot_parallel(Car) + ggplot2::geom_line(linewidth = 2) + ggplot2::geom_point(size = 3) + + } + Error: C stack usage 9961604 is too close to the limit + Execution halted + ``` + +# diceR + +
+ +* Version: 3.0.0 +* GitHub: https://github.com/AlineTalhouk/diceR +* Source code: https://github.com/cran/diceR +* Date/Publication: 2025-02-05 09:40:01 UTC +* Number of recursive dependencies: 152 + +Run `revdepcheck::cloud_details(, "diceR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-graphs.R:18:3'): graph_cdf object can have added/modified ggplot layers ── + isTRUE(all.equal(p1, p2)) is not FALSE + + `actual`: TRUE + `expected`: FALSE + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 113 ] + Error: Test failures + Execution halted + ``` + +# DImodelsVis + +
+ +* Version: 1.0.1 +* GitHub: NA +* Source code: https://github.com/cran/DImodelsVis +* Date/Publication: 2024-02-26 14:10:15 UTC +* Number of recursive dependencies: 113 + +Run `revdepcheck::cloud_details(, "DImodelsVis")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘DImodelsVis-Ex.R’ failed + The error most likely occurred in: + + > ### Name: conditional_ternary + > ### Title: Conditional ternary diagrams + > ### Aliases: conditional_ternary + > + > ### ** Examples + > + > library(DImodels) + ... + 14. │ └─base::withCallingHandlers(...) + 15. └─ggplot2 (local) f(l = layers[[i]], d = data[[i]]) + 16. └─l$compute_position(d, layout) + 17. └─ggplot2 (local) compute_position(..., self = self) + 18. └─self$position$use_defaults(data, self$aes_params) + 19. └─ggplot2 (local) use_defaults(..., self = self) + 20. └─ggplot2:::check_aesthetics(new, nrow(data)) + 21. └─cli::cli_abort(...) + 22. └─rlang::abort(...) + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘DImodelsVis-with-complex-models.Rmd’ using rmarkdown + ``` + +# directlabels + +
+ +* Version: 2025.5.20 +* GitHub: https://github.com/tdhock/directlabels +* Source code: https://github.com/cran/directlabels +* Date/Publication: 2025-05-20 10:50:02 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "directlabels")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘examples.Rmd’ using knitr + ``` + +# DiSCos + +
+ +* Version: 0.1.1 +* GitHub: https://github.com/Davidvandijcke/DiSCos +* Source code: https://github.com/cran/DiSCos +* Date/Publication: 2024-07-23 03:30:03 UTC +* Number of recursive dependencies: 119 + +Run `revdepcheck::cloud_details(, "DiSCos")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + `expected`: TRUE + ── Failure ('test-DiSCoTEA.R:142:3'): cdfDiff works ──────────────────────────── + typeof(discot$plot) == "list" is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 8 | WARN 2 | SKIP 1 | PASS 107 ] + Error: Test failures + Execution halted + ``` + +# discourseGT + +
+ +* Version: 1.2.0 +* GitHub: NA +* Source code: https://github.com/cran/discourseGT +* Date/Publication: 2023-07-19 07:20:02 UTC +* Number of recursive dependencies: 127 + +Run `revdepcheck::cloud_details(, "discourseGT")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘discourseGT-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot1Att + > ### Title: Plots Graphs using ggplot2 with one attribute + > ### Aliases: plot1Att + > + > ### ** Examples + > + > df <- sampleData1 + ... + > prepNet <- tabulate_edges(df, silentNodes = 0) + > baseNet <- prepareGraphs(prepNet, project_title = "Sample Data 1", weightedGraph = TRUE) + > attdata <- attributeData + > plot1Att(baseNet, prop = 20, graphmode = "fruchtermanreingold", + + attribute = attdata$gender, + + attribute.label = "Gender", + + attribute.node.labels = attdata$node, attribute.nodesize = 12) + $g2plot + Error: C stack usage 9961524 is too close to the limit + Execution halted + ``` + +# distributions3 + +
+ +* Version: 0.2.2 +* GitHub: https://github.com/alexpghayes/distributions3 +* Source code: https://github.com/cran/distributions3 +* Date/Publication: 2024-09-16 16:20:02 UTC +* Number of recursive dependencies: 89 + +Run `revdepcheck::cloud_details(, "distributions3")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(distributions3) + + Attaching package: 'distributions3' + + The following object is masked from 'package:stats': + + ... + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-plot.R:50:3'): ggplot2 implementation works ────────────────── + `print(gg1)` produced warnings. + ── Failure ('test-plot.R:56:3'): ggplot2 implementation works ────────────────── + `print(gg3)` produced warnings. + + [ FAIL 2 | WARN 14 | SKIP 0 | PASS 2766 ] + Error: Test failures + Execution halted + ``` + +# dittoViz + +
+ +* Version: 1.0.3 +* GitHub: https://github.com/dtm2451/dittoViz +* Source code: https://github.com/cran/dittoViz +* Date/Publication: 2025-02-25 18:30:02 UTC +* Number of recursive dependencies: 96 + +Run `revdepcheck::cloud_details(, "dittoViz")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘dittoViz-Ex.R’ failed + The error most likely occurred in: + + > ### Name: barPlot + > ### Title: Outputs a stacked bar plot to show the percent composition of + > ### samples, groups, clusters, or other groupings + > ### Aliases: barPlot + > + > ### ** Examples + > + ... + 15 3 D 12 32 0.3750000 + 16 4 D 8 32 0.2500000 + > # through hovering the cursor over the relevant parts of the plot + > if (requireNamespace("plotly", quietly = TRUE)) { + + barPlot(example_df, "clustering", group.by = "groups", + + do.hover = TRUE) + + } + Error in pm[[2]] : subscript out of bounds + Calls: barPlot -> -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(dittoViz) + Loading required package: ggplot2 + > test_check("dittoViz") + Picking joint bandwidth of 11.2 + Picking joint bandwidth of 11.2 + Picking joint bandwidth of 11.2 + ... + 6. └─dittoViz:::.yPlot_add_data_y_direction(...) + 7. └─ggplot2::geom_violin(draw_quantiles = vlnplot.quantiles) + 8. └─ggplot2:::check_numeric(draw_quantiles) + 9. └─ggplot2:::check_object(x, is.numeric, what, ..., arg = arg, call = call) + 10. └─ggplot2:::stop_input_type(...) + 11. └─rlang::abort(message, ..., call = call, arg = arg) + + [ FAIL 47 | WARN 19 | SKIP 0 | PASS 199 ] + Error: Test failures + Execution halted + ``` + +# dndR + +
+ +* Version: 3.0.0 +* GitHub: https://github.com/njlyon0/dndR +* Source code: https://github.com/cran/dndR +* Date/Publication: 2025-04-02 18:00:02 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "dndR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + `expected[2:2]`: "ggplot" + ── Failure ('test-probability_plot.R:22:3'): Outputs are as expected ─────────── + class(my_plot) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 102 ] + Error: Test failures + Execution halted + ``` + +# dobin + +
+ +* Version: 1.0.4 +* GitHub: NA +* Source code: https://github.com/cran/dobin +* Date/Publication: 2022-08-25 22:52:33 UTC +* Number of recursive dependencies: 132 + +Run `revdepcheck::cloud_details(, "dobin")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘dobin.Rmd’ using rmarkdown + ``` + +# donutsk + +
+ +* Version: 0.1.1 +* GitHub: https://github.com/dkibalnikov/donutsk +* Source code: https://github.com/cran/donutsk +* Date/Publication: 2024-04-22 18:50:06 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "donutsk")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘donutsk-Ex.R’ failed + The error most likely occurred in: + + > ### Name: donut_label + > ### Title: Create pie or donut label and text annotations + > ### Aliases: donut_label StatLabelInt geom_label_int StatTextInt + > ### geom_text_int StatLabelExt geom_label_ext StatTextExt geom_text_ext + > ### Keywords: datasets + > + > ### ** Examples + ... + + guides(alpha=guide_legend(ncol = 2), fill=guide_legend(ncol = 2)) + + + theme_void() + + + theme(legend.position = "inside", legend.position.inside = c(0.1, 0.9)) + > + > p + coord_radial(theta = "y", expand = FALSE, rotate_angle = FALSE) + Warning: The `rotate_angle` argument of `coord_radial()` is deprecated as of ggplot2 + 3.5.1. + ℹ Please use the `rotate.angle` argument instead. + Error: Can't find property @margin + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘real_life_example.Rmd’ using rmarkdown + + Quitting from real_life_example.Rmd:68-95 [unnamed-chunk-3] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! Can't find property @margin + --- + Backtrace: + ... + + Error: processing vignette 'real_life_example.Rmd' failed with diagnostics: + Can't find property @margin + --- failed re-building ‘real_life_example.Rmd’ + + SUMMARY: processing the following file failed: + ‘real_life_example.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# dotsViolin + +
+ +* 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: 37 + +Run `revdepcheck::cloud_details(, "dotsViolin")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + 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 + > + ... + 32. │ └─ggplot2 (local) draw_group(...) + 33. │ ├─ggplot2:::ggname(...) + 34. │ │ └─grid::grobName(grob, prefix) + 35. │ └─ggplot2:::dotstackGrob(...) + 36. └─base::.handleSimpleError(...) + 37. └─rlang (local) h(simpleError(msg, call)) + 38. └─handlers[[1L]](cnd) + 39. └─cli::cli_abort(...) + 40. └─rlang::abort(...) + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 2 marked UTF-8 strings + ``` + +# dsld + +
+ +* Version: 0.2.2 +* GitHub: https://github.com/matloff/dsld +* Source code: https://github.com/cran/dsld +* Date/Publication: 2024-09-13 18:20:09 UTC +* Number of recursive dependencies: 227 + +Run `revdepcheck::cloud_details(, "dsld")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘dsld-Ex.R’ failed + The error most likely occurred in: + + > ### Name: dsldFreqPCoord + > ### Title: dsldFreqPCoord + > ### Aliases: dsldFreqPCoord + > + > ### ** Examples + > + > data(lsa) + > lsa1 <- lsa[,c('fam_inc','ugpa','gender','lsat','race1')] + > dsldFreqPCoord(lsa1,75,'race1') + Error: C stack usage 9965508 is too close to the limit + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘bnlearn’ + ``` + +# 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: 86 + +Run `revdepcheck::cloud_details(, "duke")` 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 + ... + 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 10 | SKIP 0 | PASS 27 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘duke.Rmd’ using rmarkdown + ``` + +# easyalluvial + +
+ +* Version: 0.3.2 +* GitHub: https://github.com/erblast/easyalluvial +* Source code: https://github.com/cran/easyalluvial +* Date/Publication: 2023-12-07 13:40:06 UTC +* Number of recursive dependencies: 148 + +Run `revdepcheck::cloud_details(, "easyalluvial")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(easyalluvial) + > + > test_check("easyalluvial") + [ FAIL 3 | WARN 6 | SKIP 18 | PASS 41 ] + + ══ Skipped tests (18) ══════════════════════════════════════════════════════════ + ... + • plot_marginal_histograms/mod-num-num.svg + • plot_marginal_histograms/mod-num-pred-train.svg + • plot_marginal_histograms/plot-hist-long-cat-fill.svg + • plot_marginal_histograms/plot-hist-long-cat.svg + • plot_marginal_histograms/plot-hist-long-num-has-fill.svg + • plot_marginal_histograms/plot-hist-long-num-is-fill.svg + • plot_marginal_histograms/plot-hist-long-num.svg + • plot_marginal_histograms/plot-hist-wide-num.svg + Error: Test failures + Execution halted + ``` + +# easysurv + +
+ +* 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: 153 + +Run `revdepcheck::cloud_details(, "easysurv")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘easysurv-Ex.R’ failed + The error most likely occurred in: + + > ### Name: get_km + > ### Title: Generate Kaplan-Meier estimates + > ### Aliases: get_km + > + > ### ** 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 + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘easysurv.Rmd’ using rmarkdown + + Quitting from easysurv.Rmd:148-157 [km] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `.construct_risktable()`: + ! argument "risktable_height" is missing, with no default + --- + Backtrace: + ... + + 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 + ``` + +# ecocbo + +
+ +* Version: 0.12.0 +* GitHub: NA +* Source code: https://github.com/cran/ecocbo +* Date/Publication: 2024-08-21 08:00:02 UTC +* Number of recursive dependencies: 115 + +Run `revdepcheck::cloud_details(, "ecocbo")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ecocbo-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ecocbo-package + > ### Title: ecocbo: Calculating Optimum Sampling Effort in Community Ecology + > ### Aliases: ecocbo-package ecocbo + > ### Keywords: package + > + > ### ** Examples + > + ... + 40. └─vctrs::vec_default_cast(...) + 41. ├─base::withRestarts(...) + 42. │ └─base (local) withOneRestart(expr, restarts[[1L]]) + 43. │ └─base (local) doWithOneRestart(return(expr), restart) + 44. └─vctrs::stop_incompatible_cast(...) + 45. └─vctrs::stop_incompatible_type(...) + 46. └─vctrs:::stop_incompatible(...) + 47. └─vctrs:::stop_vctrs(...) + 48. └─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: + > # 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 + ... + ── Failure ('test-plot_power.R:6:3'): plots are plotted ──────────────────────── + Expected `plot_power(epiBetaR, m = 4, method = "both")` to run without any conditions. + i Actually got a with text: + i In index: 1. + Caused by error in `vec_slice<-`: + ! Can't convert `na_value` to . + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 25 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘ecocbo-guide.Rmd’ using rmarkdown + + Quitting from ecocbo-guide.Rmd:164-167 [step4] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'ecocbo-guide.Rmd' failed with diagnostics: + ... + ℹ In index: 1. + Caused by error in `vec_slice<-`: + ! Can't convert `na_value` to . + --- failed re-building ‘ecocbo-guide.Rmd’ + + SUMMARY: processing the following file failed: + ‘ecocbo-guide.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# ecochange + +
+ +* Version: 2.9.3.3 +* GitHub: NA +* Source code: https://github.com/cran/ecochange +* Date/Publication: 2025-04-05 11:20:17 UTC +* Number of recursive dependencies: 89 + +Run `revdepcheck::cloud_details(, "ecochange")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ecochange-Ex.R’ failed + The error most likely occurred in: + + > ### Name: EBVstats + > ### Title: EBV Stats + > ### Aliases: EBVstats + > + > ### ** Examples + > + > ## RasterBrick of structural Essential Biodiversity Variables + ... + 5. └─ggplot2::build_ggplot(plot) + 6. ├─S7::S7_dispatch() + 7. └─ggplot2 (local) `method(build_ggplot, ggplot2::ggplot)`(...) + 8. └─ggplot2:::plot_theme(plot) + 9. └─ggplot2:::check_theme(theme) + 10. └─base::mapply(...) + 11. └─ggplot2 (local) ``(...) + 12. └─cli::cli_abort(...) + 13. └─rlang::abort(...) + Execution halted + ``` + +# EGAnet + +
+ +* Version: 2.3.0 +* GitHub: https://github.com/hfgolino/EGAnet +* Source code: https://github.com/cran/EGAnet +* Date/Publication: 2025-04-09 23:10:15 UTC +* Number of recursive dependencies: 185 + +Run `revdepcheck::cloud_details(, "EGAnet")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘EGAnet-Ex.R’ failed + The error most likely occurred in: + + > ### Name: compare.EGA.plots + > ### Title: Visually Compare Two or More 'EGAnet' plots + > ### Aliases: compare.EGA.plots + > + > ### ** Examples + > + > # Obtain WMT-2 data + ... + > wmt <- wmt2[,7:24] + > + > # Draw random samples of 300 cases + > sample1 <- wmt[sample(1:nrow(wmt), 300),] + > sample2 <- wmt[sample(1:nrow(wmt), 300),] + > + > # Estimate EGAs + > ega1 <- EGA(sample1) + Error: C stack usage 9964804 is too close to the limit + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.2Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 4.0Mb + ``` + +# 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: 74 + +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 9 | SKIP 19 | PASS 43 ] + Error: Test failures + Execution halted + ``` + +# eks + +
+ +* Version: 1.1.0 +* GitHub: NA +* Source code: https://github.com/cran/eks +* Date/Publication: 2025-05-18 17:30:02 UTC +* Number of recursive dependencies: 79 + +Run `revdepcheck::cloud_details(, "eks")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.scale_rem: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# EMMIXmfa + +
+ +* 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: 45 + +Run `revdepcheck::cloud_details(, "EMMIXmfa")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘EMMIXmfa-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 + > + > ### ** Examples + ... + > # Allocating new samples to the clusters + > 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: C stack usage 9963108 is too close to the limit + Execution halted + ``` + +# ENMTools + +
+ +* Version: 1.1.2 +* GitHub: NA +* Source code: https://github.com/cran/ENMTools +* Date/Publication: 2024-01-16 12:50:11 UTC +* Number of recursive dependencies: 286 + +Run `revdepcheck::cloud_details(, "ENMTools")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ENMTools) + Loading required package: dismo + Loading required package: raster + Loading required package: sp + > + > test_check("ENMTools") + ... + `actual`: FALSE + `expected`: TRUE + Backtrace: + ▆ + 1. └─ENMTools (local) expect_enmtools_model(cyreni.glm.raster2) at test_ENMTools.R:249:3 + 2. └─testthat::expect_true(...) at test_ENMTools.R:66:3 + + [ FAIL 9 | WARN 0 | SKIP 3 | PASS 167 ] + Error: Test failures + Execution halted + ``` + +# epiCleanr + +
+ +* Version: 0.2.0 +* 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: 129 + +Run `revdepcheck::cloud_details(, "epiCleanr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘epiCleanr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: handle_outliers + > ### Title: Detect and Handle Outliers in Dataset + > ### Aliases: handle_outliers + > + > ### ** Examples + > + > + ... + 13. │ └─ggplot2 (local) FUN(X[[i]], ...) + 14. │ └─scale$map_df(df = df) + 15. │ └─ggplot2 (local) map_df(..., self = self) + 16. │ └─base::lapply(aesthetics, function(j) self$map(df[[j]])) + 17. │ └─ggplot2 (local) FUN(X[[i]], ...) + 18. │ └─self$map(df[[j]]) + 19. │ └─ggplot2 (local) map(..., self = self) + 20. │ └─vctrs::`vec_slice<-`(`*tmp*`, is.na(x), value = na_value) + 21. └─rlang::cnd_signal(x) + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.6Mb + sub-directories of 1Mb or more: + doc 2.9Mb + help 2.5Mb + ``` + +# EpiForsk + +
+ +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/EpiForsk +* Date/Publication: 2024-02-26 13:40:05 UTC +* Number of recursive dependencies: 124 + +Run `revdepcheck::cloud_details(, "EpiForsk")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Contributing.Rmd’ using rmarkdown + --- finished re-building ‘Contributing.Rmd’ + + --- re-building ‘Writing_functions.Rmd’ using rmarkdown + --- finished re-building ‘Writing_functions.Rmd’ + + --- re-building ‘andh_forest_plot.Rmd’ using rmarkdown + + Quitting from andh_forest_plot.Rmd:211-241 [unnamed-chunk-8] + ... + + Error: processing vignette 'andh_forest_plot.Rmd' failed with diagnostics: + the condition has length > 1 + --- failed re-building ‘andh_forest_plot.Rmd’ + + SUMMARY: processing the following file failed: + ‘andh_forest_plot.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# epiphy + +
+ +* Version: 0.5.0 +* GitHub: https://github.com/chgigot/epiphy +* Source code: https://github.com/cran/epiphy +* Date/Publication: 2023-11-16 11:20:10 UTC +* Number of recursive dependencies: 89 + +Run `revdepcheck::cloud_details(, "epiphy")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘epiphy-Ex.R’ failed + The error most likely occurred in: + + > ### Name: clump + > ### Title: Regroup observational data into even clumps of individuals. + > ### Aliases: clump clump.intensity + > + > ### ** Examples + > + > my_incidence <- incidence(tomato_tswv$field_1929) + ... + 21. │ └─ggplot2 (local) setup_params(...) + 22. │ └─ggplot2:::make_summary_fun(...) + 23. │ └─rlang::as_function(fun.data) + 24. │ └─base::get(x, envir = env, mode = "function") + 25. └─base::.handleSimpleError(...) + 26. └─rlang (local) h(simpleError(msg, call)) + 27. └─handlers[[1L]](cnd) + 28. └─cli::cli_abort(...) + 29. └─rlang::abort(...) + Execution halted + ``` + +# epos + +
+ +* Version: 1.1 +* GitHub: https://github.com/bernd-mueller/epos +* Source code: https://github.com/cran/epos +* Date/Publication: 2024-03-15 10:10:02 UTC +* Number of recursive dependencies: 95 + +Run `revdepcheck::cloud_details(, "epos")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(epos) + > + > test_check("epos") + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 13 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + [1] 1 - 11 == -10 + Backtrace: + ▆ + 1. └─testthat::expect_that(length(tanimotobaseline), equals(11)) at test_createTanimotoBaseline.R:47:3 + 2. └─testthat (local) condition(object) + 3. └─testthat::expect_equal(x, expected, ..., expected.label = label) + + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 13 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘testthat’ + All declared Imports should be used. + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 15 marked UTF-8 strings + ``` + +# EQUALSTATS + +
+ +* Version: 0.5.0 +* GitHub: NA +* Source code: https://github.com/cran/EQUALSTATS +* Date/Publication: 2024-09-23 08:30:02 UTC +* Number of recursive dependencies: 129 + +Run `revdepcheck::cloud_details(, "EQUALSTATS")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘EQUALSTATS-Ex.R’ failed + The error most likely occurred in: + + > ### Name: function.Survival_Analysis + > ### Title: Perform Survival Analysis + > ### Aliases: function.Survival_Analysis + > + > ### ** Examples + > + > # Create simulated data #### + ... + > rv$second_menu_choice <- NA + > rv$entry[[1]] <- "Admission to care home" + > rv$entry[[2]] <- "Follow-up" + > rv$entry[[3]] <- "Treatment" + > # Final function #### + > Results <- function.Survival_Analysis(Predefined_lists, rv) + Error in .construct_risktable(x, geom_blank.times = NULL, geom_blank.risktable_stats = c("{n.risk}", : + argument "risktable_height" is missing, with no default + Calls: function.Survival_Analysis + Execution halted + ``` + +## In both + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘lmerTest’ + ``` + +# equatiomatic + +
+ +* Version: 0.3.6 +* GitHub: https://github.com/datalorax/equatiomatic +* Source code: https://github.com/cran/equatiomatic +* Date/Publication: 2025-03-10 16:50:09 UTC +* Number of recursive dependencies: 146 + +Run `revdepcheck::cloud_details(, "equatiomatic")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘colors.Rmd’ using rmarkdown + --- finished re-building ‘colors.Rmd’ + + --- re-building ‘equatiomatic.Rmd’ using rmarkdown + --- finished re-building ‘equatiomatic.Rmd’ + + --- re-building ‘forecast-arima.Rmd’ using rmarkdown + --- finished re-building ‘forecast-arima.Rmd’ + + --- re-building ‘lme4-lmer.Rmd’ using rmarkdown + --- finished re-building ‘lme4-lmer.Rmd’ + + --- re-building ‘plotting-integration.Rmd’ using rmarkdown + ``` + +# errors + +
+ +* Version: 0.4.3 +* GitHub: https://github.com/r-quantities/errors +* Source code: https://github.com/cran/errors +* Date/Publication: 2025-01-18 18:10:05 UTC +* Number of recursive dependencies: 66 + +Run `revdepcheck::cloud_details(, "errors")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘errors-Ex.R’ failed + The error most likely occurred in: + + > ### Name: geom_errors + > ### Title: Errorbars for 'errors' objects + > ### Aliases: geom_errors + > + > ### ** Examples + > + > if (requireNamespace("ggplot2", quietly=TRUE)) { + ... + 23. │ └─self$draw_panel(data, panel_params, coord, width = 0.05, height = 0.05) + 24. │ └─errors (local) draw_panel(...) + 25. │ ├─base::append(...) + 26. │ └─ggplot2::GeomErrorbarh$draw_panel(...) + 27. └─base::.handleSimpleError(...) + 28. └─rlang (local) h(simpleError(msg, call)) + 29. └─handlers[[1L]](cnd) + 30. └─cli::cli_abort(...) + 31. └─rlang::abort(...) + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘rjournal.Rmd’ using rmarkdown + + Quitting from rjournal.Rmd:252-272 [plot] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'rjournal.Rmd' failed with diagnostics: + ... + ℹ Error occurred in the 2nd layer. + Caused by error in `draw_panel()`: + ! unused argument (height = NULL) + --- failed re-building ‘rjournal.Rmd’ + + SUMMARY: processing the following file failed: + ‘rjournal.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# eudract + +
+ +* Version: 1.0.4 +* GitHub: https://github.com/shug0131/eudraCT +* Source code: https://github.com/cran/eudract +* Date/Publication: 2025-03-20 17:20:02 UTC +* Number of recursive dependencies: 81 + +Run `revdepcheck::cloud_details(, "eudract")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘eudract-Ex.R’ failed + The error most likely occurred in: + + > ### Name: dot_plot + > ### Title: creates a dot-plot of safety data showing the absolute and + > ### relative risks + > ### Aliases: dot_plot + > + > ### ** Examples + > + ... + + $reference + [1] "Control" + + > fig <- dot_plot(safety_statistics, type="non_serious", base=4) + > fig + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(eudract) + > + > test_check("eudract") + [ FAIL 1 | WARN 3 | SKIP 4 | PASS 75 ] + + ══ Skipped tests (4) ═══════════════════════════════════════════════════════════ + ... + + [ FAIL 1 | WARN 3 | SKIP 4 | PASS 75 ] + Deleting unused snapshots: + • dotplot/dotplot-1group.svg + • dotplot/dotplot-3groups.svg + • dotplot/dotplot-ref-rr.svg + • dotplot/dotplot-ref.svg + • dotplot/dotplot.svg + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘eudract.Rmd’ using rmarkdown + --- finished re-building ‘eudract.Rmd’ + + --- re-building ‘standard_reporting.Rmd’ using rmarkdown + + Quitting from standard_reporting.Rmd:65-67 [dotplot_sae] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ... + Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + --- failed re-building ‘standard_reporting.Rmd’ + + SUMMARY: processing the following file failed: + ‘standard_reporting.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# eventstudyr + +
+ +* Version: 1.1.3 +* 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 + +Run `revdepcheck::cloud_details(, "eventstudyr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(eventstudyr) + > + > test_check("eventstudyr") + Defaulting to strongest lead of differenced policy variable: proxyIV = z_fd_lead3. To specify a different proxyIV use the proxyIV argument. + Defaulting to strongest lead of differenced policy variable: proxyIV = z_fd_lead3. To specify a different proxyIV use the proxyIV argument. + Defaulting to strongest lead of differenced policy variable: proxyIV = z_fd_lead3. To specify a different proxyIV use the proxyIV argument. + ... + `expected` is a character vector ('ci_lower') + ── Failure ('test-EventStudyPlot.R:128:5'): confidence intervals are appropriately present or absent ── + p_ci$labels$ymax (`actual`) not equal to "ci_upper" (`expected`). + + `actual` is NULL + `expected` is a character vector ('ci_upper') + + [ FAIL 6 | WARN 0 | SKIP 0 | PASS 258 ] + Error: Test failures + 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: 146 + +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: plot_treerates_sgn + > ### Title: Plot Bayesian evolutionary tree with rate thresholds for + > ### selection mode + > ### Aliases: plot_treerates_sgn + > + > ### ** Examples + > + ... + 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 ggtree package. + Please report the issue at . + Error: .onLoad failed in loadNamespace() for 'deeptime', details: + call: NULL + error: object properties are invalid: + - @hjust must be , , or , not + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘char-part.Rmd’ using rmarkdown + + Quitting from char-part.Rmd:28-30 [unnamed-chunk-2] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'char-part.Rmd' failed with diagnostics: + The package "deeptime" (>= 0.2.0) is required. + ... + Error: processing vignette 'rates-selection_MrBayes.Rmd' failed with diagnostics: + The package "deeptime" (>= 0.2.0) is required. + --- failed re-building ‘rates-selection_MrBayes.Rmd’ + + SUMMARY: processing the following files failed: + ‘char-part.Rmd’ ‘fbd-params.Rmd’ ‘offset_handling.Rmd’ + ‘rates-selection_BEAST2.Rmd’ ‘rates-selection_MrBayes.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* 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 + ``` + +# EWSmethods + +
+ +* Version: 1.3.1 +* GitHub: https://github.com/duncanobrien/EWSmethods +* Source code: https://github.com/cran/EWSmethods +* Date/Publication: 2024-05-15 16:20:02 UTC +* Number of recursive dependencies: 138 + +Run `revdepcheck::cloud_details(, "EWSmethods")` 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 + ... + i Actually got a with text: + The `plot.margin` theme element must be a vector of length 4 + ── Failure ('test-univariate_composite_ews_wrapper.R:28:3'): uniEWS works ────── + Expected `plot(eg.uniEWS2)` to run without any errors. + i Actually got a with text: + The `plot.margin` theme element must be a vector of length 4 + + [ FAIL 6 | WARN 28 | SKIP 2 | PASS 64 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ews_assessments.Rmd’ using rmarkdown + ``` + +# explainer + +
+ +* Version: 1.0.2 +* GitHub: https://github.com/PERSIMUNE/explainer +* Source code: https://github.com/cran/explainer +* Date/Publication: 2024-09-30 17:30:02 UTC +* Number of recursive dependencies: 185 + +Run `revdepcheck::cloud_details(, "explainer")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘explainer-Ex.R’ failed + The error most likely occurred in: + + > ### Name: eDecisionCurve + > ### Title: Decision Curve Plot + > ### Aliases: eDecisionCurve + > + > ### ** Examples + > + > library("explainer") + ... + > mylrn$train(maintask, splits$train) + > myplot <- eDecisionCurve( + + task = maintask, + + trained_model = mylrn, + + splits = splits, + + seed = seed + + ) + Error in pm[[2]] : subscript out of bounds + Calls: eDecisionCurve -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘ggpmisc’ + All declared Imports should be used. + ``` + +# ez + +
+ +* Version: 4.4-0 +* GitHub: https://github.com/mike-lawrence/ez +* Source code: https://github.com/cran/ez +* Date/Publication: 2016-11-02 18:17:31 +* Number of recursive dependencies: 63 + +Run `revdepcheck::cloud_details(, "ez")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ez-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ezPlot + > ### Title: Plot data from a factorial experiment + > ### Aliases: ezPlot + > + > ### ** Examples + > + > #Read in the ANT data (see ?ANT). + ... + Backtrace: + ▆ + 1. └─ez::ezPlot(...) + 2. ├─base::eval(parse(text = p)) + 3. │ └─base::eval(parse(text = p)) + 4. └─ggplot2::facet_grid(facets = . ~ group, scales = "free_y") + 5. └─lifecycle::deprecate_stop("2.2.0", "facet_grid(facets)", "facet_grid(rows)") + 6. └─lifecycle:::deprecate_stop0(msg) + 7. └─rlang::cnd_signal(...) + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) ez-package.Rd:19: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:20: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:21: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:22: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:23: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:24: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:25: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:26: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:27: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:28: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:29: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:30: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:32: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ez-package.Rd:33: Lost braces in \itemize; meant \describe ? + ``` + +# ezEDA + +
+ +* Version: 0.1.1 +* 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: 77 + +Run `revdepcheck::cloud_details(, "ezEDA")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ezEDA-Ex.R’ failed + The error most likely occurred in: + + > ### Name: category_contribution + > ### Title: Plot the contribution of different categories to a measure + > ### Aliases: category_contribution + > + > ### ** Examples + > + > category_contribution(ggplot2::diamonds, cut, price) + Error: C stack usage 9963124 is too close to the limit + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ezEDA) + > + > test_check("ezEDA") + [ FAIL 22 | WARN 0 | SKIP 0 | PASS 57 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ── Error ('test_two_measures_relationship.R:19:3'): y axis is labeled 'hwy' ──── + Error in `expect_match(p$labels$y, "hwy")`: is.character(act$val) is not TRUE + Backtrace: + ▆ + 1. └─testthat::expect_match(p$labels$y, "hwy") at test_two_measures_relationship.R:19:3 + 2. └─base::stopifnot(is.character(act$val)) + + [ FAIL 22 | WARN 0 | SKIP 0 | PASS 57 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘ezEDA.Rmd’ using rmarkdown + + Quitting from ezEDA.Rmd:86-90 [measure_change_over_time_wide] + Error: processing vignette 'ezEDA.Rmd' failed with diagnostics: + C stack usage 9962068 is too close to the limit + --- failed re-building ‘ezEDA.Rmd’ + + SUMMARY: processing the following file failed: + ‘ezEDA.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# EZFragility + +
+ +* Version: 1.0.3 +* GitHub: NA +* Source code: https://github.com/cran/EZFragility +* Date/Publication: 2025-04-10 14:40:09 UTC +* Number of recursive dependencies: 85 + +Run `revdepcheck::cloud_details(, "EZFragility")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘EZFragility-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plotFragHeatmap + > ### Title: Visualization functions (raw signal, fragility matrix) + > ### Aliases: plotFragHeatmap plotFragQuantile plotFragDistribution + > + > ### ** Examples + > + > + ... + > + > ## precomputed fragility object + > data("pt01Frag") + > + > ## plot the fragility heatmap + > plotFragHeatmap(frag = pt01Frag, sozIndex = sozIndex) + Warning: Ignoring unknown labels: + • size : "2" + Error: `object` must be an , not a S3 + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Intro_to_EZFragility.Rmd’ using rmarkdown + ``` + +# 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: 106 + +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: variable_plot + > ### Title: variable_plot + > ### Aliases: variable_plot + > + > ### ** Examples + > + > suppressPackageStartupMessages(library(tsibble)) + > library(tsibbledata) + > variable_plot(ansett, "Week", "Passengers", facet_x = "Class", yoy = TRUE) + Error: object properties are invalid: + - @linewidth must be , , or , not + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ezplot) + > suppressPackageStartupMessages(library(tsibble)) + > + > test_check("ezplot") + [ FAIL 2 | WARN 6 | SKIP 0 | PASS 90 ] + + ... + 2. ├─ggplot2::theme(...) + 3. │ └─ggplot2:::find_args(..., complete = NULL, validate = NULL) + 4. │ └─base::mget(args, envir = env) + 5. └─ggplot2::element_rect(fill = NA, colour = NA, linewidth = NA) + 6. └─S7::new_object(...) + 7. └─S7::validate(object, recursive = !parent_validated) + + [ FAIL 2 | WARN 6 | SKIP 0 | PASS 90 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘bar_plot.Rmd’ using rmarkdown + ``` + +# fabletools + +
+ +* Version: 0.5.0 +* GitHub: https://github.com/tidyverts/fabletools +* Source code: https://github.com/cran/fabletools +* Date/Publication: 2024-09-17 07:30:02 UTC +* Number of recursive dependencies: 105 + +Run `revdepcheck::cloud_details(, "fabletools")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(dplyr) + + Attaching package: 'dplyr' + + The following object is masked from 'package:testthat': + + ... + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-graphics.R:327:3'): autoplot_dcmp_ts() ─────────────────────── + `print(p)` produced warnings. + ── Failure ('test-graphics.R:346:3'): autoplot_dcmp_ts() ─────────────────────── + `print(p)` produced warnings. + + [ FAIL 2 | WARN 5 | SKIP 1 | PASS 292 ] + Error: Test failures + Execution halted + ``` + +# fairmodels + +
+ +* Version: 1.2.1 +* 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: 84 + +Run `revdepcheck::cloud_details(, "fairmodels")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘fairmodels-Ex.R’ failed + The error most likely occurred in: + + > ### Name: fairness_heatmap + > ### Title: Fairness heatmap + > ### Aliases: fairness_heatmap + > + > ### ** Examples + > + > + ... +  Fairness object created succesfully  + > + > + > fh <- fairness_heatmap(fobject) + > + > plot(fh) + Error in rep(yes, length.out = len) : + attempt to replicate an object of type 'object' + Calls: plot -> plot.fairness_heatmap -> ifelse + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(fairmodels) + > + > + > test_check("fairmodels") + Welcome to DALEX (version: 2.4.3). + Find examples and detailed introduction at: http://ema.drwhy.ai/ + ... + 5. │ └─base::class(object) %in% class + 6. ├─fairmodels::plot_fairmodels(fc, type = "fairness_heatmap") + 7. └─fairmodels:::plot_fairmodels.fairness_object(fc, type = "fairness_heatmap") + 8. └─fairmodels:::plot_fairmodels.default(x, type, ...) + 9. └─fairmodels:::plot.fairness_heatmap(fairness_heatmap(x, ...)) + 10. └─base::ifelse(...) + + [ FAIL 3 | WARN 1 | SKIP 0 | PASS 299 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Advanced_tutorial.Rmd’ using rmarkdown + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) choose_metric.Rd:35: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) choose_metric.Rd:36: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) choose_metric.Rd:37: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) confusion_matrx.Rd:20: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) confusion_matrx.Rd:21: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) confusion_matrx.Rd:22: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) confusion_matrx.Rd:23: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) disparate_impact_remover.Rd:28: Lost braces + 28 | pigeonholing. The number of pigeonholes is fixed and equal to min{101, unique(a)}, where a is vector with values for subgroup. So if some subgroup is not numerous and + | ^ + ... + checkRd: (-1) group_metric.Rd:30: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) group_metric.Rd:31: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) group_metric.Rd:32: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) group_metric.Rd:33: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) metric_scores.Rd:18: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) metric_scores.Rd:19: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) performance_and_fairness.Rd:20: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) performance_and_fairness.Rd:21: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) performance_and_fairness.Rd:22: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) performance_and_fairness.Rd:23: Lost braces in \itemize; \value handles \item{}{} directly + ``` + +# fairness + +
+ +* Version: 1.2.2 +* GitHub: https://github.com/kozodoi/fairness +* Source code: https://github.com/cran/fairness +* Date/Publication: 2021-04-14 15:00:02 UTC +* Number of recursive dependencies: 149 + +Run `revdepcheck::cloud_details(, "fairness")` for more info + +
+ +## Newly broken + +* checking whether package ‘fairness’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘fairness’ + See ‘/tmp/workdir/fairness/new/fairness.Rcheck/00install.out’ for details. + ``` + +# faux + +
+ +* Version: 1.2.2 +* GitHub: https://github.com/debruine/faux +* Source code: https://github.com/cran/faux +* Date/Publication: 2025-01-15 09:10:01 UTC +* Number of recursive dependencies: 128 + +Run `revdepcheck::cloud_details(, "faux")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘faux-Ex.R’ failed + The error most likely occurred in: + + > ### Name: norm2likert + > ### Title: Convert normal to likert + > ### Aliases: norm2likert + > + > ### ** Examples + > + > + ... + 2. └─plt$build() + 3. └─private$addLimits(margThemed) + 4. └─ggplot2::scale_x_continuous(limits = limits, oob = scales::squish) + 5. └─ggplot2::continuous_scale(...) + 6. └─ggplot2:::check_continuous_limits(limits, call = call) + 7. └─ggplot2:::check_numeric(limits, arg = arg, call = call, allow_na = TRUE) + 8. └─ggplot2:::check_object(x, is.numeric, what, ..., arg = arg, call = call) + 9. └─ggplot2:::stop_input_type(...) + 10. └─rlang::abort(message, ..., call = call, arg = arg) + 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() + ... + class(p) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + Backtrace: + ▆ + 1. └─global expect_equal(class(p), c("gg", "ggplot")) at test-plot_design.R:288:3 + 2. └─testthat::expect_equal(..., check.environment = FALSE) + + [ FAIL 19 | WARN 0 | SKIP 22 | PASS 1351 ] + Error: Test failures + Execution halted + ``` + +# fChange + +
+ +* Version: 2.0.0 +* GitHub: NA +* Source code: https://github.com/cran/fChange +* Date/Publication: 2025-03-27 18:00:09 UTC +* Number of recursive dependencies: 207 + +Run `revdepcheck::cloud_details(, "fChange")` 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 + ... + `expected`: "gg" + ── Failure ('test-plot_qq.R:3:3'): QQ Plot ───────────────────────────────────── + class(tmp)[1] (`actual`) not equal to "gg" (`expected`). + + `actual`: "ggplot2::ggplot" + `expected`: "gg" + + [ FAIL 13 | WARN 0 | SKIP 9 | PASS 177 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.0Mb + sub-directories of 1Mb or more: + data 2.0Mb + libs 3.5Mb + ``` + +# feasts + +
+ +* Version: 0.4.1 +* GitHub: https://github.com/tidyverts/feasts +* Source code: https://github.com/cran/feasts +* Date/Publication: 2024-09-25 23:40:02 UTC +* Number of recursive dependencies: 98 + +Run `revdepcheck::cloud_details(, "feasts")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(feasts) + Loading required package: fabletools + > + > test_check("feasts") + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 101 ] + + ... + ▆ + 1. ├─ggplot2::ggplot_build(p[[1]]) at test-graphics.R:194:3 + 2. ├─ggplot2:::ggplot_build.default(p[[1]]) + 3. │ └─ggplot2::build_ggplot(plot) + 4. │ └─S7::S7_dispatch() + 5. └─S7:::method_lookup_error("build_ggplot", ``) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 101 ] + Error: Test failures + Execution halted + ``` + +# fec16 + +
+ +* Version: 0.1.4 +* GitHub: https://github.com/baumer-lab/fec16 +* Source code: https://github.com/cran/fec16 +* Date/Publication: 2023-08-09 10:50:14 UTC +* Number of recursive dependencies: 92 + +Run `revdepcheck::cloud_details(, "fec16")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘fec_vignette.Rmd’ using rmarkdown + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 20 marked UTF-8 strings + ``` + +# fect + +
+ +* Version: 1.0.0 +* GitHub: NA +* Source code: https://github.com/cran/fect +* Date/Publication: 2022-10-14 09:52:32 UTC +* Number of recursive dependencies: 67 + +Run `revdepcheck::cloud_details(, "fect")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘fect-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.fect + > ### Title: Plotting + > ### Aliases: plot.fect + > + > ### ** Examples + > + > library(fect) + ... + 5. └─ggplot2::build_ggplot(plot) + 6. ├─S7::S7_dispatch() + 7. └─ggplot2 (local) `method(build_ggplot, ggplot2::ggplot)`(...) + 8. └─ggplot2:::plot_theme(plot) + 9. └─ggplot2:::check_theme(theme) + 10. └─base::mapply(...) + 11. └─ggplot2 (local) ``(...) + 12. └─cli::cli_abort(...) + 13. └─rlang::abort(...) + Execution halted + ``` + +## In both + +* checking C++ specification ... NOTE + ``` + Specified C++11: please drop specification unless essential + ``` + +* checking installed package size ... NOTE + ``` + installed size is 12.3Mb + sub-directories of 1Mb or more: + libs 10.9Mb + ``` + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘panelView’ + All declared Imports should be used. + ``` + +# fitbitViz + +
+ +* Version: 1.0.6 +* GitHub: https://github.com/mlampros/fitbitViz +* Source code: https://github.com/cran/fitbitViz +* Date/Publication: 2024-02-08 09:30:02 UTC +* Number of recursive dependencies: 154 + +Run `revdepcheck::cloud_details(, "fitbitViz")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(fitbitViz) + > + > test_check("fitbitViz") + [ FAIL 3 | WARN 3 | SKIP 0 | PASS 4 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + 4. ├─ggplot2::theme(...) + 5. │ └─ggplot2:::find_args(..., complete = NULL, validate = NULL) + 6. │ └─base::mget(args, envir = env) + 7. └─ggplot2::element_text(size = 12, face = "bold", colour = level_data$colour_y_axis) + 8. └─S7::new_object(...) + 9. └─S7::validate(object, recursive = !parent_validated) + + [ FAIL 3 | WARN 3 | SKIP 0 | PASS 4 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.7Mb + sub-directories of 1Mb or more: + doc 4.0Mb + ``` + +# flashlight + +
+ +* Version: 0.9.0 +* GitHub: https://github.com/mayer79/flashlight +* Source code: https://github.com/cran/flashlight +* Date/Publication: 2023-05-10 02:40:06 UTC +* Number of recursive dependencies: 72 + +Run `revdepcheck::cloud_details(, "flashlight")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘flashlight-Ex.R’ failed + The error most likely occurred in: + + > ### Name: light_interaction + > ### Title: Interaction Strength + > ### Aliases: light_interaction light_interaction.default + > ### light_interaction.flashlight light_interaction.multiflashlight + > + > ### ** Examples + > + ... + > fit_add <- stats::lm(Sepal.Length ~ Petal.Length + Petal.Width, data = iris) + > fit_nonadd <- stats::lm(Sepal.Length ~ Petal.Length * Petal.Width, data = iris) + > fl_add <- flashlight(model = fit_add, label = "additive") + > fl_nonadd <- flashlight(model = fit_nonadd, label = "nonadditive") + > fls <- multiflashlight(list(fl_add, fl_nonadd), data = iris) + > plot(st <- light_interaction(fls, v = v), fill = "darkgreen") + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘flashlight.Rmd’ using rmarkdown + + Quitting from flashlight.Rmd:85-95 [unnamed-chunk-3] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `as.vector()`: + ! cannot coerce type 'object' to vector of type 'character' + --- + Backtrace: + ... + + Error: processing vignette 'flashlight.Rmd' failed with diagnostics: + cannot coerce type 'object' to vector of type 'character' + --- failed re-building ‘flashlight.Rmd’ + + SUMMARY: processing the following file failed: + ‘flashlight.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) flashlight.Rd:53: Lost braces; missing escapes or markup? + 53 | like those in package {MetricsWeighted}.} + | ^ + checkRd: (-1) grouped_stats.Rd:49: Lost braces; missing escapes or markup? + 49 | {MetricsWeighted}.} + | ^ + checkRd: (-1) plot_counts.Rd:45: Lost braces; missing escapes or markup? + 45 | Experimental. Uses package {ggpubr} to rearrange the figure. + | ^ + ``` + +# flextable + +
+ +* Version: 0.9.9 +* GitHub: https://github.com/davidgohel/flextable +* Source code: https://github.com/cran/flextable +* Date/Publication: 2025-05-31 09:40:02 UTC +* Number of recursive dependencies: 131 + +Run `revdepcheck::cloud_details(, "flextable")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘flextable-Ex.R’ failed + The error most likely occurred in: + + > ### Name: gg_chunk + > ### Title: 'ggplots' chunk wrapper + > ### Aliases: gg_chunk + > + > ### ** Examples + > + > library(data.table) + ... + Loading required package: ggplot2 + a flextable object. + col_keys: `Species`, `gg` + header has 1 row(s) + body has 3 row(s) + original dataset sample: + Error in format.default(unlist(xx), ...) : + c("Found no format() method for class \"ggplot2::ggplot\"", "Found no format() method for class \"ggplot\"", "Found no format() method for class \"ggplot2::gg\"", "Found no format() method for class \"S7_object\"", "Found no format() method for class \"gg\"") + Calls: ... format -> format.default -> lapply -> FUN -> format.default + Execution halted + ``` + +# flipr + +
+ +* Version: 0.3.3 +* 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: 105 + +Run `revdepcheck::cloud_details(, "flipr")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘alternative.Rmd’ using rmarkdown + --- finished re-building ‘alternative.Rmd’ + + --- re-building ‘exactness.Rmd’ using rmarkdown + + Quitting from exactness.Rmd:141-177 [unnamed-chunk-1] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ... + 6. ├─plotly::ggplotly(.) + 7. └─plotly:::ggplotly.ggplot(.) + 8. └─plotly::gg2list(...) + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'exactness.Rmd' failed with diagnostics: + subscript out of bounds + --- failed re-building ‘exactness.Rmd’ + + --- re-building ‘flipr.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 11.2Mb + sub-directories of 1Mb or more: + doc 9.1Mb + libs 1.4Mb + ``` + +# fmeffects + +
+ +* Version: 0.1.4 +* GitHub: https://github.com/holgstr/fmeffects +* Source code: https://github.com/cran/fmeffects +* Date/Publication: 2024-11-05 18:50:02 UTC +* Number of recursive dependencies: 181 + +Run `revdepcheck::cloud_details(, "fmeffects")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘fmeffects-Ex.R’ failed + The error most likely occurred in: + + > ### Name: came + > ### Title: Computes a partitioning for a 'ForwardMarginalEffect' + > ### Aliases: came + > + > ### ** Examples + > + > # Train a model and compute FMEs: + ... + + PartitioningRpart of an FME object + + Method: max.sd = 200 + + n cAME SD(fME) + 728 56.44523 165.7487 * + 340 -37.57207 108.1235 + 388 138.83153 163.6989 + --- + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘fme_theory.Rmd’ using rmarkdown + --- finished re-building ‘fme_theory.Rmd’ + + --- re-building ‘fmeffects.Rmd’ using rmarkdown + ``` + +# fmf + +
+ +* 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: 176 + +Run `revdepcheck::cloud_details(, "fmf")` for more info + +
+ +## Newly broken + +* checking whether package ‘fmf’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘fmf’ + See ‘/tmp/workdir/fmf/new/fmf.Rcheck/00install.out’ for details. + ``` + +## In both + +* checking C++ specification ... NOTE + ``` + Specified C++11: please drop specification unless essential + ``` + +# foqat + +
+ +* Version: 2.0.8.2 +* GitHub: https://github.com/tianshu129/foqat +* Source code: https://github.com/cran/foqat +* Date/Publication: 2023-09-30 06:10:02 UTC +* Number of recursive dependencies: 73 + +Run `revdepcheck::cloud_details(, "foqat")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Air_Quality.Rmd’ using rmarkdown + --- finished re-building ‘Air_Quality.Rmd’ + + --- re-building ‘Atmospheric_Radiation.Rmd’ using rmarkdown + --- finished re-building ‘Atmospheric_Radiation.Rmd’ + + --- re-building ‘Basic_Functions.Rmd’ using rmarkdown + --- finished re-building ‘Basic_Functions.Rmd’ + + --- re-building ‘Particle_Size_Distribution.Rmd’ using rmarkdown + ``` + +# forestly + +
+ +* Version: 0.1.2 +* GitHub: https://github.com/Merck/forestly +* Source code: https://github.com/cran/forestly +* Date/Publication: 2025-01-10 16:20:14 UTC +* Number of recursive dependencies: 81 + +Run `revdepcheck::cloud_details(, "forestly")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘forest-plot-static.Rmd’ using rmarkdown + ``` + +# forestPSD + +
+ +* Version: 1.0.0 +* GitHub: NA +* Source code: https://github.com/cran/forestPSD +* Date/Publication: 2024-11-11 16:50:05 UTC +* Number of recursive dependencies: 45 + +Run `revdepcheck::cloud_details(, "forestPSD")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘forestPSD-Ex.R’ failed + The error most likely occurred in: + + > ### Name: psdfun + > ### Title: Regression analysis for survival curves. + > ### Aliases: psdfun + > + > ### ** Examples + > + > data(Npop) + ... + 16. │ └─l$compute_geom_2(d, theme = plot@theme) + 17. │ └─ggplot2 (local) compute_geom_2(..., self = self) + 18. │ └─self$geom$use_defaults(...) + 19. │ └─ggplot2 (local) use_defaults(..., self = self) + 20. │ └─ggplot2:::check_aesthetics(new_params, nrow(data)) + 21. │ └─vctrs::list_sizes(x) + 22. └─vctrs:::stop_scalar_type(``(``), "x$label", ``) + 23. └─vctrs:::stop_vctrs(...) + 24. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘ggplot2’ ‘reshape2’ + All declared Imports should be used. + ``` + +# formods + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/john-harrold/formods +* Source code: https://github.com/cran/formods +* Date/Publication: 2025-01-07 16:20:06 UTC +* Number of recursive dependencies: 187 + +Run `revdepcheck::cloud_details(, "formods")` 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 + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-FG_module.R:13:5'): FG -- Forcing builds of figures ────────── + class(ggplot2::ggplot_build(sess_res[["state"]][["FG"]][["figs"]][[fid]][["fobj"]])) (`actual`) not equal to "ggplot_built" (`expected`). + + `actual`: "ggplot2::ggplot_built" "ggplot_built" "ggplot2::gg" "S7_object" + `expected`: "ggplot_built" + + [ FAIL 1 | WARN 32 | SKIP 0 | PASS 39 ] + Error: Test failures + Execution halted + ``` + +# FPDclustering + +
+ +* Version: 2.3.5 +* GitHub: NA +* Source code: https://github.com/cran/FPDclustering +* Date/Publication: 2025-03-06 03:40:04 UTC +* Number of recursive dependencies: 98 + +Run `revdepcheck::cloud_details(, "FPDclustering")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘FPDclustering-Ex.R’ failed + The error most likely occurred in: + + > ### Name: GPDC + > ### Title: Gaussian PD-Clustering + > ### Aliases: GPDC + > + > ### ** Examples + > + > #Load the data + ... + > + > #Results + > table(res$label,ais$sex) + + f m + 1 95 1 + 2 5 101 + > plot(res) + Error: C stack usage 9961924 is too close to the limit + Execution halted + ``` + +# fqar + +
+ +* Version: 0.5.4 +* GitHub: https://github.com/equitable-equations/fqar +* Source code: https://github.com/cran/fqar +* Date/Publication: 2024-10-06 18:00:02 UTC +* Number of recursive dependencies: 73 + +Run `revdepcheck::cloud_details(, "fqar")` 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 + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-species_profile_plot.R:21:3'): species_profile_plot works ──── + class(p) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 365 ] + Error: Test failures + 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: 76 + +Run `revdepcheck::cloud_details(, "frailtyEM")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘frailtyEM-Ex.R’ failed + The error most likely occurred in: + + > ### Name: summary.emfrail + > ### Title: Summary for 'emfrail' objects + > ### Aliases: summary.emfrail + > + > ### ** Examples + > + > data("bladder") + ... + 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 re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + --- re-building ‘frailtyEM_manual.Rnw’ using Sweave + Loading required package: survival + Loading required package: gridExtra + 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 frailtyEM + package. + ... + 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 + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) emfrail_control.Rd:49: Lost braces in \itemize; meant \describe ? + checkRd: (-1) emfrail_control.Rd:50: Lost braces in \itemize; meant \describe ? + checkRd: (-1) emfrail_control.Rd:51: Lost braces in \itemize; meant \describe ? + checkRd: (-1) emfrail_control.Rd:52: Lost braces in \itemize; meant \describe ? + checkRd: (-1) emfrail_control.Rd:53-54: Lost braces in \itemize; meant \describe ? + checkRd: (-1) emfrail_control.Rd:55-57: Lost braces in \itemize; meant \describe ? + ``` + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# freqparcoord + +
+ +* Version: 1.0.1 +* GitHub: NA +* Source code: https://github.com/cran/freqparcoord +* Date/Publication: 2016-01-17 10:59:33 +* Number of recursive dependencies: 46 + +Run `revdepcheck::cloud_details(, "freqparcoord")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘freqparcoord-Ex.R’ failed + The error most likely occurred in: + + > ### Name: freqparcoord + > ### Title: Frequency-based parallel coordinates. + > ### Aliases: freqparcoord + > + > ### ** Examples + > + > # baseball player data courtesy of UCLA Stat. Dept., www.socr.ucla.edu + > data(mlb) + > + > # plot baseball data, broken down by position category (infield, + > # outfield, etc.); plot the 5 higest-density values in each group + > freqparcoord(mlb,5,4:6,7,method="maxdens") + Error: C stack usage 9963444 is too close to the limit + Execution halted + ``` + +# funcharts + +
+ +* Version: 1.7.0 +* GitHub: https://github.com/unina-sfere/funcharts +* Source code: https://github.com/cran/funcharts +* Date/Publication: 2025-03-17 17:30:02 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: control_charts_pca_mfd_real_time + > ### Title: Real-time T2 and SPE control charts for multivariate functional + > ### data + > ### Aliases: control_charts_pca_mfd_real_time + > + > ### ** Examples + > + ... + > + > cclist <- control_charts_pca_mfd_real_time( + + pca_list = pca_list, + + components_list = 1:3, + + mfdobj_x_test = mfdobj_x2_list) + > plot_control_charts_real_time(cclist, 1) + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(funcharts) + Loading required package: robustbase + > + > test_check("funcharts") + [1] "The Fisher omnibus combining function is considered." + [1] "The Fisher omnibus combining function is considered." + ... + - e1: + - e2: + Backtrace: + ▆ + 1. └─funcharts::plot_control_charts_real_time(cclist, 1) at test_phaseII.R:104:3 + 2. └─S7:::Ops.S7_object(...) + + [ FAIL 3 | WARN 0 | SKIP 1 | PASS 111 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.7Mb + sub-directories of 1Mb or more: + R 1.5Mb + libs 3.4Mb + ``` + +# FunnelPlotR + +
+ +* 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: 82 + +Run `revdepcheck::cloud_details(, "FunnelPlotR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘FunnelPlotR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: funnel_plot + > ### Title: Funnel plots for comparing institutional performance + > ### Aliases: funnel_plot + > + > ### ** Examples + > + > # We will use the 'medpar' dataset from the 'COUNT' package. + ... + > + > # Get predicted values for building ratio + > medpar$prds<- predict(mod, type="response") + > + > # Draw plot, returning just the plot object + > fp<-funnel_plot(medpar, denominator=prds, numerator=los, + + group = provnum, limit=95, title="An example funnel plot") + Error in validate_funnel_plot(rtn) : Invalid ggplot object + Calls: funnel_plot -> validate_funnel_plot + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(FunnelPlotR) + > + > test_check("FunnelPlotR") + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 34 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ── Error ('test-funnel_plot.R:7:3'): `funnel_plot()` works with input and returns expected list ── + Error in `validate_funnel_plot(rtn)`: Invalid ggplot object + Backtrace: + ▆ + 1. └─FunnelPlotR::funnel_plot(dt, num, denom, group) at test-funnel_plot.R:7:3 + 2. └─FunnelPlotR:::validate_funnel_plot(rtn) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 34 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘changing_funnel_plot_options.Rmd’ using rmarkdown + + Quitting from changing_funnel_plot_options.Rmd:32-49 [dtsetup] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `validate_funnel_plot()`: + ! Invalid ggplot object + --- + Backtrace: + ... + ▆ + 1. └─FunnelPlotR::funnel_plot(...) + 2. └─FunnelPlotR:::validate_funnel_plot(rtn) + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'changing_funnel_plot_options.Rmd' failed with diagnostics: + Invalid ggplot object + --- failed re-building ‘changing_funnel_plot_options.Rmd’ + + --- re-building ‘funnel_plots.Rmd’ using rmarkdown + ``` + +# 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: 68 + +Run `revdepcheck::cloud_details(, "gapfill")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘run-all.R’ + Running the tests in ‘tests/run-all.R’ failed. + Complete output: + > library(testthat) + > test_check('gapfill') + Loading required package: gapfill + Loading required package: ggplot2 + --> See ?Gapfill and https://doi.org/10.1109/TGRS.2017.2785240 <-- + [ FAIL 5 | WARN 6 | SKIP 0 | PASS 870 ] + + ... + ── Failure ('test-Image.R:10:4'): Image ──────────────────────────────────────── + class(Image(unname(ndvi))) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + ── Failure ('test-Image.R:11:4'): Image ──────────────────────────────────────── + class(Image(ndvi, zlim = c(1, 2))) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 5 | WARN 6 | SKIP 0 | PASS 870 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Packages which this enhances but not available for checking: + 'raster', 'doParallel', 'doMPI' + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) Gapfill.Rd:66-68: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) Gapfill.Rd:69-70: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) Gapfill.Rd:71-77: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) Gapfill.Rd:72: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) Gapfill.Rd:73: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) Gapfill.Rd:74: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) Gapfill.Rd:75: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) Gapfill.Rd:78: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) ndvi.Rd:10: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ndvi.Rd:11: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ndvi.Rd:12: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ndvi.Rd:13: Lost braces in \itemize; meant \describe ? + ``` + +# gapminder + +
+ +* 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: 63 + +Run `revdepcheck::cloud_details(, "gapminder")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘gapminder-Ex.R’ failed + The error most likely occurred in: + + > ### Name: country_colors + > ### Title: Gapminder color schemes. + > ### Aliases: country_colors continent_colors + > ### Keywords: datasets + > + > ### ** Examples + > + ... + 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 + ``` + +# 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: 197 + +Run `revdepcheck::cloud_details(, "genekitr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘genekitr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plotVenn + > ### Title: Venn plot for groups of genes + > ### Aliases: plotVenn + > + > ### ** Examples + > + > k1 = requireNamespace("ComplexUpset",quietly = TRUE) + ... + 32. │ └─ggplot2 (local) `method(merge_element, list(ggplot2::element, class_any))`(...) + 33. │ └─S7::props(old, idx) + 34. │ └─S7::check_is_S7(object) + 35. │ └─base::stop(msg, call. = FALSE) + 36. └─base::.handleSimpleError(...) + 37. └─rlang (local) h(simpleError(msg, call)) + 38. └─handlers[[1L]](cnd) + 39. └─cli::cli_abort(...) + 40. └─rlang::abort(...) + Execution halted + ``` + +# geneSLOPE + +
+ +* Version: 0.38.2 +* GitHub: https://github.com/psobczyk/geneSLOPE +* Source code: https://github.com/cran/geneSLOPE +* Date/Publication: 2023-08-16 09:12:37 UTC +* Number of recursive dependencies: 77 + +Run `revdepcheck::cloud_details(, "geneSLOPE")` for more info + +
+ +## Newly broken + +* checking whether package ‘geneSLOPE’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: The `size` argument of `element_line()` is deprecated as of ggplot2 3.4.0. + See ‘/tmp/workdir/geneSLOPE/new/geneSLOPE.Rcheck/00install.out’ for details. + ``` + +# geofacet + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/hafen/geofacet +* Source code: https://github.com/cran/geofacet +* Date/Publication: 2023-11-30 08:00:11 UTC +* Number of recursive dependencies: 94 + +Run `revdepcheck::cloud_details(, "geofacet")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.facet_geo_spec: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 646 marked UTF-8 strings + ``` + +# geoheatmap + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/geoheatmap +* Date/Publication: 2024-09-05 15:40:02 UTC +* Number of recursive dependencies: 103 + +Run `revdepcheck::cloud_details(, "geoheatmap")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘geoheatmap.Rmd’ using rmarkdown + ``` + +# geomtextpath + +
+ +* Version: 0.1.5 +* GitHub: https://github.com/AllanCameron/geomtextpath +* Source code: https://github.com/cran/geomtextpath +* Date/Publication: 2025-01-14 17:40:02 UTC +* Number of recursive dependencies: 92 + +Run `revdepcheck::cloud_details(, "geomtextpath")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘geomtextpath-Ex.R’ failed + The error most likely occurred in: + + > ### Name: geom_textsf + > ### Title: Visualise sf objects with labels + > ### Aliases: geom_textsf geom_labelsf + > + > ### ** Examples + > + > ggplot(waterways) + + ... + 22. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 23. │ └─self$draw_panel(...) + 24. │ └─geomtextpath (local) draw_panel(...) + 25. │ └─geomtextpath:::sf_textgrob(...) + 26. └─base::.handleSimpleError(...) + 27. └─rlang (local) h(simpleError(msg, call)) + 28. └─handlers[[1L]](cnd) + 29. └─cli::cli_abort(...) + 30. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(geomtextpath) + Loading required package: ggplot2 + > + > test_check("geomtextpath") + [ FAIL 2 | WARN 0 | SKIP 4 | PASS 462 ] + + ... + `expected` is an expression vector + ── Error ('test-sf.R:91:3'): We can make grobs from sf features ──────────────── + Error in `(x$boxlinewidth %||% defaults$linewidth[type_ind]) * 3.779528`: non-numeric argument to binary operator + Backtrace: + ▆ + 1. └─geomtextpath:::sf_textgrob(river, as_textbox = TRUE) at test-sf.R:91:3 + + [ FAIL 2 | WARN 0 | SKIP 4 | PASS 462 ] + Error: Test failures + Execution halted + ``` + +# gfoRmulaICE + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/gfoRmulaICE +* Date/Publication: 2024-12-02 12:50:08 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "gfoRmulaICE")` 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 + ... + `expected[2:2]`: "ggplot" + ── Failure ('test_plot.R:534:5'): plot complicated scenario 3 - intervention-specific time options ── + class(plots) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 15 | WARN 176 | SKIP 0 | PASS 47 ] + Error: Test failures + Execution halted + ``` + +# gg.gap + +
+ +* Version: 1.3 +* GitHub: https://github.com/ChrisLou-bioinfo/gg.gap +* Source code: https://github.com/cran/gg.gap +* Date/Publication: 2019-09-30 16:10:02 UTC +* Number of recursive dependencies: 27 + +Run `revdepcheck::cloud_details(, "gg.gap")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘gg.gap-Ex.R’ failed + The error most likely occurred in: + + > ### Name: add.legend + > ### Title: Add Legend to gg.gap() + > ### Aliases: add.legend + > + > ### ** Examples + > + > library(ggplot2) + ... + 12. └─ggplot2::build_ggplot(plot) + 13. ├─S7::S7_dispatch() + 14. └─ggplot2 (local) `method(build_ggplot, ggplot2::ggplot)`(...) + 15. └─ggplot2:::plot_theme(plot) + 16. └─ggplot2:::check_theme(theme) + 17. └─base::mapply(...) + 18. └─ggplot2 (local) ``(...) + 19. └─cli::cli_abort(...) + 20. └─rlang::abort(...) + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# gg1d + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/selkamand/gg1d +* Source code: https://github.com/cran/gg1d +* Date/Publication: 2024-12-09 19:40:02 UTC +* Number of recursive dependencies: 88 + +Run `revdepcheck::cloud_details(, "gg1d")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘gg1d-Ex.R’ failed + The error most likely occurred in: + + > ### Name: gg1d + > ### Title: AutoPlot an entire data.frame + > ### Aliases: gg1d + > + > ### ** Examples + > + > path_gg1d <- system.file("example.csv", package = "gg1d") + ... + 31. │ └─base::lapply(...) + 32. │ └─ggplot2 (local) FUN(X[[i]], ...) + 33. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 34. │ └─self$draw_panel(...) + 35. └─base::.handleSimpleError(...) + 36. └─rlang (local) h(simpleError(msg, call)) + 37. └─handlers[[1L]](cnd) + 38. └─cli::cli_abort(...) + 39. └─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/tests.html + > # * https://testthat.r-lib.org/reference/test_package.html#special-files + ... + Expected `gg1d(...)` to run without any errors. + i Actually got a with text: + Problem while converting geom to grob. + i Error occurred in the 1st layer. + Caused by error in `draw_panel()`: + ! unused arguments (lineend = "butt", linejoin = "mitre") + + [ FAIL 9 | WARN 1 | SKIP 2 | PASS 47 ] + Error: Test failures + Execution halted + ``` + +# ggalign + +
+ +* Version: 1.0.2 +* GitHub: https://github.com/Yunuuuu/ggalign +* Source code: https://github.com/cran/ggalign +* Date/Publication: 2025-05-14 14:00:08 UTC +* Number of recursive dependencies: 57 + +Run `revdepcheck::cloud_details(, "ggalign")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggalign-Ex.R’ failed + The error most likely occurred in: + + > ### Name: align_dendro + > ### Title: Plot dendrogram tree + > ### Aliases: align_dendro + > + > ### ** Examples + > + > # align_dendro will always add a plot area + ... + 37. │ ├─S7::S7_dispatch() + 38. │ └─ggplot2 (local) `method(+, list(ggplot2::ggplot, class_any))`(...) + 39. │ └─ggplot2:::add_ggplot(e1, e2, e2name) + 40. │ ├─ggplot2::ggplot_add(object, p, objectname) + 41. │ └─ggalign:::ggplot_add.ggalign_design(object, p, objectname) + 42. └─base::.handleSimpleError(...) + 43. └─rlang (local) h(simpleError(msg, call)) + 44. └─handlers[[1L]](cnd) + 45. └─rlang::cnd_signal(e) + 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 + ... + • plot-align/reorder-left-reverse.svg + • plot-align/reorder-left.svg + • plot-align/reorder-right.svg + • plot-align/reorder-top-reverse.svg + • plot-align/reorder-top-within-group.svg + • plot-align/reorder-top.svg + • plot-align/stack-no-data-dendrogram-input.svg + • plot-align/stack-no-data-hclust-input.svg + Error: Test failures + Execution halted + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.ggalign_default_expansion: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.FacetSector: + function(object, plot, object_name) + + ... + function(plot, ...) + ggplot_build.ggalign_facet_sector_plot: + function(plot) + + ggplot_build: + function(plot, ...) + ggplot_build.ggalign_heatmap: + function(plot) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +* checking Rd cross-references ... WARNING + ``` + Packages unavailable to check Rd xrefs: ‘ape’, ‘patchwork’, ‘maftools’, ‘ComplexHeatmap’, ‘pheatmap’ + Missing link or links in Rd file 'scheme_theme.Rd': + ‘[ggplot2:+.gg]{+.gg()}’ + + See section 'Cross-references' in the 'Writing R Extensions' manual. + ``` + +* checking for code/documentation mismatches ... WARNING + ``` + Codoc mismatches from Rd file 'scheme_theme.Rd': + scheme_theme + Code: function(..., line, rect, text, title, point, polygon, 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, + ... + strip.text.y.right, strip.switch.pad.grid, + strip.switch.pad.wrap, complete = FALSE, validate = + TRUE) + Argument names in code not in docs: + point polygon geom spacing margins legend.key.justification + panel.widths panel.heights + Mismatches in argument names (first 3): + Position: 6 Code: point Docs: aspect.ratio + Position: 7 Code: polygon Docs: axis.title + Position: 8 Code: geom Docs: axis.title.x + ``` + +## Newly fixed + +* checking Rd cross-references ... NOTE + ``` + Packages unavailable to check Rd xrefs: ‘ape’, ‘patchwork’, ‘maftools’, ‘ComplexHeatmap’, ‘pheatmap’ + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Packages which this enhances but not available for checking: + 'patchwork', 'ggrastr', 'maftools' + ``` + +# GGally + +
+ +* Version: 2.2.1 +* 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: 144 + +Run `revdepcheck::cloud_details(, "GGally")` for more info + +
+ +## Newly broken + +* checking whether package ‘GGally’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/GGally/new/GGally.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘GGally’ ... +** package ‘GGally’ 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 eval(exprs[i], envir) : object 'is.rel' not found +Error: unable to load R code in package ‘GGally’ +Execution halted +ERROR: lazy loading failed for package ‘GGally’ +* removing ‘/tmp/workdir/GGally/new/GGally.Rcheck/GGally’ + + +``` +### CRAN + +``` +* installing *source* package ‘GGally’ ... +** package ‘GGally’ 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 +** 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 (GGally) + + +``` +# gganimate + +
+ +* Version: 1.0.9 +* 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: 94 + +Run `revdepcheck::cloud_details(, "gganimate")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(gganimate) + Loading required package: ggplot2 + > + > test_check("gganimate") + [ FAIL 2 | WARN 4 | SKIP 1 | PASS 4 ] + + ... + 22. └─self$extract_key(...) + 23. └─ggplot2 (local) extract_key(...) + 24. └─Guide$extract_key(scale, aesthetic, ...) + 25. └─ggplot2 (local) extract_key(...) + 26. └─scale$map(breaks) + 27. └─ggplot2 (local) map(..., self = self) + + [ FAIL 2 | WARN 4 | SKIP 1 | PASS 4 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘gganimate.Rmd’ using rmarkdown + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_build: + function(plot, ...) + ggplot_build.gganim: + function(plot) + + ggplot_add: + function(object, plot, ...) + ggplot_add.ExitFactory: + function(object, plot, object_name) + + ... + function(object, plot, ...) + ggplot_add.View: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.EaseAes: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# ggblend + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/mjskay/ggblend +* Source code: https://github.com/cran/ggblend +* Date/Publication: 2023-05-22 08:30:05 UTC +* Number of recursive dependencies: 60 + +Run `revdepcheck::cloud_details(, "ggblend")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggblend) + > + > test_check("ggblend") + [ FAIL 3 | WARN 2 | SKIP 7 | PASS 99 ] + + ══ Skipped tests (7) ═══════════════════════════════════════════════════════════ + ... + `actual$mapping` is an S3 object of class , a list + `expected$mapping` is an S7 object of class + Backtrace: + ▆ + 1. └─ggblend:::expect_equal_layer(...) at test-operation-adjust.R:19:3 + 2. └─testthat::expect_equal(...) at tests/testthat/helper-layer.R:26:3 + + [ FAIL 3 | WARN 2 | SKIP 7 | PASS 99 ] + Error: Test failures + Execution halted + ``` + +# ggborderline + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/wurli/ggborderline +* Source code: https://github.com/cran/ggborderline +* Date/Publication: 2022-10-25 13:45:14 UTC +* Number of recursive dependencies: 43 + +Run `revdepcheck::cloud_details(, "ggborderline")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggborderline-Ex.R’ failed + The error most likely occurred in: + + > ### Name: geom_borderpath + > ### Title: Connect observations + > ### Aliases: geom_borderpath geom_borderline geom_borderstep + > + > ### ** Examples + > + > require(ggplot2) + ... + 5. └─ggplot2::build_ggplot(plot) + 6. ├─S7::S7_dispatch() + 7. └─ggplot2 (local) `method(build_ggplot, ggplot2::ggplot)`(...) + 8. └─npscales$set_palettes(plot@theme) + 9. └─ggplot2 (local) set_palettes(..., self = self) + 10. ├─scales::as_discrete_pal(elem) + 11. └─scales:::as_discrete_pal.default(elem) + 12. └─cli::cli_abort("Cannot convert {.arg x} to a discrete palette.") + 13. └─rlang::abort(...) + Execution halted + ``` + +# ggbrain + +
+ +* Version: 0.9.0 +* GitHub: https://github.com/michaelhallquist/ggbrain +* Source code: https://github.com/cran/ggbrain +* Date/Publication: 2025-03-20 01:30:02 UTC +* Number of recursive dependencies: 72 + +Run `revdepcheck::cloud_details(, "ggbrain")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + 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 + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.ggbrain_panel: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.ggbrain_label: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.ggbrain_layer: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 10.1Mb + sub-directories of 1Mb or more: + doc 1.6Mb + extdata 2.2Mb + libs 5.5Mb + ``` + +# ggbreak + +
+ +* Version: 0.1.4 +* GitHub: https://github.com/YuLab-SMU/ggbreak +* Source code: https://github.com/cran/ggbreak +* Date/Publication: 2025-02-04 17:50:10 UTC +* Number of recursive dependencies: 62 + +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: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ggbreak.Rmd’ using rmarkdown + + Quitting from ggbreak.Rmd:61-78 [unnamed-chunk-2] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `UseMethod()`: + ! no applicable method for 'as.grob' applied to an object of class "c('LayerInstance', 'Layer', 'ggproto', 'gg')" + --- + Backtrace: + ... + + Error: processing vignette 'ggbreak.Rmd' failed with diagnostics: + no applicable method for 'as.grob' applied to an object of class "c('LayerInstance', 'Layer', 'ggproto', 'gg')" + --- failed re-building ‘ggbreak.Rmd’ + + SUMMARY: processing the following file failed: + ‘ggbreak.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.wrap_params: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.ggcut_params: + function(object, plot, object_name) + + ... + function(object, plot, ...) + ggplot_add.ggbreak: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.gg: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# ggbump + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/ggbump +* Date/Publication: 2020-04-24 16:00:02 UTC +* Number of recursive dependencies: 51 + +Run `revdepcheck::cloud_details(, "ggbump")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggbump) + > + > test_check("ggbump") + [ FAIL 3 | WARN 1 | SKIP 0 | PASS 1 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ── Failure ('test-numeric_inputs.R:21:3'): multiplication works ──────────────── + ... %>% class() not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + ── Failure ('test-numeric_inputs.R:26:3'): multiplication works ──────────────── + ... %>% class() not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 3 | WARN 1 | SKIP 0 | PASS 1 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# ggdark + +
+ +* Version: 0.2.1 +* GitHub: NA +* Source code: https://github.com/cran/ggdark +* Date/Publication: 2019-01-11 17:30:06 UTC +* Number of recursive dependencies: 43 + +Run `revdepcheck::cloud_details(, "ggdark")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggdark-Ex.R’ failed + The error most likely occurred in: + + > ### Name: dark_mode + > ### Title: Activate dark mode on a 'ggplot2' theme + > ### Aliases: dark_mode + > + > ### ** Examples + > + > library(ggplot2) + ... + > + > p1 <- ggplot(iris, aes(Sepal.Width, Sepal.Length, color = Species)) + + + geom_point() + > + > p1 # theme returned by theme_get() + > p1 + dark_mode() # activate dark mode on theme returned by theme_get() + Error in match(x, table, nomatch = 0L) : + 'match' requires vector arguments + Calls: dark_mode -> %in% + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggdark) + > + > test_check("ggdark") + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 0 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ── Error ('test_dark_mode.R:10:1'): (code run outside of `test_that()`) ──────── + Error in `match(x, table, nomatch = 0L)`: 'match' requires vector arguments + Backtrace: + ▆ + 1. └─ggdark::dark_mode(light_theme) at test_dark_mode.R:10:1 + 2. └─geoms[["GeomPoint"]]$default_aes$colour %in% ... + + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + '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: 52 + +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. + ``` + +# ggDoE + +
+ +* Version: 0.8 +* GitHub: https://github.com/toledo60/ggDoE +* Source code: https://github.com/cran/ggDoE +* Date/Publication: 2024-02-10 04:50:02 UTC +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "ggDoE")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggDoE-Ex.R’ failed + The error most likely occurred in: + + > ### Name: gg_lm + > ### Title: Regression Diagnostic Plots with ggplot2 + > ### Aliases: gg_lm + > + > ### ** Examples + > + > model <- lm(mpg ~ wt + am + gear, data = mtcars) + > gg_lm(model) + Warning: `fortify()` was deprecated in ggplot2 3.6.0. + ℹ Please use `broom::augment()` instead. + ℹ The deprecated feature was likely used in the ggplot2 package. + Please report the issue at . + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +# ggDoubleHeat + +
+ +* Version: 0.1.2 +* GitHub: https://github.com/PursuitOfDataScience/ggDoubleHeat +* Source code: https://github.com/cran/ggDoubleHeat +* Date/Publication: 2023-08-24 21:00:04 UTC +* Number of recursive dependencies: 56 + +Run `revdepcheck::cloud_details(, "ggDoubleHeat")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggDoubleHeat-Ex.R’ failed + The error most likely occurred in: + + > ### Name: geom_heat_circle + > ### Title: Heatcircle + > ### Aliases: geom_heat_circle + > + > ### ** Examples + > + > + ... + + y = rep(c("d", "e", "f"), 3), + + outside_values = rep(c(1,5,7),3), + + inside_values = rep(c(2,3,4),3)) + > + > ggplot(data, aes(x,y)) + + + geom_heat_circle(outside = outside_values, + + inside = inside_values) + Error in scale_title(title) : object 'outside_values' not found + Calls: ... extract_params -> -> make_title -> scale_title + Execution halted + ``` + +# ggeasy + +
+ +* Version: 0.1.5 +* GitHub: https://github.com/jonocarroll/ggeasy +* Source code: https://github.com/cran/ggeasy +* Date/Publication: 2024-11-03 05:50:02 UTC +* Number of recursive dependencies: 91 + +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_add_legend_title + > ### Title: Easily add legend title(s) + > ### Aliases: easy_add_legend_title + > + > ### ** Examples + > + > + ... + > # Add legend title to a specific aesthetic + > ggplot(mtcars, aes(wt, mpg, colour = cyl, size = hp)) + + + geom_point() + easy_add_legend_title(col = "Number of Cylinders") + > + > # Add legend title to all aesthetics + > ggplot(mtcars, aes(wt, mpg, colour = cyl)) + + + geom_point() + easy_add_legend_title("Number of Cylinders") + Error: object is invalid: + - labels cannot contain duplicate names (colour, linetype, shape, and size). + 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 151 ] + + ══ Skipped tests (1) ═══════════════════════════════════════════════════════════ + ... + 8. └─S7::validate(object, recursive = !parent_validated) + + [ FAIL 6 | WARN 0 | SKIP 1 | PASS 151 ] + Deleting unused snapshots: + • labs/labels-attrib.svg + • labs/labels-manual.svg + • labs/labels-mytitle.svg + • labs/labels-y-col.svg + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘shortcuts.Rmd’ using rmarkdown + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.easy_labs: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# ggEDA + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/CCICB/ggEDA +* Source code: https://github.com/cran/ggEDA +* Date/Publication: 2025-05-07 12:00:02 UTC +* Number of recursive dependencies: 93 + +Run `revdepcheck::cloud_details(, "ggEDA")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggEDA-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggstack + > ### Title: AutoPlot an entire data.frame + > ### Aliases: ggstack + > + > ### ** Examples + > + > + ... + 31. │ └─base::lapply(...) + 32. │ └─ggplot2 (local) FUN(X[[i]], ...) + 33. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 34. │ └─self$draw_panel(...) + 35. └─base::.handleSimpleError(...) + 36. └─rlang (local) h(simpleError(msg, call)) + 37. └─handlers[[1L]](cnd) + 38. └─cli::cli_abort(...) + 39. └─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/tests.html + > # * https://testthat.r-lib.org/reference/test_package.html#special-files + ... + Expected `ggstack(...)` to run without any errors. + i Actually got a with text: + Problem while converting geom to grob. + i Error occurred in the 1st layer. + Caused by error in `draw_panel()`: + ! unused arguments (lineend = "butt", linejoin = "mitre") + + [ FAIL 11 | WARN 12 | SKIP 2 | PASS 114 ] + Error: Test failures + Execution halted + ``` + +# ggedit + +
+ +* Version: 0.4.1 +* 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: 92 + +Run `revdepcheck::cloud_details(, "ggedit")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggedit-Ex.R’ failed + The error most likely occurred in: + + > ### Name: compare + > ### Title: compare + > ### Aliases: compare + > + > ### ** Examples + > + > compare(ggplot2::theme_bw(),ggplot2::theme_get()) + Error in as.vector(x, "list") : + cannot coerce type 'object' to vector of type 'list' + Calls: compare ... themeFetchFull -> lapply -> as.list -> as.list.default + Execution halted + ``` + +# ggfields + +
+ +* Version: 0.0.6 +* GitHub: https://github.com/pepijn-devries/ggfields +* Source code: https://github.com/cran/ggfields +* Date/Publication: 2024-02-26 14:40:03 UTC +* Number of recursive dependencies: 101 + +Run `revdepcheck::cloud_details(, "ggfields")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggfields-Ex.R’ failed + The error most likely occurred in: + + > ### Name: angle_correction + > ### Title: Calculate correction for angle in the plot coordinate system + > ### Aliases: angle_correction + > + > ### ** Examples + > + > ## Create a data.frame with some xy-coordinates and all angles pointing North (0 degrees) + ... + + default_crs = 4326 + + ) + + ) + > + > ## When plotting as lon-lat, the angle correction will be zero + > angle_correction(d, params_mockup, ggplot2::coord_sf(default_crs = 4326)) + Error in panel_params$guides$get_guide(aesthetics) : + attempt to apply non-function + Calls: angle_correction ... train_panel_guides -> -> train_panel_guides + Execution halted + ``` + +# ggFishPlots + +
+ +* Version: 0.3.0 +* GitHub: https://github.com/DeepWaterIMR/ggFishPlots +* Source code: https://github.com/cran/ggFishPlots +* Date/Publication: 2024-06-26 10:20:02 UTC +* Number of recursive dependencies: 73 + +Run `revdepcheck::cloud_details(, "ggFishPlots")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggFishPlots-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_catchcurve + > ### Title: Plot catch curve + > ### Aliases: plot_catchcurve + > + > ### ** Examples + > + > # Catch curve including all ages + ... + 5. └─ggplot2::build_ggplot(plot) + 6. ├─S7::S7_dispatch() + 7. └─ggplot2 (local) `method(build_ggplot, ggplot2::ggplot)`(...) + 8. └─ggplot2:::plot_theme(plot) + 9. └─ggplot2:::check_theme(theme) + 10. └─base::mapply(...) + 11. └─ggplot2 (local) ``(...) + 12. └─cli::cli_abort(...) + 13. └─rlang::abort(...) + Execution halted + ``` + +# ggfixest + +
+ +* Version: 0.3.0 +* GitHub: https://github.com/grantmcdermott/ggfixest +* Source code: https://github.com/cran/ggfixest +* Date/Publication: 2025-05-14 02:20:02 UTC +* Number of recursive dependencies: 78 + +Run `revdepcheck::cloud_details(, "ggfixest")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > ## Throttle CPU threads if R CMD check (for CRAN) + > + > if (any(grepl("_R_CHECK", names(Sys.getenv()), fixed = TRUE))) { + + # fixest + + if (requireNamespace("fixest", quietly = TRUE)) { + + library(fixest) + + setFixest_nthreads(1) + ... + 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 + ----- FAILED[]: test_ggiplot.R<193--193> + 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: 5 out of 111 tests failed + In addition: There were 11 warnings (use warnings() to see them) + Execution halted + ``` + +# 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: 53 + +Run `revdepcheck::cloud_details(, "ggfocus")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggfocus-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggfocus + > ### Title: (Deprecated) Sets focus scales to an existing 'ggplot' object + > ### Aliases: ggfocus + > + > ### ** Examples + > + > library(ggplot2) + ... + > p <- ggplot(iris,aes(x=Sepal.Length,y=Petal.Length)) + geom_point() + > ggfocus(p, Species, "versicolor") + The function 'ggfocus()' is deprecated, consider using the family scale_*_focus() instead. + Warning: `select_()` was deprecated in dplyr 0.7.0. + ℹ Please use `select()` instead. + ℹ The deprecated feature was likely used in the ggfocus package. + Please report the issue at . + Error in scale_title(title) : object 'Species' not found + Calls: ... extract_params -> -> make_title -> scale_title + Execution halted + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.ggfocus_fill: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.ggfocus_shape: + function(object, plot, object_name) + + ... + function(object, plot, ...) + ggplot_add.ggfocus_size: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.ggfocus_linetype: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# ggforce + +
+ +* Version: 0.4.2 +* GitHub: https://github.com/thomasp85/ggforce +* Source code: https://github.com/cran/ggforce +* Date/Publication: 2024-02-19 11:00:02 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "ggforce")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggforce-Ex.R’ failed + The error most likely occurred in: + + > ### Name: facet_matrix + > ### Title: Facet by different data columns + > ### Aliases: facet_matrix + > + > ### ** Examples + > + > # Standard use: + > ggplot(mpg) + + + geom_point(aes(x = .panel_x, y = .panel_y)) + + + facet_matrix(vars(displ, cty, hwy)) + Error in get(x, envir = ns, inherits = FALSE) : + object 'check_labeller' not found + Calls: facet_matrix -> -> get + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 27.3Mb + sub-directories of 1Mb or more: + R 1.0Mb + help 1.2Mb + libs 25.0Mb + ``` + +# ggformula + +
+ +* Version: 0.12.0 +* 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: 120 + +Run `revdepcheck::cloud_details(, "ggformula")` for more info + +
+ +## Newly broken + +* checking for code/documentation mismatches ... WARNING + ``` + Codoc mismatches from Rd file 'gf_lines.Rd': + gf_hline + Code: function(object = NULL, gformula = NULL, data = NULL, ..., + yintercept, color, linetype, linewidth, alpha, xlab, + ylab, title, subtitle, caption, position = "identity", + show.legend = NA, show.help = NULL, inherit = FALSE, + environment = parent.frame()) + Docs: function(object = NULL, gformula = NULL, data = NULL, ..., + yintercept, color, linetype, linewidth, alpha, xlab, + ylab, title, subtitle, caption, show.legend = NA, + ... + xintercept, color, linetype, linewidth, alpha, xlab, + ylab, title, subtitle, caption, show.legend = NA, + show.help = NULL, inherit = FALSE, environment = + parent.frame()) + Argument names in code not in docs: + position + Mismatches in argument names (first 3): + Position: 15 Code: position Docs: show.legend + Position: 16 Code: show.legend Docs: show.help + Position: 17 Code: show.help Docs: inherit + ``` + +## In both + +* checking Rd cross-references ... NOTE + ``` + Packages unavailable to check Rd xrefs: ‘akima’, ‘ggforce’ + ``` + +# ggfortify + +
+ +* Version: 0.4.17 +* 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: 122 + +Run `revdepcheck::cloud_details(, "ggfortify")` 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) + > + > suppressWarnings(RNGversion("3.5.0")) + > set.seed(1, sample.kind = "Rejection") + > + > test_check('ggfortify') + Loading required package: ggfortify + ... + + 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 + ``` + +# ggfun + +
+ +* Version: 0.1.8 +* GitHub: https://github.com/YuLab-SMU/ggfun +* Source code: https://github.com/cran/ggfun +* Date/Publication: 2024-12-03 10:20:02 UTC +* Number of recursive dependencies: 60 + +Run `revdepcheck::cloud_details(, "ggfun")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.facet_set: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.scatter_rect: + function(object, plot, object_name) + + ... + function(object, plot, ...) + ggplot_add.segmentC: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.volpoint: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# ggfx + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/thomasp85/ggfx +* Source code: https://github.com/cran/ggfx +* Date/Publication: 2022-08-22 08:00:06 UTC +* Number of recursive dependencies: 63 + +Run `revdepcheck::cloud_details(, "ggfx")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_gtable: + function(plot) + ggplot_gtable.filtered_gtable: + function(data) + + ggplot_build: + function(plot, ...) + ggplot_build.filtered_ggplot: + function(plot) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) render_context.Rd:42: Lost braces; missing escapes or markup? + 42 | \item{xmin, ymin, xmax, ymax}{Boundaries of the area in pixels. {0,0} is the + | ^ + ``` + +# gggap + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/cmoralesmx/gggap +* Source code: https://github.com/cran/gggap +* Date/Publication: 2020-11-20 09:20:02 UTC +* Number of recursive dependencies: 27 + +Run `revdepcheck::cloud_details(, "gggap")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘gggap-Ex.R’ failed + The error most likely occurred in: + + > ### Name: gggap_legend + > ### Title: Add Legend to gggap() + > ### Aliases: gggap_legend + > + > ### ** Examples + > + > library(ggplot2) + ... + 12. └─ggplot2::build_ggplot(plot) + 13. ├─S7::S7_dispatch() + 14. └─ggplot2 (local) `method(build_ggplot, ggplot2::ggplot)`(...) + 15. └─ggplot2:::plot_theme(plot) + 16. └─ggplot2:::check_theme(theme) + 17. └─base::mapply(...) + 18. └─ggplot2 (local) ``(...) + 19. └─cli::cli_abort(...) + 20. └─rlang::abort(...) + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# gggenomes + +
+ +* 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: 110 + +Run `revdepcheck::cloud_details(, "gggenomes")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘gggenomes-Ex.R’ failed + The error most likely occurred in: + + > ### Name: add_feats + > ### Title: Add different types of tracks + > ### Aliases: add_feats add_links add_subfeats add_sublinks add_clusters + > ### add_tracks + > + > ### ** Examples + > + ... + + add_feats(repeats = emale_tirs) + + + geom_seq() + geom_feat() + Warning: The `size` argument of `element_line()` is deprecated as of ggplot2 3.4.0. + ℹ Please use the `linewidth` argument instead. + ℹ The deprecated feature was likely used in the gggenomes package. + Please report the issue at . + Error in UseMethod("add_feats") : + no applicable method for 'add_feats' applied to an object of class "NULL" + Calls: %>% -> add_feats + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + 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 flip.Rmd:16-44 [unnamed-chunk-2] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `UseMethod()`: + ... + + Error: processing vignette 'gggenomes.Rmd' failed with diagnostics: + no applicable method for 'track_info' applied to an object of class "NULL" + --- failed re-building ‘gggenomes.Rmd’ + + SUMMARY: processing the following files failed: + ‘flip.Rmd’ ‘gggenomes.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# ggghost + +
+ +* Version: 0.2.2 +* GitHub: https://github.com/jonocarroll/ggghost +* Source code: https://github.com/cran/ggghost +* Date/Publication: 2025-04-15 05:50:07 UTC +* Number of recursive dependencies: 47 + +Run `revdepcheck::cloud_details(, "ggghost")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggghost-Ex.R’ failed + The error most likely occurred in: + + > ### Name: -.gg + > ### Title: Remove a call from a ggghost object + > ### Aliases: -.gg + > + > ### ** Examples + > + > ## create a ggghost object + ... + > ## remove the geom_smooth + > z - geom_smooth() + > + > ## remove the labels + > ## NOTE: argument must be present and able to be + > ## evaluated in scope + > z - labs(TRUE) # works + Error: object is invalid: + - every label must be named. + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggghost) + Loading required package: ggplot2 + Loading required package: animation + Registered S3 method overwritten by 'ggghost': + method from + +.gg ggplot2 + ... + ── Error: (code run outside of `test_that()`) ────────────────────────────────── + + Error: C stack usage 9965028 is too close to the limit + ── Error ('test_methods.R:15:1'): ggghost methods behave correctly ───────────── + + Error: C stack usage 9962740 is too close to the limit + + [ FAIL 2 | WARN 5 | SKIP 0 | PASS 37 ] + Error: Test failures + Execution halted + ``` + +# gghalves + +
+ +* Version: 0.1.4 +* GitHub: https://github.com/erocoar/gghalves +* Source code: https://github.com/cran/gghalves +* Date/Publication: 2022-11-20 11:40:02 UTC +* Number of recursive dependencies: 50 + +Run `revdepcheck::cloud_details(, "gghalves")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘gghalves-Ex.R’ failed + The error most likely occurred in: + + > ### Name: geom_half_point + > ### Title: Points with jitter for half geoms. + > ### Aliases: geom_half_point + > + > ### ** Examples + > + > ggplot(iris, aes(x = Species, y = Petal.Width, fill = Species)) + + ... + 32. │ └─base::lapply(...) + 33. │ └─ggplot2 (local) FUN(X[[i]], ...) + 34. │ └─ggplot2 (local) apply_fun(cur_data) + 35. │ └─ggplot2 (local) fun(x, ...) + 36. └─base::.handleSimpleError(...) + 37. └─rlang (local) h(simpleError(msg, call)) + 38. └─handlers[[1L]](cnd) + 39. └─cli::cli_abort(...) + 40. └─rlang::abort(...) + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘gghalves.Rmd’ using rmarkdown + + Quitting from gghalves.Rmd:39-42 [unnamed-chunk-2] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'gghalves.Rmd' failed with diagnostics: + ... + ℹ Error occurred in the 1st layer. + Caused by error in `fun()`: + ! argument "layout" is missing, with no default + --- failed re-building ‘gghalves.Rmd’ + + SUMMARY: processing the following file failed: + ‘gghalves.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘grDevices’ ‘gtable’ + All declared Imports should be used. + ``` + +# gghighlight + +
+ +* Version: 0.4.1 +* GitHub: https://github.com/yutannihilation/gghighlight +* Source code: https://github.com/cran/gghighlight +* Date/Publication: 2023-12-16 01:00:02 UTC +* Number of recursive dependencies: 83 + +Run `revdepcheck::cloud_details(, "gghighlight")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘gghighlight-Ex.R’ failed + The error most likely occurred in: + + > ### Name: gghighlight + > ### Title: Highlight Data With Predicate + > ### Aliases: gghighlight + > + > ### ** Examples + > + > d <- data.frame( + ... + 15. │ ├─purrr:::with_indexed_errors(...) + 16. │ │ └─base::withCallingHandlers(...) + 17. │ ├─purrr:::call_with_cleanup(...) + 18. │ └─gghighlight (local) .f(.x[[i]], .y[[i]], ...) + 19. │ └─gghighlight:::get_default_aes_param(nm, layer$geom, layer$mapping) + 20. └─base::.handleSimpleError(...) + 21. └─purrr (local) h(simpleError(msg, call)) + 22. └─cli::cli_abort(...) + 23. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(gghighlight) + Loading required package: ggplot2 + > + > test_check("gghighlight") + label_key: type + label_key: type + ... + 25. └─cli::cli_abort(...) + 26. └─rlang::abort(...) + + [ FAIL 7 | WARN 24 | SKIP 0 | PASS 159 ] + Deleting unused snapshots: + • vdiffr/simple-bar-chart-with-facet.svg + • vdiffr/simple-line-chart.svg + • vdiffr/simple-point-chart.svg + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘gghighlight.Rmd’ using rmarkdown + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.gg_highlighter: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# gghourglass + +
+ +* Version: 0.0.2 +* GitHub: https://github.com/pepijn-devries/gghourglass +* Source code: https://github.com/cran/gghourglass +* Date/Publication: 2025-04-05 14:20:02 UTC +* Number of recursive dependencies: 97 + +Run `revdepcheck::cloud_details(, "gghourglass")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘gghourglass-Ex.R’ failed + The error most likely occurred in: + + > ### Name: AnnotateLunarphase + > ### Title: Annotate ggplot with lunar phases + > ### Aliases: AnnotateLunarphase annotate_lunarphase + > ### Keywords: datasets + > + > ### ** Examples + > + ... + 19. │ └─vctrs (local) ``() + 20. │ ├─x[i = i] + 21. │ └─grid:::`[.unit`(x = x, i = i) + 22. │ └─base::stop(...) + 23. └─base::.handleSimpleError(...) + 24. └─rlang (local) h(simpleError(msg, call)) + 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(gghourglass) + > + > test_check("gghourglass") + NULL + [ FAIL 1 | WARN 2 | SKIP 4 | PASS 3 ] + + ... + 26. │ └─base::stop(...) + 27. └─base::.handleSimpleError(...) + 28. └─rlang (local) h(simpleError(msg, call)) + 29. └─handlers[[1L]](cnd) + 30. └─cli::cli_abort(...) + 31. └─rlang::abort(...) + + [ FAIL 1 | WARN 2 | SKIP 4 | PASS 3 ] + Error: Test failures + Execution halted + ``` + +# ggimage + +
+ +* Version: 0.3.3 +* GitHub: https://github.com/GuangchuangYu/ggimage +* Source code: https://github.com/cran/ggimage +* Date/Publication: 2023-06-19 04:10:02 UTC +* Number of recursive dependencies: 57 + +Run `revdepcheck::cloud_details(, "ggimage")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.bgimage: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# ggiraph + +
+ +* Version: 0.8.13 +* GitHub: https://github.com/davidgohel/ggiraph +* Source code: https://github.com/cran/ggiraph +* Date/Publication: 2025-03-28 10:20:02 UTC +* Number of recursive dependencies: 87 + +Run `revdepcheck::cloud_details(, "ggiraph")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggiraph-Ex.R’ failed + The error most likely occurred in: + + > ### Name: geom_bar_interactive + > ### Title: Create interactive bars + > ### Aliases: geom_bar_interactive geom_col_interactive + > + > ### ** Examples + > + > # add interactive bar ------- + ... + 23. │ └─base::lapply(...) + 24. │ └─ggplot2 (local) FUN(X[[i]], ...) + 25. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 26. │ └─self$draw_panel(...) + 27. └─base::.handleSimpleError(...) + 28. └─rlang (local) h(simpleError(msg, call)) + 29. └─handlers[[1L]](cnd) + 30. └─cli::cli_abort(...) + 31. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > if (requireNamespace("tinytest", quietly = TRUE)) { + + tinytest::test_package("ggiraph") + + } + + test-annotate_interactive.R... 0 tests + test-annotate_interactive.R... 0 tests + test-annotate_interactive.R... 0 tests + ... + 33. │ └─base::lapply(...) + 34. │ └─ggplot2 (local) FUN(X[[i]], ...) + 35. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 36. │ └─self$draw_panel(...) + 37. └─base::.handleSimpleError(...) + 38. └─rlang (local) h(simpleError(msg, call)) + 39. └─handlers[[1L]](cnd) + 40. └─cli::cli_abort(...) + 41. └─rlang::abort(...) + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 8.1Mb + sub-directories of 1Mb or more: + R 1.5Mb + libs 5.2Mb + ``` + +# ggiraphExtra + +
+ +* Version: 0.3.0 +* GitHub: https://github.com/cardiomoon/ggiraphExtra +* Source code: https://github.com/cran/ggiraphExtra +* Date/Publication: 2020-10-06 07:00:02 UTC +* Number of recursive dependencies: 108 + +Run `revdepcheck::cloud_details(, "ggiraphExtra")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggiraphExtra-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggBar + > ### Title: Draw an interactive barplot + > ### Aliases: ggBar + > + > ### ** Examples + > + > require(moonBook) + ... + 24. │ └─base::lapply(...) + 25. │ └─ggplot2 (local) FUN(X[[i]], ...) + 26. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 27. │ └─self$draw_panel(...) + 28. └─base::.handleSimpleError(...) + 29. └─rlang (local) h(simpleError(msg, call)) + 30. └─handlers[[1L]](cnd) + 31. └─cli::cli_abort(...) + 32. └─rlang::abort(...) + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ggPredict.Rmd’ using rmarkdown + ``` + +# gglogger + +
+ +* Version: 0.1.5 +* GitHub: https://github.com/pwwang/gglogger +* Source code: https://github.com/cran/gglogger +* Date/Publication: 2024-10-25 09:10:02 UTC +* Number of recursive dependencies: 43 + +Run `revdepcheck::cloud_details(, "gglogger")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + y[1]: displ, y = hwy))\n" + ── Failure ('test-gglogger.R:124:5'): gglogger stringify works ───────────────── + `code` not equal to "ggplot2::ggplot(ggplot2::mpg) +\n geom_point(aes(x = displ, y = hwy))". + 1/1 mismatches + x[1]: "ggplot2::ggplot(ggplot2::mpg)" + y[1]: "ggplot2::ggplot(ggplot2::mpg) +\n geom_point(aes(x = displ, y = hwy))" + + [ FAIL 16 | WARN 0 | SKIP 0 | PASS 38 ] + Error: Test failures + Execution halted + ``` + +# ggmap + +
+ +* Version: 4.0.1 +* GitHub: https://github.com/dkahle/ggmap +* Source code: https://github.com/cran/ggmap +* Date/Publication: 2025-04-07 19:40:02 UTC +* Number of recursive dependencies: 63 + +Run `revdepcheck::cloud_details(, "ggmap")` for more info + +
+ +## Newly broken + +* checking whether package ‘ggmap’ can be installed ... WARNING + ``` + 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. + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.4Mb + sub-directories of 1Mb or more: + data 7.0Mb + ``` + +# ggmcmc + +
+ +* 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: 72 + +Run `revdepcheck::cloud_details(, "ggmcmc")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggmcmc-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggs_Rhat + > ### Title: Dotplot of Potential Scale Reduction Factor (Rhat) + > ### Aliases: ggs_Rhat + > + > ### ** Examples + > + > data(linear) + > ggs_Rhat(ggs(s)) + Error: C stack usage 9961844 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘using_ggmcmc.Rmd’ using rmarkdown + + Quitting from using_ggmcmc.Rmd:132-134 [histogram] + Error: processing vignette 'using_ggmcmc.Rmd' failed with diagnostics: + C stack usage 9965700 is too close to the limit + --- failed re-building ‘using_ggmcmc.Rmd’ + + --- re-building ‘v70i09.Rnw’ using knitr + ... + Quitting from v70i09.Rnw:239-245 [histogram_density_part] + Error: processing vignette 'v70i09.Rnw' failed with diagnostics: + C stack usage 9964756 is too close to the limit + --- failed re-building ‘v70i09.Rnw’ + + SUMMARY: processing the following files failed: + ‘using_ggmcmc.Rmd’ ‘v70i09.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## Newly fixed + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + --- re-building ‘using_ggmcmc.Rmd’ using rmarkdown + ``` + +# ggmice + +
+ +* Version: 0.1.0 +* 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 + +Run `revdepcheck::cloud_details(, "ggmice")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ggmice.Rmd’ using rmarkdown + ``` + +# GGMncv + +
+ +* Version: 2.1.1 +* GitHub: https://github.com/donaldRwilliams/GGMncv +* Source code: https://github.com/cran/GGMncv +* Date/Publication: 2021-12-15 07:40:28 UTC +* Number of recursive dependencies: 171 + +Run `revdepcheck::cloud_details(, "GGMncv")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘cpu_time.Rmd’ using rmarkdown + --- finished re-building ‘cpu_time.Rmd’ + + --- re-building ‘high_dim.Rmd’ using rmarkdown + + Quitting from high_dim.Rmd:75-78 [unnamed-chunk-4] + Error: processing vignette 'high_dim.Rmd' failed with diagnostics: + C stack usage 9964788 is too close to the limit + --- failed re-building ‘high_dim.Rmd’ + + --- re-building ‘nct_custom.Rmd’ using rmarkdown + ``` + +## In both + +* checking C++ specification ... NOTE + ``` + Specified C++11: please drop specification unless essential + ``` + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘Rdpack’ ‘mathjaxr’ + All declared Imports should be used. + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) boot_eip.Rd:50: Escaped LaTeX specials: \& + checkRd: (-1) constrained.Rd:93: Escaped LaTeX specials: \& + ``` + +# GGMnonreg + +
+ +* Version: 1.0.0 +* GitHub: NA +* Source code: https://github.com/cran/GGMnonreg +* Date/Publication: 2021-04-08 11:30:06 UTC +* Number of recursive dependencies: 122 + +Run `revdepcheck::cloud_details(, "GGMnonreg")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘GGMnonreg-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.graph + > ### Title: Network Plot for 'graph' Objects + > ### Aliases: plot.graph + > + > ### ** Examples + > + > # data + ... + > fit <- ggm_inference(Y, boot = FALSE) + > + > # get info for plotting + > plot(get_graph(fit)) + 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 GGMnonreg package. + Please report the issue to the authors. + Error: C stack usage 9962260 is too close to the limit + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘Matrix’ ‘Rdpack’ + All declared Imports should be used. + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) constrained.Rd:37: Escaped LaTeX specials: \& + ``` + +# ggmosaic + +
+ +* Version: 0.3.3 +* GitHub: https://github.com/haleyjeppson/ggmosaic +* Source code: https://github.com/cran/ggmosaic +* Date/Publication: 2021-02-23 19:50:02 UTC +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "ggmosaic")` for more info + +
+ +## Newly broken + +* checking whether package ‘ggmosaic’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ggmosaic/new/ggmosaic.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking dependencies in R code ... NOTE + ``` + ':::' call which should be '::': ‘scales:::censor’ + See the note in ?`:::` about the use of this operator. + Unexported object imported by a ':::' call: ‘productplots:::bound’ + See the note in ?`:::` about the use of this operator. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘ggmosaic’ ... +** package ‘ggmosaic’ 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 get(x, envir = ns, inherits = FALSE) : + object 'is.waive' not found +Error: unable to load R code in package ‘ggmosaic’ +Execution halted +ERROR: lazy loading failed for package ‘ggmosaic’ +* removing ‘/tmp/workdir/ggmosaic/new/ggmosaic.Rcheck/ggmosaic’ + + +``` +### CRAN + +``` +* installing *source* package ‘ggmosaic’ ... +** package ‘ggmosaic’ 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 +** help +*** installing help indices +*** copying figures +** 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 (ggmosaic) + + +``` +# ggmulti + +
+ +* Version: 1.0.7 +* GitHub: NA +* Source code: https://github.com/cran/ggmulti +* Date/Publication: 2024-04-09 09:40:05 UTC +* Number of recursive dependencies: 124 + +Run `revdepcheck::cloud_details(, "ggmulti")` for more info + +
+ +## Newly broken + +* checking whether package ‘ggmulti’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ggmulti/new/ggmulti.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘ggmulti’ ... +** package ‘ggmulti’ 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 get(x, envir = ns, inherits = FALSE) : + object 'new_aes' not found +Error: unable to load R code in package ‘ggmulti’ +Execution halted +ERROR: lazy loading failed for package ‘ggmulti’ +* removing ‘/tmp/workdir/ggmulti/new/ggmulti.Rcheck/ggmulti’ + + +``` +### CRAN + +``` +* installing *source* package ‘ggmulti’ ... +** package ‘ggmulti’ 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 +** help +*** installing help indices +*** copying figures +** 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 (ggmulti) + + +``` +# ggnewscale + +
+ +* Version: 0.5.1 +* GitHub: https://github.com/eliocamp/ggnewscale +* Source code: https://github.com/cran/ggnewscale +* Date/Publication: 2025-02-24 09:00:02 UTC +* Number of recursive dependencies: 59 + +Run `revdepcheck::cloud_details(, "ggnewscale")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggnewscale) + > + > test_check("ggnewscale") + `new_stat_bin2d()` using `bins = 30`. Pick better value `binwidth`. + `new_stat_bin2d()` using `bins = 30`. Pick better value `binwidth`. + `new_stat_bin2d()` using `bins = 30`. Pick better value `binwidth`. + ... + 16. └─scales:::as_discrete_pal.default(elem) + 17. └─cli::cli_abort("Cannot convert {.arg x} to a discrete palette.") + 18. └─rlang::abort(...) + + [ FAIL 1 | WARN 0 | SKIP 5 | PASS 3 ] + Deleting unused snapshots: + • newscale/guides-outisde-of-scales.svg + • newscale/respects-override-aes-2.svg + Error: Test failures + Execution halted + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.new_aes: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# 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: 73 + +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) + ... + + geom_line(...) %+% + + geom_point(color = "red", ...) + + } + > + > ggplot(mtcars, aes(x = wt, y = mpg)) + + + ggpk_func(color = "purple", size = 2, point.size = 4) + Error in if (grepl("^Ignoring unknown (parameters|aesthetics):", w$message)) invokeRestart("muffleWarning") : + the condition has length > 1 + Calls: Ops.S7_object ... withOneRestart -> doWithOneRestart -> signalCondition -> + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘composing-functions.Rmd’ using rmarkdown + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.ggpacket: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# ggparallel + +
+ +* Version: 0.4.0 +* 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: 48 + +Run `revdepcheck::cloud_details(, "ggparallel")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + ▆ + 1. ├─ggplot2::ggplot_build(test_mtcars_plot) at test-ggparallel.R:12:3 + 2. ├─ggplot2:::ggplot_build.default(test_mtcars_plot) + 3. │ └─ggplot2::build_ggplot(plot) + 4. │ └─S7::S7_dispatch() + 5. └─S7:::method_lookup_error("build_ggplot", ``) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted + ``` + +# ggparty + +
+ +* 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 + +Run `revdepcheck::cloud_details(, "ggparty")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggparty-Ex.R’ failed + The error most likely occurred in: + + > ### Name: autoplot.party + > ### Title: autoplot methods for party objects + > ### Aliases: autoplot.party autoplot.constparty autoplot.modelparty + > ### autoplot.lmtree + > + > ### ** Examples + > + ... + Backtrace: + ▆ + 1. ├─ggplot2::autoplot(py) + 2. └─ggparty:::autoplot.party(py) + 3. └─ggparty::ggparty(object) + 4. ├─ggplot2::ggplot(data = plot_data, mapping = mapping) + 5. └─ggplot2:::ggplot.default(data = plot_data, mapping = mapping) + 6. └─cli::cli_abort(...) + 7. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggparty) + Loading required package: ggplot2 + Loading required package: partykit + Loading required package: grid + Loading required package: libcoin + Loading required package: mvtnorm + ... + 3. │ └─vdiffr:::print_plot(plot, title) + 4. └─ggparty::ggparty(py) + 5. ├─ggplot2::ggplot(data = plot_data, mapping = mapping) + 6. └─ggplot2:::ggplot.default(data = plot_data, mapping = mapping) + 7. └─cli::cli_abort(...) + 8. └─rlang::abort(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 92 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ggparty-graphic-partying.Rmd’ using rmarkdown + + Quitting from ggparty-graphic-partying.Rmd:41-122 [unnamed-chunk-2] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'ggparty-graphic-partying.Rmd' failed with diagnostics: + `mapping` must be created with `aes()`. + ... + Error: processing vignette 'on-the-edge.Rmd' failed with diagnostics: + `mapping` must be created with `aes()`. + ✖ You've supplied an object. + --- failed re-building ‘on-the-edge.Rmd’ + + SUMMARY: processing the following files failed: + ‘ggparty-graphic-partying.Rmd’ ‘on-the-edge.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## 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 + ``` + +# ggpath + +
+ +* Version: 1.0.2 +* GitHub: https://github.com/mrcaseb/ggpath +* Source code: https://github.com/cran/ggpath +* Date/Publication: 2024-08-20 09:30:02 UTC +* Number of recursive dependencies: 65 + +Run `revdepcheck::cloud_details(, "ggpath")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggpath-Ex.R’ failed + The error most likely occurred in: + + > ### Name: element_path + > ### Title: Theme Elements for Image Grobs + > ### Aliases: element_path element_raster + > + > ### ** Examples + > + > library(ggplot2) + ... + + theme( + + plot.caption = element_path(hjust = 1, size = 0.6), + + axis.text.y = element_path(size = 1), + + axis.title.x = element_path(), + + axis.title.y = element_path(vjust = 0.9), + + plot.title = element_path(hjust = 0, size = 2, alpha = 0.5), + + plot.subtitle = element_path(hjust = 0.9, angle = 45), + + ) + Error: `object` must be an , not a S3 + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggpath) + > + > test_check("ggpath") + [ FAIL 1 | WARN 0 | SKIP 5 | PASS 3 ] + + ══ Skipped tests (5) ═══════════════════════════════════════════════════════════ + ... + • geom_lines/p1.svg + • geom_lines/p2.svg + • geom_lines/p3.svg + • geom_lines/p4.svg + • geom_lines/p5.svg + • theme-elements/p1.svg + • theme-elements/p2.svg + • theme-elements/p3.svg + Error: Test failures + Execution halted + ``` + +# ggpedigree + +
+ +* Version: 0.4.1 +* GitHub: https://github.com/R-Computing-Lab/ggpedigree +* Source code: https://github.com/cran/ggpedigree +* Date/Publication: 2025-05-26 09:20:05 UTC +* Number of recursive dependencies: 143 + +Run `revdepcheck::cloud_details(, "ggpedigree")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggpedigree-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggPedigreeInteractive + > ### Title: Interactive pedigree plot (Plotly wrapper around ggPedigree) + > ### Aliases: ggPedigreeInteractive ggpedigreeinteractive + > + > ### ** Examples + > + > library(BGmisc) + > data("potter") + > ggPedigreeInteractive(potter, famID = "famID", personID = "personID") + Error in pm[[2]] : subscript out of bounds + Calls: ggPedigreeInteractive -> -> ggplotly.ggplot -> gg2list + 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 + ... + Backtrace: + ▆ + 1. └─ggpedigree::ggPedigreeInteractive(...) at test-ggPedigreeInteractive.R:29:3 + 2. ├─plotly::ggplotly(...) + 3. └─plotly:::ggplotly.ggplot(...) + 4. └─plotly::gg2list(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 107 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘v0_plots.Rmd’ using rmarkdown + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘OpenMx’ + ``` + +# ggplot2.utils + +
+ +* Version: 0.3.2 +* GitHub: https://github.com/insightsengineering/ggplot2.utils +* Source code: https://github.com/cran/ggplot2.utils +* Date/Publication: 2024-06-25 21:10:02 UTC +* Number of recursive dependencies: 71 + +Run `revdepcheck::cloud_details(, "ggplot2.utils")` 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.utils) + Loading required package: ggplot2 + > + > test_check("ggplot2.utils") + + Attaching package: 'dplyr' + ... + ── Failure ('test-geom_km_ticks.R:10:3'): geom_km_ticks works as expected ────── + Names of `first_layer` ('time', 'survival', 'n.risk', 'n.censor', 'n.event', 'PANEL', 'group', 'x', 'y', 'shape', 'colour', 'size', 'alpha', 'stroke', 'fill') don't match 'x', 'y', 'time', 'survival', 'n.risk', 'n.censor', 'n.event', 'PANEL', 'group', 'shape', 'colour', 'size', 'alpha', 'stroke', 'fill' + ── Failure ('test-stat_km.R:10:3'): stat_km works as expected ────────────────── + Names of `first_layer` ('time', 'survival', 'PANEL', 'group', 'x', 'y', 'colour', 'fill', 'linewidth', 'linetype', 'weight', 'alpha') don't match 'x', 'y', 'time', 'survival', 'PANEL', 'group', 'colour', 'fill', 'linewidth', 'linetype', 'weight', 'alpha' + ── Failure ('test-stat_km_ticks.R:10:3'): stat_km_ticks works as expected ────── + Names of `first_layer` ('time', 'survival', 'n.risk', 'n.censor', 'n.event', 'PANEL', 'group', 'x', 'y', 'shape', 'colour', 'size', 'alpha', 'stroke', 'fill') don't match 'x', 'y', 'time', 'survival', 'n.risk', 'n.censor', 'n.event', 'PANEL', 'group', 'shape', 'colour', 'size', 'alpha', 'stroke', 'fill' + + [ FAIL 4 | WARN 0 | SKIP 7 | PASS 44 ] + Error: Test failures + Execution halted + ``` + +# ggPMX + +
+ +* 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: 174 + +Run `revdepcheck::cloud_details(, "ggPMX")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggPMX-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 + > + > ### ** Examples + > + ... + + dvid = "DVID", + + 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: C stack usage 9965556 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘ggPMX-guide.Rmd’ using rmarkdown + + Quitting from ggPMX-guide.Rmd:24-37 [load_package] + Error: processing vignette 'ggPMX-guide.Rmd' failed with diagnostics: + C stack usage 9961876 is too close to the limit + --- failed re-building ‘ggPMX-guide.Rmd’ + + SUMMARY: processing the following file failed: + ‘ggPMX-guide.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘lixoftConnectors’ + ``` + +* checking installed package size ... NOTE + ``` + installed size is 9.0Mb + sub-directories of 1Mb or more: + doc 1.1Mb + help 2.4Mb + testdata 4.8Mb + ``` + +# ggpol + +
+ +* 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: 52 + +Run `revdepcheck::cloud_details(, "ggpol")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggpol-Ex.R’ failed + The error most likely occurred in: + + > ### Name: GeomConfmat + > ### Title: Confusion Matrix + > ### Aliases: GeomConfmat geom_confmat stat_confmat + > + > ### ** Examples + > + > x <- sample(LETTERS[seq(4)], 50, replace = TRUE) + ... + 24. │ └─ggpol (local) draw_panel(...) + 25. │ └─base::lapply(GeomText$default_aes[missing_aes], rlang::eval_tidy) + 26. │ └─rlang (local) FUN(X[[i]], ...) + 27. ├─ggplot2::from_theme(fontsize) + 28. └─base::.handleSimpleError(...) + 29. └─rlang (local) h(simpleError(msg, call)) + 30. └─handlers[[1L]](cnd) + 31. └─cli::cli_abort(...) + 32. └─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 + +
+ +* Version: 1.0.6 +* GitHub: https://github.com/csdaw/ggprism +* Source code: https://github.com/cran/ggprism +* Date/Publication: 2025-05-17 10:50:02 UTC +* Number of recursive dependencies: 99 + +Run `revdepcheck::cloud_details(, "ggprism")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggprism-Ex.R’ failed + The error most likely occurred in: + + > ### Name: annotation_ticks + > ### Title: Add ticks as ggplot annotation + > ### Aliases: annotation_ticks + > + > ### ** Examples + > + > ## Generally it is better to use the guide_prism_minor function. + ... + Please report the issue at . + Error in `parent %+replace% t`: + ! `%+replace%` requires two theme objects + Backtrace: + ▆ + 1. └─ggprism::theme_prism(border = TRUE) + 2. └─parent %+replace% t + 3. └─cli::cli_abort("{.code %+replace%} requires two theme objects") + 4. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > + > if ( requireNamespace("tinytest", quietly=TRUE) ){ + + tinytest::test_package("ggprism") + + } + + test-add_pvalue.R............. 0 tests + test-add_pvalue.R............. 0 tests + ... + ℹ It has been replaced by a ggproto system that can be extended. + 3: The `size` argument of `element_line()` is deprecated as of ggplot2 3.4.0. + ℹ Please use the `linewidth` argument instead. + ℹ The deprecated feature was likely used in the ggprism package. + Please report the issue at . + 4: The `size` argument of `element_rect()` is deprecated as of ggplot2 3.4.0. + ℹ Please use the `linewidth` argument instead. + ℹ The deprecated feature was likely used in the ggprism package. + Please report the issue at . + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘axes.Rmd’ using rmarkdown + + Quitting from axes.Rmd:37-48 [unnamed-chunk-2] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'axes.Rmd' failed with diagnostics: + `%+replace%` requires two theme objects + ... + + Error: processing vignette 'themes.Rmd' failed with diagnostics: + `%+replace%` requires two theme objects + --- failed re-building ‘themes.Rmd’ + + SUMMARY: processing the following files failed: + ‘axes.Rmd’ ‘colours.Rmd’ ‘ggprism.Rmd’ ‘pvalues.Rmd’ ‘themes.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# ggpubr + +
+ +* 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: 89 + +Run `revdepcheck::cloud_details(, "ggpubr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggpubr) + Loading required package: ggplot2 + > + > test_check("ggpubr") + [ FAIL 2 | WARN 6 | SKIP 0 | PASS 183 ] + + ... + [6] 6 - 10 == -4 + [7] 19 - 9 == 10 + [9] 1 - 7 == -6 + [10] 6 - 7 == -1 + [11] 13 - 6 == 7 + ... + + [ FAIL 2 | WARN 6 | SKIP 0 | PASS 183 ] + Error: Test failures + Execution halted + ``` + +# ggquickeda + +
+ +* Version: 0.3.1 +* GitHub: https://github.com/smouksassi/ggquickeda +* Source code: https://github.com/cran/ggquickeda +* Date/Publication: 2024-01-15 10:20:02 UTC +* Number of recursive dependencies: 175 + +Run `revdepcheck::cloud_details(, "ggquickeda")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggquickeda-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggcontinuousexpdist + > ### Title: Create a continuous exposure fit plot + > ### Aliases: ggcontinuousexpdist + > + > ### ** Examples + > + > # Example 1 + ... + Joining with `by = join_by(loopvariable, DOSE, quant_25)` + Joining with `by = join_by(loopvariable, DOSE, quant_75)` + Joining with `by = join_by(loopvariable, DOSE, medexp)` + > a / b + + + plot_layout(guides = "collect") & + + theme(legend.position = "top") + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘DT’ ‘Formula’ ‘GGally’ ‘Hmisc’ ‘RPostgres’ ‘colourpicker’ ‘ggpmisc’ + ‘ggpubr’ ‘glue’ ‘gridExtra’ ‘markdown’ ‘patchwork’ ‘plotly’ + ‘quantreg’ ‘shinyFiles’ ‘shinyjqui’ ‘shinyjs’ ‘table1’ ‘zoo’ + All declared Imports should be used. + ``` + +# ggraph + +
+ +* 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: 114 + +Run `revdepcheck::cloud_details(, "ggraph")` 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(, , , , , , , 5.5, c(5.5, 5.5, 5.5, 5.5), NULL, , , , NULL, , NULL, , , , , NULL, , NULL, , NULL, , , 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, , NULL, NULL, NULL, NULL, NULL, NULL, + NULL, NULL, , NULL, 2, NULL, NULL, NULL, 1.2, NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, 0.2, NULL, , NULL, , NULL, "right", NULL, NULL, NULL, "center", NULL, NULL, NULL, NULL, NULL, NULL, NULL, NULL, 0, , 2, , , NULL, NULL, NULL, , NULL, , NULL, NULL, NULL, NULL, FALSE, NULL, NULL, , , "panel", , , "panel", , "topleft", NULL, NULL, , NULL, NULL, "on", " + Calls: ... -> -> process_layers -> + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Edges.Rmd’ using rmarkdown + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_build: + function(plot, ...) + ggplot_build.ggraph: + function(plot) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 9.0Mb + sub-directories of 1Mb or more: + R 1.5Mb + doc 3.9Mb + libs 2.8Mb + ``` + +# ggredist + +
+ +* 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: 65 + +Run `revdepcheck::cloud_details(, "ggredist")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggredist-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 + > ### Keywords: datasets + > + > ### ** Examples + ... + 25. │ └─coord$transform(data, panel_params) + 26. │ └─ggplot2 (local) transform(..., self = self) + 27. │ └─ggplot2:::sf_rescale01(data[[geom_column(data)]], x_range, y_range) + 28. │ └─sf::st_normalize(x, c(x_range[1], y_range[1], x_range[2], y_range[2])) + 29. └─base::.handleSimpleError(...) + 30. └─rlang (local) h(simpleError(msg, call)) + 31. └─handlers[[1L]](cnd) + 32. └─cli::cli_abort(...) + 33. └─rlang::abort(...) + Execution halted + ``` + +# ggResidpanel + +
+ +* Version: 0.3.0 +* GitHub: NA +* Source code: https://github.com/cran/ggResidpanel +* Date/Publication: 2019-05-31 23:20:04 UTC +* Number of recursive dependencies: 112 + +Run `revdepcheck::cloud_details(, "ggResidpanel")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggResidpanel-Ex.R’ failed + The error most likely occurred in: + + > ### Name: resid_interact + > ### Title: Panel of Interactive Versions of Diagnostic Residual Plots. + > ### Aliases: resid_interact + > + > ### ** Examples + > + > + > # Fit a model to the penguin data + > penguin_model <- lme4::lmer(heartrate ~ depth + duration + (1|bird), data = penguins) + > + > # Create the default interactive panel + > resid_interact(penguin_model) + Error in pm[[2]] : subscript out of bounds + Calls: resid_interact ... %>% -> layout -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggResidpanel) + > + > test_check("ggResidpanel") + [ FAIL 1 | WARN 4 | SKIP 9 | PASS 18 ] + + ══ Skipped tests (9) ═══════════════════════════════════════════════════════════ + ... + 42. │ └─ggplot2 (local) draw_group(..., self = self) + 43. └─base::.handleSimpleError(...) + 44. └─rlang (local) h(simpleError(msg, call)) + 45. └─handlers[[1L]](cnd) + 46. └─cli::cli_abort(...) + 47. └─rlang::abort(...) + + [ FAIL 1 | WARN 4 | SKIP 9 | PASS 18 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘introduction.Rmd’ using rmarkdown + ``` + +# 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: 66 + +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' + + 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(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 3 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘Vignette.Rmd’ using rmarkdown + + Quitting from Vignette.Rmd:47-49 [unnamed-chunk-2] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + 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 + ``` + +# ggseas + +
+ +* Version: 0.5.4 +* GitHub: https://github.com/ellisp/ggseas +* Source code: https://github.com/cran/ggseas +* Date/Publication: 2018-06-12 13:33:33 UTC +* Number of recursive dependencies: 63 + +Run `revdepcheck::cloud_details(, "ggseas")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggseas) + Loading required package: ggplot2 + > + > test_check("ggseas") + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 9 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-tsdf.R:22:4'): ggplot can draw graphic with tsdf output ────── + class(tmp2) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 9 ] + Error: Test failures + Execution halted + ``` + +# ggseqplot + +
+ +* Version: 0.8.6 +* GitHub: https://github.com/maraab23/ggseqplot +* Source code: https://github.com/cran/ggseqplot +* Date/Publication: 2025-05-06 22:10:02 UTC +* Number of recursive dependencies: 128 + +Run `revdepcheck::cloud_details(, "ggseqplot")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggseqplot-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggseqrfplot + > ### Title: Relative Frequency Sequence Plot + > ### Aliases: ggseqrfplot + > + > ### ** Examples + > + > # Load additional library for fine-tuning the plots + ... + > + > # ... 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: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + 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-11 (Built: 2024-12-09) + 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 3 | WARN 16 | SKIP 0 | PASS 117 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ggseqplot.Rmd’ using rmarkdown + ``` + +# ggside + +
+ +* 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: 73 + +Run `revdepcheck::cloud_details(, "ggside")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ggside-Ex.R’ failed + The error most likely occurred in: + + > ### Name: geom_xsidebar + > ### Title: Side bar Charts + > ### Aliases: geom_xsidebar geom_*sidebar geom_ysidebar geom_xsidecol + > ### geom_ysidecol + > + > ### ** Examples + > + ... + 14. │ └─base::withCallingHandlers(...) + 15. └─ggplot2 (local) f(l = layers[[i]], d = data[[i]]) + 16. └─l$compute_statistic(d, layout) + 17. └─ggside (local) compute_statistic(..., self = self) + 18. └─ggplot2 (local) ggproto_parent_method(self = self, data = data, layout = layout) + 19. └─self$stat$setup_params(data, self$stat_params) + 20. └─ggplot2 (local) setup_params(..., self = self) + 21. └─cli::cli_abort("{.fn {snake_class(self)}} must only have an {.field x} {.emph or} {.field y} aesthetic.") + 22. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + 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 + > + ... + • side_layers/label.svg + • side_layers/violin.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 re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ggside_aes_mapping.Rmd’ using rmarkdown + + Quitting from ggside_aes_mapping.Rmd:42-46 [ggside_updated_aes_usage] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'ggside_aes_mapping.Rmd' failed with diagnostics: + Problem while setting up geom. + ℹ Error occurred in the 2nd layer. + Caused by error in `ggproto_parent_method()`: + ! `geom_xsidedensity()` requires the following missing aesthetics: y. + --- failed re-building ‘ggside_aes_mapping.Rmd’ + + --- re-building ‘ggside_basic_usage.Rmd’ using rmarkdown + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.ggside_scale: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.ggside_layer: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.ggside_options: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +* checking for code/documentation mismatches ... WARNING + ``` + Codoc mismatches from Rd file 'geom_xsideabline.Rd': + 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: ... + ... + FALSE, show.legend = NA, inherit.aes = TRUE, + orientation = "y") + Argument names in code not in docs: + quantile.colour quantile.color quantile.linetype quantile.linewidth + Mismatches in argument names (first 3): + Position: 6 Code: trim Docs: draw_quantiles + Position: 7 Code: bounds Docs: trim + Position: 8 Code: quantile.colour Docs: bounds + Mismatches in argument default values: + Name: 'draw_quantiles' Code: deprecated() Docs: NULL + ``` + +* checking R code for possible problems ... NOTE + ``` + geom_xsidelabel: no visible global function definition for ‘deprecated’ + geom_xsideviolin: no visible global function definition for + ‘deprecated’ + geom_ysidelabel: no visible global function definition for ‘deprecated’ + geom_ysideviolin: no visible global function definition for + ‘deprecated’ + Undefined global functions or variables: + deprecated + ``` + +# 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: 105 + +Run `revdepcheck::cloud_details(, "ggspatial")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.fixed_plot_aspect: + function(object, plot, object_name) + + ggplot_build: + function(plot, ...) + ggplot_build.gg_fixed_plot_aspect: + function(plot) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# ggstatsplot + +
+ +* Version: 0.13.1 +* GitHub: https://github.com/IndrajeetPatil/ggstatsplot +* Source code: https://github.com/cran/ggstatsplot +* Date/Publication: 2025-05-09 23:40:02 UTC +* Number of recursive dependencies: 173 + +Run `revdepcheck::cloud_details(, "ggstatsplot")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # graphics engine changed in this version, and so snapshots generated on + > # previous R version won't work + > if (getRversion() >= "4.4.0") { + + library(testthat) + + suppressPackageStartupMessages(library(ggstatsplot)) + + test_check("ggstatsplot") + + } + ... + • pairwise-ggsignif/within-non-parametric-all.svg + • pairwise-ggsignif/within-non-parametric-only-non-significant.svg + • pairwise-ggsignif/within-non-parametric-only-significant.svg + • pairwise-ggsignif/within-parametric-all.svg + • pairwise-ggsignif/within-parametric-only-significant.svg + • pairwise-ggsignif/within-robust-all.svg + • pairwise-ggsignif/within-robust-only-non-significant.svg + • pairwise-ggsignif/within-robust-only-significant.svg + Error: Test failures + Execution halted + ``` + +# ggstream + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/ggstream +* Date/Publication: 2021-05-06 07:50:03 UTC +* Number of recursive dependencies: 52 + +Run `revdepcheck::cloud_details(, "ggstream")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ggstream) + > + > test_check("ggstream") + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 0 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-geom_stream.R:4:3'): geom_stream ───────────────────────────── + class(...) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘tidyr’ + All declared Imports should be used. + ``` + +# ggswissmaps + +
+ +* 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: 69 + +Run `revdepcheck::cloud_details(, "ggswissmaps")` for more info + +
+ +## Newly broken + +* checking whether package ‘ggswissmaps’ can be installed ... WARNING + ``` + 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 whether the namespace can be loaded with stated dependencies ... NOTE + ``` + 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. + ``` + +# ggtangle + +
+ +* Version: 0.0.6 +* GitHub: NA +* Source code: https://github.com/cran/ggtangle +* Date/Publication: 2024-12-18 14:30:06 UTC +* Number of recursive dependencies: 77 + +Run `revdepcheck::cloud_details(, "ggtangle")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ggtangle.Rmd’ using rmarkdown + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.cnet_label: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.layer_edge: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# 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: 40 + +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 'is.zero' 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) + + +``` +# ggtext + +
+ +* Version: 0.1.2 +* GitHub: https://github.com/wilkelab/ggtext +* Source code: https://github.com/cran/ggtext +* Date/Publication: 2022-09-16 11:36:07 UTC +* Number of recursive dependencies: 77 + +Run `revdepcheck::cloud_details(, "ggtext")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘plotting_text.Rmd’ using rmarkdown + ``` + +# ggthemeUL + +
+ +* Version: 0.1.3 +* GitHub: NA +* Source code: https://github.com/cran/ggthemeUL +* Date/Publication: 2023-12-07 11:50:02 UTC +* Number of recursive dependencies: 47 + +Run `revdepcheck::cloud_details(, "ggthemeUL")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ggthemeUL.Rmd’ using rmarkdown + + Quitting from ggthemeUL.Rmd:146-162 [unnamed-chunk-7] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `as.vector()`: + ! cannot coerce type 'object' to vector of type 'character' + --- + Backtrace: + ... + + Error: processing vignette 'ggthemeUL.Rmd' failed with diagnostics: + cannot coerce type 'object' to vector of type 'character' + --- failed re-building ‘ggthemeUL.Rmd’ + + SUMMARY: processing the following file failed: + ‘ggthemeUL.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# ggtibble + +
+ +* Version: 1.0.1 +* GitHub: NA +* Source code: https://github.com/cran/ggtibble +* Date/Publication: 2024-06-19 12:50:02 UTC +* Number of recursive dependencies: 73 + +Run `revdepcheck::cloud_details(, "ggtibble")` for more info + +
+ +## Newly broken + +* 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/testing-design.html#sec-tests-files-overview + ... + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. ├─ggtibble::new_gglist(list(ggplot2::labs("foo"))) + 5. └─ggplot2::labs("foo") + 6. └─ggplot2::class_labels(args) + 7. └─S7::new_object(labels) + 8. └─S7::validate(object, recursive = !parent_validated) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 59 ] + Error: Test failures + Execution halted + ``` + +# 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: 95 + +Run `revdepcheck::cloud_details(, "ggVennDiagram")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + 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 + ``` + +# ggview + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/idmn/ggview +* Source code: https://github.com/cran/ggview +* Date/Publication: 2024-10-02 17:00:10 UTC +* Number of recursive dependencies: 45 + +Run `revdepcheck::cloud_details(, "ggview")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.canvas: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# 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: 115 + +Run `revdepcheck::cloud_details(, "GimmeMyPlot")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + 9. │ │ └─base::mget(args, envir = env) + 10. │ └─ggplot2::element_text(...) + 11. │ └─S7::new_object(...) + 12. │ └─S7::validate(object, recursive = !parent_validated) + 13. └─base::suppressWarnings(.) + 14. └─base::withCallingHandlers(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 1 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Tutorial.Rmd’ using rmarkdown + + Quitting from Tutorial.Rmd:23-57 [violin] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! object properties are invalid: + - @colour must be , , or , not S3 + --- + ... + Error: processing vignette 'Tutorial.Rmd' failed with diagnostics: + object properties are invalid: + - @colour must be , , or , not S3 + --- failed re-building ‘Tutorial.Rmd’ + + SUMMARY: processing the following file failed: + ‘Tutorial.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# gosset + +
+ +* Version: 1.4 +* GitHub: https://github.com/agrdatasci/gosset +* Source code: https://github.com/cran/gosset +* Date/Publication: 2024-12-05 14:00:02 UTC +* Number of recursive dependencies: 149 + +Run `revdepcheck::cloud_details(, "gosset")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘vignette-1-trait-prioritization-and-crop-performance.Rmd’ using rmarkdown_notangle + ``` + +# grafify + +
+ +* Version: 5.0.0.1 +* GitHub: https://github.com/ashenoy-cmbi/grafify +* Source code: https://github.com/cran/grafify +* Date/Publication: 2025-03-10 22:50:02 UTC +* Number of recursive dependencies: 112 + +Run `revdepcheck::cloud_details(, "grafify")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(grafify) + Loading required package: ggplot2 + > library(rlang) + + Attaching package: 'rlang' + + ... + Backtrace: + ▆ + 1. └─testthat::expect_match(db2$labels$y, "PI") at test-plot_befafter_colors.R:37:3 + 2. └─base::stopifnot(is.character(act$val)) + ── Failure ('test-plot_qqline.R:14:3'): Check QQ plots ───────────────────────── + as.character(db1$labels$y) is empty. + + [ FAIL 5 | WARN 0 | SKIP 0 | PASS 180 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.6Mb + sub-directories of 1Mb or more: + help 5.3Mb + ``` + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘gratia’ + ``` + +# graphPAF + +
+ +* Version: 2.0.0 +* GitHub: https://github.com/johnfergusonNUIG/graphPAF +* Source code: https://github.com/cran/graphPAF +* Date/Publication: 2023-12-21 00:50:06 UTC +* Number of recursive dependencies: 48 + +Run `revdepcheck::cloud_details(, "graphPAF")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘graphPAF-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.SAF_summary + > ### Title: Produce plots of sequential and average PAF + > ### Aliases: plot.SAF_summary + > + > ### ** Examples + > + > library(splines) + ... + + riskfactor_vec = c("urban.rural","occupational.exposure"),ci=FALSE) + > plot(out) + Warning in fortify(data, ...) : Arguments in `...` must be used. + ✖ Problematic argument: + • size = point.size + ℹ Did you misspell an argument name? + Error: Can't find method for generic `+(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +# gratia + +
+ +* Version: 0.10.0 +* GitHub: https://github.com/gavinsimpson/gratia +* Source code: https://github.com/cran/gratia +* Date/Publication: 2024-12-19 19:10:02 UTC +* Number of recursive dependencies: 154 + +Run `revdepcheck::cloud_details(, "gratia")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘gratia-Ex.R’ failed + The error most likely occurred in: + + > ### Name: appraise + > ### Title: Model diagnostic plots + > ### Aliases: appraise appraise.gam appraise.lm + > + > ### ** Examples + > + > load_mgcv() + ... + > ## change the ggplot theme for all panels + > library("ggplot2") + > appraise(mod, seed = 42, + + point_col = "steelblue", point_alpha = 0.4, + + line_col = "black" + + ) & theme_minimal() + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘test-all.R’ + Running the tests in ‘tests/test-all.R’ failed. + Complete output: + > ## Test `gratia` using the `testthat` package + > + > ## Setup + > library("testthat") + > library("gratia") + > + > ## Runs the tests in tests/testthat + ... + • penalty/draw-penalty-single-smooths-user-continuous-fill.svg + • rootograms/draw-gaussian-rootogram.svg + • rootograms/draw-neg-bin-rootogram.svg + • rootograms/draw-neg-bin-sqrt-rootogram.svg + • rootograms/draw-neg-bin-standing-rootogram.svg + • rootograms/draw-neg-bin-suspended-rootogram.svg + • soap-films/draw-gam-so-soap-film.svg + • soap-films/draw-smooth-estimates-so-soap-film.svg + Error: Test failures + 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: 87 + +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 + ``` + +# GRShiny + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/sooyongl/GRShiny +* Source code: https://github.com/cran/GRShiny +* Date/Publication: 2023-05-03 18:40:06 UTC +* Number of recursive dependencies: 153 + +Run `revdepcheck::cloud_details(, "GRShiny")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(GRShiny) + > + > test_check("GRShiny") + + F1 =~ NA*y1+l1*y1+l2*y2 + + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-gendata.r:73:3'): Plotting functions work ──────────────────── + `res` is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 6 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) runGRM.Rd:24: Lost braces + 24 | from \code{\link{mirt}} or code{\linkS4class{lavaan}} from from + | ^ + ``` + +# grwat + +
+ +* Version: 0.0.4 +* GitHub: https://github.com/tsamsonov/grwat +* Source code: https://github.com/cran/grwat +* Date/Publication: 2023-10-27 11:40:12 UTC +* Number of recursive dependencies: 98 + +Run `revdepcheck::cloud_details(, "grwat")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > suppressPackageStartupMessages(library(grwat)) + > + > test_check("grwat") + [ FAIL 7 | WARN 4 | SKIP 1 | PASS 165 ] + + ══ Skipped tests (1) ═══════════════════════════════════════════════════════════ + ... + ── Failure ('test-gr_plot_matrix.R:17:3'): Matrix ggplot has the correct content ── + `plt` has type 'object', not 'list'. + ── Failure ('test-gr_plot_ridge.R:9:3'): Ridgeline plot has the correct content ── + `plt` has type 'object', not 'list'. + ── Failure ('test-gr_plot_tests.R:10:3'): Tests plot has the correct content ─── + `plt` has type 'object', not 'list'. + + [ FAIL 7 | WARN 4 | SKIP 1 | PASS 165 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.3Mb + sub-directories of 1Mb or more: + doc 1.6Mb + libs 2.6Mb + ``` + +# gtExtras + +
+ +* Version: 0.6.0 +* GitHub: https://github.com/jthomasmock/gtExtras +* Source code: https://github.com/cran/gtExtras +* Date/Publication: 2025-05-29 04:50:02 UTC +* Number of recursive dependencies: 106 + +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': + ... + 44. │ └─base::stop(...) + 45. └─base::.handleSimpleError(...) + 46. └─rlang (local) h(simpleError(msg, call)) + 47. └─handlers[[1L]](cnd) + 48. └─cli::cli_abort(...) + 49. └─rlang::abort(...) + + [ FAIL 6 | WARN 4 | SKIP 19 | PASS 104 ] + Error: Test failures + Execution halted + ``` + +# guideR + +
+ +* Version: 0.4.0 +* GitHub: https://github.com/larmarange/guideR +* Source code: https://github.com/cran/guideR +* Date/Publication: 2025-04-22 12:00:02 UTC +* Number of recursive dependencies: 155 + +Run `revdepcheck::cloud_details(, "guideR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘guideR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_inertia_from_tree + > ### Title: Plot inertia, absolute loss and relative loss from a + > ### classification tree + > ### Aliases: plot_inertia_from_tree get_inertia_from_tree + > ### Keywords: tree + > + > ### ** Examples + ... + 11 11 38.5 -2.96 -0.0713 + 12 12 36.8 -1.68 -0.0436 + 13 13 36.7 -0.113 -0.00307 + 14 14 32.7 -4.02 -0.109 + 15 15 31.6 -1.10 -0.0336 + > plot_inertia_from_tree(hc) + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + 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/testing-design.html#sec-tests-files-overview + ... + ── Failure ('test-plot_inertia_from_tree.R:6:3'): plot_inertia_from_tree() does not produce an error ── + Expected `plot_inertia_from_tree(hc)` to run without any errors. + i Actually got a with text: + Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + + [ FAIL 1 | WARN 34 | SKIP 4 | PASS 60 ] + Error: Test failures + Execution halted + ``` + +# handwriterRF + +
+ +* Version: 1.1.1 +* GitHub: https://github.com/CSAFE-ISU/handwriterRF +* Source code: https://github.com/cran/handwriterRF +* Date/Publication: 2025-01-29 00:20:01 UTC +* Number of recursive dependencies: 124 + +Run `revdepcheck::cloud_details(, "handwriterRF")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + Calculating similarity score... + Calculating distance between samples... + Calculating similarity score... + Calculating distance between samples... + Calculating similarity score... + Calculating SLR... + Calculating distance between samples... + Calculating similarity score... + Calculating SLR... + Killed + ``` + +# harmony + +
+ +* Version: 1.2.3 +* GitHub: https://github.com/immunogenomics/harmony +* Source code: https://github.com/cran/harmony +* Date/Publication: 2024-11-27 23:50:02 UTC +* Number of recursive dependencies: 211 + +Run `revdepcheck::cloud_details(, "harmony")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Seurat.Rmd’ using rmarkdown + Calculating gene variances + 0% 10 20 30 40 50 60 70 80 90 100% + [----|----|----|----|----|----|----|----|----|----| + **************************************************| + Calculating feature variances of standardized and clipped values + 0% 10 20 30 40 50 60 70 80 90 100% + [----|----|----|----|----|----|----|----|----|----| + **************************************************| + ... + **************************************************| + 0% 10 20 30 40 50 60 70 80 90 100% + [----|----|----|----|----|----|----|----|----|----| + **************************************************| + 0% 10 20 30 40 50 60 70 80 90 100% + [----|----|----|----|----|----|----|----|----|----| + **************************************************| + 0% 10 20 30 40 50 60 70 80 90 100% + [----|----|----|----|----|----|----|----|----|----| + **************************************************| + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 14.8Mb + sub-directories of 1Mb or more: + data 5.0Mb + doc 2.5Mb + libs 7.1Mb + ``` + +# hatchR + +
+ +* Version: 0.3.2 +* GitHub: https://github.com/bmait101/hatchR +* Source code: https://github.com/cran/hatchR +* Date/Publication: 2025-03-05 15:40:02 UTC +* Number of recursive dependencies: 92 + +Run `revdepcheck::cloud_details(, "hatchR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + `plot_geoms` (`actual`) not identical to c("GeomPoint", "GeomLine", "GeomHline", "GeomHline") (`expected`). + + `names(actual)` is a character vector ('geom_point', 'geom_line', 'geom_hline', 'geom_hline...4') + `names(expected)` is absent + ── Failure ('test-plot_phenology.R:10:3'): plot_phenology works ──────────────── + `p` has type 'object', not 'list'. + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 35 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 8.7Mb + sub-directories of 1Mb or more: + data 6.5Mb + doc 1.9Mb + ``` + +# 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 re-building of vignette outputs ... ERROR + ``` + 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.ai + +
+ +* Version: 0.1.1 +* GitHub: https://github.com/spsanderson/healthyR.ai +* Source code: https://github.com/cran/healthyR.ai +* Date/Publication: 2025-04-24 11:40:17 UTC +* Number of recursive dependencies: 204 + +Run `revdepcheck::cloud_details(, "healthyR.ai")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘healthyR.ai-Ex.R’ failed + The error most likely occurred in: + + > ### Name: pca_your_recipe + > ### Title: Perform PCA + > ### Aliases: pca_your_recipe + > + > ### ** Examples + > + > suppressPackageStartupMessages(library(timetk)) + ... + + step_rm(matches("(iso$)|(xts$)|(hour)|(min)|(sec)|(am.pm)")) + > + > output_list <- pca_your_recipe(rec_obj, .data = data_tbl) + Warning: ! The following columns have zero variance so scaling cannot be used: + date_col_day, date_col_mday, date_col_mweek, and date_col_mday7. + ℹ Consider using ?step_zv (`?recipes::step_zv()`) to remove those columns + before normalizing. + Error in pm[[2]] : subscript out of bounds + Calls: pca_your_recipe -> -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘auto-kmeans.Rmd’ using rmarkdown + --- finished re-building ‘auto-kmeans.Rmd’ + + --- re-building ‘getting-started.Rmd’ using rmarkdown + + Quitting from getting-started.Rmd:106-113 [pca_your_rec] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ... + 2. ├─plotly::ggplotly(loadings_plt) + 3. └─plotly:::ggplotly.ggplot(loadings_plt) + 4. └─plotly::gg2list(...) + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'getting-started.Rmd' failed with diagnostics: + subscript out of bounds + --- failed re-building ‘getting-started.Rmd’ + + --- re-building ‘kmeans-umap.Rmd’ using rmarkdown + ``` + +# healthyR.ts + +
+ +* 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: 210 + +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 re-building of vignette outputs ... ERROR + ``` + 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.3Mb + ``` + +# 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: 109 + +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 re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘heatmaply.Rmd’ using rmarkdown + + Quitting from heatmaply.Rmd:108-111 [unnamed-chunk-5] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ! subscript out of bounds + --- + Backtrace: + ... + + 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 + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) heatmaply.Rd:282: Lost braces + 282 | row and column dendrograms. The default uses stats{reorder.dendrogram}} + | ^ + checkRd: (-1) heatmapr.Rd:93: Lost braces + 93 | \item{reorderfun}{function(d, w) of dendrogram and weights for reordering the row and column dendrograms. The default uses stats{reorder.dendrogram}} + | ^ + checkRd: (-1) is.plotly.Rd:16: Lost braces + 16 | Helpful for the plot_method in link{heatmaply}. + | ^ + ``` + +# hesim + +
+ +* 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: 104 + +Run `revdepcheck::cloud_details(, "hesim")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(hesim) + > + > test_check("hesim") + sample = 1 + sample = 2 + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 1121 ] + ... + ── 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 4 | WARN 0 | SKIP 0 | PASS 1121 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 35.9Mb + sub-directories of 1Mb or more: + R 1.5Mb + doc 2.2Mb + libs 30.8Mb + ``` + +# hmer + +
+ +* Version: 1.6.0 +* GitHub: https://github.com/andy-iskauskas/hmer +* Source code: https://github.com/cran/hmer +* Date/Publication: 2024-05-31 13:30:07 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "hmer")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘hmer-Ex.R’ failed + The error most likely occurred in: + + > ### Name: Proto_emulator + > ### Title: Prototype Class for Emulator-like Objects + > ### Aliases: Proto_emulator + > + > ### ** Examples + > + > # Use linear regression with an "error" on the SIR dataset. + ... + 5.0845280 2.5233162 2.1004352 5.5958288 6.2210115 5.0446000 5.2278751 2.7367493 + 71 72 73 74 75 76 77 78 + 0.8839762 2.3799804 3.1068393 1.6507576 3.3745018 3.6494126 2.8932212 7.9416568 + 79 80 81 82 83 84 85 86 + 0.3464207 3.1117428 0.7681329 5.7715196 4.8774590 3.9468858 4.3563842 2.2535948 + 87 88 89 90 + 1.8418017 8.3594335 2.3102947 2.6746812 + > emulator_plot(proto_ems) + Error: C stack usage 9961732 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘demonstrating-the-hmer-package.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.5Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 2.0Mb + doc 1.5Mb + ``` + +# hmsidwR + +
+ +* 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: 175 + +Run `revdepcheck::cloud_details(, "hmsidwR")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘hmsidwR.Rmd’ using rmarkdown + + Quitting from hmsidwR.Rmd:51-84 [unnamed-chunk-6] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ! subscript out of bounds + --- + ... + + 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 + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.2Mb + sub-directories of 1Mb or more: + data 2.0Mb + doc 4.0Mb + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 1686 marked UTF-8 strings + ``` + +# hoopR + +
+ +* Version: 2.1.0 +* GitHub: https://github.com/sportsdataverse/hoopR +* Source code: https://github.com/cran/hoopR +* Date/Publication: 2023-11-25 23:40:20 UTC +* Number of recursive dependencies: 113 + +Run `revdepcheck::cloud_details(, "hoopR")` for more info + +
+ +## Newly broken + +* checking installed package size ... NOTE + ``` + installed size is 5.2Mb + sub-directories of 1Mb or more: + R 1.5Mb + help 3.5Mb + ``` + +# hrbrthemes + +
+ +* Version: 0.8.7 +* GitHub: NA +* Source code: https://github.com/cran/hrbrthemes +* Date/Publication: 2024-03-04 00:20:02 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "hrbrthemes")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘test-all.R’ + Running the tests in ‘tests/test-all.R’ failed. + Complete output: + > library(testthat) + > test_check("hrbrthemes") + Loading required package: hrbrthemes + [ FAIL 1 | WARN 0 | SKIP 2 | PASS 9 ] + + ══ Skipped tests (2) ═══════════════════════════════════════════════════════════ + • On CRAN (2): 'test-hrbrthemes.R:71:3', 'test-themes.R:4:3' + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-hrbrthemes.R:16:3'): we can do something ───────────────────── + `gg_check(gg_tmp)` did not produce any messages. + + [ FAIL 1 | WARN 0 | SKIP 2 | PASS 9 ] + Deleting unused snapshots: + • themes/theme-ipsum-rc.svg + • themes/theme-ipsum.svg + Error: Test failures + Execution halted + ``` + +# hstats + +
+ +* Version: 1.2.1 +* GitHub: https://github.com/ModelOriented/hstats +* Source code: https://github.com/cran/hstats +* Date/Publication: 2024-08-17 15:50:09 UTC +* Number of recursive dependencies: 43 + +Run `revdepcheck::cloud_details(, "hstats")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘hstats-Ex.R’ failed + The error most likely occurred in: + + > ### Name: average_loss + > ### Title: Average Loss + > ### Aliases: average_loss average_loss.default average_loss.ranger + > ### average_loss.explainer + > + > ### ** Examples + > + ... + Average loss + Sepal.Length Sepal.Width + setosa 0.004646018 0.011500586 + versicolor 0.003121888 0.007489254 + virginica 0.002525590 0.007419552 + > plot(L) + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +# HVT + +
+ +* Version: 25.2.3 +* GitHub: https://github.com/Mu-Sigma/HVT +* Source code: https://github.com/cran/HVT +* Date/Publication: 2025-03-27 11:40:13 UTC +* Number of recursive dependencies: 208 + +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: clustHVT + > ### Title: Performing Hierarchical Clustering Analysis + > ### Aliases: clustHVT + > ### Keywords: Clustering_Analysis + > + > ### ** Examples + > + ... + > scoring <- scoreHVT(dataset, hvt.results, analysis.plots = TRUE, names.column = dataset[,1]) + Scale for colour is already present. + Adding another scale for colour, which will replace the existing scale. + 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. + Error in pm[[2]] : subscript out of bounds + Calls: scoreHVT + Execution halted + ``` + +# hyperoverlap + +
+ +* Version: 1.1.1 +* GitHub: NA +* Source code: https://github.com/cran/hyperoverlap +* Date/Publication: 2021-08-10 08:30:05 UTC +* Number of recursive dependencies: 106 + +Run `revdepcheck::cloud_details(, "hyperoverlap")` for more info + +
+ +## Newly broken + +* checking whether package ‘hyperoverlap’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘hyperoverlap’ + See ‘/tmp/workdir/hyperoverlap/new/hyperoverlap.Rcheck/00install.out’ for details. + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.5Mb + sub-directories of 1Mb or more: + doc 6.3Mb + ``` + +# hypervolume + +
+ +* Version: 3.1.5 +* GitHub: https://github.com/bblonder/hypervolume +* Source code: https://github.com/cran/hypervolume +* Date/Publication: 2025-01-17 20:50:16 UTC +* Number of recursive dependencies: 143 + +Run `revdepcheck::cloud_details(, "hypervolume")` for more info + +
+ +## Newly broken + +* checking whether package ‘hypervolume’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘hypervolume’ + See ‘/tmp/workdir/hypervolume/new/hypervolume.Rcheck/00install.out’ for details. + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.4Mb + sub-directories of 1Mb or more: + doc 2.8Mb + libs 2.4Mb + ``` + +# 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: 94 + +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. + ``` + +# ibawds + +
+ +* Version: 1.1.0 +* GitHub: https://github.com/stibu81/ibawds +* Source code: https://github.com/cran/ibawds +* Date/Publication: 2025-03-07 16:20:05 UTC +* Number of recursive dependencies: 217 + +Run `revdepcheck::cloud_details(, "ibawds")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ibawds) + Loading required package: dslabs + > + > test_check("ibawds") + [ FAIL 2 | WARN 0 | SKIP 14 | PASS 157 ] + ... + • dist_plots/density-plot-poisson.svg + • dist_plots/density-plot-weibull.svg + • dist_plots/distribution-plot-poisson-continuous.svg + • dist_plots/distribution-plot-uniform.svg + • voronoi/voronoi-suppress-data.svg + • voronoi/voronoi-uncoloured-data.svg + • voronoi/voronoi-with-data.svg + • voronoi/voronoi-with-options.svg + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 1 marked UTF-8 string + ``` + +# ichimoku + +
+ +* Version: 1.5.6 +* GitHub: https://github.com/shikokuchuo/ichimoku +* Source code: https://github.com/cran/ichimoku +* Date/Publication: 2025-03-14 18:00:05 UTC +* Number of recursive dependencies: 78 + +Run `revdepcheck::cloud_details(, "ichimoku")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ichimoku) + > + > test_check("ichimoku") + Data verified by SHA256: 02a4376885505a161032f4f4d4240798c6e776943dbaa54f374f92b2fccea1a9 + Data verified by SHA256: 02a4376885505a161032f4f4d4240798c6e776943dbaa54f374f92b2fccea1a9 + Loading required package: shiny + ... + 34. │ └─base (local) doWithOneRestart(return(expr), restart) + 35. └─vctrs::stop_incompatible_cast(...) + 36. └─vctrs::stop_incompatible_type(...) + 37. └─vctrs:::stop_incompatible(...) + 38. └─vctrs:::stop_vctrs(...) + 39. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 208 ] + Error: Test failures + Execution halted + ``` + +# ICSClust + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/AuroreAA/ICSClust +* Source code: https://github.com/cran/ICSClust +* Date/Publication: 2023-09-21 13:20:02 UTC +* Number of recursive dependencies: 133 + +Run `revdepcheck::cloud_details(, "ICSClust")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ICSClust-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ICSClust + > ### Title: Tandem clustering with ICS + > ### Aliases: ICSClust + > + > ### ** Examples + > + > X <- iris[,1:4] + ... + + 2 components are selected: IC.4 IC.1 + + 3 clusters are identified: + + 1 2 3 + 44 57 49 + > plot(out) + Error: C stack usage 9962308 is too close to the limit + 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 + ... + [ FAIL 1 | WARN 7 | SKIP 0 | PASS 80 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Error ('test-plots.R:197:1'): component plot on ICS object with select from ICSç ── + + Error: C stack usage 9963620 is too close to the limit + + [ FAIL 1 | WARN 7 | SKIP 0 | PASS 80 ] + Error: Test failures + Execution halted + ``` + +# ICtest + +
+ +* Version: 0.3-6 +* GitHub: NA +* Source code: https://github.com/cran/ICtest +* Date/Publication: 2025-05-27 23:20:05 UTC +* Number of recursive dependencies: 83 + +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: ggladleplot + > ### Title: Ladle Plot for an Object of Class ladle Using ggplot2 + > ### Aliases: ggladleplot + > ### Keywords: hplot + > + > ### ** Examples + > + > n <- 1000 + > X <- cbind(rexp(n), rt(n,5), rnorm(n), rnorm(n), rnorm(n), rnorm(n)) + > test <- FOBIladle(X) + > ggladleplot(test) + Error: C stack usage 9965652 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ICA.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.6Mb + sub-directories of 1Mb or more: + doc 2.2Mb + libs 3.0Mb + ``` + +# ImHD + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/ImHD +* Date/Publication: 2023-09-12 06:12:44 UTC +* Number of recursive dependencies: 39 + +Run `revdepcheck::cloud_details(, "ImHD")` for more info + +
+ +## Newly broken + +* checking whether package ‘ImHD’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘ImHD’ + See ‘/tmp/workdir/ImHD/new/ImHD.Rcheck/00install.out’ for details. + ``` + +# implicitMeasures + +
+ +* Version: 0.2.1 +* GitHub: NA +* Source code: https://github.com/cran/implicitMeasures +* Date/Publication: 2022-02-16 13:40:13 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "implicitMeasures")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(implicitMeasures) + > + > test_check("implicitMeasures") + [ FAIL 7 | WARN 2 | SKIP 2 | PASS 69 ] + + ... + 5. └─implicitMeasures::multi_dscore(iat_data, ds = "error-inflation") + 6. └─ggplot2::geom_violin(draw_quantiles = TRUE) + 7. └─ggplot2:::check_numeric(draw_quantiles) + 8. └─ggplot2:::check_object(x, is.numeric, what, ..., arg = arg, call = call) + 9. └─ggplot2:::stop_input_type(...) + 10. └─rlang::abort(message, ..., call = call, arg = arg) + + [ FAIL 7 | WARN 2 | SKIP 2 | PASS 69 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘IAT-example.Rmd’ using rmarkdown + ``` + +# imputeTS + +
+ +* Version: 3.3 +* GitHub: https://github.com/SteffenMoritz/imputeTS +* Source code: https://github.com/cran/imputeTS +* Date/Publication: 2022-09-09 06:52:55 UTC +* Number of recursive dependencies: 111 + +Run `revdepcheck::cloud_details(, "imputeTS")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > test_check("imputeTS") + Loading required package: imputeTS + [ FAIL 43 | WARN 18 | SKIP 52 | PASS 411 ] + + ══ Skipped tests (52) ══════════════════════════════════════════════════════════ + • On CRAN (52): 'test-ggplot_na_distribution.R:59:3', + ... + `expected`: TRUE + ── Failure ('test-ggplot_na_imputations.R:81:5'): Check that all parameters of plot run without error ── + is.list(...) is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 43 | WARN 18 | SKIP 52 | PASS 411 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + --- re-building ‘Cheat_Sheet_imputeTS.pdf.asis’ using asis + --- finished re-building ‘Cheat_Sheet_imputeTS.pdf.asis’ + + --- re-building ‘imputeTS-Time-Series-Missing-Value-Imputation-in-R.ltx’ using tex + Error: processing vignette 'imputeTS-Time-Series-Missing-Value-Imputation-in-R.ltx' failed with diagnostics: + Running 'texi2dvi' on 'imputeTS-Time-Series-Missing-Value-Imputation-in-R.ltx' failed. + LaTeX errors: + ! LaTeX Error: File `etex.sty' not found. + + ... + + ! Emergency stop. + + + l.5 \usepackage + [utf8]{inputenc}^^M + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘imputeTS-Time-Series-Missing-Value-Imputation-in-R.ltx’ + + --- re-building ‘gallery_visualizations.Rmd’ using rmarkdown + ``` + +* checking installed package size ... NOTE + ``` + installed size is 5.7Mb + sub-directories of 1Mb or more: + data 2.0Mb + doc 1.1Mb + libs 1.9Mb + ``` + +# imsig + +
+ +* Version: 1.1.3 +* GitHub: https://github.com/ajitjohnson/imsig +* Source code: https://github.com/cran/imsig +* Date/Publication: 2021-01-10 01:00:02 UTC +* Number of recursive dependencies: 49 + +Run `revdepcheck::cloud_details(, "imsig")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘imsig-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_survival + > ### Title: Forest plot of survial analysis by ImSig + > ### Aliases: plot_survival + > + > ### ** Examples + > + > plot_survival (exp = example_data, r = 0.7, cli = example_cli, time = 'time', status= 'status') + Error: object properties are invalid: + - @colour must be , , or , not + Execution halted + ``` + +# incidence + +
+ +* Version: 1.7.5 +* GitHub: https://github.com/reconhub/incidence +* Source code: https://github.com/cran/incidence +* Date/Publication: 2024-05-31 10:10:02 UTC +* Number of recursive dependencies: 66 + +Run `revdepcheck::cloud_details(, "incidence")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘incidence-Ex.R’ failed + The error most likely occurred in: + + > ### Name: get_fit + > ### Title: Accessors for 'incidence_fit' objects + > ### Aliases: get_fit get_fit.incidence_fit get_fit.incidence_fit_list + > ### get_info get_info.incidence_fit get_info.incidence_fit_list + > + > ### ** Examples + > + ... + + })} + Loading required package: outbreaks + > dat <- ebola_sim$linelist$date_of_onset + > sex <- ebola_sim$linelist$gender + > i.sex <- incidence(dat, interval = 7, group = sex) + > fits <- fit_optim_split(i.sex, separate_split = TRUE) + Error in names(out$plot) <- names(res) : + invalid to use names()<- on an S4 object of class 'ggplot2::ggplot' + Calls: withAutoprint ... source -> withVisible -> eval -> eval -> fit_optim_split + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(incidence) + > + > test_check("incidence") + [ FAIL 1 | WARN 0 | SKIP 18 | PASS 213 ] + + ══ Skipped tests (18) ══════════════════════════════════════════════════════════ + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Error ('test-accessors.R:156:1'): (code run outside of `test_that()`) ─────── + Error in `names(out$plot) <- names(res)`: invalid to use names()<- on an S4 object of class 'ggplot2::ggplot' + Backtrace: + ▆ + 1. └─incidence::fit_optim_split(i.sex.o) at test-accessors.R:156:1 + + [ FAIL 1 | WARN 0 | SKIP 18 | PASS 213 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘conversions.Rmd’ using rmarkdown + ``` + +# infer + +
+ +* Version: 1.0.8 +* GitHub: https://github.com/tidymodels/infer +* Source code: https://github.com/cran/infer +* Date/Publication: 2025-04-14 17:20:02 UTC +* Number of recursive dependencies: 125 + +Run `revdepcheck::cloud_details(, "infer")` 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 + ... + • visualize/viz-assume-z-p-val-right.svg + • visualize/viz-assume-z.svg + • visualize/viz-fit-bare.svg + • visualize/viz-fit-conf-int.svg + • visualize/viz-fit-no-h0.svg + • visualize/viz-fit-p-val-both.svg + • visualize/viz-fit-p-val-left.svg + • visualize/viz-fit-p-val-right.svg + Error: Test failures + Execution halted + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.infer_layer: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# inferCSN + +
+ +* Version: 1.1.7 +* GitHub: https://github.com/mengxu98/inferCSN +* Source code: https://github.com/cran/inferCSN +* Date/Publication: 2025-03-30 17:00:02 UTC +* Number of recursive dependencies: 187 + +Run `revdepcheck::cloud_details(, "inferCSN")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘inferCSN-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_dynamic_networks + > ### Title: Plot dynamic networks + > ### Aliases: plot_dynamic_networks + > + > ### ** Examples + > + > data("example_matrix") + ... + + ) + > + > 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 + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 27.7Mb + sub-directories of 1Mb or more: + data 2.0Mb + libs 25.1Mb + ``` + +# 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: 110 + +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 59 | WARN 0 | SKIP 0 | PASS 881 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Error in `geom_point(mapping = do.call(aes, c(aesBase, list(y = sym("meanVar")), + if (!is.null(colorVar) & useShape) list(shape = sym("colorVar")))), + position = pd, size = sizePoint, data = data)`: Problem while setting up geom aesthetics. + ℹ Error occurred in the 2nd layer. + Caused by error in `list_sizes()`: + ! `x$size` must be a vector, not a object. + + [ FAIL 59 | WARN 0 | SKIP 0 | PASS 881 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + 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 inTextSummaryTable-aesthetics.Rmd:210-224 [aesthetics-defaultsVisualization] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + ... + Error: processing vignette 'inTextSummaryTable-visualization.Rmd' failed with diagnostics: + The `plot.margin` theme element must be a vector of length 4 + --- 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.2Mb + sub-directories of 1Mb or more: + doc 9.7Mb + ``` + +# inventorize + +
+ +* Version: 1.1.2 +* GitHub: NA +* Source code: https://github.com/cran/inventorize +* Date/Publication: 2025-05-28 13:20:02 UTC +* Number of recursive dependencies: 69 + +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) + + +``` +# iNZightTS + +
+ +* Version: 2.0.0 +* GitHub: https://github.com/iNZightVIT/iNZightTS +* Source code: https://github.com/cran/iNZightTS +* Date/Publication: 2024-01-17 06:20:02 UTC +* Number of recursive dependencies: 91 + +Run `revdepcheck::cloud_details(, "iNZightTS")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(iNZightTS) + > + > test_check("iNZightTS") + [ FAIL 6 | WARN 3 | SKIP 0 | PASS 91 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ▆ + 1. ├─base::plot(tm, names(tm)[-1], xlim = c(2000, 2011)) at test_subset.R:44:5 + 2. └─iNZightTS:::plot.inz_ts(tm, names(tm)[-1], xlim = c(2000, 2011)) + 3. ├─(function(.) structure(., use.plotly = ggplotable(.)))(...) + 4. │ └─base::structure(., use.plotly = ggplotable(.)) + 5. └─S7:::Ops.S7_object(...) + + [ FAIL 6 | WARN 3 | SKIP 0 | PASS 91 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘plotly’ + ``` + +# ipsRdbs + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/sujit-sahu/ipsRdbs +* Source code: https://github.com/cran/ipsRdbs +* Date/Publication: 2024-04-10 17:20:03 UTC +* Number of recursive dependencies: 92 + +Run `revdepcheck::cloud_details(, "ipsRdbs")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘vignette.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.6Mb + sub-directories of 1Mb or more: + doc 5.2Mb + ``` + +# 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: 82 + +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) + ... + 19. │ └─self$stat$setup_params(data, self$stat_params) + 20. │ └─ggplot2 (local) setup_params(...) + 21. │ └─base::match.fun(method) + 22. │ └─base::get(as.character(FUN), mode = "function", envir = envir) + 23. └─base::.handleSimpleError(...) + 24. └─rlang (local) h(simpleError(msg, call)) + 25. └─handlers[[1L]](cnd) + 26. └─cli::cli_abort(...) + 27. └─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 + ``` + +# 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: 120 + +Run `revdepcheck::cloud_details(, "isoorbi")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(dplyr) + + Attaching package: 'dplyr' + + The following object is masked from 'package:testthat': + + ... + ── Failure ('test_plotting_functions.R:107:3'): orbi_plot_raw_data() tests ───── + orbi_plot_raw_data(df, y = "ratio") has type 'object', not 'list'. + ── Failure ('test_plotting_functions.R:139:3'): orbi_plot_isotopocule_coverage() tests ── + `fig` has type 'object', not 'list'. + ── Failure ('test_shotnoise_functions.R:94:3'): orbi_plot_shot_noise() tests ─── + orbi_plot_shot_noise(df, "time.min") has type 'object', not 'list'. + + [ FAIL 5 | WARN 1 | SKIP 0 | PASS 350 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.3Mb + sub-directories of 1Mb or more: + doc 2.0Mb + extdata 3.3Mb + ``` + +# jskm + +
+ +* Version: 0.5.11 +* GitHub: https://github.com/jinseob2kim/jstable +* Source code: https://github.com/cran/jskm +* Date/Publication: 2025-03-20 03:10:02 UTC +* Number of recursive dependencies: 109 + +Run `revdepcheck::cloud_details(, "jskm")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘jskm.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: 87 + +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.7 +* GitHub: https://github.com/silvaneojunior/kDGLM +* Source code: https://github.com/cran/kDGLM +* Date/Publication: 2025-03-20 01:00:03 UTC +* Number of recursive dependencies: 133 + +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 + > + > + ... + 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 + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘example1.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 10.9Mb + sub-directories of 1Mb or more: + doc 9.9Mb + ``` + +# khroma + +
+ +* Version: 1.16.0 +* GitHub: NA +* Source code: https://github.com/cran/khroma +* Date/Publication: 2025-02-25 17:40:05 UTC +* Number of recursive dependencies: 72 + +Run `revdepcheck::cloud_details(, "khroma")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘khroma-Ex.R’ failed + The error most likely occurred in: + + > ### Name: scale_colour_land + > ### Title: AVHRR Global Land Cover Classification Color Scheme for + > ### 'ggplot2' and 'ggraph' + > ### Aliases: scale_colour_land scale_color_land scale_fill_land + > ### scale_edge_colour_land scale_edge_color_land scale_edge_fill_land + > + > ### ** Examples + ... + 24. └─vctrs::vec_default_cast(...) + 25. ├─base::withRestarts(...) + 26. │ └─base (local) withOneRestart(expr, restarts[[1L]]) + 27. │ └─base (local) doWithOneRestart(return(expr), restart) + 28. └─vctrs::stop_incompatible_cast(...) + 29. └─vctrs::stop_incompatible_type(...) + 30. └─vctrs:::stop_incompatible(...) + 31. └─vctrs:::stop_vctrs(...) + 32. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + Execution halted + ``` + +# lares + +
+ +* Version: 5.2.13 +* GitHub: https://github.com/laresbernardo/lares +* Source code: https://github.com/cran/lares +* Date/Publication: 2025-02-19 15:20:02 UTC +* Number of recursive dependencies: 96 + +Run `revdepcheck::cloud_details(, "lares")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘lares-Ex.R’ failed + The error most likely occurred in: + + > ### Name: clusterKmeans + > ### Title: Automated K-Means Clustering + PCA/t-SNE + > ### Aliases: clusterKmeans + > + > ### ** Examples + > + > Sys.unsetenv("LARES_FONT") # Temporal + ... + > + > # If dataset has +5 columns, feel free to reduce dimenstionalities + > # with reduce_pca() or reduce_tsne() first + > + > # Find optimal k + > check_k <- clusterKmeans(df, limit = 10) + >>> Removed duplicate obserations: 1 + Error: object properties are invalid: + - @family must be or , not + 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: 142 + +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.010 0.010 0.021 + > # 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 Rd files ... NOTE + ``` + checkRd: (-1) evaluation.Rd:38: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) evaluation.Rd:39: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) evaluation.Rd:40: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) evaluation.Rd:41: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) evaluation.Rd:42: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) evaluation.Rd:43: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) evaluation.Rd:44: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) evaluation.Rd:45: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) evaluation.Rd:46: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) evaluation.Rd:47: Lost braces in \itemize; \value handles \item{}{} directly + ... + checkRd: (-1) gen_data.Rd:35: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) gen_data.Rd:36-37: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) get_types.Rd:17: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) interpolation.Rd:23: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) interpolation.Rd:24: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) latentcor.Rd:38: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) latentcor.Rd:39: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) latentcor.Rd:40: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) latentcor.Rd:41: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) latentcor.Rd:42: Lost braces in \itemize; \value handles \item{}{} directly + ``` + +# latrend + +
+ +* Version: 1.6.1 +* GitHub: https://github.com/philips-software/latrend +* Source code: https://github.com/cran/latrend +* Date/Publication: 2024-05-15 11:50:02 UTC +* Number of recursive dependencies: 237 + +Run `revdepcheck::cloud_details(, "latrend")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘latrend-Ex.R’ failed + The error most likely occurred in: + + > ### Name: qqPlot + > ### Title: Quantile-quantile plot + > ### Aliases: qqPlot + > + > ### ** Examples + > + > data(latrendData) + ... + 26. │ └─ggplot2 (local) FUN(X[[i]], ...) + 27. │ └─self$draw_group(group, panel_params, coord, ...) + 28. │ └─ggplot2 (local) draw_group(...) + 29. │ └─ggplot2 (local) draw_group(..., self = self) + 30. └─base::.handleSimpleError(...) + 31. └─rlang (local) h(simpleError(msg, call)) + 32. └─handlers[[1L]](cnd) + 33. └─cli::cli_abort(...) + 34. └─rlang::abort(...) + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘demo.Rmd’ using rmarkdown + ``` + +# lcars + +
+ +* 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: 85 + +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() + ... + > + > len_frac <- c(0.3, 0.5, 0.2, 0.4, 0.3, 0.2, 0.1, 0.3) + > n_seg <- c(1, 2, 0, 8) + > + > library(ggplot2) + > g <- ggplot(iris, aes(Sepal.Length, Sepal.Width, color = Species)) + + + geom_point() + facet_wrap(~Species, 2) + theme_lcars_light() + Error: object properties are invalid: + - @family must be or , not + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘lcars.Rmd’ using rmarkdown + + Quitting from lcars.Rmd:20-54 [ex-1] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! object properties are invalid: + - @family must be or , not + --- + ... + Error: processing vignette 'lcars.Rmd' failed with diagnostics: + object properties are invalid: + - @family must be or , not + --- failed re-building ‘lcars.Rmd’ + + SUMMARY: processing the following file failed: + ‘lcars.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# legendry + +
+ +* Version: 0.2.2 +* GitHub: https://github.com/teunbrand/legendry +* Source code: https://github.com/cran/legendry +* Date/Publication: 2025-05-30 09:20:09 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "legendry")` for more info + +
+ +## Newly broken + +* checking whether the package can be loaded with stated dependencies ... WARNING + ``` + Loading required package: ggplot2 + Error: package or namespace load failed for ‘legendry’: + .onLoad failed in loadNamespace() for 'legendry', details: + call: getFromNamespace("class_mapping", "ggplot2") + error: could not find function "getFromNamespace" + Execution halted + + It looks like this package (or one of its dependent packages) has an + unstated dependence on a standard package. All dependencies must be + declared in DESCRIPTION. + See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ + manual. + ``` + +* checking whether the package can be unloaded cleanly ... WARNING + ``` + Error: package or namespace load failed for ‘legendry’: + .onLoad failed in loadNamespace() for 'legendry', details: + call: getFromNamespace("class_mapping", "ggplot2") + error: could not find function "getFromNamespace" + Execution halted + ``` + +* checking whether the namespace can be loaded with stated dependencies ... WARNING + ``` + Error: .onLoad failed in loadNamespace() for 'legendry', details: + call: getFromNamespace("class_mapping", "ggplot2") + error: could not find function "getFromNamespace" + Execution halted + + 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. + ``` + +* checking dependencies in R code ... NOTE + ``` + Error: .onLoad failed in loadNamespace() for 'legendry', details: + call: getFromNamespace("class_mapping", "ggplot2") + error: could not find function "getFromNamespace" + Call sequence: + 3: stop(gettextf("%s failed in %s() for '%s', details:\n call: %s\n error: %s", + hookname, "loadNamespace", pkgname, deparse(conditionCall(res))[1L], + conditionMessage(res)), call. = FALSE, domain = NA) + 2: runHook(".onLoad", env, package.lib, package) + 1: loadNamespace(package, lib.loc) + Execution halted + ``` + +* checking R code for possible problems ... NOTE + ``` + Error: .onLoad failed in loadNamespace() for 'legendry', details: + call: getFromNamespace("class_mapping", "ggplot2") + error: could not find function "getFromNamespace" + Execution halted + ``` + +# lemon + +
+ +* 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: 73 + +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: brackets_horizontal + > ### Title: Axis brackets instead of axis ticks and lines + > ### Aliases: brackets_horizontal brackets_horisontal brackets_vertical + > + > ### ** Examples + > + > library(ggplot2) + ... + + geom_point(position=position_jitter(width=0.3)) + + + theme_bw() + + + theme(panel.border = element_blank(), axis.line = element_line()) + > p + > + > p <- p + coord_flex_cart(bottom=brackets_horizontal(length=unit(0.08, 'npc'))) + > p + Error in as.unit(e2) : object is not coercible to a unit + Calls: ... render_axis_h -> bottom -> bottom -> unit.c -> Ops.unit -> as.unit + 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 { + ... + 16. └─gtable::gtable_add_row_space(panel_table, theme$panel.spacing.y %||% theme$panel.spacing) + 17. └─cli::cli_abort("{.arg height} must be of length 1 or nrow - 1") + 18. └─rlang::abort(...) + + [ FAIL 2 | WARN 14 | 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 re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘capped-axes.Rmd’ using rmarkdown + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_build: + function(plot, ...) + ggplot_build.lemon_plot: + function(plot) + + ggplot_add: + function(object, plot, ...) + ggplot_add.axis_annotation: + function(object, plot, object_name) + + ggplot_gtable: + function(plot) + ggplot_gtable.built_lemon: + function(data) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# lfproQC + +
+ +* 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: 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 re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘user_guide.Rmd’ using rmarkdown + + Quitting from user_guide.Rmd:54-56 [unnamed-chunk-8] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ! subscript out of bounds + --- + Backtrace: + ... + + 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 + ``` + +# 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.7. Type ?lgpr to get started. + > + ... + ── Failure ('test_misc-invgamma.R:34:3'): plotting the inverse gamma distribution works ── + `c1` not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + ── Failure ('test_misc-invgamma.R:35:3'): plotting the inverse gamma distribution works ── + `c2` not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 2 | WARN 2 | SKIP 0 | PASS 446 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 153.2Mb + sub-directories of 1Mb or more: + R 1.5Mb + libs 151.3Mb + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) prior_to_num.Rd:13: Lost braces; missing escapes or markup? + 13 | {'uniform', 'normal', 'student-t', 'gamma', 'inv-gamma', 'log-normal'} + | ^ + ``` + +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. + ``` + +# lionfish + +
+ +* Version: 1.0.27 +* GitHub: NA +* Source code: https://github.com/cran/lionfish +* Date/Publication: 2025-03-13 20:50:02 UTC +* Number of recursive dependencies: 126 + +Run `revdepcheck::cloud_details(, "lionfish")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Bioprocess-Optimization.Rmd’ using knitr + --- finished re-building ‘Bioprocess-Optimization.Rmd’ + + --- re-building ‘General-interactivity.Rmd’ using knitr + --- finished re-building ‘General-interactivity.Rmd’ + + --- re-building ‘Market-segmentation.Rmd’ using knitr + ``` + +# listdown + +
+ +* Version: 0.5.7 +* GitHub: https://github.com/kaneplusplus/listdown +* Source code: https://github.com/cran/listdown +* Date/Publication: 2023-04-03 00:30:02 UTC +* Number of recursive dependencies: 71 + +Run `revdepcheck::cloud_details(, "listdown")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘listdown-Ex.R’ failed + The error most likely occurred in: + + > ### Name: as_ld_yml + > ### Title: Turn a Computational Component List into YAML with Class + > ### Information + > ### Aliases: as_ld_yml + > + > ### ** Examples + > + ... + + as_ld_yml(cc_list) + + } + Loading required package: ggplot2 + Error in parse(text = paste("x", loc, " <<- list(paste(", deparse(class(elem)), : + :2:1: unexpected symbol + 1: x [[1]] <<- list(paste( c("ggplot2::ggplot", "ggplot", "ggplot2::gg", "S7_object", "gg" , collapse = ":")) + 2: x + ^ + Calls: as_ld_yml -> depth_first_copy -> eval -> parse + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.r’ + Running the tests in ‘tests/testthat.r’ failed. + Complete output: + > library(testthat) + > library(listdown) + > + > test_check("listdown") + [ FAIL 2 | WARN 0 | SKIP 1 | PASS 34 ] + + ══ Skipped tests (1) ═══════════════════════════════════════════════════════════ + ... + 5. └─listdown (local) depth_first_copy() + 6. ├─base::eval(...) + 7. └─base::parse(...) + ── Failure ('test-cc-dendro.r:20:3'): Dendrograms work. ──────────────────────── + ld_cc_dendro(cc_list) not equal to read_reference("cc-dendro.rds"). + 4 string mismatches + + [ FAIL 2 | WARN 0 | SKIP 1 | PASS 34 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package which this enhances but not available for checking: ‘workflowr’ + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) ld_build_html_site.Rd:41: Lost braces + 41 | directory specified by `rmd_dir`. Note that this is an {{rmarkdown}} + | ^ + checkRd: (-1) ld_create_doc.Rd:29: Lost braces + 29 | directory specified by `rmd_dir`. Note that this is an {{rmarkdown}} + | ^ + ``` + +# LMD + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/shubhra-opensource/LMD +* Source code: https://github.com/cran/LMD +* Date/Publication: 2022-09-20 09:56:07 UTC +* Number of recursive dependencies: 91 + +Run `revdepcheck::cloud_details(, "LMD")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘LMD-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_lmd + > ### Title: LMD Plot + > ### Aliases: plot_lmd + > ### Keywords: LMD PF Residue + > + > ### ** Examples + > + ... + > y = (2 / 3 )* sin(x * 30) + (2 / 3) * sin(x * 17.5) + (4 / 5) *cos(x * 2) + > plot_lmd(lmd(y)) + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the LMD package. + Please report the issue at + . + Error: object is invalid: + - every label must be named. + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Getting_Started_with_LMD.Rmd’ using rmarkdown + ``` + +# 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 re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘compare.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 10.2Mb + sub-directories of 1Mb or more: + doc 4.0Mb + libs 5.8Mb + ``` + +* 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. + ``` + +# longevity + +
+ +* Version: 1.2 +* GitHub: https://github.com/lbelzile/longevity +* Source code: https://github.com/cran/longevity +* Date/Publication: 2025-05-12 02:10:02 UTC +* Number of recursive dependencies: 53 + +Run `revdepcheck::cloud_details(, "longevity")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘longevity-Ex.R’ failed + The error most likely occurred in: + + > ### Name: autoplot.elife_par + > ### Title: Goodness-of-fit plots for parametric models + > ### Aliases: autoplot.elife_par plot.elife_par + > + > ### ** Examples + > + > set.seed(1234) + ... + + thresh = 0, + + event = ifelse(samp$rcens, 0L, 1L), + + type = "right", + + family = "exp", + + export = TRUE) + > plot(fitted, plot.type = "ggplot") + Error in get("print.ggplot", envir = loadNamespace("ggplot2")) : + object 'print.ggplot' not found + Calls: plot -> plot.elife_par -> lapply -> match.fun -> get + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > + > if ( requireNamespace("tinytest", quietly=TRUE) ){ + + tinytest::test_package("longevity") + + } + + test-S3methods.R.............. 0 tests + test-S3methods.R.............. 0 tests + ... + test-S3methods.R.............. 0 tests + test-S3methods.R.............. 0 tests + test-S3methods.R.............. 0 tests + test-S3methods.R.............. 0 tests + test-S3methods.R.............. 0 tests + test-S3methods.R.............. 0 tests + test-S3methods.R.............. 0 tests Error in get("print.ggplot", envir = loadNamespace("ggplot2")) : + object 'print.ggplot' not found + Calls: ... plot -> plot.elife_par -> lapply -> match.fun -> get + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 10.0Mb + sub-directories of 1Mb or more: + data 7.0Mb + libs 2.3Mb + ``` + +# LorenzRegression + +
+ +* Version: 2.1.0 +* GitHub: https://github.com/AlJacq/LorenzRegression +* Source code: https://github.com/cran/LorenzRegression +* Date/Publication: 2024-10-11 16:50:02 UTC +* Number of recursive dependencies: 82 + +Run `revdepcheck::cloud_details(, "LorenzRegression")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘LorenzRegression-Ex.R’ failed + The error most likely occurred in: + + > ### Name: Lorenz.Reg + > ### Title: Fits a Lorenz regression + > ### Aliases: Lorenz.Reg + > + > ### ** Examples + > + > data(Data.Incomes) + ... + 26. └─vctrs::vec_default_cast(...) + 27. ├─base::withRestarts(...) + 28. │ └─base (local) withOneRestart(expr, restarts[[1L]]) + 29. │ └─base (local) doWithOneRestart(return(expr), restart) + 30. └─vctrs::stop_incompatible_cast(...) + 31. └─vctrs::stop_incompatible_type(...) + 32. └─vctrs:::stop_incompatible(...) + 33. └─vctrs:::stop_vctrs(...) + 34. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + Execution halted + ``` + +# LSX + +
+ +* Version: 1.4.4 +* GitHub: https://github.com/koheiw/LSX +* Source code: https://github.com/cran/LSX +* Date/Publication: 2025-05-23 09:02:06 UTC +* Number of recursive dependencies: 91 + +Run `revdepcheck::cloud_details(, "LSX")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > require(testthat) + Loading required package: testthat + > require(quanteda) + Loading required package: quanteda + Package version: 4.3.0 + Unicode version: 15.1 + ... + ── Failure ('test-textplot.R:84:5'): textplot_components() works ─────────────── + class(textplot_components(lss_svd, 3, scale = "relative")) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + ── Failure ('test-textplot.R:109:5'): textplot_terms works even when frequency has zeros (#85) ── + class(textplot_terms(lss)) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 24 | WARN 0 | SKIP 10 | PASS 221 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 2096 marked UTF-8 strings + ``` + +# ltertools + +
+ +* Version: 2.0.0 +* GitHub: https://github.com/lter/ltertools +* Source code: https://github.com/cran/ltertools +* Date/Publication: 2025-03-26 18:30:02 UTC +* Number of recursive dependencies: 91 + +Run `revdepcheck::cloud_details(, "ltertools")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-site_timeline.R:15:3'): Outputs are correct ────────────────── + class(time_gg) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 36 ] + Error: Test failures + Execution halted + ``` + +# manydata + +
+ +* Version: 1.0.2 +* GitHub: https://github.com/globalgov/manydata +* Source code: https://github.com/cran/manydata +* Date/Publication: 2025-06-03 08:40:02 UTC +* Number of recursive dependencies: 116 + +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) + Loading required package: cli + Loading required package: dplyr + + Attaching package: 'dplyr' + + ... + ── Failure ('test_compare.R:6:3'): plot for compare_categories returns the correct output format ── + `db` has length 1, not length 11. + ── Failure ('test_compare.R:48:3'): compare_overlap() and return the correct output format ── + `pl` has type 'object', not 'list'. + ── Failure ('test_compare.R:60:3'): compare_missing() and plot_missing() returns the correct output format ── + `pl` has type 'object', not 'list'. + + [ FAIL 5 | WARN 1 | SKIP 3 | PASS 122 ] + Error: Test failures + Execution halted + ``` + +# manymodelr + +
+ +* Version: 0.3.9 +* GitHub: https://github.com/Nelson-Gon/manymodelr +* Source code: https://github.com/cran/manymodelr +* Date/Publication: 2025-03-20 07:20:02 UTC +* Number of recursive dependencies: 127 + +Run `revdepcheck::cloud_details(, "manymodelr")` for more info + +
+ +## Newly broken + +* checking whether package ‘manymodelr’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘manymodelr’ + See ‘/tmp/workdir/manymodelr/new/manymodelr.Rcheck/00install.out’ for details. + ``` + +# manynet + +
+ +* Version: 1.3.2 +* GitHub: https://github.com/stocnet/manynet +* Source code: https://github.com/cran/manynet +* Date/Publication: 2024-11-05 20:50:02 UTC +* Number of recursive dependencies: 143 + +Run `revdepcheck::cloud_details(, "manynet")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘manynet-Ex.R’ failed + The error most likely occurred in: + + > ### Name: make_play + > ### Title: Making diffusion models on networks + > ### Aliases: make_play play_diffusion play_diffusions + > + > ### ** Examples + > + > smeg <- generate_smallworld(15, 0.025) + ... + ! Only know how to add and/or objects + Backtrace: + ▆ + 1. ├─base::plot(play_diffusion(smeg, recovery = 0.4)) + 2. └─manynet:::plot.diff_model(play_diffusion(smeg, recovery = 0.4)) + 3. └─manynet:::`+.ggplot`(...) + 4. └─patchwork::wrap_plots(e1, e2, ...) + 5. └─cli::cli_abort("Only know how to add {.cls ggplot} and/or {.cls grob} objects") + 6. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(manynet) + > + > test_check("manynet") + Starting 2 test processes + [ FAIL 3 | WARN 0 | SKIP 21 | PASS 548 ] + + ... + 1. ├─base::plot(node_degree(ison_adolescents)) at test-measure_centrality.R:87:3 + 2. └─manynet:::plot.node_measure(node_degree(ison_adolescents)) + 3. └─manynet:::`+.ggplot`(...) + 4. └─patchwork::wrap_plots(e1, e2, ...) + 5. └─cli::cli_abort("Only know how to add {.cls ggplot} and/or {.cls grob} objects") + 6. └─rlang::abort(...) + + [ FAIL 3 | WARN 0 | SKIP 21 | PASS 548 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package which this enhances but not available for checking: ‘Rgraphviz’ + ``` + +* checking installed package size ... NOTE + ``` + installed size is 5.4Mb + sub-directories of 1Mb or more: + R 1.5Mb + tutorials 1.9Mb + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 7 marked UTF-8 strings + ``` + +# marquee + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/r-lib/marquee +* Source code: https://github.com/cran/marquee +* Date/Publication: 2025-01-20 16:01:56 UTC +* Number of recursive dependencies: 86 + +Run `revdepcheck::cloud_details(, "marquee")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘marquee-Ex.R’ failed + The error most likely occurred in: + + > ### Name: element_marquee + > ### Title: ggplot2 theme element supporting marquee syntax + > ### Aliases: element_marquee + > + > ### ** Examples + > + > ## Don't show: + ... + + What more could you _possibly_ want?") + + + theme(title = element_marquee()) + + ## Don't show: + + }) # examplesIf + > library(ggplot2) + > p <- ggplot(mtcars) + geom_point(aes(mpg, disp)) + labs(title = "A {.red *marquee*} title\n* Look at this bullet list\n\n* great, huh?") + + + theme_gray(base_size = 6) + theme(title = element_marquee()) + > plot(p) + Error: `object` must be an , not a S3 + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.9Mb + sub-directories of 1Mb or more: + doc 2.4Mb + libs 2.6Mb + ``` + +# matsindf + +
+ +* Version: 0.4.10 +* GitHub: https://github.com/MatthewHeun/matsindf +* Source code: https://github.com/cran/matsindf +* Date/Publication: 2025-05-26 06:10:02 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "matsindf")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘iris_pca.Rmd’ using rmarkdown + + Quitting from iris_pca.Rmd:86-97 [unnamed-chunk-4] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `as.vector()`: + ! cannot coerce type 'object' to vector of type 'character' + --- + Backtrace: + ... + 69. └─grid:::validDetails.text(x) + 70. ├─base::as.character(x$label) + 71. └─base::as.character.default(x$label) + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'iris_pca.Rmd' failed with diagnostics: + cannot coerce type 'object' to vector of type 'character' + --- failed re-building ‘iris_pca.Rmd’ + + --- re-building ‘matsindf.Rmd’ using rmarkdown + ``` + +# 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: 55 + +Run `revdepcheck::cloud_details(, "MaxWiK")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘User-Guide.Rmd’ using rmarkdown + # Input data + + ## Data format + + The data format of input should be numerical only in the form of data frame, for example: + + + ``` r + ... + + Error: processing vignette 'User-Guide.Rmd' failed with diagnostics: + `object` must be an , not a S3 + --- failed re-building ‘User-Guide.Rmd’ + + SUMMARY: processing the following file failed: + ‘User-Guide.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# MBMethPred + +
+ +* Version: 0.1.4.2 +* GitHub: https://github.com/sharifrahmanie/MBMethPred +* Source code: https://github.com/cran/MBMethPred +* Date/Publication: 2023-09-18 14:10:09 UTC +* Number of recursive dependencies: 139 + +Run `revdepcheck::cloud_details(, "MBMethPred")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(MBMethPred) + > + > test_check("MBMethPred") + y_pred + y_true Group3 SHH Group4 + Group3 1 0 0 + ... + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 11 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-BoxPlot.R:8:3'): MakeBoxPlot returns correct type ──────────── + BoxPlot(File = data) has type 'object', not 'list'. + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 11 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 10.2Mb + sub-directories of 1Mb or more: + R 3.0Mb + data 7.0Mb + ``` + +# mcp + +
+ +* Version: 0.3.4 +* GitHub: https://github.com/lindeloev/mcp +* Source code: https://github.com/cran/mcp +* Date/Publication: 2024-03-17 20:10:02 UTC +* Number of recursive dependencies: 97 + +Run `revdepcheck::cloud_details(, "mcp")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘mcp-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_pars + > ### Title: Plot individual parameters + > ### Aliases: plot_pars + > + > ### ** Examples + > + > # Typical usage. demo_fit is an mcpfit object. + > plot_pars(demo_fit) + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the bayesplot package. + Please report the issue at . + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(mcp) + > + > test_check("mcp") + [ FAIL 24 | WARN 2 | SKIP 6 | PASS 749 ] + + ══ Skipped tests (6) ═══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─mcp:::test_runs(model, ...) at tests/testthat/helper-runs.R:338:7 + 2. └─mcp:::test_plot_pars(fit) at tests/testthat/helper-runs.R:112:7 + 3. └─mcp::plot_pars(fit, type = "dens_overlay") at tests/testthat/helper-runs.R:171:3 + 4. └─S7:::Ops.S7_object(...) + + [ FAIL 24 | WARN 2 | SKIP 6 | PASS 749 ] + Error: Test failures + Execution halted + ``` + +# mcradds + +
+ +* Version: 1.1.1 +* GitHub: https://github.com/kaigu1990/mcradds +* Source code: https://github.com/cran/mcradds +* Date/Publication: 2024-08-30 04:30:01 UTC +* Number of recursive dependencies: 132 + +Run `revdepcheck::cloud_details(, "mcradds")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘mcradds-Ex.R’ failed + The error most likely occurred in: + + > ### Name: autoplot + > ### Title: Generate a 'ggplot' for Bland-Altman Plot and Regression Plot + > ### Aliases: autoplot autoplot,BAsummary-method autoplot,MCResult-method + > + > ### ** Examples + > + > # Specify the type for difference plot + ... + 5. └─ggplot2::build_ggplot(plot) + 6. ├─S7::S7_dispatch() + 7. └─ggplot2 (local) `method(build_ggplot, ggplot2::ggplot)`(...) + 8. └─ggplot2:::plot_theme(plot) + 9. └─ggplot2:::check_theme(theme) + 10. └─base::mapply(...) + 11. └─ggplot2 (local) ``(...) + 12. └─cli::cli_abort(...) + 13. └─rlang::abort(...) + 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/testing-design.html#sec-tests-files-overview + ... + 14. └─base::mapply(...) + 15. └─ggplot2 (local) ``(...) + 16. └─cli::cli_abort(...) + 17. └─rlang::abort(...) + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 154 ] + Deleting unused snapshots: + • autoplot/autoplot-basummary-with-relative-diff.svg + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘mcradds.Rmd’ using rmarkdown + + Quitting from mcradds.Rmd:474-482 [unnamed-chunk-35] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'mcradds.Rmd' failed with diagnostics: + The `plot.margin` theme element must be a vector of length 4 + --- failed re-building ‘mcradds.Rmd’ + + SUMMARY: processing the following file failed: + ‘mcradds.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# mcStats + +
+ +* Version: 0.1.2 +* GitHub: NA +* Source code: https://github.com/cran/mcStats +* Date/Publication: 2020-02-26 06:50:02 UTC +* Number of recursive dependencies: 53 + +Run `revdepcheck::cloud_details(, "mcStats")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(mcStats) + > + > test_check("mcStats") + [ FAIL 2 | WARN 2 | SKIP 0 | PASS 6 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + * Removed 420 rows containing missing values or values outside the scale range + (`geom_area()`). + * Removed 442 rows containing missing values or values outside the scale range + (`geom_area()`). + * Removed 184 rows containing missing values or values outside the scale range + (`geom_area()`). + + [ FAIL 2 | WARN 2 | SKIP 0 | PASS 6 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# meme + +
+ +* Version: 0.2.3 +* GitHub: https://github.com/GuangchuangYu/meme +* Source code: https://github.com/cran/meme +* Date/Publication: 2021-04-23 10:00:02 UTC +* Number of recursive dependencies: 64 + +Run `revdepcheck::cloud_details(, "meme")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘meme.Rmd’ using rmarkdown + ``` + +# MendelianRandomization + +
+ +* Version: 0.10.0 +* GitHub: NA +* Source code: https://github.com/cran/MendelianRandomization +* Date/Publication: 2024-04-12 10:10:02 UTC +* Number of recursive dependencies: 86 + +Run `revdepcheck::cloud_details(, "MendelianRandomization")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘MendelianRandomization-Ex.R’ failed + The error most likely occurred in: + + > ### Name: mr_plot + > ### Title: Draw a scatter plot of the genetic associations and/or causal + > ### estimates + > ### Aliases: mr_plot mr_plot,MRInput-method mr_plot,MRAll-method + > ### mr_plot,MRMVInput-method + > + > ### ** Examples + > + > mr_plot(mr_input(bx = ldlc, bxse = ldlcse, by = chdlodds, byse = chdloddsse), + + line="egger", orientate = TRUE) + Error in pm[[2]] : subscript out of bounds + Calls: mr_plot ... plotly_build -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.4Mb + sub-directories of 1Mb or more: + R 1.5Mb + libs 4.2Mb + ``` + +# metagam + +
+ +* Version: 0.4.0 +* GitHub: https://github.com/Lifebrain/metagam +* Source code: https://github.com/cran/metagam +* Date/Publication: 2023-05-05 18:20:06 UTC +* Number of recursive dependencies: 116 + +Run `revdepcheck::cloud_details(, "metagam")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘dominance.Rmd’ using rmarkdown + ``` + +# MetAlyzer + +
+ +* 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: 95 + +Run `revdepcheck::cloud_details(, "MetAlyzer")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘MetAlyzer-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plotly_scatter + > ### Title: Plotly Log2FC Scatter Plot + > ### Aliases: plotly_scatter + > + > ### ** Examples + > + > + ... + Warning: Partial NA coefficients for 2 probe(s) + > + > 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 + ``` + +# metan + +
+ +* Version: 1.19.0 +* GitHub: https://github.com/nepem-ufsc/metan +* Source code: https://github.com/cran/metan +* Date/Publication: 2024-12-15 01:00:02 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "metan")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘metan_start.Rmd’ using rmarkdown + ``` + +# MetaNet + +
+ +* Version: 0.2.5 +* GitHub: https://github.com/Asa12138/MetaNet +* Source code: https://github.com/cran/MetaNet +* Date/Publication: 2025-04-10 06:30:02 UTC +* Number of recursive dependencies: 174 + +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 + ... + 5. └─ggplot2::build_ggplot(plot) + 6. ├─S7::S7_dispatch() + 7. └─ggplot2 (local) `method(build_ggplot, ggplot2::ggplot)`(...) + 8. └─npscales$set_palettes(plot@theme) + 9. └─ggplot2 (local) set_palettes(..., self = self) + 10. ├─scales::as_continuous_pal(elem) + 11. └─scales:::as_continuous_pal.default(elem) + 12. └─cli::cli_abort("Cannot convert {.arg x} to a continuous palette.") + 13. └─rlang::abort(...) + Execution halted + ``` + +# metanetwork + +
+ +* Version: 0.7.0 +* GitHub: https://github.com/MarcOhlmann/metanetwork +* Source code: https://github.com/cran/metanetwork +* Date/Publication: 2022-12-05 14:10:02 UTC +* Number of recursive dependencies: 105 + +Run `revdepcheck::cloud_details(, "metanetwork")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘metanetwork-Ex.R’ failed + The error most likely occurred in: + + > ### Name: diff_plot + > ### Title: plot difference network + > ### Aliases: diff_plot + > + > ### ** Examples + > + > #on Angola dataset + ... + ℹ Call `igraph::upgrade_graph()` on it to use with the current igraph version. + For now we convert it on the fly... + plotting: X2003_Species - X1986_Species + mode is TL-tsne + beta = 0.05 + Epoch: Iteration #100 error is: 907.373467952717 + Epoch: Iteration #200 error is: 217.111280176298 + Epoch: Iteration #300 error is: 217.23002415391 + Error: C stack usage 9962612 is too close to the limit + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(metanetwork) + + Attaching package: 'metanetwork' + + The following object is masked from 'package:base': + + ... + [ FAIL 1 | WARN 2215 | SKIP 0 | PASS 70 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Error ('test-ggmetanet.R:72:1'): test legend for large networks ───────────── + + Error: C stack usage 9963252 is too close to the limit + + [ FAIL 1 | WARN 2215 | SKIP 0 | PASS 70 ] + Error: Test failures + Execution halted + ``` + +# metaquant + +
+ +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/metaquant +* Date/Publication: 2025-02-11 17:00:02 UTC +* Number of recursive dependencies: 76 + +Run `revdepcheck::cloud_details(, "metaquant")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘metaquant-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plotdist + > ### Title: Visualising Densities using Quantiles + > ### Aliases: plotdist + > + > ### ** Examples + > + > #Example dataset of 3-point summaries (min, med, max) for 2 groups + ... + + display.legend = TRUE, + + pooled.dist = TRUE + + ) + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the metaquant package. + Please report the issue to the authors. + Error in pm[[2]] : subscript out of bounds + Calls: plotdist -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +# metR + +
+ +* Version: 0.18.1 +* GitHub: https://github.com/eliocamp/metR +* Source code: https://github.com/cran/metR +* Date/Publication: 2025-05-13 06:30:01 UTC +* Number of recursive dependencies: 119 + +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_fill + > ### Title: Filled 2d contours of a 3d surface + > ### Aliases: geom_contour_fill stat_contour_fill StatContourFill + > ### Keywords: datasets + > + > ### ** Examples + > + ... + > ggplot(surface, aes(Var1, Var2, z = value)) + geom_contour_fill() + geom_contour(color = "black", + + size = 0.1) + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + > ggplot(surface, aes(Var1, Var2, z = value)) + geom_contour_fill(aes(fill = after_stat(level))) + > ggplot(surface, aes(Var1, Var2, z = value)) + geom_contour_fill(aes(fill = after_stat(level_d))) + Error in train(..., self = self) : + unused argument (call = scale_fill_discretised()) + Calls: ... -> train_df -> -> train -> + 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) + > + ... + 18. ├─ggplot2::guide_gengrob(params, theme) + 19. └─metR:::guide_gengrob.colorstrip(params, theme) + 20. └─grid::convertWidth(...) + 21. └─grid::convertUnit(...) + 22. ├─grid:::upgradeUnit(x) + 23. └─grid:::upgradeUnit.default(x) + + [ FAIL 1 | WARN 2 | SKIP 19 | PASS 184 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Visualization-tools.Rmd’ using knitr + + Quitting from Visualization-tools.Rmd:181-184 [unnamed-chunk-12] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `train()`: + ! unused argument (call = scale_fill_discretised()) + --- + Backtrace: + ... + --- 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: 0.2.0 +* GitHub: https://github.com/mfasiolo/mgcViz +* Source code: https://github.com/cran/mgcViz +* Date/Publication: 2025-04-11 11:30:07 UTC +* Number of recursive dependencies: 111 + +Run `revdepcheck::cloud_details(, "mgcViz")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘mgcViz-Ex.R’ failed + The error most likely occurred in: + + > ### Name: gridPrint + > ### Title: Plotting plotSmooth objects on a grid + > ### Aliases: gridPrint + > + > ### ** Examples + > + > library(mgcViz) + ... + > + > # All on one page, method 2: + > gridPrint(grobs = list(o1, o2, qpl), ncol = 2) + > + > # Works also when some ggplot objects are present + > gridPrint(o1, o2, qpl, ggplot(), ncol = 2) + Warning: %+% x was deprecated in ggplot2 4.0.0. + ℹ Please use + x instead. + Error: C stack usage 9963684 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘mgcviz.rmd’ using rmarkdown + ``` + +# MIC + +
+ +* Version: 1.1.0 +* GitHub: https://github.com/agerada/MIC +* Source code: https://github.com/cran/MIC +* Date/Publication: 2025-06-05 04:20:06 UTC +* Number of recursive dependencies: 145 + +Run `revdepcheck::cloud_details(, "MIC")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘MIC-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.mic_validation + > ### Title: Plot MIC validation results + > ### Aliases: plot.mic_validation + > + > ### ** Examples + > + > gold_standard <- c("<0.25", "8", "64", ">64") + ... + 6. ├─S7::S7_dispatch() + 7. └─ggplot2 (local) `method(gtable_ggplot, ggplot2::ggplot_built)`(data = ``) + 8. └─layout$render(geom_grobs, data, theme, plot@labels) + 9. └─ggplot2 (local) render(..., self = self) + 10. └─self$facet$draw_panels(...) + 11. └─lemon (local) draw_panels(...) + 12. └─gtable::gtable_add_col_space(panel_table, theme$panel.spacing.x %||% theme$panel.spacing) + 13. └─cli::cli_abort("{.arg width} must be of length 1 or ncol - 1") + 14. └─rlang::abort(...) + Execution halted + ``` + +# microeco + +
+ +* Version: 1.15.0 +* GitHub: https://github.com/ChiLiubio/microeco +* Source code: https://github.com/cran/microeco +* Date/Publication: 2025-05-18 11:10:02 UTC +* Number of recursive dependencies: 137 + +Run `revdepcheck::cloud_details(, "microeco")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘microeco-Ex.R’ failed + The error most likely occurred in: + + > ### Name: trans_beta + > ### Title: Create 'trans_beta' object for beta-diversity analysis + > ### Aliases: trans_beta + > + > ### ** Examples + > + > + ... + ! `mapping` must be created with `aes()`. + ✖ You've supplied an object. + Backtrace: + ▆ + 1. └─t1$plot_ordination(plot_type = "point") + 2. ├─ggplot2::ggplot(...) + 3. └─ggplot2:::ggplot.default(...) + 4. └─cli::cli_abort(...) + 5. └─rlang::abort(...) + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 8.5Mb + sub-directories of 1Mb or more: + R 2.0Mb + data 6.0Mb + ``` + +# 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: 96 + +Run `revdepcheck::cloud_details(, "migraph")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘migraph-Ex.R’ failed + The error most likely occurred in: + + > ### Name: regression + > ### Title: Linear and logistic regression for network data + > ### Aliases: regression net_regression + > + > ### ** Examples + > + > networkers <- ison_networkers %>% to_subgraph(Discipline == "Sociology") + ... + 4 sim Citations 39.4 3.13 0.1 + > glance(model1) + # A tibble: 1 × 8 + r.squared adj.r.squared sigma statistic p.value df df.residual nobs + + 1 0.0674 0.0570 48.9 6.46 0.000309 3 268 272 + > plot(model1) + Error in loadNamespace(x) : there is no package called ‘patchwork’ + Calls: plot ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart + Execution halted + ``` + +* 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 1 | SKIP 0 | PASS 34 ] + ... + 2. ├─migraph:::plot.network_test(cugtest) + 3. │ └─manynet:::`+.ggplot`(...) + 4. └─base::loadNamespace(x) + 5. └─base::withRestarts(stop(cond), retry_loadNamespace = function() NULL) + 6. └─base (local) withOneRestart(expr, restarts[[1L]]) + 7. └─base (local) doWithOneRestart(return(expr), restart) + + [ FAIL 2 | WARN 1 | SKIP 0 | PASS 34 ] + 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: 128 + +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 + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) create_grouped_data_partition.Rd:60: Lost braces; missing escapes or markup? + 60 | Zena Lapp, {zenalapp@umich.edu} + | ^ + checkRd: (-1) create_grouped_data_partition.Rd:62: Lost braces; missing escapes or markup? + 62 | Kelly Sovacool, {sovacool@umich.edu} + | ^ + checkRd: (-1) create_grouped_k_multifolds.Rd:30: Lost braces; missing escapes or markup? + 30 | Zena Lapp, {zenalapp@umich.edu} + | ^ + checkRd: (-1) get_partition_indices.Rd:58: Lost braces; missing escapes or markup? + 58 | Kelly Sovacool, {sovacool@umich.edu} + | ^ + checkRd: (-1) set_hparams_glmnet.Rd:16: Lost braces; missing escapes or markup? + 16 | Zena Lapp, {zenalapp@umich.edu} + | ^ + ``` + +# 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: 193 + +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: 124 + +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 7 | WARN 15 | SKIP 0 | PASS 196 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + y[1]: "list" + ── Failure ('test-plotscore.R:44:5'): Tests plotting scores ──────────────────── + typeof(plot_own) not equal to "list". + 1/1 mismatches + x[1]: "object" + y[1]: "list" + + [ FAIL 7 | WARN 15 | SKIP 0 | PASS 196 ] + Error: Test failures + Execution halted + ``` + +# MiRNAQCD + +
+ +* Version: 1.1.3 +* GitHub: NA +* Source code: https://github.com/cran/MiRNAQCD +* Date/Publication: 2023-05-02 07:00:02 UTC +* Number of recursive dependencies: 50 + +Run `revdepcheck::cloud_details(, "MiRNAQCD")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(MiRNAQCD) + > + > test_check("MiRNAQCD") + + ############################### + + ... + 3. ├─ggplot2::theme(...) + 4. │ └─ggplot2:::find_args(..., complete = NULL, validate = NULL) + 5. │ └─base::mget(args, envir = env) + 6. └─ggplot2::element_text(size = 14, face = "bold", color = 1) + 7. └─S7::new_object(...) + 8. └─S7::validate(object, recursive = !parent_validated) + + [ FAIL 1 | WARN 65 | SKIP 0 | PASS 12 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘qpdf’ + All declared Imports should be used. + ``` + +# MiscMetabar + +
+ +* Version: 0.14.2 +* GitHub: https://github.com/adrientaudiere/MiscMetabar +* Source code: https://github.com/cran/MiscMetabar +* Date/Publication: 2025-03-20 15:20:02 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: upset_pq + > ### Title: Make upset plot for phyloseq object. + > ### Aliases: upset_pq + > + > ### ** Examples + > + > if (requireNamespace("ComplexUpset")) { + ... + 27. │ └─ggplot2 (local) `method(merge_element, list(ggplot2::element, class_any))`(...) + 28. │ └─S7::props(old, idx) + 29. │ └─S7::check_is_S7(object) + 30. │ └─base::stop(msg, call. = FALSE) + 31. └─base::.handleSimpleError(...) + 32. └─rlang (local) h(simpleError(msg, call)) + 33. └─handlers[[1L]](cnd) + 34. └─cli::cli_abort(...) + 35. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + 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 + ... + + ══ 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. + ── Failure ('test_figures_beta_div.R:258:5'): upset_pq works with data_fungi dataset ── + `suppressMessages(upset_pq(data_fungi_mini, "Height"))` produced warnings. + + [ FAIL 2 | WARN 4 | SKIP 74 | PASS 80 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘MiscMetabar.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.2Mb + sub-directories of 1Mb or more: + data 2.0Mb + extdata 1.2Mb + ``` + +# miscset + +
+ +* Version: 1.1.0 +* GitHub: https://github.com/setempler/miscset +* Source code: https://github.com/cran/miscset +* Date/Publication: 2017-02-24 16:46:57 +* Number of recursive dependencies: 109 + +Run `revdepcheck::cloud_details(, "miscset")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘miscset.Rmd’ using rmarkdown + ``` + +# missingHE + +
+ +* Version: 1.5.0 +* GitHub: NA +* Source code: https://github.com/cran/missingHE +* Date/Publication: 2023-03-21 08:50:02 UTC +* Number of recursive dependencies: 151 + +Run `revdepcheck::cloud_details(, "missingHE")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘missingHE-Ex.R’ failed + The error most likely occurred in: + + > ### Name: hurdle + > ### Title: Full Bayesian Models to handle missingness in Economic + > ### Evaluations (Hurdle Models) + > ### Aliases: hurdle + > ### Keywords: CEA Hurdle JAGS Models data missing + > + > ### ** Examples + ... + > + > # Assess model convergence using graphical tools + > # Produce histograms of the posterior samples for the mean effects + > diag.hist <- diagnostic(model.hurdle, type = "histogram", param = "mu.e") + Loading required namespace: ggmcmc + Loading required namespace: mcmcplots + Loading required namespace: ggthemes + Loading required namespace: mcmcr + Error: C stack usage 9963188 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Fitting_MNAR_models_in_missingHE.Rmd’ using rmarkdown + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘mcmcr’ + All declared Imports should be used. + ``` + +# 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: 86 + +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 + ``` + +# mistr + +
+ +* Version: 0.0.6 +* GitHub: NA +* Source code: https://github.com/cran/mistr +* Date/Publication: 2023-02-22 15:20:03 UTC +* Number of recursive dependencies: 52 + +Run `revdepcheck::cloud_details(, "mistr")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘mistr-extensions.Rmd’ using rmarkdown + ! Package babel Error: Unknown option 'english'. Either you misspelled it + (babel) or the language definition file english.ldf + (babel) was not found. + (babel) There is a locale ini file for this language. + (babel) If it’s the main language, try adding `provide=*' + (babel) to the babel package options. + + Error: processing vignette 'mistr-extensions.Rmd' failed with diagnostics: + ... + + Error: processing vignette 'mistr-introduction.Rmd' failed with diagnostics: + LaTeX failed to compile /tmp/workdir/mistr/new/mistr.Rcheck/vign_test/mistr/vignettes/mistr-introduction.tex. See https://yihui.org/tinytex/r/#debugging for debugging tips. See mistr-introduction.log for more info. + --- failed re-building ‘mistr-introduction.Rmd’ + + SUMMARY: processing the following files failed: + ‘mistr-extensions.Rmd’ ‘mistr-introduction.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## Newly fixed + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + --- re-building ‘mistr-extensions.Rmd’ using rmarkdown + + tlmgr: Remote database at https://ctan.math.illinois.edu/systems/texlive/tlnet + (revision 75389 of the texlive-scripts package) + seems to be older than the local installation + (revision 75397 of texlive-scripts); + please use a different mirror and/or wait a day or two. + + + ... + + Error: processing vignette 'mistr-introduction.Rmd' failed with diagnostics: + LaTeX failed to compile /tmp/workdir/mistr/old/mistr.Rcheck/vign_test/mistr/vignettes/mistr-introduction.tex. See https://yihui.org/tinytex/r/#debugging for debugging tips. See mistr-introduction.log for more info. + --- failed re-building ‘mistr-introduction.Rmd’ + + SUMMARY: processing the following files failed: + ‘mistr-extensions.Rmd’ ‘mistr-introduction.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# mistral + +
+ +* Version: 2.2.2 +* GitHub: NA +* Source code: https://github.com/cran/mistral +* Date/Publication: 2024-01-17 13:40:02 UTC +* Number of recursive dependencies: 72 + +Run `revdepcheck::cloud_details(, "mistral")` for more info + +
+ +## Newly broken + +* checking whether package ‘mistral’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘mistral’ + See ‘/tmp/workdir/mistral/new/mistral.Rcheck/00install.out’ for details. + ``` + +# misty + +
+ +* Version: 0.7.2 +* GitHub: NA +* Source code: https://github.com/cran/misty +* Date/Publication: 2025-05-20 16:20:02 UTC +* Number of recursive dependencies: 86 + +Run `revdepcheck::cloud_details(, "misty")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘misty-Ex.R’ failed + The error most likely occurred in: + + > ### Name: na.pattern + > ### Title: Missing Data Pattern + > ### Aliases: na.pattern + > + > ### ** Examples + > + > # Example 1: Compute a summary of missing data patterns + ... + 26. └─ggplot2 (local) extract_key(...) + 27. └─Guide$extract_key(scale, aesthetic, ...) + 28. └─ggplot2 (local) extract_key(...) + 29. └─scale$get_labels(breaks) + 30. └─ggplot2 (local) get_labels(..., self = self) + 31. └─self$scale$get_labels(breaks) + 32. └─ggplot2 (local) get_labels(..., self = self) + 33. └─cli::cli_abort(...) + 34. └─rlang::abort(...) + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.6Mb + sub-directories of 1Mb or more: + R 4.0Mb + help 1.5Mb + ``` + +# MixLFA + +
+ +* Version: 1.0.0 +* GitHub: NA +* Source code: https://github.com/cran/MixLFA +* Date/Publication: 2024-10-17 16:00:05 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "MixLFA")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘MixLFA-Ex.R’ failed + The error most likely occurred in: + + > ### Name: stdUnique + > ### Title: Generate Standardized Uniqueness from MLFA Results + > ### Aliases: stdUnique + > + > ### ** Examples + > + > # Load the necessary datasets + ... + iteration 44 + iteration 45 + iteration 46 + iteration 47 + iteration 48 + iteration 49 + > # Generate the uniqueness plots for the first cluster + > stdUnique(result_MLFA, C=1) + Error: C stack usage 9964708 is too close to the limit + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 43.9Mb + sub-directories of 1Mb or more: + libs 43.6Mb + ``` + +# 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: 135 + +Run `revdepcheck::cloud_details(, "mixpoissonreg")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘influence-mixpoissonreg.Rmd’ using rmarkdown + ``` + +# 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: 107 + +Run `revdepcheck::cloud_details(, "mizer")` for more info + +
+ +## Newly broken + +* 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/testing-design.html#sec-tests-files-overview + ... + • 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 + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.5Mb + sub-directories of 1Mb or more: + help 1.8Mb + ``` + +# MKpower + +
+ +* Version: 1.0 +* GitHub: https://github.com/stamats/MKpower +* Source code: https://github.com/cran/MKpower +* Date/Publication: 2024-09-23 14:30:01 UTC +* Number of recursive dependencies: 123 + +Run `revdepcheck::cloud_details(, "MKpower")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘MKpower-Ex.R’ failed + The error most likely occurred in: + + > ### Name: qqunif + > ### Title: qq-Plots for Uniform Distribution + > ### Aliases: qqunif qqunif.default qqunif.sim.power.ttest + > ### qqunif.sim.power.wtest + > ### Keywords: hplot + > + > ### ** Examples + ... + 26. │ └─ggplot2 (local) FUN(X[[i]], ...) + 27. │ └─self$draw_group(group, panel_params, coord, ...) + 28. │ └─ggplot2 (local) draw_group(...) + 29. │ └─ggplot2 (local) draw_group(..., self = self) + 30. └─base::.handleSimpleError(...) + 31. └─rlang (local) h(simpleError(msg, call)) + 32. └─handlers[[1L]](cnd) + 33. └─cli::cli_abort(...) + 34. └─rlang::abort(...) + Execution halted + ``` + +# mlergm + +
+ +* Version: 0.8.1 +* GitHub: NA +* Source code: https://github.com/cran/mlergm +* Date/Publication: 2025-05-22 15:50:10 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "mlergm")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘mlergm_tutorial.Rmd’ using rmarkdown + + Quitting from mlergm_tutorial.Rmd:146-148 [unnamed-chunk-4] + Error: processing vignette 'mlergm_tutorial.Rmd' failed with diagnostics: + C stack usage 9964516 is too close to the limit + --- failed re-building ‘mlergm_tutorial.Rmd’ + + SUMMARY: processing the following file failed: + ‘mlergm_tutorial.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# mlr3spatiotempcv + +
+ +* Version: 2.3.2 +* GitHub: https://github.com/mlr-org/mlr3spatiotempcv +* Source code: https://github.com/cran/mlr3spatiotempcv +* Date/Publication: 2024-11-29 13:10:02 UTC +* Number of recursive dependencies: 166 + +Run `revdepcheck::cloud_details(, "mlr3spatiotempcv")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > if (requireNamespace("testthat", quietly = TRUE)) { + + library("checkmate") + + library("testthat") + + library("mlr3spatiotempcv") + + test_check("mlr3spatiotempcv") + + } + Loading required package: mlr3 + ... + • 2-autoplot/sptcvcstf-2d-time-var-fold-1-rep-2.svg + • 2-autoplot/sptcvcstf-2d-time-var-fold-1-sample-fold-n.svg + • 2-autoplot/sptcvcstf-2d-time-var-fold-1.svg + • 2-autoplot/sptcvcstf-2d-time-var-sample-fold-n.svg + • 2-autoplot/sptcvcstf-3d-time-var-fold-1-2-sample-fold-n.svg + • 2-autoplot/sptcvcstf-3d-time-var-fold-1-2.svg + • 2-autoplot/sptcvcstf-3d-time-var-fold-1-sample-fold-n.svg + • autoplot_buffer/spcvbuffer-fold-1-2.svg + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.9Mb + sub-directories of 1Mb or more: + data 3.5Mb + ``` + +# mlr3viz + +
+ +* Version: 0.10.1 +* GitHub: https://github.com/mlr-org/mlr3viz +* Source code: https://github.com/cran/mlr3viz +* Date/Publication: 2025-01-16 16:40:02 UTC +* Number of recursive dependencies: 174 + +Run `revdepcheck::cloud_details(, "mlr3viz")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘mlr3viz-Ex.R’ failed + The error most likely occurred in: + + > ### Name: autoplot.LearnerClassifRpart + > ### Title: Plots for Rpart Learners + > ### Aliases: autoplot.LearnerClassifRpart autoplot.LearnerRegrRpart + > + > ### ** Examples + > + > if (requireNamespace("mlr3")) { + ... + Backtrace: + ▆ + 1. ├─ggplot2::autoplot(learner, type = "ggparty") + 2. └─mlr3viz:::autoplot.LearnerClassifRpart(learner, type = "ggparty") + 3. └─ggparty::ggparty(partykit::as.party(object$model)) + 4. ├─ggplot2::ggplot(data = plot_data, mapping = mapping) + 5. └─ggplot2:::ggplot.default(data = plot_data, mapping = mapping) + 6. └─cli::cli_abort(...) + 7. └─rlang::abort(...) + 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 2 | WARN 74 | SKIP 27 | PASS 88 ] + ... + • 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 + ``` + +# mobr + +
+ +* Version: 3.0.0 +* GitHub: https://github.com/MoBiodiv/mobr +* Source code: https://github.com/cran/mobr +* Date/Publication: 2024-08-17 18:20:02 UTC +* Number of recursive dependencies: 86 + +Run `revdepcheck::cloud_details(, "mobr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘mobr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: get_delta_stats + > ### Title: Conduct the MoB tests on drivers of biodiversity across scales. + > ### Aliases: get_delta_stats + > + > ### ** Examples + > + > data(inv_comm) + ... + | + |======================================================================| 100% + > plot(inv_mob_out) + Effect size shown at the following efforts: 2, 4, 8, 16, 32, 64, 128, 256 + Warning: No shared levels found between `names(values)` of the manual scale and the + data's fill values. + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: plot ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘beta_div_demo.Rmd’ using rmarkdown + Warning in get_engine(options$engine) : + Unknown language engine 'setup' (must be registered via knit_engines$set()). + --- finished re-building ‘beta_div_demo.Rmd’ + + --- re-building ‘mobr_intro.Rmd’ using rmarkdown + ``` + +# modeldb + +
+ +* Version: 0.3.0 +* GitHub: https://github.com/tidymodels/modeldb +* Source code: https://github.com/cran/modeldb +* Date/Publication: 2023-11-01 14:30:02 UTC +* Number of recursive dependencies: 88 + +Run `revdepcheck::cloud_details(, "modeldb")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test_kmeans_viz.R:5:3'): plot_kmeans() returns a ggplot2 object ─── + class(plot_kmeans(mtcars, mpg, wt, group = am)) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 1 | WARN 33 | SKIP 0 | PASS 18 ] + Error: Test failures + Execution halted + ``` + +# modeltime.resample + +
+ +* 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: 235 + +Run `revdepcheck::cloud_details(, "modeltime.resample")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > + > # Machine Learning + > library(tidymodels) + ── Attaching packages ────────────────────────────────────── tidymodels 1.3.0 ── + ✔ broom 1.0.8 ✔ recipes 1.3.1 + ✔ dials 1.4.0 ✔ rsample 1.3.0 + ... + ▆ + 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 + ``` + +## 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. + ``` + +# Momocs + +
+ +* Version: 1.4.1 +* GitHub: https://github.com/MomX/Momocs +* Source code: https://github.com/cran/Momocs +* Date/Publication: 2023-11-13 11:13:30 UTC +* Number of recursive dependencies: 144 + +Run `revdepcheck::cloud_details(, "Momocs")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘Momocs-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_CV + > ### Title: Plots a cross-validation table as an heatmap + > ### Aliases: plot_CV plot_CV.default plot_CV.LDA + > + > ### ** Examples + > + > h <- hearts %>% + ... + > h %>% plot_CV(freq=FALSE, rm0=FALSE, fill=FALSE) + > # you can customize the returned gg with some ggplot2 functions + > h %>% plot_CV(labels=FALSE, fill=TRUE, axis.size=5) + ggplot2::ggtitle("A confusion matrix") + > + > # or build your own using the prepared data_frame: + > df <- h %>% plot_CV() %$% data + Error in eval(substitute(expr), data, enclos = parent.frame()) : + invalid 'envir' argument of type 'object' + Calls: %$% -> -> with.default -> eval + Execution halted + ``` + +# morseDR + +
+ +* Version: 0.1.2 +* GitHub: NA +* Source code: https://github.com/cran/morseDR +* Date/Publication: 2025-05-29 08:50:06 UTC +* Number of recursive dependencies: 79 + +Run `revdepcheck::cloud_details(, "morseDR")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘models.Rmd’ using rmarkdown + --- finished re-building ‘models.Rmd’ + + --- re-building ‘tutorial.Rmd’ using rmarkdown + ``` + +# mpactr + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/mums2/mpactr +* Source code: https://github.com/cran/mpactr +* Date/Publication: 2025-03-29 00:30:05 UTC +* Number of recursive dependencies: 143 + +Run `revdepcheck::cloud_details(, "mpactr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + `expected[2:2]`: "ggplot" + ── Failure ('test-quality_control.R:44:3'): qc plot returns a generates a plot ── + class(plot) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 2 | WARN 0 | SKIP 1 | PASS 165 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘downstream_analyses.Rmd’ using rmarkdown + Warning: Duplicated chunk option(s) 'warning' in both chunk header and pipe comments of the chunk 'unnamed-chunk-18'. + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 9.0Mb + sub-directories of 1Mb or more: + doc 4.9Mb + extdata 1.9Mb + libs 1.6Mb + ``` + +# MRZero + +
+ +* Version: 0.2.0 +* GitHub: NA +* Source code: https://github.com/cran/MRZero +* Date/Publication: 2024-04-14 09:30:03 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "MRZero")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘MRZero-Ex.R’ failed + The error most likely occurred in: + + > ### Name: mr_plot + > ### Title: Draw a scatter plot of the genetic associations and/or causal + > ### estimates + > ### Aliases: mr_plot mr_plot,MRInput-method mr_plot,MRAll-method + > ### mr_plot,MRMVInput-method + > + > ### ** Examples + > + > mr_plot(mr_input(bx = ldlc, bxse = ldlcse, by = chdlodds, byse = chdloddsse), + + line="egger", orientate = TRUE) + Error in pm[[2]] : subscript out of bounds + Calls: mr_plot ... plotly_build -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +# mshap + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/mshap +* Date/Publication: 2021-06-17 08:40:02 UTC +* Number of recursive dependencies: 124 + +Run `revdepcheck::cloud_details(, "mshap")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(mshap) + > + > test_check("mshap") + [ FAIL 8 | WARN 2 | SKIP 0 | PASS 19 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + `p2_all` has type 'object', not 'list'. + ── Failure ('test-plots.R:62:3'): Observation Plot Works with all arguments ──── + class(p2_all) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 8 | WARN 2 | SKIP 0 | PASS 19 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘tidyselect’ + All declared Imports should be used. + ``` + +# mtdesign + +
+ +* Version: 0.1.2 +* GitHub: https://github.com/openpharma/mtdesign +* Source code: https://github.com/cran/mtdesign +* Date/Publication: 2024-11-05 14:10:15 UTC +* Number of recursive dependencies: 57 + +Run `revdepcheck::cloud_details(, "mtdesign")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(mtdesign) + > + > test_check("mtdesign") + testthat 2025-06-05 13:16:04 DEBUG test_check: Entry + testthat 2025-06-05 13:16:04 DEBUG test_check: Entry + testthat 2025-06-05 13:16:04 DEBUG test_check: Exit + ... + `expected[2:2]`: "ggplot" + ── Failure ('test-powerPlot.R:6:3'): multiplication works ────────────────────── + class(powerPlot(simonGrid)) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 127 ] + Error: Test failures + Execution halted + ``` + +# mulgar + +
+ +* Version: 1.0.5 +* GitHub: https://github.com/dicook/mulgar +* Source code: https://github.com/cran/mulgar +* Date/Publication: 2025-04-07 02:30:02 UTC +* Number of recursive dependencies: 51 + +Run `revdepcheck::cloud_details(, "mulgar")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘mulgar-Ex.R’ failed + The error most likely occurred in: + + > ### Name: anomalies + > ### Title: Data sets with anomalies + > ### Aliases: anomalies anomaly1 anomaly2 anomaly3 anomaly4 anomaly5 + > ### Keywords: datasets + > + > ### ** Examples + > + > require(GGally) + Loading required package: GGally + Loading required package: ggplot2 + > data(anomaly1) + > data(anomaly2) + > ggscatmat(anomaly1) + Error: C stack usage 9962068 is too close to the limit + Execution halted + ``` + +# multilandr + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/phuais/multilandr +* Source code: https://github.com/cran/multilandr +* Date/Publication: 2025-02-14 14:50:10 UTC +* Number of recursive dependencies: 93 + +Run `revdepcheck::cloud_details(, "multilandr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘multilandr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: metrics_plots + > ### Title: Pairwise metric plots + > ### Aliases: metrics_plots + > + > ### ** Examples + > + > # Pair plots between metrics "pland" of classes 1 to 4, for radius 3000 m + > metrics_plots(ed_metrics, classes = 1:4, radii = 3000, show_class_names = TRUE, + + c_level = "pland") + Error: C stack usage 9962164 is too close to the limit + Execution halted + ``` + +# MultiTraits + +
+ +* Version: 0.5.0 +* GitHub: NA +* Source code: https://github.com/cran/MultiTraits +* Date/Publication: 2025-04-20 18:40:02 UTC +* Number of recursive dependencies: 137 + +Run `revdepcheck::cloud_details(, "MultiTraits")` for more info + +
+ +## Newly broken + +* checking whether package ‘MultiTraits’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/MultiTraits/new/MultiTraits.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘MultiTraits’ ... +** package ‘MultiTraits’ 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: .onLoad failed in loadNamespace() for 'ggtern', details: + call: NULL + error: object properties are invalid: +- @lineend must be or , not S3 +Execution halted +ERROR: lazy loading failed for package ‘MultiTraits’ +* removing ‘/tmp/workdir/MultiTraits/new/MultiTraits.Rcheck/MultiTraits’ + + +``` +### CRAN + +``` +* installing *source* package ‘MultiTraits’ ... +** package ‘MultiTraits’ 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 +** help +*** installing help indices +*** copying figures +** 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 (MultiTraits) + + +``` +# mvdalab + +
+ +* Version: 1.7 +* GitHub: NA +* Source code: https://github.com/cran/mvdalab +* Date/Publication: 2022-10-05 23:00:14 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "mvdalab")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘mvdalab-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.plusminus + > ### Title: 2D Graph of the PCA scores associated with a plusminusFit + > ### Aliases: plot.plusminus + > + > ### ** Examples + > + > ### PLUS-Minus CLASSIFIER WITH validation = 'none', i.e. no CV ### + ... + 15. │ └─ggplot2 (local) FUN(X[[i]], ...) + 16. │ └─scale$map_df(df = df) + 17. │ └─ggplot2 (local) map_df(..., self = self) + 18. │ └─base::lapply(aesthetics, function(j) self$map(df[[j]])) + 19. │ └─ggplot2 (local) FUN(X[[i]], ...) + 20. │ └─self$map(df[[j]]) + 21. │ └─ggplot2 (local) map(..., self = self) + 22. │ └─vctrs::`vec_slice<-`(`*tmp*`, is.na(x), value = na_value) + 23. └─rlang::cnd_signal(x) + Execution halted + ``` + +# mverse + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/mverseanalysis/mverse +* Source code: https://github.com/cran/mverse +* Date/Publication: 2025-04-24 08:10:02 UTC +* Number of recursive dependencies: 135 + +Run `revdepcheck::cloud_details(, "mverse")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘mverse_gettingstarted.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 9.0Mb + sub-directories of 1Mb or more: + data 7.0Mb + ``` + +# mvMAPIT + +
+ +* Version: 2.0.3 +* GitHub: https://github.com/lcrawlab/mvMAPIT +* Source code: https://github.com/cran/mvMAPIT +* Date/Publication: 2023-09-26 07:40:02 UTC +* Number of recursive dependencies: 103 + +Run `revdepcheck::cloud_details(, "mvMAPIT")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘mvMAPIT.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 17.7Mb + sub-directories of 1Mb or more: + libs 16.5Mb + ``` + +# mxnorm + +
+ +* Version: 1.0.3 +* GitHub: NA +* Source code: https://github.com/cran/mxnorm +* Date/Publication: 2023-05-01 17:10:02 UTC +* Number of recursive dependencies: 170 + +Run `revdepcheck::cloud_details(, "mxnorm")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(mxnorm) + > + > test_check("mxnorm") + boundary (singular) fit: see help('isSingular') + boundary (singular) fit: see help('isSingular') + boundary (singular) fit: see help('isSingular') + ... + `expected[2:2]`: "ggplot" + ── Failure ('test-plot_mx_umap.R:16:5'): plotting works ──────────────────────── + class(plot_mx_umap(mx_data)) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 2 | WARN 2 | SKIP 6 | PASS 85 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘e1071’ ‘glue’ + All declared Imports should be used. + ``` + +# neatmaps + +
+ +* 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: 98 + +Run `revdepcheck::cloud_details(, "neatmaps")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + 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 + ... + > # 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) + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the dendextend package. + Please report the issue at . + Error in pm[[2]] : subscript out of bounds + Calls: neatmap ... %>% -> layout -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.3Mb + ``` + +# NeuralNetTools + +
+ +* Version: 1.5.3 +* GitHub: https://github.com/fawda123/NeuralNetTools +* Source code: https://github.com/cran/NeuralNetTools +* Date/Publication: 2022-01-06 15:30:02 UTC +* Number of recursive dependencies: 97 + +Run `revdepcheck::cloud_details(, "NeuralNetTools")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘NeuralNetTools-Ex.R’ failed + The error most likely occurred in: + + > ### Name: garson + > ### Title: Variable importance using Garson's algorithm + > ### Aliases: garson garson.default garson.numeric garson.nnet garson.mlp + > ### garson.nn garson.train + > + > ### ** Examples + > + ... + > ## using numeric input + > + > wts_in <- c(13.12, 1.49, 0.16, -0.11, -0.19, -0.16, 0.56, -0.52, 0.81) + > struct <- c(2, 2, 1) #two inputs, two hidden, one output + > + > garson(wts_in, struct) + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Overview.Rmd’ using rmarkdown + ``` + +# NHSRplotthedots + +
+ +* 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: 83 + +Run `revdepcheck::cloud_details(, "NHSRplotthedots")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(NHSRplotthedots) + > + > test_check("NHSRplotthedots") + [ FAIL 2 | WARN 733 | SKIP 3 | PASS 430 ] + + ... + `attr(expected, 'S7_class')` is absent + ── Failure ('test-ptd_create_ggplot.R:79:3'): it returns a ggplot object ─────── + p$labels (`actual`) not equal to list(...) (`expected`). + + `actual` is an S7 object of class + `expected` is a list + + [ FAIL 2 | WARN 733 | SKIP 3 | PASS 430 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘NHSRdatasets’ ‘grid’ ‘utils’ + All declared Imports should be used. + ``` + +# nichetools + +
+ +* Version: 0.3.2 +* GitHub: https://github.com/benjaminhlina/nichetools +* Source code: https://github.com/cran/nichetools +* Date/Publication: 2024-09-30 21:20:02 UTC +* Number of recursive dependencies: 118 + +Run `revdepcheck::cloud_details(, "nichetools")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘using-nichetools-with-the-package-SIBER.Rmd’ using rmarkdown + + Quitting from using-nichetools-with-the-package-SIBER.Rmd:96-118 [unnamed-chunk-6] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! `object` must be an , not a S3 + --- + Backtrace: + ... + 61. └─ggplot2 (local) f(init, x[[i]]) + 62. └─S7::props(e2) + 63. └─S7::check_is_S7(object) + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'using-nichetools-with-the-package-SIBER.Rmd' failed with diagnostics: + `object` must be an , not a S3 + --- failed re-building ‘using-nichetools-with-the-package-SIBER.Rmd’ + + --- re-building ‘using-nichetools-with-the-package-nicheROVER.Rmd’ using rmarkdown + ``` + +# NiLeDAM + +
+ +* Version: 0.3 +* GitHub: NA +* Source code: https://github.com/cran/NiLeDAM +* Date/Publication: 2023-09-18 06:00:02 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "NiLeDAM")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(NiLeDAM) + + *********************************************************** + + Welcome to the NiLeDAM package + ... + `expected[2:2]`: "ggplot" + ── Failure ('test-popline.R:22:3'): test result on 'ageTests' plotted correctly ── + typeof(p) (`actual`) not equal to "list" (`expected`). + + `actual`: "object" + `expected`: "list" + + [ FAIL 8 | WARN 10 | SKIP 0 | PASS 49 ] + Error: Test failures + Execution halted + ``` + +# NIMAA + +
+ +* 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: 180 + +Run `revdepcheck::cloud_details(, "NIMAA")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘NIMAA-Ex.R’ failed + The error most likely occurred in: + + > ### Name: extractSubMatrix + > ### Title: Extract the non-missing submatrices from a given matrix. + > ### Aliases: extractSubMatrix + > + > ### ** Examples + > + > # load part of the beatAML data + ... + ℹ See also `vignette("ggplot2-in-packages")` for more information. + ℹ The deprecated feature was likely used in the NIMAA package. + Please report the issue at . + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the NIMAA package. + Please report the issue at . + Error in pm[[2]] : subscript out of bounds + Calls: extractSubMatrix ... plotSubmatrix -> print -> -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(NIMAA) + > + > test_check("NIMAA") + binmatnest.temperature + 13.21245 + Size of Square: 66 rows x 66 columns + ... + 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 8 | SKIP 0 | PASS 7 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘NIMAA-vignette.Rmd’ using rmarkdown + + Quitting from NIMAA-vignette.Rmd:48-57 [plotIncMatrix function] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ! subscript out of bounds + --- + Backtrace: + ... + + 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 + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.5Mb + 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 + ``` + +# nlmixr2plot + +
+ +* Version: 3.0.1 +* GitHub: https://github.com/nlmixr2/nlmixr2plot +* Source code: https://github.com/cran/nlmixr2plot +* Date/Publication: 2025-02-14 15:10:02 UTC +* Number of recursive dependencies: 160 + +Run `revdepcheck::cloud_details(, "nlmixr2plot")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(nlmixr2plot) + > + > test_check("nlmixr2plot") + > loading into symengine environment... + > pruning branches (`if`/`else`) of saem model... + v done + ... + `expected`: TRUE + ── Failure ('test-add.R:45:3'): test addition operator ───────────────────────── + inherits(p2[[1]], "gg") is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 2 | WARN 4 | SKIP 2 | PASS 33 ] + Error: Test failures + Execution halted + ``` + +# nlmixr2rpt + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/nlmixr2/nlmixr2rpt +* Source code: https://github.com/cran/nlmixr2rpt +* Date/Publication: 2023-06-06 13:10:05 UTC +* Number of recursive dependencies: 209 + +Run `revdepcheck::cloud_details(, "nlmixr2rpt")` 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 ('test-rptnlmixr.R:93:1'): PowerPoint Workflow ──────────────────────── + + Error: C stack usage 9961748 is too close to the limit + ── Error ('test-rptnlmixr.R:129:1'): Word Workflow ───────────────────────────── + + Error: C stack usage 9961748 is too close to the limit + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 11 ] + Error: Test failures + Execution halted + ``` + +# noisemodel + +
+ +* Version: 1.0.2 +* GitHub: NA +* Source code: https://github.com/cran/noisemodel +* Date/Publication: 2022-10-17 06:20:02 UTC +* Number of recursive dependencies: 122 + +Run `revdepcheck::cloud_details(, "noisemodel")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘noisemodel-Ex.R’ failed + The error most likely occurred in: + + > ### Name: asy_def_ln + > ### Title: Asymmetric default label noise + > ### Aliases: asy_def_ln asy_def_ln.default asy_def_ln.formula + > + > ### ** Examples + > + > # load the dataset + ... + - Class virginica: 44/44 (100.00%) + - Class setosa: 18/22 (81.82%) + - Class versicolor: 25/35 (71.43%) + + ## Indices of noisy samples: + - Output class: 3, 6, 19, 21, 25, 27, 32, 34, 40, 44, 47, 50, 52, 57 + > plot(outdef) + Error: object properties are invalid: + - @colour must be , , or , not + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘noisemodel.Rmd’ using rmarkdown + + Quitting from noisemodel.Rmd:67-85 [example 1] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! object properties are invalid: + - @colour must be , , or , not + --- + ... + Error: processing vignette 'noisemodel.Rmd' failed with diagnostics: + object properties are invalid: + - @colour must be , , or , not + --- failed re-building ‘noisemodel.Rmd’ + + SUMMARY: processing the following file failed: + ‘noisemodel.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) imp_int_an.Rd:24: Lost braces in \itemize; meant \describe ? + checkRd: (-1) imp_int_an.Rd:25: Lost braces in \itemize; meant \describe ? + checkRd: (-1) plot.ndmodel.Rd:16: Lost braces in \itemize; meant \describe ? + checkRd: (-1) plot.ndmodel.Rd:17: Lost braces in \itemize; meant \describe ? + checkRd: (-1) plot.ndmodel.Rd:18: Lost braces in \itemize; meant \describe ? + ``` + +# nonmem2R + +
+ +* 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: 62 + +Run `revdepcheck::cloud_details(, "nonmem2R")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘nonmem2R-Ex.R’ failed + The error most likely occurred in: + + > ### Name: basic.GOF4 + > ### Title: Basic 4- and 6-panel GOF + > ### Aliases: basic.GOF4 basic.GOF6 + > + > ### ** Examples + > + > # Get path to the example files included in nonmem2R package + ... + > ## Example 4 panel basic GOF + > basic.GOF4(subset(sdtab,DV>0),idv2="TAPD") + 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 nonmem2R package. + Please report the issue to the authors. + Error: object properties are invalid: + - @colour must be , , or , not + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘GOFvignette.Rmd’ using rmarkdown + + Quitting from GOFvignette.Rmd:27-30 [unnamed-chunk-2] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! object properties are invalid: + - @colour must be , , or , not + --- + ... + Error: processing vignette 'VPCvignette.Rmd' failed with diagnostics: + object properties are invalid: + - @colour must be , , or , not + --- failed re-building ‘VPCvignette.Rmd’ + + SUMMARY: processing the following files failed: + ‘GOFvignette.Rmd’ ‘VPCvignette.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# normfluodbf + +
+ +* Version: 2.0.0 +* GitHub: https://github.com/AlphaPrime7/normfluodbf +* Source code: https://github.com/cran/normfluodbf +* Date/Publication: 2024-09-27 23:10:03 UTC +* Number of recursive dependencies: 127 + +Run `revdepcheck::cloud_details(, "normfluodbf")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + ▆ + 1. ├─... %>% ... at test_plot_dev.R:13:3 + 2. └─normfluodbf:::plot_dev_with_custom_legends(...) + 3. ├─plotly::ggplotly(p) + 4. └─plotly:::ggplotly.ggplot(p) + 5. └─plotly::gg2list(...) + + [ FAIL 4 | WARN 613 | SKIP 0 | PASS 15 ] + Error: Test failures + Execution halted + ``` + +# NPflow + +
+ +* Version: 0.13.5 +* GitHub: https://github.com/sistm/NPflow +* Source code: https://github.com/cran/NPflow +* Date/Publication: 2024-01-13 10:00:02 UTC +* Number of recursive dependencies: 56 + +Run `revdepcheck::cloud_details(, "NPflow")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘NPflow-Ex.R’ failed + The error most likely occurred in: + + > ### Name: DPMGibbsN + > ### Title: Slice Sampling of the Dirichlet Process Mixture Model with a + > ### prior on alpha + > ### Aliases: DPMGibbsN + > + > ### ** Examples + > + ... + > ######## + > library(ggplot2) + > p <- (ggplot(data.frame("X"=z[1,], "Y"=z[2,]), aes(x=X, y=Y)) + + + geom_point() + + + ggtitle("Toy example Data")) + > p + Warning: %+% x was deprecated in ggplot2 4.0.0. + ℹ Please use + x instead. + Error: C stack usage 9962660 is too close to the limit + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 14.6Mb + sub-directories of 1Mb or more: + libs 13.9Mb + ``` + +# nzelect + +
+ +* 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: 80 + +Run `revdepcheck::cloud_details(, "nzelect")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘README.Rmd’ using rmarkdown + + Quitting from README.Rmd:63-82 [unnamed-chunk-3] + Error: processing vignette 'README.Rmd' failed with diagnostics: + C stack usage 9961508 is too close to the limit + --- failed re-building ‘README.Rmd’ + + SUMMARY: processing the following file failed: + ‘README.Rmd’ + + Error: Vignette re-building failed. + 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 + ``` + +# occCite + +
+ +* Version: 0.5.9 +* GitHub: https://github.com/ropensci/occCite +* Source code: https://github.com/cran/occCite +* Date/Publication: 2024-10-28 13:30:06 UTC +* Number of recursive dependencies: 132 + +Run `revdepcheck::cloud_details(, "occCite")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(occCite) + > + > test_check("occCite") + + OccCite query occurred on: 20 June, 2024 + + ... + ── Failure ('test-sumFig.R:40:3'): sumFig works when plotting only source by species ── + class(test[[1]][[1]]) not equal to "ggplot_built". + Lengths differ: 4 is not 1 + ── Failure ('test-sumFig.R:48:3'): sumFig works when plotting only aggregator by species ── + class(test[[1]][[1]]) not equal to "ggplot_built". + Lengths differ: 4 is not 1 + + [ FAIL 9 | WARN 1 | SKIP 20 | PASS 114 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘ape’ + All declared Imports should be used. + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 7 marked UTF-8 strings + ``` + +# ofpetrial + +
+ +* Version: 0.1.2 +* GitHub: https://github.com/DIFM-Brain/ofpetrial +* Source code: https://github.com/cran/ofpetrial +* Date/Publication: 2024-12-11 23:00:02 UTC +* Number of recursive dependencies: 148 + +Run `revdepcheck::cloud_details(, "ofpetrial")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ofpetrial-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 + > + > ### ** Examples + > + > data(td_single_input) + ... + 30. └─plt$build() + 31. └─private$addLimits(margThemed) + 32. └─ggplot2::scale_x_continuous(limits = limits, oob = scales::squish) + 33. └─ggplot2::continuous_scale(...) + 34. └─ggplot2:::check_continuous_limits(limits, call = call) + 35. └─ggplot2:::check_numeric(limits, arg = arg, call = call, allow_na = TRUE) + 36. └─ggplot2:::check_object(x, is.numeric, what, ..., arg = arg, call = call) + 37. └─ggplot2:::stop_input_type(...) + 38. └─rlang::abort(message, ..., call = call, arg = arg) + Execution halted + ``` + +# ogrdbstats + +
+ +* Version: 0.5.2 +* GitHub: https://github.com/airr-community/ogrdbstats +* Source code: https://github.com/cran/ogrdbstats +* Date/Publication: 2024-11-03 06:10:02 UTC +* Number of recursive dependencies: 131 + +Run `revdepcheck::cloud_details(, "ogrdbstats")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ogrdbstats-Ex.R’ failed + The error most likely occurred in: + + > ### Name: make_novel_base_grobs + > ### Title: Create plots showing base usage at selected locations in + > ### sequences based on novel alleles + > ### Aliases: make_novel_base_grobs + > + > ### ** Examples + > + > base_grobs = make_novel_base_grobs( + + example_rep$inferred_seqs, + + example_rep$input_sequences, + + 'V', + + FALSE + + ) + Error: object is invalid: + - every label must be named. + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Using_ogrdbstats.Rmd’ using rmarkdown + + Quitting from Using_ogrdbstats.Rmd:277-296 [unnamed-chunk-1] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! object is invalid: + - every label must be named. + --- + ... + Error: processing vignette 'Using_ogrdbstats.Rmd' failed with diagnostics: + object is invalid: + - every label must be named. + --- failed re-building ‘Using_ogrdbstats.Rmd’ + + SUMMARY: processing the following file failed: + ‘Using_ogrdbstats.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# OmicNavigator + +
+ +* Version: 1.15.0 +* GitHub: https://github.com/abbvie-external/OmicNavigator +* Source code: https://github.com/cran/OmicNavigator +* Date/Publication: 2025-05-28 19: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 + ... + testPlot.R.................... 140 tests 1 fails + testPlot.R.................... 140 tests 1 fails + testPlot.R.................... 141 tests 1 fails + testPlot.R.................... 141 tests 1 fails + testPlot.R.................... 141 tests 1 fails + testPlot.R.................... 142 tests 1 fails + testPlot.R.................... 142 tests 1 fails + testPlot.R.................... 143 tests 1 fails Error in pm[[2]] : subscript out of bounds + Calls: suppressMessages ... plotStudy -> f -> -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +## In both + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + --- re-building ‘OmicNavigatorAPI.Rnw’ using Sweave + OmicNavigator R package version: 1.15.0 + The app is not installed. Install it with installApp() + Installing study "ABC" in /tmp/Rtmpbby0kc/file1a4a7dbc8eb0 + 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/Rtmpbby0kc/ONstudyABC + Success! + ... + write + l.14 + + --- failed re-building ‘OmicNavigatorUsersGuide.Rnw’ + + SUMMARY: processing the following files failed: + ‘OmicNavigatorAPI.Rnw’ ‘OmicNavigatorUsersGuide.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# opitools + +
+ +* Version: 1.8.0 +* GitHub: https://github.com/MAnalytics/opitools +* Source code: https://github.com/cran/opitools +* Date/Publication: 2021-07-29 15:30:02 UTC +* Number of recursive dependencies: 102 + +Run `revdepcheck::cloud_details(, "opitools")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘opitools-Ex.R’ failed + The error most likely occurred in: + + > ### Name: word_distrib + > ### Title: Words Distribution + > ### Aliases: word_distrib + > + > ### ** Examples + > + > + ... + > plt = word_distrib(textdoc = tweets_dat) + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the opitools package. + Please report the issue at . + Warning in get_plot_component(plot, "guide-box") : + Multiple components found; returning the first one. To return all, use `return_all = TRUE`. + Error: object properties are invalid: + - @colour must be , , or , not + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) word_imp.Rd:14: Lost braces + 14 | number of individual records. An \code{n} x code{2} dataframe can + | ^ + ``` + +# ordinalsimr + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/NeuroShepherd/ordinalsimr +* Source code: https://github.com/cran/ordinalsimr +* Date/Publication: 2025-06-04 07:10:02 UTC +* Number of recursive dependencies: 119 + +Run `revdepcheck::cloud_details(, "ordinalsimr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + ── Error ('test-utils.R:70:3'): test the plot_power() function ───────────────── + Error in `expect_match(plot_obj$labels$ymin, "lower_power_bound")`: is.character(act$val) is not TRUE + Backtrace: + ▆ + 1. └─testthat::expect_match(plot_obj$labels$ymin, "lower_power_bound") at test-utils.R:70:3 + 2. └─base::stopifnot(is.character(act$val)) + + [ FAIL 1 | WARN 0 | SKIP 1 | PASS 69 ] + Error: Test failures + Execution halted + ``` + +# ordr + +
+ +* Version: 0.1.1 +* GitHub: https://github.com/corybrunson/ordr +* Source code: https://github.com/cran/ordr +* Date/Publication: 2022-10-20 20:52:35 UTC +* Number of recursive dependencies: 107 + +Run `revdepcheck::cloud_details(, "ordr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ordr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: biplot-stats + > ### Title: Convenience stats for row and column matrix factors + > ### Aliases: biplot-stats stat_rows_ellipse stat_cols_ellipse + > ### stat_rows_center stat_cols_center stat_rows_star stat_cols_star + > ### stat_rows_chull stat_cols_chull stat_rows_cone stat_cols_cone + > ### stat_rows_scale stat_cols_scale stat_rows_spantree stat_cols_spantree + > + ... + ✖ You've supplied an object. + Backtrace: + ▆ + 1. ├─iris_pca %>% ggbiplot(aes(color = species)) + 2. └─ordr::ggbiplot(., aes(color = species)) + 3. ├─ggplot2::ggplot(data = ordination, mapping = mapping, environment = parent.frame()) + 4. └─ggplot2:::ggplot.default(data = ordination, mapping = mapping, environment = parent.frame()) + 5. └─cli::cli_abort(...) + 6. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ordr) + Loading required package: ggplot2 + > + > test_check("ordr") + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 181 ] + + ... + ▆ + 1. └─ordr::ggbiplot(m) at test-stat-spantree.r:10:5 + 2. ├─ggplot2::ggplot(data = ordination, mapping = mapping, environment = parent.frame()) + 3. └─ggplot2:::ggplot.default(data = ordination, mapping = mapping, environment = parent.frame()) + 4. └─cli::cli_abort(...) + 5. └─rlang::abort(...) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 181 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘cmds-variables.rmd’ using rmarkdown + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) lra-ord.Rd:54: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) lra-ord.Rd:55-56: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) lra-ord.Rd:57-58: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) lra-ord.Rd:59: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) lra-ord.Rd:60: Lost braces in \itemize; \value handles \item{}{} directly + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 4 marked UTF-8 strings + ``` + +# OutliersO3 + +
+ +* Version: 0.6.3 +* GitHub: NA +* Source code: https://github.com/cran/OutliersO3 +* Date/Publication: 2020-04-25 00:10:02 UTC +* Number of recursive dependencies: 130 + +Run `revdepcheck::cloud_details(, "OutliersO3")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘OutliersO3-Ex.R’ failed + The error most likely occurred in: + + > ### Name: O3plotColours + > ### Title: Set colours for O3 plots + > ### Aliases: O3plotColours + > + > ### ** Examples + > + > c1 <- O3prep(stackloss, k1=2, method=c("HDo", "BAC"), tolHDo=0.025, tolBAC=0.01) + > c2 <- O3plotM(c1) + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the OutliersO3 package. + Please report the issue to the authors. + > c2$gO3 + Error: C stack usage 9964596 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘DrawingO3plots.Rmd’ using rmarkdown + + Quitting from DrawingO3plots.Rmd:24-32 [unnamed-chunk-1] + Error: processing vignette 'DrawingO3plots.Rmd' failed with diagnostics: + C stack usage 9965572 is too close to the limit + --- failed re-building ‘DrawingO3plots.Rmd’ + + --- re-building ‘MultTolLevels.Rmd’ using rmarkdown + + ... + --- failed re-building ‘PCPsO3.Rmd’ + + --- re-building ‘xtraO3methods.Rmd’ using rmarkdown + --- finished re-building ‘xtraO3methods.Rmd’ + + SUMMARY: processing the following files failed: + ‘DrawingO3plots.Rmd’ ‘MultTolLevels.Rmd’ ‘PCPsO3.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# pacu + +
+ +* Version: 0.1.63 +* GitHub: https://github.com/cldossantos/pacu +* Source code: https://github.com/cran/pacu +* Date/Publication: 2025-05-29 21:50:02 UTC +* Number of recursive dependencies: 169 + +Run `revdepcheck::cloud_details(, "pacu")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘pacu.Rmd’ using rmarkdown + --- finished re-building ‘pacu.Rmd’ + + --- re-building ‘pacu_faq.Rmd’ using rmarkdown + --- finished re-building ‘pacu_faq.Rmd’ + + --- re-building ‘pacu_sat.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.7Mb + sub-directories of 1Mb or more: + extdata 4.8Mb + ``` + +# pafr + +
+ +* 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: 111 + +Run `revdepcheck::cloud_details(, "pafr")` for more info + +
+ +## Newly broken + +* checking tests ... 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 ] + + ... + ── 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 + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.dotplot_hl: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# palettes + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/mccarthy-m-g/palettes +* Source code: https://github.com/cran/palettes +* Date/Publication: 2024-07-13 23:10:01 UTC +* Number of recursive dependencies: 111 + +Run `revdepcheck::cloud_details(, "palettes")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘palettes-Ex.R’ failed + The error most likely occurred in: + + > ### Name: scale_colour_palette_d + > ### Title: Colour scales from colour vectors and colour palettes + > ### Aliases: scale_colour_palette_d scale_fill_palette_d + > ### scale_colour_palette_c scale_fill_palette_c scale_colour_palette_b + > ### scale_fill_palette_b scale_color_palette_d scale_color_palette_c + > ### scale_color_palette_b + > + ... + 26. └─vctrs::vec_default_cast(...) + 27. ├─base::withRestarts(...) + 28. │ └─base (local) withOneRestart(expr, restarts[[1L]]) + 29. │ └─base (local) doWithOneRestart(return(expr), restart) + 30. └─vctrs::stop_incompatible_cast(...) + 31. └─vctrs::stop_incompatible_type(...) + 32. └─vctrs:::stop_incompatible(...) + 33. └─vctrs:::stop_vctrs(...) + 34. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘biscale.Rmd’ using rmarkdown + ``` + +# panelView + +
+ +* Version: 1.1.18 +* GitHub: NA +* Source code: https://github.com/cran/panelView +* Date/Publication: 2024-06-17 07:20:02 UTC +* Number of recursive dependencies: 30 + +Run `revdepcheck::cloud_details(, "panelView")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘panelView-Ex.R’ failed + The error most likely occurred in: + + > ### Name: panelview + > ### Title: Panel data visualization + > ### Aliases: panelview + > + > ### ** Examples + > + > library(panelView) + ... + 8. └─ggplot2::build_ggplot(plot) + 9. ├─S7::S7_dispatch() + 10. └─ggplot2 (local) `method(build_ggplot, ggplot2::ggplot)`(...) + 11. └─ggplot2:::plot_theme(plot) + 12. └─ggplot2:::check_theme(theme) + 13. └─base::mapply(...) + 14. └─ggplot2 (local) ``(...) + 15. └─cli::cli_abort(...) + 16. └─rlang::abort(...) + Execution halted + ``` + +# ParamHelpers + +
+ +* Version: 1.14.2 +* GitHub: https://github.com/mlr-org/ParamHelpers +* Source code: https://github.com/cran/ParamHelpers +* Date/Publication: 2025-01-09 22:50:02 UTC +* Number of recursive dependencies: 89 + +Run `revdepcheck::cloud_details(, "ParamHelpers")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘run-all.R’ + Running the tests in ‘tests/run-all.R’ failed. + Complete output: + > library(testthat) + > library(BBmisc) + + Attaching package: 'BBmisc' + + The following object is masked from 'package:base': + + ... + • On CRAN (1): 'test_convertParamSetToIrace.R:2:3' + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Error ('test_renderOptPathPlot.R:6:1'): renderOptPathPlot ─────────────────── + + Error: C stack usage 9962404 is too close to the limit + + [ FAIL 1 | WARN 1829 | SKIP 1 | PASS 1042 ] + Error: Test failures + Execution halted + ``` + +# paramix + +
+ +* Version: 0.0.1 +* GitHub: NA +* Source code: https://github.com/cran/paramix +* Date/Publication: 2024-12-09 19:30:02 UTC +* Number of recursive dependencies: 77 + +Run `revdepcheck::cloud_details(, "paramix")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘intro.Rmd’ using rmarkdown + ``` + +# PAsso + +
+ +* Version: 0.1.10 +* GitHub: https://github.com/XiaoruiZhu/PAsso +* Source code: https://github.com/cran/PAsso +* Date/Publication: 2021-06-18 09:20:08 UTC +* Number of recursive dependencies: 179 + +Run `revdepcheck::cloud_details(, "PAsso")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘PAsso-Ex.R’ failed + The error most likely occurred in: + + > ### Name: diagnostic.plot + > ### Title: Residual-based diagnostic plots + > ### Aliases: diagnostic.plot diagnostic.plot.default diagnostic.plot.resid + > ### diagnostic.plot.PAsso diagnostic.plot.glm diagnostic.plot.clm + > ### diagnostic.plot.lrm diagnostic.plot.orm diagnostic.plot.polr + > + > ### ** Examples + ... + > + > PAsso_3v <- PAsso(responses = c("PreVote.num", "PID", "selfLR"), + + adjustments = c("income.num", "age", "edu.year"), + + data = ANES2016, uni.model = "probit", + + method = c("kendall"), + + resids.type = "surrogate", jitter = "latent") + > + > diag_p1 <- diagnostic.plot(object = PAsso_3v, output = "qq") + Error: C stack usage 9963764 is too close to the limit + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘PResiduals’ + ``` + +# patchwork + +
+ +* Version: 1.3.0 +* GitHub: https://github.com/thomasp85/patchwork +* Source code: https://github.com/cran/patchwork +* Date/Publication: 2024-09-16 09:30:02 UTC +* Number of recursive dependencies: 93 + +Run `revdepcheck::cloud_details(, "patchwork")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘patchwork-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_arithmetic + > ### Title: Plot arithmetic + > ### Aliases: plot_arithmetic -.ggplot /.ggplot |.ggplot *.gg &.gg + > + > ### ** Examples + > + > library(ggplot2) + ... + > # Stacking and packing + > (p1 | p2 | p3) / + + p4 + > + > # Add elements to the same nesting level + > (p1 + (p2 + p3) + p4 + plot_layout(ncol = 1)) * theme_bw() + Error: Can't find method for generic `*(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(patchwork) + > + > test_check("patchwork") + [ FAIL 1 | WARN 1 | SKIP 11 | PASS 0 ] + + ══ Skipped tests (11) ══════════════════════════════════════════════════════════ + ... + • layout/insets-can-be-changed.svg + • layout/other-alignments-work.svg + • layout/patchworks-can-be-inset.svg + • layout/setting-heights-as-units.svg + • layout/setting-heights.svg + • layout/setting-nrow.svg + • layout/setting-widths-as-units.svg + • layout/setting-widths.svg + Error: Test failures + Execution halted + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_gtable: + function(plot) + ggplot_gtable.fixed_dim_build: + function(data) + + ggplot_add: + function(object, plot, ...) + ggplot_add.formula: + function(object, plot, object_name) + + ... + function(object, plot, ...) + ggplot_add.grob: + function(object, plot, object_name) + + ggplot_build: + function(plot, ...) + ggplot_build.fixed_dim_ggplot: + function(plot) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# Path.Analysis + +
+ +* Version: 0.1 +* GitHub: https://github.com/abeyran/Path.Analysis +* Source code: https://github.com/cran/Path.Analysis +* Date/Publication: 2024-09-25 08:20:05 UTC +* Number of recursive dependencies: 203 + +Run `revdepcheck::cloud_details(, "Path.Analysis")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘Path.Analysis_manual.Rmd’ using rmarkdown + + Quitting from Path.Analysis_manual.Rmd:158-161 [Correlogram of dtraw dataset, excluding the first column on the left] + Error: processing vignette 'Path.Analysis_manual.Rmd' failed with diagnostics: + C stack usage 9962356 is too close to the limit + --- failed re-building ‘Path.Analysis_manual.Rmd’ + + SUMMARY: processing the following file failed: + ‘Path.Analysis_manual.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘ComplexHeatmap’ ‘mathjaxr’ + All declared Imports should be used. + ``` + +# pathfindR + +
+ +* Version: 2.4.2 +* GitHub: https://github.com/egeulgen/pathfindR +* Source code: https://github.com/cran/pathfindR +* Date/Publication: 2025-02-17 09:30:02 UTC +* Number of recursive dependencies: 143 + +Run `revdepcheck::cloud_details(, "pathfindR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat-active_snw.R’ + Running ‘testthat-clustering.R’ + Running ‘testthat-comparison.R’ + Running ‘testthat-core.R’ + Running ‘testthat-data_generation.R’ + Running ‘testthat-enrichment.R’ + Running ‘testthat-scoring.R’ + Running the tests in ‘tests/testthat-scoring.R’ failed. + Complete output: + > library(testthat) + ... + ── Failure ('test-scoring.R:113:9'): `plot_scores()` -- creates term score heatmap ggplot object with correct labels ── + g$labels$x not identical to "Sample". + target is NULL, current is character + ── Failure ('test-scoring.R:114:9'): `plot_scores()` -- creates term score heatmap ggplot object with correct labels ── + g$labels$y not identical to "Term". + target is NULL, current is character + + [ FAIL 8 | WARN 0 | SKIP 0 | PASS 37 ] + Error: Test failures + Execution halted + ``` + +# pathviewr + +
+ +* 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: 189 + +Run `revdepcheck::cloud_details(, "pathviewr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(pathviewr) + > #library(vdiffr) + > + > 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)) + + [ FAIL 2 | WARN 1 | SKIP 0 | PASS 286 ] + Error: Test failures + Execution halted + ``` + +# PatientLevelPrediction + +
+ +* Version: 6.4.1 +* GitHub: https://github.com/OHDSI/PatientLevelPrediction +* Source code: https://github.com/cran/PatientLevelPrediction +* Date/Publication: 2025-04-20 09:40:02 UTC +* Number of recursive dependencies: 215 + +Run `revdepcheck::cloud_details(, "PatientLevelPrediction")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘PatientLevelPrediction-Ex.R’ failed + The error most likely occurred in: + + > ### Name: outcomeSurvivalPlot + > ### Title: Plot the outcome incidence over time + > ### Aliases: outcomeSurvivalPlot + > + > ### ** Examples + > + > ## Don't show: + ... + Warning: Ignoring unknown labels: + • fill : "Strata" + • linetype : "1" + Warning: Ignoring unknown labels: + • fill : "Strata" + • linetype : "1" + Warning: Ignoring unknown labels: + • colour : "Strata" + Error: `object` must be an , not a S3 + Execution halted + ``` + +# patientProfilesVis + +
+ +* 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: 99 + +Run `revdepcheck::cloud_details(, "patientProfilesVis")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘patientProfiles-template-SDTM.Rmd’ using rmarkdown + --- finished re-building ‘patientProfiles-template-SDTM.Rmd’ + + --- re-building ‘patientProfilesVis-introduction.Rmd’ using rmarkdown + + Quitting from patientProfilesVis-introduction.Rmd:167-171 [text-wideFormat-include] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ... + + Error: processing vignette 'patientProfilesVis-introduction.Rmd' failed with diagnostics: + The `plot.margin` theme element must be a vector of length 4 + --- failed re-building ‘patientProfilesVis-introduction.Rmd’ + + SUMMARY: processing the following file failed: + ‘patientProfilesVis-introduction.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(patientProfilesVis) + > + > test_check("patientProfilesVis") + [ FAIL 18 | WARN 0 | SKIP 20 | PASS 333 ] + + == Skipped tests (20) ================================================================================================================================================================================== + ... + 24. \-ggplot2:::plot_theme(plot) + 25. \-ggplot2:::check_theme(theme) + 26. \-base::mapply(...) + 27. \-ggplot2 (local) ``(...) + 28. \-cli::cli_abort(...) + 29. \-rlang::abort(...) + + [ FAIL 18 | WARN 0 | SKIP 20 | PASS 333 ] + Error: Test failures + Execution halted + ``` + +* checking installed package size ... NOTE + ``` + installed size is 5.7Mb + sub-directories of 1Mb or more: + doc 5.2Mb + ``` + +# pcpr + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/Columbia-PRIME/pcpr +* Source code: https://github.com/cran/pcpr +* Date/Publication: 2025-03-27 18:20:02 UTC +* Number of recursive dependencies: 93 + +Run `revdepcheck::cloud_details(, "pcpr")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘pcp-applied.Rmd’ using rmarkdown + ``` + +# pcr + +
+ +* Version: 1.2.2 +* GitHub: https://github.com/MahShaaban/pcr +* Source code: https://github.com/cran/pcr +* Date/Publication: 2020-04-01 06:10:02 UTC +* Number of recursive dependencies: 69 + +Run `revdepcheck::cloud_details(, "pcr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(pcr) + > + > test_check("pcr") + [ FAIL 12 | WARN 1 | SKIP 0 | PASS 74 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ── Failure ('test_plotting_fun.R:68:3'): .pcr_plot_assess returns an efficiency plot ── + class(gg) not identical to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + ── Failure ('test_plotting_fun.R:79:3'): .pcr_plot_assess returns standard_curve plots ── + class(gg) not identical to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 12 | WARN 1 | SKIP 0 | PASS 74 ] + Error: Test failures + 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: 103 + +Run `revdepcheck::cloud_details(, "pdxTrees")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + 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 + ``` + +# pedbp + +
+ +* Version: 2.0.2 +* GitHub: https://github.com/dewittpe/pedbp +* Source code: https://github.com/cran/pedbp +* Date/Publication: 2025-01-07 20:40:01 UTC +* Number of recursive dependencies: 117 + +Run `revdepcheck::cloud_details(, "pedbp")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘test-bmi_for_age.R’ + Running ‘test-bp-by-source.R’ + Running ‘test-bp_cdf.R’ + Running the tests in ‘tests/test-bp_cdf.R’ failed. + Complete output: + > library(pedbp) + > + > ################################################################################ + > x <- bp_cdf(age = 96, male = 1, sbp = 103, dbp = 55) + > stopifnot(identical(class(x), c("gg", "ggplot"))) + Error: identical(class(x), c("gg", "ggplot")) is not TRUE + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.1Mb + sub-directories of 1Mb or more: + libs 5.3Mb + ``` + +# personalized + +
+ +* 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: 91 + +Run `revdepcheck::cloud_details(, "personalized")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + 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-9 + Loading required package: mgcv + ... + 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(...) + + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 215 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) fit.subgroup.Rd:56: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:57: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:58: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:59: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:60: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:61: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:62: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:63: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:64: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:65: Lost braces in \itemize; meant \describe ? + ... + checkRd: (-1) fit.subgroup.Rd:179-181: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:182: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:183: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fit.subgroup.Rd:184: Lost braces in \itemize; meant \describe ? + checkRd: (-1) validate.subgroup.Rd:77-81: Lost braces in \enumerate; meant \describe ? + checkRd: (-1) validate.subgroup.Rd:82-86: Lost braces in \enumerate; meant \describe ? + checkRd: (-1) validate.subgroup.Rd:89-92: Lost braces in \enumerate; meant \describe ? + checkRd: (-1) weighted.ksvm.Rd:21: Lost braces; missing escapes or markup? + 21 | \item{y}{The response vector (either a character vector, factor vector, or numeric vector with values in {-1, 1})} + | ^ + ``` + +# phylepic + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/cidm-ph/phylepic +* Source code: https://github.com/cran/phylepic +* Date/Publication: 2024-05-31 19:10:02 UTC +* Number of recursive dependencies: 86 + +Run `revdepcheck::cloud_details(, "phylepic")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_gtable: + function(plot) + ggplot_gtable.phylepic_ggplot_build: + function(data) + + ggplot_build: + function(plot, ...) + ggplot_build.phylepic_ggplot: + function(plot) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# PieGlyph + +
+ +* 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: 88 + +Run `revdepcheck::cloud_details(, "PieGlyph")` for more info + +
+ +## Newly broken + +* checking whether package ‘PieGlyph’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/PieGlyph/new/PieGlyph.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘PieGlyph’ ... +** package ‘PieGlyph’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in get(x, envir = ns, inherits = FALSE) : + object 'is.waive' not found +Error: unable to load R code in package ‘PieGlyph’ +Execution halted +ERROR: lazy loading failed for package ‘PieGlyph’ +* removing ‘/tmp/workdir/PieGlyph/new/PieGlyph.Rcheck/PieGlyph’ + + +``` +### CRAN + +``` +* installing *source* package ‘PieGlyph’ ... +** package ‘PieGlyph’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +** help +*** installing help indices +*** copying figures +** 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 (PieGlyph) + + +``` +# plantTracker + +
+ +* Version: 1.1.0 +* GitHub: https://github.com/aestears/plantTracker +* Source code: https://github.com/cran/plantTracker +* Date/Publication: 2023-05-05 18:20:02 UTC +* Number of recursive dependencies: 81 + +Run `revdepcheck::cloud_details(, "plantTracker")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Suggested_plantTracker_Workflow.Rmd’ using rmarkdown + Warning in options[opts_class] <- Map(code_folding_class, options[opts_class], : + number of items to replace is not a multiple of replacement length + Warning in options[opts_attr] <- Map(code_folding_attr, options[opts_attr], : + number of items to replace is not a multiple of replacement length + Warning in options[opts_class] <- Map(code_folding_class, options[opts_class], : + number of items to replace is not a multiple of replacement length + Warning in options[opts_attr] <- Map(code_folding_attr, options[opts_attr], : + number of items to replace is not a multiple of replacement length + Warning in options[opts_class] <- Map(code_folding_class, options[opts_class], : + number of items to replace is not a multiple of replacement length + Warning in options[opts_attr] <- Map(code_folding_attr, options[opts_attr], : + number of items to replace is not a multiple of replacement length + ``` + +# Plasmidprofiler + +
+ +* Version: 0.1.6 +* GitHub: NA +* Source code: https://github.com/cran/Plasmidprofiler +* Date/Publication: 2017-01-06 01:10:47 +* Number of recursive dependencies: 81 + +Run `revdepcheck::cloud_details(, "Plasmidprofiler")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘Plasmidprofiler-Ex.R’ failed + The error most likely occurred in: + + > ### Name: main + > ### Title: Main: Run everything + > ### Aliases: main + > + > ### ** 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 + Execution halted + ``` + +# PLMIX + +
+ +* Version: 2.1.1 +* GitHub: NA +* Source code: https://github.com/cran/PLMIX +* Date/Publication: 2019-09-04 11:50:02 UTC +* Number of recursive dependencies: 127 + +Run `revdepcheck::cloud_details(, "PLMIX")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘PLMIX-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.mpPLMIX + > ### Title: Plot the MAP estimates for a Bayesian mixture of Plackett-Luce + > ### models + > ### Aliases: plot.mpPLMIX + > + > ### ** Examples + > + ... + > data(d_carconf) + > MAP <- mapPLMIX(pi_inv=d_carconf, K=ncol(d_carconf), G=3) + > plot(MAP) + 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 PLMIX package. + Please report the issue to the authors. + Error: C stack usage 9962916 is too close to the limit + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 9.1Mb + sub-directories of 1Mb or more: + libs 8.6Mb + ``` + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘PlackettLuce’ ‘StatRank’ ‘pmr’ ‘prefmod’ ‘rankdist’ + All declared Imports should be used. + ``` + +# plotdap + +
+ +* Version: 1.0.3 +* GitHub: https://github.com/rmendels/plotdap +* Source code: https://github.com/cran/plotdap +* Date/Publication: 2023-10-17 22:00:15 UTC +* Number of recursive dependencies: 110 + +Run `revdepcheck::cloud_details(, "plotdap")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘plotdap-Ex.R’ failed + The error most likely occurred in: + + > ### Name: add_ggplot + > ### Title: Add ggplot2 elements to a plotdap object + > ### Aliases: add_ggplot + > + > ### ** Examples + > + > + ... + + crs = "+proj=laea +y_0=0 +lon_0=155 +lat_0=-90 +ellps=WGS84 +no_defs") + Loading required package: maps + > p <- add_ggplot( + + p, + + ggplot2::theme_bw() + + ) + Error in .Primitive("@")(NULL, properties) : + no applicable method for `@` applied to an object of class "NULL" + Calls: add_ggplot ... -> validate -> validate_properties -> @ -> do.call + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘using_plotdap.Rmd’ using rmarkdown + + Quitting from using_plotdap.Rmd:57-61 [world] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! no applicable method for `@` applied to an object of class "NULL" + --- + Backtrace: + ... + + Error: processing vignette 'using_plotdap.Rmd' failed with diagnostics: + no applicable method for `@` applied to an object of class "NULL" + --- failed re-building ‘using_plotdap.Rmd’ + + SUMMARY: processing the following file failed: + ‘using_plotdap.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# plotDK + +
+ +* 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: 83 + +Run `revdepcheck::cloud_details(, "plotDK")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(plotDK) + > + > test_check("plotDK") + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 46 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ── Failure ('test-plotDK.R:72:5'): The returned plot has the correct labels ──── + labels$fill not equal to "test_label". + target is NULL, current is character + ── Failure ('test-plotDK.R:81:5'): The returned plot has the correct labels ──── + labels$fill not equal to "fill". + target is NULL, current is character + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 46 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘mapproj’ + All declared Imports should be used. + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 12992 marked UTF-8 strings + ``` + +# PlotFTIR + +
+ +* Version: 1.2.0 +* GitHub: https://github.com/NRCan/PlotFTIR +* Source code: https://github.com/cran/PlotFTIR +* Date/Publication: 2025-03-31 15:30:06 UTC +* Number of recursive dependencies: 105 + +Run `revdepcheck::cloud_details(, "PlotFTIR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + `expected` is a character vector ('Transmittance (a.u.)') + ── Failure ('test-plot_ftir.R:28:3'): Plots are generated ────────────────────── + p5$label$y (`actual`) not equal to "Normalized Absorbance" (`expected`). + + `actual` is NULL + `expected` is a character vector ('Normalized Absorbance') + + [ FAIL 6 | WARN 58 | SKIP 0 | PASS 513 ] + Error: Test failures + Execution halted + ``` + +# plotly + +
+ +* 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: 135 + +Run `revdepcheck::cloud_details(, "plotly")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘plotly-Ex.R’ failed + The error most likely occurred in: + + > ### Name: style + > ### Title: Modify trace(s) + > ### Aliases: style + > + > ### ** Examples + > + > ## Don't show: + ... + + # 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 + 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 + sub-directories of 1Mb or more: + R 1.0Mb + htmlwidgets 4.0Mb + ``` + +# plotor + +
+ +* Version: 0.6.0 +* GitHub: https://github.com/craig-parylo/plotor +* Source code: https://github.com/cran/plotor +* Date/Publication: 2025-05-28 11:50:02 UTC +* Number of recursive dependencies: 140 + +Run `revdepcheck::cloud_details(, "plotor")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘plotor-Ex.R’ failed + The error most likely occurred in: + + > ### Name: table_or + > ### Title: Table OR + > ### Aliases: table_or + > + > ### ** Examples + > + > # get some data + ... + 40. │ └─self$draw_panel(...) + 41. │ └─ggplot2 (local) draw_panel(..., self = self) + 42. │ └─grid:::Ops.unit(data$linewidth, 0) + 43. │ └─base::stop(...) + 44. └─base::.handleSimpleError(...) + 45. └─rlang (local) h(simpleError(msg, call)) + 46. └─handlers[[1L]](cnd) + 47. └─cli::cli_abort(...) + 48. └─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 + ... + ── Failure ('test-plot_or.R:7:3'): `plot_or()` does not produce messages or warnings ── + `{ ... }` produced warnings. + ── Failure ('test-plot_or.R:13:3'): `plot_or()` does not produce messages or warnings ── + `{ ... }` produced warnings. + + [ FAIL 2 | WARN 24 | SKIP 1 | PASS 26 ] + Deleting unused snapshots: + • plot_or/plot-diabetes.svg + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘using_plotor.Rmd’ using rmarkdown + ``` + +# plotROC + +
+ +* Version: 2.3.1 +* GitHub: https://github.com/sachsmc/plotROC +* Source code: https://github.com/cran/plotROC +* Date/Publication: 2023-10-06 12:40:02 UTC +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "plotROC")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘plotROC-Ex.R’ failed + The error most likely occurred in: + + > ### Name: calc_auc + > ### Title: Calculate the Area under the ROC curve + > ### Aliases: calc_auc + > + > ### ** Examples + > + > D.ex <- rbinom(50, 1, .5) + ... + > ggroc <- ggplot(rocdata, aes(m = M, d = D)) + geom_roc() + > calc_auc(ggroc) + Error in `rlang::quo_get_expr()`: + ! `quo` must be a quosure + Backtrace: + ▆ + 1. ├─plotROC::calc_auc(ggroc) + 2. │ └─rlang::quo_get_expr(l2$plot$mapping[current_name][[1]]) + 3. └─rlang::abort(message = message) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(plotROC) + Loading required package: ggplot2 + > + > test_check("plotROC") + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 13 ] + + ... + 2. │ └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. ├─base::nrow(calc_auc(ggroc_p)) + 5. ├─plotROC::calc_auc(ggroc_p) + 6. │ └─rlang::quo_get_expr(l2$plot$mapping[current_name][[1]]) + 7. └─rlang::abort(message = message) + + [ FAIL 1 | WARN 1 | SKIP 0 | PASS 13 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘examples.Rmd’ using rmarkdown + ``` + +# plotthis + +
+ +* Version: 0.7.0 +* GitHub: https://github.com/pwwang/plotthis +* Source code: https://github.com/cran/plotthis +* Date/Publication: 2025-05-31 05:00:02 UTC +* Number of recursive dependencies: 213 + +Run `revdepcheck::cloud_details(, "plotthis")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘plotthis-Ex.R’ failed + The error most likely occurred in: + + > ### Name: QQPlot + > ### Title: QQ plot + > ### Aliases: QQPlot + > + > ### ** Examples + > + > set.seed(8525) + ... + 26. │ └─ggplot2 (local) FUN(X[[i]], ...) + 27. │ └─self$draw_group(group, panel_params, coord, ...) + 28. │ └─ggplot2 (local) draw_group(...) + 29. │ └─ggplot2 (local) draw_group(..., self = self) + 30. └─base::.handleSimpleError(...) + 31. └─rlang (local) h(simpleError(msg, call)) + 32. └─handlers[[1L]](cnd) + 33. └─cli::cli_abort(...) + 34. └─rlang::abort(...) + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.0Mb + sub-directories of 1Mb or more: + R 1.5Mb + help 3.3Mb + ``` + +# pmartR + +
+ +* Version: 2.5.0 +* GitHub: https://github.com/pmartR/pmartR +* Source code: https://github.com/cran/pmartR +* Date/Publication: 2025-04-23 18:00:02 UTC +* Number of recursive dependencies: 144 + +Run `revdepcheck::cloud_details(, "pmartR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(pmartR) + > + > test_check("pmartR") + [ FAIL 1 | WARN 11 | SKIP 11 | PASS 2380 ] + + ══ Skipped tests (11) ══════════════════════════════════════════════════════════ + ... + • plots/plot-spansres-n-biomolecule-bar.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 + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 10.7Mb + sub-directories of 1Mb or more: + R 1.5Mb + help 1.5Mb + libs 6.6Mb + ``` + +# pmxTools + +
+ +* 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: 82 + +Run `revdepcheck::cloud_details(, "pmxTools")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + 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 ] + + ... + 44. └─handlers[[1L]](cnd) + 45. └─cli::cli_abort(...) + 46. └─rlang::abort(...) + + [ FAIL 1 | WARN 1 | SKIP 12 | PASS 110 ] + Deleting unused snapshots: + • plot/conditioned-distplot.svg + • plot/perc.svg + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) plot_scm.Rd:106: Lost braces; missing escapes or markup? + 106 | \item{lookupDF}{A data frame containing a lookup table for node labels. By default, {plot_scm} will use the PSN model names. If a lookup table containing the fields `Model` and `Alias` is provided, model names in `Model` will be replaced in the output plots by mtaching labels in `Alias`.} + | ^ + checkRd: (-1) rnm.Rd:56: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:57: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:58: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:59: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:60: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:61: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:62: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:63: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:64: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:65: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:66: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:67: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:68: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:69: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:70: Lost braces in \itemize; meant \describe ? + checkRd: (-1) rnm.Rd:71: Lost braces in \itemize; meant \describe ? + ``` + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘DiagrammeR’ + ``` + +# pollster + +
+ +* Version: 0.1.6 +* GitHub: NA +* Source code: https://github.com/cran/pollster +* Date/Publication: 2023-05-12 19:00:05 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "pollster")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘crosstab3way.Rmd’ using rmarkdown + + Quitting from crosstab3way.Rmd:40-54 [unnamed-chunk-3] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! object is invalid: + - every label must be named. + --- + ... + 3. └─S7::new_object(labels) + 4. └─S7::validate(object, recursive = !parent_validated) + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'crosstab3way.Rmd' failed with diagnostics: + object is invalid: + - every label must be named. + --- failed re-building ‘crosstab3way.Rmd’ + + --- re-building ‘crosstabs.Rmd’ using rmarkdown + ``` + +# poppr + +
+ +* Version: 2.9.6 +* GitHub: https://github.com/grunwaldlab/poppr +* Source code: https://github.com/cran/poppr +* Date/Publication: 2024-03-15 17:40:02 UTC +* Number of recursive dependencies: 95 + +Run `revdepcheck::cloud_details(, "poppr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘poppr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: genotype_curve + > ### Title: Produce a genotype accumulation curve + > ### Aliases: genotype_curve + > + > ### ** Examples + > + > data(nancycats) + > nan_geno <- genotype_curve(nancycats) + Error: object is invalid: + - every label must be named. + Execution halted + ``` + +## In both + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘algo.Rnw’ using knitr + Error: processing vignette 'algo.Rnw' failed with diagnostics: + Running 'texi2dvi' on 'algo.tex' failed. + LaTeX errors: + ! LaTeX Error: File `colortbl.sty' not found. + + Type X to quit or to proceed, + or enter new name. (Default extension: sty) + ... + l.4 \makeatletter + ^^M + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘algo.Rnw’ + + SUMMARY: processing the following file failed: + ‘algo.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# PoweREST + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/PoweREST +* Date/Publication: 2024-09-09 09:30:02 UTC +* Number of recursive dependencies: 181 + +Run `revdepcheck::cloud_details(, "PoweREST")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘PoweREST-Ex.R’ failed + The error most likely occurred in: + + > ### Name: vis_XGBoost + > ### Title: Visualization of the power estimations from XGBoost + > ### Aliases: vis_XGBoost + > + > ### ** Examples + > + > data(power_example) + ... + # Good: !!myquosure * rhs + Backtrace: + ▆ + 1. └─PoweREST::vis_XGBoost(...) + 2. ├─base::eval(parse(text = txt3)) + 3. │ └─base::eval(parse(text = txt3)) + 4. └─rayshader::plot_gg(mtplot, width = 3.5, raytrace = FALSE, preview = TRUE) + 5. └─rlang:::Ops.quosure(ggplotobj2$layers[[i]]$geom$default_aes$size, pointcontract) + 6. └─rlang::abort(...) + Execution halted + ``` + +# PPforest + +
+ +* Version: 0.1.3 +* GitHub: https://github.com/natydasilva/PPforest +* Source code: https://github.com/cran/PPforest +* Date/Publication: 2022-09-09 23:32:55 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "PPforest")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘PPforest-vignette.Rmd’ using rmarkdown + + Quitting from PPforest-vignette.Rmd:117-129 [descri] + Error: processing vignette 'PPforest-vignette.Rmd' failed with diagnostics: + C stack usage 9964404 is too close to the limit + --- failed re-building ‘PPforest-vignette.Rmd’ + + SUMMARY: processing the following file failed: + ‘PPforest-vignette.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.0Mb + sub-directories of 1Mb or more: + libs 4.8Mb + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) NCI60.Rd:19: Lost braces in \itemize; meant \describe ? + checkRd: (-1) NCI60.Rd:20: Lost braces in \itemize; meant \describe ? + checkRd: (-1) crab.Rd:21: Lost braces in \itemize; meant \describe ? + checkRd: (-1) crab.Rd:22: Lost braces in \itemize; meant \describe ? + checkRd: (-1) crab.Rd:23: Lost braces in \itemize; meant \describe ? + checkRd: (-1) crab.Rd:24: Lost braces in \itemize; meant \describe ? + checkRd: (-1) crab.Rd:25: Lost braces in \itemize; meant \describe ? + checkRd: (-1) crab.Rd:26: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fishcatch.Rd:20: Lost braces in \itemize; meant \describe ? + checkRd: (-1) fishcatch.Rd:21: Lost braces in \itemize; meant \describe ? + ... + checkRd: (-1) parkinson.Rd:37: Lost braces in \itemize; meant \describe ? + checkRd: (-1) parkinson.Rd:38: Lost braces in \itemize; meant \describe ? + checkRd: (-1) parkinson.Rd:39: Lost braces in \itemize; meant \describe ? + checkRd: (-1) parkinson.Rd:40: Lost braces in \itemize; meant \describe ? + checkRd: (-1) parkinson.Rd:41: Lost braces in \itemize; meant \describe ? + checkRd: (-1) parkinson.Rd:11: Lost braces + 11 | url{https://archive.ics.uci.edu/ml/datasets/Parkinsons} + | ^ + checkRd: (-1) wine.Rd:18: Lost braces in \itemize; meant \describe ? + checkRd: (-1) wine.Rd:19: Lost braces in \itemize; meant \describe ? + ``` + +# PPQplan + +
+ +* Version: 1.1.0 +* GitHub: https://github.com/allenzhuaz/PPQplan +* Source code: https://github.com/cran/PPQplan +* Date/Publication: 2020-10-08 04:30:06 UTC +* Number of recursive dependencies: 116 + +Run `revdepcheck::cloud_details(, "PPQplan")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘PPQnote.Rmd’ using rmarkdown + --- finished re-building ‘PPQnote.Rmd’ + + --- re-building ‘PPQplan-vignette.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 12.1Mb + sub-directories of 1Mb or more: + doc 12.0Mb + ``` + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# ppseq + +
+ +* Version: 0.2.5 +* GitHub: https://github.com/zabore/ppseq +* Source code: https://github.com/cran/ppseq +* Date/Publication: 2024-09-04 22:20:02 UTC +* Number of recursive dependencies: 102 + +Run `revdepcheck::cloud_details(, "ppseq")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘one_sample_expansion.Rmd’ using rmarkdown + + Quitting from one_sample_expansion.Rmd:182-188 [unnamed-chunk-13] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ! subscript out of bounds + --- + Backtrace: + ... + + Error: processing vignette 'two_sample_randomized.Rmd' failed with diagnostics: + subscript out of bounds + --- failed re-building ‘two_sample_randomized.Rmd’ + + SUMMARY: processing the following files failed: + ‘one_sample_expansion.Rmd’ ‘two_sample_randomized.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 11.0Mb + sub-directories of 1Mb or more: + doc 10.5Mb + ``` + +# PRECAST + +
+ +* Version: 1.6.6 +* GitHub: https://github.com/feiyoung/PRECAST +* Source code: https://github.com/cran/PRECAST +* Date/Publication: 2025-03-27 15:20:02 UTC +* Number of recursive dependencies: 218 + +Run `revdepcheck::cloud_details(, "PRECAST")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘PRECAST-Ex.R’ failed + The error most likely occurred in: + + > ### Name: SpaPlot + > ### Title: Spatial heatmap + > ### Aliases: SpaPlot + > + > ### ** Examples + > + > + ... + 2025-06-05 13:43:07.226264 : ***** New Seurat object is generated!, 0.003 mins elapsed. + > SpaPlot(seuInt) + 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 PRECAST package. + Please report the issue at . + Error: object properties are invalid: + - @colour must be , , or , not + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 14.3Mb + sub-directories of 1Mb or more: + data 2.2Mb + libs 11.3Mb + ``` + +# precintcon + +
+ +* Version: 2.3.0 +* GitHub: https://github.com/lucasvenez/precintcon +* Source code: https://github.com/cran/precintcon +* Date/Publication: 2016-07-17 13:49:19 +* Number of recursive dependencies: 26 + +Run `revdepcheck::cloud_details(, "precintcon")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘precintcon-Ex.R’ failed + The error most likely occurred in: + + > ### Name: pplot.deciles + > ### Title: Plot deciles + > ### Aliases: pplot.deciles precintcon.plot.deciles + > ### Keywords: deciles precipitation + > + > ### ** Examples + > + ... + 1. └─precintcon::pplot.deciles(monthly) + 2. └─precintcon::precintcon.plot.deciles(...) + 3. └─base::mapply(...) + 4. └─precintcon (local) ``(...) + 5. └─ggplot2::geom_boxplot(...) + 6. └─ggplot2::layer(...) + 7. └─lifecycle::deprecate_stop("2.0.0", "layer(show_guide)", "layer(show.legend)") + 8. └─lifecycle:::deprecate_stop0(msg) + 9. └─rlang::cnd_signal(...) + Execution halted + ``` + +# predint + +
+ +* Version: 2.2.1 +* GitHub: https://github.com/MaxMenssen/predint +* Source code: https://github.com/cran/predint +* Date/Publication: 2024-03-04 15:10:03 UTC +* Number of recursive dependencies: 69 + +Run `revdepcheck::cloud_details(, "predint")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(predint) + Loading required package: ggplot2 + Loading required package: lme4 + Loading required package: Matrix + Loading required package: MASS + + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-plot.R:16:9'): plot must be a ggplot ───────────────────────── + is.list(qp_plot) is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 304 ] + Error: Test failures + Execution halted + ``` + +# PredPsych + +
+ +* Version: 0.4 +* GitHub: NA +* Source code: https://github.com/cran/PredPsych +* Date/Publication: 2019-07-23 08:20:05 UTC +* Number of recursive dependencies: 108 + +Run `revdepcheck::cloud_details(, "PredPsych")` for more info + +
+ +## Newly broken + +* checking whether package ‘PredPsych’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘PredPsych’ + See ‘/tmp/workdir/PredPsych/new/PredPsych.Rcheck/00install.out’ for details. + ``` + +# predRupdate + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/GlenMartin31/predRupdate +* Source code: https://github.com/cran/predRupdate +* Date/Publication: 2024-08-23 14:20:02 UTC +* Number of recursive dependencies: 113 + +Run `revdepcheck::cloud_details(, "predRupdate")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(predRupdate) + > + > test_check("predRupdate") + $OE_ratio + [1] 1.900612 + + ... + `expected[2:2]`: "ggplot" + ── Failure ('test-flex_calplot.R:28:3'): flex_calplot works ──────────────────── + class(...) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 2 | WARN 0 | SKIP 4 | PASS 229 ] + Error: Test failures + Execution halted + ``` + +# probably + +
+ +* Version: 1.1.0 +* GitHub: https://github.com/tidymodels/probably +* Source code: https://github.com/cran/probably +* Date/Publication: 2025-05-21 13:30:02 UTC +* Number of recursive dependencies: 130 + +Run `revdepcheck::cloud_details(, "probably")` 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 + ... + `expected` is a list + ── Failure ('test-cal-plot.R:256:3'): Binary logistic functions work with group argument ── + res$labels (`actual`) not equal to list(x = "Probability", y = "Predicted Event Rate") (`expected`). + + `actual` is an S7 object of class + `expected` is a list + + [ FAIL 2 | WARN 0 | SKIP 84 | PASS 549 ] + Error: Test failures + Execution halted + ``` + +# processmapR + +
+ +* Version: 0.5.6 +* GitHub: https://github.com/bupaverse/processmapr +* Source code: https://github.com/cran/processmapR +* Date/Publication: 2024-12-03 12:50:02 UTC +* Number of recursive dependencies: 115 + +Run `revdepcheck::cloud_details(, "processmapR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(processmapR) + + Attaching package: 'processmapR' + + The following object is masked from 'package:stats': + + ... + 10. └─processmapR:::return_plotly(p, plotly) + 11. ├─plotly::ggplotly(p) + 12. └─plotly:::ggplotly.ggplot(p) + 13. └─plotly::gg2list(...) + ── Failure ('test_trace_explorer.R:240:3'): test trace_explorer on eventlog with param `plotly` ── + `chart` inherits from 'ggplot2::ggplot'/'ggplot'/'ggplot2::gg'/'S7_object'/'gg' not 'plotly'. + + [ FAIL 6 | WARN 0 | SKIP 11 | PASS 105 ] + Error: Test failures + Execution halted + ``` + +# psborrow + +
+ +* Version: 0.2.2 +* GitHub: NA +* Source code: https://github.com/cran/psborrow +* Date/Publication: 2025-02-19 13:40:02 UTC +* Number of recursive dependencies: 104 + +Run `revdepcheck::cloud_details(, "psborrow")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(psborrow) + > + > test_check("psborrow") + Input all is found in pred. Any other input is disregarded. + [ FAIL 20 | WARN 0 | SKIP 1 | PASS 134 ] + + ... + `expected`: "gg" + ── Failure ('test-plots.R:126:5'): Ensure output is producing a ggplot2 object with appropriate parameters ── + p1$labels$yintercept (`actual`) not equal to "ref" (`expected`). + + `actual` is NULL + `expected` is a character vector ('ref') + + [ FAIL 20 | WARN 0 | SKIP 1 | PASS 134 ] + Error: Test failures + Execution halted + ``` + +* checking whether package ‘psborrow’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: The `size` argument of `element_line()` is deprecated as of ggplot2 3.4.0. + See ‘/tmp/workdir/psborrow/new/psborrow.Rcheck/00install.out’ for details. + ``` + +# psc + +
+ +* Version: 1.3.0 +* GitHub: https://github.com/richJJackson/psc +* Source code: https://github.com/cran/psc +* Date/Publication: 2025-05-29 15:10:02 UTC +* Number of recursive dependencies: 190 + +Run `revdepcheck::cloud_details(, "psc")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘psc-vignette.Rmd’ using rmarkdown + + Quitting from psc-vignette.Rmd:176-178 [unnamed-chunk-5] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'psc-vignette.Rmd' failed with diagnostics: + ... + ℹ In index: 1. + Caused by error: + ! Can't find method for `build_ggplot(S3)`. + --- failed re-building ‘psc-vignette.Rmd’ + + SUMMARY: processing the following file failed: + ‘psc-vignette.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# pscore + +
+ +* Version: 0.4.0 +* GitHub: https://github.com/JWiley/score-project +* Source code: https://github.com/cran/pscore +* Date/Publication: 2022-05-13 22:30:02 UTC +* Number of recursive dependencies: 157 + +Run `revdepcheck::cloud_details(, "pscore")` for more info + +
+ +## Newly broken + +* checking whether package ‘pscore’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: `aes_string()` was deprecated in ggplot2 3.0.0. + See ‘/tmp/workdir/pscore/new/pscore.Rcheck/00install.out’ for details. + ``` + +# psyntur + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/psyntur +* Date/Publication: 2021-09-15 09:20:05 UTC +* Number of recursive dependencies: 102 + +Run `revdepcheck::cloud_details(, "psyntur")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘psyntur-Ex.R’ failed + The error most likely occurred in: + + > ### Name: pairs_plot + > ### Title: A pairs plot + > ### Aliases: pairs_plot + > + > ### ** Examples + > + > # A simple pairs plot + > pairs_plot(variables = c("sex_dimorph", "attractive"), + + data = faithfulfaces) + Error: C stack usage 9965044 is too close to the limit + Execution halted + ``` + +# pubh + +
+ +* Version: 2.0.0 +* GitHub: https://github.com/josie-athens/pubh +* Source code: https://github.com/cran/pubh +* Date/Publication: 2024-10-08 05:00:03 UTC +* Number of recursive dependencies: 159 + +Run `revdepcheck::cloud_details(, "pubh")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘pubh-Ex.R’ failed + The error most likely occurred in: + + > ### Name: axis_labs + > ### Title: Apply labels from variables to axis-labels in plots. + > ### Aliases: axis_labs + > + > ### ** Examples + > + > data(kfm, package = "ISwR") + ... + > kfm |> + + gf_point(weight ~ dl.milk) |> + + gf_lm(col = 2, interval = "confidence", col = 2) |> + + axis_labs() + Warning in rep(yes, length.out = len) : + 'x' is NULL so the result will be NULL + Error in ans[ypos] <- rep(yes, length.out = len)[ypos] : + replacement has length zero + Calls: axis_labs -> ifelse + Execution halted + ``` + +# PvSTATEM + +
+ +* Version: 0.2.2 +* GitHub: https://github.com/mini-pw/PvSTATEM +* Source code: https://github.com/cran/PvSTATEM +* Date/Publication: 2025-02-27 00:30:02 UTC +* Number of recursive dependencies: 94 + +Run `revdepcheck::cloud_details(, "PvSTATEM")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘PvSTATEM-Ex.R’ failed + The error most likely occurred in: + + > ### Name: generate_levey_jennings_report + > ### Title: Generate a Levey-Jennings Report for Multiple Plates. + > ### Aliases: generate_levey_jennings_report + > + > ### ** Examples + > + > output_dir <- tempdir(check = TRUE) + ... + 44. └─ggplot2 (local) ``(...) + 45. └─cli::cli_abort(...) + 46. └─rlang::abort(...) + + Quitting from levey_jennings_report_template.Rmd:101-103 [plate-layout] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + 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 + ... + 8. └─ggplot2:::plot_theme(plot) + 9. └─ggplot2:::check_theme(theme) + 10. └─base::mapply(...) + 11. └─ggplot2 (local) ``(...) + 12. └─cli::cli_abort(...) + 13. └─rlang::abort(...) + + [ FAIL 9 | WARN 19 | SKIP 0 | PASS 315 ] + Error: Test failures + Execution halted + ``` + +# qad + +
+ +* Version: 1.0.4 +* GitHub: https://github.com/griefl/qad +* Source code: https://github.com/cran/qad +* Date/Publication: 2022-12-14 16:50:02 UTC +* Number of recursive dependencies: 93 + +Run `revdepcheck::cloud_details(, "qad")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(qad) + > + > test_check("qad") + Intervalls for the variable x2 + Interval lowerBound upperBound + 1 I1 1 4 + ... + `expected[2:2]`: "ggplot" + ── Failure ('test-utilityfunctions.R:33:3'): plot_density ────────────────────── + class(plot_density(fit$mass_matrix)) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 10 | WARN 26 | SKIP 0 | PASS 71 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) ECBC.Rd:39: Lost braces; missing escapes or markup? + 39 | Let (u_i,v_i) := (F_n(x_i),G_n(y_i)) be the pseudo-observations for i in \{1,\ldots,n\} and (u_1',v_1'),\ldots, (u_m',v_m') the distinct pairs of pseudo-observations with m leq n. Moreover set S_1:=\{0, u_1, \ldots, u_{m_1}\} and S_2:=\{0, v_1,\ldots, v_{m_2}\} and define the quantities t_i,r_i and s_i for i=1,\ldots, m by + | ^ + checkRd: (-1) ECBC.Rd:39: Lost braces; missing escapes or markup? + 39 | Let (u_i,v_i) := (F_n(x_i),G_n(y_i)) be the pseudo-observations for i in \{1,\ldots,n\} and (u_1',v_1'),\ldots, (u_m',v_m') the distinct pairs of pseudo-observations with m leq n. Moreover set S_1:=\{0, u_1, \ldots, u_{m_1}\} and S_2:=\{0, v_1,\ldots, v_{m_2}\} and define the quantities t_i,r_i and s_i for i=1,\ldots, m by + | ^ + checkRd: (-1) ECBC.Rd:49: Lost braces; missing escapes or markup? + 49 | and set the measure of the empirical copula mu_{A_n}^B := 1/n sum_{i=1}^m t_i mu_B^{w_i}, where B denotes the product copula. + | ^ + checkRd: (-1) ECBC.Rd:49: Lost braces; missing escapes or markup? + ... + | ^ + checkRd: (-1) emp_c_copula.Rd:52: Lost braces; missing escapes or markup? + 52 | and set the measure of the empirical copula mu_{A_n}^B := 1/n sum_{i=1}^m t_i mu_B^{w_i}, where B denotes the product copula. + | ^ + checkRd: (-1) emp_c_copula.Rd:52: Lost braces; missing escapes or markup? + 52 | and set the measure of the empirical copula mu_{A_n}^B := 1/n sum_{i=1}^m t_i mu_B^{w_i}, where B denotes the product copula. + | ^ + checkRd: (-1) emp_c_copula.Rd:52: Lost braces; missing escapes or markup? + 52 | and set the measure of the empirical copula mu_{A_n}^B := 1/n sum_{i=1}^m t_i mu_B^{w_i}, where B denotes the product copula. + | ^ + ``` + +# qdap + +
+ +* Version: 2.4.6 +* GitHub: https://github.com/trinker/qdap +* Source code: https://github.com/cran/qdap +* Date/Publication: 2023-05-11 06:10:02 UTC +* Number of recursive dependencies: 95 + +Run `revdepcheck::cloud_details(, "qdap")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library("testthat") + > library("qdap") + Loading required package: qdapDictionaries + Loading required package: qdapRegex + Loading required package: qdapTools + Loading required package: RColorBrewer + + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-dispersion_plot.R:6:5'): dispersion_plot outputs a ggplot object ── + all(class(m) == c("gg", "ggplot")) is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 1 | WARN 3 | SKIP 0 | PASS 217 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.1Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 2.0Mb + help 1.5Mb + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) check_text.Rd:19: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) check_text.Rd:20: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) check_text.Rd:21: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) check_text.Rd:22: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) check_text.Rd:23: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) check_text.Rd:24: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) check_text.Rd:25: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) check_text.Rd:26: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) check_text.Rd:27: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) check_text.Rd:28: Lost braces in \itemize; \value handles \item{}{} directly + ... + checkRd: (-1) word_stats.Rd:70: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) word_stats.Rd:71: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) word_stats.Rd:72: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) word_stats.Rd:73: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) word_stats.Rd:74: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) word_stats.Rd:75: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) word_stats.Rd:76: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) word_stats.Rd:77: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) word_stats.Rd:78: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) word_stats.Rd:79: Lost braces in \itemize; \value handles \item{}{} directly + ``` + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘gplots’ + ``` + +# qgcompint + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/alexpkeil1/qgcompint +* Source code: https://github.com/cran/qgcompint +* Date/Publication: 2025-03-12 16:40:02 UTC +* Number of recursive dependencies: 155 + +Run `revdepcheck::cloud_details(, "qgcompint")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘qgcompint-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.qgcompemmfit + > ### Title: Default plotting method for a qgcompemmfit object + > ### Aliases: plot.qgcompemmfit + > + > ### ** Examples + > + > set.seed(50) + ... + > pp1 = plot(qfit4, emmval=1, suppressprint=TRUE) + > pp2 = plot(qfit4, emmval=2, suppressprint=TRUE) + > pp1 + theme_linedraw() # can use with other ggplot functions + > + > # overlay (fussy to work with) + > #ppom <- ggplot_build(pp0 + pp1[2] + pp2[[2]] + scale_color_discrete(guide="none")) + > ppom <- ggplot_build(pp0ee + pp1ee[2] + pp2ee[[2]] + scale_color_discrete(guide="none")) + Error in S7::prop(x, "meta")[[i]] : subscript out of bounds + Calls: ggplot_build -> [[ -> [[.ggplot2::gg + Execution halted + ``` + +# qicharts2 + +
+ +* Version: 0.8.0 +* GitHub: https://github.com/anhoej/qicharts2 +* Source code: https://github.com/cran/qicharts2 +* Date/Publication: 2025-05-15 08:00:02 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "qicharts2")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘qicharts2-Ex.R’ failed + The error most likely occurred in: + + > ### Name: bchart + > ### Title: Bernoulli CUSUM chart for binary data (EXPERIMENTAL) + > ### Aliases: bchart + > + > ### ** Examples + > + > # Generate 1000 random successes and failures with success rate = 0.02 + ... + ℹ Please use tidy evaluation idioms with `aes()` + ℹ The deprecated feature was likely used in the qicharts2 package. + Please report the issue to the authors. + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the qicharts2 package. + Please report the issue to the authors. + Error: object is invalid: + - every label must be named. + Execution halted + ``` + +# quantities + +
+ +* Version: 0.2.3 +* GitHub: https://github.com/r-quantities/quantities +* Source code: https://github.com/cran/quantities +* Date/Publication: 2025-01-18 21:20:02 UTC +* Number of recursive dependencies: 73 + +Run `revdepcheck::cloud_details(, "quantities")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘introduction.Rmd’ using rmarkdown + ``` + +# QuantNorm + +
+ +* Version: 1.0.5 +* GitHub: https://github.com/tengfei-emory/QuantNorm +* Source code: https://github.com/cran/QuantNorm +* Date/Publication: 2019-02-01 20:23:25 UTC +* Number of recursive dependencies: 72 + +Run `revdepcheck::cloud_details(, "QuantNorm")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘QuantNorm-Ex.R’ failed + The error most likely occurred in: + + > ### Name: connection.matrix + > ### Title: Construct connection matrix for network analysis + > ### Aliases: connection.matrix + > + > ### ** Examples + > + > + > library(network); library(ggplot2); library(sna); library(GGally) #drawing network graph + + ‘network’ 1.19.0 (2024-12-08), part of the Statnet Project + ``` + +# quickPlot + +
+ +* Version: 1.0.2 +* GitHub: https://github.com/PredictiveEcology/quickPlot +* Source code: https://github.com/cran/quickPlot +* Date/Publication: 2023-07-02 05:20:02 UTC +* Number of recursive dependencies: 85 + +Run `revdepcheck::cloud_details(, "quickPlot")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘test-all.R’ + Running the tests in ‘tests/test-all.R’ failed. + Complete output: + > library(testthat) + > test_check("quickPlot") + Loading required package: quickPlot + Error in pgmatrix(grobToPlot, col, real, size, minv, maxv, legend, legendText, : + object 'nrowLegText' not found + Error in pgmatrix(grobToPlot, col, real, size, minv, maxv, legend, legendText, : + object 'nrowLegText' not found + ... + • Plot/test46.png + • Plot/test47.png + • Plot/test5.png + • Plot/test50.png + • Plot/test6.png + • Plot/test7.png + • Plot/test8.png + • Plot/test9.png + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘iii-plotting.Rmd’ using rmarkdown + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘fastshp’ + ``` + +# quickReg + +
+ +* Version: 1.5.0 +* GitHub: NA +* Source code: https://github.com/cran/quickReg +* Date/Publication: 2017-09-28 06:41:12 UTC +* Number of recursive dependencies: 72 + +Run `revdepcheck::cloud_details(, "quickReg")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘quickReg.Rmd’ using rmarkdown + + Quitting from quickReg.Rmd:130-162 [plot] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! object is invalid: + - every label must be named. + --- + ... + Error: processing vignette 'quickReg.Rmd' failed with diagnostics: + object is invalid: + - every label must be named. + --- failed re-building ‘quickReg.Rmd’ + + SUMMARY: processing the following file failed: + ‘quickReg.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘psych’ + All declared Imports should be used. + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) display_table.Rd:37: Lost braces; missing escapes or markup? + 37 | \item{normtest}{A character indicating test of normality, the default method is \code{\link{shapiro.test}} when sample size no more than 5000, otherwise \code{\link[nortest]{lillie.test}} {Kolmogorov-Smirnov} is used, see package \strong{nortest} for more methods.Use 'shapiro.test', 'lillie.test', 'ad.test', etc to specify methods.} + | ^ + ``` + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘PredictABEL’ + ``` + +# R4GoodPersonalFinances + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/R4GoodAcademy/R4GoodPersonalFinances +* Source code: https://github.com/cran/R4GoodPersonalFinances +* Date/Publication: 2025-06-04 11:00:09 UTC +* Number of recursive dependencies: 108 + +Run `revdepcheck::cloud_details(, "R4GoodPersonalFinances")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘R4GoodPersonalFinances-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_retirement_ruin + > ### Title: Plotting retirement ruin + > ### Aliases: plot_retirement_ruin + > + > ### ** Examples + > + > plot_retirement_ruin( + ... + + portfolio_return_mean = 0.034, + + portfolio_return_sd = 0.15, + + age = 65, + + gompertz_mode = 88, + + gompertz_dispersion = 10, + + portfolio_value = 1000000, + + monthly_spendings = 3000 + + ) + Error: `object` must be an , not a S3 + Execution halted + ``` + +# r6qualitytools + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/Fabianenc/r6qualitytools +* Source code: https://github.com/cran/r6qualitytools +* Date/Publication: 2024-10-03 19:30:02 UTC +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "r6qualitytools")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘r6qualitytools-Ex.R’ failed + The error most likely occurred in: + + > ### Name: dotPlot + > ### Title: dotPlot: Function to create a dot plot + > ### Aliases: dotPlot + > + > ### ** Examples + > + > # Create some data and grouping + ... + 31. └─vctrs::vec_default_cast(...) + 32. ├─base::withRestarts(...) + 33. │ └─base (local) withOneRestart(expr, restarts[[1L]]) + 34. │ └─base (local) doWithOneRestart(return(expr), restart) + 35. └─vctrs::stop_incompatible_cast(...) + 36. └─vctrs::stop_incompatible_type(...) + 37. └─vctrs:::stop_incompatible(...) + 38. └─vctrs:::stop_vctrs(...) + 39. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + Execution halted + ``` + +# radiant.model + +
+ +* Version: 1.6.7 +* GitHub: https://github.com/radiant-rstats/radiant.model +* Source code: https://github.com/cran/radiant.model +* Date/Publication: 2024-10-11 05:50:02 UTC +* Number of recursive dependencies: 177 + +Run `revdepcheck::cloud_details(, "radiant.model")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘radiant.model-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.nn + > ### Title: Plot method for the nn function + > ### Aliases: plot.nn + > + > ### ** Examples + > + > result <- nn(titanic, "survived", c("pclass", "sex"), lev = "Yes") + > plot(result, plots = "net") + > plot(result, plots = "olden") + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: plot ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +# Radviz + +
+ +* Version: 0.9.4 +* GitHub: https://github.com/yannabraham/Radviz +* Source code: https://github.com/cran/Radviz +* Date/Publication: 2025-05-09 06:30:02 UTC +* Number of recursive dependencies: 62 + +Run `revdepcheck::cloud_details(, "Radviz")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘Radviz-Ex.R’ failed + The error most likely occurred in: + + > ### Name: Radviz-package + > ### Title: Radviz: Project Multidimensional Data in 2D Space + > ### Aliases: Radviz Radviz-package + > ### Keywords: internal + > + > ### ** Examples + > + ... + 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 Radviz package. + Please report the issue at . + > plot(rv,anchors.only=FALSE) + Error in plot.radviz(rv, anchors.only = FALSE) : + 'language' object cannot be coerced to type 'double' + Calls: plot -> plot.radviz + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘multivariate_analysis.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.6Mb + sub-directories of 1Mb or more: + doc 3.9Mb + libs 2.5Mb + ``` + +# RamanMP + +
+ +* Version: 1.0 +* GitHub: NA +* Source code: https://github.com/cran/RamanMP +* Date/Publication: 2021-07-09 08:10:04 UTC +* Number of recursive dependencies: 60 + +Run `revdepcheck::cloud_details(, "RamanMP")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘RamanMP-Ex.R’ failed + The error most likely occurred in: + + > ### Name: peak.finder + > ### Title: Peaks identification + > ### Aliases: peak.finder + > ### Keywords: peaks + > + > ### ** Examples + > + > data("MPdatabase") + > peak.data<-peak.finder(MPdatabase[,c(1,7)], threshold = 500, m=7) + Error: object properties are invalid: + - @size must be , , or , not + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 8.1Mb + sub-directories of 1Mb or more: + data 8.0Mb + ``` + +# randomForestExplainer + +
+ +* Version: 0.10.1 +* GitHub: https://github.com/ModelOriented/randomForestExplainer +* Source code: https://github.com/cran/randomForestExplainer +* Date/Publication: 2020-07-11 20:30:02 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "randomForestExplainer")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘randomForestExplainer-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_importance_ggpairs + > ### Title: Plot importance measures with ggpairs + > ### Aliases: plot_importance_ggpairs + > + > ### ** Examples + > + > forest <- randomForest::randomForest(Species ~ ., data = iris, localImp = TRUE, ntree = 200) + > frame <- measure_importance(forest, measures = c("mean_min_depth", "times_a_root")) + > plot_importance_ggpairs(frame, measures = c("mean_min_depth", "times_a_root")) + Error in `+.gg`(e1, item) : + 'ggmatrix' does not know how to add objects that do not have class 'theme', 'labels' or 'ggproto'. Received object with class: 'character' + Calls: plot_importance_ggpairs -> +.gg -> add_list_to_ggmatrix -> +.gg + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(randomForestExplainer) + > + > test_check("randomForestExplainer") + [ FAIL 12 | WARN 71 | SKIP 0 | PASS 49 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─randomForestExplainer::plot_importance_rankings(ranger_s) at test_ranger.R:185:3 + 2. └─GGally:::`+.gg`(plot, ggtitle(main)) + 3. └─GGally:::add_list_to_ggmatrix(e1, e2) + 4. └─GGally:::`+.gg`(e1, item) + + [ FAIL 12 | WARN 71 | SKIP 0 | PASS 49 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘randomForestExplainer.Rmd’ using rmarkdown + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# rassta + +
+ +* Version: 1.0.6 +* GitHub: https://github.com/bafuentes/rassta +* Source code: https://github.com/cran/rassta +* Date/Publication: 2024-08-19 06:20:13 UTC +* Number of recursive dependencies: 106 + +Run `revdepcheck::cloud_details(, "rassta")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘rassta-Ex.R’ failed + The error most likely occurred in: + + > ### Name: select_functions + > ### Title: Select Constrained Univariate Distribution Functions + > ### Aliases: select_functions + > + > ### ** Examples + > + > require(terra) + ... + + ) + > tvars <- terra::rast(tf) + > # Single-layer SpatRaster of topographic classification units + > ## 5 classification units + > tcf <- list.files(path = p, pattern = "topography.tif", full.names = TRUE) + > tcu <- terra::rast(tcf) + > # Automatic selection of distribution functions + > tdif <- select_functions(cu.rast = tcu, var.rast = tvars, fun = mean) + Error: C stack usage 9963172 is too close to the limit + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > + > if ( requireNamespace("tinytest", quietly=TRUE) ){ + + tinytest::test_package("rassta") + + } + + Attaching package: 'rassta' + + ... + test_select_functions.R....... 0 tests + test_select_functions.R....... 0 tests + test_select_functions.R....... 0 tests + test_select_functions.R....... 0 tests + test_select_functions.R....... 0 tests + test_select_functions.R....... 0 tests + test_select_functions.R....... 0 tests + test_select_functions.R....... 0 tests + test_select_functions.R....... 0 tests Error: C stack usage 9964884 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘classunits.Rmd’ using rmarkdown + --- finished re-building ‘classunits.Rmd’ + + --- re-building ‘modeling.Rmd’ using rmarkdown + --- finished re-building ‘modeling.Rmd’ + + --- re-building ‘sampling.Rmd’ using rmarkdown + --- finished re-building ‘sampling.Rmd’ + + ... + --- finished re-building ‘similarity.Rmd’ + + --- re-building ‘stratunits.Rmd’ using rmarkdown + --- finished re-building ‘stratunits.Rmd’ + + SUMMARY: processing the following file failed: + ‘signature.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# rasterdiv + +
+ +* Version: 0.3.6 +* GitHub: https://github.com/mattmar/rasterdiv +* Source code: https://github.com/cran/rasterdiv +* Date/Publication: 2024-11-06 11:20:03 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "rasterdiv")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘rasterdiv_01_Basics.Rmd’ using rmarkdown + ``` + +# rater + +
+ +* Version: 1.3.1 +* GitHub: https://github.com/jeffreypullin/rater +* Source code: https://github.com/cran/rater +* Date/Publication: 2023-09-11 17:40:02 UTC +* Number of recursive dependencies: 89 + +Run `revdepcheck::cloud_details(, "rater")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(rater) + * The rater package uses `Stan` to fit bayesian models. + * If you are working on a local, multicore CPU with excess RAM please call: + * options(mc.cores = parallel::detectCores()) + * This will allow Stan to run inference on multiple cores in parallel. + > + ... + ── Failure ('test_plotting.R:65:3'): plot_theta_points output has correct type ── + get_geoms(ds_plot) (`actual`) not equal to c("GeomPoint", "GeomErrorbar") (`expected`). + + `names(actual)` is a character vector ('geom_point', 'geom_errorbar') + `names(expected)` is absent + + [ FAIL 4 | WARN 0 | SKIP 6 | PASS 375 ] + Error: Test failures + In addition: There were 12 warnings (use warnings() to see them) + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 124.5Mb + sub-directories of 1Mb or more: + libs 123.7Mb + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) as_mcmc.list.Rd:5: Lost braces; missing escapes or markup? + 5 | \title{Convert a rater_fit object to a {coda} \code{mcmc.list} object.} + | ^ + checkRd: (-1) as_mcmc.list.Rd:16: Lost braces; missing escapes or markup? + 16 | Convert a rater_fit object to a {coda} \code{mcmc.list} object. + | ^ + checkRd: (-1) as_mcmc.list.Rd:13: Lost braces; missing escapes or markup? + 13 | A {coda} mcmc.list object. + | ^ + ``` + +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. + ``` + +# ratlas + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/atlas-aai/ratlas +* Source code: https://github.com/cran/ratlas +* Date/Publication: 2024-11-06 16:20:02 UTC +* Number of recursive dependencies: 136 + +Run `revdepcheck::cloud_details(, "ratlas")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(ratlas) + NOTE: Either Arial Narrow or Montserrat fonts are required to use these themes. + Please use ratlas::import_montserrat() to install Montserrat and + if Arial Narrow is not on your system, please see https://bit.ly/arialnarrow + > + ... + • okabeito-color-scales/okabeito-fill.svg + • okabeito-color-scales/okabeito-lighten.svg + • stat-bin/bins30-bound0.svg + • stat-bin/no-color-hist.svg + • stat-bin/one-bin.svg + • stat-bin/trimmed-hist-bound0.svg + • stat-bin/trimmed-hist-center0.svg + • themes/theme-atlas.svg + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘plotting.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.1Mb + sub-directories of 1Mb or more: + doc 2.6Mb + rstudio 1.6Mb + ``` + +# rBiasCorrection + +
+ +* Version: 0.3.5 +* GitHub: https://github.com/kapsner/rBiasCorrection +* Source code: https://github.com/cran/rBiasCorrection +* Date/Publication: 2025-04-05 13:50:02 UTC +* Number of recursive dependencies: 121 + +Run `revdepcheck::cloud_details(, "rBiasCorrection")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘rBiasCorrection-Ex.R’ failed + The error most likely occurred in: + + > ### Name: create_exampleplot + > ### Title: create_exampleplot helper function + > ### Aliases: create_exampleplot + > + > ### ** Examples + > + > gdat <- rBiasCorrection::example._plot.df_agg + ... + + coef_cubic = coef_c, + + plot_height = 5, + + plot_width = 7.5, + + plot_textsize = 1, + + filename = paste0(tempdir(), "/exampleplot.png") + + ) + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: create_exampleplot ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # https://github.com/Rdatatable/data.table/issues/5658 + > Sys.setenv("OMP_THREAD_LIMIT" = 2) + > Sys.setenv("Ncpu" = 2) + > + > library(testthat) + > library(rBiasCorrection) + > + ... + 33. ├─grid::validDetails(x) + 34. └─grid:::validDetails.text(x) + 35. ├─base::as.character(x$label) + 36. └─base::as.character.default(x$label) + + [ FAIL 4 | WARN 30 | SKIP 12 | PASS 30 ] + Error: Test failures + Execution halted + Error in deferred_run(env) : could not find function "deferred_run" + Calls: + ``` + +# rbioacc + +
+ +* Version: 1.2.1 +* GitHub: NA +* Source code: https://github.com/cran/rbioacc +* Date/Publication: 2024-02-27 01:40:02 UTC +* Number of recursive dependencies: 97 + +Run `revdepcheck::cloud_details(, "rbioacc")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(rbioacc) + > + > test_check("rbioacc") + + SAMPLING FOR MODEL 'TK' NOW (CHAIN 1). + Chain 1: + ... + `expected`: TRUE + ── Failure ('test-ppc.R:16:5'): plot ppc ─────────────────────────────────────── + all(class(ppc(fit_MGSG)) == c("gg", "ggplot")) is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 20 | WARN 99 | SKIP 9 | PASS 60 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 94.5Mb + sub-directories of 1Mb or more: + libs 93.8Mb + ``` + +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. + ``` + +# rbiom + +
+ +* Version: 2.2.0 +* GitHub: https://github.com/cmmr/rbiom +* Source code: https://github.com/cran/rbiom +* Date/Publication: 2025-04-04 20:20:02 UTC +* Number of recursive dependencies: 107 + +Run `revdepcheck::cloud_details(, "rbiom")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘rbiom-Ex.R’ failed + The error most likely occurred in: + + > ### Name: bdiv_heatmap + > ### Title: Display beta diversities in an all vs all grid. + > ### Aliases: bdiv_heatmap + > + > ### ** Examples + > + > library(rbiom) + ... + 18. │ │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]]) + 19. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler) + 20. │ └─base::withCallingHandlers(...) + 21. └─ggplot2 (local) f(l = layers[[i]], d = data[[i]]) + 22. └─l$layer_data(plot@data) + 23. └─ggplot2::layer_data(..., self = self) + 24. └─ggplot2:::unrowname(data) + 25. └─cli::cli_abort("Can only remove rownames from {.cls data.frame} and {.cls matrix} objects.") + 26. └─rlang::abort(...) + Execution halted + ``` + +## Newly fixed + +* checking tests ... ERROR + ``` + Running ‘testthat.r’ + Running the tests in ‘tests/testthat.r’ failed. + Complete output: + > library(testthat) + > library(rbiom) + > + > test_check("rbiom") + [ FAIL 1 | WARN 0 | SKIP 32 | PASS 191 ] + + ══ Skipped tests (32) ══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. ├─testthat::expect_s3_class(read_tree(tree), "phylo") at test-read_tree.r:4:3 + 2. │ └─testthat::quasi_label(enquo(object), arg = "object") + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. └─rbiom::read_tree(tree) + + [ FAIL 1 | WARN 0 | SKIP 32 | PASS 191 ] + Error: Test failures + Execution halted + ``` + +# reda + +
+ +* Version: 0.5.4 +* GitHub: https://github.com/wenjie2wang/reda +* Source code: https://github.com/cran/reda +* Date/Publication: 2022-07-08 21:50:02 UTC +* Number of recursive dependencies: 51 + +Run `revdepcheck::cloud_details(, "reda")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > if (requireNamespace("tinytest", quietly = TRUE) && + + utils::packageVersion("tinytest") >= "1.1.0") { + + + + ## Set a seed to make the test deterministic + + set.seed(808) + + + + tinytest::test_package("reda", ncpu = NULL, + ... + call| --> lty = 1:4, col = 1:4)), c("gg", "ggplot")) + diff| Lengths (2, 5) differ (string compare on first 2) + diff| 1 string mismatch + ----- FAILED[data]: test_rateReg.R<152--152> + call| expect_equivalent(class(plot(mcf_splineFit)), c("gg", "ggplot")) + diff| Lengths (2, 5) differ (string compare on first 2) + diff| 1 string mismatch + Error: 8 out of 191 tests failed + In addition: There were 16 warnings (use warnings() to see them) + Execution halted + ``` + +## In both + +* checking C++ specification ... NOTE + ``` + Specified C++11: please drop specification unless essential + ``` + +* checking installed package size ... NOTE + ``` + installed size is 8.0Mb + sub-directories of 1Mb or more: + doc 3.3Mb + libs 4.0Mb + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) simEvent.Rd:112: Lost braces; missing escapes or markup? + 112 | and another argument named {zCoef} for covariate coefficient vector. + | ^ + ``` + +# regtomean + +
+ +* Version: 1.2 +* GitHub: NA +* Source code: https://github.com/cran/regtomean +* Date/Publication: 2024-12-17 15:00:02 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "regtomean")` for more info + +
+ +## Newly broken + +* checking whether package ‘regtomean’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘ggplot2::set_theme’ by ‘sjPlot::set_theme’ when loading ‘regtomean’ + See ‘/tmp/workdir/regtomean/new/regtomean.Rcheck/00install.out’ for details. + ``` + +## In both + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘plyr’ + ``` + +# rempsyc + +
+ +* Version: 0.1.9 +* GitHub: https://github.com/rempsyc/rempsyc +* Source code: https://github.com/cran/rempsyc +* Date/Publication: 2025-02-01 23:40:05 UTC +* Number of recursive dependencies: 176 + +Run `revdepcheck::cloud_details(, "rempsyc")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘rempsyc-Ex.R’ failed + The error most likely occurred in: + + > ### Name: nice_normality + > ### Title: Easy normality check per group + > ### Aliases: nice_normality + > ### Keywords: QQ density distribution normality plots + > + > ### ** Examples + > + ... + 33. │ └─ggplot2 (local) FUN(X[[i]], ...) + 34. │ └─self$draw_group(group, panel_params, coord, ...) + 35. │ └─ggplot2 (local) draw_group(...) + 36. │ └─ggplot2 (local) draw_group(..., self = self) + 37. └─base::.handleSimpleError(...) + 38. └─rlang (local) h(simpleError(msg, call)) + 39. └─handlers[[1L]](cnd) + 40. └─cli::cli_abort(...) + 41. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(rempsyc) + Suggested APA citation: Thériault, R. (2023). rempsyc: Convenience functions for psychology. + Journal of Open Source Software, 8(87), 5466. https://doi.org/10.21105/joss.05466 + > + > test_check("rempsyc") + [ FAIL 2 | WARN 2 | SKIP 20 | PASS 44 ] + ... + 33. │ └─ggplot2 (local) draw_group(..., self = self) + 34. └─base::.handleSimpleError(...) + 35. └─rlang (local) h(simpleError(msg, call)) + 36. └─handlers[[1L]](cnd) + 37. └─cli::cli_abort(...) + 38. └─rlang::abort(...) + + [ FAIL 2 | WARN 2 | SKIP 20 | PASS 44 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘assumptions.Rmd’ using rmarkdown + + Quitting from assumptions.Rmd:134-140 [unnamed-chunk-11] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'assumptions.Rmd' failed with diagnostics: + Problem while converting geom to grob. + ℹ Error occurred in the 1st layer. + Caused by error in `check_linewidth()`: + ! could not find function "check_linewidth" + --- failed re-building ‘assumptions.Rmd’ + + --- re-building ‘contrasts.Rmd’ using rmarkdown + ``` + +# reportRmd + +
+ +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/reportRmd +* Date/Publication: 2025-01-24 18:40:02 UTC +* Number of recursive dependencies: 131 + +Run `revdepcheck::cloud_details(, "reportRmd")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘reportRmd-Ex.R’ failed + The error most likely occurred in: + + > ### Name: forestplot2 + > ### Title: Create a forest plot using ggplot2 + > ### Aliases: forestplot2 + > ### Keywords: plot + > + > ### ** Examples + > + ... + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the ggplot2 package. + Please report the issue at . + Warning in geom_errorbar(..., orientation = orientation) : + Ignoring unknown parameters: `height` + Warning: Vectorized input to `element_text()` is not officially supported. + ℹ Results may be unexpected or may change in future versions of ggplot2. + Error in if (value %in% options) { : the condition has length > 1 + Calls: forestplot2 ... validate -> validate_properties -> prop_validate -> validator + Execution halted + ``` + +# ReturnCurves + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/lidiamandre/ReturnCurves +* Source code: https://github.com/cran/ReturnCurves +* Date/Publication: 2025-02-05 17:40:02 UTC +* Number of recursive dependencies: 97 + +Run `revdepcheck::cloud_details(, "ReturnCurves")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ReturnCurves-Ex.R’ failed + The error most likely occurred in: + + > ### Name: adf_est + > ### Title: Estimation of the Angular Dependence Function (ADF) + > ### Aliases: adf_est + > + > ### ** Examples + > + > library(ReturnCurves) + ... + 24. └─vctrs::vec_default_cast(...) + 25. ├─base::withRestarts(...) + 26. │ └─base (local) withOneRestart(expr, restarts[[1L]]) + 27. │ └─base (local) doWithOneRestart(return(expr), restart) + 28. └─vctrs::stop_incompatible_cast(...) + 29. └─vctrs::stop_incompatible_type(...) + 30. └─vctrs:::stop_incompatible(...) + 31. └─vctrs:::stop_vctrs(...) + 32. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘ReturnCurves.Rmd’ using rmarkdown + + Quitting from ReturnCurves.Rmd:309-312 [plotsadfest] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'ReturnCurves.Rmd' failed with diagnostics: + Can't convert `na_value` to . + --- failed re-building ‘ReturnCurves.Rmd’ + + SUMMARY: processing the following file failed: + ‘ReturnCurves.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# RevGadgets + +
+ +* Version: 1.2.1 +* GitHub: https://github.com/revbayes/RevGadgets +* Source code: https://github.com/cran/RevGadgets +* Date/Publication: 2023-11-29 20:30:02 UTC +* Number of recursive dependencies: 132 + +Run `revdepcheck::cloud_details(, "RevGadgets")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(RevGadgets) + > + > test_check("RevGadgets") + + | + | | 0% + ... + Backtrace: + ▆ + 1. ├─RevGadgets::plotFBDTree(...) at test_plotFBDTree.R:12:3 + 2. │ └─RevGadgets:::plotTreeFull(...) + 3. └─base::loadNamespace(x) + 4. └─base (local) runHook(".onLoad", env, package.lib, package) + + [ FAIL 1 | WARN 11 | SKIP 0 | PASS 138 ] + Error: Test failures + Execution halted + ``` + +# ridgetorus + +
+ +* Version: 1.0.2 +* GitHub: https://github.com/egarpor/ridgetorus +* Source code: https://github.com/cran/ridgetorus +* Date/Publication: 2023-08-27 22:40:02 UTC +* Number of recursive dependencies: 132 + +Run `revdepcheck::cloud_details(, "ridgetorus")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ridgetorus-Ex.R’ failed + The error most likely occurred in: + + > ### Name: torus_pairs + > ### Title: Toroidal pairs plot + > ### Aliases: torus_pairs + > + > ### ** Examples + > + > # Generate data + ... + + sigma = diag(0.1, nrow = 2)), + + mvtnorm::rmvnorm(n = n, mean = c(0, pi / 2), + + sigma = diag(0.1, nrow = 2)) + + )) + > col <- rainbow(3)[rep(1:3, each = n)] + > + > # Torus pairs + > torus_pairs(x, col_data = col) + Error: C stack usage 9962340 is too close to the limit + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.1Mb + sub-directories of 1Mb or more: + libs 4.5Mb + ``` + +# rifreg + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/rifreg +* Date/Publication: 2024-05-01 18:42:07 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "rifreg")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(rifreg) + Loading required package: ggplot2 + > + > test_check("rifreg") + Bootstrapping Standard Errors... + + ... + `expected[2:2]`: "ggplot" + ── Failure ('test-plot.R:190:3'): Generic plot method generates a plot for RIF of interquantile ratio ── + class(rifreg_plot) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 10 | WARN 3525 | SKIP 0 | PASS 66 ] + Error: Test failures + Execution halted + ``` + +# RMixtComp + +
+ +* Version: 4.1.4 +* GitHub: https://github.com/modal-inria/MixtComp +* Source code: https://github.com/cran/RMixtComp +* Date/Publication: 2023-06-18 22:50:13 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "RMixtComp")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘RMixtComp-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.MixtCompLearn + > ### Title: Plot of a _MixtCompLearn_ object + > ### Aliases: plot.MixtCompLearn + > + > ### ** Examples + > + > data(iris) + ... + + $discrimPowerVar + + $proportion + + $Petal.Width + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +# RMixtCompUtilities + +
+ +* Version: 4.1.6 +* GitHub: https://github.com/modal-inria/MixtComp +* Source code: https://github.com/cran/RMixtCompUtilities +* Date/Publication: 2023-09-22 12:30:09 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "RMixtCompUtilities")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘RMixtCompUtilities-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plotDataBoxplot + > ### Title: Boxplot per class + > ### Aliases: plotDataBoxplot + > + > ### ** Examples + > + > if (requireNamespace("RMixtCompIO", quietly = TRUE)) { + ... + + plotDataBoxplot(resLearn, "var1") + + } + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the RMixtCompUtilities package. + Please report the issue at . + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) histMisclassif.Rd:22: Lost braces + 22 | err_i = 1 - max_{k={1,\ldots,K}} P(Z_i=k|x_i) + | ^ + checkRd: (-1) histMisclassif.Rd:22: Lost braces + 22 | err_i = 1 - max_{k={1,\ldots,K}} P(Z_i=k|x_i) + | ^ + ``` + +# rmweather + +
+ +* Version: 0.2.62 +* GitHub: https://github.com/skgrange/rmweather +* Source code: https://github.com/cran/rmweather +* Date/Publication: 2025-02-21 00:20:02 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "rmweather")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(dplyr) + + Attaching package: 'dplyr' + + The following object is masked from 'package:testthat': + + ... + ── Failure ('test_02_rmw_functions.R:83:3'): Test training function ──────────── + class(rmw_plot_importance(df_importance)) not identical to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + ── Failure ('test_02_rmw_functions.R:90:3'): Test training function ──────────── + class(plot_test) not identical to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 40 ] + Error: Test failures + Execution halted + ``` + +# RNAseqQC + +
+ +* 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: 160 + +Run `revdepcheck::cloud_details(, "RNAseqQC")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘data.Rmd’ using rmarkdown + --- finished re-building ‘data.Rmd’ + + --- re-building ‘introduction.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.0Mb + sub-directories of 1Mb or more: + data 4.5Mb + doc 2.3Mb + ``` + +# roahd + +
+ +* Version: 1.4.3 +* GitHub: https://github.com/astamm/roahd +* Source code: https://github.com/cran/roahd +* Date/Publication: 2021-11-04 00:10:02 UTC +* Number of recursive dependencies: 85 + +Run `revdepcheck::cloud_details(, "roahd")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘roahd-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.depthgram + > ### Title: Specialized method to plot 'depthgram' objects + > ### Aliases: plot.depthgram + > + > ### ** Examples + > + > N <- 50 + ... + + N, + + centerline = sin(2 * pi * grid), + + Cov = Cov + + ) + > names <- paste0("id_", 1:nrow(Data[[1]])) + > DG <- depthgram(Data, marginal_outliers = TRUE, ids = names) + > plot(DG) + Error in pm[[2]] : subscript out of bounds + Calls: plot ... plotly_build -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.4Mb + sub-directories of 1Mb or more: + data 5.0Mb + doc 1.7Mb + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) fData.Rd:22: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) fData.Rd:23-24: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) fData.Rd:25: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) fData.Rd:26: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) fData.Rd:27-28: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) mfData.Rd:22: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) mfData.Rd:23: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) mfData.Rd:24-25: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) mfData.Rd:26: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) mfData.Rd:27: Lost braces in \itemize; \value handles \item{}{} directly + ... + checkRd: (-1) outliergram.Rd:49-51: Lost braces in \itemize; meant \describe ? + checkRd: (-1) outliergram.Rd:52-54: Lost braces in \itemize; meant \describe ? + checkRd: (-1) outliergram.Rd:55-58: Lost braces in \itemize; meant \describe ? + checkRd: (-1) outliergram.Rd:59-62: Lost braces in \itemize; meant \describe ? + checkRd: (-1) outliergram.Rd:63-65: Lost braces in \itemize; meant \describe ? + checkRd: (-1) outliergram.Rd:66-69: Lost braces in \itemize; meant \describe ? + checkRd: (-1) outliergram.Rd:70-71: Lost braces in \itemize; meant \describe ? + checkRd: (-1) outliergram.Rd:94: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) outliergram.Rd:95-96: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) outliergram.Rd:97: Lost braces in \itemize; \value handles \item{}{} directly + ``` + +# robCompositions + +
+ +* Version: 2.4.1 +* GitHub: NA +* Source code: https://github.com/cran/robCompositions +* Date/Publication: 2023-08-25 15:30:06 UTC +* Number of recursive dependencies: 140 + +Run `revdepcheck::cloud_details(, "robCompositions")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘robCompositions-Ex.R’ failed + The error most likely occurred in: + + > ### Name: biplot.pcaCoDa + > ### Title: Biplot method + > ### Aliases: biplot.pcaCoDa + > ### Keywords: aplot + > + > ### ** Examples + > + ... + > pc <- pcaCoDa(arcticLake, method="classical") + > plot(pc, xlabs=rownames(arcticLake), which = 2) + > plot(pc, xlabs=rownames(arcticLake), which = 3) + 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: C stack usage 9961508 is too close to the limit + Execution halted + ``` + +* checking whether package ‘robCompositions’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘robCompositions’ + See ‘/tmp/workdir/robCompositions/new/robCompositions.Rcheck/00install.out’ for details. + ``` + +## In both + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + --- re-building ‘imputation.Rnw’ using knitr + Error: processing vignette 'imputation.Rnw' failed with diagnostics: + Running 'texi2dvi' on 'imputation.tex' failed. + LaTeX errors: + ! LaTeX Error: File `scrartcl.cls' not found. + + Type X to quit or to proceed, + or enter new name. (Default extension: cls) + + ... + l.3 \usepackage + [pdftex]{hyperref}^^M + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘robCompositions-overview.Rnw’ + + SUMMARY: processing the following files failed: + ‘imputation.Rnw’ ‘robCompositions-overview.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +* checking installed package size ... NOTE + ``` + installed size is 24.0Mb + sub-directories of 1Mb or more: + data 2.0Mb + libs 20.8Mb + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) GDPsatis.Rd:21: Lost braces in \itemize; meant \describe ? + checkRd: (-1) GDPsatis.Rd:22: Lost braces in \itemize; meant \describe ? + checkRd: (-1) GDPsatis.Rd:23: Lost braces in \itemize; meant \describe ? + checkRd: (-1) GDPsatis.Rd:24: Lost braces in \itemize; meant \describe ? + checkRd: (-1) GDPsatis.Rd:25: Lost braces in \itemize; meant \describe ? + checkRd: (-1) GDPsatis.Rd:26: Lost braces in \itemize; meant \describe ? + checkRd: (-1) GDPsatis.Rd:27: Lost braces in \itemize; meant \describe ? + checkRd: (-1) GDPsatis.Rd:28: Lost braces in \itemize; meant \describe ? + checkRd: (-1) aDist.Rd:19: Lost braces + 19 | sets, or a distance matrix in case code{y} is not supplied. + ... + | ^ + checkRd: (-1) weightedPivotCoord.Rd:25: Lost braces; missing escapes or markup? + 25 | `cut = min(#r_{j}=>0/#r_{j}, #r_{j}<0/#r_{j}`, with Gaussian Kernel function and bandwidth `h=0.05`.} + | ^ + checkRd: (-1) weightedPivotCoord.Rd:25: Lost braces; missing escapes or markup? + 25 | `cut = min(#r_{j}=>0/#r_{j}, #r_{j}<0/#r_{j}`, with Gaussian Kernel function and bandwidth `h=0.05`.} + | ^ + checkRd: (-1) weightedPivotCoord.Rd:25: Lost braces; missing escapes or markup? + 25 | `cut = min(#r_{j}=>0/#r_{j}, #r_{j}<0/#r_{j}`, with Gaussian Kernel function and bandwidth `h=0.05`.} + | ^ + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 1 marked UTF-8 string + ``` + +# robustmatrix + +
+ +* Version: 0.1.4 +* GitHub: NA +* Source code: https://github.com/cran/robustmatrix +* Date/Publication: 2025-05-14 15:40:02 UTC +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "robustmatrix")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘MMCD_examples.Rmd’ using rmarkdown + ``` + +# romic + +
+ +* Version: 1.1.3 +* GitHub: NA +* Source code: https://github.com/cran/romic +* Date/Publication: 2023-09-21 05:40:02 UTC +* Number of recursive dependencies: 110 + +Run `revdepcheck::cloud_details(, "romic")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + 3. │ │ └─base::withCallingHandlers(...) + 4. │ ├─plotly::ggplotly(heatmap_plot) %>% plotly::layout(margin = 0) + 5. │ ├─plotly::ggplotly(heatmap_plot) + 6. │ └─plotly:::ggplotly.ggplot(heatmap_plot) + 7. │ └─plotly::gg2list(...) + 8. └─plotly::layout(., margin = 0) + + [ FAIL 1 | WARN 0 | SKIP 7 | PASS 66 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) update_tidy_omic.Rd:16-17: Lost braces + 16 | in \code{updated_tidy_data} (names) and the table {features, samples, + | ^ + ``` + +# roptions + +
+ +* Version: 1.0.3 +* GitHub: NA +* Source code: https://github.com/cran/roptions +* Date/Publication: 2020-05-11 11:10:06 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "roptions")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘roptions-Ex.R’ failed + The error most likely occurred in: + + > ### Name: box.spread + > ### Title: Box Spread Strategy Function + > ### Aliases: box.spread + > + > ### ** Examples + > + > box.spread(100, 105, 95, 110, 3.2, 2.6, 1.1, 2.4) + ... + 35 5.7 + 36 5.7 + 37 5.7 + 38 5.7 + 39 5.7 + 40 5.7 + 41 5.7 + Error in pm[[2]] : subscript out of bounds + Calls: box.spread -> print -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# rPBK + +
+ +* Version: 0.2.4 +* GitHub: NA +* Source code: https://github.com/cran/rPBK +* Date/Publication: 2024-02-26 17:00:02 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "rPBK")` 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 + ... + `expected`: TRUE + ── Failure ('test-ppc.R:7:5'): ppc ───────────────────────────────────────────── + all(class(ppcPBK_C4) == c("gg", "ggplot")) is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 6 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking whether package ‘rPBK’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: namespace ‘colorspace’ is not available and has been replaced + See ‘/tmp/workdir/rPBK/new/rPBK.Rcheck/00install.out’ for details. + ``` + +* checking installed package size ... NOTE + ``` + installed size is 98.4Mb + sub-directories of 1Mb or more: + data 1.5Mb + libs 96.5Mb + ``` + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘rstantools’ + All declared Imports should be used. + ``` + +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. + ``` + +# rrr + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/chrisaddy/rrr +* Source code: https://github.com/cran/rrr +* Date/Publication: 2016-12-09 15:15:55 +* Number of recursive dependencies: 95 + +Run `revdepcheck::cloud_details(, "rrr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘rrr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: residuals + > ### Title: Reduced-Rank Regression Residuals + > ### Aliases: residuals + > + > ### ** Examples + > + > data(tobacco) + ... + 5 -0.124 1.64 -0.362 + 6 -0.0495 0.320 -1.24 + 7 -0.0419 2.08 -0.339 + 8 -0.145 2.75 -0.190 + 9 -0.0979 1.53 -0.588 + 10 -0.355 2.61 -0.333 + # ℹ 15 more rows + > residuals(tobacco_x, tobacco_y, rank = 1) + Error: C stack usage 9965620 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘rrr.Rmd’ using rmarkdown + + Quitting from rrr.Rmd:88-90 [unnamed-chunk-4] + Error: processing vignette 'rrr.Rmd' failed with diagnostics: + C stack usage 9962196 is too close to the limit + --- failed re-building ‘rrr.Rmd’ + + SUMMARY: processing the following file failed: + ‘rrr.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘Rcpp’ + All declared Imports should be used. + ``` + +# RSDA + +
+ +* Version: 3.2.4 +* GitHub: NA +* Source code: https://github.com/cran/RSDA +* Date/Publication: 2025-06-02 19:10:02 UTC +* Number of recursive dependencies: 162 + +Run `revdepcheck::cloud_details(, "RSDA")` for more info + +
+ +## Newly broken + +* checking whether package ‘RSDA’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘RSDA’ + See ‘/tmp/workdir/RSDA/new/RSDA.Rcheck/00install.out’ for details. + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.8Mb + sub-directories of 1Mb or more: + doc 4.6Mb + ``` + +# 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: 159 + +Run `revdepcheck::cloud_details(, "RTIGER")` for more info + +
+ +## Newly broken + +* checking whether package ‘RTIGER’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘RTIGER’ + See ‘/tmp/workdir/RTIGER/new/RTIGER.Rcheck/00install.out’ for details. + ``` + +# RtsEva + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/Alowis/RtsEva +* Source code: https://github.com/cran/RtsEva +* Date/Publication: 2024-06-24 12:30:01 UTC +* Number of recursive dependencies: 98 + +Run `revdepcheck::cloud_details(, "RtsEva")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘RtsEva-Ex.R’ failed + The error most likely occurred in: + + > ### Name: tsEvaPlotSeriesTrendStdDevFromAnalyisObj + > ### Title: tsEvaPlotSeriesTrendStdDevFromAnalyisObj + > ### Aliases: tsEvaPlotSeriesTrendStdDevFromAnalyisObj + > + > ### ** Examples + > + > # Example usage of TsEvaNs function + ... + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the RtsEva package. + Please report the issue at . + Warning: The `size` argument of `element_rect()` is deprecated as of ggplot2 3.4.0. + ℹ Please use the `linewidth` argument instead. + ℹ The deprecated feature was likely used in the RtsEva package. + Please report the issue at . + Error: object properties are invalid: + - @colour must be , , or , not + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.9Mb + sub-directories of 1Mb or more: + data 7.0Mb + ``` + +# RVA + +
+ +* Version: 0.0.5 +* 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: 209 + +Run `revdepcheck::cloud_details(, "RVA")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘RVA.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 8.8Mb + sub-directories of 1Mb or more: + data 7.5Mb + ``` + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘XML’ + All declared Imports should be used. + ``` + +# RVenn + +
+ +* Version: 1.1.0 +* GitHub: NA +* Source code: https://github.com/cran/RVenn +* Date/Publication: 2019-07-18 21:40:02 UTC +* Number of recursive dependencies: 73 + +Run `revdepcheck::cloud_details(, "RVenn")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(RVenn) + > + > test_check("RVenn") + [ FAIL 4 | WARN 1 | SKIP 0 | PASS 31 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + ── Failure ('test_ggvenn.R:16:3'): ggvenn: slices ────────────────────────────── + class(ggvenn(v1, slice = c(2, 4))) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + ── Failure ('test_ggvenn.R:17:3'): ggvenn: slices ────────────────────────────── + class(ggvenn(v1, slice = c("A", "B", "C"))) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 4 | WARN 1 | SKIP 0 | PASS 31 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# Rwtss + +
+ +* Version: 0.9.2 +* GitHub: https://github.com/e-sensing/Rwtss +* Source code: https://github.com/cran/Rwtss +* Date/Publication: 2022-04-25 08:50:05 UTC +* Number of recursive dependencies: 114 + +Run `revdepcheck::cloud_details(, "Rwtss")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(Rwtss) + Rwtss - R interface to Web Time Series Service. + Loaded Rwtss v0.9.2. + See ?Rwtss for help, citation("Rwtss") for use in publication. + See demo(package = "Rwtss") for examples. + ... + Backtrace: + ▆ + 1. ├─vcr::use_cassette(...) at test_wtss.R:53:5 + 2. │ └─cassette$call_block(...) + 3. └─testthat::expect_true(unname(summary(g)[1, 2]) == "gg") at test_wtss.R:60:9 + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 57 ] + Error: Test failures + Execution halted + Ran 14/14 deferred expressions + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) wtss_to_ts.Rd:31: Lost braces; missing escapes or markup? + 31 | This period can be either {"month", "week", "day"}, + | ^ + checkRd: (-1) wtss_to_ts.Rd:32: Lost braces; missing escapes or markup? + 32 | {"months", "weeks", "days"} or + | ^ + checkRd: (-1) wtss_to_ts.Rd:33: Lost braces; missing escapes or markup? + 33 | {12, 52, 365}. This function creates a new time series with the required + | ^ + ``` + +# rYWAASB + +
+ +* Version: 0.3 +* GitHub: https://github.com/abeyran/rYWAASB +* Source code: https://github.com/cran/rYWAASB +* Date/Publication: 2025-05-23 11:02:02 UTC +* Number of recursive dependencies: 177 + +Run `revdepcheck::cloud_details(, "rYWAASB")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘rYWAASB_manual.Rmd’ using rmarkdown + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘lifecycle’ ‘mathjaxr’ + All declared Imports should be used. + ``` + +# sageR + +
+ +* Version: 0.6.1 +* GitHub: https://github.com/fbertran/sageR +* Source code: https://github.com/cran/sageR +* Date/Publication: 2023-03-23 18:40:02 UTC +* Number of recursive dependencies: 257 + +Run `revdepcheck::cloud_details(, "sageR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘sageR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: air_pollution + > ### Title: Air pollution data + > ### Aliases: air_pollution + > ### Keywords: datasets + > + > ### ** Examples + > + ... + $ NONPOOR: num 83.9 69.1 73.3 87.3 73.2 87.1 86.9 86.1 86.1 78.5 ... + $ GE65 : int 109 64 103 103 93 97 82 112 98 81 ... + $ LPOP : num 5.86 5.27 5.45 5.79 5.41 ... + $ l_pm2 : num 4.75 3.06 2.76 7.21 2.9 ... + $ l_pmax : num 5.41 4.82 6.11 5.53 5.39 ... + > library(ggplot2) + > library(GGally) + > GGally::ggpairs(air_pollution[,2:4],) + Error: C stack usage 9961732 is too close to the limit + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 120 marked UTF-8 strings + ``` + +# saros + +
+ +* Version: 1.5.4 +* GitHub: https://github.com/NIFU-NO/saros +* Source code: https://github.com/cran/saros +* Date/Publication: 2025-06-04 12:10:06 UTC +* Number of recursive dependencies: 118 + +Run `revdepcheck::cloud_details(, "saros")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘saros-Ex.R’ failed + The error most likely occurred in: + + > ### Name: girafe + > ### Title: Pull global plotting settings before displaying plot + > ### Aliases: girafe + > + > ### ** Examples + > + > plot <- makeme(data = ex_survey, dep = b_1) + ... + 24. │ └─base::lapply(...) + 25. │ └─ggplot2 (local) FUN(X[[i]], ...) + 26. │ ├─rlang::inject(self$draw_panel(data, panel_params, coord, !!!params)) + 27. │ └─self$draw_panel(...) + 28. └─base::.handleSimpleError(...) + 29. └─rlang (local) h(simpleError(msg, call)) + 30. └─handlers[[1L]](cnd) + 31. └─cli::cli_abort(...) + 32. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(saros) + > + > testthat::test_check("saros") + Starting 2 test processes + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 224 ] + ... + 27. │ └─self$draw_panel(...) + 28. └─base::.handleSimpleError(...) + 29. └─rlang (local) h(simpleError(msg, call)) + 30. └─handlers[[1L]](cnd) + 31. └─cli::cli_abort(...) + 32. └─rlang::abort(...) + + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 224 ] + Error: Test failures + Execution halted + ``` + +# scatterpie + +
+ +* Version: 0.2.4 +* GitHub: NA +* Source code: https://github.com/cran/scatterpie +* Date/Publication: 2024-08-28 17:20:02 UTC +* Number of recursive dependencies: 65 + +Run `revdepcheck::cloud_details(, "scatterpie")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.layer_scatterpie: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# 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: 276 + +Run `revdepcheck::cloud_details(, "scCustomize")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘scCustomize-Ex.R’ failed + The error most likely occurred in: + + > ### Name: Plot_Median_Genes + > ### Title: Plot Median Genes per Cell per Sample + > ### Aliases: Plot_Median_Genes + > + > ### ** Examples + > + > library(Seurat) + ... + 1. └─scCustomize::Plot_Median_Genes(...) + 2. └─scCustomize::theme_ggprism_mod() + 3. ├─... %+replace% ... + 4. │ └─ggplot2::is_theme(e1) + 5. │ └─S7::S7_inherits(x, class_theme) + 6. └─ggprism::theme_prism(...) + 7. └─parent %+replace% t + 8. └─cli::cli_abort("{.code %+replace%} requires two theme objects") + 9. └─rlang::abort(...) + Execution halted + ``` + +# scGate + +
+ +* Version: 1.7.0 +* GitHub: https://github.com/carmonalab/scGate +* Source code: https://github.com/cran/scGate +* Date/Publication: 2025-04-24 14:10:02 UTC +* Number of recursive dependencies: 177 + +Run `revdepcheck::cloud_details(, "scGate")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘scGate-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_tree + > ### Title: Plot model tree + > ### Aliases: plot_tree + > + > ### ** Examples + > + > library(ggparty) + ... + ✖ You've supplied an object. + Backtrace: + ▆ + 1. └─scGate::plot_tree(models$human$generic$Tcell) + 2. └─ggparty::ggparty(py) + 3. ├─ggplot2::ggplot(data = plot_data, mapping = mapping) + 4. └─ggplot2:::ggplot.default(data = plot_data, mapping = mapping) + 5. └─cli::cli_abort(...) + 6. └─rlang::abort(...) + Execution halted + ``` + +## In both + +* checking whether package ‘scGate’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: namespace ‘colorspace’ is not available and has been replaced + See ‘/tmp/workdir/scGate/new/scGate.Rcheck/00install.out’ for details. + ``` + +# schtools + +
+ +* Version: 0.4.1 +* GitHub: https://github.com/SchlossLab/schtools +* Source code: https://github.com/cran/schtools +* Date/Publication: 2023-08-21 14:50:06 UTC +* Number of recursive dependencies: 117 + +Run `revdepcheck::cloud_details(, "schtools")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘introduction.Rmd’ using rmarkdown + + Quitting from introduction.Rmd:76-94 [italic-genus] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! `object` must be an , not a S3 + --- + Backtrace: + ... + + Error: processing vignette 'introduction.Rmd' failed with diagnostics: + `object` must be an , not a S3 + --- failed re-building ‘introduction.Rmd’ + + SUMMARY: processing the following file failed: + ‘introduction.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# scoringutils + +
+ +* Version: 2.1.0 +* GitHub: https://github.com/epiforecasts/scoringutils +* Source code: https://github.com/cran/scoringutils +* Date/Publication: 2025-03-03 18:10:02 UTC +* Number of recursive dependencies: 83 + +Run `revdepcheck::cloud_details(, "scoringutils")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘scoringutils-Ex.R’ failed + The error most likely occurred in: + + > ### Name: get_pit_histogram.forecast_quantile + > ### Title: Probability integral transformation histogram + > ### Aliases: get_pit_histogram.forecast_quantile + > ### get_pit_histogram.forecast_sample get_pit_histogram + > ### get_pit_histogram.default + > ### Keywords: scoring + > + ... + > library("ggplot2") + > + > result <- get_pit_histogram(example_sample_continuous, by = "model") + > ggplot(result, aes(x = mid, y = density)) + + + geom_col() + + + facet_wrap(. ~ model) + + + labs(x = "Quantile", "Density") + Error: object is invalid: + - every label must be named. + Execution halted + ``` + +# scplot + +
+ +* Version: 0.5.1 +* GitHub: NA +* Source code: https://github.com/cran/scplot +* Date/Publication: 2025-03-01 13:10:03 UTC +* Number of recursive dependencies: 115 + +Run `revdepcheck::cloud_details(, "scplot")` for more info + +
+ +## Newly broken + +* checking whether package ‘scplot’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/scplot/new/scplot.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘scplot’ ... +** package ‘scplot’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Warning: The `size` argument of `element_rect()` is deprecated as of ggplot2 3.4.0. +ℹ Please use the `linewidth` argument instead. +ℹ The deprecated feature was likely used in the scplot package. + Please report the issue to the authors. +Error in `class<-`(`*tmp*`, value = "list") : + cannot coerce type 'object' to vector of type 'list' +Error: unable to load R code in package ‘scplot’ +Execution halted +ERROR: lazy loading failed for package ‘scplot’ +* removing ‘/tmp/workdir/scplot/new/scplot.Rcheck/scplot’ + + +``` +### CRAN + +``` +* installing *source* package ‘scplot’ ... +** package ‘scplot’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +** help +*** installing help indices +*** copying figures +** 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 (scplot) + + +``` +# 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: 300 + +Run `revdepcheck::cloud_details(, "SCpubr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # nolint start + > library(testthat) + > library(SCpubr) + + + ── SCpubr 2.0.2 ──────────────────────────────────────────────────────────────── + + ... + - e1: + - e2: + Backtrace: + ▆ + 1. └─SCpubr::do_FeaturePlot(sample, features = "EPC1") at test-utils.R:775:5 + 2. └─S7:::Ops.S7_object(p, ggplot2::ggtitle("")) + + [ FAIL 55 | WARN 16 | SKIP 391 | PASS 25 ] + Error: Test failures + Execution halted + ``` + +# scRNAstat + +
+ +* Version: 0.1.1.1 +* GitHub: NA +* Source code: https://github.com/cran/scRNAstat +* Date/Publication: 2025-03-08 08:58:55 UTC +* Number of recursive dependencies: 155 + +Run `revdepcheck::cloud_details(, "scRNAstat")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘scRNAstat-Ex.R’ failed + The error most likely occurred in: + + > ### Name: basic_filter + > ### Title: basic_filter + > ### Aliases: basic_filter + > + > ### ** Examples + > + > basic_filter(AJ064_small_sce) + ... + Please report the issue at . + 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 Seurat package. + Please report the issue at . + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +## In both + +* checking whether package ‘scRNAstat’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: namespace ‘colorspace’ is not available and has been replaced + See ‘/tmp/workdir/scRNAstat/new/scRNAstat.Rcheck/00install.out’ for details. + ``` + +* checking installed package size ... NOTE + ``` + installed size is 8.1Mb + sub-directories of 1Mb or more: + data 8.0Mb + ``` + +# scrutiny + +
+ +* Version: 0.5.0 +* GitHub: https://github.com/lhdjung/scrutiny +* Source code: https://github.com/cran/scrutiny +* Date/Publication: 2024-09-22 08:10:02 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "scrutiny")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘scrutiny-Ex.R’ failed + The error most likely occurred in: + + > ### Name: debit_plot + > ### Title: Visualize DEBIT results + > ### Aliases: debit_plot + > + > ### ** Examples + > + > # Run `debit_plot()` on the output + > # of `debit_map()`: + > pigs3 %>% + + debit_map() %>% + + debit_plot() + Error: object properties are invalid: + - @colour must be , , or , not + - @arrow.fill must be , , or , not + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > + > + > library(testthat) + > library(scrutiny) + > + > test_check("scrutiny") + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 523 ] + ... + 3. ├─ggplot2::theme(...) + 4. │ └─ggplot2:::find_args(..., complete = NULL, validate = NULL) + 5. │ └─base::mget(args, envir = env) + 6. └─ggplot2::element_line(seq(0, 0.5, 0.1)) + 7. └─S7::new_object(...) + 8. └─S7::validate(object, recursive = !parent_validated) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 523 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘consistency-tests-in-depth.Rmd’ using rmarkdown + --- finished re-building ‘consistency-tests-in-depth.Rmd’ + + --- re-building ‘consistency-tests-simple.Rmd’ using rmarkdown + --- finished re-building ‘consistency-tests-simple.Rmd’ + + --- re-building ‘debit.Rmd’ using rmarkdown + + Quitting from debit.Rmd:116-124 [unnamed-chunk-8] + ... + - @arrow.fill must be , , or , not + --- failed re-building ‘debit.Rmd’ + + --- re-building ‘devtools.Rmd’ using rmarkdown + --- finished re-building ‘devtools.Rmd’ + + --- re-building ‘duplicates.Rmd’ using rmarkdown + --- finished re-building ‘duplicates.Rmd’ + + --- re-building ‘grim.Rmd’ using rmarkdown + ``` + +## In both + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘janitor’ + ``` + +# scUtils + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/scUtils +* Date/Publication: 2020-06-25 16:20:02 UTC +* Number of recursive dependencies: 49 + +Run `revdepcheck::cloud_details(, "scUtils")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(scUtils) + > + > test_check("scUtils") + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 32 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-plots.R:59:3'): all kinds of colnames are allowed ──────────── + p$labels not equal to list(y = "Dim2", x = "Dim1", colour = "expression"). + Attributes: < names for target but not for current > + Attributes: < Length mismatch: comparison on first 0 components > + Length mismatch: comparison on first 2 components + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 32 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# SCVA + +
+ +* Version: 1.3.1 +* GitHub: NA +* Source code: https://github.com/cran/SCVA +* Date/Publication: 2020-01-09 22:50:10 UTC +* Number of recursive dependencies: 78 + +Run `revdepcheck::cloud_details(, "SCVA")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘SCVA-Ex.R’ failed + The error most likely occurred in: + + > ### Name: graphly + > ### Title: Interactive plot of single-case data + > ### Aliases: graphly + > ### Keywords: Single-case design Graph + > + > ### ** Examples + > + > data(AB) + > graphly(design = "AB", data = AB) + Warning: `qplot()` was deprecated in ggplot2 3.4.0. + ℹ The deprecated feature was likely used in the SCVA package. + Please report the issue to the authors. + Error in pm[[2]] : subscript out of bounds + Calls: graphly -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +# SDMtune + +
+ +* Version: 1.3.2 +* GitHub: https://github.com/ConsBiol-unibern/SDMtune +* Source code: https://github.com/cran/SDMtune +* Date/Publication: 2024-12-16 16:50:06 UTC +* Number of recursive dependencies: 122 + +Run `revdepcheck::cloud_details(, "SDMtune")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(SDMtune) + + _____ ____ __ ___ __ + / ___/ / __ \ / |/ // /_ __ __ ____ ___ + \__ \ / / / // /|_/ // __// / / // __ \ / _ \ + ___/ // /_/ // / / // /_ / /_/ // / / // __/ + ... + `expected` is a character vector ('Var2') + ── Failure ('test-plotCor.R:6:3'): The plot has the correct labels and text size ── + p$labels$y (`actual`) not equal to "Var1" (`expected`). + + `actual` is NULL + `expected` is a character vector ('Var1') + + [ FAIL 2 | WARN 0 | SKIP 55 | PASS 315 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.2Mb + sub-directories of 1Mb or more: + R 3.0Mb + libs 1.0Mb + ``` + +# seAMLess + +
+ +* Version: 0.1.1 +* GitHub: https://github.com/eonurk/seAMLess +* Source code: https://github.com/cran/seAMLess +* Date/Publication: 2024-11-11 12:50:02 UTC +* Number of recursive dependencies: 50 + +Run `revdepcheck::cloud_details(, "seAMLess")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘seAMLess-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ternaryPlot + > ### Title: Given the immune compositions (ICs) of bulk-RNA samples, this + > ### function creates a ternary plot similar to ALOT tube from EuroFlow + > ### analysis and Figure 1E of our paper. + > ### Aliases: ternaryPlot + > + > ### ** Examples + ... + > + > library(seAMLess) + > + > data(minRes) + > ternaryPlot(minRes) + Error: .onLoad failed in loadNamespace() for 'ggtern', details: + call: NULL + error: object properties are invalid: + - @lineend must be or , not S3 + Execution halted + ``` + +# sedproxy + +
+ +* Version: 0.7.5 +* GitHub: https://github.com/EarthSystemDiagnostics/sedproxy +* Source code: https://github.com/cran/sedproxy +* Date/Publication: 2023-02-26 10:50:02 UTC +* Number of recursive dependencies: 69 + +Run `revdepcheck::cloud_details(, "sedproxy")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(sedproxy) + > + > test_check("sedproxy") + [ FAIL 1 | WARN 13 | SKIP 0 | PASS 36 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-ClimToProxyClim.R:332:3'): example from paper works ────────── + class(p) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 1 | WARN 13 | SKIP 0 | PASS 36 ] + Error: Test failures + Execution halted + ``` + +# see + +
+ +* Version: 0.11.0 +* GitHub: https://github.com/easystats/see +* Source code: https://github.com/cran/see +* Date/Publication: 2025-03-11 16:20:02 UTC +* Number of recursive dependencies: 246 + +Run `revdepcheck::cloud_details(, "see")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘see-Ex.R’ failed + The error most likely occurred in: + + > ### Name: geom_from_list + > ### Title: Create ggplot2 geom(s) from a list + > ### Aliases: geom_from_list geoms_from_list + > + > ### ** Examples + > + > ## Don't show: + ... + 14. │ │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]]) + 15. │ │ └─base (local) doTryCatch(return(expr), name, parentenv, handler) + 16. │ └─base::withCallingHandlers(...) + 17. └─ggplot2 (local) f(l = layers[[i]], d = data[[i]]) + 18. └─l$map_statistic(d, plot) + 19. └─ggplot2 (local) map_statistic(..., self = self) + 20. └─ggplot2:::check_nondata_cols(...) + 21. └─cli::cli_abort(c(problem, issues, i = hint), call = NULL) + 22. └─rlang::abort(...) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # graphics engine changed in R 4.4, and so snapshots generated on + > # previous R version won't work + > if (getRversion() >= "4.4.0") { + + library(testthat) + + library(see) + + + + test_check("see") + ... + 33. │ └─ggplot2 (local) draw_group(..., self = self) + 34. └─base::.handleSimpleError(...) + 35. └─rlang (local) h(simpleError(msg, call)) + 36. └─handlers[[1L]](cnd) + 37. └─cli::cli_abort(...) + 38. └─rlang::abort(...) + + [ FAIL 1 | WARN 11 | SKIP 23 | PASS 34 ] + Error: Test failures + Execution halted + ``` + +# seedreg + +
+ +* Version: 1.0.3 +* GitHub: NA +* Source code: https://github.com/cran/seedreg +* Date/Publication: 2022-07-07 21:20:02 UTC +* Number of recursive dependencies: 125 + +Run `revdepcheck::cloud_details(, "seedreg")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘seedreg-Ex.R’ failed + The error most likely occurred in: + + > ### Name: lineplot + > ### Title: Graph: line chart + > ### Aliases: lineplot + > + > ### ** Examples + > + > data("substrate") + ... + 19. │ └─ggplot2 (local) setup_params(...) + 20. │ └─ggplot2:::make_summary_fun(...) + 21. │ └─rlang::as_function(fun.data) + 22. │ └─base::get(x, envir = env, mode = "function") + 23. └─base::.handleSimpleError(...) + 24. └─rlang (local) h(simpleError(msg, call)) + 25. └─handlers[[1L]](cnd) + 26. └─cli::cli_abort(...) + 27. └─rlang::abort(...) + Execution halted + ``` + +# SEI + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/noeliaof/SEI +* Source code: https://github.com/cran/SEI +* Date/Publication: 2024-08-27 11:20:46 UTC +* Number of recursive dependencies: 82 + +Run `revdepcheck::cloud_details(, "SEI")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘SEI-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_sei + > ### Title: Plot standardised indices + > ### Aliases: plot_sei + > + > ### ** Examples + > + > data(data_supply) + ... + 5. └─ggplot2::build_ggplot(plot) + 6. ├─S7::S7_dispatch() + 7. └─ggplot2 (local) `method(build_ggplot, ggplot2::ggplot)`(...) + 8. └─ggplot2:::plot_theme(plot) + 9. └─ggplot2:::check_theme(theme) + 10. └─base::mapply(...) + 11. └─ggplot2 (local) ``(...) + 12. └─cli::cli_abort(...) + 13. └─rlang::abort(...) + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘SEI_vignette.Rnw’ using knitr + + Quitting from SEI_vignette.Rnw:277-281 [std_index_ex_plot] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'SEI_vignette.Rnw' failed with diagnostics: + The `plot.margin` theme element must be a vector of length 4 + --- failed re-building ‘SEI_vignette.Rnw’ + + SUMMARY: processing the following file failed: + ‘SEI_vignette.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## Newly fixed + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘SEI_vignette.Rnw’ using knitr + Error: processing vignette 'SEI_vignette.Rnw' failed with diagnostics: + Running 'texi2dvi' on 'SEI_vignette.tex' failed. + LaTeX errors: + ! LaTeX Error: File `thumbpdf.sty' not found. + + Type X to quit or to proceed, + or enter new name. (Default extension: sty) + ... + l.57 \usepackage + {amsfonts,amsmath,amssymb,amsthm}^^M + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘SEI_vignette.Rnw’ + + SUMMARY: processing the following file failed: + ‘SEI_vignette.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.3Mb + sub-directories of 1Mb or more: + data 6.5Mb + ``` + +# seqHMM + +
+ +* Version: 2.0.0 +* GitHub: https://github.com/helske/seqHMM +* Source code: https://github.com/cran/seqHMM +* Date/Publication: 2025-05-17 00:10:02 UTC +* Number of recursive dependencies: 126 + +Run `revdepcheck::cloud_details(, "seqHMM")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘seqHMM-Ex.R’ failed + The error most likely occurred in: + + > ### Name: stacked_sequence_plot + > ### Title: Stacked Sequence Plots of Multichannel Sequences and/or Most + > ### Probable Paths from Hidden Markov Models + > ### Aliases: stacked_sequence_plot + > + > ### ** Examples + > + ... + + plots = "both", + + type = "d", + + legend_position = c("right", "right", "right", "none") + + ) + > library("ggplot2") + > p & theme(plot.margin = unit(c(1, 1, 0, 2), "mm")) + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +## In both + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + --- re-building ‘seqHMM.Rnw’ using knitr + + Quitting from seqHMM.Rnw:417-429 [graphicalillustrations2] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + ... + Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + --- failed re-building ‘seqHMM_visualization.Rnw’ + + SUMMARY: processing the following files failed: + ‘seqHMM.Rnw’ ‘seqHMM_algorithms.Rnw’ ‘seqHMM_visualization.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +* checking installed package size ... NOTE + ``` + installed size is 41.6Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 1.5Mb + libs 37.5Mb + ``` + +# SerolyzeR + +
+ +* Version: 1.2.0 +* GitHub: https://github.com/mini-pw/SerolyzeR +* Source code: https://github.com/cran/SerolyzeR +* Date/Publication: 2025-05-06 08:20:02 UTC +* Number of recursive dependencies: 88 + +Run `revdepcheck::cloud_details(, "SerolyzeR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘SerolyzeR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: generate_levey_jennings_report + > ### Title: Generate a Levey-Jennings Report for Multiple Plates. + > ### Aliases: generate_levey_jennings_report + > + > ### ** Examples + > + > output_dir <- tempdir(check = TRUE) + ... + 44. └─ggplot2 (local) ``(...) + 45. └─cli::cli_abort(...) + 46. └─rlang::abort(...) + + Quitting from levey_jennings_report_template.Rmd:125-127 [plate-layout] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + 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 + ... + 12. └─cli::cli_abort(...) + 13. └─rlang::abort(...) + ── Failure ('test-process-dir.R:129:3'): Test processing a directory with a single plate ── + Expected `capture.output(...)` to run without any errors. + ℹ Actually got a with text: + The `legend.margin` theme element must be a vector of length 4 + + [ FAIL 10 | WARN 28 | SKIP 0 | PASS 346 ] + Error: Test failures + Execution halted + ``` + +# Seurat + +
+ +* Version: 5.3.0 +* GitHub: https://github.com/satijalab/seurat +* Source code: https://github.com/cran/Seurat +* Date/Publication: 2025-04-23 22:10:02 UTC +* Number of recursive dependencies: 279 + +Run `revdepcheck::cloud_details(, "Seurat")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘Seurat-Ex.R’ failed + The error most likely occurred in: + + > ### Name: CombinePlots + > ### Title: Combine ggplot2-based plots into a single plot + > ### Aliases: CombinePlots + > + > ### ** Examples + > + > data("pbmc_small") + ... + + split.by = 'group' + + ) + Warning: The `slot` argument of `FetchData()` is deprecated as of SeuratObject 5.0.0. + ℹ Please use the `layer` argument instead. + ℹ The deprecated feature was likely used in the Seurat package. + Please report the issue at . + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 16.7Mb + sub-directories of 1Mb or more: + R 3.5Mb + help 1.5Mb + libs 11.4Mb + ``` + +* checking Rd cross-references ... NOTE + ``` + Package unavailable to check Rd xrefs: ‘Signac’ + ``` + +# sglg + +
+ +* Version: 0.2.2 +* GitHub: NA +* Source code: https://github.com/cran/sglg +* Date/Publication: 2022-09-04 03:50:01 UTC +* Number of recursive dependencies: 93 + +Run `revdepcheck::cloud_details(, "sglg")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘sglg-Ex.R’ failed + The error most likely occurred in: + + > ### Name: deviance_residuals + > ### Title: Deviance Residuals for a Generalized Log-gamma Regression Model + > ### Aliases: deviance_residuals + > + > ### ** Examples + > + > # Example 1 + > n <- 300 + > error <- rglg(n,0,1,1) + > y <- 0.5 + error + > fit <- glg(y~1,data=as.data.frame(y)) + > deviance_residuals(fit) + Error in pm[[2]] : subscript out of bounds + Calls: deviance_residuals ... dots2plots -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +# sgsR + +
+ +* Version: 1.4.5 +* GitHub: https://github.com/tgoodbody/sgsR +* Source code: https://github.com/cran/sgsR +* Date/Publication: 2024-03-03 15:10:02 UTC +* Number of recursive dependencies: 120 + +Run `revdepcheck::cloud_details(, "sgsR")` for more info + +
+ +## Newly broken + +* 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 + ... + `expected` is a character vector ('zq90') + ── Failure ('test-utils-plot.R:19:3'): scatter messages ──────────────────────── + o1$labels$x (`actual`) not equal to "pzabove2" (`expected`). + + `actual` is NULL + `expected` is a character vector ('pzabove2') + + [ FAIL 2 | WARN 111 | SKIP 19 | PASS 508 ] + Error: Test failures + Execution halted + ``` + +# shadowtext + +
+ +* Version: 0.1.4 +* GitHub: https://github.com/GuangchuangYu/shadowtext +* Source code: https://github.com/cran/shadowtext +* Date/Publication: 2024-07-18 07:00:01 UTC +* Number of recursive dependencies: 48 + +Run `revdepcheck::cloud_details(, "shadowtext")` for more info + +
+ +## Newly broken + +* checking dependencies in R code ... WARNING + ``` + '::' or ':::' import not declared from: ‘S7’ + ``` + +# SHAPforxgboost + +
+ +* Version: 0.1.3 +* GitHub: https://github.com/liuyanguu/SHAPforxgboost +* Source code: https://github.com/cran/SHAPforxgboost +* Date/Publication: 2023-05-29 17:20:07 UTC +* Number of recursive dependencies: 114 + +Run `revdepcheck::cloud_details(, "SHAPforxgboost")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘SHAPforxgboost-Ex.R’ failed + The error most likely occurred in: + + > ### Name: shap.plot.force_plot + > ### Title: Make the SHAP force plot + > ### Aliases: shap.plot.force_plot + > + > ### ** Examples + > + > + ... + ℹ Please use tidy evaluation idioms with `aes()`. + ℹ See also `vignette("ggplot2-in-packages")` for more information. + ℹ The deprecated feature was likely used in the SHAPforxgboost package. + Please report the issue at + . + Data has N = 150 | zoom in length is 50 at location 90. + + Error in upgradeUnit.default(x) : Not a unit object + Calls: ... is.unit -> convertUnit -> upgradeUnit -> upgradeUnit.default + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘basic_workflow.Rmd’ using rmarkdown + + Quitting from basic_workflow.Rmd:62-87 [unnamed-chunk-3] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `as.vector()`: + ! cannot coerce type 'object' to vector of type 'character' + --- + Backtrace: + ... + + Error: processing vignette 'basic_workflow.Rmd' failed with diagnostics: + cannot coerce type 'object' to vector of type 'character' + --- failed re-building ‘basic_workflow.Rmd’ + + SUMMARY: processing the following file failed: + ‘basic_workflow.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# ShapleyOutlier + +
+ +* Version: 0.1.2 +* GitHub: NA +* Source code: https://github.com/cran/ShapleyOutlier +* Date/Publication: 2024-10-17 12:00:34 UTC +* Number of recursive dependencies: 75 + +Run `revdepcheck::cloud_details(, "ShapleyOutlier")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ShapleyOutlier-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.shapley_interaction + > ### Title: Plot of Shapley interaction indices + > ### Aliases: plot.shapley_interaction + > + > ### ** Examples + > + > p <- 5 + ... + > mu <- rep(0,p) + > Sigma <- matrix(0.9, p, p); diag(Sigma) = 1 + > Sigma_inv <- solve(Sigma) + > x <- c(0,1,2,2.3,2.5) + > PHI <- shapley_interaction(x, mu, Sigma) + > plot(PHI) + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: plot ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ShapleyOutlier_examples.Rmd’ using rmarkdown + ``` + +# shapviz + +
+ +* Version: 0.9.7 +* GitHub: https://github.com/ModelOriented/shapviz +* Source code: https://github.com/cran/shapviz +* Date/Publication: 2025-01-19 19:20:02 UTC +* Number of recursive dependencies: 78 + +Run `revdepcheck::cloud_details(, "shapviz")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘shapviz-Ex.R’ failed + The error most likely occurred in: + + > ### Name: sv_force + > ### Title: SHAP Force Plot + > ### Aliases: sv_force sv_force.default sv_force.shapviz sv_force.mshapviz + > + > ### ** Examples + > + > dtrain <- xgboost::xgb.DMatrix( + + data.matrix(iris[, -1]), label = iris[, 1], nthread = 1 + + ) + > fit <- xgboost::xgb.train(data = dtrain, nrounds = 20, nthread = 1) + > x <- shapviz(fit, X_pred = dtrain, X = iris[, -1]) + > sv_force(x) + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘basic_use.Rmd’ using rmarkdown + + Quitting from basic_use.Rmd:61-87 [unnamed-chunk-2] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `as.vector()`: + ! cannot coerce type 'object' to vector of type 'character' + --- + Backtrace: + ... + 68. └─grid:::validDetails.text(x) + 69. ├─base::as.character(x$label) + 70. └─base::as.character.default(x$label) + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'basic_use.Rmd' failed with diagnostics: + cannot coerce type 'object' to vector of type 'character' + --- failed re-building ‘basic_use.Rmd’ + + --- re-building ‘geographic.Rmd’ using rmarkdown + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Packages which this enhances but not available for checking: + 'fastshap', 'h2o', 'lightgbm' + ``` + +# shiny + +
+ +* Version: 1.10.0 +* GitHub: https://github.com/rstudio/shiny +* Source code: https://github.com/cran/shiny +* Date/Publication: 2024-12-14 00:10:02 UTC +* Number of recursive dependencies: 92 + +Run `revdepcheck::cloud_details(, "shiny")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(shiny) + > + > test_check("shiny") + [ FAIL 96 | WARN 1 | SKIP 19 | PASS 1529 ] + + ══ Skipped tests (19) ══════════════════════════════════════════════════════════ + ... + m5$panels has length 0, not length 1. + ── Failure ('test-plot-coordmap.R:464:3'): ggplot coordmap maintains discrete limits ── + m5$panels[[1]]$domain$discrete_limits (`actual`) not equal to list(x = c("e", "f")) (`expected`). + + `actual` is NULL + `expected` is a list + + [ FAIL 96 | WARN 1 | SKIP 19 | PASS 1529 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 16.6Mb + sub-directories of 1Mb or more: + R 3.5Mb + help 1.7Mb + www 10.4Mb + ``` + +# shinyMixR + +
+ +* Version: 0.5.0 +* GitHub: NA +* Source code: https://github.com/cran/shinyMixR +* Date/Publication: 2024-11-14 16:10:03 UTC +* Number of recursive dependencies: 200 + +Run `revdepcheck::cloud_details(, "shinyMixR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # see https://github.com/rstudio/shinytest2/issues/351 + > options(chromote.timeout = 120) + > + > library(testthat) + > library(shinyMixR) + Loading required package: shiny + Loading required package: ggplot2 + ... + Backtrace: + ▆ + 1. ├─base::suppressWarnings(gof_plot(res, ptype = "all", type = "xpose")) at test-gof_plot.R:10:3 + 2. │ └─base::withCallingHandlers(...) + 3. └─shinyMixR::gof_plot(res, ptype = "all", type = "xpose") + 4. └─S7:::Ops.S7_object(...) + + [ FAIL 4 | WARN 1 | SKIP 11 | PASS 28 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘getting_started.Rmd’ using rmarkdown + + Quitting from getting_started.Rmd:234-237 [unnamed-chunk-18] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + ... + Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + --- failed re-building ‘getting_started.Rmd’ + + SUMMARY: processing the following file failed: + ‘getting_started.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# shinyMobile + +
+ +* Version: 2.0.1 +* GitHub: https://github.com/RinteRface/shinyMobile +* Source code: https://github.com/cran/shinyMobile +* Date/Publication: 2024-10-04 17:30:02 UTC +* Number of recursive dependencies: 97 + +Run `revdepcheck::cloud_details(, "shinyMobile")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘shinyMobile-Ex.R’ failed + The error most likely occurred in: + + > ### Name: f7SplitLayout + > ### Title: Framework7 split layout + > ### Aliases: f7SplitLayout + > + > ### ** Examples + > + > library(shiny) + ... + > fruits <- data.frame( + + name = c("Apples", "Oranges", "Bananas", "Berries"), + + value = c(44, 55, 67, 83) + + ) + > + > thematic_shiny(font = "auto") + Error in get(x, envir = ns, inherits = FALSE) : + object 'ggplot_build.ggplot' not found + Calls: thematic_shiny ... thematic_on -> ggplot_build_set -> getFromNamespace -> get + Execution halted + ``` + +# simmr + +
+ +* Version: 0.5.1.217 +* GitHub: https://github.com/andrewcparnell/simmr +* Source code: https://github.com/cran/simmr +* Date/Publication: 2024-10-16 15:10:02 UTC +* Number of recursive dependencies: 115 + +Run `revdepcheck::cloud_details(, "simmr")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘advanced_plotting.Rmd’ using rmarkdown + ``` + +# SimNPH + +
+ +* Version: 0.5.7 +* GitHub: https://github.com/SimNPH/SimNPH +* Source code: https://github.com/cran/SimNPH +* Date/Publication: 2025-04-08 10:30:02 UTC +* Number of recursive dependencies: 131 + +Run `revdepcheck::cloud_details(, "SimNPH")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(SimNPH) + Loading required package: SimDesign + Loading required package: survival + > + > test_check("SimNPH") + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 403 ] + ... + 1. ├─withr::with_package(...) at test-shhr_gg.R:5:3 + 2. │ └─base::force(code) + 3. ├─withr::with_package(...) at test-shhr_gg.R:6:5 + 4. │ └─base::force(code) + 5. └─SimNPH::shhr_gg(A, B) at test-shhr_gg.R:7:7 + 6. └─S7:::Ops.S7_object(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 403 ] + Error: Test failures + Execution halted + ``` + +# simplecolors + +
+ +* Version: 0.1.2 +* GitHub: https://github.com/rjake/simplecolors +* Source code: https://github.com/cran/simplecolors +* Date/Publication: 2023-08-31 04:40:07 UTC +* Number of recursive dependencies: 118 + +Run `revdepcheck::cloud_details(, "simplecolors")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(simplecolors) + > + > test_check("simplecolors") + [ FAIL 3 | WARN 1 | SKIP 0 | PASS 22 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + y[1]: "gg" + ── Failure ('test-show_colors.R:5:3'): show_colors retuns gglot ──────────────── + is(x) not equal to "gg". + 1/1 mismatches + x[1]: "ggplot2::ggplot" + y[1]: "gg" + + [ FAIL 3 | WARN 1 | SKIP 0 | PASS 22 ] + Error: Test failures + Execution halted + ``` + +# sjPlot + +
+ +* Version: 2.8.17 +* GitHub: https://github.com/strengejacke/sjPlot +* Source code: https://github.com/cran/sjPlot +* Date/Publication: 2024-11-29 11:20:03 UTC +* Number of recursive dependencies: 194 + +Run `revdepcheck::cloud_details(, "sjPlot")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘blackwhitefigures.Rmd’ using rmarkdown + ``` + +# smallsets + +
+ +* Version: 2.0.0 +* GitHub: https://github.com/lydialucchesi/smallsets +* Source code: https://github.com/cran/smallsets +* Date/Publication: 2023-12-05 00:00:02 UTC +* Number of recursive dependencies: 95 + +Run `revdepcheck::cloud_details(, "smallsets")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘smallsets-Ex.R’ failed + The error most likely occurred in: + + > ### Name: Smallset_Timeline + > ### Title: Smallset Timeline + > ### Aliases: Smallset_Timeline + > + > ### ** Examples + > + > set.seed(145) + > + > Smallset_Timeline( + + data = s_data, + + code = system.file("s_data_preprocess.R", package = "smallsets") + + ) + Error: Can't find property @hjust + 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 + ... + 9. │ └─ggplot2:::fix_theme_deprecations(elements) + 10. │ ├─base::`$<-`(`*tmp*`, "hjust", value = ``) + 11. │ └─ggplot2:::`$<-.ggplot2::element`(`*tmp*`, "hjust", value = ``) + 12. │ └─S7::`props<-`(`*tmp*`, value = `[[<-`(S7::props(x), i, value)) + 13. │ └─S7::`prop<-`(`*tmp*`, name, check = FALSE, value = value[[name]]) + 14. └─S7 (local) ``(...) + + [ FAIL 15 | WARN 0 | SKIP 0 | PASS 16 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘smallsets.Rmd’ using rmarkdown + + Quitting from smallsets.Rmd:35-42 [timeline1] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: + ! Can't find property @hjust + --- + Backtrace: + ... + + Error: processing vignette 'smallsets.Rmd' failed with diagnostics: + Can't find property @hjust + --- failed re-building ‘smallsets.Rmd’ + + SUMMARY: processing the following file failed: + ‘smallsets.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘gurobi’ + ``` + +# SmartEDA + +
+ +* Version: 0.3.10 +* GitHub: https://github.com/daya6489/SmartEDA +* Source code: https://github.com/cran/SmartEDA +* Date/Publication: 2024-01-30 17:50:02 UTC +* Number of recursive dependencies: 94 + +Run `revdepcheck::cloud_details(, "SmartEDA")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘SmartEDA-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ExpCatStat + > ### Title: Function provides summary statistics for all character or + > ### categorical columns in the dataframe + > ### Aliases: ExpCatStat + > + > ### ** Examples + > + ... + > # Information value plot + > ExpCatStat(mtcars,Target="am",result = "Stat",clim=10,nlim=10,bins=10, + + Pclass=1,plot=TRUE,top=20,Round=2) + Warning in FUN(X[[i]], ...) : NAs introduced by coercion + Warning: The `size` argument of `element_line()` is deprecated as of ggplot2 3.4.0. + ℹ Please use the `linewidth` argument instead. + ℹ The deprecated feature was likely used in the SmartEDA package. + Please report the issue at . + Error: C stack usage 9964564 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘CustomTable.Rmd’ using rmarkdown + --- finished re-building ‘CustomTable.Rmd’ + + --- re-building ‘SmartEDA.Rmd’ using rmarkdown + + Quitting from SmartEDA.Rmd:195-199 [c1.2 ] + Error: processing vignette 'SmartEDA.Rmd' failed with diagnostics: + C stack usage 9961812 is too close to the limit + ... + Quitting from SmartTwoPlots.Rmd:54-66 [c11 ] + Error: processing vignette 'SmartTwoPlots.Rmd' failed with diagnostics: + C stack usage 9964532 is too close to the limit + --- failed re-building ‘SmartTwoPlots.Rmd’ + + SUMMARY: processing the following files failed: + ‘SmartEDA.Rmd’ ‘SmartTwoPlots.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘qpdf’ + All declared Imports should be used. + ``` + +* checking Rd cross-references ... NOTE + ``` + Packages unavailable to check Rd xrefs: ‘ggthemes’, ‘DataExplorer’ + ``` + +# smer + +
+ +* Version: 0.0.1 +* GitHub: https://github.com/lcrawlab/sme +* Source code: https://github.com/cran/smer +* Date/Publication: 2025-01-16 15:50:01 UTC +* Number of recursive dependencies: 111 + +Run `revdepcheck::cloud_details(, "smer")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘smer.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 45.7Mb + sub-directories of 1Mb or more: + libs 42.7Mb + ``` + +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. + ``` + +# SOMbrero + +
+ +* Version: 1.4-2 +* GitHub: https://github.com/tuxette/SOMbrero +* Source code: https://github.com/cran/SOMbrero +* Date/Publication: 2024-01-25 22:10:10 UTC +* Number of recursive dependencies: 113 + +Run `revdepcheck::cloud_details(, "SOMbrero")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library("testthat") + > library("SOMbrero") + Loading required package: igraph + + Attaching package: 'igraph' + + The following object is masked from 'package:testthat': + ... + ── Failure ('test-missing.R:58:3'): All 'add' plots are produced for inputs with missing entries ── + class(plot(nsom, what = "add", type = "barplot", variable = add4)) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + ── Failure ('test-missing.R:61:3'): All 'add' plots are produced for inputs with missing entries ── + class(plot(nsom, what = "add", type = "boxplot", variable = add4)) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 14 | WARN 0 | SKIP 0 | PASS 58 ] + Error: Test failures + Execution halted + ``` + +# 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: 200 + +Run `revdepcheck::cloud_details(, "SoupX")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘pbmcTutorial.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.8Mb + sub-directories of 1Mb or more: + data 3.9Mb + doc 1.0Mb + ``` + +# spacejamr + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/dscolby/spacejamr +* Source code: https://github.com/cran/spacejamr +* Date/Publication: 2022-04-01 20:10:02 UTC +* Number of recursive dependencies: 134 + +Run `revdepcheck::cloud_details(, "spacejamr")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(spacejamr) + > + > test_check("spacejamr") + Density Mean Degree Mean Closeness Mean Betweenness Largest Component Size + pl 0 0 NaN 0 1 + apl 0 0 NaN 0 1 + ... + [1] "ggraph" - "gg" [2] + [2] "ggplot2::ggplot" - + [3] "ggplot" - + [4] "ggplot2::gg" - + [5] "S7_object" - + [6] "gg" - "ggplot" [3] + + [ FAIL 3 | WARN 3 | SKIP 0 | PASS 20 ] + Error: Test failures + Execution halted + ``` + +# spatialwarnings + +
+ +* Version: 3.1.0 +* GitHub: https://github.com/spatial-ews/spatialwarnings +* Source code: https://github.com/cran/spatialwarnings +* Date/Publication: 2024-09-06 14:50:02 UTC +* Number of recursive dependencies: 94 + +Run `revdepcheck::cloud_details(, "spatialwarnings")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > + > library(spatialwarnings) + Loading required package: future + This is spatialwarnings 3.1.0 + Use plan(multisession) to set up parallel processing + > if ( require("testthat") ) { + + test_check("spatialwarnings") + ... + { + ... + } is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 6 | WARN 16 | SKIP 2 | PASS 161 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 8.3Mb + sub-directories of 1Mb or more: + data 2.0Mb + libs 5.8Mb + ``` + +# spectralR + +
+ +* Version: 0.1.3 +* GitHub: https://github.com/olehprylutskyi/spectralR +* Source code: https://github.com/cran/spectralR +* Date/Publication: 2023-08-24 09:20:02 UTC +* Number of recursive dependencies: 118 + +Run `revdepcheck::cloud_details(, "spectralR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > if ( requireNamespace("tinytest", quietly=TRUE) ){ + + tinytest::test_package("spectralR") + + } + + test_get.pixel.data.R......... 1 tests OK 83ms + + test_prepare.vector.data.R.... 1 tests OK + ... + test_prepare.vector.data.R.... 8 tests OK + test_prepare.vector.data.R.... 9 tests OK + test_prepare.vector.data.R.... 10 tests OK + test_prepare.vector.data.R.... 11 tests OK + test_prepare.vector.data.R.... 12 tests OK 40ms + + test_spectral.curves.plot.R... 1 tests OK Joining with `by = join_by(variable)` + Error in if (msg != "") { : the condition has length > 1 + Calls: ... lapply -> FUN -> eval -> eval -> expect_silent -> fun + Execution halted + ``` + +# spinifex + +
+ +* Version: 0.3.8 +* GitHub: https://github.com/nspyrison/spinifex +* Source code: https://github.com/cran/spinifex +* Date/Publication: 2025-01-08 22:10:02 UTC +* Number of recursive dependencies: 152 + +Run `revdepcheck::cloud_details(, "spinifex")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(spinifex) + Loading required package: tourr + -------------------------------------------------------- + spinifex --- version 0.3.8 + Please share bugs, suggestions, and feature requests at: + ... + 2. │ └─base::withCallingHandlers(...) + 3. └─spinifex::play_tour_path(tour_path = tpath, data = dat_std, angle = 1) + 4. └─spinifex (local) render_type(frames = tour_df, ...) + 5. ├─plotly::ggplotly(p = gg, tooltip = "tooltip") + 6. └─plotly:::ggplotly.ggplot(p = gg, tooltip = "tooltip") + 7. └─plotly::gg2list(...) + + [ FAIL 9 | WARN 85 | SKIP 0 | PASS 72 ] + Error: Test failures + Execution halted + ``` + +# sport + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/gogonzo/sport +* Source code: https://github.com/cran/sport +* Date/Publication: 2024-01-08 23:50:02 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "sport")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > + > test_check("sport") + Loading required package: sport + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 238 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test_output.R:30:3'): Scale is labelled 'r' ─────────────────────── + p$labels$y not identical to "r". + target is NULL, current is character + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 238 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 7504 marked UTF-8 strings + ``` + +# sportyR + +
+ +* Version: 2.2.2 +* GitHub: https://github.com/sportsdataverse/sportyR +* Source code: https://github.com/cran/sportyR +* Date/Publication: 2024-02-15 10:10:02 UTC +* Number of recursive dependencies: 92 + +Run `revdepcheck::cloud_details(, "sportyR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(sportyR) + > + > test_check("sportyR") + [ FAIL 28 | WARN 0 | SKIP 0 | PASS 101 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + `expected`: "gg" + ── Failure ('test-plots-and-features-volleyball.R:18:5'): geom_volleyball() can successfully transform coordinates ── + class(fivb_court)[1] (`actual`) not equal to "gg" (`expected`). + + `actual`: "ggplot2::ggplot" + `expected`: "gg" + + [ FAIL 28 | WARN 0 | SKIP 0 | PASS 101 ] + Error: Test failures + Execution halted + ``` + +# SPUTNIK + +
+ +* Version: 1.4.2 +* GitHub: https://github.com/paoloinglese/SPUTNIK +* Source code: https://github.com/cran/SPUTNIK +* Date/Publication: 2024-04-16 14:30:05 UTC +* Number of recursive dependencies: 86 + +Run `revdepcheck::cloud_details(, "SPUTNIK")` for more info + +
+ +## Newly broken + +* checking whether package ‘SPUTNIK’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘SPUTNIK’ + See ‘/tmp/workdir/SPUTNIK/new/SPUTNIK.Rcheck/00install.out’ for details. + ``` + +# SqueakR + +
+ +* Version: 1.3.0 +* GitHub: https://github.com/osimon81/SqueakR +* Source code: https://github.com/cran/SqueakR +* Date/Publication: 2022-06-28 09:20:04 UTC +* Number of recursive dependencies: 147 + +Run `revdepcheck::cloud_details(, "SqueakR")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘SqueakR.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 8.8Mb + sub-directories of 1Mb or more: + doc 8.2Mb + ``` + +# ssd4mosaic + +
+ +* Version: 1.0.3 +* GitHub: NA +* Source code: https://github.com/cran/ssd4mosaic +* Date/Publication: 2025-03-11 14:40:02 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "ssd4mosaic")` for more info + +
+ +## Newly broken + +* 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 + ... + plot_cens_ci$layers has length 11, not length 7. + ── Error ('test-fct_options_plots.R:8:3'): Uncensored data can be coloured by group ── + Error in `order(p$layers[[1]]$data$group)`: argument 1 is not a vector + Backtrace: + ▆ + 1. └─base::order(p$layers[[1]]$data$group) at test-fct_options_plots.R:8:3 + + [ FAIL 3 | WARN 1 | SKIP 1 | PASS 66 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 1 marked UTF-8 string + ``` + +# sssc + +
+ +* Version: 1.0.0 +* GitHub: NA +* Source code: https://github.com/cran/sssc +* Date/Publication: 2018-06-15 11:22:54 UTC +* Number of recursive dependencies: 32 + +Run `revdepcheck::cloud_details(, "sssc")` for more info + +
+ +## Newly broken + +* checking whether package ‘sssc’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘sssc’ + See ‘/tmp/workdir/sssc/new/sssc.Rcheck/00install.out’ for details. + ``` + +# starvz + +
+ +* Version: 0.8.2 +* GitHub: https://github.com/schnorr/starvz +* Source code: https://github.com/cran/starvz +* Date/Publication: 2024-09-08 19:00:02 UTC +* Number of recursive dependencies: 102 + +Run `revdepcheck::cloud_details(, "starvz")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(starvz) + > + > test_check("starvz") + [ FAIL 1 | WARN 0 | SKIP 2 | PASS 1 ] + + ══ Skipped tests (2) ═══════════════════════════════════════════════════════════ + ... + • On CRAN (2): 'test_lu.R:10:3', 'test_qr.R:5:3' + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test_lu.R:8:3'): starvz_plot works ──────────────────────────────── + class(pl) not equal to c("patchwork", "gg", "ggplot"). + Lengths differ: 6 is not 3 + + [ FAIL 1 | WARN 0 | SKIP 2 | PASS 1 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.0Mb + sub-directories of 1Mb or more: + libs 3.9Mb + ``` + +# states + +
+ +* Version: 0.3.2 +* GitHub: https://github.com/andybega/states +* Source code: https://github.com/cran/states +* Date/Publication: 2023-09-05 12:20:02 UTC +* Number of recursive dependencies: 90 + +Run `revdepcheck::cloud_details(, "states")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library("testthat") + > library("states") + + Attaching package: 'states' + + The following object is masked from 'package:testthat': + + ... + ── Failure ('test-plot-missing.R:72:3'): plot_missing accepts all input options ── + plot_missing(...) has type 'object', not 'list'. + ── Failure ('test-plot-missing.R:77:3'): plot_missing accepts all input options ── + plot_missing(...) has type 'object', not 'list'. + ── Failure ('test-plot-missing.R:82:3'): plot_missing accepts all input options ── + plot_missing(...) has type 'object', not 'list'. + + [ FAIL 3 | WARN 0 | SKIP 0 | PASS 106 ] + Error: Test failures + Execution halted + ``` + +# statgenGWAS + +
+ +* Version: 1.0.11 +* GitHub: https://github.com/Biometris/statgenGWAS +* Source code: https://github.com/cran/statgenGWAS +* Date/Publication: 2025-03-31 13:30:06 UTC +* Number of recursive dependencies: 71 + +Run `revdepcheck::cloud_details(, "statgenGWAS")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > + > if ( requireNamespace("tinytest", quietly=TRUE) ){ + + tinytest::test_package("statgenGWAS") + + } + + test_GWAS.R................... 0 tests + test_GWAS.R................... 0 tests + ... + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the statgenGWAS package. + Please report the issue at . + 2: In grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, : + for '← 2@3' in 'mbcsToSbcs': <- substituted for ← (U+2190) + 3: `aes_()` was deprecated in ggplot2 3.0.0. + ℹ Please use tidy evaluation idioms with `aes()` + ℹ The deprecated feature was likely used in the statgenGWAS package. + Please report the issue at . + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 15.2Mb + sub-directories of 1Mb or more: + data 7.0Mb + libs 7.2Mb + ``` + +# statgenGxE + +
+ +* Version: 1.0.9 +* GitHub: https://github.com/Biometris/statgenGxE +* Source code: https://github.com/cran/statgenGxE +* Date/Publication: 2024-09-18 07:10:03 UTC +* Number of recursive dependencies: 86 + +Run `revdepcheck::cloud_details(, "statgenGxE")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(statgenGxE) + > + > test_check("statgenGxE") + [ FAIL 8 | WARN 3 | SKIP 17 | PASS 440 ] + + ══ Skipped tests (17) ══════════════════════════════════════════════════════════ + ... + ── Failure ('test-plots.R:354:3'): Option colorGenoBy in scatterFit plot functions correctly ── + p1$labels$colour not equal to "family". + target is NULL, current is character + ── Failure ('test-plots.R:405:3'): VarCov plot gives correct output types ────── + `geoms` not equal to "GeomTile". + names for target but not for current + + [ FAIL 8 | WARN 3 | SKIP 17 | PASS 440 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘asreml’ + ``` + +# statgenHTP + +
+ +* Version: 1.0.8 +* GitHub: https://github.com/Biometris/statgenHTP +* Source code: https://github.com/cran/statgenHTP +* Date/Publication: 2025-04-29 10:30:02 UTC +* Number of recursive dependencies: 132 + +Run `revdepcheck::cloud_details(, "statgenHTP")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > + > if ( requireNamespace("tinytest", quietly=TRUE) ){ + + tinytest::test_package("statgenHTP") + + } + + test_TP.R..................... 0 tests + test_TP.R..................... 0 tests + ... + + test_TPPlots.R................ 0 tests + test_TPPlots.R................ 0 tests + test_TPPlots.R................ 1 tests OK + test_TPPlots.R................ 1 tests OK Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + In addition: Warning message: + 125 failed to parse. + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Overview_HTP.Rmd’ using rmarkdown + + Quitting from Overview_HTP.Rmd:104-109 [layoutPlot] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `as.vector()`: + ! cannot coerce type 'object' to vector of type 'character' + --- + Backtrace: + ... + + Error: processing vignette 'Overview_HTP.Rmd' failed with diagnostics: + cannot coerce type 'object' to vector of type 'character' + --- failed re-building ‘Overview_HTP.Rmd’ + + SUMMARY: processing the following file failed: + ‘Overview_HTP.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘asreml’ + ``` + +* checking installed package size ... NOTE + ``` + installed size is 8.0Mb + sub-directories of 1Mb or more: + data 6.5Mb + ``` + +# statgenIBD + +
+ +* Version: 1.0.8 +* GitHub: https://github.com/Biometris/statgenIBD +* Source code: https://github.com/cran/statgenIBD +* Date/Publication: 2025-02-05 12:00:02 UTC +* Number of recursive dependencies: 59 + +Run `revdepcheck::cloud_details(, "statgenIBD")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > + > if ( requireNamespace("tinytest", quietly=TRUE) ){ + + tinytest::test_package("statgenIBD") + + } + + test_IBDprob.R................ 0 tests + test_IBDprob.R................ 0 tests + ... + test_IBDprob.R................ 6 tests OK + test_IBDprob.R................ 7 tests OK + test_IBDprob.R................ 8 tests OK + test_IBDprob.R................ 9 tests OK + test_IBDprob.R................ 9 tests OK + test_IBDprob.R................ 10 tests OK + test_IBDprob.R................ 11 tests OK + test_IBDprob.R................ 12 tests OK Error in if (msg != "") { : the condition has length > 1 + Calls: ... lapply -> FUN -> eval -> eval -> expect_silent -> fun + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 9.7Mb + sub-directories of 1Mb or more: + extdata 2.4Mb + libs 6.4Mb + ``` + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘statgenGWAS’ + All declared Imports should be used. + ``` + +# statgenSTA + +
+ +* Version: 1.0.14 +* GitHub: https://github.com/Biometris/statgenSTA +* Source code: https://github.com/cran/statgenSTA +* Date/Publication: 2024-10-14 07:40:02 UTC +* Number of recursive dependencies: 85 + +Run `revdepcheck::cloud_details(, "statgenSTA")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(statgenSTA) + > + > test_check("statgenSTA") + [ FAIL 1 | WARN 0 | SKIP 6 | PASS 760 ] + + ══ Skipped tests (6) ═══════════════════════════════════════════════════════════ + ... + 29. ├─grid:::validGrob(g) + 30. └─grid:::validGrob.grob(g) + 31. ├─grid::validDetails(x) + 32. └─grid:::validDetails.text(x) + 33. ├─base::as.character(x$label) + 34. └─base::as.character.default(x$label) + + [ FAIL 1 | WARN 0 | SKIP 6 | PASS 760 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘statgenSTA.Rmd’ using rmarkdown + + Quitting from statgenSTA.Rmd:194-197 [layoutPlot] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `as.vector()`: + ! cannot coerce type 'object' to vector of type 'character' + --- + Backtrace: + ... + + Error: processing vignette 'statgenSTA.Rmd' failed with diagnostics: + cannot coerce type 'object' to vector of type 'character' + --- failed re-building ‘statgenSTA.Rmd’ + + SUMMARY: processing the following file failed: + ‘statgenSTA.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘asreml’ + ``` + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘mapproj’ + All declared Imports should be used. + ``` + +# statVisual + +
+ +* Version: 1.2.1 +* GitHub: NA +* Source code: https://github.com/cran/statVisual +* Date/Publication: 2020-02-20 19:30:02 UTC +* Number of recursive dependencies: 186 + +Run `revdepcheck::cloud_details(, "statVisual")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘statVisual-Ex.R’ failed + The error most likely occurred in: + + > ### Name: BiAxisErrBar + > ### Title: Compare Patterns of Two Outcomes in One Scatter Plot + > ### Aliases: BiAxisErrBar + > ### Keywords: method + > + > ### ** Examples + > + ... + + # Auto named with `tibble::lst()`: tibble::lst(mean, median) + + # Using lambdas list(~ mean(., trim = .2), ~ median(., na.rm = TRUE)) + ℹ The deprecated feature was likely used in the statVisual package. + Please report the issue to the authors. + Scale for linetype is already present. + Adding another scale for linetype, which will replace the existing scale. + Error: C stack usage 9962020 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘statVisual.Rmd’ using rmarkdown + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘gbm’ ‘ggfortify’ ‘tibble’ ‘tidyverse’ + All declared Imports should be used. + ``` + +# StratifiedMedicine + +
+ +* Version: 1.0.5 +* GitHub: https://github.com/thomasjemielita/StratifiedMedicine +* Source code: https://github.com/cran/StratifiedMedicine +* Date/Publication: 2022-03-29 23:00:02 UTC +* Number of recursive dependencies: 92 + +Run `revdepcheck::cloud_details(, "StratifiedMedicine")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘SM_PRISM.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 5.7Mb + sub-directories of 1Mb or more: + doc 5.0Mb + ``` + +# stRoke + +
+ +* Version: 24.10.1 +* GitHub: https://github.com/agdamsbo/stRoke +* Source code: https://github.com/cran/stRoke +* Date/Publication: 2024-10-25 06:50:01 UTC +* Number of recursive dependencies: 130 + +Run `revdepcheck::cloud_details(, "stRoke")` 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 + ... + ── Failure ('test-index_plot.R:2:3'): index_plot() works! ────────────────────── + index_plot(stRoke::score[score$event == "A", ]) has type 'object', not 'list'. + ── Failure ('test-index_plot.R:5:3'): index_plot() works! ────────────────────── + index_plot(stRoke::score[score$event == "A", ], sub_plot = "_per") has type 'object', not 'list'. + ── Failure ('test-index_plot.R:17:3'): index_plot() works! ───────────────────── + index_plot(stRoke::score, sub_plot = "_per", facet.by = "event") has type 'object', not 'list'. + + [ FAIL 3 | WARN 2 | SKIP 0 | PASS 47 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 705 marked UTF-8 strings + ``` + +# Superpower + +
+ +* Version: 0.2.3 +* GitHub: https://github.com/arcaldwell49/Superpower +* Source code: https://github.com/cran/Superpower +* Date/Publication: 2025-05-15 07:20:02 UTC +* Number of recursive dependencies: 116 + +Run `revdepcheck::cloud_details(, "Superpower")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(Superpower) + > + > + > test_check("Superpower") + [1] "condition_one" "sad_1" + ... + y[1]: "gg" + ── Failure ('test-morey.R:109:3'): No error messages ftest ───────────────────── + class(test)[1] not equal to "gg". + 1/1 mismatches + x[1]: "ggplot2::ggplot" + y[1]: "gg" + + [ FAIL 2 | WARN 18 | SKIP 13 | PASS 398 ] + Error: Test failures + Execution halted + ``` + +# surveyexplorer + +
+ +* Version: 0.2.0 +* GitHub: NA +* Source code: https://github.com/cran/surveyexplorer +* Date/Publication: 2024-06-07 09:50:02 UTC +* Number of recursive dependencies: 85 + +Run `revdepcheck::cloud_details(, "surveyexplorer")` for more info + +
+ +## Newly broken + +* 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 + ... + 1. ├─testthat::expect_false(identical(as.list(x), as.list(y))) at test-singlechoice.R:92:3 + 2. │ └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. ├─base::identical(as.list(x), as.list(y)) + 5. ├─base::as.list(x) + 6. └─base::as.list.default(x) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 67 ] + Error: Test failures + Execution halted + ``` + +# survHE + +
+ +* Version: 2.0.4 +* GitHub: https://github.com/giabaio/survHE +* Source code: https://github.com/cran/survHE +* Date/Publication: 2025-05-15 08:20:02 UTC +* Number of recursive dependencies: 128 + +Run `revdepcheck::cloud_details(, "survHE")` 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 + ... + ── Failure ('test-make.surv.R:20:3'): output plots don't throw an error and return ggplot2 list ── + psa.plot(p.mle3) has type 'object', not 'list'. + ── Failure ('test-make.surv.R:22:3'): output plots don't throw an error and return ggplot2 list ── + plot(mle, add.km = TRUE) has type 'object', not 'list'. + ── Failure ('test-make.surv.R:23:3'): output plots don't throw an error and return ggplot2 list ── + plot(mle, add.km = TRUE, sim = 10) has type 'object', not 'list'. + + [ FAIL 7 | WARN 0 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted + ``` + +# survstan + +
+ +* Version: 0.0.7.1 +* GitHub: https://github.com/fndemarqui/survstan +* Source code: https://github.com/cran/survstan +* Date/Publication: 2024-04-12 16:50:02 UTC +* Number of recursive dependencies: 114 + +Run `revdepcheck::cloud_details(, "survstan")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘LRT.Rmd’ using rmarkdown + + Quitting from LRT.Rmd:30-42 [unnamed-chunk-2] + Error: processing vignette 'LRT.Rmd' failed with diagnostics: + C stack usage 9961988 is too close to the limit + --- failed re-building ‘LRT.Rmd’ + + --- re-building ‘survstan.Rmd’ using rmarkdown + --- finished re-building ‘survstan.Rmd’ + + SUMMARY: processing the following file failed: + ‘LRT.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 79.0Mb + sub-directories of 1Mb or more: + libs 78.4Mb + ``` + +* 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. + ``` + +# symptomcheckR + +
+ +* Version: 0.1.3 +* GitHub: https://github.com/ma-kopka/symptomcheckR +* Source code: https://github.com/cran/symptomcheckR +* Date/Publication: 2024-04-16 20:40:06 UTC +* Number of recursive dependencies: 105 + +Run `revdepcheck::cloud_details(, "symptomcheckR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘symptomcheckR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_performance_multiple + > ### Title: plot_performance_multiple + > ### Aliases: plot_performance_multiple + > + > ### ** Examples + > + > data(symptomcheckRdata) + ... + 42. │ └─grid:::validGrob.grob(g) + 43. │ ├─grid::validDetails(x) + 44. │ └─grid:::validDetails.text(x) + 45. │ ├─base::as.character(x$label) + 46. │ └─base::as.character.default(x$label) + 47. └─base::.handleSimpleError(...) + 48. └─purrr (local) h(simpleError(msg, call)) + 49. └─cli::cli_abort(...) + 50. └─rlang::abort(...) + Execution halted + ``` + +# synthpop + +
+ +* Version: 1.9-1.1 +* GitHub: NA +* Source code: https://github.com/cran/synthpop +* Date/Publication: 2025-06-03 05:53:06 UTC +* Number of recursive dependencies: 64 + +Run `revdepcheck::cloud_details(, "synthpop")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘synthpop-Ex.R’ failed + The error most likely occurred in: + + > ### Name: compare.synds + > ### Title: Compare univariate distributions of synthesised and observed + > ### data + > ### Aliases: compare.synds compare.data.frame compare.list + > ### print.compare.synds + > + > ### ** Examples + ... + > + > ### synthetic data provided as a 'synds' object + > compare(s1, ods, vars = "ls") + Calculations done for ls + + Comparing percentages observed with synthetic + + Error in S7::prop(x, "meta")[[i]] : subscript out of bounds + Calls: ... print.compare.synds -> print -> [[ -> [[.ggplot2::gg + Execution halted + ``` + +## In both + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + --- re-building ‘disclosure.Rnw’ using Sweave + New version of synthpop (1.9-0) with disclosure functions + see disclosure.pdf for details and NEWS file for other changes + + Find out more at https://www.synthpop.org.uk/ + Error: processing vignette 'disclosure.Rnw' failed with diagnostics: + Running 'texi2dvi' on 'disclosure.tex' failed. + LaTeX errors: + ! LaTeX Error: File `authblk.sty' not found. + ... + l.6 \usepackage + {framed}^^M + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building 'utility.Rnw' + + SUMMARY: processing the following files failed: + ‘disclosure.Rnw’ ‘inference.Rnw’ ‘utility.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# tabledown + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/masiraji/tabledown +* Source code: https://github.com/cran/tabledown +* Date/Publication: 2024-05-02 13:40:03 UTC +* Number of recursive dependencies: 164 + +Run `revdepcheck::cloud_details(, "tabledown")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘tabledown-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggreliability_plotly + > ### Title: A Function for Creating Item Response Theory based reliability + > ### plot based on plotly. + > ### Aliases: ggreliability_plotly + > + > ### ** Examples + > + ... + Iteration: 17, Log-Lik: -5351.363, Max-Change: 0.00011 + Iteration: 18, Log-Lik: -5351.363, Max-Change: 0.00054 + Iteration: 19, Log-Lik: -5351.363, Max-Change: 0.00012 + Iteration: 20, Log-Lik: -5351.363, Max-Change: 0.00035 + Iteration: 21, Log-Lik: -5351.363, Max-Change: 0.00010 + > + > plot <- ggreliability_plotly(data, model) + Error in pm[[2]] : subscript out of bounds + Calls: ggreliability_plotly -> -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 551 marked UTF-8 strings + ``` + +# tastypie + +
+ +* Version: 0.1.1 +* GitHub: https://github.com/PaoloDalena/tastypie +* Source code: https://github.com/cran/tastypie +* Date/Publication: 2023-09-06 18:00:06 UTC +* Number of recursive dependencies: 77 + +Run `revdepcheck::cloud_details(, "tastypie")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(tastypie) + $$ $$ $$ + __||__||__||__ + | * * * * * * *| + |* * * * * * * | + | * * * * * * *| + ... + * S7_object + * gg + Backtrace: + ▆ + 1. └─testthat::expect_match(class(b), "gg") at test-templates.R:37:3 + 2. └─testthat:::expect_match_(...) + + [ FAIL 45 | WARN 38 | SKIP 0 | PASS 74 ] + Error: Test failures + Execution halted + ``` + +# TcGSA + +
+ +* Version: 0.12.10 +* GitHub: https://github.com/sistm/TcGSA +* Source code: https://github.com/cran/TcGSA +* Date/Publication: 2022-02-28 21:40:02 UTC +* Number of recursive dependencies: 132 + +Run `revdepcheck::cloud_details(, "TcGSA")` for more info + +
+ +## Newly broken + +* checking Rd cross-references ... WARNING + ``` + Missing link or links in Rd file 'plot1GS.Rd': + ‘+.gg’ + + Missing link or links in Rd file 'plotFit.GS.Rd': + ‘+.gg’ + + Missing link or links in Rd file 'plotMultipleGS.Rd': + ‘+.gg’ + + Missing link or links in Rd file 'plotPat.1GS.Rd': + ‘+.gg’ + + Missing link or links in Rd file 'plotSelect.GS.Rd': + ‘+.gg’ + + See section 'Cross-references' in the 'Writing R Extensions' manual. + ``` + +# TCIU + +
+ +* Version: 1.2.7 +* GitHub: https://github.com/SOCR/TCIU +* Source code: https://github.com/cran/TCIU +* Date/Publication: 2024-09-15 02:40:02 UTC +* Number of recursive dependencies: 166 + +Run `revdepcheck::cloud_details(, "TCIU")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘TCIU-Ex.R’ failed + The error most likely occurred in: + + > ### Name: fmri_image + > ### Title: interactive graph object of the fMRI image + > ### Aliases: fmri_image + > + > ### ** Examples + > + > fmri_generate = fmri_simulate_func(dim_data = c(64, 64, 40), mask = mask) + > fmri_image(fmri_generate$fmri_data, option='manually', voxel_location = c(40,22,33), time = 4) + Error in pm[[2]] : subscript out of bounds + Calls: fmri_image ... add_trace -> add_data -> ggplotly -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘tciu-LT-kimesurface.Rmd’ using rmarkdown + --- finished re-building ‘tciu-LT-kimesurface.Rmd’ + + --- re-building ‘tciu-fMRI-analytics.Rmd’ using rmarkdown + + Quitting from tciu-fMRI-analytics.Rmd:183-185 [unnamed-chunk-5] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `pm[[2]]`: + ... + + Error: processing vignette 'tciu-fMRI-analytics.Rmd' failed with diagnostics: + subscript out of bounds + --- failed re-building ‘tciu-fMRI-analytics.Rmd’ + + SUMMARY: processing the following file failed: + ‘tciu-fMRI-analytics.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 14.1Mb + sub-directories of 1Mb or more: + data 1.5Mb + doc 12.0Mb + ``` + +# teal.widgets + +
+ +* Version: 0.4.3 +* GitHub: https://github.com/insightsengineering/teal.widgets +* Source code: https://github.com/cran/teal.widgets +* Date/Publication: 2025-01-31 17:50:01 UTC +* Number of recursive dependencies: 105 + +Run `revdepcheck::cloud_details(, "teal.widgets")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > pkg_name <- "teal.widgets" + > library(pkg_name, character.only = TRUE) + > testthat::test_check(pkg_name) + [ FAIL 3 | WARN 0 | SKIP 21 | PASS 203 ] + + ══ Skipped tests (21) ══════════════════════════════════════════════════════════ + • testing depth 3 is below current testing specification 5 (21): + ... + ── Failure ('test-ggplot2_args.R:267:5'): parse_ggplot2_args, when resolve_ggplot2_args priorotizes input in the order: user_plot, user_default, teal.ggplot2_args and module_plot ── + deparse(parsed_all$theme, 500) not identical to "ggplot2::theme(axis.text = structure(list(), class = c(\"element_blank\", \"element\")))". + 1/1 mismatches + x[1]: "ggplot2::theme(axis.text = )" + y[1]: "ggplot2::theme(axis.text = structure(list(), class = c(\"element_blank\", + y[1]: \"element\")))" + + [ FAIL 3 | WARN 0 | SKIP 21 | PASS 203 ] + Error: Test failures + Execution halted + ``` + +# telraamStats + +
+ +* Version: 1.1.2 +* GitHub: https://github.com/KetsiaGuichard/telraamStats +* Source code: https://github.com/cran/telraamStats +* Date/Publication: 2024-05-27 17:40:02 UTC +* Number of recursive dependencies: 83 + +Run `revdepcheck::cloud_details(, "telraamStats")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘telraamStats-Ex.R’ failed + The error most likely occurred in: + + > ### Name: gg_car_speed_histogram + > ### Title: Histogram of car speed over a period, for a segment or a subset + > ### of segment. + > ### Aliases: gg_car_speed_histogram + > + > ### ** Examples + > + ... + 24. └─vctrs::vec_default_cast(...) + 25. ├─base::withRestarts(...) + 26. │ └─base (local) withOneRestart(expr, restarts[[1L]]) + 27. │ └─base (local) doWithOneRestart(return(expr), restart) + 28. └─vctrs::stop_incompatible_cast(...) + 29. └─vctrs::stop_incompatible_type(...) + 30. └─vctrs:::stop_incompatible(...) + 31. └─vctrs:::stop_vctrs(...) + 32. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘data-details.Rmd’ using rmarkdown + --- finished re-building ‘data-details.Rmd’ + + --- re-building ‘data-visualization.Rmd’ using rmarkdown + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 3271 marked UTF-8 strings + ``` + +# TestGardener + +
+ +* Version: 3.3.5 +* GitHub: NA +* Source code: https://github.com/cran/TestGardener +* Date/Publication: 2024-09-18 17:40:02 UTC +* Number of recursive dependencies: 123 + +Run `revdepcheck::cloud_details(, "TestGardener")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘TestGardener-Ex.R’ failed + The error most likely occurred in: + + > ### Name: Ffuns_plot + > ### Title: Plot a selection of fit criterion F functions and their first + > ### two derivatives. + > ### Aliases: Ffuns_plot + > + > ### ** Examples + > + ... + > # short SweSAT multiple choice test with 24 items and 1000 examinees + > chcemat <- Quant_13B_problem_dataList$chcemat + > index <- Quant_13B_problem_parmList$index + > SfdList <- Quant_13B_problem_parmList$SfdList + > plotindex <- 1:3 + > indfine <- seq(0,100,len=101) + > Ffuns_plot(indfine, index, SfdList, chcemat, plotindex) + Error: object is invalid: + - every label must be named. + Execution halted + ``` + +# thematic + +
+ +* Version: 0.1.6 +* GitHub: https://github.com/rstudio/thematic +* Source code: https://github.com/cran/thematic +* Date/Publication: 2024-07-29 15:50:02 UTC +* Number of recursive dependencies: 103 + +Run `revdepcheck::cloud_details(, "thematic")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘thematic-Ex.R’ failed + The error most likely occurred in: + + > ### Name: auto_config + > ### Title: Configure auto theming behavior + > ### Aliases: auto_config auto_config_set auto_config_get + > + > ### ** Examples + > + > old_config <- auto_config_set(auto_config("black", "white")) + > thematic_with_theme( + + thematic_theme(), { + + plot(1:10, 1:10) + + }) + Error in get(x, envir = ns, inherits = FALSE) : + object 'ggplot_build.ggplot' not found + Calls: thematic_with_theme ... -> ggplot_build_set -> getFromNamespace -> get + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(thematic) + > + > test_check("thematic") + [ FAIL 17 | WARN 0 | SKIP 5 | PASS 13 ] + + ══ Skipped tests (5) ═══════════════════════════════════════════════════════════ + ... + Backtrace: + ▆ + 1. └─thematic::thematic_on("black", "white", "green") at test-state.R:54:3 + 2. └─thematic:::ggplot_build_set() + 3. └─utils::getFromNamespace("ggplot_build.ggplot", "ggplot2") + 4. └─base::get(x, envir = ns, inherits = FALSE) + + [ FAIL 17 | WARN 0 | SKIP 5 | PASS 13 ] + Error: Test failures + Execution halted + ``` + +# tidycat + +
+ +* Version: 0.1.2 +* GitHub: https://github.com/guyabel/tidycat +* Source code: https://github.com/cran/tidycat +* Date/Publication: 2021-08-02 04:20:01 UTC +* Number of recursive dependencies: 68 + +Run `revdepcheck::cloud_details(, "tidycat")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘tidycat-Ex.R’ failed + The error most likely occurred in: + + > ### Name: tidy_categorical + > ### Title: Expand broom::tidy() Outputs for Categorical Parameter Estimates + > ### Aliases: tidy_categorical + > + > ### ** Examples + > + > # strip ordering in factors (currently ordered factor not supported) + ... + > ggplot(data = d0, + + mapping = aes(x = level, colour = reference, + + y = estimate, ymin = conf.low, ymax = conf.high)) + + + facet_row(facets = vars(variable), scales = "free_x", space = "free") + + + geom_hline(yintercept = 0, linetype = "dashed") + + + geom_pointrange() + + + theme(axis.text.x = element_text(angle = 45, hjust = 1)) + Error in space$x : $ operator is invalid for atomic vectors + Calls: ... -> draw_panels -> -> init_gtable + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘intro.Rmd’ using rmarkdown + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘tidyr’ + All declared Imports should be used. + ``` + +# tidyCDISC + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/Biogen-Inc/tidyCDISC +* Source code: https://github.com/cran/tidyCDISC +* Date/Publication: 2023-03-16 14:20:02 UTC +* Number of recursive dependencies: 132 + +Run `revdepcheck::cloud_details(, "tidyCDISC")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘spelling.R’ + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(tidyCDISC) + > library(shinyjs) + + Attaching package: 'shinyjs' + + ... + 'test-tableGen_fct_y_freq.R:35:1' + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Error: (code run outside of `test_that()`) ────────────────────────────────── + + Error: C stack usage 9965460 is too close to the limit + + [ FAIL 1 | WARN 1 | SKIP 15 | PASS 91 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.5Mb + sub-directories of 1Mb or more: + R 1.5Mb + data 2.0Mb + doc 1.8Mb + ``` + +# tidycomm + +
+ +* Version: 0.4.1 +* GitHub: https://github.com/joon-e/tidycomm +* Source code: https://github.com/cran/tidycomm +* Date/Publication: 2024-02-22 12:20:02 UTC +* Number of recursive dependencies: 142 + +Run `revdepcheck::cloud_details(, "tidycomm")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(tidycomm) + + Attaching package: 'tidycomm' + + The following object is masked from 'package:testthat': + + ... + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 378 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Error ('test-tdcmm_visualize.R:3:1'): implemented visualize() calls return ggplot2 (gg) ── + + Error: C stack usage 9965108 is too close to the limit + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 378 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘v01_univariate.Rmd’ using rmarkdown + ``` + +# tidydr + +
+ +* Version: 0.0.5 +* GitHub: https://github.com/YuLab-SMU/tidydr +* Source code: https://github.com/cran/tidydr +* Date/Publication: 2023-03-08 09:20:02 UTC +* Number of recursive dependencies: 76 + +Run `revdepcheck::cloud_details(, "tidydr")` for more info + +
+ +## Newly broken + +* checking whether package ‘tidydr’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/tidydr/new/tidydr.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘tidydr’ ... +** package ‘tidydr’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in get(x, envir = ns, inherits = FALSE) : + object 'len0_null' not found +Error: unable to load R code in package ‘tidydr’ +Execution halted +ERROR: lazy loading failed for package ‘tidydr’ +* removing ‘/tmp/workdir/tidydr/new/tidydr.Rcheck/tidydr’ + + +``` +### CRAN + +``` +* installing *source* package ‘tidydr’ ... +** package ‘tidydr’ 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 +** 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 (tidydr) + + +``` +# tidyEdSurvey + +
+ +* Version: 0.1.3 +* GitHub: NA +* Source code: https://github.com/cran/tidyEdSurvey +* Date/Publication: 2024-05-14 20:20:03 UTC +* Number of recursive dependencies: 111 + +Run `revdepcheck::cloud_details(, "tidyEdSurvey")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(EdSurvey) + Loading required package: car + Loading required package: carData + Loading required package: lfactors + lfactors v1.0.4 + + ... + ── Failure ('test-ggplot.R:13:3'): density plot with facets and PVs ──────────── + class(p) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + ── Failure ('test-ggplot.R:21:3'): boxplot with facets and PVs ───────────────── + class(p) not equal to c("gg", "ggplot"). + Lengths differ: 5 is not 2 + + [ FAIL 2 | WARN 0 | SKIP 1 | PASS 10 ] + Error: Test failures + Execution halted + ``` + +# tidyfit + +
+ +* Version: 0.7.4 +* GitHub: https://github.com/jpfitzinger/tidyfit +* Source code: https://github.com/cran/tidyfit +* Date/Publication: 2025-04-29 18:50:02 UTC +* Number of recursive dependencies: 191 + +Run `revdepcheck::cloud_details(, "tidyfit")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Accessing_Fitted_Model_Objects.Rmd’ using rmarkdown + ``` + +# tidypaleo + +
+ +* Version: 0.1.3 +* GitHub: https://github.com/paleolimbot/tidypaleo +* Source code: https://github.com/cran/tidypaleo +* Date/Publication: 2023-01-18 08:20:03 UTC +* Number of recursive dependencies: 84 + +Run `revdepcheck::cloud_details(, "tidypaleo")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.rotate_facet_label_spec: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.sequential_layer_facet_spec: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# tidyposterior + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/tidymodels/tidyposterior +* Source code: https://github.com/cran/tidyposterior +* Date/Publication: 2023-10-11 18:50:02 UTC +* Number of recursive dependencies: 177 + +Run `revdepcheck::cloud_details(, "tidyposterior")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(tidyposterior) + > + > test_check("tidyposterior") + + Attaching package: 'rsample' + + ... + `expected`: ".upper" + ── Failure ('test_perf_mod.R:288:3'): workflow sets ──────────────────────────── + as.character(p_rope$labels$colour) (`actual`) not equal to "workflow" (`expected`). + + `actual`: + `expected`: "workflow" + + [ FAIL 12 | WARN 32 | SKIP 5 | PASS 116 ] + Error: Test failures + Execution halted + ``` + +# tidysdm + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/EvolEcolGroup/tidysdm +* Source code: https://github.com/cran/tidysdm +* Date/Publication: 2025-03-05 17:40:02 UTC +* Number of recursive dependencies: 192 + +Run `revdepcheck::cloud_details(, "tidysdm")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘tidysdm-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_pres_vs_bg + > ### Title: Plot presences vs background + > ### Aliases: plot_pres_vs_bg + > + > ### ** Examples + > + > data("bradypus", package = "maxnet") + ... + + ), + + ref = "presence" + + )) %>% + + select(-ecoreg) + > + > bradypus_tb %>% plot_pres_vs_bg(presence) + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘a0_tidysdm_overview.Rmd’ using rmarkdown + ``` + +# timetk + +
+ +* Version: 2.9.0 +* GitHub: https://github.com/business-science/timetk +* Source code: https://github.com/cran/timetk +* Date/Publication: 2023-10-31 22:30:02 UTC +* Number of recursive dependencies: 205 + +Run `revdepcheck::cloud_details(, "timetk")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + 7. └─timetk:::plot_time_series.grouped_df(...) + 8. ├─timetk::plot_time_series(...) + 9. └─timetk:::plot_time_series.data.frame(...) + 10. ├─plotly::ggplotly(g, dynamicTicks = TRUE) + 11. └─plotly:::ggplotly.ggplot(g, dynamicTicks = TRUE) + 12. └─plotly::gg2list(...) + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 406 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 2750 marked UTF-8 strings + ``` + +# tinyarray + +
+ +* Version: 2.4.3 +* GitHub: https://github.com/xjsun1221/tinyarray +* Source code: https://github.com/cran/tinyarray +* Date/Publication: 2025-03-05 13:20:02 UTC +* Number of recursive dependencies: 249 + +Run `revdepcheck::cloud_details(, "tinyarray")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘tinyarray-Ex.R’ failed + The error most likely occurred in: + + > ### Name: box_surv + > ### Title: box_surv + > ### Aliases: box_surv + > + > ### ** Examples + > + > if(requireNamespace("ggpubr",quietly = TRUE)) { + ... + Please use `theme()` to construct themes. + 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 tinyarray package. + Please report the issue at . + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +# tip + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/tip +* Date/Publication: 2022-11-14 17:30:02 UTC +* Number of recursive dependencies: 98 + +Run `revdepcheck::cloud_details(, "tip")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘tip-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ggplot_line_point + > ### Title: Plot connected points using ggplot2 + > ### Aliases: ggplot_line_point + > + > ### ** Examples + > + > # Import the tip library + ... + > # Create a label that appears on the horizontal axis + > xlab <- "x" + > + > # Create a label that appears on the vertical axis + > ylab <- "y" + > + > # Create the plot of y versus x with + > ggplot_line_point(.x = x, .y = y, .xlab = xlab, .ylab = ylab) + Error: C stack usage 9962292 is too close to the limit + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘matrix-CONSTANT-simulated-vignette.Rmd’ using rmarkdown + + Quitting from matrix-CONSTANT-simulated-vignette.Rmd:93-96 [unnamed-chunk-3] + Error: processing vignette 'matrix-CONSTANT-simulated-vignette.Rmd' failed with diagnostics: + C stack usage 9965300 is too close to the limit + --- failed re-building ‘matrix-CONSTANT-simulated-vignette.Rmd’ + + --- re-building ‘matrix-MNIW-simulated-vignette.Rmd’ using rmarkdown + + ... + --- failed re-building ‘vector-NIW-usarrests-vignette.Rmd’ + + SUMMARY: processing the following files failed: + ‘matrix-CONSTANT-simulated-vignette.Rmd’ + ‘matrix-MNIW-simulated-vignette.Rmd’ + ‘tensor-CONSTANT-simulated-vignette.Rmd’ + ‘vector-NIW-iris-vignette.Rmd’ ‘vector-NIW-usarrests-vignette.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking Rd files ... NOTE + ``` + checkRd: (-1) partition_undirected_graph.Rd:20: Lost braces; missing escapes or markup? + 20 | \item{cutoff}{Numeric. The value max(0, g_{i,j} - cutoff) so that there are <\code{.num_components}> components in the graph.} + | ^ + ``` + +# tmt + +
+ +* Version: 0.3.4-0 +* GitHub: https://github.com/jansteinfeld/tmt +* Source code: https://github.com/cran/tmt +* Date/Publication: 2024-05-03 15:00:02 UTC +* Number of recursive dependencies: 77 + +Run `revdepcheck::cloud_details(, "tmt")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(tmt) + - tmt 0.3.4-0 (2024-05-02) + > + > test_check("tmt") + The following items are specified in the dataset, but not in the submitted mstdesign: ii1 + The following items are specified in the mstdesign, but not in the dataset: i1 + ... + [1] 1 - 11 == -10 + Backtrace: + ▆ + 1. └─testthat::expect_that(length(p), equals(11)) at test-tmt_gmc.R:34:5 + 2. └─testthat (local) condition(object) + 3. └─testthat::expect_equal(x, expected, ..., expected.label = label) + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 362 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Package suggested but not available for checking: ‘dexterMST’ + ``` + +# TPMplt + +
+ +* Version: 0.1.6 +* GitHub: https://github.com/CubicZebra/TPMplt +* Source code: https://github.com/cran/TPMplt +* Date/Publication: 2024-10-01 13:20:05 UTC +* Number of recursive dependencies: 91 + +Run `revdepcheck::cloud_details(, "TPMplt")` for more info + +
+ +## Newly broken + +* checking whether package ‘TPMplt’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘TPMplt’ + See ‘/tmp/workdir/TPMplt/new/TPMplt.Rcheck/00install.out’ for details. + ``` + +# track2KBA + +
+ +* Version: 1.1.2 +* GitHub: https://github.com/BirdLifeInternational/track2kba +* Source code: https://github.com/cran/track2KBA +* Date/Publication: 2024-07-01 10:40:07 UTC +* Number of recursive dependencies: 94 + +Run `revdepcheck::cloud_details(, "track2KBA")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > if ( requireNamespace("tinytest", quietly=TRUE) ){ + + tinytest::test_package("track2KBA") + + } + + test_estSpaceUse.R............ 0 tests + Attaching package: 'lubridate' + + ... + with cells of 0.411 square km + + test_mapKDE.R................. 1 tests OK + test_mapKDE.R................. 2 tests OK Error in if (msg != "") { : the condition has length > 1 + Calls: ... lapply -> FUN -> eval -> eval -> expect_silent -> fun + In addition: Warning message: + In Matching::ks.boot(WI, BW, alternative = "two.sided", nboots = iterations) : + For publication quality p-values it is recommended that 'nboots' + be set equal to at least 500 (preferably 1000) + Execution halted + ``` + +# tradeoffaucdim + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/luisgarcez11/tradeoffaucdim +* Source code: https://github.com/cran/tradeoffaucdim +* Date/Publication: 2025-05-02 09:40:02 UTC +* Number of recursive dependencies: 142 + +Run `revdepcheck::cloud_details(, "tradeoffaucdim")` for more info + +
+ +## Newly broken + +* 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/testing-design.html#sec-tests-files-overview + ... + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-05-plot_curve.R:11:3'): output ─────────────────────────────── + plot_curve(obj4)$plot_performance has type 'object', not 'list'. + ── Failure ('test-05-plot_curve.R:12:3'): output ─────────────────────────────── + plot_curve(obj4)$plot_time has type 'object', not 'list'. + + [ FAIL 2 | WARN 0 | SKIP 0 | PASS 38 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘speedglm’ + All declared Imports should be used. + ``` + +# trajmsm + +
+ +* Version: 0.1.3 +* GitHub: https://github.com/awamaeva/R-package-trajmsm +* Source code: https://github.com/cran/trajmsm +* Date/Publication: 2024-10-05 19:00:02 UTC +* Number of recursive dependencies: 35 + +Run `revdepcheck::cloud_details(, "trajmsm")` for more info + +
+ +## Newly broken + +* checking whether package ‘trajmsm’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘trajmsm’ + See ‘/tmp/workdir/trajmsm/new/trajmsm.Rcheck/00install.out’ for details. + ``` + +# TransProR + +
+ +* Version: 1.0.3 +* GitHub: https://github.com/SSSYDYSSS/TransProR +* Source code: https://github.com/cran/TransProR +* Date/Publication: 2025-02-18 09:00:05 UTC +* Number of recursive dependencies: 210 + +Run `revdepcheck::cloud_details(, "TransProR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘TransProR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: highlight_by_node + > ### Title: Highlight Nodes in a Phylogenetic Tree with Custom Fill Colors + > ### and Transparency + > ### Aliases: highlight_by_node + > + > ### ** Examples + > + ... + > p2 <- highlight_by_node( + + p2_plot, + + nodes, + + fill_colors, + + alpha_values, + + extend_values + + ) + Error in ggtree_object + layer : non-numeric argument to binary operator + Calls: highlight_by_node + Execution halted + ``` + +# treeheatr + +
+ +* Version: 0.2.1 +* GitHub: https://github.com/trang1618/treeheatr +* Source code: https://github.com/cran/treeheatr +* Date/Publication: 2020-11-19 21:00:03 UTC +* Number of recursive dependencies: 96 + +Run `revdepcheck::cloud_details(, "treeheatr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘treeheatr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: compute_tree + > ### Title: Compute decision tree from data set + > ### Aliases: compute_tree + > + > ### ** Examples + > + > fit_tree <- compute_tree(penguins, target_lab = 'species') + ... + ✖ You've supplied an object. + Backtrace: + ▆ + 1. └─treeheatr::compute_tree(penguins, target_lab = "species") + 2. └─ggparty::ggparty(fit) + 3. ├─ggplot2::ggplot(data = plot_data, mapping = mapping) + 4. └─ggplot2:::ggplot.default(data = plot_data, mapping = mapping) + 5. └─cli::cli_abort(...) + 6. └─rlang::abort(...) + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘explore.Rmd’ using rmarkdown + + Quitting from explore.Rmd:32-36 [unnamed-chunk-2] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'explore.Rmd' failed with diagnostics: + `mapping` must be created with `aes()`. + ✖ You've supplied an object. + --- failed re-building ‘explore.Rmd’ + + SUMMARY: processing the following file failed: + ‘explore.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# trelliscopejs + +
+ +* Version: 0.2.6 +* GitHub: https://github.com/hafen/trelliscopejs +* Source code: https://github.com/cran/trelliscopejs +* Date/Publication: 2021-02-01 08:00:02 UTC +* Number of recursive dependencies: 103 + +Run `revdepcheck::cloud_details(, "trelliscopejs")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(trelliscopejs) + > + > test_check("trelliscopejs") + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 0 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + 4. └─base::lapply(...) + 5. └─trelliscopejs (local) FUN(X[[i]], ...) + 6. ├─base::do.call(plotly::ggplotly, c(list(p = q), plotly_args)) + 7. ├─plotly (local) ``(p = ``) + 8. └─plotly:::ggplotly.ggplot(p = ``) + 9. └─plotly::gg2list(...) + + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 0 ] + Error: Test failures + Execution halted + ``` + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.facet_trelliscope: + function(object, plot, object_name) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +# tricolore + +
+ +* Version: 1.2.4 +* GitHub: https://github.com/jschoeley/tricolore +* Source code: https://github.com/cran/tricolore +* Date/Publication: 2024-05-15 15:00:02 UTC +* Number of recursive dependencies: 105 + +Run `revdepcheck::cloud_details(, "tricolore")` for more info + +
+ +## Newly broken + +* checking whether package ‘tricolore’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/tricolore/new/tricolore.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 2 marked UTF-8 strings + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘tricolore’ ... +** package ‘tricolore’ 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: .onLoad failed in loadNamespace() for 'ggtern', details: + call: NULL + error: object properties are invalid: +- @lineend must be or , not S3 +Execution halted +ERROR: lazy loading failed for package ‘tricolore’ +* removing ‘/tmp/workdir/tricolore/new/tricolore.Rcheck/tricolore’ + + +``` +### CRAN + +``` +* installing *source* package ‘tricolore’ ... +** package ‘tricolore’ 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 +** 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 (tricolore) + + +``` +# triplot + +
+ +* Version: 1.3.0 +* GitHub: https://github.com/ModelOriented/triplot +* Source code: https://github.com/cran/triplot +* Date/Publication: 2020-07-13 17:00:03 UTC +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "triplot")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘triplot-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.triplot + > ### Title: Plots triplot + > ### Aliases: plot.triplot + > + > ### ** Examples + > + > library(DALEX) + ... + > explainer_apartments <- explain(model = apartments_num_lm_model, + + data = apartments_num[,-1], + + y = apartments_num[, 1], + + verbose = FALSE) + > apartments_tri <- calculate_triplot(x = explainer_apartments, + + new_observation = apartments_num_new_observation[-1]) + > plot(apartments_tri) + Error: object properties are invalid: + - @labels must be , not + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(triplot) + > + > test_check("triplot") + Welcome to DALEX (version: 2.4.3). + Find examples and detailed introduction at: http://ema.drwhy.ai/ + Additional features will be available after installation of: ggpubr. + ... + 14. └─ggplot2::update_ggplot(object = object, plot = plot, ...) + 15. ├─S7::S7_dispatch() + 16. └─ggplot2 (local) `method(update_ggplot, list(ggplot2::theme, ggplot2::ggplot))`(...) + 17. └─S7::set_props(plot, theme = add_theme(plot@theme, object)) + 18. └─S7::`props<-`(`*tmp*`, value = list(...)) + 19. └─S7::validate(object) + + [ FAIL 2 | WARN 3 | SKIP 0 | PASS 74 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking LazyData ... NOTE + ``` + 'LazyData' is specified without a 'data' directory + ``` + +# triptych + +
+ +* Version: 0.1.3 +* GitHub: https://github.com/aijordan/triptych +* Source code: https://github.com/cran/triptych +* Date/Publication: 2024-06-13 15:50:02 UTC +* Number of recursive dependencies: 62 + +Run `revdepcheck::cloud_details(, "triptych")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘triptych-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot.triptych + > ### Title: Plot methods for the triptych classes + > ### Aliases: plot.triptych autoplot.triptych plot.triptych_murphy + > ### autoplot.triptych_murphy plot.triptych_reliability + > ### autoplot.triptych_reliability plot.triptych_roc autoplot.triptych_roc + > ### plot.triptych_mcbdsc autoplot.triptych_mcbdsc + > + ... + > ### ** Examples + > + > data(ex_binary, package = "triptych") + > tr <- triptych(ex_binary) + > + > dplyr::slice(tr, 1, 3, 6, 9) |> autoplot() + Error: Can't find method for generic `&(e1, e2)`: + - e1: + - e2: + Execution halted + ``` + +# tsfeatures + +
+ +* Version: 1.1.1 +* GitHub: https://github.com/robjhyndman/tsfeatures +* Source code: https://github.com/cran/tsfeatures +* Date/Publication: 2023-08-28 14:00:02 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "tsfeatures")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘tsfeatures.Rmd’ using rmarkdown + trying URL 'https://github.com/robjhyndman/tsfeatures/raw/master/extra-data/yahoo.rda' + Content type 'application/octet-stream' length 7897660 bytes (7.5 MB) + ================================================== + downloaded 7.5 MB + + trying URL 'https://github.com/robjhyndman/tsfeatures/raw/master/extra-data/hwl.rda' + Content type 'application/octet-stream' length 185319 bytes (180 KB) + ================================================== + downloaded 180 KB + ``` + +# tsgc + +
+ +* Version: 0.0 +* GitHub: https://github.com/Craig-PT/tsgc +* Source code: https://github.com/cran/tsgc +* Date/Publication: 2024-08-26 12:10:04 UTC +* Number of recursive dependencies: 156 + +Run `revdepcheck::cloud_details(, "tsgc")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘tsgc-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_gy_components + > ### Title: Plots the growth rates and slope of the log cumulative growth + > ### rate + > ### Aliases: plot_gy_components + > + > ### ** Examples + > + ... + setting this dimension may lead to an invalid zoo object + Warning in `dim<-.zoo`(`*tmp*`, value = c(n, p)) : + setting this dimension may lead to an invalid zoo object + > + > # Plot filtered gy, g and gamma + > plot_gy_components(res, plt.start.date = as.Date("2020-07-06")) + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +# tsnet + +
+ +* Version: 0.1.0 +* GitHub: https://github.com/bsiepe/tsnet +* Source code: https://github.com/cran/tsnet +* Date/Publication: 2024-02-28 11:30:02 UTC +* Number of recursive dependencies: 74 + +Run `revdepcheck::cloud_details(, "tsnet")` 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 + ... + Chain 1: + [ FAIL 1 | WARN 16 | SKIP 0 | PASS 107 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-centrality.R:52:3'): plot_centrality returns expected output ── + `result` has type 'object', not 'list'. + + [ FAIL 1 | WARN 16 | SKIP 0 | PASS 107 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 159.7Mb + sub-directories of 1Mb or more: + libs 158.7Mb + ``` + +* checking for GNU extensions in Makefiles ... NOTE + ``` + GNU make is a SystemRequirements. + ``` + +# ufs + +
+ +* Version: 0.5.12 +* GitHub: NA +* Source code: https://github.com/cran/ufs +* Date/Publication: 2024-03-09 22:30:02 UTC +* Number of recursive dependencies: 146 + +Run `revdepcheck::cloud_details(, "ufs")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ufs-Ex.R’ failed + The error most likely occurred in: + + > ### Name: regrInfluential + > ### Title: Detecting influential cases in regression analyses + > ### Aliases: regrInfluential print.regrInfluential + > + > ### ** Examples + > + > + ... + > regrInfluential(mpg ~ hp, mtcars); + + ### Influential cases: + + mpg hp dfb.1_ dfb.hp dffit cov.r cook.d hat + Maserati Bora 15 335 -1.128627 1.487575 1.580208 0.9791369 1.052231 0.2745929 + indexOfInfluentiality + Maserati Bora 5 + Error: C stack usage 9963092 is too close to the limit + Execution halted + ``` + +# ulrb + +
+ +* Version: 0.1.6 +* GitHub: https://github.com/pascoalf/ulrb +* Source code: https://github.com/cran/ulrb +* Date/Publication: 2025-04-07 09:50:02 UTC +* Number of recursive dependencies: 81 + +Run `revdepcheck::cloud_details(, "ulrb")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘Glossary.Rmd’ using rmarkdown + --- finished re-building ‘Glossary.Rmd’ + + --- re-building ‘eco-analysis.Rmd’ using rmarkdown + ``` + +# umiAnalyzer + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/sfilges/umiAnalyzer +* Source code: https://github.com/cran/umiAnalyzer +* Date/Publication: 2021-11-25 08:40:02 UTC +* Number of recursive dependencies: 112 + +Run `revdepcheck::cloud_details(, "umiAnalyzer")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘umiAnalyzer-Ex.R’ failed + The error most likely occurred in: + + > ### Name: AmpliconPlot + > ### Title: Generate Amplicon plots + > ### Aliases: AmpliconPlot + > + > ### ** Examples + > + > library(umiAnalyzer) + ... + ℹ Please use tidy evaluation idioms with `aes()` + ℹ The deprecated feature was likely used in the umiAnalyzer package. + Please report the issue at . + Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0. + ℹ Please use `linewidth` instead. + ℹ The deprecated feature was likely used in the umiAnalyzer package. + Please report the issue at . + Error in pm[[2]] : subscript out of bounds + Calls: AmpliconPlot -> -> ggplotly.ggplot -> gg2list + Execution halted + ``` + +# UnalR + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/estadisticaun/UnalR +* Source code: https://github.com/cran/UnalR +* Date/Publication: 2024-05-25 17:20:05 UTC +* Number of recursive dependencies: 168 + +Run `revdepcheck::cloud_details(, "UnalR")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(UnalR) + > + > test_check("UnalR") + Starting 2 test processes + [ FAIL 1 | WARN 4 | SKIP 2 | PASS 73 ] + + ... + ══ Skipped tests (2) ═══════════════════════════════════════════════════════════ + • On CRAN (2): 'test-Plot_Boxplot.R:48:3', 'test-Tabla.R:40:3' + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-Plot_Series.R:110:3'): Plot.Series() captura de algunos valores claves a retornar ── + `output_PlotSeries` has type 'object', not 'list'. + + [ FAIL 1 | WARN 4 | SKIP 2 | PASS 73 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.0Mb + sub-directories of 1Mb or more: + R 2.3Mb + data 2.0Mb + help 2.7Mb + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 312859 marked UTF-8 strings + ``` + +# ushr + +
+ +* Version: 0.2.3 +* GitHub: https://github.com/SineadMorris/ushr +* Source code: https://github.com/cran/ushr +* Date/Publication: 2020-04-21 18:20:03 UTC +* Number of recursive dependencies: 77 + +Run `revdepcheck::cloud_details(, "ushr")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘ushr-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_pairs + > ### Title: Plot pairwise parameter distributions + > ### Aliases: plot_pairs + > + > ### ** Examples + > + > + ... + > + > model_output <- ushr(data = simulated_data) + Warning in sqrt(diag(fisher_info)) : NaNs produced + Warning in sqrt(diag(fisher_info)) : NaNs produced + Warning in sqrt(diag(fisher_info)) : NaNs produced + Warning in sqrt(diag(fisher_info)) : NaNs produced + > + > plot_pairs(model_output) + Error: C stack usage 9963940 is too close to the limit + Execution halted + ``` + +# usmap + +
+ +* Version: 0.8.0 +* GitHub: https://github.com/pdil/usmap +* Source code: https://github.com/cran/usmap +* Date/Publication: 2025-05-28 08:00:02 UTC +* Number of recursive dependencies: 88 + +Run `revdepcheck::cloud_details(, "usmap")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘usmap-Ex.R’ failed + The error most likely occurred in: + + > ### Name: .east_north_central + > ### Title: East North Central census division + > ### Aliases: .east_north_central + > ### Keywords: datasets + > + > ### ** Examples + > + > plot_usmap(include = .east_north_central, labels = TRUE) + Error in process_cpl_read_ogr(x, quiet, check_ring_dir = check_ring_dir, : + package tibble not available: install first? + Calls: plot_usmap ... 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: + > # 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 + ... + • data/statepov.svg + • plot/arizona-county-map-with-labels-and-fill.svg + • plot/example-data-state-map-with-custom-linewidth.svg + • plot/new-england-state-map-with-labels-excluding-maine.svg + • plot/southeastern-states-map-with-labels.svg + • plot/state-map-with-labels.svg + • plot/state-map-with-major-rivers.svg + • plot/state-population-map-with-blue-outlines.svg + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘usmap1.Rmd’ using rmarkdown + + Quitting from usmap1.Rmd:25-27 [unnamed-chunk-1] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `process_cpl_read_ogr()`: + ! package tibble not available: install first? + --- + Backtrace: + ... + + Error: processing vignette 'usmap3.Rmd' failed with diagnostics: + package tibble not available: install first? + --- failed re-building ‘usmap3.Rmd’ + + SUMMARY: processing the following files failed: + ‘usmap1.Rmd’ ‘usmap2.Rmd’ ‘usmap3.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 17 marked UTF-8 strings + ``` + +# utile.visuals + +
+ +* Version: 0.3.3 +* GitHub: https://github.com/efinite/utile.visuals +* Source code: https://github.com/cran/utile.visuals +* Date/Publication: 2023-01-24 01:00:02 UTC +* Number of recursive dependencies: 38 + +Run `revdepcheck::cloud_details(, "utile.visuals")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘utile.visuals-Ex.R’ failed + The error most likely occurred in: + + > ### Name: append_table + > ### Title: Append a ggplot2 table to the bottom of a ggplot2 plot + > ### Aliases: append_table + > + > ### ** Examples + > + > library(survival) + ... + + aesthetics = c('colour', 'fill')) + + + theme_basic() + > + > # Risk Table + > tbl_risk <- ggrisktable(fit, c(0, 10, 20, 30, 40, 50)) + + + coord_cartesian(c(0, 50)) + + + scale_x_continuous(expand = c(0.02,0)) + + + theme_risk() + Error: Can't find property @hjust + Execution halted + ``` + +# vaccine + +
+ +* Version: 1.3.0 +* GitHub: https://github.com/Avi-Kenny/vaccine +* Source code: https://github.com/cran/vaccine +* Date/Publication: 2025-01-07 18:00:01 UTC +* Number of recursive dependencies: 152 + +Run `revdepcheck::cloud_details(, "vaccine")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(vaccine) + vaccine (version 1.3.0). + Type ?vaccine to get started. + > + > test_check("vaccine") + Loading required package: nnls + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-test-core-functions.R:320:3'): plot_ce ─────────────────────── + class(p) (`actual`) not equal to c("gg", "ggplot") (`expected`). + + `actual`: "ggplot2::ggplot" "ggplot" "ggplot2::gg" "S7_object" "gg" + `expected[2:2]`: "ggplot" + + [ FAIL 1 | WARN 0 | SKIP 0 | PASS 165 ] + Error: Test failures + Execution halted + ``` + +# vaccineff + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/epiverse-trace/vaccineff +* Source code: https://github.com/cran/vaccineff +* Date/Publication: 2024-11-29 09:30:02 UTC +* Number of recursive dependencies: 73 + +Run `revdepcheck::cloud_details(, "vaccineff")` for more info + +
+ +## Newly broken + +* 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 + ... + `expected` is a character vector ('coverage * max(dose_plot)') + ── Failure ('test-utils_coverage.R:50:3'): `plot_coverage`: cumulative plot ──── + plt$labels$y (`actual`) not identical to "coverage * max(dose_plot)" (`expected`). + + `actual` is NULL + `expected` is a character vector ('coverage * max(dose_plot)') + + [ FAIL 2 | WARN 0 | SKIP 6 | PASS 100 ] + Error: Test failures + Execution halted + ``` + +# valr + +
+ +* Version: 0.8.3 +* GitHub: https://github.com/rnabioco/valr +* Source code: https://github.com/cran/valr +* Date/Publication: 2025-01-11 15:40:02 UTC +* Number of recursive dependencies: 146 + +Run `revdepcheck::cloud_details(, "valr")` 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 + ... + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test_glyph.r:13:3'): glyph labels are applied ───────────────────── + res$labels$label (`actual`) not equal to "id" (`expected`). + + `actual` is NULL + `expected` is a character vector ('id') + + [ FAIL 1 | WARN 0 | SKIP 4 | PASS 479 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 15.1Mb + sub-directories of 1Mb or more: + libs 13.9Mb + ``` + +# vanquish + +
+ +* Version: 1.0.0 +* GitHub: NA +* Source code: https://github.com/cran/vanquish +* Date/Publication: 2018-09-05 14:50:04 UTC +* Number of recursive dependencies: 32 + +Run `revdepcheck::cloud_details(, "vanquish")` for more info + +
+ +## Newly broken + +* checking whether package ‘vanquish’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘vanquish’ + See ‘/tmp/workdir/vanquish/new/vanquish.Rcheck/00install.out’ for details. + ``` + +# VarSelLCM + +
+ +* Version: 2.1.3.1 +* GitHub: NA +* Source code: https://github.com/cran/VarSelLCM +* Date/Publication: 2020-10-14 16:34:36 UTC +* Number of recursive dependencies: 61 + +Run `revdepcheck::cloud_details(, "VarSelLCM")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘VarSelLCM.Rmd’ using rmarkdown + + Quitting from VarSelLCM.Rmd:112-115 [unnamed-chunk-10] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error in `rep()`: + ! attempt to replicate an object of type 'object' + --- + Backtrace: + ... + + Error: processing vignette 'VarSelLCM.Rmd' failed with diagnostics: + attempt to replicate an object of type 'object' + --- failed re-building ‘VarSelLCM.Rmd’ + + SUMMARY: processing the following file failed: + ‘VarSelLCM.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 17.3Mb + sub-directories of 1Mb or more: + libs 16.5Mb + ``` + +# vDiveR + +
+ +* Version: 2.0.1 +* GitHub: NA +* Source code: https://github.com/cran/vDiveR +* Date/Publication: 2024-11-22 08:20:02 UTC +* Number of recursive dependencies: 106 + +Run `revdepcheck::cloud_details(, "vDiveR")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘vDiveR-Ex.R’ failed + The error most likely occurred in: + + > ### Name: plot_conservation_level + > ### Title: Conservation Levels Distribution Plot + > ### Aliases: plot_conservation_level + > + > ### ** Examples + > + > plot_conservation_level(proteins_1host, conservation_label = 1,alpha=0.8, base_size = 15) + ... + 32. │ └─base::lapply(...) + 33. │ └─ggplot2 (local) FUN(X[[i]], ...) + 34. │ └─ggplot2 (local) apply_fun(cur_data) + 35. │ └─ggplot2 (local) fun(x, ...) + 36. └─base::.handleSimpleError(...) + 37. └─rlang (local) h(simpleError(msg, call)) + 38. └─handlers[[1L]](cnd) + 39. └─cli::cli_abort(...) + 40. └─rlang::abort(...) + Execution halted + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘maps’ + All declared Imports should be used. + ``` + +# vip + +
+ +* Version: 0.4.1 +* GitHub: https://github.com/koalaverse/vip +* Source code: https://github.com/cran/vip +* Date/Publication: 2023-08-21 09:20:02 UTC +* Number of recursive dependencies: 103 + +Run `revdepcheck::cloud_details(, "vip")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘tinytest.R’ + Running the tests in ‘tests/tinytest.R’ failed. + Complete output: + > if (requireNamespace("tinytest", quietly = TRUE)) { + + home <- length(unclass(packageVersion("vip"))[[1L]]) == 4 + + tinytest::test_package("vip", at_home = home) + + } + + Attaching package: 'vip' + + ... + test_vip.R.................... 0 tests + test_vip.R.................... 1 tests OK + test_vip.R.................... 2 tests OK + test_vip.R.................... 3 tests OK 9ms + ----- FAILED[data]: test_pkg_nnet.R<47--50> + call| expect_identical(current = class(p), target = c("gg", "ggplot")) + diff| Lengths (2, 5) differ (string compare on first 2) + diff| 1 string mismatch + Error: 1 out of 25 tests failed + Execution halted + ``` + +## In both + +* checking package dependencies ... NOTE + ``` + Packages which this enhances but not available for checking: + 'C50', 'caret', 'Cubist', 'earth', 'gbm', 'glmnet', 'h2o', + 'lightgbm', 'mixOmics', 'mlr', 'mlr3', 'neuralnet', 'parsnip', + 'partykit', 'pls', 'randomForest', 'ranger', 'RSNNS', 'sparklyr', + 'tidymodels', 'workflows', 'xgboost' + ``` + +* checking Rd cross-references ... NOTE + ``` + Packages unavailable to check Rd xrefs: ‘randomForest’, ‘glmnet’, ‘C50’, ‘Cubist’, ‘caret’, ‘partykit’, ‘earth’, ‘gbm’, ‘h2o’, ‘sparklyr’, ‘ranger’, ‘xgboost’, ‘lightgbm’ + ``` + +# ViSiElse + +
+ +* Version: 1.2.2 +* GitHub: https://github.com/Re2SimLab/ViSiElse +* Source code: https://github.com/cran/ViSiElse +* Date/Publication: 2019-10-24 20:00:11 UTC +* Number of recursive dependencies: 54 + +Run `revdepcheck::cloud_details(, "ViSiElse")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ViSiElSe_Paper_Walkthrough.Rmd’ using rmarkdown + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘ggplot2’ ‘reshape2’ + All declared Imports should be used. + ``` + +* checking Rd files ... NOTE + ``` + checkRd: (-1) ViSiElse.Rd:101-107: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSiElse.Rd:102: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSiElse.Rd:103: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSiElse.Rd:104: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSiElse.Rd:105-106: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSiElse.Rd:108-127: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSiElse.Rd:112-113: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSiElse.Rd:114-115: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSiElse.Rd:116: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSiElse.Rd:128-134: Lost braces in \itemize; meant \describe ? + ... + checkRd: (-1) ViSiElse.Rd:152-153: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSiElse.Rd:154-155: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSibook-class.Rd:24: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSibook-class.Rd:25: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSibook-class.Rd:29: Lost braces in \itemize; meant \describe ? + checkRd: (-1) ViSibook-class.Rd:30: Lost braces in \itemize; meant \describe ? + checkRd: (-1) dim-ViSibook-methods.Rd:16: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) dim-ViSibook-methods.Rd:17-18: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) summary-ViSigrid-methods.Rd:16: Lost braces in \itemize; \value handles \item{}{} directly + checkRd: (-1) summary-ViSigrid-methods.Rd:17: Lost braces in \itemize; \value handles \item{}{} directly + ``` + +# visualpred + +
+ +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/visualpred +* Date/Publication: 2024-11-07 12:30:02 UTC +* Number of recursive dependencies: 116 + +Run `revdepcheck::cloud_details(, "visualpred")` for more info + +
+ +## Newly broken + +* checking whether package ‘visualpred’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘visualpred’ + See ‘/tmp/workdir/visualpred/new/visualpred.Rcheck/00install.out’ for details. + ``` + +# vivaldi + +
+ +* Version: 1.0.1 +* GitHub: https://github.com/GreshamLab/vivaldi +* Source code: https://github.com/cran/vivaldi +* Date/Publication: 2023-03-21 20:10:02 UTC +* Number of recursive dependencies: 100 + +Run `revdepcheck::cloud_details(, "vivaldi")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘vivaldi-Ex.R’ failed + The error most likely occurred in: + + > ### Name: snv_location + > ### Title: snv_location + > ### Aliases: snv_location + > + > ### ** Examples + > + > # Example 1: + ... + 6 m2 PB1 234 G A minor 0.010 0.990 + 7 m2 PB1 266 G A minor 0.022 0.978 + 8 m2 PB2 199 A G minor 0.043 0.957 + 9 m2 PB2 88 G A major 0.055 0.945 + 10 m2 PB2 180 C T minor 0.011 0.989 + > + > snv_location(df) + Error in pm[[2]] : subscript out of bounds + Calls: snv_location -> -> ggplotly.ggplot -> gg2list + 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 + ... + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ── Failure ('test-snv_location.R:13:3'): expect output ───────────────────────── + Expected `snv_location(df)` to run without any errors. + i Actually got a with text: + subscript out of bounds + + [ FAIL 1 | WARN 2 | SKIP 0 | PASS 28 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘vignette.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.8Mb + sub-directories of 1Mb or more: + doc 5.4Mb + extdata 1.1Mb + ``` + +# vivid + +
+ +* Version: 0.2.9 +* GitHub: NA +* Source code: https://github.com/cran/vivid +* Date/Publication: 2024-07-31 11:50:02 UTC +* Number of recursive dependencies: 234 + +Run `revdepcheck::cloud_details(, "vivid")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘vivid-Ex.R’ failed + The error most likely occurred in: + + > ### Name: pdpPairs + > ### Title: pdpPairs + > ### Aliases: pdpPairs + > + > ### ** Examples + > + > # Load in the data: + ... + > f <- lm(Ozone ~ ., data = aq) + > pdpPairs(aq, f, "Ozone") + Generating ice/pdp fits... waiting... + Finished ice/pdp + Warning: The `size` argument of `element_rect()` is deprecated as of ggplot2 3.4.0. + ℹ Please use the `linewidth` argument instead. + ℹ The deprecated feature was likely used in the vivid package. + Please report the issue to the authors. + Error: C stack usage 9965764 is too close to the limit + Execution halted + ``` + +# voluModel + +
+ +* Version: 0.2.2 +* GitHub: https://github.com/hannahlowens/voluModel +* Source code: https://github.com/cran/voluModel +* Date/Publication: 2024-08-20 22:50:01 UTC +* Number of recursive dependencies: 131 + +Run `revdepcheck::cloud_details(, "voluModel")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘voluModel-Ex.R’ failed + The error most likely occurred in: + + > ### Name: pointCompMap + > ### Title: Comparative point mapping + > ### Aliases: pointCompMap + > ### Keywords: plotting + > + > ### ** Examples + > + ... + 9. └─ggplot2 (local) setup(..., self = self) + 10. └─self$coord$setup_params(data) + 11. └─ggplot2 (local) setup_params(..., self = self) + 12. └─ggproto_parent(Coord, self)$setup_params(data) + 13. └─ggplot2 (local) setup_params(..., self = self) + 14. └─ggplot2:::parse_coord_expand(expand = self$expand %||% TRUE) + 15. └─ggplot2:::check_logical(expand) + 16. └─ggplot2:::stop_input_type(...) + 17. └─rlang::abort(message, ..., call = call, arg = arg) + Execution halted + ``` + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(voluModel) + > + > test_check("voluModel") + terra 1.8.54 + + Attaching package: 'terra' + ... + 9. ├─ggplot2::theme(...) + 10. │ └─ggplot2:::find_args(..., complete = NULL, validate = NULL) + 11. │ └─base::mget(args, envir = env) + 12. └─ggplot2::element_text(colour = 1, size = 12) + 13. └─S7::new_object(...) + 14. └─S7::validate(object, recursive = !parent_validated) + + [ FAIL 1 | WARN 9 | SKIP 2 | PASS 245 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘a_Introduction.Rmd’ using rmarkdown + + Quitting from a_Introduction.Rmd:43-58 [show points] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'a_Introduction.Rmd' failed with diagnostics: + `expand` must be a logical vector, not the number 0.05. + --- failed re-building ‘a_Introduction.Rmd’ + + --- re-building ‘b_RasterProcessing.Rmd’ using rmarkdown + ``` + +# vvshiny + +
+ +* Version: 0.1.1 +* GitHub: NA +* Source code: https://github.com/cran/vvshiny +* Date/Publication: 2023-07-19 15:30:02 UTC +* Number of recursive dependencies: 134 + +Run `revdepcheck::cloud_details(, "vvshiny")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + 1. ├─vvshiny::ggplotly_with_legend(p, color = "grp", mapping_table = list(grp = "Group")) at test-ggplotly_with_legend.R:15:3 + 2. │ ├─plotly::ggplotly(plot) %>% ... + 3. │ ├─plotly::ggplotly(plot) + 4. │ └─plotly:::ggplotly.ggplot(plot) + 5. │ └─plotly::gg2list(...) + 6. └─plotly::layout(...) + + [ FAIL 3 | WARN 4 | SKIP 0 | PASS 58 ] + Error: Test failures + Execution halted + ``` + +# washi + +
+ +* Version: 0.2.0 +* GitHub: https://github.com/WA-Department-of-Agriculture/washi +* Source code: https://github.com/cran/washi +* Date/Publication: 2023-09-07 23:50:02 UTC +* Number of recursive dependencies: 86 + +Run `revdepcheck::cloud_details(, "washi")` 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 + ... + `expected`: 0.0 + ── Failure ('test-theme.R:31:3'): washi_theme() works ────────────────────────── + length(theme$panel.grid.major.y) (`actual`) not equal to 0 (`expected`). + + `actual`: 1.0 + `expected`: 0.0 + + [ FAIL 2 | WARN 4 | SKIP 5 | PASS 13 ] + Error: Test failures + Execution halted + ``` + +# webSDM + +
+ +* Version: 1.1-5 +* GitHub: https://github.com/giopogg/webSDM +* Source code: https://github.com/cran/webSDM +* Date/Publication: 2024-06-24 12:10:02 UTC +* Number of recursive dependencies: 194 + +Run `revdepcheck::cloud_details(, "webSDM")` for more info + +
+ +## Newly broken + +* checking whether package ‘webSDM’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/webSDM/new/webSDM.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘webSDM’ ... +** package ‘webSDM’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +Error: .onLoad failed in loadNamespace() for 'rstan', details: + call: NULL + error: C stack usage 9964308 is too close to the limit +Execution halted +ERROR: lazy loading failed for package ‘webSDM’ +* removing ‘/tmp/workdir/webSDM/new/webSDM.Rcheck/webSDM’ + + +``` +### CRAN + +``` +* installing *source* package ‘webSDM’ ... +** package ‘webSDM’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +** inst +** byte-compile and prepare package for lazy loading +** help +*** installing help indices +*** copying figures +** 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 (webSDM) + + +``` +# wilson + +
+ +* Version: 2.4.2 +* GitHub: https://github.com/loosolab/wilson +* Source code: https://github.com/cran/wilson +* Date/Publication: 2021-04-19 09:40:02 UTC +* Number of recursive dependencies: 203 + +Run `revdepcheck::cloud_details(, "wilson")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(wilson) + + Attaching package: 'wilson' + + The following object is masked from 'package:stats': + + ... + Backtrace: + ▆ + 1. └─wilson::create_geneview(...) at test-interactive-plots.R:21:3 + 2. ├─plotly::ggplotly(...) + 3. └─plotly:::ggplotly.ggplot(...) + 4. └─plotly::gg2list(...) + + [ FAIL 3 | WARN 11 | SKIP 1 | PASS 74 ] + Error: Test failures + Execution halted + ``` + +# windfarmGA + +
+ +* Version: 4.0.0 +* GitHub: https://github.com/YsoSirius/windfarmGA +* Source code: https://github.com/cran/windfarmGA +* Date/Publication: 2025-01-18 11:00:02 UTC +* Number of recursive dependencies: 116 + +Run `revdepcheck::cloud_details(, "windfarmGA")` for more info + +
+ +## Newly broken + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + `expected`: TRUE + ── Failure ('test_plots.R:126:3'): Test Plotting Functions ───────────────────── + class(windr_res)[1] == "gg" is not TRUE + + `actual`: FALSE + `expected`: TRUE + + [ FAIL 2 | WARN 0 | SKIP 2 | PASS 703 ] + Error: Test failures + Execution halted + ``` + +# wql + +
+ +* Version: 1.0.2 +* GitHub: https://github.com/jsta/wql +* Source code: https://github.com/cran/wql +* Date/Publication: 2025-01-23 10:10:02 UTC +* Number of recursive dependencies: 53 + +Run `revdepcheck::cloud_details(, "wql")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘wql-Ex.R’ failed + The error most likely occurred in: + + > ### Name: eofNum + > ### Title: Plot EOF percent variance + > ### Aliases: eofNum + > ### Keywords: Graphics ts + > + > ### ** Examples + > + > + > # Create an annual time series data matrix from sfbay chlorophyll data + > # Average over each year + > chla1 <- aggregate(sfbayChla, 1, mean, na.rm = TRUE) + > chla1 <- chla1[, 1:12] # remove stations with missing years + > eofNum(chla1) + Error: object is invalid: + - every label must be named. + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘wql-package.Rmd’ using rmarkdown + ``` + +# WRS2 + +
+ +* Version: 1.1-7 +* GitHub: NA +* Source code: https://github.com/cran/WRS2 +* Date/Publication: 2025-05-22 05:25:05 UTC +* Number of recursive dependencies: 110 + +Run `revdepcheck::cloud_details(, "WRS2")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘WRS2.Rnw’ using knitr + + Quitting from WRS2.Rnw:193-195 [cor-plot1] + Error: processing vignette 'WRS2.Rnw' failed with diagnostics: + C stack usage 9961524 is too close to the limit + --- failed re-building ‘WRS2.Rnw’ + + SUMMARY: processing the following file failed: + ‘WRS2.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## Newly fixed + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + ... + --- re-building ‘WRS2.Rnw’ using knitr + Error: processing vignette 'WRS2.Rnw' failed with diagnostics: + Running 'texi2dvi' on 'WRS2.tex' failed. + LaTeX errors: + ! LaTeX Error: File `thumbpdf.sty' not found. + + Type X to quit or to proceed, + or enter new name. (Default extension: sty) + ... + l.20 \usepackage + {float,amssymb}^^M + ! ==> Fatal error occurred, no output PDF file produced! + --- failed re-building ‘WRS2.Rnw’ + + SUMMARY: processing the following file failed: + ‘WRS2.Rnw’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# WRTDStidal + +
+ +* Version: 1.1.4 +* GitHub: https://github.com/fawda123/WRTDStidal +* Source code: https://github.com/cran/WRTDStidal +* Date/Publication: 2023-10-20 09:00:11 UTC +* Number of recursive dependencies: 140 + +Run `revdepcheck::cloud_details(, "WRTDStidal")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘WRTDStidal-Ex.R’ failed + The error most likely occurred in: + + > ### Name: wtsplot + > ### Title: Plot the weights for an observation + > ### Aliases: wtsplot wtsplot.default wtsplot.tidal wtsplot.tidalmean + > + > ### ** Examples + > + > + > ## load a fitted tidal object + > data(tidfit) + > + > ## plot using defaults, + > wtsplot(tidfit) + Error in as.vector(x, "character") : + cannot coerce type 'object' to vector of type 'character' + Calls: wtsplot ... validDetails.text -> as.character -> as.character.default + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘overview.Rmd’ using rmarkdown + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 6.8Mb + sub-directories of 1Mb or more: + data 2.0Mb + doc 4.3Mb + ``` + +# xaringanthemer + +
+ +* Version: 0.4.3 +* GitHub: https://github.com/gadenbuie/xaringanthemer +* Source code: https://github.com/cran/xaringanthemer +* Date/Publication: 2024-09-15 14:00:02 UTC +* Number of recursive dependencies: 73 + +Run `revdepcheck::cloud_details(, "xaringanthemer")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘ggplot2-themes.Rmd’ using rmarkdown + ``` + +# xpose + +
+ +* Version: 0.4.19 +* GitHub: https://github.com/UUPharmacometrics/xpose +* Source code: https://github.com/cran/xpose +* Date/Publication: 2025-01-07 20:00:02 UTC +* Number of recursive dependencies: 106 + +Run `revdepcheck::cloud_details(, "xpose")` for more info + +
+ +## Newly broken + +* checking whether package ‘xpose’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/xpose/new/xpose.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘xpose’ ... +** package ‘xpose’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +Error in get("print.ggplot", envir = asNamespace("ggplot2")) : + object 'print.ggplot' not found +Warning: namespace ‘xpose’ is not available and has been replaced +by .GlobalEnv when processing object ‘xpdb_ex_pk’ +... +Warning: namespace ‘xpose’ is not available and has been replaced +by .GlobalEnv when processing object ‘xpdb_ex_pk’ +** inst +** byte-compile and prepare package for lazy loading +Error in get("print.ggplot", envir = asNamespace("ggplot2")) : + object 'print.ggplot' not found +Error: unable to load R code in package ‘xpose’ +Execution halted +ERROR: lazy loading failed for package ‘xpose’ +* removing ‘/tmp/workdir/xpose/new/xpose.Rcheck/xpose’ + + +``` +### CRAN + +``` +* installing *source* package ‘xpose’ ... +** package ‘xpose’ 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 +** help +*** installing help indices +*** copying figures +** 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 (xpose) + + +``` +# xpose.xtras + +
+ +* Version: 0.0.2 +* GitHub: https://github.com/jprybylski/xpose.xtras +* Source code: https://github.com/cran/xpose.xtras +* Date/Publication: 2024-11-21 17:20:02 UTC +* Number of recursive dependencies: 107 + +Run `revdepcheck::cloud_details(, "xpose.xtras")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘xpose.xtras-Ex.R’ failed + The error most likely occurred in: + + > ### Name: catdv_vs_dvprobs + > ### Title: Non-simulation based likelihood model diagnostic + > ### Aliases: catdv_vs_dvprobs + > + > ### ** Examples + > + > + ... + 4. ├─purrr::map_if(...) + 5. │ └─purrr:::where_if(.x, .p) + 6. │ └─rlang::is_logical(.p) + 7. ├─stringr::str_detect(., "@") + 8. │ └─stringr:::check_lengths(string, pattern) + 9. │ └─vctrs::vec_size_common(...) + 10. └─vctrs:::stop_scalar_type(``(``), "string", ``) + 11. └─vctrs:::stop_vctrs(...) + 12. └─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: + > # 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 + ... + 10. ├─stringr::str_detect(., "@") + 11. │ └─stringr:::check_lengths(string, pattern) + 12. │ └─vctrs::vec_size_common(...) + 13. └─vctrs:::stop_scalar_type(``(``), "string", ``) + 14. └─vctrs:::stop_vctrs(...) + 15. └─rlang::abort(message, class = c(class, "vctrs_error"), ..., call = call) + + [ FAIL 10 | WARN 0 | SKIP 4 | PASS 622 ] + Error: Test failures + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘a01-the-xp_xtra-object.Rmd’ using rmarkdown + + Quitting from a01-the-xp_xtra-object.Rmd:94-96 [plot_cont] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + NULL + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'a01-the-xp_xtra-object.Rmd' failed with diagnostics: + `string` must be a vector, not a object. + ... + Error: processing vignette 'a03-useful_plots.Rmd' failed with diagnostics: + `string` must be a vector, not a object. + --- failed re-building ‘a03-useful_plots.Rmd’ + + SUMMARY: processing the following files failed: + ‘a01-the-xp_xtra-object.Rmd’ ‘a02-xpose-sets.Rmd’ + ‘a03-useful_plots.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +## In both + +* checking installed package size ... NOTE + ``` + installed size is 7.9Mb + sub-directories of 1Mb or more: + data 2.5Mb + doc 2.4Mb + ``` + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 2 marked UTF-8 strings + ``` + +# yamlet + +
+ +* Version: 1.2.1 +* GitHub: https://github.com/bergsmat/yamlet +* Source code: https://github.com/cran/yamlet +* Date/Publication: 2025-04-18 12:30:02 UTC +* Number of recursive dependencies: 101 + +Run `revdepcheck::cloud_details(, "yamlet")` for more info + +
+ +## Newly broken + +* checking S3 generic/method consistency ... WARNING + ``` + ggplot_add: + function(object, plot, ...) + ggplot_add.ggplot_isometric: + function(object, plot, object_name) + + ggplot_add: + function(object, plot, ...) + ggplot_add.ggplot_symmetric: + function(object, plot, object_name) + + ggplot_build: + function(plot, ...) + ggplot_build.decorated_ggplot: + function(plot) + See section ‘Generic functions and methods’ in the ‘Writing R + Extensions’ manual. + ``` + +## In both + +* checking re-building of vignette outputs ... WARNING + ``` + Error(s) in re-building vignettes: + --- re-building ‘scripted-html.Rmd’ using rmarkdown + ``` + +# ZetaSuite + +
+ +* Version: 1.0.1 +* GitHub: NA +* Source code: https://github.com/cran/ZetaSuite +* Date/Publication: 2022-05-24 19:40:02 UTC +* Number of recursive dependencies: 79 + +Run `revdepcheck::cloud_details(, "ZetaSuite")` for more info + +
+ +## Newly broken + +* checking whether package ‘ZetaSuite’ can be installed ... WARNING + ``` + Found the following significant warnings: + Warning: replacing previous import ‘e1071::element’ by ‘ggplot2::element’ when loading ‘ZetaSuite’ + See ‘/tmp/workdir/ZetaSuite/new/ZetaSuite.Rcheck/00install.out’ for details. + ``` + +## In both + +* checking dependencies in R code ... NOTE + ``` + Namespace in Imports field not imported from: ‘dplyr’ + All declared Imports should be used. + ``` + diff --git a/tests/testthat/_snaps/4.0/theme.md b/tests/testthat/_snaps/4.0/theme.md new file mode 100644 index 0000000000..e4df8865e7 --- /dev/null +++ b/tests/testthat/_snaps/4.0/theme.md @@ -0,0 +1,8 @@ +# modifying theme element properties with + operator works + + Code + theme_grey() + "asdf" + Condition + Error in `method(+, list(ggplot2::theme, class_any))`: + ! Can't add `"asdf"` to a theme object. + diff --git a/tests/testthat/_snaps/4.4/theme.md b/tests/testthat/_snaps/4.4/theme.md new file mode 100644 index 0000000000..ee5f23ab56 --- /dev/null +++ b/tests/testthat/_snaps/4.4/theme.md @@ -0,0 +1,8 @@ +# modifying theme element properties with + operator works + + Code + theme_grey() + "asdf" + Condition + Error: + ! Can't add `"asdf"` to a theme object. + diff --git a/tests/testthat/_snaps/4.5/theme.md b/tests/testthat/_snaps/4.5/theme.md new file mode 100644 index 0000000000..ee5f23ab56 --- /dev/null +++ b/tests/testthat/_snaps/4.5/theme.md @@ -0,0 +1,8 @@ +# modifying theme element properties with + operator works + + Code + theme_grey() + "asdf" + Condition + Error: + ! Can't add `"asdf"` to a theme object. + diff --git a/tests/testthat/_snaps/aes.md b/tests/testthat/_snaps/aes.md index 4a891eacbe..c4b534a453 100644 --- a/tests/testthat/_snaps/aes.md +++ b/tests/testthat/_snaps/aes.md @@ -54,7 +54,7 @@ Don't know how to get alternative usage for `foo`. -# new_aes() checks its inputs +# class_mapping() checks its inputs `x` must be a , not an integer vector. diff --git a/tests/testthat/_snaps/error.md b/tests/testthat/_snaps/error.md deleted file mode 100644 index a8cb5172df..0000000000 --- a/tests/testthat/_snaps/error.md +++ /dev/null @@ -1,10 +0,0 @@ -# various misuses of +.gg (#2638) - - Cannot use `+` with a single argument. - i Did you accidentally put `+` on a new line? - ---- - - Cannot add objects together. - i Did you forget to add this object to a object? - diff --git a/tests/testthat/_snaps/fortify.md b/tests/testthat/_snaps/fortify.md index 605829d9d8..5baf41b576 100644 --- a/tests/testthat/_snaps/fortify.md +++ b/tests/testthat/_snaps/fortify.md @@ -1,6 +1,6 @@ -# fortify.default proves a helpful error with class uneval +# fortify.default proves a helpful error with mapping class - `data` must be a , or an object coercible by `fortify()`, or a valid -like object coercible by `as.data.frame()`, not a object. + `data` must be a , or an object coercible by `fortify()`, or a valid -like object coercible by `as.data.frame()`, not a object. i Did you accidentally pass `aes()` to the `data` argument? # fortify.default can handle healthy data-frame-like objects diff --git a/tests/testthat/_snaps/layer.md b/tests/testthat/_snaps/layer.md index c796c6a530..a7ae1d1a85 100644 --- a/tests/testthat/_snaps/layer.md +++ b/tests/testthat/_snaps/layer.md @@ -13,10 +13,12 @@ --- `mapping` must be created by `aes()`. + x You've supplied an integer vector. --- `mapping` must be created by `aes()`. + x You've supplied a object. i Did you use `%>%` or `|>` instead of `+`? --- diff --git a/tests/testthat/_snaps/plot.md b/tests/testthat/_snaps/plot.md index 157ebb6635..baabc9038e 100644 --- a/tests/testthat/_snaps/plot.md +++ b/tests/testthat/_snaps/plot.md @@ -1,12 +1,12 @@ # ggplot() throws informative errors - `mapping` must be created with `aes()`. + `mapping` must be created by `aes()`. x You've supplied a character vector. --- `data` cannot be a function. - i Have you misspelled the `data` argument in `ggplot()` + i Have you misspelled the `data` argument in `ggplot()`? --- diff --git a/tests/testthat/_snaps/prohibited-functions.md b/tests/testthat/_snaps/prohibited-functions.md index e13510ebcf..fe32ebf1c4 100644 --- a/tests/testthat/_snaps/prohibited-functions.md +++ b/tests/testthat/_snaps/prohibited-functions.md @@ -12,6 +12,9 @@ $calc_element [1] "skip_blank" + $class_ggplot + [1] "plot_env" + $continuous_scale [1] "scale_name" "minor_breaks" @@ -52,9 +55,6 @@ $geom_violin [1] "draw_quantiles" - $ggplot_add - [1] "object_name" - $ggproto [1] "_class" "_inherit" diff --git a/tests/testthat/_snaps/summarise-plot.md b/tests/testthat/_snaps/summarise-plot.md index 32582d9366..84128c3b47 100644 --- a/tests/testthat/_snaps/summarise-plot.md +++ b/tests/testthat/_snaps/summarise-plot.md @@ -1,12 +1,12 @@ # summarise_*() throws appropriate errors - `p` must be a object, not the number 10. + `p` must be a object, not the number 10. --- - `p` must be a object, not the string "A". + `p` must be a object, not the string "A". --- - `p` must be a object, not `TRUE`. + `p` must be a object, not `TRUE`. diff --git a/tests/testthat/_snaps/theme.md b/tests/testthat/_snaps/theme.md index 0218bbef51..a094a6ff15 100644 --- a/tests/testthat/_snaps/theme.md +++ b/tests/testthat/_snaps/theme.md @@ -1,19 +1,3 @@ -# modifying theme element properties with + operator works - - Code - theme_grey() + "asdf" - Condition - Error: - ! Can't add `"asdf"` to a theme object. - -# replacing theme elements with %+replace% operator works - - Code - theme_grey() + "asdf" - Condition - Error: - ! Can't add `"asdf"` to a theme object. - # theme validation happens at build stage The `text` theme element must be a object. @@ -25,7 +9,7 @@ # incorrect theme specifications throw meaningful errors Can't merge the `line` theme element. - Caused by error in `merge_element()`: + Caused by error in `method(merge_element, list(ggplot2::element, class_any))`: ! Only elements of the same class can be merged. --- @@ -34,7 +18,7 @@ --- - Theme element `test` has `NULL` property without default: fill, colour, linewidth, and linetype. + Theme element `test` has `NULL` property without default: fill, colour, linewidth, linetype, and linejoin. --- @@ -74,9 +58,20 @@ Code merge_element(text_base, rect_base) Condition - Error in `merge_element()`: + Error in `method(merge_element, list(ggplot2::element, class_any))`: ! Only elements of the same class can be merged. +# margins() warn against wrong input lengths + + Code + margin(c(1, 2), 3, 4, c(5, 6, 7)) + Condition + Warning: + In `margin()`, the arguments `t` and `l` should have length 1, not length 2 and 3. + i Arguments get(s) truncated to length 1. + Output + [1] 1points 3points 4points 5points + # Theme elements are checked during build `plot.title.position` must be one of "panel" or "plot", not "test". @@ -94,6 +89,42 @@ Ignoring unknown `theme()` elements: foo and bar. +# element_text throws appropriate conditions + + Vectorized input to `element_text()` is not officially supported. + i Results may be unexpected or may change in future versions of ggplot2. + +--- + + The `margin` argument should be constructed using the `margin()` function. + +--- + + Code + element_text(margin = 5) + Condition + Error in `as_margin()`: + ! `margin` must be a class, not a number. + +--- + + Code + element_text(colour = sqrt(2)) + Condition + Error: + ! object properties are invalid: + - @colour cannot be a decimal number, but could be an integer. + +--- + + Code + element_grob(el, label = element_blank()) + Condition + Warning: + `label` cannot be a object. + Output + zeroGrob[NULL] + # Theme validation behaves as expected The `aspect.ratio` theme element must be a object. diff --git a/tests/testthat/helper-plot-data.R b/tests/testthat/helper-plot-data.R index 13e36d861a..cf97be4122 100644 --- a/tests/testthat/helper-plot-data.R +++ b/tests/testthat/helper-plot-data.R @@ -2,23 +2,23 @@ cdata <- function(plot) { pieces <- ggplot_build(plot) - lapply(pieces$data, function(d) { + lapply(pieces@data, function(d) { dapply(d, "PANEL", function(panel_data) { - scales <- pieces$layout$get_scales(panel_data$PANEL[1]) - panel_params <- plot$coordinates$setup_panel_params(scales$x, scales$y, params = pieces$layout$coord_params) - plot$coordinates$transform(panel_data, panel_params) + scales <- pieces@layout$get_scales(panel_data$PANEL[1]) + panel_params <- plot@coordinates$setup_panel_params(scales$x, scales$y, params = pieces@layout$coord_params) + plot@coordinates$transform(panel_data, panel_params) }) }) } pranges <- function(plot) { - layout <- ggplot_build(plot)$layout + layout <- ggplot_build(plot)@layout x_ranges <- lapply(layout$panel_scales_x, function(scale) scale$get_limits()) y_ranges <- lapply(layout$panel_scales_y, function(scale) scale$get_limits()) - npscales <- plot$scales$non_position_scales() + npscales <- plot@scales$non_position_scales() npranges <- lapply(npscales$scales$scales, function(scale) scale$get_limits()) diff --git a/tests/testthat/test-add.R b/tests/testthat/test-add.R index a860a55845..0c318e6c9e 100644 --- a/tests/testthat/test-add.R +++ b/tests/testthat/test-add.R @@ -1,4 +1,4 @@ -test_that("mapping class is preserved when adding uneval objects", { +test_that("mapping class is preserved when adding mapping objects", { p <- ggplot(mtcars) + aes(wt, mpg) - expect_identical(class(p$mapping), "uneval") + expect_s7_class(p@mapping, class_mapping) }) diff --git a/tests/testthat/test-aes.R b/tests/testthat/test-aes.R index a42b4a3ae1..b0922383cc 100644 --- a/tests/testthat/test-aes.R +++ b/tests/testthat/test-aes.R @@ -37,8 +37,8 @@ test_that("aes_q() & aes_string() preserve explicit NULLs", { test_that("aes_all() converts strings into mappings", { expect_equal( - aes_all(c("x", "y", "col", "pch")), - aes(x, y, colour = col, shape = pch), + unclass(aes_all(c("x", "y", "col", "pch"))), + unclass(aes(x, y, colour = col, shape = pch)), # ignore the environments of quosures ignore_attr = TRUE ) @@ -67,7 +67,7 @@ test_that("aes evaluated in environment where plot created", { test_that("constants are not wrapped in quosures", { aes <- aes(1L, "foo", 1.5) - expect_identical(unclass(aes), list(x = 1L, y = "foo", 1.5)) + expect_identical(S7::S7_data(aes), list(x = 1L, y = "foo", 1.5)) }) test_that("assignment methods wrap symbolic objects in quosures", { @@ -96,13 +96,13 @@ test_that("assignment methods pull unwrap constants from quosures", { test_that("quosures are squashed when creating default label for a mapping", { p <- ggplot(mtcars) + aes(!!quo(identity(!!quo(cyl)))) - labels <- ggplot_build(p)$plot$labels + labels <- ggplot_build(p)@plot@labels expect_identical(labels$x, "identity(cyl)") }) test_that("labelling doesn't cause error if aesthetic is NULL", { p <- ggplot(mtcars) + aes(x = NULL) - labels <- ggplot_build(p)$plot$labels + labels <- ggplot_build(p)@plot@labels expect_identical(labels$x, "x") }) @@ -195,8 +195,8 @@ test_that("alternative_aes_extract_usage() can inspect the call", { expect_snapshot_error(alternative_aes_extract_usage(x)) }) -test_that("new_aes() checks its inputs", { - expect_snapshot_error(new_aes(1:5)) +test_that("class_mapping() checks its inputs", { + expect_snapshot_error(class_mapping(1:5)) }) # Visual tests ------------------------------------------------------------ diff --git a/tests/testthat/test-build.R b/tests/testthat/test-build.R index cdcbe0c6ac..cfb4cf6e4a 100644 --- a/tests/testthat/test-build.R +++ b/tests/testthat/test-build.R @@ -2,7 +2,7 @@ df <- data_frame(x = 1:3, y = 3:1, z = letters[1:3]) test_that("there is one data frame for each layer", { - nlayers <- function(x) length(ggplot_build(x)$data) + nlayers <- function(x) length(ggplot_build(x)@data) l1 <- ggplot(df, aes(x, y)) + geom_point() l2 <- ggplot(df, aes(x, y)) + geom_point() + geom_line() diff --git a/tests/testthat/test-coord-.R b/tests/testthat/test-coord-.R index b0cef2de26..ea80cb5ce1 100644 --- a/tests/testthat/test-coord-.R +++ b/tests/testthat/test-coord-.R @@ -8,7 +8,7 @@ test_that("Coord errors on missing methods", { test_that("clipping is on by default", { p <- ggplot() - coord <- ggplot_build(p)$layout$coord + coord <- ggplot_build(p)@layout$coord expect_equal(coord$clip, "on") }) @@ -30,11 +30,11 @@ test_that("guide names are not removed by `train_panel_guides()`", { data <- ggplot_build(gg) # Excerpt from ggplot_gtable.ggplot_built - plot <- data$plot - layout <- data$layout - data <- data$data + plot <- data@plot + layout <- data@layout + data <- data@data - layout$setup_panel_guides(guides_list(NULL), plot$layers) + layout$setup_panel_guides(guides_list(NULL), plot@layers) # Line showing change in outcome expect_named(layout$panel_params[[1]]$guides$aesthetics, c("x", "y", "x.sec", "y.sec")) @@ -97,12 +97,12 @@ test_that("coord expand takes a vector", { base <- ggplot() + lims(x = c(0, 10), y = c(0, 10)) p <- ggplot_build(base + coord_cartesian(expand = c(TRUE, FALSE, FALSE, TRUE))) - pp <- p$layout$panel_params[[1]] + pp <- p@layout$panel_params[[1]] expect_equal(pp$x.range, c(-0.5, 10)) expect_equal(pp$y.range, c(0, 10.5)) p <- ggplot_build(base + coord_cartesian(expand = c(top = FALSE, left = FALSE))) - pp <- p$layout$panel_params[[1]] + pp <- p@layout$panel_params[[1]] expect_equal(pp$x.range, c(0, 10.5)) expect_equal(pp$y.range, c(-0.5, 10)) diff --git a/tests/testthat/test-coord-cartesian.R b/tests/testthat/test-coord-cartesian.R index e54b123d61..e63663f7e4 100644 --- a/tests/testthat/test-coord-cartesian.R +++ b/tests/testthat/test-coord-cartesian.R @@ -1,16 +1,16 @@ test_that("clipping can be turned off and on", { # clip on by default p <- ggplot() + coord_cartesian() - coord <- ggplot_build(p)$layout$coord + coord <- ggplot_build(p)@layout$coord expect_equal(coord$clip, "on") # clip can be turned on and off p <- ggplot() + coord_cartesian(clip = "off") - coord <- ggplot_build(p)$layout$coord + coord <- ggplot_build(p)@layout$coord expect_equal(coord$clip, "off") p <- ggplot() + coord_cartesian(clip = "on") - coord <- ggplot_build(p)$layout$coord + coord <- ggplot_build(p)@layout$coord expect_equal(coord$clip, "on") }) diff --git a/tests/testthat/test-coord-polar.R b/tests/testthat/test-coord-polar.R index 08427fadda..f45b76d194 100644 --- a/tests/testthat/test-coord-polar.R +++ b/tests/testthat/test-coord-polar.R @@ -55,11 +55,11 @@ test_that("polar distance calculation ignores NA's", { test_that("clipping can be turned off and on", { # clip can be turned on and off p <- ggplot() + coord_polar() - coord <- ggplot_build(p)$layout$coord + coord <- ggplot_build(p)@layout$coord expect_equal(coord$clip, "on") p <- ggplot() + coord_polar(clip = "off") - coord <- ggplot_build(p)$layout$coord + coord <- ggplot_build(p)@layout$coord expect_equal(coord$clip, "off") }) @@ -209,7 +209,7 @@ test_that("coord_radial can deal with empty breaks (#6271)", { scale_x_continuous(breaks = numeric()) + scale_y_continuous(breaks = numeric()) ) - guides <- p$layout$panel_params[[1]]$guides$guides + guides <- p@layout$panel_params[[1]]$guides$guides is_none <- vapply(guides, inherits, logical(1), what = "GuideNone") expect_true(all(is_none)) }) diff --git a/tests/testthat/test-coord-transform.R b/tests/testthat/test-coord-transform.R index 035d534737..5711ea5768 100644 --- a/tests/testthat/test-coord-transform.R +++ b/tests/testthat/test-coord-transform.R @@ -28,8 +28,8 @@ test_that("coord_transform() expands axes identically to coord_cartesian()", { built_cartesian <- ggplot_build(p + coord_cartesian()) built_trans <- ggplot_build(p + coord_transform()) - cartesian_params <- built_cartesian$layout$panel_params[[1]] - trans_params <- built_trans$layout$panel_params[[1]] + cartesian_params <- built_cartesian@layout$panel_params[[1]] + trans_params <- built_trans@layout$panel_params[[1]] expect_identical(cartesian_params$x.range, trans_params$x.range) expect_identical(cartesian_params$y.range, trans_params$y.range) @@ -40,8 +40,8 @@ test_that("coord_transform(expand = FALSE) expands axes identically to coord_car built_cartesian <- ggplot_build(p + coord_cartesian(expand = FALSE)) built_trans <- ggplot_build(p + coord_transform(expand = FALSE)) - cartesian_params <- built_cartesian$layout$panel_params[[1]] - trans_params <- built_trans$layout$panel_params[[1]] + cartesian_params <- built_cartesian@layout$panel_params[[1]] + trans_params <- built_trans@layout$panel_params[[1]] expect_identical(cartesian_params$x.range, trans_params$x.range) expect_identical(cartesian_params$y.range, trans_params$y.range) @@ -52,8 +52,8 @@ test_that("coord_transform(y = 'log10') expands the x axis identically to scale_ built_cartesian <- ggplot_build(p + scale_y_log10()) built_trans <- ggplot_build(p + coord_transform(y = "log10")) - cartesian_params <- built_cartesian$layout$panel_params[[1]] - trans_params <- built_trans$layout$panel_params[[1]] + cartesian_params <- built_cartesian@layout$panel_params[[1]] + trans_params <- built_trans@layout$panel_params[[1]] expect_identical(cartesian_params$y.range, trans_params$y.range) }) @@ -65,8 +65,8 @@ test_that("coord_transform() expands axes outside the domain of the axis trans", built_cartesian <- ggplot_build(p + scale_y_sqrt()) built_trans <- ggplot_build(p + coord_transform(y = "sqrt")) - cartesian_params <- built_cartesian$layout$panel_params[[1]] - trans_params <- built_trans$layout$panel_params[[1]] + cartesian_params <- built_cartesian@layout$panel_params[[1]] + trans_params <- built_trans@layout$panel_params[[1]] expect_identical(cartesian_params$y.range, trans_params$y.range) }) @@ -78,8 +78,8 @@ test_that("coord_transform() works with the reverse transformation", { built_cartesian <- ggplot_build(p + scale_y_reverse()) built_trans <- ggplot_build(p + coord_transform(y = "reverse")) - cartesian_params <- built_cartesian$layout$panel_params[[1]] - trans_params <- built_trans$layout$panel_params[[1]] + cartesian_params <- built_cartesian@layout$panel_params[[1]] + trans_params <- built_trans@layout$panel_params[[1]] expect_identical(cartesian_params$y.range, trans_params$y.range) }) @@ -91,8 +91,8 @@ test_that("coord_transform() can reverse discrete axes", { built_cartesian <- ggplot_build(p) built_trans <- ggplot_build(p + coord_transform(x = "reverse")) - cartesian_params <- built_cartesian$layout$panel_params[[1]] - trans_params <- built_trans$layout$panel_params[[1]] + cartesian_params <- built_cartesian@layout$panel_params[[1]] + trans_params <- built_trans@layout$panel_params[[1]] expect_identical(cartesian_params$x.range, -rev(trans_params$x.range)) }) diff --git a/tests/testthat/test-coord_sf.R b/tests/testthat/test-coord_sf.R index 463aee8d1c..9e33c73ce0 100644 --- a/tests/testthat/test-coord_sf.R +++ b/tests/testthat/test-coord_sf.R @@ -56,7 +56,7 @@ test_that("axis labels are correct for manual breaks", { scale_x_continuous(breaks = c(1000, 2000, 3000)) + scale_y_continuous(breaks = c(1000, 1500, 2000)) ) - graticule <- b$layout$panel_params[[1]]$graticule + graticule <- b@layout$panel_params[[1]]$graticule expect_identical( graticule[graticule$type == "E", ]$degree_label, c("1000", "2000", "3000") @@ -85,7 +85,7 @@ test_that("axis labels can be set manually", { labels = c("D", "E", "F") ) ) - graticule <- b$layout$panel_params[[1]]$graticule + graticule <- b@layout$panel_params[[1]]$graticule expect_identical( graticule[graticule$type == "E", ]$degree_label, c("A", "B", "C") @@ -128,7 +128,7 @@ test_that("factors are treated like character labels and are not parsed", { labels = factor(c("1 * degree * N", "1.5 * degree * N", "2 * degree * N")) ) ) - graticule <- b$layout$panel_params[[1]]$graticule + graticule <- b@layout$panel_params[[1]]$graticule expect_identical( graticule[graticule$type == "E", ]$degree_label, c("A", "B", "C") @@ -156,7 +156,7 @@ test_that("expressions can be mixed with character labels", { labels = parse(text = c("10^3", "1.5 %*% 10^3", "2 %*% 10^3")) ) ) - graticule <- b$layout$panel_params[[1]]$graticule + graticule <- b@layout$panel_params[[1]]$graticule expect_identical( graticule[graticule$type == "E", ]$degree_label, as.list(c("A", "B", "C")) @@ -180,7 +180,7 @@ test_that("expressions can be mixed with character labels", { labels = parse(text = c("10^3", "1.5 %*% 10^3", "2 %*% 10^3")) ) ) - graticule <- b$layout$panel_params[[1]]$graticule + graticule <- b@layout$panel_params[[1]]$graticule expect_identical( graticule[graticule$type == "N", ]$degree_label, as.list(c("A", "B", "C")) @@ -207,7 +207,7 @@ test_that("degree labels are automatically parsed", { scale_y_continuous(breaks = c(10, 15, 20)) ) - graticule <- b$layout$panel_params[[1]]$graticule + graticule <- b@layout$panel_params[[1]]$graticule expect_setequal( graticule[graticule$type == "N", ]$degree, c(10, 15, 20) @@ -343,7 +343,7 @@ test_that("coord_sf() can use function breaks and n.breaks", { scale_y_continuous(n.breaks = 4) b <- ggplot_build(p) - grat <- b$layout$panel_params[[1]]$graticule + grat <- b@layout$panel_params[[1]]$graticule expect_equal( vec_slice(grat$degree, grat$type == "E"), diff --git a/tests/testthat/test-error.R b/tests/testthat/test-error.R deleted file mode 100644 index 8e1424a7f1..0000000000 --- a/tests/testthat/test-error.R +++ /dev/null @@ -1,12 +0,0 @@ -test_that("various misuses of +.gg (#2638)", { - expect_snapshot_error( - { - ggplot(mtcars, aes(hwy, displ)) - + geom_point() - } - ) - - expect_snapshot_error( - geom_point() + geom_point() - ) -}) diff --git a/tests/testthat/test-facet-labels.R b/tests/testthat/test-facet-labels.R index 01fe866a92..f755e93aa8 100644 --- a/tests/testthat/test-facet-labels.R +++ b/tests/testthat/test-facet-labels.R @@ -1,6 +1,6 @@ get_labels_matrix <- function(plot, ...) { data <- ggplot_build(plot) - layout <- data$layout + layout <- data@layout labels <- get_labels_info(layout$facet, layout, ...) labeller <- match.fun(layout$facet$params$labeller) diff --git a/tests/testthat/test-facet-map.R b/tests/testthat/test-facet-map.R index d6d1d0c79a..4ce6e24329 100644 --- a/tests/testthat/test-facet-map.R +++ b/tests/testthat/test-facet-map.R @@ -184,7 +184,7 @@ test_that("grid: missing values are located correctly", { # Facet order ---------------------------------------------------------------- -get_layout <- function(p) ggplot_build(p)$layout$layout +get_layout <- function(p) ggplot_build(p)@layout$layout # Data with factor f with levels CBA d <- data_frame(x = 1:9, y = 1:9, diff --git a/tests/testthat/test-facet-strips.R b/tests/testthat/test-facet-strips.R index d13f8d500c..2f1080877f 100644 --- a/tests/testthat/test-facet-strips.R +++ b/tests/testthat/test-facet-strips.R @@ -1,13 +1,13 @@ strip_layout <- function(p) { data <- ggplot_build(p) - plot <- data$plot - layout <- data$layout - data <- data$data + plot <- data@plot + layout <- data@layout + data <- data@data theme <- plot_theme(plot) - geom_grobs <- Map(function(l, d) l$draw_geom(d, layout), plot$layers, data) + geom_grobs <- Map(function(l, d) l$draw_geom(d, layout), plot@layers, data) - facet <- layout$render(geom_grobs, data, theme, plot$labels) + facet <- layout$render(geom_grobs, data, theme, plot@labels) layout <- facet$layout strip_layout <- layout[grepl("^strip", layout$name), 1:4] as.list(strip_layout) diff --git a/tests/testthat/test-fortify.R b/tests/testthat/test-fortify.R index e98edad549..2650884942 100644 --- a/tests/testthat/test-fortify.R +++ b/tests/testthat/test-fortify.R @@ -56,7 +56,7 @@ test_that("spatial polygons have correct ordering", { ) }) -test_that("fortify.default proves a helpful error with class uneval", { +test_that("fortify.default proves a helpful error with mapping class", { expect_snapshot_error(ggplot(aes(x = x))) }) diff --git a/tests/testthat/test-geom-.R b/tests/testthat/test-geom-.R index 6766178f22..02e0ed9710 100644 --- a/tests/testthat/test-geom-.R +++ b/tests/testthat/test-geom-.R @@ -53,7 +53,7 @@ test_that("updating geom aesthetic defaults preserves class and order", { updated_defaults <- GeomPoint$default_aes - expect_s3_class(updated_defaults, "uneval") + expect_s7_class(updated_defaults, class_mapping) intended_defaults <- original_defaults intended_defaults[["colour"]] <- "red" @@ -75,7 +75,7 @@ test_that("updating stat aesthetic defaults preserves class and order", { updated_defaults <- StatBin$default_aes - expect_s3_class(updated_defaults, "uneval") + expect_s7_class(updated_defaults, class_mapping) intended_defaults <- original_defaults intended_defaults[["y"]] <- expr(after_stat(density)) diff --git a/tests/testthat/test-geom-boxplot.R b/tests/testthat/test-geom-boxplot.R index 81d37cc5a9..9d977501ff 100644 --- a/tests/testthat/test-geom-boxplot.R +++ b/tests/testthat/test-geom-boxplot.R @@ -3,8 +3,8 @@ test_that("geom_boxplot range includes all outliers", { dat <- data_frame(x = 1, y = c(-(1:20) ^ 3, (1:20) ^ 3) ) p <- ggplot_build(ggplot(dat, aes(x,y)) + geom_boxplot()) - miny <- p$layout$panel_params[[1]]$y.range[1] - maxy <- p$layout$panel_params[[1]]$y.range[2] + miny <- p@layout$panel_params[[1]]$y.range[1] + maxy <- p@layout$panel_params[[1]]$y.range[2] expect_true(miny <= min(dat$y)) expect_true(maxy >= max(dat$y)) @@ -12,8 +12,8 @@ test_that("geom_boxplot range includes all outliers", { # Unless specifically directed not to p <- ggplot_build(ggplot(dat, aes(x, y)) + geom_boxplot(outliers = FALSE)) - miny <- p$layout$panel_params[[1]]$y.range[1] - maxy <- p$layout$panel_params[[1]]$y.range[2] + miny <- p@layout$panel_params[[1]]$y.range[1] + maxy <- p@layout$panel_params[[1]]$y.range[2] expect_lte(maxy, max(dat$y)) expect_gte(miny, min(dat$y)) diff --git a/tests/testthat/test-geom-dotplot.R b/tests/testthat/test-geom-dotplot.R index f7159bdd80..fa43204e67 100644 --- a/tests/testthat/test-geom-dotplot.R +++ b/tests/testthat/test-geom-dotplot.R @@ -68,8 +68,8 @@ test_that("when binning on y-axis, limits depend on the panel", { b1 <- ggplot_build(p + facet_wrap(~am)) b2 <- ggplot_build(p + facet_wrap(~am, scales = "free_y")) - equal_limits1 <- (b1$layout$panel_params[[1]]$y.range == b1$layout$panel_params[[2]]$y.range) - equal_limits2 <- (b2$layout$panel_params[[1]]$y.range == b2$layout$panel_params[[2]]$y.range) + equal_limits1 <- (b1@layout$panel_params[[1]]$y.range == b1@layout$panel_params[[2]]$y.range) + equal_limits2 <- (b2@layout$panel_params[[1]]$y.range == b2@layout$panel_params[[2]]$y.range) expect_true(all(equal_limits1)) expect_false(all(equal_limits2)) diff --git a/tests/testthat/test-geom-polygon.R b/tests/testthat/test-geom-polygon.R index 3cf3636655..eec237f588 100644 --- a/tests/testthat/test-geom-polygon.R +++ b/tests/testthat/test-geom-polygon.R @@ -40,9 +40,9 @@ test_that("geom_polygon is closed before munching", { coord_polar() built <- ggplot_build(p) - coord <- built$plot$coordinates - data <- built$data[[1]] - param <- built$layout$panel_params[[1]] + coord <- built@plot@coordinates + data <- built@data[[1]] + param <- built@layout$panel_params[[1]] closed <- coord_munch(coord, data, param, is_closed = TRUE) open <- coord_munch(coord, data, param, is_closed = FALSE) diff --git a/tests/testthat/test-geom-sf.R b/tests/testthat/test-geom-sf.R index 29f5da8323..6503cf7678 100644 --- a/tests/testthat/test-geom-sf.R +++ b/tests/testthat/test-geom-sf.R @@ -30,24 +30,24 @@ test_that("geom_sf() determines the legend type automatically", { } # test the automatic choice - expect_true(fun_geom_sf(mp, TRUE)$plot$layers[[1]]$show.legend) - expect_identical(fun_geom_sf(mp, TRUE)$plot$layers[[1]]$computed_geom_params$legend, "point") + expect_true(fun_geom_sf(mp, TRUE)@plot@layers[[1]]$show.legend) + expect_identical(fun_geom_sf(mp, TRUE)@plot@layers[[1]]$computed_geom_params$legend, "point") - expect_true(fun_geom_sf(mls, TRUE)$plot$layers[[1]]$show.legend) - expect_identical(fun_geom_sf(mls, TRUE)$plot$layers[[1]]$computed_geom_params$legend, "line") + expect_true(fun_geom_sf(mls, TRUE)@plot@layers[[1]]$show.legend) + expect_identical(fun_geom_sf(mls, TRUE)@plot@layers[[1]]$computed_geom_params$legend, "line") - expect_true(fun_geom_sf(mpol, TRUE)$plot$layers[[1]]$show.legend) - expect_identical(fun_geom_sf(mpol, TRUE)$plot$layers[[1]]$computed_geom_params$legend, "other") + expect_true(fun_geom_sf(mpol, TRUE)@plot@layers[[1]]$show.legend) + expect_identical(fun_geom_sf(mpol, TRUE)@plot@layers[[1]]$computed_geom_params$legend, "other") # test that automatic choice can be overridden manually - expect_true(fun_geom_sf(mp, "point")$plot$layers[[1]]$show.legend) - expect_identical(fun_geom_sf(mp, "point")$plot$layers[[1]]$computed_geom_params$legend, "point") + expect_true(fun_geom_sf(mp, "point")@plot@layers[[1]]$show.legend) + expect_identical(fun_geom_sf(mp, "point")@plot@layers[[1]]$computed_geom_params$legend, "point") - expect_true(fun_geom_sf(mls, "point")$plot$layers[[1]]$show.legend) - expect_identical(fun_geom_sf(mls, "point")$plot$layers[[1]]$computed_geom_params$legend, "point") + expect_true(fun_geom_sf(mls, "point")@plot@layers[[1]]$show.legend) + expect_identical(fun_geom_sf(mls, "point")@plot@layers[[1]]$computed_geom_params$legend, "point") - expect_true(fun_geom_sf(mpol, "point")$plot$layers[[1]]$show.legend) - expect_identical(fun_geom_sf(mpol, "point")$plot$layers[[1]]$computed_geom_params$legend, "point") + expect_true(fun_geom_sf(mpol, "point")@plot@layers[[1]]$show.legend) + expect_identical(fun_geom_sf(mpol, "point")@plot@layers[[1]]$computed_geom_params$legend, "point") }) test_that("geom_sf() determines the legend type from mapped geometry column", { @@ -68,12 +68,12 @@ test_that("geom_sf() determines the legend type from mapped geometry column", { p <- ggplot_build( ggplot(d_sf) + geom_sf(aes(geometry = g_point, colour = "a")) ) - expect_identical(p$plot$layers[[1]]$computed_geom_params$legend, "point") + expect_identical(p@plot@layers[[1]]$computed_geom_params$legend, "point") p <- ggplot_build( ggplot(d_sf) + geom_sf(aes(geometry = g_line, colour = "a")) ) - expect_identical(p$plot$layers[[1]]$computed_geom_params$legend, "line") + expect_identical(p@plot@layers[[1]]$computed_geom_params$legend, "line") }) test_that("geom_sf() removes rows containing missing aes", { @@ -197,7 +197,7 @@ test_that("geom_sf data type renders appropriate legends", { ) expect_doppelganger( "geom_sf point legend", - p %+% data + ggplot_add(data, p) ) # Line data @@ -210,7 +210,7 @@ test_that("geom_sf data type renders appropriate legends", { ) expect_doppelganger( "geom_sf line legend", - p %+% data + ggplot_add(data, p) ) # Polygon data @@ -223,7 +223,7 @@ test_that("geom_sf data type renders appropriate legends", { ) expect_doppelganger( "geom_sf polygon legend", - p %+% data + ggplot_add(data, p) ) }) diff --git a/tests/testthat/test-guide-.R b/tests/testthat/test-guide-.R index 4f66920c3e..e5f9c34bc6 100644 --- a/tests/testthat/test-guide-.R +++ b/tests/testthat/test-guide-.R @@ -14,29 +14,29 @@ test_that("plotting does not induce state changes in guides", { geom_point() + guides - snapshot <- serialize(as.list(p$guides), NULL) + snapshot <- serialize(as.list(p@guides), NULL) grob <- ggplotGrob(p) - expect_identical(as.list(p$guides), unserialize(snapshot)) + expect_identical(as.list(p@guides), unserialize(snapshot)) }) test_that("adding guides doesn't change plot state", { p1 <- ggplot(mtcars, aes(disp, mpg)) - expect_length(p1$guides$guides, 0) + expect_length(p1@guides$guides, 0) p2 <- p1 + guides(y = guide_axis(angle = 45)) - expect_length(p1$guides$guides, 0) - expect_length(p2$guides$guides, 1) + expect_length(p1@guides$guides, 0) + expect_length(p2@guides$guides, 1) p3 <- p2 + guides(y = guide_axis(angle = 90)) - expect_length(p3$guides$guides, 1) - expect_equal(p3$guides$guides[[1]]$params$angle, 90) - expect_equal(p2$guides$guides[[1]]$params$angle, 45) + expect_length(p3@guides$guides, 1) + expect_equal(p3@guides$guides[[1]]$params$angle, 90) + expect_equal(p2@guides$guides[[1]]$params$angle, 45) }) test_that("dots are checked when making guides", { diff --git a/tests/testthat/test-guide-colorbar.R b/tests/testthat/test-guide-colorbar.R index 7cfd96a2f1..e9602a4c73 100644 --- a/tests/testthat/test-guide-colorbar.R +++ b/tests/testthat/test-guide-colorbar.R @@ -12,10 +12,10 @@ test_that("Colorbar respects show.legend in layer", { df <- data_frame(x = 1:3, y = 1) p <- ggplot(df, aes(x = x, y = y, color = x)) + geom_point(size = 20, shape = 21, show.legend = FALSE) - expect_length(ggplot_build(p)$plot$guides$guides, 0L) + expect_length(ggplot_build(p)@plot@guides$guides, 0L) p <- ggplot(df, aes(x = x, y = y, color = x)) + geom_point(size = 20, shape = 21, show.legend = TRUE) - expect_length(ggplot_build(p)$plot$guides$guides, 1L) + expect_length(ggplot_build(p)@plot@guides$guides, 1L) }) test_that("colorsteps and bins checks the breaks format", { diff --git a/tests/testthat/test-guide-legend.R b/tests/testthat/test-guide-legend.R index de9fdb38ab..2dd68fe01b 100644 --- a/tests/testthat/test-guide-legend.R +++ b/tests/testthat/test-guide-legend.R @@ -128,7 +128,7 @@ test_that("legends can be forced to display unrelated geoms", { ) b <- ggplot_build(p) - legend <- b$plot$guides$params[[1]] + legend <- b@plot@guides$params[[1]] expect_equal( legend$decor[[1]]$data$fill, diff --git a/tests/testthat/test-guides.R b/tests/testthat/test-guides.R index 64391776e3..ae1bfe85bd 100644 --- a/tests/testthat/test-guides.R +++ b/tests/testthat/test-guides.R @@ -6,12 +6,12 @@ test_that("guide_none() can be used in non-position scales", { scale_color_discrete(guide = guide_none()) built <- ggplot_build(p) - plot <- built$plot - guides <- guides_list(plot$guides) + plot <- built@plot + guides <- guides_list(plot@guides) guides <- guides$build( - plot$scales, - plot$layers, - plot$labels + plot@scales, + plot@layers, + plot@labels ) expect_length(guides$guides, 0) @@ -156,7 +156,7 @@ test_that("empty guides are dropped", { expect_equal(nrow(gd), 0) # Draw guides - guides <- p$plot$guides$assemble(theme_gray()) + guides <- p@plot@guides$assemble(theme_gray()) # All guide-boxes should be empty expect_true(is_zero(guides)) diff --git a/tests/testthat/test-labels.R b/tests/testthat/test-labels.R index be947ee1c9..3241f2bb9a 100644 --- a/tests/testthat/test-labels.R +++ b/tests/testthat/test-labels.R @@ -25,16 +25,16 @@ test_that("setting guide labels works", { expect_identical(labs(color = "my label")$colour, "my label") # No extra elements exists - expect_equal(labs(title = "my title"), list(title = "my title"), ignore_attr = TRUE) # formal argument - expect_equal(labs(colour = "my label"), list(colour = "my label"), ignore_attr = TRUE) # dot - expect_equal(labs(foo = "bar"), list(foo = "bar"), ignore_attr = TRUE) # non-existent param + expect_length(labs(title = "my title"), 1) # formal argument + expect_length(labs(colour = "my label"), 1) # dot + expect_length(labs(foo = "bar"), 1) # non-existent param # labs() has list-splicing semantics params <- list(title = "my title", tag = "A)") expect_identical(labs(!!!params)$tag, "A)") # NULL is preserved - expect_equal(labs(title = NULL), list(title = NULL), ignore_attr = TRUE) + expect_length(labs(title = NULL), 1) # ggtitle works in the same way as labs() expect_identical(ggtitle("my title")$title, "my title") @@ -147,15 +147,15 @@ test_that("position axis label hierarchy works as intended", { geom_point(size = 5) p <- ggplot_build(p) - resolve_label <- function(x) p$layout$resolve_label(x, p$plot$labels) + resolve_label <- function(x) p@layout$resolve_label(x, p@plot@labels) # In absence of explicit title, get title from mapping expect_identical( - resolve_label(p$layout$panel_scales_x[[1]]), + resolve_label(p@layout$panel_scales_x[[1]]), list(secondary = NULL, primary = "foo") ) expect_identical( - resolve_label(p$layout$panel_scales_y[[1]]), + resolve_label(p@layout$panel_scales_y[[1]]), list(primary = "bar", secondary = NULL) ) @@ -170,9 +170,9 @@ test_that("position axis label hierarchy works as intended", { ) # Guide titles overrule scale names - p$layout$setup_panel_guides( + p@layout$setup_panel_guides( guides_list(list(x = guide_axis("quuX"), y = guide_axis("corgE"))), - p$plot$layers + p@plot@layers ) expect_identical( resolve_label(scale_x_continuous("Baz")), @@ -196,10 +196,10 @@ test_that("position axis label hierarchy works as intended", { ) # Secondary guide titles override secondary axis names - p$layout$setup_panel_guides( + p@layout$setup_panel_guides( guides_list(list(x = guide_axis("quuX"), y = guide_axis("corgE"), x.sec = guide_axis("waldo"), y.sec = guide_axis("fred"))), - p$plot$layers + p@plot@layers ) expect_identical( resolve_label(xsec), @@ -244,38 +244,38 @@ test_that("moving guide positions lets titles follow", { p <- ggplot_build(p) # Default guide positions - p$layout$setup_panel_guides( + p@layout$setup_panel_guides( guides_list( list(x = guide_axis("baz", position = "bottom"), y = guide_axis("qux", position = "left")) ), - p$plot$layers + p@plot@layers ) labs <- get_labs(p) expect <- list(x = "baz", x.sec = NULL, y = "qux", y.sec = NULL) expect_identical(labs[names(expect)], expect) # Guides at secondary positions - p$layout$setup_panel_guides( + p@layout$setup_panel_guides( guides_list( list(x = guide_axis("baz", position = "top"), y = guide_axis("qux", position = "right")) ), - p$plot$layers + p@plot@layers ) labs <- get_labs(p) expect_identical(labs[names(expect)], expect) # Primary guides at secondary positions with # secondary guides at primary positions - p$layout$setup_panel_guides( + p@layout$setup_panel_guides( guides_list( list(x = guide_axis("baz", position = "top"), y = guide_axis("qux", position = "right"), x.sec = guide_axis("quux"), y.sec = guide_axis("corge")) ), - p$plot$layers + p@plot@layers ) labs <- get_labs(p) expect[c("x.sec", "y.sec")] <- list("quux", "corge") @@ -294,16 +294,16 @@ test_that("label dictionaries work", { )) p <- ggplot_build(p) - x <- p$layout$resolve_label(p$layout$panel_scales_x[[1]], p$plot$labels) + x <- p@layout$resolve_label(p@layout$panel_scales_x[[1]], p@plot@labels) expect_equal(x$primary, "Displacement") - y <- p$layout$resolve_label(p$layout$panel_scales_y[[1]], p$plot$labels) + y <- p@layout$resolve_label(p@layout$panel_scales_y[[1]], p@plot@labels) expect_equal(y$primary, "Miles per gallon") - shape <- p$plot$guides$get_params("shape")$title + shape <- p@plot@guides$get_params("shape")$title expect_equal(shape, "Number of cylinders") - size <- p$plot$guides$get_params("size")$title + size <- p@plot@guides$get_params("size")$title expect_equal(size, "Rear axle ratio") }) diff --git a/tests/testthat/test-layer.R b/tests/testthat/test-layer.R index 23d7ef5ed6..efa1265b3f 100644 --- a/tests/testthat/test-layer.R +++ b/tests/testthat/test-layer.R @@ -94,10 +94,10 @@ test_that("layers are stateless except for the computed params", { df <- data.frame(x = 1:10, y = 1:10) p <- ggplot(df) + geom_col(aes(x = x, y = y), width = 0.8, fill = "red") - col_layer <- as.list(p$layers[[1]]) + col_layer <- as.list(p@layers[[1]]) stateless_names <- setdiff(names(col_layer), c("computed_geom_params", "computed_stat_params", "computed_mapping")) invisible(ggplotGrob(p)) - expect_identical(as.list(p$layers[[1]])[stateless_names], col_layer[stateless_names]) + expect_identical(as.list(p@layers[[1]])[stateless_names], col_layer[stateless_names]) }) test_that("inherit.aes works", { @@ -108,7 +108,7 @@ test_that("inherit.aes works", { geom_col(aes(x = x, y = y), inherit.aes = FALSE) invisible(ggplotGrob(p1)) invisible(ggplotGrob(p2)) - expect_identical(p1$layers[[1]]$computed_mapping, p2$layers[[1]]$computed_mapping) + expect_identical(p1@layers[[1]]$computed_mapping, p2@layers[[1]]$computed_mapping) }) test_that("retransform works on computed aesthetics in `map_statistic`", { @@ -117,8 +117,8 @@ test_that("retransform works on computed aesthetics in `map_statistic`", { expect_equal(get_layer_data(p)$y, c(3, 5)) # To double check: should be original values when `retransform = FALSE` - parent <- p$layers[[1]]$stat - p$layers[[1]]$stat <- ggproto(NULL, parent, retransform = FALSE) + parent <- p@layers[[1]]$stat + p@layers[[1]]$stat <- ggproto(NULL, parent, retransform = FALSE) expect_equal(get_layer_data(p)$y, c(9, 25)) }) @@ -148,10 +148,10 @@ test_that("layer warns for constant aesthetics", { test_that("layer names can be resolved", { p <- ggplot() + geom_point() + geom_point() - expect_named(p$layers, c("geom_point", "geom_point...2")) + expect_named(p@layers, c("geom_point", "geom_point...2")) p <- ggplot() + geom_point(name = "foo") + geom_point(name = "bar") - expect_named(p$layers, c("foo", "bar")) + expect_named(p@layers, c("foo", "bar")) l <- geom_point(name = "foobar") expect_snapshot(p + l + l, error = TRUE) diff --git a/tests/testthat/test-plot.R b/tests/testthat/test-plot.R index 2cccf79034..45a3e1cede 100644 --- a/tests/testthat/test-plot.R +++ b/tests/testthat/test-plot.R @@ -5,6 +5,7 @@ test_that("ggplot() throws informative errors", { }) test_that("construction have user friendly errors", { + skip_if(getRversion() < "4.3.0") expect_snapshot_error(+ geom_point()) expect_snapshot_error(geom_point() + geom_bar()) expect_snapshot_error(ggplot() + 1) diff --git a/tests/testthat/test-qplot.R b/tests/testthat/test-qplot.R index 74ab153c39..59527d1989 100644 --- a/tests/testthat/test-qplot.R +++ b/tests/testthat/test-qplot.R @@ -3,20 +3,25 @@ test_that("qplot works with variables in data frame and parent env", { y <- 1:10 b <- 1:10 + lifecycle::expect_deprecated( - expect_s3_class(qplot(x, y, data = df), "ggplot") + p <- qplot(x, y, data = df) ) + expect_s7_class(p, class_ggplot) lifecycle::expect_deprecated( - expect_s3_class(qplot(x, y, data = df, colour = a), "ggplot") + p <- qplot(x, y, data = df, colour = a) ) + expect_s7_class(p, class_ggplot) lifecycle::expect_deprecated( - expect_s3_class(qplot(x, y, data = df, colour = b), "ggplot") + p <- qplot(x, y, data = df, colour = b) ) + expect_s7_class(p, class_ggplot) bin <- 1 lifecycle::expect_deprecated( - expect_s3_class(qplot(x, data = df, binwidth = bin), "ggplot") + p <- qplot(x, data = df, binwidth = bin) ) + expect_s7_class(p, class_ggplot) }) test_that("qplot works in non-standard environments", { @@ -27,7 +32,7 @@ test_that("qplot works in non-standard environments", { qplot(x, breaks = 0:`-1-`) }) ) - expect_s3_class(p, "ggplot") + expect_s7_class(p, class_ggplot) }) test_that("qplot() evaluates constants in the right place", { diff --git a/tests/testthat/test-scale-discrete.R b/tests/testthat/test-scale-discrete.R index 50f7b585fe..46e5c83d16 100644 --- a/tests/testthat/test-scale-discrete.R +++ b/tests/testthat/test-scale-discrete.R @@ -180,7 +180,7 @@ test_that("palettes work for discrete scales", { # Check discsrete expansion is applied b <- ggplot_build(p) expect_equal( - b$layout$panel_params[[1]]$x.range, + b@layout$panel_params[[1]]$x.range, range(values) + c(-0.6, 0.6) ) }) diff --git a/tests/testthat/test-scale-manual.R b/tests/testthat/test-scale-manual.R index 324485952b..75f4879607 100644 --- a/tests/testthat/test-scale-manual.R +++ b/tests/testthat/test-scale-manual.R @@ -26,7 +26,7 @@ dat <- data_frame(g = c("B","A","A")) p <- ggplot(dat, aes(g, fill = g)) + geom_bar() col <- c("A" = "red", "B" = "green", "C" = "blue") -cols <- function(x) ggplot_build(x)$data[[1]][, "fill"] +cols <- function(x) ggplot_build(x)@data[[1]][, "fill"] test_that("named values work regardless of order", { fill_scale <- function(order) scale_fill_manual(values = col[order], diff --git a/tests/testthat/test-scales.R b/tests/testthat/test-scales.R index c312e085b3..4be77ae371 100644 --- a/tests/testthat/test-scales.R +++ b/tests/testthat/test-scales.R @@ -2,10 +2,10 @@ test_that("building a plot does not affect its scales", { dat <- data_frame(x = rnorm(20), y = rnorm(20)) p <- ggplot(dat, aes(x, y)) + geom_point() - expect_length(p$scales$scales, 0) + expect_length(p@scales$scales, 0) ggplot_build(p) - expect_length(p$scales$scales, 0) + expect_length(p@scales$scales, 0) }) test_that("ranges update only for variables listed in aesthetics", { @@ -82,7 +82,7 @@ test_that("position scales are updated by all position aesthetics", { ) base <- ggplot(df, aes(x = 1, y = 1)) + geom_point() - plots <- lapply(aesthetics, function(x) base %+% x) + plots <- lapply(aesthetics, ggplot_add, plot = base) ranges <- lapply(plots, pranges) lapply(ranges, function(range) { @@ -146,18 +146,18 @@ test_that("all-Inf layers are not used for determining the type of scale", { geom_point() b1 <- ggplot_build(p1) - expect_s3_class(b1$layout$panel_scales_x[[1]], "ScaleDiscretePosition") + expect_s3_class(b1@layout$panel_scales_x[[1]], "ScaleDiscretePosition") p2 <- ggplot() + # If the layer non-Inf value, it's considered annotate("rect", xmin = -Inf, xmax = 0, ymin = -Inf, ymax = Inf, fill = "black") b2 <- ggplot_build(p2) - expect_s3_class(b2$layout$panel_scales_x[[1]], "ScaleContinuousPosition") + expect_s3_class(b2@layout$panel_scales_x[[1]], "ScaleContinuousPosition") }) test_that("scales are looked for in appropriate place", { - xlabel <- function(x) ggplot_build(x)$layout$panel_scales_x[[1]]$name + xlabel <- function(x) ggplot_build(x)@layout$panel_scales_x[[1]]$name p0 <- ggplot(mtcars, aes(mpg, wt)) + geom_point() + scale_x_continuous("0") expect_equal(xlabel(p0), "0") @@ -343,12 +343,12 @@ test_that("scale_apply preserves class and attributes", { # Perform identity transformation via `scale_apply` out <- with_bindings(scale_apply( - df, "x", "transform", 1:2, plot$layout$panel_scales_x + df, "x", "transform", 1:2, plot@layout$panel_scales_x )[[1]], `c.baz` = `c.baz`, `[.baz` = `[.baz`, .env = global_env()) # Check that it errors on bad scale ids expect_snapshot_error(scale_apply( - df, "x", "transform", c(NA, 1), plot$layout$panel_scales_x + df, "x", "transform", c(NA, 1), plot@layout$panel_scales_x )) # Check class preservation @@ -362,7 +362,7 @@ test_that("scale_apply preserves class and attributes", { class(df$x) <- "foobar" out <- with_bindings(scale_apply( - df, "x", "transform", 1:2, plot$layout$panel_scales_x + df, "x", "transform", 1:2, plot@layout$panel_scales_x )[[1]], `c.baz` = `c.baz`, `[.baz` = `[.baz`, .env = global_env()) expect_false(inherits(out, "foobar")) @@ -752,7 +752,7 @@ test_that("ViewScales can make fixed copies", { annotate("point", x = 5, y = 10) + scale_x_discrete(labels = c("four-wheel", "forward", "reverse")) - b1 <- ggplot_build(p1)$layout$panel_params[[1]] + b1 <- ggplot_build(p1)@layout$panel_params[[1]] # We build a second plot with the first plot's scales p2 <- ggplot(mpg, aes(drv, cyl)) + diff --git a/tests/testthat/test-stat-bin.R b/tests/testthat/test-stat-bin.R index 3568faa819..27de4ef939 100644 --- a/tests/testthat/test-stat-bin.R +++ b/tests/testthat/test-stat-bin.R @@ -241,19 +241,19 @@ test_that("stat_count throws error when both x and y aesthetic present", { test_that("stat_count preserves x order for continuous and discrete", { # x is numeric b <- ggplot_build(ggplot(mtcars, aes(carb)) + geom_bar()) - expect_identical(b$data[[1]]$x, c(1,2,3,4,6,8)) - expect_identical(b$data[[1]]$y, c(7,10,3,10,1,1)) + expect_identical(b@data[[1]]$x, c(1,2,3,4,6,8)) + expect_identical(b@data[[1]]$y, c(7,10,3,10,1,1)) # x is factor where levels match numeric order mtcars$carb2 <- factor(mtcars$carb) b <- ggplot_build(ggplot(mtcars, aes(carb2)) + geom_bar()) - expect_identical(b$data[[1]]$x, mapped_discrete(1:6)) - expect_identical(b$data[[1]]$y, c(7,10,3,10,1,1)) + expect_identical(b@data[[1]]$x, mapped_discrete(1:6)) + expect_identical(b@data[[1]]$y, c(7,10,3,10,1,1)) # x is factor levels differ from numeric order mtcars$carb3 <- factor(mtcars$carb, levels = c(4,1,2,3,6,8)) b <- ggplot_build(ggplot(mtcars, aes(carb3)) + geom_bar()) - expect_identical(b$data[[1]]$x, mapped_discrete(1:6)) - expect_identical(b$layout$panel_params[[1]]$x$get_labels(), c("4","1","2","3","6","8")) - expect_identical(b$data[[1]]$y, c(10,7,10,3,1,1)) + expect_identical(b@data[[1]]$x, mapped_discrete(1:6)) + expect_identical(b@layout$panel_params[[1]]$x$get_labels(), c("4","1","2","3","6","8")) + expect_identical(b@data[[1]]$y, c(10,7,10,3,1,1)) }) diff --git a/tests/testthat/test-stats.R b/tests/testthat/test-stats.R index f8e8b37f31..6eeeffa938 100644 --- a/tests/testthat/test-stats.R +++ b/tests/testthat/test-stats.R @@ -3,12 +3,12 @@ test_that("plot succeeds even if some computation fails", { p1 <- ggplot(df, aes(x, y)) + geom_point() b1 <- ggplot_build(p1) - expect_length(b1$data, 1) + expect_length(b1@data, 1) p2 <- p1 + stat_summary(fun = function(x) stop("Failed computation")) expect_snapshot_warning(b2 <- ggplot_build(p2)) - expect_length(b2$data, 2) + expect_length(b2@data, 2) }) test_that("error message is thrown when aesthetics are missing", { @@ -45,9 +45,9 @@ test_that("erroneously dropped aesthetics are found and issue a warning", { ) # colour is dropped because group a's colour is not constant (GeomBar$default_aes$colour is NA) - expect_true(all(is.na(b2$data[[1]]$colour))) + expect_true(all(is.na(b2@data[[1]]$colour))) # fill is dropped because group b's fill is not constant - expect_true(all(b2$data[[1]]$fill == "#595959FF")) + expect_true(all(b2@data[[1]]$fill == "#595959FF")) # case 2-1) dropped partially with NA @@ -62,10 +62,10 @@ test_that("erroneously dropped aesthetics are found and issue a warning", { expect_snapshot_warning(b3 <- ggplot_build(p3)) # colour is dropped because group a's colour is not constant (GeomBar$default_aes$colour is NA) - expect_true(all(is.na(b3$data[[1]]$colour))) + expect_true(all(is.na(b3@data[[1]]$colour))) # fill is NOT dropped. Group a's fill is na.value, but others are mapped. expect_equal( - b3$data[[1]]$fill == "#123", + b3@data[[1]]$fill == "#123", c(TRUE, FALSE, FALSE) ) }) diff --git a/tests/testthat/test-theme.R b/tests/testthat/test-theme.R index 9b68ae2b09..af5a304cdb 100644 --- a/tests/testthat/test-theme.R +++ b/tests/testthat/test-theme.R @@ -19,10 +19,10 @@ test_that("modifying theme element properties with + operator works", { t <- theme_grey() + theme(axis.title.x = element_text(colour = 'red', margin = margin())) expect_identical(t$axis.title.x, element_text(colour = 'red', margin = margin(), vjust = 1)) # Make sure the theme class didn't change or get dropped - expect_s3_class(t, "theme") + expect_s7_class(t, class_theme) # Make sure the element class didn't change or get dropped - expect_s3_class(t$axis.title.x, "element") - expect_s3_class(t$axis.title.x, "element_text") + expect_s7_class(t$axis.title.x, element) + expect_s7_class(t$axis.title.x, element_text) # Modifying an intermediate node works t <- theme_grey() + theme(axis.title = element_text(colour = 'red')) @@ -30,10 +30,10 @@ test_that("modifying theme element properties with + operator works", { # Modifying a root node changes only the specified properties t <- theme_grey() + theme(text = element_text(colour = 'red')) - expect_identical(t$text$colour, 'red') - expect_identical(t$text$family, theme_grey()$text$family) - expect_identical(t$text$face, theme_grey()$text$face) - expect_identical(t$text$size, theme_grey()$text$size) + expect_identical(t$text@colour, 'red') + expect_identical(t$text@family, theme_grey()$text@family) + expect_identical(t$text@face, theme_grey()$text@face) + expect_identical(t$text@size, theme_grey()$text@size) # Descendent is unchanged expect_identical(t$axis.title.x, theme_grey()$axis.title.x) @@ -49,41 +49,45 @@ test_that("modifying theme element properties with + operator works", { t <- theme_grey() + theme() expect_identical(t, theme_grey()) - expect_snapshot(theme_grey() + "asdf", error = TRUE) + expect_snapshot( + theme_grey() + "asdf", + error = TRUE, + variant = substr(as.character(getRversion()), start = 1, stop = 3) + ) }) test_that("adding theme object to ggplot object with + operator works", { ## test with complete theme p <- ggplot(data.frame(x = 1:3), aes(x, x)) + geom_point() + theme_grey() p <- p + theme(axis.title = element_text(size = 20)) - expect_true(p$theme$axis.title$size == 20) + expect_true(p@theme$axis.title@size == 20) # Should update specified properties, but not reset other properties p <- p + theme(text = element_text(colour = 'red')) - expect_true(p$theme$text$colour == 'red') + expect_true(p@theme$text@colour == 'red') tt <- theme_grey()$text - tt$colour <- 'red' - expect_true(tt$inherit.blank) - tt$inherit.blank <- FALSE - expect_identical(p$theme$text, tt) + tt@colour <- 'red' + expect_true(tt@inherit.blank) + tt@inherit.blank <- FALSE + expect_identical(p@theme$text, tt) ## test without complete theme p <- ggplot(data.frame(x = 1:3), aes(x, x)) + geom_point() p <- p + theme(axis.title = element_text(size = 20)) - expect_true(p$theme$axis.title$size == 20) + expect_true(p@theme$axis.title@size == 20) # Should update specified properties, but not reset other properties p <- p + theme(text = element_text(colour = 'red')) - expect_true(p$theme$text$colour == 'red') - expect_null(p$theme$text$family) - expect_null(p$theme$text$face) - expect_null(p$theme$text$size) - expect_null(p$theme$text$hjust) - expect_null(p$theme$text$vjust) - expect_null(p$theme$text$angle) - expect_null(p$theme$text$lineheight) - expect_null(p$theme$text$margin) - expect_null(p$theme$text$debug) + expect_true(p@theme$text@colour == 'red') + expect_null(p@theme$text@family) + expect_null(p@theme$text@face) + expect_null(p@theme$text@size) + expect_null(p@theme$text@hjust) + expect_null(p@theme$text@vjust) + expect_null(p@theme$text@angle) + expect_null(p@theme$text@lineheight) + expect_null(p@theme$text@margin) + expect_null(p@theme$text@debug) ## stepwise addition of partial themes is identical to one-step addition p <- ggplot(data.frame(x = 1:3), aes(x, x)) + geom_point() @@ -95,7 +99,7 @@ test_that("adding theme object to ggplot object with + operator works", { theme(axis.line.x = element_line(color = "blue"), axis.ticks.x = element_line(color = "red")) - expect_identical(p1$theme, p2$theme) + expect_identical(p1@theme, p2@theme) }) test_that("replacing theme elements with %+replace% operator works", { @@ -103,7 +107,7 @@ test_that("replacing theme elements with %+replace% operator works", { t <- theme_grey() %+replace% theme(axis.title.x = element_text(colour = 'red')) expect_identical(t$axis.title.x, element_text(colour = 'red')) # Make sure the class didn't change or get dropped - expect_s3_class(t, "theme") + expect_s7_class(t, class_theme) # Changing an intermediate node works t <- theme_grey() %+replace% theme(axis.title = element_text(colour = 'red')) @@ -114,8 +118,6 @@ test_that("replacing theme elements with %+replace% operator works", { # Adding empty theme() has no effect t <- theme_grey() %+replace% theme() expect_identical(t, theme_grey()) - - expect_snapshot(theme_grey() + "asdf", error = TRUE) }) test_that("calculating theme element inheritance works", { @@ -123,36 +125,34 @@ test_that("calculating theme element inheritance works", { # Check that properties are passed along from axis.title to axis.title.x e <- calc_element('axis.title.x', t) - expect_identical(e$colour, 'red') - expect_false(is.null(e$family)) - expect_false(is.null(e$face)) - expect_false(is.null(e$size)) + expect_identical(e@colour, 'red') + expect_false(is.null(e@family)) + expect_false(is.null(e@face)) + expect_false(is.null(e@size)) # Check that rel() works for relative sizing, and is applied at each level t <- theme_grey(base_size = 12) + theme(axis.title = element_text(size = rel(0.5))) + theme(axis.title.x = element_text(size = rel(0.5))) e <- calc_element('axis.title', t) - expect_identical(e$size, 6) + expect_identical(e@size, 6) ex <- calc_element('axis.title.x', t) - expect_identical(ex$size, 3) + expect_identical(ex@size, 3) # Check that a theme_blank in a parent node gets passed along to children t <- theme_grey() + theme(text = element_blank()) expect_identical(calc_element('axis.title.x', t), element_blank()) # Check that inheritance from derived class works - element_dummyrect <- function(dummy) { # like element_rect but w/ dummy argument - structure(list( - fill = NULL, colour = NULL, dummy = dummy, linewidth = NULL, - linetype = NULL, inherit.blank = FALSE - ), class = c("element_dummyrect", "element_rect", "element")) - } + element_dummyrect <- S7::new_class( + "element_dummyrect", parent = element_rect, + properties = c(element_rect@properties, list(dummy = S7::class_any)) + ) e <- calc_element( "panel.background", theme( - rect = element_rect(fill = "white", colour = "black", linewidth = 0.5, linetype = 1), + rect = element_rect(fill = "white", colour = "black", linewidth = 0.5, linetype = 1, linejoin = "round"), panel.background = element_dummyrect(dummy = 5), complete = TRUE # need to prevent pulling in default theme ) @@ -160,10 +160,10 @@ test_that("calculating theme element inheritance works", { expect_identical( e, - structure(list( - fill = "white", colour = "black", dummy = 5, linewidth = 0.5, linetype = 1, + element_dummyrect( + fill = "white", colour = "black", dummy = 5, linewidth = 0.5, linetype = 1, linejoin = "round", inherit.blank = TRUE # this is true because we're requesting a complete theme - ), class = c("element_dummyrect", "element_rect", "element")) + ) ) # Check that blank elements are skipped in inheritance tree if and only if elements @@ -175,7 +175,7 @@ test_that("calculating theme element inheritance works", { ) e1 <- calc_element("strip.text.x", t) e2 <- calc_element("text", t) - e2$inherit.blank <- FALSE # b/c inherit.blank = TRUE for complete themes + e2@inherit.blank <- FALSE # b/c inherit.blank = TRUE for complete themes expect_identical(e1, e2) theme <- theme_gray() + @@ -201,18 +201,18 @@ test_that("complete and non-complete themes interact correctly with each other", # But for _element properties_, the one on the right modifies the one on the left. t <- theme_bw() + theme(text = element_text(colour = 'red')) expect_true(attr(t, "complete")) - expect_equal(t$text$colour, 'red') + expect_equal(t$text@colour, 'red') # A complete theme object (like theme_bw) always trumps a non-complete theme object t <- theme(text = element_text(colour = 'red')) + theme_bw() expect_true(attr(t, "complete")) - expect_equal(t$text$colour, theme_bw()$text$colour) + expect_equal(t$text@colour, theme_bw()$text@colour) # Adding two non-complete themes: the one on the right modifies the one on the left. t <- theme(text = element_text(colour = 'blue')) + theme(text = element_text(colour = 'red')) expect_false(attr(t, "complete")) - expect_equal(t$text$colour, 'red') + expect_equal(t$text@colour, 'red') }) test_that("complete and non-complete themes interact correctly with ggplot objects", { @@ -221,33 +221,33 @@ test_that("complete and non-complete themes interact correctly with ggplot objec # Check that adding two theme successive theme objects to a ggplot object # works like adding the two theme object to each other p <- ggplot_build(base + theme_bw() + theme(text = element_text(colour = 'red'))) - expect_true(attr(p$plot$theme, "complete")) + expect_true(attr(p@plot@theme, "complete")) # Compare the theme objects, after sorting the items, because item order can differ - pt <- p$plot$theme + pt <- p@plot@theme tt <- theme_bw() + theme(text = element_text(colour = 'red')) pt <- pt[order(names(pt))] tt <- tt[order(names(tt))] expect_identical(pt, tt) p <- ggplot_build(base + theme(text = element_text(colour = 'red')) + theme_bw()) - expect_true(attr(p$plot$theme, "complete")) + expect_true(attr(p@plot@theme, "complete")) # Compare the theme objects, after sorting the items, because item order can differ - pt <- p$plot$theme + pt <- p@plot@theme tt <- theme(text = element_text(colour = 'red')) + theme_bw() pt <- pt[order(names(pt))] tt <- tt[order(names(tt))] expect_identical(pt, tt) p <- ggplot_build(base + theme(text = element_text(colour = 'red', face = 'italic'))) - expect_equal(p$plot$theme$text$colour, "red") - expect_equal(p$plot$theme$text$face, "italic") + expect_equal(p@plot@theme$text@colour, "red") + expect_equal(p@plot@theme$text@face, "italic") p <- ggplot_build(base + theme(text = element_text(colour = 'red')) + theme(text = element_text(face = 'italic'))) - expect_equal(p$plot$theme$text$colour, "red") - expect_equal(p$plot$theme$text$face, "italic") + expect_equal(p@plot@theme$text@colour, "red") + expect_equal(p@plot@theme$text@face, "italic") }) test_that("theme(validate=FALSE) means do not check_element", { @@ -255,16 +255,16 @@ test_that("theme(validate=FALSE) means do not check_element", { bw <- p + theme_bw() red.text <- theme(text = element_text(colour = "red")) bw.before <- bw + theme(animint.width = 500, validate = FALSE) - expect_equal(bw.before$theme$animint.width, 500) + expect_equal(bw.before@theme$animint.width, 500) bw.after <- p + theme(animint.width = 500, validate = FALSE) + theme_bw() - expect_null(bw.after$theme$animint.width) + expect_null(bw.after@theme$animint.width) red.after <- p + theme(animint.width = 500, validate = FALSE) + red.text - expect_equal(red.after$theme$animint.width, 500) + expect_equal(red.after@theme$animint.width, 500) red.before <- p + red.text + theme(animint.width = 500, validate = FALSE) - expect_equal(red.before$theme$animint.width, 500) + expect_equal(red.before@theme$animint.width, 500) }) test_that("theme validation happens at build stage", { @@ -283,9 +283,10 @@ test_that("theme validation happens at build stage", { test_that("incorrect theme specifications throw meaningful errors", { expect_snapshot_error(add_theme(theme_grey(), theme(line = element_rect()))) expect_snapshot_error(calc_element("line", theme(line = element_rect()))) - register_theme_elements(element_tree = list(test = el_def("element_rect"))) + register_theme_elements(element_tree = list(test = el_def(element_rect))) expect_snapshot_error(calc_element("test", theme_gray() + theme(test = element_rect()))) expect_snapshot_error(set_theme("foo")) + reset_theme_settings() }) test_that("element tree can be modified", { @@ -305,7 +306,7 @@ test_that("element tree can be modified", { # things work once we add a new element to the element tree register_theme_elements( - element_tree = list(blablabla = el_def("element_text", "text")) + element_tree = list(blablabla = el_def(element_text, "text")) ) expect_silent(ggplotGrob(p)) @@ -327,31 +328,29 @@ test_that("element tree can be modified", { final_theme <- ggplot2:::plot_theme(p, theme_gray()) e1 <- calc_element("blablabla", final_theme) e2 <- calc_element("text", final_theme) - expect_identical(e1$family, e2$family) - expect_identical(e1$face, e2$face) - expect_identical(e1$size, e2$size) - expect_identical(e1$lineheight, e2$lineheight) - expect_identical(e1$colour, "red") # not inherited from element_text + expect_identical(e1@family, e2@family) + expect_identical(e1@face, e2@face) + expect_identical(e1@size, e2@size) + expect_identical(e1@lineheight, e2@lineheight) + expect_identical(e1@colour, "red") # not inherited from element_text # existing elements can be overwritten - ed <- el_def("element_rect", "rect") + ed <- el_def(element_rect, "rect") register_theme_elements( element_tree = list(axis.title = ed) ) expect_identical(get_element_tree()$axis.title, ed) - reset_theme_settings(reset_current = FALSE) # revert back to defaults + reset_theme_settings() # revert back to defaults }) test_that("all elements in complete themes have inherit.blank=TRUE", { inherit_blanks <- function(theme) { - all(vapply(theme, function(el) { - if (is_theme_element(el) && !is_theme_element(el, "blank")) { - el$inherit.blank - } else { - TRUE - } - }, logical(1))) + all(vapply( + theme, try_prop, + name = "inherit.blank", default = TRUE, + logical(1) + )) } expect_true(inherit_blanks(theme_grey())) expect_true(inherit_blanks(theme_bw())) @@ -393,7 +392,7 @@ test_that("complete plot themes shouldn't inherit from default", { base <- ggplot(data.frame(x = 1), aes(x, x)) + geom_point() ptheme <- plot_theme(base + theme(axis.text.x = element_text(colour = "blue")), default_theme) - expect_equal(ptheme$axis.text.x$colour, "blue") + expect_equal(ptheme$axis.text.x@colour, "blue") ptheme <- plot_theme(base + theme_void(), default_theme) expect_null(ptheme$axis.text.x) @@ -423,14 +422,14 @@ test_that("current theme can be updated with new elements", { # element tree gets merged properly register_theme_elements( abcde = element_text(color = "blue", hjust = 0, vjust = 1), - element_tree = list(abcde = el_def("element_text", "text")) + element_tree = list(abcde = el_def(element_text, "text")) ) e1 <- calc_element("abcde", plot_theme(b2)) e2 <- calc_element("text", plot_theme(b2)) - e2$colour <- "blue" - e2$hjust <- 0 - e2$vjust <- 1 + e2@colour <- "blue" + e2@hjust <- 0 + e2@vjust <- 1 expect_identical(e1, e2) reset_theme_settings() @@ -474,6 +473,10 @@ test_that("titleGrob() and margins() work correctly", { expect_equal(width_cm(g10), width_cm(g1) + 2) }) +test_that("margins() warn against wrong input lengths", { + expect_snapshot(margin(c(1, 2), 3, 4, c(5, 6, 7))) +}) + test_that("provided themes explicitly define all elements", { elements <- names(.element_tree) @@ -547,6 +550,30 @@ test_that("subtheme functions rename arguments as intended", { ) }) +test_that("element_text throws appropriate conditions", { + expect_snapshot_warning( + element_text(colour = c("red", "blue")) + ) + expect_snapshot_warning( + element_text(margin = unit(1, "cm")) + ) + expect_snapshot( + element_text(margin = 5), + error = TRUE + ) + expect_snapshot( + element_text(colour = sqrt(2)), + error = TRUE + ) + + # Some absurd case found in reverse dependency check where + # labs(y = element_blank()) for some reason + el <- theme_get()$text + expect_snapshot( + element_grob(el, label = element_blank()) + ) +}) + test_that("Theme validation behaves as expected", { tree <- get_element_tree() expect_silent(check_element(1, "aspect.ratio", tree)) @@ -565,7 +592,7 @@ test_that("Element subclasses are inherited", { test <- combine_elements(poor, rich) expect_s3_class(test, "element_rich") expect_equal( - test[c("colour", "linetype", "linewidth")], + S7::props(test)[c("colour", "linetype", "linewidth")], list(colour = "red", linetype = 3, linewidth = 2) ) @@ -573,7 +600,7 @@ test_that("Element subclasses are inherited", { test <- combine_elements(rich, poor) expect_s3_class(test, "element_rich") expect_equal( - test[c("colour", "linetype", "linewidth")], + S7::props(test)[c("colour", "linetype", "linewidth")], list(colour = "red", linetype = 2, linewidth = 2) ) @@ -585,7 +612,7 @@ test_that("Element subclasses are inherited", { test <- combine_elements(sibling, rich) expect_s3_class(test, "element_sibling") expect_equal( - test[c("colour", "linetype", "linewidth")], + S7::props(test)[c("colour", "linetype", "linewidth")], list(colour = "red", linetype = 3, linewidth = 2) ) @@ -593,7 +620,7 @@ test_that("Element subclasses are inherited", { test <- combine_elements(rich, sibling) expect_s3_class(test, "element_rich") expect_equal( - test[c("colour", "linetype", "linewidth")], + S7::props(test)[c("colour", "linetype", "linewidth")], list(colour = "red", linetype = 2, linewidth = 2) ) }) @@ -620,33 +647,33 @@ test_that("header_family is passed on correctly", { td <- theme_dark(base_family = "x", header_family = "y") test <- calc_element("plot.title", td) - expect_equal(test$family, "y") + expect_equal(test@family, "y") test <- calc_element("plot.subtitle", td) - expect_equal(test$family, "x") + expect_equal(test@family, "x") }) test_that("complete_theme completes a theme", { # `NULL` should match default gray <- theme_gray() new <- complete_theme(NULL, default = gray) - expect_equal(new, gray, ignore_attr = "validate") + expect_equal(S7::S7_data(new), S7::S7_data(gray)) # Elements are propagated new <- complete_theme(theme(axis.line = element_line("red")), gray) - expect_equal(new$axis.line$colour, "red") + expect_equal(new$axis.line@colour, "red") # Missing elements are filled in if default theme is incomplete new <- complete_theme(default = theme()) - expect_s3_class(new$axis.line, "element_blank") + expect_s3_class(new$axis.line, "ggplot2::element_blank") # Registered elements are included register_theme_elements( test = element_text(), - element_tree = list(test = el_def("element_text", "text")) + element_tree = list(test = el_def(element_text, "text")) ) new <- complete_theme(default = gray) - expect_s3_class(new$test, "element_text") + expect_s3_class(new$test, "ggplot2::element_text") reset_theme_settings() }) @@ -983,15 +1010,11 @@ test_that("Legends can on all sides of the plot with custom justification", { }) test_that("Strips can render custom elements", { - element_test <- function(...) { - el <- element_text(...) - class(el) <- c("element_test", "element_text", "element") - el - } - element_grob.element_test <- function(element, label = "", x = NULL, y = NULL, ...) { - rectGrob(width = unit(1, "cm"), height = unit(1, "cm")) - } - registerS3method("element_grob", "element_test", element_grob.element_test) + element_test <- S7::new_class("element_test", element_text) + S7::method(element_grob, element_test) <- + function(element, label = "", x = NULL, y = NULL, ...) { + rectGrob(width = unit(1, "cm"), height = unit(1, "cm")) + } df <- data_frame(x = 1:3, y = 1:3, a = letters[1:3]) plot <- ggplot(df, aes(x, y)) + diff --git a/vignettes/articles/faq-axes.Rmd b/vignettes/articles/faq-axes.Rmd index cf88240cfa..8f390fc2e4 100644 --- a/vignettes/articles/faq-axes.Rmd +++ b/vignettes/articles/faq-axes.Rmd @@ -447,6 +447,7 @@ ggplot(mpg, aes(x = cty^2, y = log(hwy, base = 10))) + - If you're already familiar with Markdown and HTML, you might prefer using the [ggtext](https://wilkelab.org/ggtext/) package instead. In Markdown we can write the axis labels as `cty2` and `log10(hwy)` for x and y axes, respectively. Then, we tell ggplot2 to interpret the axis labels as Markdown and not as plain text by setting `axis.title.x` and `axis.title.y` to `ggtext::element_markdown()`. ```{r} +#| eval: false #| fig.alt: "A scatter plot showing the squared city miles per gallon on the #| x-axis versus the base 10 logarithm of highway miles per gallon on the #| y-axis for 234 cars. In the axis titles, the base 10 is indicated in