From 724c2c9257ddd5e6b88610da4d77f603da59227a Mon Sep 17 00:00:00 2001 From: Hadley Wickham Date: Fri, 27 Jun 2025 10:07:02 -0500 Subject: [PATCH 1/3] Remove functions/arguments deprecated in purrr 0.3.0 Some of these hung on because we didn't properly flag as deprecated, but I think it's time to let them go. Hopefully the revdep checks support this decision. --- NAMESPACE | 7 --- NEWS.md | 4 ++ R/adverb-partial.R | 42 ++----------- R/deprec-cross.R | 16 ----- R/deprec-map.R | 11 ---- R/deprec-utils.R | 19 ------ R/detect.R | 19 ++---- R/reduce.R | 79 ------------------------- man/accumulate.Rd | 9 --- man/at_depth.Rd | 14 ----- man/cross.Rd | 2 - man/detect.Rd | 13 +--- man/get-attr.Rd | 22 ------- man/in_parallel.Rd | 2 +- man/map.Rd | 2 +- man/partial.Rd | 19 +----- man/reduce_right.Rd | 76 ------------------------ tests/testthat/_snaps/adverb-partial.md | 18 ------ tests/testthat/_snaps/deprec-map.md | 9 --- tests/testthat/_snaps/detect.md | 15 ----- tests/testthat/_snaps/reduce.md | 21 ------- tests/testthat/test-adverb-partial.R | 32 ---------- tests/testthat/test-deprec-map.R | 3 - tests/testthat/test-detect.R | 18 ------ tests/testthat/test-reduce.R | 51 ---------------- 25 files changed, 18 insertions(+), 505 deletions(-) delete mode 100644 R/deprec-map.R delete mode 100644 man/at_depth.Rd delete mode 100644 man/get-attr.Rd delete mode 100644 man/reduce_right.Rd delete mode 100644 tests/testthat/_snaps/deprec-map.md delete mode 100644 tests/testthat/test-deprec-map.R diff --git a/NAMESPACE b/NAMESPACE index fd9734cc2..12aac1a68 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -11,18 +11,15 @@ S3method(print,purrr_rate_delay) S3method(rate_sleep,purrr_rate_backoff) S3method(rate_sleep,purrr_rate_delay) export("%>%") -export("%@%") export("%||%") export("pluck<-") export(accumulate) export(accumulate2) -export(accumulate_right) export(array_branch) export(array_tree) export(as_mapper) export(as_vector) export(assign_in) -export(at_depth) export(attr_getter) export(auto_browse) export(chuck) @@ -31,9 +28,7 @@ export(compose) export(cross) export(cross2) export(cross3) -export(cross_d) export(cross_df) -export(cross_n) export(detect) export(detect_index) export(discard) @@ -182,8 +177,6 @@ export(rbernoulli) export(rdunif) export(reduce) export(reduce2) -export(reduce2_right) -export(reduce_right) export(rep_along) export(rerun) export(safely) diff --git a/NEWS.md b/NEWS.md index 3c52b74ff..1576515b1 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,5 +1,9 @@ # purrr (development version) +* All functions and arguments deprecated in purrr 0.3.0 have now been removed. + This includes `%@%`, `accumulate_right()`, `at_depth()`, `cross_d()`, + `cross_n()`, `reduce2_right()`, and `reduce_right()`. + * purrr gains the capacity for parallel and distributed map, powered by the mirai package. Newly-added `in_parallel()` wraps a function provided to `map()` and all its variants to enable this. See `?in_parallel` for more diff --git a/R/adverb-partial.R b/R/adverb-partial.R index 466e3de5b..7a50b9150 100644 --- a/R/adverb-partial.R +++ b/R/adverb-partial.R @@ -31,15 +31,6 @@ #' These dots support quasiquotation. If you unquote a value, it is #' evaluated only once at function creation time. Otherwise, it is #' evaluated each time the function is called. -#' @param .env `r lifecycle::badge("deprecated")` The environments are -#' now captured via quosures. -#' @param .first `r lifecycle::badge("deprecated")` Please pass an -#' empty argument `... = ` to specify the position of future -#' arguments. -#' @param .lazy `r lifecycle::badge("deprecated")` Please unquote the -#' arguments that should be evaluated once at function creation time -#' with `!!`. -#' #' @inheritSection safely Adverbs #' @inherit safely return #' @family adverbs @@ -88,11 +79,7 @@ #' # `... = ` argument: #' my_list <- partial(list, 1, ... = , 2) #' my_list("foo") -partial <- function(.f, - ..., - .env = deprecated(), - .lazy = deprecated(), - .first = deprecated()) { +partial <- function(.f, ...) { args <- enquos(...) fn_expr <- enexpr(.f) @@ -106,19 +93,6 @@ partial <- function(.f, ) ) - if (lifecycle::is_present(.env)) { - lifecycle::deprecate_warn("0.3.0", "partial(.env)", always = TRUE) - } - if (lifecycle::is_present(.lazy)) { - lifecycle::deprecate_warn("0.3.0", "partial(.lazy)", always = TRUE) - if (!.lazy) { - args <- map(args, ~ new_quosure(eval_tidy(.x , env = caller_env()), empty_env())) - } - } - if (lifecycle::is_present(.first)) { - lifecycle::deprecate_warn("0.3.0", "partial(.first)", always = TRUE) - } - env <- caller_env() heterogeneous_envs <- !every(args, quo_is_same_env, env) @@ -129,15 +103,10 @@ partial <- function(.f, # Reuse function symbol if possible fn_sym <- if (is_symbol(fn_expr)) fn_expr else quote(.fn) - if (is_false(.first)) { - # For compatibility - call <- call_modify(call2(fn_sym), ... = , !!!args) - } else { - # Pass on `...` from parent function. It should be last, this way if - # `args` also contain a `...` argument, the position in `args` - # prevails. - call <- call_modify(call2(fn_sym), !!!args, ... = ) - } + # Pass on `...` from parent function. It should be last, this way if + # `args` also contain a `...` argument, the position in `args` + # prevails. + call <- call_modify(call2(fn_sym), !!!args, ... = ) if (heterogeneous_envs) { # Forward caller environment where S3 methods might be defined. @@ -254,4 +223,3 @@ quo_is_same_env <- function(x, env) { quo_env <- quo_get_env(x) is_reference(quo_env, env) || is_reference(quo_env, empty_env()) } - diff --git a/R/deprec-cross.R b/R/deprec-cross.R index e2c1eacb6..010e8274b 100644 --- a/R/deprec-cross.R +++ b/R/deprec-cross.R @@ -203,19 +203,3 @@ cross_df <- function(.l, .filter = NULL) { simplify_all() %>% tibble::as_tibble() } - -#' @export -#' @usage NULL -#' @rdname cross -cross_n <- function(...) { - lifecycle::deprecate_stop("0.2.3", "purrr::cross_n()") - cross(...) -} - -#' @export -#' @usage NULL -#' @rdname cross -cross_d <- function(...) { - lifecycle::deprecate_stop("0.2.3", "purrr::cross_d()") - cross_df(...) -} diff --git a/R/deprec-map.R b/R/deprec-map.R deleted file mode 100644 index fbf52595e..000000000 --- a/R/deprec-map.R +++ /dev/null @@ -1,11 +0,0 @@ -#' Map at depth -#' -#' This function is defunct and has been replaced by [map_depth()]. -#' See also [modify_depth()] for a version that preserves the types of -#' the elements of the tree. -#' -#' @export -#' @keywords internal -at_depth <- function(.x, .depth, .f, ...) { - lifecycle::deprecate_stop("0.3.0", "at_depth()", "map_depth()") -} diff --git a/R/deprec-utils.R b/R/deprec-utils.R index b09be9b19..99c5fad26 100644 --- a/R/deprec-utils.R +++ b/R/deprec-utils.R @@ -1,22 +1,3 @@ -#' Infix attribute accessor -#' -#' @description -#' `r lifecycle::badge("deprecated")` -#' -#' This function was deprecated in purrr 0.3.0. Instead, lease use the `%@%` -#' operator exported in rlang. It has an interface more consistent with `@`: -#' uses NSE, supports S4 fields, and has an assignment variant. -#' -#' @param x Object -#' @param name Attribute name -#' @export -#' @name get-attr -#' @keywords internal -`%@%` <- function(x, name) { - lifecycle::deprecate_warn("0.3.0", I("%@%"), I("rlang::%@%"), always = TRUE) - attr(x, name, exact = TRUE) -} - #' Generate random sample from a Bernoulli distribution #' #' @description diff --git a/R/detect.R b/R/detect.R index 6b1d87c19..672922b62 100644 --- a/R/detect.R +++ b/R/detect.R @@ -16,7 +16,6 @@ #' @param .dir If `"forward"`, the default, starts at the beginning of #' the vector and move towards the end; if `"backward"`, starts at #' the end of the vector and moves towards the beginning. -#' @param .right `r lifecycle::badge("deprecated")` Please use `.dir` instead. #' @param .default The value returned when nothing is detected. #' @return `detect` the value of the first item that matches the #' predicate; `detect_index` the position of the matching item. @@ -52,11 +51,11 @@ #' #' # If you need to find all positions, use map_lgl(): #' which(map_lgl(x, "foo")) -detect <- function(.x, .f, ..., .dir = c("forward", "backward"), .right = NULL, .default = NULL) { +detect <- function(.x, .f, ..., .dir = c("forward", "backward"), .default = NULL) { .f <- as_predicate(.f, ..., .mapper = TRUE) .dir <- arg_match0(.dir, c("forward", "backward")) - for (i in index(.x, .dir, .right, "detect")) { + for (i in index(.x, .dir, "detect")) { if (.f(.x[[i]], ...)) { return(.x[[i]]) } @@ -67,11 +66,11 @@ detect <- function(.x, .f, ..., .dir = c("forward", "backward"), .right = NULL, #' @export #' @rdname detect -detect_index <- function(.x, .f, ..., .dir = c("forward", "backward"), .right = NULL) { +detect_index <- function(.x, .f, ..., .dir = c("forward", "backward")) { .f <- as_predicate(.f, ..., .mapper = TRUE) .dir <- arg_match0(.dir, c("forward", "backward")) - for (i in index(.x, .dir, .right, "detect_index")) { + for (i in index(.x, .dir, "detect_index")) { if (.f(.x[[i]], ...)) { return(i) } @@ -83,16 +82,6 @@ detect_index <- function(.x, .f, ..., .dir = c("forward", "backward"), .right = index <- function(x, dir, right = NULL, fn) { - if (!is_null(right)) { - lifecycle::deprecate_warn( - when = "0.3.0", - what = paste0(fn, "(.right)"), - with = paste0(fn, "(.dir)"), - always = TRUE - ) - dir <- if (right) "backward" else "forward" - } - idx <- seq_along(x) if (dir == "backward") { idx <- rev(idx) diff --git a/R/reduce.R b/R/reduce.R index 77638ca70..80d8f235c 100644 --- a/R/reduce.R +++ b/R/reduce.R @@ -381,13 +381,6 @@ seq_len2 <- function(start, end) { #' #' @inheritSection reduce Direction #' -#' @section Life cycle: -#' -#' `accumulate_right()` is soft-deprecated in favour of the `.dir` -#' argument as of rlang 0.3.0. Note that the algorithm has -#' slightly changed: the accumulated value is passed to the right -#' rather than the left, which is consistent with a right reduction. -#' #' @seealso [reduce()] when you only need the final reduced value. #' @examples #' # With an associative operation, the final value is always the @@ -500,75 +493,3 @@ accumulate_names <- function(nms, init, dir) { nms } - -#' Reduce from the right (retired) -#' -#' @description -#' `r lifecycle::badge("deprecated")` -#' -#' `reduce_right()` is soft-deprecated as of purrr 0.3.0. Please use -#' the `.dir` argument of `reduce()` instead. Note that the algorithm -#' has changed. Whereas `reduce_right()` computed `f(f(3, 2), 1)`, -#' `reduce(.dir = \"backward\")` computes `f(1, f(2, 3))`. This is the -#' standard way of reducing from the right. -#' -#' To update your code with the same reduction as `reduce_right()`, -#' simply reverse your vector and use a left reduction: -#' -#' ```R -#' # Before: -#' reduce_right(1:3, f) -#' -#' # After: -#' reduce(rev(1:3), f) -#' ``` -#' -#' `reduce2_right()` is deprecated as of purrr 0.3.0 without -#' replacement. It is not clear what algorithmic properties should a -#' right reduction have in this case. Please reach out if you know -#' about a use case for a right reduction with a ternary function. -#' -#' @inheritParams reduce -#' @keywords internal -#' @export -reduce_right <- function(.x, .f, ..., .init) { - lifecycle::deprecate_warn( - when = "0.3.0", - what = "reduce_right()", - with = "reduce(.dir)", - always = TRUE - ) - - .x <- rev(.x) # Compatibility - reduce_impl(.x, .f, ..., .dir = "forward", .init = .init) -} -#' @rdname reduce_right -#' @export -reduce2_right <- function(.x, .y, .f, ..., .init) { - lifecycle::deprecate_warn( - when = "0.3.0", - what = "reduce2_right()", - with = I("reverse your vectors and use `reduce2()`"), - always = TRUE - ) - - reduce2_impl(.x, .y, .f, ..., .init = .init, .left = FALSE) -} - -#' @rdname reduce_right -#' @export -accumulate_right <- function(.x, .f, ..., .init) { - lifecycle::deprecate_warn( - when = "0.3.0", - what = "accumulate_right()", - with = "accumulate(.dir)", - always = TRUE - ) - - # Note the order of arguments is switched - f <- function(y, x) { - .f(x, y, ...) - } - - accumulate(.x, f, .init = .init, .dir = "backward") -} diff --git a/man/accumulate.Rd b/man/accumulate.Rd index cfd8c68cd..395930e4f 100644 --- a/man/accumulate.Rd +++ b/man/accumulate.Rd @@ -101,15 +101,6 @@ application. \code{accumulate2()} sequentially applies a function to elements of two lists, \code{.x} and \code{.y}. } -\section{Life cycle}{ - - -\code{accumulate_right()} is soft-deprecated in favour of the \code{.dir} -argument as of rlang 0.3.0. Note that the algorithm has -slightly changed: the accumulated value is passed to the right -rather than the left, which is consistent with a right reduction. -} - \section{Direction}{ diff --git a/man/at_depth.Rd b/man/at_depth.Rd deleted file mode 100644 index aa9a9d167..000000000 --- a/man/at_depth.Rd +++ /dev/null @@ -1,14 +0,0 @@ -% Generated by roxygen2: do not edit by hand -% Please edit documentation in R/deprec-map.R -\name{at_depth} -\alias{at_depth} -\title{Map at depth} -\usage{ -at_depth(.x, .depth, .f, ...) -} -\description{ -This function is defunct and has been replaced by \code{\link[=map_depth]{map_depth()}}. -See also \code{\link[=modify_depth]{modify_depth()}} for a version that preserves the types of -the elements of the tree. -} -\keyword{internal} diff --git a/man/cross.Rd b/man/cross.Rd index fab082116..5ee18284b 100644 --- a/man/cross.Rd +++ b/man/cross.Rd @@ -5,8 +5,6 @@ \alias{cross2} \alias{cross3} \alias{cross_df} -\alias{cross_n} -\alias{cross_d} \title{Produce all combinations of list elements} \usage{ cross(.l, .filter = NULL) diff --git a/man/detect.Rd b/man/detect.Rd index e012db2b4..8b69eb9a8 100644 --- a/man/detect.Rd +++ b/man/detect.Rd @@ -5,16 +5,9 @@ \alias{detect_index} \title{Find the value or position of the first match} \usage{ -detect( - .x, - .f, - ..., - .dir = c("forward", "backward"), - .right = NULL, - .default = NULL -) +detect(.x, .f, ..., .dir = c("forward", "backward"), .default = NULL) -detect_index(.x, .f, ..., .dir = c("forward", "backward"), .right = NULL) +detect_index(.x, .f, ..., .dir = c("forward", "backward")) } \arguments{ \item{.x}{A list or vector.} @@ -38,8 +31,6 @@ set a default value if the indexed element is \code{NULL} or does not exist. the vector and move towards the end; if \code{"backward"}, starts at the end of the vector and moves towards the beginning.} -\item{.right}{\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#deprecated}{\figure{lifecycle-deprecated.svg}{options: alt='[Deprecated]'}}}{\strong{[Deprecated]}} Please use \code{.dir} instead.} - \item{.default}{The value returned when nothing is detected.} } \value{ diff --git a/man/get-attr.Rd b/man/get-attr.Rd deleted file mode 100644 index 70bcce9a5..000000000 --- a/man/get-attr.Rd +++ /dev/null @@ -1,22 +0,0 @@ -% Generated by roxygen2: do not edit by hand -% Please edit documentation in R/deprec-utils.R -\name{get-attr} -\alias{get-attr} -\alias{\%@\%} -\title{Infix attribute accessor} -\usage{ -x \%@\% name -} -\arguments{ -\item{x}{Object} - -\item{name}{Attribute name} -} -\description{ -\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#deprecated}{\figure{lifecycle-deprecated.svg}{options: alt='[Deprecated]'}}}{\strong{[Deprecated]}} - -This function was deprecated in purrr 0.3.0. Instead, lease use the \verb{\%@\%} -operator exported in rlang. It has an interface more consistent with \code{@}: -uses NSE, supports S4 fields, and has an assignment variant. -} -\keyword{internal} diff --git a/man/in_parallel.Rd b/man/in_parallel.Rd index 8ee3934c7..77e640528 100644 --- a/man/in_parallel.Rd +++ b/man/in_parallel.Rd @@ -142,7 +142,7 @@ recursively within each other. } \examples{ -\dontshow{if (interactive() && rlang::is_installed("mirai") && rlang::is_installed("carrier")) withAutoprint(\{ # examplesIf} +\dontshow{if (interactive() && rlang::is_installed("mirai") && rlang::is_installed("carrier")) (if (getRversion() >= "3.4") withAutoprint else force)(\{ # examplesIf} # Run in interactive sessions only as spawns additional processes slow_lm <- function(formula, data) { diff --git a/man/map.Rd b/man/map.Rd index a6ce9de7e..e15c6d75e 100644 --- a/man/map.Rd +++ b/man/map.Rd @@ -156,7 +156,7 @@ mtcars |> map(summary) |> map_dbl("r.squared") -\dontshow{if (interactive() && rlang::is_installed("mirai") && rlang::is_installed("carrier")) withAutoprint(\{ # examplesIf} +\dontshow{if (interactive() && rlang::is_installed("mirai") && rlang::is_installed("carrier")) (if (getRversion() >= "3.4") withAutoprint else force)(\{ # examplesIf} # Run in interactive sessions only as spawns additional processes # To use parallelized map: diff --git a/man/partial.Rd b/man/partial.Rd index dcc917731..1c99493f8 100644 --- a/man/partial.Rd +++ b/man/partial.Rd @@ -4,13 +4,7 @@ \alias{partial} \title{Partially apply a function, filling in some arguments} \usage{ -partial( - .f, - ..., - .env = deprecated(), - .lazy = deprecated(), - .first = deprecated() -) +partial(.f, ...) } \arguments{ \item{.f}{a function. For the output source to read well, this should be a @@ -25,17 +19,6 @@ arguments relative to partialised ones. See These dots support quasiquotation. If you unquote a value, it is evaluated only once at function creation time. Otherwise, it is evaluated each time the function is called.} - -\item{.env}{\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#deprecated}{\figure{lifecycle-deprecated.svg}{options: alt='[Deprecated]'}}}{\strong{[Deprecated]}} The environments are -now captured via quosures.} - -\item{.lazy}{\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#deprecated}{\figure{lifecycle-deprecated.svg}{options: alt='[Deprecated]'}}}{\strong{[Deprecated]}} Please unquote the -arguments that should be evaluated once at function creation time -with \verb{!!}.} - -\item{.first}{\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#deprecated}{\figure{lifecycle-deprecated.svg}{options: alt='[Deprecated]'}}}{\strong{[Deprecated]}} Please pass an -empty argument \verb{... = } to specify the position of future -arguments.} } \value{ A function that takes the same arguments as \code{.f}, but returns diff --git a/man/reduce_right.Rd b/man/reduce_right.Rd deleted file mode 100644 index 830b86559..000000000 --- a/man/reduce_right.Rd +++ /dev/null @@ -1,76 +0,0 @@ -% Generated by roxygen2: do not edit by hand -% Please edit documentation in R/reduce.R -\name{reduce_right} -\alias{reduce_right} -\alias{reduce2_right} -\alias{accumulate_right} -\title{Reduce from the right (retired)} -\usage{ -reduce_right(.x, .f, ..., .init) - -reduce2_right(.x, .y, .f, ..., .init) - -accumulate_right(.x, .f, ..., .init) -} -\arguments{ -\item{.x}{A list or atomic vector.} - -\item{.f}{For \code{reduce()}, a 2-argument function. The function will be passed -the accumulated value as the first argument and the "next" value as the -second argument. - -For \code{reduce2()}, a 3-argument function. The function will be passed the -accumulated value as the first argument, the next value of \code{.x} as the -second argument, and the next value of \code{.y} as the third argument. - -The reduction terminates early if \code{.f} returns a value wrapped in -a \code{\link[=done]{done()}}.} - -\item{...}{Additional arguments passed on to the reduce function. - -We now generally recommend against using \code{...} to pass additional -(constant) arguments to \code{.f}. Instead use a shorthand anonymous function: - -\if{html}{\out{
}}\preformatted{# Instead of -x |> reduce(f, 1, 2, collapse = ",") -# do: -x |> reduce(\\(x, y) f(x, y, 1, 2, collapse = ",")) -}\if{html}{\out{
}} - -This makes it easier to understand which arguments belong to which -function and will tend to yield better error messages.} - -\item{.init}{If supplied, will be used as the first value to start -the accumulation, rather than using \code{.x[[1]]}. This is useful if -you want to ensure that \code{reduce} returns a correct value when \code{.x} -is empty. If missing, and \code{.x} is empty, will throw an error.} - -\item{.y}{For \code{reduce2()} an additional -argument that is passed to \code{.f}. If \code{init} is not set, \code{.y} -should be 1 element shorter than \code{.x}.} -} -\description{ -\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#deprecated}{\figure{lifecycle-deprecated.svg}{options: alt='[Deprecated]'}}}{\strong{[Deprecated]}} - -\code{reduce_right()} is soft-deprecated as of purrr 0.3.0. Please use -the \code{.dir} argument of \code{reduce()} instead. Note that the algorithm -has changed. Whereas \code{reduce_right()} computed \code{f(f(3, 2), 1)}, -\verb{reduce(.dir = \\"backward\\")} computes \code{f(1, f(2, 3))}. This is the -standard way of reducing from the right. - -To update your code with the same reduction as \code{reduce_right()}, -simply reverse your vector and use a left reduction: - -\if{html}{\out{
}}\preformatted{# Before: -reduce_right(1:3, f) - -# After: -reduce(rev(1:3), f) -}\if{html}{\out{
}} - -\code{reduce2_right()} is deprecated as of purrr 0.3.0 without -replacement. It is not clear what algorithmic properties should a -right reduction have in this case. Please reach out if you know -about a use case for a right reduction with a ternary function. -} -\keyword{internal} diff --git a/tests/testthat/_snaps/adverb-partial.md b/tests/testthat/_snaps/adverb-partial.md index 5ab3850de..39a30d60e 100644 --- a/tests/testthat/_snaps/adverb-partial.md +++ b/tests/testthat/_snaps/adverb-partial.md @@ -7,24 +7,6 @@ function (...) foo(y = 3, ...) -# `.lazy`, `.env`, and `.first` are soft-deprecated - - Code - . <- partial(list, "foo", .lazy = TRUE) - Condition - Warning: - The `.lazy` argument of `partial()` is deprecated as of purrr 0.3.0. - Code - . <- partial(list, "foo", .env = env()) - Condition - Warning: - The `.env` argument of `partial()` is deprecated as of purrr 0.3.0. - Code - . <- partial(list, "foo", .first = TRUE) - Condition - Warning: - The `.first` argument of `partial()` is deprecated as of purrr 0.3.0. - # checks inputs Code diff --git a/tests/testthat/_snaps/deprec-map.md b/tests/testthat/_snaps/deprec-map.md deleted file mode 100644 index 84b3cfc50..000000000 --- a/tests/testthat/_snaps/deprec-map.md +++ /dev/null @@ -1,9 +0,0 @@ -# at_depth is defunct - - Code - at_depth() - Condition - Error: - ! `at_depth()` was deprecated in purrr 0.3.0 and is now defunct. - i Please use `map_depth()` instead. - diff --git a/tests/testthat/_snaps/detect.md b/tests/testthat/_snaps/detect.md index 92b10b13a..6003b28ed 100644 --- a/tests/testthat/_snaps/detect.md +++ b/tests/testthat/_snaps/detect.md @@ -14,18 +14,3 @@ Error in `detect_index()`: ! `.f()` must return a single `TRUE` or `FALSE`, not a logical vector. -# `.right` argument is retired - - Code - . <- detect(1:2, ~TRUE, .right = TRUE) - Condition - Warning: - The `.right` argument of `detect()` is deprecated as of purrr 0.3.0. - i Please use the `.dir` argument instead. - Code - . <- detect_index(1:2, ~TRUE, .right = TRUE) - Condition - Warning: - The `.right` argument of `detect_index()` is deprecated as of purrr 0.3.0. - i Please use the `.dir` argument instead. - diff --git a/tests/testthat/_snaps/reduce.md b/tests/testthat/_snaps/reduce.md index e1966e9ad..040c19118 100644 --- a/tests/testthat/_snaps/reduce.md +++ b/tests/testthat/_snaps/reduce.md @@ -30,24 +30,3 @@ Error in `reduce2()`: ! Must supply `.init` when `.x` is empty. -# right variants are retired - - Code - . <- reduce_right(1:3, c) - Condition - Warning: - `reduce_right()` was deprecated in purrr 0.3.0. - i Please use the `.dir` argument of `reduce()` instead. - Code - . <- reduce2_right(1:3, 1:2, c) - Condition - Warning: - `reduce2_right()` was deprecated in purrr 0.3.0. - i Please use reverse your vectors and use `reduce2()` instead. - Code - . <- accumulate_right(1:3, c) - Condition - Warning: - `accumulate_right()` was deprecated in purrr 0.3.0. - i Please use the `.dir` argument of `accumulate()` instead. - diff --git a/tests/testthat/test-adverb-partial.R b/tests/testthat/test-adverb-partial.R index 13e792618..2d143ebec 100644 --- a/tests/testthat/test-adverb-partial.R +++ b/tests/testthat/test-adverb-partial.R @@ -140,38 +140,6 @@ test_that("partial() preserves visibility when arguments are from the same envir expect_identical(withVisible(fn()), list(value = 1, visible = FALSE)) }) - -# Life cycle -------------------------------------------------------------- - -test_that("`.lazy`, `.env`, and `.first` are soft-deprecated", { - expect_snapshot({ - . <- partial(list, "foo", .lazy = TRUE) - . <- partial(list, "foo", .env = env()) - . <- partial(list, "foo", .first = TRUE) - }) -}) - -test_that("`.lazy` still works", { - local_options(lifecycle_verbosity = "quiet") - - counter <- env(n = 0) - eager <- partial(list, n = { counter$n <- counter$n + 1; NULL }, .lazy = FALSE) - walk(1:10, ~eager()) - expect_identical(counter$n, 1) -}) - -test_that("`.first` still works", { - local_options(lifecycle_verbosity = "quiet") - - out <- partialised_body(partial(runif, n = rpois(1, 5), .first = FALSE)) - exp <- expr(runif(..., n = rpois(1, 5))) - expect_identical(out, exp) - - # partial() also works without partialised arguments - expect_identical(partialised_body(partial(runif, .first = TRUE)), expr(runif(...))) - expect_identical(partialised_body(partial(runif, .first = FALSE)), expr(runif(...))) -}) - test_that("checks inputs", { expect_snapshot(partial(1), error = TRUE) }) diff --git a/tests/testthat/test-deprec-map.R b/tests/testthat/test-deprec-map.R deleted file mode 100644 index 86dd88adb..000000000 --- a/tests/testthat/test-deprec-map.R +++ /dev/null @@ -1,3 +0,0 @@ -test_that("at_depth is defunct", { - expect_snapshot(at_depth(), error = TRUE) -}) diff --git a/tests/testthat/test-detect.R b/tests/testthat/test-detect.R index 192e7bd48..35b70a9e2 100644 --- a/tests/testthat/test-detect.R +++ b/tests/testthat/test-detect.R @@ -25,21 +25,3 @@ test_that("`detect()` requires a predicate function", { expect_snapshot(detect(list(1:2, 2), is.na), error = TRUE) expect_snapshot(detect_index(list(1:2, 2), is.na), error = TRUE) }) - - -# Lifecycle --------------------------------------------------------------- - -test_that("`.right` argument is retired", { - - expect_snapshot({ - . <- detect(1:2, ~ TRUE, .right = TRUE) - . <- detect_index(1:2, ~ TRUE, .right = TRUE) - }) -}) - -test_that("`.right` argument still works", { - local_options(lifecycle_verbosity = "quiet") - is_odd <- function(x) x %% 2 == 1 - expect_equal(detect(y, is_odd, .right = TRUE), 9) - expect_equal(detect_index(y, is_odd, .right = TRUE), 6) -}) diff --git a/tests/testthat/test-reduce.R b/tests/testthat/test-reduce.R index bd384062e..6944b2ce9 100644 --- a/tests/testthat/test-reduce.R +++ b/tests/testthat/test-reduce.R @@ -185,54 +185,3 @@ test_that("accumulate2() forces arguments (#643)", { fns <- accumulate2(list(identity, identity), "foo", compose) expect_true(every(fns, function(f) identical(f(1), 1))) }) - - -# Life cycle -------------------------------------------------------------- - -test_that("right variants are retired", { - expect_snapshot({ - . <- reduce_right(1:3, c) - . <- reduce2_right(1:3, 1:2, c) - . <- accumulate_right(1:3, c) - }) -}) - -test_that("reduce_right still works", { - local_options(lifecycle_verbosity = "quiet") - expect_equal(reduce_right(c(1, 1), `+`), 2) - expect_equal(reduce_right(c(1, 1), `+`, .init = 1), 3) - expect_equal(reduce_right(1, `+`, .init = 1), 2) -}) - -test_that("reduce_right equivalent to reversing input", { - local_options(lifecycle_verbosity = "quiet") - x <- list(c(2, 1), c(4, 3), c(6, 5)) - expect_equal(reduce_right(x, c), c(6, 5, 4, 3, 2, 1)) - expect_equal(reduce_right(x, c, .init = 7), c(7, 6, 5, 4, 3, 2, 1)) -}) - -test_that("reduce2_right still works", { - local_options(lifecycle_verbosity = "quiet") - - paste2 <- function(x, y, sep) paste(x, y, sep = sep) - x <- c("a", "b", "c") - expect_equal(reduce2_right(x, c("-", "."), paste2), "c.b-a") - expect_equal(reduce2_right(x, c(".", "-", "."), paste2, .init = "x"), "x.c-b.a") - - x <- list(c(0, 1), c(2, 3), c(4, 5)) - y <- list(c(6, 7), c(8, 9)) - expect_equal(reduce2_right(x, y, paste), c("4 2 8 0 6", "5 3 9 1 7")) -}) - -test_that("accumulate_right still works", { - local_options(lifecycle_verbosity = "quiet") - - tt <- c("a", "b", "c") - expect_equal(accumulate_right(tt, paste, sep = "."), c("c.b.a", "c.b", "c")) - - input <- set_names(1:26, letters) - expect_identical(accumulate_right(input, sum), set_names(rev(cumsum(rev(1:26))), rev(letters))) - - expect_identical(accumulate_right(0:1, c, .init = 2L), list(2:0, 2:1, 2L)) - expect_identical(accumulate_right(c(a = 0L, b = 1L), c, .init = 2L), list(b = 2:0, a = 2:1, .init = 2L)) -}) From 86616fdf750fddd963ed0d0c8d15337cff0118c7 Mon Sep 17 00:00:00 2001 From: Hadley Wickham Date: Fri, 27 Jun 2025 11:03:04 -0500 Subject: [PATCH 2/3] Add revdep checks --- revdep/README.md | 79 +- revdep/cran.md | 60 +- revdep/failures.md | 3296 ++++---------------------------------------- revdep/problems.md | 350 ++++- 4 files changed, 650 insertions(+), 3135 deletions(-) diff --git a/revdep/README.md b/revdep/README.md index 770d211f4..e84de10e9 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -1,65 +1,26 @@ # Revdeps -## Failed to check (51) +## Failed to check (11) -|package |version |error |warning |note | -|:----------------|:-------|:-----|:-------|:----| -|AovBay |0.1.0 |1 | | | -|arealDB |0.9.4 |1 | | | -|autoReg |? | | | | -|bayesCT |0.99.3 |1 | | | -|bspcov |1.0.1 |1 | | | -|censored |? | | | | -|CGPfunctions |0.6.3 |1 | | | -|CSCNet |? | | | | -|dartR.base |? | | | | -|dartR.popgen |? | | | | -|deeptrafo |? | | | | -|dibble |? | | | | -|DR.SC |3.4 |1 | | | -|epizootic |1.0.0 |1 | | | -|GeoTox |? | | | | -|GseaVis |? | | | | -|hettx |0.1.3 |1 | | | -|immcp |? | | | | -|invivoPKfit |2.0.0 |1 | | | -|jsmodule |? | | | | -|lnmixsurv |? | | | | -|lsirm12pl |1.3.3 |1 | | | -|MantaID |? | | | | -|metajam |0.3.1 |1 | | | -|miWQS |0.4.4 |1 | |1 | -|multinma |0.7.2 |1 | | | -|nesRdata |0.3.1 |1 | | | -|obliqueRSF |? | | | | -|ontologics |0.7.4 |1 | | | -|OVtool |1.0.3 |1 | | | -|pammtools |? | | | | -|pathwayTMB |? | | | | -|pencal |? | | | | -|quid |0.0.1 |1 | | | -|rdflib |0.2.9 |1 | | | -|rmlnomogram |? | | | | -|robber |? | | | | -|rplec |? | | | | -|RVA |? | | | | -|scCustomize |3.0.1 |1 | |1 | -|scpi |2.2.6 |1 | | | -|SCpubr |? | | | | -|SEERaBomb |2019.2 |1 | | | -|SensIAT |? | | | | -|SimplyAgree |0.2.0 |1 | | | -|ssdGSA |? | | | | -|SSHAARP |? | | | | -|stabiliser |1.0.6 |1 | | | -|tidyseurat |0.8.0 |1 | | | -|TriDimRegression |1.0.2 |1 | | | -|WRTDStidal |1.1.4 |1 | | | +|package |version |error |warning |note | +|:----------------|:-------|:------|:-------|:----| +|arealDB |0.9.4 |1 | | | +|dsTidyverse |? | | | | +|[kerastuneR](failures.md#kerastuner)|0.1.0.7 |__+1__ | | | +|metabolic |? | | | | +|metajam |0.3.1 |1 | | | +|nesRdata |0.3.1 |1 | | | +|ontologics |0.7.4 |1 | | | +|rdflib |0.2.9 |1 | | | +|[stoRy](failures.md#story)|0.2.2 |__+1__ | | | +|[tidyjson](failures.md#tidyjson)|0.3.2 |__+1__ | |-1 | +|TriDimRegression |1.0.2 |1 | | | -## New problems (2) +## New problems (3) -|package |version |error |warning |note | -|:--------|:-------|:------|:-------|:--------| -|[meta](problems.md#meta)|8.0-2 | | |1 __+1__ | -|[waywiser](problems.md#waywiser)|0.6.0 |__+1__ | |1 | +|package |version |error |warning |note | +|:--------|:-------|:------|:-------|:------| +|[CPAT](problems.md#cpat)|0.1.0 |__+1__ | |1 | +|[PopED](problems.md#poped)|0.7.0 | | |__+1__ | +|[quincunx](problems.md#quincunx)|0.1.10 |__+2__ | | | diff --git a/revdep/cran.md b/revdep/cran.md index aefac2fdb..795dbd37c 100644 --- a/revdep/cran.md +++ b/revdep/cran.md @@ -1,65 +1,35 @@ ## revdepcheck results -We checked 1943 reverse dependencies (1937 from CRAN + 6 from Bioconductor), comparing R CMD check results across CRAN and dev versions of this package. +We checked 2038 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. - * We saw 2 new problems - * We failed to check 45 packages + * We saw 3 new problems + * We failed to check 11 packages Issues with CRAN packages are summarised below. ### New problems (This reports the first line of each new failure) -* meta +* CPAT + checking tests ... ERROR + +* PopED checking installed package size ... NOTE -* waywiser - checking running R code from vignettes ... ERROR +* quincunx + checking examples ... ERROR + checking tests ... ERROR ### Failed to check -* AovBay (NA) * arealDB (NA) -* autoReg (NA) -* bayesCT (NA) -* bspcov (NA) -* censored (NA) -* CGPfunctions (NA) -* CSCNet (NA) -* dartR.base (NA) -* dartR.popgen (NA) -* deeptrafo (NA) -* DR.SC (NA) -* epizootic (NA) -* GseaVis (NA) -* hettx (NA) -* immcp (NA) -* invivoPKfit (NA) -* jsmodule (NA) -* lnmixsurv (NA) -* lsirm12pl (NA) +* dsTidyverse (NA) +* kerastuneR (NA) +* metabolic (NA) * metajam (NA) -* miWQS (NA) -* multinma (NA) * nesRdata (NA) -* obliqueRSF (NA) * ontologics (NA) -* OVtool (NA) -* pammtools (NA) -* pathwayTMB (NA) -* pencal (NA) -* quid (NA) * rdflib (NA) -* robber (NA) -* RVA (NA) -* scCustomize (NA) -* scpi (NA) -* SCpubr (NA) -* SEERaBomb (NA) -* SimplyAgree (NA) -* ssdGSA (NA) -* SSHAARP (NA) -* stabiliser (NA) -* tidyseurat (NA) +* stoRy (NA) +* tidyjson (NA) * TriDimRegression (NA) -* WRTDStidal (NA) diff --git a/revdep/failures.md b/revdep/failures.md index 9281836dc..29f319899 100644 --- a/revdep/failures.md +++ b/revdep/failures.md @@ -1,81 +1,3 @@ -# AovBay - -
- -* Version: 0.1.0 -* GitHub: NA -* Source code: https://github.com/cran/AovBay -* Date/Publication: 2021-07-22 06:30:02 UTC -* Number of recursive dependencies: 147 - -Run `revdepcheck::cloud_details(, "AovBay")` for more info - -
- -## In both - -* checking whether package ‘AovBay’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/AovBay/new/AovBay.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘AovBay’ ... -** package ‘AovBay’ 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, -... -** 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.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘AovBay’ -* removing ‘/tmp/workdir/AovBay/new/AovBay.Rcheck/AovBay’ - - -``` -### CRAN - -``` -* installing *source* package ‘AovBay’ ... -** package ‘AovBay’ 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, -... -** 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.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘AovBay’ -* removing ‘/tmp/workdir/AovBay/old/AovBay.Rcheck/AovBay’ - - -``` # arealDB
@@ -84,7 +6,7 @@ ERROR: lazy loading failed for package ‘AovBay’ * GitHub: https://github.com/luckinet/arealDB * Source code: https://github.com/cran/arealDB * Date/Publication: 2025-01-20 13:40:05 UTC -* Number of recursive dependencies: 110 +* Number of recursive dependencies: 109 Run `revdepcheck::cloud_details(, "arealDB")` for more info @@ -142,17 +64,17 @@ ERROR: lazy loading failed for package ‘arealDB’ ``` -# autoReg +# dsTidyverse
-* 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: 1.0.4 +* GitHub: NA +* Source code: https://github.com/cran/dsTidyverse +* Date/Publication: 2025-02-27 09:40:06 UTC +* Number of recursive dependencies: 46 -Run `revdepcheck::cloud_details(, "autoReg")` for more info +Run `revdepcheck::cloud_details(, "dsTidyverse")` for more info
@@ -161,27 +83,27 @@ Run `revdepcheck::cloud_details(, "autoReg")` for more info ### 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) +* using log directory ‘/tmp/workdir/dsTidyverse/new/dsTidyverse.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu * R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘autoReg/DESCRIPTION’ ... OK +* checking for file ‘dsTidyverse/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 +* checking for code/documentation mismatches ... OK +* checking Rd \usage sections ... OK +* checking Rd contents ... OK +* checking for unstated dependencies in examples ... OK +* checking examples ... NONE +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ * DONE -Status: OK +Status: 1 NOTE @@ -191,53 +113,53 @@ Status: OK ### 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) +* using log directory ‘/tmp/workdir/dsTidyverse/old/dsTidyverse.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu * R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘autoReg/DESCRIPTION’ ... OK +* checking for file ‘dsTidyverse/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 +* checking for code/documentation mismatches ... OK +* checking Rd \usage sections ... OK +* checking Rd contents ... OK +* checking for unstated dependencies in examples ... OK +* checking examples ... NONE +* checking for unstated dependencies in ‘tests’ ... OK +* checking tests ... OK + Running ‘testthat.R’ * DONE -Status: OK +Status: 1 NOTE ``` -# bayesCT +# kerastuneR
-* Version: 0.99.3 -* GitHub: https://github.com/thevaachandereng/bayesCT -* Source code: https://github.com/cran/bayesCT -* Date/Publication: 2020-07-01 09:30:02 UTC -* Number of recursive dependencies: 121 +* Version: 0.1.0.7 +* GitHub: https://github.com/EagerAI/kerastuneR +* Source code: https://github.com/cran/kerastuneR +* Date/Publication: 2024-04-13 13:20:02 UTC +* Number of recursive dependencies: 109 -Run `revdepcheck::cloud_details(, "bayesCT")` for more info +Run `revdepcheck::cloud_details(, "kerastuneR")` for more info
-## In both +## Newly broken -* checking whether package ‘bayesCT’ can be installed ... ERROR +* checking whether package ‘kerastuneR’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/bayesCT/new/bayesCT.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/kerastuneR/new/kerastuneR.Rcheck/00install.out’ for details. ``` ## Installation @@ -245,116 +167,50 @@ Run `revdepcheck::cloud_details(, "bayesCT")` for more info ### Devel ``` -* installing *source* package ‘bayesCT’ ... -** package ‘bayesCT’ successfully unpacked and MD5 sums checked +* installing *source* package ‘kerastuneR’ ... +** package ‘kerastuneR’ 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: object ‘at_depth’ is not exported by 'namespace:purrr' Execution halted -ERROR: lazy loading failed for package ‘bayesCT’ -* removing ‘/tmp/workdir/bayesCT/new/bayesCT.Rcheck/bayesCT’ +ERROR: lazy loading failed for package ‘kerastuneR’ +* removing ‘/tmp/workdir/kerastuneR/new/kerastuneR.Rcheck/kerastuneR’ ``` ### CRAN ``` -* installing *source* package ‘bayesCT’ ... -** package ‘bayesCT’ successfully unpacked and MD5 sums checked +* installing *source* package ‘kerastuneR’ ... +** package ‘kerastuneR’ successfully unpacked and MD5 sums checked ** using staged installation ** R -** data -*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘bayesCT’ -* removing ‘/tmp/workdir/bayesCT/old/bayesCT.Rcheck/bayesCT’ - - -``` -# bspcov - -
- -* 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 - -Run `revdepcheck::cloud_details(, "bspcov")` for more info - -
- -## In both - -* checking whether package ‘bspcov’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/bspcov/new/bspcov.Rcheck/00install.out’ for details. - ``` - -## Installation - -### 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’ +** 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 (kerastuneR) ``` -# censored +# metabolic
-* Version: 0.3.2 -* GitHub: https://github.com/tidymodels/censored -* Source code: https://github.com/cran/censored -* Date/Publication: 2024-06-11 18:10:02 UTC -* Number of recursive dependencies: 163 +* 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(, "censored")` for more info +Run `revdepcheck::cloud_details(, "metabolic")` for more info
@@ -363,27 +219,27 @@ Run `revdepcheck::cloud_details(, "censored")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/censored/new/censored.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) +* 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 + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘censored/DESCRIPTION’ ... OK +* checking for file ‘metabolic/DESCRIPTION’ ... OK ... -* this is package ‘censored’ version ‘0.3.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required and available but unsuitable version: ‘survival’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* 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 @@ -393,53 +249,53 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/censored/old/censored.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) +* 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 + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘censored/DESCRIPTION’ ... OK +* checking for file ‘metabolic/DESCRIPTION’ ... OK ... -* this is package ‘censored’ version ‘0.3.2’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required and available but unsuitable version: ‘survival’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. +* 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 ``` -# CGPfunctions +# metajam
-* 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 +* Version: 0.3.1 +* GitHub: https://github.com/NCEAS/metajam +* Source code: https://github.com/cran/metajam +* Date/Publication: 2024-08-16 17:50:02 UTC +* Number of recursive dependencies: 89 -Run `revdepcheck::cloud_details(, "CGPfunctions")` for more info +Run `revdepcheck::cloud_details(, "metajam")` for more info
## In both -* checking whether package ‘CGPfunctions’ can be installed ... ERROR +* checking whether package ‘metajam’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/CGPfunctions/new/CGPfunctions.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/metajam/new/metajam.Rcheck/00install.out’ for details. ``` ## Installation @@ -447,2517 +303,189 @@ Run `revdepcheck::cloud_details(, "CGPfunctions")` for more info ### Devel ``` -* installing *source* package ‘CGPfunctions’ ... -** package ‘CGPfunctions’ successfully unpacked and MD5 sums checked +* installing *source* package ‘metajam’ ... +** package ‘metajam’ 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 dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘CGPfunctions’ -* removing ‘/tmp/workdir/CGPfunctions/new/CGPfunctions.Rcheck/CGPfunctions’ +ERROR: lazy loading failed for package ‘metajam’ +* removing ‘/tmp/workdir/metajam/new/metajam.Rcheck/metajam’ ``` ### CRAN ``` -* installing *source* package ‘CGPfunctions’ ... -** package ‘CGPfunctions’ successfully unpacked and MD5 sums checked +* installing *source* package ‘metajam’ ... +** package ‘metajam’ 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 dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘CGPfunctions’ -* removing ‘/tmp/workdir/CGPfunctions/old/CGPfunctions.Rcheck/CGPfunctions’ +ERROR: lazy loading failed for package ‘metajam’ +* removing ‘/tmp/workdir/metajam/old/metajam.Rcheck/metajam’ ``` -# CSCNet +# nesRdata
-* Version: 0.1.2 -* GitHub: NA -* Source code: https://github.com/cran/CSCNet -* Date/Publication: 2022-11-08 18:50:02 UTC -* Number of recursive dependencies: 171 +* Version: 0.3.1 +* GitHub: https://github.com/jsta/nesRdata +* Source code: https://github.com/cran/nesRdata +* Date/Publication: 2020-04-30 17:20:02 UTC +* Number of recursive dependencies: 65 -Run `revdepcheck::cloud_details(, "CSCNet")` for more info +Run `revdepcheck::cloud_details(, "nesRdata")` for more info
-## Error before installation - -### Devel +## In both -``` -* using log directory ‘/tmp/workdir/CSCNet/new/CSCNet.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘CSCNet/DESCRIPTION’ ... OK -... -* this is package ‘CSCNet’ version ‘0.1.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 +* checking whether package ‘nesRdata’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/nesRdata/new/nesRdata.Rcheck/00install.out’ for details. + ``` +## Installation +### Devel +``` +* installing *source* package ‘nesRdata’ ... +** package ‘nesRdata’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘nesRdata’ +* removing ‘/tmp/workdir/nesRdata/new/nesRdata.Rcheck/nesRdata’ ``` ### CRAN ``` -* using log directory ‘/tmp/workdir/CSCNet/old/CSCNet.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘CSCNet/DESCRIPTION’ ... OK -... -* this is package ‘CSCNet’ version ‘0.1.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 - - - +* installing *source* package ‘nesRdata’ ... +** package ‘nesRdata’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** data +*** moving datasets to lazyload DB +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘nesRdata’ +* removing ‘/tmp/workdir/nesRdata/old/nesRdata.Rcheck/nesRdata’ ``` -# dartR.base +# ontologics
-* 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 +* Version: 0.7.4 +* GitHub: https://github.com/luckinet/ontologics +* Source code: https://github.com/cran/ontologics +* Date/Publication: 2025-01-17 16:50:02 UTC +* Number of recursive dependencies: 79 -Run `revdepcheck::cloud_details(, "dartR.base")` for more info +Run `revdepcheck::cloud_details(, "ontologics")` for more info
-## Error before installation - -### Devel +## In both -``` -* 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 +* checking whether package ‘ontologics’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/00install.out’ for details. + ``` +## Installation +### Devel +``` +* installing *source* package ‘ontologics’ ... +** package ‘ontologics’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘ontologics’ +* removing ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/ontologics’ ``` ### 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.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 - - - - - -``` -# deeptrafo - -
- -* Version: 1.0-0 -* GitHub: https://github.com/neural-structured-additive-learning/deeptrafo -* Source code: https://github.com/cran/deeptrafo -* Date/Publication: 2024-12-03 18:40:02 UTC -* Number of recursive dependencies: 109 - -Run `revdepcheck::cloud_details(, "deeptrafo")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/deeptrafo/new/deeptrafo.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘deeptrafo/DESCRIPTION’ ... OK -... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘mlt’ - -Packages suggested but not available for checking: 'tram', 'cotram' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/deeptrafo/old/deeptrafo.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘deeptrafo/DESCRIPTION’ ... OK -... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘mlt’ - -Packages suggested but not available for checking: 'tram', 'cotram' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# dibble - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/dibble -* Number of recursive dependencies: 51 - -Run `revdepcheck::cloud_details(, "dibble")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# 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’ - - -``` -# epizootic - -
- -* Version: 1.0.0 -* GitHub: https://github.com/viralemergence/epizootic -* Source code: https://github.com/cran/epizootic -* Date/Publication: 2024-10-02 13:10:05 UTC -* Number of recursive dependencies: 93 - -Run `revdepcheck::cloud_details(, "epizootic")` for more info - -
- -## In both - -* checking whether package ‘epizootic’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/epizootic/new/epizootic.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘epizootic’ ... -** package ‘epizootic’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c aspatial_siri.cpp -o aspatial_siri.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o epizootic.so RcppExports.o aspatial_siri.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/epizootic/new/epizootic.Rcheck/00LOCK-epizootic/00new/epizootic/libs -** R -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘epizootic’ -* removing ‘/tmp/workdir/epizootic/new/epizootic.Rcheck/epizootic’ - - -``` -### CRAN - -``` -* installing *source* package ‘epizootic’ ... -** package ‘epizootic’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c aspatial_siri.cpp -o aspatial_siri.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o epizootic.so RcppExports.o aspatial_siri.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/epizootic/old/epizootic.Rcheck/00LOCK-epizootic/00new/epizootic/libs -** R -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘epizootic’ -* removing ‘/tmp/workdir/epizootic/old/epizootic.Rcheck/epizootic’ - - -``` -# 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 - -``` - - - - - - -``` -# 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’ - - -``` -# 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 - - - - - -``` -# 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’ - - -``` -# 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 - - - - - -``` -# lnmixsurv - -
- -* Version: 3.1.6 -* GitHub: NA -* Source code: https://github.com/cran/lnmixsurv -* Date/Publication: 2024-09-03 15:20:08 UTC -* Number of recursive dependencies: 195 - -Run `revdepcheck::cloud_details(, "lnmixsurv")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/lnmixsurv/new/lnmixsurv.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘lnmixsurv/DESCRIPTION’ ... OK -... -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘compare.Rmd’ using ‘UTF-8’... OK - ‘expectation_maximization.Rmd’ using ‘UTF-8’... OK - ‘intercept_only.Rmd’ using ‘UTF-8’... OK - ‘lnmixsurv.Rmd’ using ‘UTF-8’... OK - ‘parallel_computation.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 4 NOTEs - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/lnmixsurv/old/lnmixsurv.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘lnmixsurv/DESCRIPTION’ ... OK -... -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘compare.Rmd’ using ‘UTF-8’... OK - ‘expectation_maximization.Rmd’ using ‘UTF-8’... OK - ‘intercept_only.Rmd’ using ‘UTF-8’... OK - ‘lnmixsurv.Rmd’ using ‘UTF-8’... OK - ‘parallel_computation.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 4 NOTEs - - - - - -``` -# 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 - -``` - - - - - - -``` -# metajam - -
- -* Version: 0.3.1 -* GitHub: https://github.com/NCEAS/metajam -* Source code: https://github.com/cran/metajam -* Date/Publication: 2024-08-16 17:50:02 UTC -* Number of recursive dependencies: 90 - -Run `revdepcheck::cloud_details(, "metajam")` for more info - -
- -## In both - -* checking whether package ‘metajam’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/metajam/new/metajam.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘metajam’ ... -** package ‘metajam’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘metajam’ -* removing ‘/tmp/workdir/metajam/new/metajam.Rcheck/metajam’ - - -``` -### CRAN - -``` -* installing *source* package ‘metajam’ ... -** package ‘metajam’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘metajam’ -* removing ‘/tmp/workdir/metajam/old/metajam.Rcheck/metajam’ - - -``` -# 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’ - - -``` -# 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’ - - -``` -# nesRdata - -
- -* Version: 0.3.1 -* GitHub: https://github.com/jsta/nesRdata -* Source code: https://github.com/cran/nesRdata -* Date/Publication: 2020-04-30 17:20:02 UTC -* Number of recursive dependencies: 66 - -Run `revdepcheck::cloud_details(, "nesRdata")` for more info - -
- -## In both - -* checking whether package ‘nesRdata’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/nesRdata/new/nesRdata.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘nesRdata’ ... -** package ‘nesRdata’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘nesRdata’ -* removing ‘/tmp/workdir/nesRdata/new/nesRdata.Rcheck/nesRdata’ - - -``` -### CRAN - -``` -* installing *source* package ‘nesRdata’ ... -** package ‘nesRdata’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘nesRdata’ -* removing ‘/tmp/workdir/nesRdata/old/nesRdata.Rcheck/nesRdata’ - - -``` -# 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 - - - - - -``` -# ontologics - -
- -* Version: 0.7.4 -* GitHub: https://github.com/luckinet/ontologics -* Source code: https://github.com/cran/ontologics -* Date/Publication: 2025-01-17 16:50:02 UTC -* Number of recursive dependencies: 80 - -Run `revdepcheck::cloud_details(, "ontologics")` for more info - -
- -## In both - -* checking whether package ‘ontologics’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘ontologics’ ... -** package ‘ontologics’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘ontologics’ -* removing ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/ontologics’ - - -``` -### CRAN - -``` -* installing *source* package ‘ontologics’ ... -** package ‘ontologics’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘ontologics’ -* removing ‘/tmp/workdir/ontologics/old/ontologics.Rcheck/ontologics’ - - -``` -# 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 - - - - - -``` -# pathwayTMB - -
- -* Version: 0.1.3 -* GitHub: NA -* Source code: https://github.com/cran/pathwayTMB -* Date/Publication: 2022-08-09 13:50:02 UTC -* Number of recursive dependencies: 226 - -Run `revdepcheck::cloud_details(, "pathwayTMB")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/pathwayTMB/new/pathwayTMB.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘pathwayTMB/DESCRIPTION’ ... OK -... -* this is package ‘pathwayTMB’ version ‘0.1.3’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘clusterProfiler’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/pathwayTMB/old/pathwayTMB.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘pathwayTMB/DESCRIPTION’ ... OK -... -* this is package ‘pathwayTMB’ version ‘0.1.3’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘clusterProfiler’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# pencal - -
- -* Version: 2.2.2 -* GitHub: NA -* Source code: https://github.com/cran/pencal -* Date/Publication: 2024-06-12 11:10:02 UTC -* Number of recursive dependencies: 174 - -Run `revdepcheck::cloud_details(, "pencal")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/pencal/new/pencal.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘pencal/DESCRIPTION’ ... OK -... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘riskRegression’ - -Package suggested but not available for checking: ‘ptmixed’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/pencal/old/pencal.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘pencal/DESCRIPTION’ ... OK -... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘riskRegression’ - -Package suggested but not available for checking: ‘ptmixed’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# 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’ - - -``` -# rdflib - -
- -* Version: 0.2.9 -* GitHub: https://github.com/ropensci/rdflib -* Source code: https://github.com/cran/rdflib -* Date/Publication: 2024-08-17 06:00:05 UTC -* Number of recursive dependencies: 93 - -Run `revdepcheck::cloud_details(, "rdflib")` for more info - -
- -## In both - -* checking whether package ‘rdflib’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/rdflib/new/rdflib.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘rdflib’ ... -** package ‘rdflib’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘rdflib’ -* removing ‘/tmp/workdir/rdflib/new/rdflib.Rcheck/rdflib’ - - -``` -### CRAN - -``` -* installing *source* package ‘rdflib’ ... -** package ‘rdflib’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘rdflib’ -* removing ‘/tmp/workdir/rdflib/old/rdflib.Rcheck/rdflib’ - - -``` -# 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 - -``` - - - - - - -``` -# 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 - - - - - -``` -# rplec - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/rplec -* Number of recursive dependencies: 122 - -Run `revdepcheck::cloud_details(, "rplec")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# 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 - - - - - -``` -# 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’ - - -``` -# 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 - - - - - -``` -# 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 +* installing *source* package ‘ontologics’ ... +** package ‘ontologics’ 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 +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘SEERaBomb’ -* removing ‘/tmp/workdir/SEERaBomb/old/SEERaBomb.Rcheck/SEERaBomb’ - - -``` -# SensIAT - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/SensIAT -* Number of recursive dependencies: 60 - -Run `revdepcheck::cloud_details(, "SensIAT")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - +ERROR: lazy loading failed for package ‘ontologics’ +* removing ‘/tmp/workdir/ontologics/old/ontologics.Rcheck/ontologics’ ``` -# SimplyAgree +# rdflib
-* 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 +* Version: 0.2.9 +* GitHub: https://github.com/ropensci/rdflib +* Source code: https://github.com/cran/rdflib +* Date/Publication: 2024-08-17 06:00:05 UTC +* Number of recursive dependencies: 92 -Run `revdepcheck::cloud_details(, "SimplyAgree")` for more info +Run `revdepcheck::cloud_details(, "rdflib")` for more info
## In both -* checking whether package ‘SimplyAgree’ can be installed ... ERROR +* checking whether package ‘rdflib’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/SimplyAgree/new/SimplyAgree.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/rdflib/new/rdflib.Rcheck/00install.out’ for details. ``` ## Installation @@ -2965,225 +493,61 @@ Run `revdepcheck::cloud_details(, "SimplyAgree")` for more info ### Devel ``` -* installing *source* package ‘SimplyAgree’ ... -** package ‘SimplyAgree’ successfully unpacked and MD5 sums checked +* installing *source* package ‘rdflib’ ... +** package ‘rdflib’ 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 +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘SimplyAgree’ -* removing ‘/tmp/workdir/SimplyAgree/new/SimplyAgree.Rcheck/SimplyAgree’ +ERROR: lazy loading failed for package ‘rdflib’ +* removing ‘/tmp/workdir/rdflib/new/rdflib.Rcheck/rdflib’ ``` ### CRAN ``` -* installing *source* package ‘SimplyAgree’ ... -** package ‘SimplyAgree’ successfully unpacked and MD5 sums checked +* installing *source* package ‘rdflib’ ... +** package ‘rdflib’ 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 +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘SimplyAgree’ -* removing ‘/tmp/workdir/SimplyAgree/old/SimplyAgree.Rcheck/SimplyAgree’ - - -``` -# ssdGSA - -
- -* Version: 0.1.1 -* GitHub: NA -* Source code: https://github.com/cran/ssdGSA -* Date/Publication: 2024-07-26 23:10:02 UTC -* Number of recursive dependencies: 174 - -Run `revdepcheck::cloud_details(, "ssdGSA")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/ssdGSA/new/ssdGSA.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘ssdGSA/DESCRIPTION’ ... OK -... -* this is package ‘ssdGSA’ version ‘0.1.1’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘clusterProfiler’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/ssdGSA/old/ssdGSA.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘ssdGSA/DESCRIPTION’ ... OK -... -* this is package ‘ssdGSA’ version ‘0.1.1’ -* package encoding: UTF-8 -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘clusterProfiler’ - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -# SSHAARP - -
- -* Version: 2.0.5 -* GitHub: NA -* Source code: https://github.com/cran/SSHAARP -* Date/Publication: 2024-12-11 07:50:06 UTC -* Number of recursive dependencies: 123 - -Run `revdepcheck::cloud_details(, "SSHAARP")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/SSHAARP/new/SSHAARP.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘SSHAARP/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 - ‘vignette.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: OK - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/SSHAARP/old/SSHAARP.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘SSHAARP/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 - ‘vignette.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: OK - - - +ERROR: lazy loading failed for package ‘rdflib’ +* removing ‘/tmp/workdir/rdflib/old/rdflib.Rcheck/rdflib’ ``` -# stabiliser +# stoRy
-* 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 +* Version: 0.2.2 +* GitHub: https://github.com/theme-ontology/stoRy +* Source code: https://github.com/cran/stoRy +* Date/Publication: 2023-06-13 23:10:02 UTC +* Number of recursive dependencies: 76 -Run `revdepcheck::cloud_details(, "stabiliser")` for more info +Run `revdepcheck::cloud_details(, "stoRy")` for more info
-## In both +## Newly broken -* checking whether package ‘stabiliser’ can be installed ... ERROR +* checking whether package ‘stoRy’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/stabiliser/new/stabiliser.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/stoRy/new/stoRy.Rcheck/00install.out’ for details. ``` ## Installation @@ -3191,63 +555,77 @@ Run `revdepcheck::cloud_details(, "stabiliser")` for more info ### Devel ``` -* installing *source* package ‘stabiliser’ ... -** package ‘stabiliser’ successfully unpacked and MD5 sums checked +* installing *source* package ‘stoRy’ ... +** package ‘stoRy’ successfully unpacked and MD5 sums checked ** using staged installation ** R -** data -*** moving datasets to lazyload DB +Warning: namespace ‘stoRy’ is not available and has been replaced +by .GlobalEnv when processing object ‘background_collection’ ** 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: object ‘at_depth’ is not exported by 'namespace:purrr' Execution halted -ERROR: lazy loading failed for package ‘stabiliser’ -* removing ‘/tmp/workdir/stabiliser/new/stabiliser.Rcheck/stabiliser’ +ERROR: lazy loading failed for package ‘stoRy’ +* removing ‘/tmp/workdir/stoRy/new/stoRy.Rcheck/stoRy’ ``` ### CRAN ``` -* installing *source* package ‘stabiliser’ ... -** package ‘stabiliser’ successfully unpacked and MD5 sums checked +* installing *source* package ‘stoRy’ ... +** package ‘stoRy’ successfully unpacked and MD5 sums checked ** using staged installation ** R -** data -*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading -Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : - there is no package called ‘maditr’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘stabiliser’ -* removing ‘/tmp/workdir/stabiliser/old/stabiliser.Rcheck/stabiliser’ +** 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 (stoRy) ``` -# tidyseurat +# tidyjson
-* 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: 0.3.2 +* GitHub: https://github.com/colearendt/tidyjson +* Source code: https://github.com/cran/tidyjson +* Date/Publication: 2023-01-07 00:20:02 UTC +* Number of recursive dependencies: 93 -Run `revdepcheck::cloud_details(, "tidyseurat")` for more info +Run `revdepcheck::cloud_details(, "tidyjson")` for more info
-## In both +## Newly broken -* checking whether package ‘tidyseurat’ can be installed ... ERROR +* checking whether package ‘tidyjson’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/tidyseurat/new/tidyseurat.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/tidyjson/new/tidyjson.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking Rd files ... NOTE + ``` + checkRd: (-1) json_schema.Rd:33: Lost braces; missing escapes or markup? + 33 | \item object -> {"name": } e.g., {"age": 32} -> {"age": "number"} + | ^ + checkRd: (-1) json_schema.Rd:33: Lost braces; missing escapes or markup? + 33 | \item object -> {"name": } e.g., {"age": 32} -> {"age": "number"} + | ^ + checkRd: (-1) json_schema.Rd:33: Lost braces; missing escapes or markup? + 33 | \item object -> {"name": } e.g., {"age": 32} -> {"age": "number"} + | ^ ``` ## Installation @@ -3255,38 +633,40 @@ Run `revdepcheck::cloud_details(, "tidyseurat")` for more info ### Devel ``` -* installing *source* package ‘tidyseurat’ ... -** package ‘tidyseurat’ successfully unpacked and MD5 sums checked +* installing *source* package ‘tidyjson’ ... +** package ‘tidyjson’ 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 +Error: object ‘at_depth’ is not exported by 'namespace:purrr' Execution halted -ERROR: lazy loading failed for package ‘tidyseurat’ -* removing ‘/tmp/workdir/tidyseurat/new/tidyseurat.Rcheck/tidyseurat’ +ERROR: lazy loading failed for package ‘tidyjson’ +* removing ‘/tmp/workdir/tidyjson/new/tidyjson.Rcheck/tidyjson’ ``` ### CRAN ``` -* installing *source* package ‘tidyseurat’ ... -** package ‘tidyseurat’ successfully unpacked and MD5 sums checked +* installing *source* package ‘tidyjson’ ... +** package ‘tidyjson’ 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’ +** 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 (tidyjson) ``` @@ -3298,7 +678,7 @@ ERROR: lazy loading failed for package ‘tidyseurat’ * 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 +* Number of recursive dependencies: 95 Run `revdepcheck::cloud_details(, "TriDimRegression")` for more info @@ -3341,68 +721,4 @@ ERROR: configuration failed for package ‘TriDimRegression’ * removing ‘/tmp/workdir/TriDimRegression/old/TriDimRegression.Rcheck/TriDimRegression’ -``` -# 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: 139 - -Run `revdepcheck::cloud_details(, "WRTDStidal")` for more info - -
- -## In both - -* checking whether package ‘WRTDStidal’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/WRTDStidal/new/WRTDStidal.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘WRTDStidal’ ... -** package ‘WRTDStidal’ 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/new/WRTDStidal.Rcheck/WRTDStidal’ - - -``` -### CRAN - -``` -* installing *source* package ‘WRTDStidal’ ... -** package ‘WRTDStidal’ 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’ - - ``` diff --git a/revdep/problems.md b/revdep/problems.md index e12d244cb..083f6277f 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -1,75 +1,343 @@ -# meta +# CPAT
-* Version: 8.0-2 -* GitHub: https://github.com/guido-s/meta -* Source code: https://github.com/cran/meta -* Date/Publication: 2025-01-21 19:20:02 UTC -* Number of recursive dependencies: 96 +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/CPAT +* Date/Publication: 2018-12-25 22:40:08 UTC +* Number of recursive dependencies: 63 -Run `revdepcheck::cloud_details(, "meta")` for more info +Run `revdepcheck::cloud_details(, "CPAT")` for more info
## Newly broken -* checking installed package size ... NOTE +* checking tests ... ERROR ``` - installed size is 5.6Mb - sub-directories of 1Mb or more: - R 3.5Mb - help 1.5Mb + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(CPAT) + Package 'CPAT' version 0.1.0 + Type citation("CPAT") for citing this R package in publications + > + > test_check("CPAT") + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 97 ] + ... + 1. ├─testthat::expect_equal(...) at test-TestStatisticsFunctions.R:152:3 + 2. │ └─testthat::quasi_label(enquo(object), label, arg = "object") + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. └─CPAT:::stat_hs(...) + 5. └─base::vapply(1:length(dat), custom_var, FUN.VALUE = numeric(1)) + 6. └─CPAT (local) FUN(X[[i]], ...) + + [ FAIL 4 | WARN 0 | SKIP 0 | PASS 97 ] + Error: Test failures + Execution halted ``` ## In both -* checking Rd cross-references ... NOTE +* checking dependencies in R code ... NOTE + ``` + Namespaces in Imports field not imported from: + ‘Rdpack’ ‘grDevices’ + All declared Imports should be used. + ``` + +# kerastuneR + +
+ +* Version: 0.1.0.7 +* GitHub: https://github.com/EagerAI/kerastuneR +* Source code: https://github.com/cran/kerastuneR +* Date/Publication: 2024-04-13 13:20:02 UTC +* Number of recursive dependencies: 109 + +Run `revdepcheck::cloud_details(, "kerastuneR")` for more info + +
+ +## Newly broken + +* checking whether package ‘kerastuneR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/kerastuneR/new/kerastuneR.Rcheck/00install.out’ for details. + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘kerastuneR’ ... +** package ‘kerastuneR’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error: object ‘at_depth’ is not exported by 'namespace:purrr' +Execution halted +ERROR: lazy loading failed for package ‘kerastuneR’ +* removing ‘/tmp/workdir/kerastuneR/new/kerastuneR.Rcheck/kerastuneR’ + + +``` +### CRAN + +``` +* installing *source* package ‘kerastuneR’ ... +** package ‘kerastuneR’ 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 (kerastuneR) + + +``` +# PopED + +
+ +* Version: 0.7.0 +* GitHub: https://github.com/andrewhooker/PopED +* Source code: https://github.com/cran/PopED +* Date/Publication: 2024-10-07 19:30:02 UTC +* Number of recursive dependencies: 139 + +Run `revdepcheck::cloud_details(, "PopED")` for more info + +
+ +## Newly broken + +* checking installed package size ... NOTE ``` - Packages unavailable to check Rd xrefs: ‘metasens’, ‘robumeta’ + installed size is 5.5Mb + sub-directories of 1Mb or more: + R 1.5Mb + doc 1.4Mb + test 1.1Mb ``` -# waywiser +# quincunx
-* Version: 0.6.0 -* GitHub: https://github.com/ropensci/waywiser -* Source code: https://github.com/cran/waywiser -* Date/Publication: 2024-06-27 19:10:03 UTC -* Number of recursive dependencies: 172 +* Version: 0.1.10 +* GitHub: https://github.com/ramiromagno/quincunx +* Source code: https://github.com/cran/quincunx +* Date/Publication: 2025-05-31 17:10:02 UTC +* Number of recursive dependencies: 89 -Run `revdepcheck::cloud_details(, "waywiser")` for more info +Run `revdepcheck::cloud_details(, "quincunx")` for more info
## Newly broken -* checking running R code from vignettes ... ERROR - ``` - Errors in running code in vignettes: - when running code in ‘multi-scale-assessment.Rmd’ - ... - | - |================= | 25% - | - |================== | 25%Warning in unzip(file_loc, exdir = tmp) : - error 1 in extracting from zip file - Cannot open layer tl_2022_us_county +* checking examples ... ERROR + ``` + Running examples in ‘quincunx-Ex.R’ failed + The error most likely occurred in: - When sourcing ‘multi-scale-assessment.R’: - Error: Opening layer failed. + > ### Name: get_cohorts + > ### Title: Get PGS Catalog Cohorts + > ### Aliases: get_cohorts + > + > ### ** Examples + > + > # Get information about specific cohorts by their symbols (acronyms) + ... + 18. │ └─quincunx:::count(json_string) + 19. ├─base::loadNamespace(x) + 20. │ └─base::namespaceImportFrom(...) + 21. │ └─base::importIntoEnv(impenv, impnames, ns, impvars) + 22. │ └─base::stop(...) + 23. └─base::.handleSimpleError(...) + 24. └─purrr (local) h(simpleError(msg, call)) + 25. └─cli::cli_abort(...) + 26. └─rlang::abort(...) Execution halted - - ‘multi-scale-assessment.Rmd’ using ‘UTF-8’... failed - ‘residual-autocorrelation.Rmd’ using ‘UTF-8’... OK - ‘waywiser.Rmd’ using ‘UTF-8’... OK ``` -## In both +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > library(testthat) + > library(quincunx) + > + > test_check("quincunx") + [ FAIL 5 | WARN 0 | SKIP 0 | PASS 12 ] + + ══ Failed tests ════════════════════════════════════════════════════════════════ + ... + 3. │ └─rlang::eval_bare(expr, quo_get_env(quo)) + 4. ├─quincunx:::is_paginated(txt) + 5. │ └─quincunx:::count(json_string) + 6. └─base::loadNamespace(x) + 7. └─base::namespaceImportFrom(...) + 8. └─base::importIntoEnv(impenv, impnames, ns, impvars) + + [ FAIL 5 | WARN 0 | SKIP 0 | PASS 12 ] + Error: Test failures + Execution halted + ``` -* checking data for non-ASCII characters ... NOTE +# stoRy + +
+ +* Version: 0.2.2 +* GitHub: https://github.com/theme-ontology/stoRy +* Source code: https://github.com/cran/stoRy +* Date/Publication: 2023-06-13 23:10:02 UTC +* Number of recursive dependencies: 76 + +Run `revdepcheck::cloud_details(, "stoRy")` for more info + +
+ +## Newly broken + +* checking whether package ‘stoRy’ can be installed ... ERROR ``` - Note: found 1 marked UTF-8 string + Installation failed. + See ‘/tmp/workdir/stoRy/new/stoRy.Rcheck/00install.out’ for details. ``` +## Installation + +### Devel + +``` +* installing *source* package ‘stoRy’ ... +** package ‘stoRy’ successfully unpacked and MD5 sums checked +** using staged installation +** R +Warning: namespace ‘stoRy’ is not available and has been replaced +by .GlobalEnv when processing object ‘background_collection’ +** inst +** byte-compile and prepare package for lazy loading +Error: object ‘at_depth’ is not exported by 'namespace:purrr' +Execution halted +ERROR: lazy loading failed for package ‘stoRy’ +* removing ‘/tmp/workdir/stoRy/new/stoRy.Rcheck/stoRy’ + + +``` +### CRAN + +``` +* installing *source* package ‘stoRy’ ... +** package ‘stoRy’ 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 (stoRy) + + +``` +# tidyjson + +
+ +* Version: 0.3.2 +* GitHub: https://github.com/colearendt/tidyjson +* Source code: https://github.com/cran/tidyjson +* Date/Publication: 2023-01-07 00:20:02 UTC +* Number of recursive dependencies: 93 + +Run `revdepcheck::cloud_details(, "tidyjson")` for more info + +
+ +## Newly broken + +* checking whether package ‘tidyjson’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/tidyjson/new/tidyjson.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking Rd files ... NOTE + ``` + checkRd: (-1) json_schema.Rd:33: Lost braces; missing escapes or markup? + 33 | \item object -> {"name": } e.g., {"age": 32} -> {"age": "number"} + | ^ + checkRd: (-1) json_schema.Rd:33: Lost braces; missing escapes or markup? + 33 | \item object -> {"name": } e.g., {"age": 32} -> {"age": "number"} + | ^ + checkRd: (-1) json_schema.Rd:33: Lost braces; missing escapes or markup? + 33 | \item object -> {"name": } e.g., {"age": 32} -> {"age": "number"} + | ^ + ``` + +## Installation + +### Devel + +``` +* installing *source* package ‘tidyjson’ ... +** package ‘tidyjson’ 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 ‘at_depth’ is not exported by 'namespace:purrr' +Execution halted +ERROR: lazy loading failed for package ‘tidyjson’ +* removing ‘/tmp/workdir/tidyjson/new/tidyjson.Rcheck/tidyjson’ + + +``` +### CRAN + +``` +* installing *source* package ‘tidyjson’ ... +** package ‘tidyjson’ 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 (tidyjson) + + +``` From 57e432fed90487c11e477b14b841c22c7ee7ce07 Mon Sep 17 00:00:00 2001 From: Hadley Wickham Date: Fri, 22 Aug 2025 07:21:53 +1200 Subject: [PATCH 3/3] Re-run revdeps --- revdep/README.md | 27 +- revdep/cran.md | 57 +- revdep/failures.md | 2269 ++++++++++---------------------------------- revdep/problems.md | 367 ++++++- 4 files changed, 906 insertions(+), 1814 deletions(-) diff --git a/revdep/README.md b/revdep/README.md index a69959801..19261ee97 100644 --- a/revdep/README.md +++ b/revdep/README.md @@ -1,25 +1,36 @@ # Revdeps -## Failed to check (11) +## Failed to check (15) |package |version |error |warning |note | |:----------------|:-------|:------|:-------|:----| +|apa |? | | | | |arealDB |0.9.4 |1 | | | |dsTidyverse |? | | | | |[kerastuneR](failures.md#kerastuner)|0.1.0.7 |__+1__ | | | -|metabolic |? | | | | |metajam |0.3.1 |1 | | | |nesRdata |0.3.1 |1 | | | |ontologics |0.7.4 |1 | | | |rdflib |0.2.9 |1 | | | +|sprtt |? | | | | |[stoRy](failures.md#story)|0.2.2 |__+1__ | | | +|Surrogate |? | | | | +|tidybins |? | | | | +|tidycomm |? | | | | |[tidyjson](failures.md#tidyjson)|0.3.2 |__+1__ | |-1 | |TriDimRegression |1.0.2 |1 | | | -## New problems (3) +## New problems (9) + +|package |version |error |warning |note | +|:----------------------|:-------|:---------|:-------|:--------| +|[admiral](problems.md#admiral)|1.3.1 | | |1 __+1__ | +|[CohortCharacteristics](problems.md#cohortcharacteristics)|1.0.0 |__+1__ | |2 | +|[CPAT](problems.md#cpat)|0.1.0 |__+1__ | |1 | +|[MeasurementDiagnostics](problems.md#measurementdiagnostics)|0.1.0 |__+1__ | | | +|[omock](problems.md#omock)|0.4.0 |1 __+1__ | | | +|[OmopSketch](problems.md#omopsketch)|0.5.1 |__+2__ | |1 | +|[PatientProfiles](problems.md#patientprofiles)|1.4.2 |__+1__ | | | +|[quincunx](problems.md#quincunx)|0.1.10 |__+2__ | | | +|[wbids](problems.md#wbids)|1.0.0 |-1 __+1__ | |1 | -|package |version |error |warning |note | -|:--------|:-------|:------|:-------|:------| -|[CPAT](problems.md#cpat)|0.1.0 |__+1__ | |1 | -|[PopED](problems.md#poped)|0.7.0 | | |__+1__ | -|[quincunx](problems.md#quincunx)|0.1.10 |__+2__ | | | diff --git a/revdep/cran.md b/revdep/cran.md index fcfe15d6e..58096233b 100644 --- a/revdep/cran.md +++ b/revdep/cran.md @@ -1,3 +1,58 @@ ## revdepcheck results -We checked 2042 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. We did not see any news, although we did fail to check 9 packages. +We checked 2081 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package. + + * We saw 9 new problems + * We failed to check 15 packages + +Issues with CRAN packages are summarised below. + +### New problems +(This reports the first line of each new failure) + +* admiral + checking installed package size ... NOTE + +* CohortCharacteristics + checking re-building of vignette outputs ... ERROR + +* CPAT + checking tests ... ERROR + +* MeasurementDiagnostics + checking re-building of vignette outputs ... ERROR + +* omock + checking examples ... ERROR + +* OmopSketch + checking tests ... ERROR + checking re-building of vignette outputs ... ERROR + +* PatientProfiles + checking re-building of vignette outputs ... ERROR + +* quincunx + checking examples ... ERROR + checking tests ... ERROR + +* wbids + checking examples ... ERROR + +### Failed to check + +* apa (NA) +* arealDB (NA) +* dsTidyverse (NA) +* kerastuneR (NA) +* metajam (NA) +* nesRdata (NA) +* ontologics (NA) +* rdflib (NA) +* sprtt (NA) +* stoRy (NA) +* Surrogate (NA) +* tidybins (NA) +* tidycomm (NA) +* tidyjson (NA) +* TriDimRegression (NA) diff --git a/revdep/failures.md b/revdep/failures.md index 31baa75a4..6a123a416 100644 --- a/revdep/failures.md +++ b/revdep/failures.md @@ -1,80 +1,14 @@ -# arealDB - -
- -* Version: 0.9.4 -* GitHub: https://github.com/luckinet/arealDB -* Source code: https://github.com/cran/arealDB -* Date/Publication: 2025-01-20 13:40:05 UTC -* Number of recursive dependencies: 109 - -Run `revdepcheck::cloud_details(, "arealDB")` for more info - -
- -## In both - -* checking whether package ‘arealDB’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/arealDB/new/arealDB.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘arealDB’ ... -** package ‘arealDB’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘arealDB’ -* removing ‘/tmp/workdir/arealDB/new/arealDB.Rcheck/arealDB’ - - -``` -### CRAN - -``` -* installing *source* package ‘arealDB’ ... -** package ‘arealDB’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘arealDB’ -* removing ‘/tmp/workdir/arealDB/old/arealDB.Rcheck/arealDB’ - - -``` -# dsTidyverse +# apa
-* Version: 1.0.4 -* GitHub: NA -* Source code: https://github.com/cran/dsTidyverse -* Date/Publication: 2025-02-27 09:40:06 UTC -* Number of recursive dependencies: 46 +* Version: 0.3.4 +* GitHub: https://github.com/dgromer/apa +* Source code: https://github.com/cran/apa +* Date/Publication: 2023-10-06 15:00:02 UTC +* Number of recursive dependencies: 115 -Run `revdepcheck::cloud_details(, "dsTidyverse")` for more info +Run `revdepcheck::cloud_details(, "apa")` for more info
@@ -83,7 +17,7 @@ Run `revdepcheck::cloud_details(, "dsTidyverse")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/dsTidyverse/new/dsTidyverse.Rcheck’ +* using log directory ‘/tmp/workdir/apa/new/apa.Rcheck’ * using R version 4.4.0 (2024-04-24) * using platform: x86_64-pc-linux-gnu * R was compiled by @@ -92,1259 +26,74 @@ Run `revdepcheck::cloud_details(, "dsTidyverse")` for more info * running under: Ubuntu 24.04.2 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘CSCNet/DESCRIPTION’ ... OK -... -* this is package ‘CSCNet’ version ‘0.1.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/CSCNet/old/CSCNet.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘CSCNet/DESCRIPTION’ ... OK -... -* this is package ‘CSCNet’ version ‘0.1.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 - - - - - -``` -# 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.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 +* checking for file ‘apa/DESCRIPTION’ ... OK ... -* this is package ‘dartR.popgen’ version ‘1.0.0’ +* this is package ‘apa’ version ‘0.3.4’ * 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 - - - - - -``` -# deeptrafo - -
- -* Version: 1.0-0 -* GitHub: https://github.com/neural-structured-additive-learning/deeptrafo -* Source code: https://github.com/cran/deeptrafo -* Date/Publication: 2024-12-03 18:40:02 UTC -* Number of recursive dependencies: 109 - -Run `revdepcheck::cloud_details(, "deeptrafo")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/deeptrafo/new/deeptrafo.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘deeptrafo/DESCRIPTION’ ... OK -... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘mlt’ - -Packages suggested but not available for checking: 'tram', 'cotram' - -See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ -manual. -* DONE -Status: 1 ERROR - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/deeptrafo/old/deeptrafo.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘deeptrafo/DESCRIPTION’ ... OK -... -* checking package namespace information ... OK -* checking package dependencies ... ERROR -Package required but not available: ‘mlt’ - -Packages suggested but not available for checking: 'tram', 'cotram' +Package required but not available: ‘MBESS’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. * DONE -Status: 1 ERROR - - - - - -``` -# dibble - -
- -* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/dibble -* Number of recursive dependencies: 51 - -Run `revdepcheck::cloud_details(, "dibble")` for more info - -
- -## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - - - -``` -# 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’ - - -``` -# epizootic - -
- -* Version: 1.0.0 -* GitHub: https://github.com/viralemergence/epizootic -* Source code: https://github.com/cran/epizootic -* Date/Publication: 2024-10-02 13:10:05 UTC -* Number of recursive dependencies: 93 - -Run `revdepcheck::cloud_details(, "epizootic")` for more info - -
- -## In both - -* checking whether package ‘epizootic’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/epizootic/new/epizootic.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘epizootic’ ... -** package ‘epizootic’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c aspatial_siri.cpp -o aspatial_siri.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o epizootic.so RcppExports.o aspatial_siri.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/epizootic/new/epizootic.Rcheck/00LOCK-epizootic/00new/epizootic/libs -** R -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘epizootic’ -* removing ‘/tmp/workdir/epizootic/new/epizootic.Rcheck/epizootic’ - - -``` -### CRAN - -``` -* installing *source* package ‘epizootic’ ... -** package ‘epizootic’ successfully unpacked and MD5 sums checked -** using staged installation -** libs -using C++ compiler: ‘g++ (Ubuntu 13.2.0-23ubuntu4) 13.2.0’ -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o -g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/usr/local/lib/R/site-library/Rcpp/include' -I'/usr/local/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c aspatial_siri.cpp -o aspatial_siri.o -g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o epizootic.so RcppExports.o aspatial_siri.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR -installing to /tmp/workdir/epizootic/old/epizootic.Rcheck/00LOCK-epizootic/00new/epizootic/libs -** R -... -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) : - namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required -Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace -Execution halted -ERROR: lazy loading failed for package ‘epizootic’ -* removing ‘/tmp/workdir/epizootic/old/epizootic.Rcheck/epizootic’ - - -``` -# 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 - -``` - - - - - - -``` -# 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’ - - -``` -# 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 - - - - - -``` -# 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’ - - -``` -# 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.3.0-6ubuntu2~24.04) 13.3.0 - GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 -* running under: Ubuntu 24.04.2 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘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 - - - - - -``` -# lnmixsurv - -
- -* Version: 3.1.6 -* GitHub: NA -* Source code: https://github.com/cran/lnmixsurv -* Date/Publication: 2024-09-03 15:20:08 UTC -* Number of recursive dependencies: 195 - -Run `revdepcheck::cloud_details(, "lnmixsurv")` for more info - -
- -## Error before installation - -### Devel - -``` -* using log directory ‘/tmp/workdir/lnmixsurv/new/lnmixsurv.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘lnmixsurv/DESCRIPTION’ ... OK -... -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘compare.Rmd’ using ‘UTF-8’... OK - ‘expectation_maximization.Rmd’ using ‘UTF-8’... OK - ‘intercept_only.Rmd’ using ‘UTF-8’... OK - ‘lnmixsurv.Rmd’ using ‘UTF-8’... OK - ‘parallel_computation.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 4 NOTEs - - - - - -``` -### CRAN - -``` -* using log directory ‘/tmp/workdir/lnmixsurv/old/lnmixsurv.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) -* R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS -* using session charset: UTF-8 -* using option ‘--no-manual’ -* checking for file ‘lnmixsurv/DESCRIPTION’ ... OK -... -* checking package vignettes in ‘inst/doc’ ... OK -* checking running R code from vignettes ... OK - ‘compare.Rmd’ using ‘UTF-8’... OK - ‘expectation_maximization.Rmd’ using ‘UTF-8’... OK - ‘intercept_only.Rmd’ using ‘UTF-8’... OK - ‘lnmixsurv.Rmd’ using ‘UTF-8’... OK - ‘parallel_computation.Rmd’ using ‘UTF-8’... OK -* checking re-building of vignette outputs ... OK -* DONE -Status: 4 NOTEs - - - - - -``` -# 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 - -``` - - - - - - -``` -# metajam - -
- -* Version: 0.3.1 -* GitHub: https://github.com/NCEAS/metajam -* Source code: https://github.com/cran/metajam -* Date/Publication: 2024-08-16 17:50:02 UTC -* Number of recursive dependencies: 89 - -Run `revdepcheck::cloud_details(, "metajam")` for more info - -
- -## In both - -* checking whether package ‘metajam’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/metajam/new/metajam.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘metajam’ ... -** package ‘metajam’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘metajam’ -* removing ‘/tmp/workdir/metajam/new/metajam.Rcheck/metajam’ - - -``` -### CRAN - -``` -* installing *source* package ‘metajam’ ... -** package ‘metajam’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘metajam’ -* removing ‘/tmp/workdir/metajam/old/metajam.Rcheck/metajam’ - - -``` -# nesRdata - -
- -* Version: 0.3.1 -* GitHub: https://github.com/jsta/nesRdata -* Source code: https://github.com/cran/nesRdata -* Date/Publication: 2020-04-30 17:20:02 UTC -* Number of recursive dependencies: 65 - -Run `revdepcheck::cloud_details(, "nesRdata")` for more info - -
- -## In both - -* checking whether package ‘nesRdata’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/nesRdata/new/nesRdata.Rcheck/00install.out’ for details. - ``` - -## Installation - -### Devel - -``` -* installing *source* package ‘nesRdata’ ... -** package ‘nesRdata’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘nesRdata’ -* removing ‘/tmp/workdir/nesRdata/new/nesRdata.Rcheck/nesRdata’ - - -``` -### CRAN - -``` -* installing *source* package ‘nesRdata’ ... -** package ‘nesRdata’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘nesRdata’ -* removing ‘/tmp/workdir/nesRdata/old/nesRdata.Rcheck/nesRdata’ - - -``` -# ontologics - -
- -* Version: 0.7.4 -* GitHub: https://github.com/luckinet/ontologics -* Source code: https://github.com/cran/ontologics -* Date/Publication: 2025-01-17 16:50:02 UTC -* Number of recursive dependencies: 79 - -Run `revdepcheck::cloud_details(, "ontologics")` for more info - -
- -## In both - -* checking whether package ‘ontologics’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/00install.out’ for details. - ``` +Status: 1 ERROR -## Installation -### Devel -``` -* installing *source* package ‘ontologics’ ... -** package ‘ontologics’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘ontologics’ -* removing ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/ontologics’ ``` ### CRAN ``` -* installing *source* package ‘ontologics’ ... -** package ‘ontologics’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** inst -** byte-compile and prepare package for lazy loading -Error in dyn.load(file, DLLpath = DLLpath, ...) : - unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': - librdf.so.0: cannot open shared object file: No such file or directory -Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load -Execution halted -ERROR: lazy loading failed for package ‘ontologics’ -* removing ‘/tmp/workdir/ontologics/old/ontologics.Rcheck/ontologics’ +* using log directory ‘/tmp/workdir/apa/old/apa.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘apa/DESCRIPTION’ ... OK +... +* this is package ‘apa’ version ‘0.3.4’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘MBESS’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` -# rdflib +# arealDB
-* Version: 0.2.9 -* GitHub: https://github.com/ropensci/rdflib -* Source code: https://github.com/cran/rdflib -* Date/Publication: 2024-08-17 06:00:05 UTC -* Number of recursive dependencies: 92 +* Version: 0.9.4 +* GitHub: https://github.com/luckinet/arealDB +* Source code: https://github.com/cran/arealDB +* Date/Publication: 2025-01-20 13:40:05 UTC +* Number of recursive dependencies: 109 -Run `revdepcheck::cloud_details(, "rdflib")` for more info +Run `revdepcheck::cloud_details(, "arealDB")` for more info
## In both -* checking whether package ‘rdflib’ can be installed ... ERROR +* checking whether package ‘arealDB’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/rdflib/new/rdflib.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/arealDB/new/arealDB.Rcheck/00install.out’ for details. ``` ## Installation @@ -1352,10 +101,12 @@ Run `revdepcheck::cloud_details(, "rdflib")` for more info ### Devel ``` -* installing *source* package ‘rdflib’ ... -** package ‘rdflib’ successfully unpacked and MD5 sums checked +* installing *source* package ‘arealDB’ ... +** package ‘arealDB’ successfully unpacked and MD5 sums checked ** using staged installation ** R +** data +*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading Error in dyn.load(file, DLLpath = DLLpath, ...) : @@ -1363,18 +114,20 @@ Error in dyn.load(file, DLLpath = DLLpath, ...) : librdf.so.0: cannot open shared object file: No such file or directory Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘rdflib’ -* removing ‘/tmp/workdir/rdflib/new/rdflib.Rcheck/rdflib’ +ERROR: lazy loading failed for package ‘arealDB’ +* removing ‘/tmp/workdir/arealDB/new/arealDB.Rcheck/arealDB’ ``` ### CRAN ``` -* installing *source* package ‘rdflib’ ... -** package ‘rdflib’ successfully unpacked and MD5 sums checked +* installing *source* package ‘arealDB’ ... +** package ‘arealDB’ successfully unpacked and MD5 sums checked ** using staged installation ** R +** data +*** moving datasets to lazyload DB ** inst ** byte-compile and prepare package for lazy loading Error in dyn.load(file, DLLpath = DLLpath, ...) : @@ -1382,57 +135,22 @@ Error in dyn.load(file, DLLpath = DLLpath, ...) : librdf.so.0: cannot open shared object file: No such file or directory Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘rdflib’ -* removing ‘/tmp/workdir/rdflib/old/rdflib.Rcheck/rdflib’ +ERROR: lazy loading failed for package ‘arealDB’ +* removing ‘/tmp/workdir/arealDB/old/arealDB.Rcheck/arealDB’ ``` -# rmlnomogram +# dsTidyverse
-* Version: NA +* Version: 1.0.4 * 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 - -``` - - - - - - -``` -# 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 +* Source code: https://github.com/cran/dsTidyverse +* Date/Publication: 2025-02-27 09:40:06 UTC +* Number of recursive dependencies: 134 -Run `revdepcheck::cloud_details(, "robber")` for more info +Run `revdepcheck::cloud_details(, "dsTidyverse")` for more info
@@ -1441,27 +159,27 @@ Run `revdepcheck::cloud_details(, "robber")` for more info ### 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) +* using log directory ‘/tmp/workdir/dsTidyverse/new/dsTidyverse.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu * R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘robber/DESCRIPTION’ ... OK +* checking for file ‘dsTidyverse/DESCRIPTION’ ... OK ... +* checking for code/documentation mismatches ... OK +* checking Rd \usage sections ... OK +* checking Rd contents ... OK +* checking for unstated dependencies in examples ... OK +* checking examples ... NONE +* checking for unstated dependencies in ‘tests’ ... OK * checking tests ... OK - Running ‘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 +Status: 1 NOTE @@ -1471,169 +189,113 @@ 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) +* using log directory ‘/tmp/workdir/dsTidyverse/old/dsTidyverse.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu * R was compiled by - gcc (Ubuntu 13.2.0-23ubuntu4) 13.2.0 - GNU Fortran (Ubuntu 13.2.0-23ubuntu4) 13.2.0 -* running under: Ubuntu 24.04.1 LTS + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘robber/DESCRIPTION’ ... OK +* checking for file ‘dsTidyverse/DESCRIPTION’ ... OK ... +* checking for code/documentation mismatches ... OK +* checking Rd \usage sections ... OK +* checking Rd contents ... OK +* checking for unstated dependencies in examples ... OK +* checking examples ... NONE +* checking for unstated dependencies in ‘tests’ ... OK * checking tests ... OK - Running ‘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 +Status: 1 NOTE ``` -# rplec +# kerastuneR
-* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/rplec -* Number of recursive dependencies: 122 +* Version: 0.1.0.7 +* GitHub: https://github.com/EagerAI/kerastuneR +* Source code: https://github.com/cran/kerastuneR +* Date/Publication: 2024-04-13 13:20:02 UTC +* Number of recursive dependencies: 109 -Run `revdepcheck::cloud_details(, "rplec")` for more info +Run `revdepcheck::cloud_details(, "kerastuneR")` for more info
-## Error before installation - -### Devel - -``` - - - - - - -``` -### CRAN - -``` - - - - +## Newly broken +* checking whether package ‘kerastuneR’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/kerastuneR/new/kerastuneR.Rcheck/00install.out’ for details. + ``` -``` -# 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 +## 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 - - - +* installing *source* package ‘kerastuneR’ ... +** package ‘kerastuneR’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error: object ‘at_depth’ is not exported by 'namespace:purrr' +Execution halted +ERROR: lazy loading failed for package ‘kerastuneR’ +* removing ‘/tmp/workdir/kerastuneR/new/kerastuneR.Rcheck/kerastuneR’ ``` ### 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 - - - +* installing *source* package ‘kerastuneR’ ... +** package ‘kerastuneR’ 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 (kerastuneR) ``` -# scCustomize +# metajam
-* 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 +* Version: 0.3.1 +* GitHub: https://github.com/NCEAS/metajam +* Source code: https://github.com/cran/metajam +* Date/Publication: 2024-08-16 17:50:02 UTC +* Number of recursive dependencies: 89 -Run `revdepcheck::cloud_details(, "scCustomize")` for more info +Run `revdepcheck::cloud_details(, "metajam")` for more info
## In both -* checking whether package ‘scCustomize’ can be installed ... ERROR +* checking whether package ‘metajam’ 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’ + See ‘/tmp/workdir/metajam/new/metajam.Rcheck/00install.out’ for details. ``` ## Installation @@ -1641,59 +303,61 @@ Run `revdepcheck::cloud_details(, "scCustomize")` for more info ### Devel ``` -* installing *source* package ‘scCustomize’ ... -** package ‘scCustomize’ successfully unpacked and MD5 sums checked +* installing *source* package ‘metajam’ ... +** package ‘metajam’ successfully unpacked and MD5 sums checked ** using staged installation ** R -** data -*** moving datasets to lazyload DB +** inst ** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘scCustomize’ -* removing ‘/tmp/workdir/scCustomize/new/scCustomize.Rcheck/scCustomize’ +ERROR: lazy loading failed for package ‘metajam’ +* removing ‘/tmp/workdir/metajam/new/metajam.Rcheck/metajam’ ``` ### CRAN ``` -* installing *source* package ‘scCustomize’ ... -** package ‘scCustomize’ successfully unpacked and MD5 sums checked +* installing *source* package ‘metajam’ ... +** package ‘metajam’ successfully unpacked and MD5 sums checked ** using staged installation ** R -** data -*** moving datasets to lazyload DB +** inst ** byte-compile and prepare package for lazy loading -Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]): - namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘scCustomize’ -* removing ‘/tmp/workdir/scCustomize/old/scCustomize.Rcheck/scCustomize’ +ERROR: lazy loading failed for package ‘metajam’ +* removing ‘/tmp/workdir/metajam/old/metajam.Rcheck/metajam’ ``` -# scpi +# nesRdata
-* 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 +* Version: 0.3.1 +* GitHub: https://github.com/jsta/nesRdata +* Source code: https://github.com/cran/nesRdata +* Date/Publication: 2020-04-30 17:20:02 UTC +* Number of recursive dependencies: 65 -Run `revdepcheck::cloud_details(, "scpi")` for more info +Run `revdepcheck::cloud_details(, "nesRdata")` for more info
## In both -* checking whether package ‘scpi’ can be installed ... ERROR +* checking whether package ‘nesRdata’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/scpi/new/scpi.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/nesRdata/new/nesRdata.Rcheck/00install.out’ for details. ``` ## Installation @@ -1701,153 +365,127 @@ Run `revdepcheck::cloud_details(, "scpi")` for more info ### Devel ``` -* installing *source* package ‘scpi’ ... -** package ‘scpi’ successfully unpacked and MD5 sums checked +* installing *source* package ‘nesRdata’ ... +** package ‘nesRdata’ 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 .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 +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘scpi’ -* removing ‘/tmp/workdir/scpi/new/scpi.Rcheck/scpi’ +ERROR: lazy loading failed for package ‘nesRdata’ +* removing ‘/tmp/workdir/nesRdata/new/nesRdata.Rcheck/nesRdata’ ``` ### CRAN ``` -* installing *source* package ‘scpi’ ... -** package ‘scpi’ successfully unpacked and MD5 sums checked +* installing *source* package ‘nesRdata’ ... +** package ‘nesRdata’ 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 .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 +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... namespaceImport -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘scpi’ -* removing ‘/tmp/workdir/scpi/old/scpi.Rcheck/scpi’ +ERROR: lazy loading failed for package ‘nesRdata’ +* removing ‘/tmp/workdir/nesRdata/old/nesRdata.Rcheck/nesRdata’ ``` -# SCpubr +# ontologics
-* 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 +* Version: 0.7.4 +* GitHub: https://github.com/luckinet/ontologics +* Source code: https://github.com/cran/ontologics +* Date/Publication: 2025-01-17 16:50:02 UTC +* Number of recursive dependencies: 79 -Run `revdepcheck::cloud_details(, "SCpubr")` for more info +Run `revdepcheck::cloud_details(, "ontologics")` for more info
-## Error before installation - -### Devel +## In both -``` -* 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 +* checking whether package ‘ontologics’ can be installed ... ERROR + ``` + Installation failed. + See ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/00install.out’ for details. + ``` +## Installation +### Devel +``` +* installing *source* package ‘ontologics’ ... +** package ‘ontologics’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘ontologics’ +* removing ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/ontologics’ ``` ### 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 - - - +* installing *source* package ‘ontologics’ ... +** package ‘ontologics’ successfully unpacked and MD5 sums checked +** using staged installation +** R +** inst +** byte-compile and prepare package for lazy loading +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load +Execution halted +ERROR: lazy loading failed for package ‘ontologics’ +* removing ‘/tmp/workdir/ontologics/old/ontologics.Rcheck/ontologics’ ``` -# SEERaBomb +# rdflib
-* 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 +* Version: 0.2.9 +* GitHub: https://github.com/ropensci/rdflib +* Source code: https://github.com/cran/rdflib +* Date/Publication: 2024-08-17 06:00:05 UTC +* Number of recursive dependencies: 92 -Run `revdepcheck::cloud_details(, "SEERaBomb")` for more info +Run `revdepcheck::cloud_details(, "rdflib")` for more info
## In both -* checking whether package ‘SEERaBomb’ can be installed ... ERROR +* checking whether package ‘rdflib’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/SEERaBomb/new/SEERaBomb.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/rdflib/new/rdflib.Rcheck/00install.out’ for details. ``` ## Installation @@ -1855,67 +493,52 @@ Run `revdepcheck::cloud_details(, "SEERaBomb")` for more info ### Devel ``` -* installing *source* package ‘SEERaBomb’ ... -** package ‘SEERaBomb’ successfully unpacked and MD5 sums checked +* installing *source* package ‘rdflib’ ... +** package ‘rdflib’ 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 +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘SEERaBomb’ -* removing ‘/tmp/workdir/SEERaBomb/new/SEERaBomb.Rcheck/SEERaBomb’ +ERROR: lazy loading failed for package ‘rdflib’ +* removing ‘/tmp/workdir/rdflib/new/rdflib.Rcheck/rdflib’ ``` ### CRAN ``` -* installing *source* package ‘SEERaBomb’ ... -** package ‘SEERaBomb’ successfully unpacked and MD5 sums checked +* installing *source* package ‘rdflib’ ... +** package ‘rdflib’ 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 +Error in dyn.load(file, DLLpath = DLLpath, ...) : + unable to load shared object '/usr/local/lib/R/site-library/redland/libs/redland.so': + librdf.so.0: cannot open shared object file: No such file or directory +Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load Execution halted -ERROR: lazy loading failed for package ‘SEERaBomb’ -* removing ‘/tmp/workdir/SEERaBomb/old/SEERaBomb.Rcheck/SEERaBomb’ +ERROR: lazy loading failed for package ‘rdflib’ +* removing ‘/tmp/workdir/rdflib/old/rdflib.Rcheck/rdflib’ ``` -# SensIAT +# sprtt
-* Version: NA -* GitHub: NA -* Source code: https://github.com/cran/SensIAT -* Number of recursive dependencies: 60 +* Version: 0.2.0 +* GitHub: https://github.com/MeikeSteinhilber/sprtt +* Source code: https://github.com/cran/sprtt +* Date/Publication: 2023-07-06 13:50:02 UTC +* Number of recursive dependencies: 146 -Run `revdepcheck::cloud_details(, "SensIAT")` for more info +Run `revdepcheck::cloud_details(, "sprtt")` for more info
@@ -1924,7 +547,27 @@ Run `revdepcheck::cloud_details(, "SensIAT")` for more info ### Devel ``` +* using log directory ‘/tmp/workdir/sprtt/new/sprtt.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘sprtt/DESCRIPTION’ ... OK +... +* this is package ‘sprtt’ version ‘0.2.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘MBESS’ +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR @@ -1934,33 +577,53 @@ Run `revdepcheck::cloud_details(, "SensIAT")` for more info ### CRAN ``` +* using log directory ‘/tmp/workdir/sprtt/old/sprtt.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘sprtt/DESCRIPTION’ ... OK +... +* this is package ‘sprtt’ version ‘0.2.0’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘MBESS’ +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR ``` -# SimplyAgree +# stoRy
-* 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 +* Version: 0.2.2 +* GitHub: https://github.com/theme-ontology/stoRy +* Source code: https://github.com/cran/stoRy +* Date/Publication: 2023-06-13 23:10:02 UTC +* Number of recursive dependencies: 76 -Run `revdepcheck::cloud_details(, "SimplyAgree")` for more info +Run `revdepcheck::cloud_details(, "stoRy")` for more info
-## In both +## Newly broken -* checking whether package ‘SimplyAgree’ can be installed ... ERROR +* checking whether package ‘stoRy’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/SimplyAgree/new/SimplyAgree.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/stoRy/new/stoRy.Rcheck/00install.out’ for details. ``` ## Installation @@ -1968,64 +631,53 @@ Run `revdepcheck::cloud_details(, "SimplyAgree")` for more info ### Devel ``` -* installing *source* package ‘SimplyAgree’ ... -** package ‘SimplyAgree’ successfully unpacked and MD5 sums checked +* installing *source* package ‘stoRy’ ... +** package ‘stoRy’ successfully unpacked and MD5 sums checked ** using staged installation ** R -** data -*** moving datasets to lazyload DB +Warning: namespace ‘stoRy’ is not available and has been replaced +by .GlobalEnv when processing object ‘background_collection’ ** 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 +Error: object ‘at_depth’ is not exported by 'namespace:purrr' Execution halted -ERROR: lazy loading failed for package ‘SimplyAgree’ -* removing ‘/tmp/workdir/SimplyAgree/new/SimplyAgree.Rcheck/SimplyAgree’ +ERROR: lazy loading failed for package ‘stoRy’ +* removing ‘/tmp/workdir/stoRy/new/stoRy.Rcheck/stoRy’ ``` ### CRAN ``` -* installing *source* package ‘SimplyAgree’ ... -** package ‘SimplyAgree’ successfully unpacked and MD5 sums checked +* installing *source* package ‘stoRy’ ... +** package ‘stoRy’ 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’ +** 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 (stoRy) ``` -# ssdGSA +# Surrogate
-* Version: 0.1.1 -* GitHub: NA -* Source code: https://github.com/cran/ssdGSA -* Date/Publication: 2024-07-26 23:10:02 UTC -* Number of recursive dependencies: 174 +* Version: 3.4.1 +* GitHub: https://github.com/florianstijven/Surrogate-development +* Source code: https://github.com/cran/Surrogate +* Date/Publication: 2025-04-29 04:40:02 UTC +* Number of recursive dependencies: 192 -Run `revdepcheck::cloud_details(, "ssdGSA")` for more info +Run `revdepcheck::cloud_details(, "Surrogate")` for more info
@@ -2034,22 +686,22 @@ Run `revdepcheck::cloud_details(, "ssdGSA")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/ssdGSA/new/ssdGSA.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) +* using log directory ‘/tmp/workdir/Surrogate/new/Surrogate.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 + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘ssdGSA/DESCRIPTION’ ... OK +* checking for file ‘Surrogate/DESCRIPTION’ ... OK ... -* this is package ‘ssdGSA’ version ‘0.1.1’ +* this is package ‘Surrogate’ version ‘3.4.1’ * package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Package required but not available: ‘clusterProfiler’ +Package required but not available: ‘MBESS’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -2064,22 +716,22 @@ Status: 1 ERROR ### CRAN ``` -* using log directory ‘/tmp/workdir/ssdGSA/old/ssdGSA.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) +* using log directory ‘/tmp/workdir/Surrogate/old/Surrogate.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 + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘ssdGSA/DESCRIPTION’ ... OK +* checking for file ‘Surrogate/DESCRIPTION’ ... OK ... -* this is package ‘ssdGSA’ version ‘0.1.1’ +* this is package ‘Surrogate’ version ‘3.4.1’ * package encoding: UTF-8 * checking package namespace information ... OK * checking package dependencies ... ERROR -Package required but not available: ‘clusterProfiler’ +Package required but not available: ‘MBESS’ See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ manual. @@ -2091,17 +743,17 @@ Status: 1 ERROR ``` -# SSHAARP +# tidybins
-* Version: 2.0.5 -* GitHub: NA -* Source code: https://github.com/cran/SSHAARP -* Date/Publication: 2024-12-11 07:50:06 UTC -* Number of recursive dependencies: 123 +* Version: 0.1.1 +* GitHub: https://github.com/Harrison4192/tidybins +* Source code: https://github.com/cran/tidybins +* Date/Publication: 2024-06-12 04:50:02 UTC +* Number of recursive dependencies: 222 -Run `revdepcheck::cloud_details(, "SSHAARP")` for more info +Run `revdepcheck::cloud_details(, "tidybins")` for more info
@@ -2110,27 +762,27 @@ Run `revdepcheck::cloud_details(, "SSHAARP")` for more info ### Devel ``` -* using log directory ‘/tmp/workdir/SSHAARP/new/SSHAARP.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) +* using log directory ‘/tmp/workdir/tidybins/new/tidybins.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 + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘SSHAARP/DESCRIPTION’ ... OK +* checking for file ‘tidybins/DESCRIPTION’ ... OK ... +* checking Rd contents ... OK +* checking for unstated dependencies in examples ... 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 - ‘vignette.Rmd’ using ‘UTF-8’... OK +* checking package vignettes ... OK * checking re-building of vignette outputs ... OK * DONE -Status: OK +Status: 3 NOTEs @@ -2140,117 +792,144 @@ Status: OK ### CRAN ``` -* using log directory ‘/tmp/workdir/SSHAARP/old/SSHAARP.Rcheck’ -* using R version 4.3.1 (2023-06-16) -* using platform: x86_64-pc-linux-gnu (64-bit) +* using log directory ‘/tmp/workdir/tidybins/old/tidybins.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 + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS * using session charset: UTF-8 * using option ‘--no-manual’ -* checking for file ‘SSHAARP/DESCRIPTION’ ... OK +* checking for file ‘tidybins/DESCRIPTION’ ... OK ... +* checking Rd contents ... OK +* checking for unstated dependencies in examples ... 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 - ‘vignette.Rmd’ using ‘UTF-8’... OK +* checking package vignettes ... OK * checking re-building of vignette outputs ... OK * DONE -Status: OK +Status: 3 NOTEs ``` -# stabiliser +# tidycomm
-* 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 +* 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: 141 -Run `revdepcheck::cloud_details(, "stabiliser")` for more info +Run `revdepcheck::cloud_details(, "tidycomm")` for more info
-## In both - -* checking whether package ‘stabiliser’ can be installed ... ERROR - ``` - Installation failed. - See ‘/tmp/workdir/stabiliser/new/stabiliser.Rcheck/00install.out’ for details. - ``` - -## Installation +## Error before installation ### Devel ``` -* installing *source* package ‘stabiliser’ ... -** package ‘stabiliser’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : - there is no package called ‘maditr’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘stabiliser’ -* removing ‘/tmp/workdir/stabiliser/new/stabiliser.Rcheck/stabiliser’ +* using log directory ‘/tmp/workdir/tidycomm/new/tidycomm.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘tidycomm/DESCRIPTION’ ... OK +... +* this is package ‘tidycomm’ version ‘0.4.1’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘MBESS’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` ### CRAN ``` -* installing *source* package ‘stabiliser’ ... -** package ‘stabiliser’ successfully unpacked and MD5 sums checked -** using staged installation -** R -** data -*** moving datasets to lazyload DB -** inst -** byte-compile and prepare package for lazy loading -Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) : - there is no package called ‘maditr’ -Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart -Execution halted -ERROR: lazy loading failed for package ‘stabiliser’ -* removing ‘/tmp/workdir/stabiliser/old/stabiliser.Rcheck/stabiliser’ +* using log directory ‘/tmp/workdir/tidycomm/old/tidycomm.Rcheck’ +* using R version 4.4.0 (2024-04-24) +* using platform: x86_64-pc-linux-gnu +* R was compiled by + gcc (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 + GNU Fortran (Ubuntu 13.3.0-6ubuntu2~24.04) 13.3.0 +* running under: Ubuntu 24.04.2 LTS +* using session charset: UTF-8 +* using option ‘--no-manual’ +* checking for file ‘tidycomm/DESCRIPTION’ ... OK +... +* this is package ‘tidycomm’ version ‘0.4.1’ +* package encoding: UTF-8 +* checking package namespace information ... OK +* checking package dependencies ... ERROR +Package required but not available: ‘MBESS’ + +See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’ +manual. +* DONE +Status: 1 ERROR + + + ``` -# tidyseurat +# tidyjson
-* 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: 0.3.2 +* GitHub: https://github.com/colearendt/tidyjson +* Source code: https://github.com/cran/tidyjson +* Date/Publication: 2023-01-07 00:20:02 UTC +* Number of recursive dependencies: 93 -Run `revdepcheck::cloud_details(, "tidyseurat")` for more info +Run `revdepcheck::cloud_details(, "tidyjson")` for more info
-## In both +## Newly broken -* checking whether package ‘tidyseurat’ can be installed ... ERROR +* checking whether package ‘tidyjson’ can be installed ... ERROR ``` Installation failed. - See ‘/tmp/workdir/tidyseurat/new/tidyseurat.Rcheck/00install.out’ for details. + See ‘/tmp/workdir/tidyjson/new/tidyjson.Rcheck/00install.out’ for details. + ``` + +## Newly fixed + +* checking Rd files ... NOTE + ``` + checkRd: (-1) json_schema.Rd:33: Lost braces; missing escapes or markup? + 33 | \item object -> {"name": } e.g., {"age": 32} -> {"age": "number"} + | ^ + checkRd: (-1) json_schema.Rd:33: Lost braces; missing escapes or markup? + 33 | \item object -> {"name": } e.g., {"age": 32} -> {"age": "number"} + | ^ + checkRd: (-1) json_schema.Rd:33: Lost braces; missing escapes or markup? + 33 | \item object -> {"name": } e.g., {"age": 32} -> {"age": "number"} + | ^ ``` ## Installation @@ -2258,38 +937,40 @@ Run `revdepcheck::cloud_details(, "tidyseurat")` for more info ### Devel ``` -* installing *source* package ‘tidyseurat’ ... -** package ‘tidyseurat’ successfully unpacked and MD5 sums checked +* installing *source* package ‘tidyjson’ ... +** package ‘tidyjson’ 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 +Error: object ‘at_depth’ is not exported by 'namespace:purrr' Execution halted -ERROR: lazy loading failed for package ‘tidyseurat’ -* removing ‘/tmp/workdir/tidyseurat/new/tidyseurat.Rcheck/tidyseurat’ +ERROR: lazy loading failed for package ‘tidyjson’ +* removing ‘/tmp/workdir/tidyjson/new/tidyjson.Rcheck/tidyjson’ ``` ### CRAN ``` -* installing *source* package ‘tidyseurat’ ... -** package ‘tidyseurat’ successfully unpacked and MD5 sums checked +* installing *source* package ‘tidyjson’ ... +** package ‘tidyjson’ 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’ +** 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 (tidyjson) ``` diff --git a/revdep/problems.md b/revdep/problems.md index 083f6277f..82466e141 100644 --- a/revdep/problems.md +++ b/revdep/problems.md @@ -1,3 +1,92 @@ +# admiral + +
+ +* Version: 1.3.1 +* GitHub: https://github.com/pharmaverse/admiral +* Source code: https://github.com/cran/admiral +* Date/Publication: 2025-07-29 14:40:02 UTC +* Number of recursive dependencies: 80 + +Run `revdepcheck::cloud_details(, "admiral")` for more info + +
+ +## Newly broken + +* checking installed package size ... NOTE + ``` + installed size is 5.2Mb + sub-directories of 1Mb or more: + doc 2.3Mb + help 1.8Mb + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 24 marked UTF-8 strings + ``` + +# 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: 189 + +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 1.7 MB + + + Quitting from summarise_characteristics.Rmd:11-19 [unnamed-chunk-1] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + ... + + Error: processing vignette 'summarise_characteristics.Rmd' failed with diagnostics: + download from 'https://example-data.ohdsi.dev/GiBleed.zip' failed + --- failed re-building ‘summarise_characteristics.Rmd’ + + --- re-building ‘summarise_cohort_overlap.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. + ``` + # CPAT
@@ -108,29 +197,210 @@ ERROR: lazy loading failed for package ‘kerastuneR’ ``` -# PopED +# MeasurementDiagnostics + +
+ +* Version: 0.1.0 +* GitHub: NA +* Source code: https://github.com/cran/MeasurementDiagnostics +* Date/Publication: 2025-07-29 11:50:02 UTC +* Number of recursive dependencies: 127 + +Run `revdepcheck::cloud_details(, "MeasurementDiagnostics")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘summariseMeasurementUse.Rmd’ using rmarkdown + trying URL 'https://example-data.ohdsi.dev/GiBleed.zip' + Content type 'application/zip' length 6754786 bytes (6.4 MB) + =============== + downloaded 2.0 MB + + + Quitting from summariseMeasurementUse.Rmd:10-18 [unnamed-chunk-1] + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + ... + + Error: processing vignette 'summariseMeasurementUse.Rmd' failed with diagnostics: + download from 'https://example-data.ohdsi.dev/GiBleed.zip' failed + --- failed re-building ‘summariseMeasurementUse.Rmd’ + + SUMMARY: processing the following file failed: + ‘summariseMeasurementUse.Rmd’ + + Error: Vignette re-building failed. + Execution halted + ``` + +# omock + +
+ +* Version: 0.4.0 +* GitHub: https://github.com/ohdsi/omock +* Source code: https://github.com/cran/omock +* Date/Publication: 2025-06-12 16:10:02 UTC +* Number of recursive dependencies: 85 + +Run `revdepcheck::cloud_details(, "omock")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘omock-Ex.R’ failed + The error most likely occurred in: + + > ### Name: mockCdmFromDataset + > ### Title: Create a 'local' cdm_reference from a dataset. + > ### Aliases: mockCdmFromDataset + > + > ### ** Examples + > + > library(omock) + ... + downloaded 56 KB + + Warning in utils::download.file(url = url, destfile = datasetFile) : + downloaded length 57344 != reported length 6754786 + Warning in utils::download.file(url = url, destfile = datasetFile) : + URL 'https://example-data.ohdsi.dev/GiBleed.zip': Timeout of 60 seconds was reached + Error in utils::download.file(url = url, destfile = datasetFile) : + download from 'https://example-data.ohdsi.dev/GiBleed.zip' failed + Calls: downloadMockDataset -> + Execution halted + ``` + +## In both + +* checking tests ... ERROR + ``` + Running ‘testthat.R’ + Running the tests in ‘tests/testthat.R’ failed. + Complete output: + > # This file is part of the standard setup for testthat. + > # It is recommended that you do not modify it. + > # + > # Where should you do additional test configuration? + > # Learn more about the roles of various files in: + > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview + > # * https://testthat.r-lib.org/articles/special-files.html + ... + i Actually got a with text: + object 'cdm' not found + ── Failure ('test-mockDatasets.R:35:3'): mock datasets cdm creation ──────────── + Expected `cdm <- mockCdmFromDataset(datasetName = dbName)` to run without any errors. + i Actually got a with text: + At least person and observation_period should be provided in tables + + [ FAIL 6 | WARN 12 | SKIP 0 | PASS 108 ] + Error: Test failures + Execution halted + ``` + +# OmopSketch
-* Version: 0.7.0 -* GitHub: https://github.com/andrewhooker/PopED -* Source code: https://github.com/cran/PopED -* Date/Publication: 2024-10-07 19:30:02 UTC -* Number of recursive dependencies: 139 +* Version: 0.5.1 +* GitHub: https://github.com/OHDSI/OmopSketch +* Source code: https://github.com/cran/OmopSketch +* Date/Publication: 2025-06-19 19:50:06 UTC +* Number of recursive dependencies: 175 -Run `revdepcheck::cloud_details(, "PopED")` for more info +Run `revdepcheck::cloud_details(, "OmopSketch")` 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 (local) tryCatchList(expr, classes, parentenv, handlers) + 10. │ └─base (local) tryCatchOne(expr, names, parentenv, handlers[[1L]]) + 11. │ └─base (local) doTryCatch(return(expr), name, parentenv, handler) + 12. └─testthat:::parallel_event_loop_chunky(queue, reporters, ".") + 13. └─queue$poll(Inf) + 14. └─base::lapply(...) + 15. └─testthat (local) FUN(X[[i]], ...) + 16. └─private$handle_error(msg, i) + 17. └─rlang::abort(...) + Execution halted + ``` + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘database_characteristics.Rmd’ using rmarkdown + --- finished re-building ‘database_characteristics.Rmd’ + + --- re-building ‘missing_data.Rmd’ using rmarkdown + trying URL 'https://example-data.ohdsi.dev/GiBleed.zip' + Content type 'application/zip' length 6754786 bytes (6.4 MB) + =============== + downloaded 2.0 MB + + ... + 3. ├─withr::with_options(...) + 4. │ └─base::force(code) + 5. └─utils::download.file(...) + ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~ + + Error: processing vignette 'missing_data.Rmd' failed with diagnostics: + download from 'https://example-data.ohdsi.dev/GiBleed.zip' failed + --- failed re-building ‘missing_data.Rmd’ + + --- re-building ‘summarise_clinical_tables_records.Rmd’ using rmarkdown + ``` + +## In both + * checking installed package size ... NOTE ``` - installed size is 5.5Mb + installed size is 18.1Mb sub-directories of 1Mb or more: - R 1.5Mb - doc 1.4Mb - test 1.1Mb + doc 17.1Mb + ``` + +# PatientProfiles + +
+ +* Version: 1.4.2 +* GitHub: https://github.com/darwin-eu/PatientProfiles +* Source code: https://github.com/cran/PatientProfiles +* Date/Publication: 2025-07-09 13:20:05 UTC +* Number of recursive dependencies: 138 + +Run `revdepcheck::cloud_details(, "PatientProfiles")` for more info + +
+ +## Newly broken + +* checking re-building of vignette outputs ... ERROR + ``` + Error(s) in re-building vignettes: + --- re-building ‘cohort-intersect.Rmd’ using rmarkdown ``` # quincunx @@ -341,3 +611,78 @@ ERROR: lazy loading failed for package ‘tidyjson’ ``` +# wbids + +
+ +* Version: 1.0.0 +* GitHub: https://github.com/teal-insights/r-wbids +* Source code: https://github.com/cran/wbids +* Date/Publication: 2025-02-08 22:50:02 UTC +* Number of recursive dependencies: 70 + +Run `revdepcheck::cloud_details(, "wbids")` for more info + +
+ +## Newly broken + +* checking examples ... ERROR + ``` + Running examples in ‘wbids-Ex.R’ failed + The error most likely occurred in: + + > ### Name: ids_bulk_files + > ### Title: Retrieve Available Bulk Download Files for International Debt + > ### Statistics + > ### Aliases: ids_bulk_files + > + > ### ** Examples + > + ... + + ## End(Don't show) + + ids_bulk_files() + + ## Don't show: + + }) # examplesIf + > ids_bulk_files() + Warning in readBin(3L, raw(0), 32768L) : + URL 'https://datacatalogapi.worldbank.org/ddhxext/DatasetDownload?dataset_unique_id=0038015&version_id=': Timeout of 60 seconds was reached + Error in readBin(3L, raw(0), 32768L) : cannot read from connection + Calls: ... parse_and_simplify -> parseJSON -> parse_con -> readBin + Execution halted + ``` + +## Newly fixed + +* 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. ├─wbids:::read_bulk_info() at test-read_bulk_info.R:2:3 + 2. │ └─jsonlite::fromJSON(...) + 3. │ └─jsonlite:::parse_and_simplify(...) + 4. │ └─jsonlite:::parseJSON(txt, bigint_as_char) + 5. │ └─jsonlite:::parse_con(txt, bigint_as_char) + 6. └─base::readBin(``, ``, 32768L) + + [ FAIL 1 | WARN 1 | SKIP 7 | PASS 146 ] + Error: Test failures + Execution halted + ``` + +## In both + +* checking data for non-ASCII characters ... NOTE + ``` + Note: found 78 marked UTF-8 strings + ``` +