diff --git a/NAMESPACE b/NAMESPACE
index fd9734cc..12aac1a6 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 3dc8f088..03e1c753 100644
--- a/NEWS.md
+++ b/NEWS.md
@@ -1,5 +1,7 @@
# 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 1.1.0
* purrr now requires R >= 4.1, so we can rely on the base pipe and lambda
diff --git a/R/adverb-partial.R b/R/adverb-partial.R
index 194a13ca..b5cf2e1c 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,13 +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)
@@ -109,22 +94,6 @@ partial <- function(
)
)
- 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)
@@ -135,15 +104,10 @@ partial <- function(
# 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.
diff --git a/R/deprec-cross.R b/R/deprec-cross.R
index e763b944..ceee70a8 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 fbf52595..00000000
--- 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 b09be9b1..99c5fad2 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 ae24ba81..23aa2e97 100644
--- a/R/detect.R
+++ b/R/detect.R
@@ -15,7 +15,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.
@@ -51,18 +50,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]])
}
@@ -73,17 +65,11 @@ detect <- function(
#' @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)
}
@@ -94,16 +80,6 @@ detect_index <- function(
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 afa22d57..6f6814d3 100644
--- a/R/reduce.R
+++ b/R/reduce.R
@@ -386,13 +386,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
@@ -513,75 +506,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 cfd8c68c..395930e4 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 aa9a9d16..00000000
--- 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 fab08211..5ee18284 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 f51a8acc..d0ab5d92 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.}
@@ -37,8 +30,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 70bcce9a..00000000
--- 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/partial.Rd b/man/partial.Rd
index dcc91773..1c99493f 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 830b8655..00000000
--- 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/revdep/README.md b/revdep/README.md
index 734b71ea..19261ee9 100644
--- a/revdep/README.md
+++ b/revdep/README.md
@@ -1,16 +1,36 @@
# Revdeps
-## Failed to check (9)
+## Failed to check (15)
-|package |version |error |warning |note |
-|:----------------|:-------|:-----|:-------|:----|
-|arealDB |0.9.4 |1 | | |
-|dsTidyverse |? | | | |
-|metabolic |? | | | |
-|metajam |0.3.1 |1 | | |
-|nesRdata |0.3.1 |1 | | |
-|ontologics |0.7.4 |1 | | |
-|rdflib |0.2.9 |1 | | |
-|rgeomstats |? | | | |
-|TriDimRegression |1.0.2 |1 | | |
+|package |version |error |warning |note |
+|:----------------|:-------|:------|:-------|:----|
+|apa |? | | | |
+|arealDB |0.9.4 |1 | | |
+|dsTidyverse |? | | | |
+|[kerastuneR](failures.md#kerastuner)|0.1.0.7 |__+1__ | | |
+|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 (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 |
diff --git a/revdep/cran.md b/revdep/cran.md
index fcfe15d6..58096233 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 3f7aa2a7..6a123a41 100644
--- a/revdep/failures.md
+++ b/revdep/failures.md
@@ -1,3 +1,79 @@
+# apa
+
+
+
+* 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(, "apa")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* 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
+ 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
+
+
+
+
+
+```
+### CRAN
+
+```
+* 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
+
+
+
+
+
+```
# arealDB
@@ -72,7 +148,7 @@ ERROR: lazy loading failed for package ‘arealDB’
* GitHub: NA
* Source code: https://github.com/cran/dsTidyverse
* Date/Publication: 2025-02-27 09:40:06 UTC
-* Number of recursive dependencies: 46
+* Number of recursive dependencies: 134
Run `revdepcheck::cloud_details(, "dsTidyverse")` for more info
@@ -140,79 +216,63 @@ Status: 1 NOTE
```
-# metabolic
+# kerastuneR
-* 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
+* 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(, "metabolic")` for more info
+Run `revdepcheck::cloud_details(, "kerastuneR")` for more info
-## Error before installation
-
-### Devel
+## Newly broken
-```
-* 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.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 ‘metabolic/DESCRIPTION’ ... OK
-...
-* 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: 2 NOTEs
+* 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
```
-* 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.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 ‘metabolic/DESCRIPTION’ ... OK
-...
-* 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: 2 NOTEs
-
-
-
+* 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)
```
@@ -468,17 +528,17 @@ ERROR: lazy loading failed for package ‘rdflib’
```
-# rgeomstats
+# sprtt
-* Version: 0.0.1
-* GitHub: https://github.com/LMJL-Alea/rgeomstats
-* Source code: https://github.com/cran/rgeomstats
-* Date/Publication: 2022-11-04 10:10:02 UTC
-* Number of recursive dependencies: 36
+* 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(, "rgeomstats")` for more info
+Run `revdepcheck::cloud_details(, "sprtt")` for more info
@@ -487,17 +547,146 @@ Run `revdepcheck::cloud_details(, "rgeomstats")` 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
+
+
+
+
+
+```
+### 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
+```
+# 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
+ ```
+ 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
```
-* using log directory ‘/tmp/workdir/rgeomstats/old/rgeomstats.Rcheck’
+* 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)
+
+
+```
+# Surrogate
+
+
+
+* 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(, "Surrogate")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* 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
@@ -506,21 +695,282 @@ Run `revdepcheck::cloud_details(, "rgeomstats")` for more info
* running under: Ubuntu 24.04.2 LTS
* using session charset: UTF-8
* using option ‘--no-manual’
-* checking for file ‘rgeomstats/DESCRIPTION’ ... OK
+* checking for file ‘Surrogate/DESCRIPTION’ ... OK
+...
+* 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: ‘MBESS’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* 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.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 ‘Surrogate/DESCRIPTION’ ... OK
+...
+* 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: ‘MBESS’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# tidybins
+
+
+
+* 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(, "tidybins")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* 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.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 ‘tidybins/DESCRIPTION’ ... OK
...
- 588 | if (reticulate::py_module_available("geomstats")) {
- | ^
-* checking Rd metadata ... OK
-* checking Rd cross-references ... OK
-* checking for missing documentation entries ... OK
-* checking for code/documentation mismatches ... OK
-* checking Rd \usage sections ... OK
* checking Rd contents ... OK
* checking for unstated dependencies in examples ... OK
-* checking examples ...
+* 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 ... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 3 NOTEs
+
+
+
+
+
+```
+### CRAN
+
+```
+* 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.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 ‘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 ... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 3 NOTEs
+
+
+
+
+
+```
+# tidycomm
+
+
+* Version: 0.4.1
+* GitHub: https://github.com/joon-e/tidycomm
+* Source code: https://github.com/cran/tidycomm
+* Date/Publication: 2024-02-22 12:20:02 UTC
+* Number of recursive dependencies: 141
+Run `revdepcheck::cloud_details(, "tidycomm")` for more info
+
+
+## Error before installation
+
+### Devel
+
+```
+* 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
+
+```
+* 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
+
+
+
+
+
+```
+# 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)
```
diff --git a/revdep/problems.md b/revdep/problems.md
index 9a207363..82466e14 100644
--- a/revdep/problems.md
+++ b/revdep/problems.md
@@ -1 +1,688 @@
-*Wow, no problems at all. :)*
\ No newline at end of file
+# 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
+
+
+
+* 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(, "CPAT")` for more info
+
+
+
+## Newly broken
+
+* checking tests ... ERROR
+ ```
+ 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 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)
+
+
+```
+# 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.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(, "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 18.1Mb
+ sub-directories of 1Mb or more:
+ 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
+
+
+
+* 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(, "quincunx")` for more info
+
+
+
+## Newly broken
+
+* checking examples ... ERROR
+ ```
+ Running examples in ‘quincunx-Ex.R’ failed
+ The error most likely occurred in:
+
+ > ### 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
+ ```
+
+* 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
+ ```
+
+# 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
+ ```
+ 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)
+
+
+```
+# 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
+ ```
+
diff --git a/tests/testthat/_snaps/adverb-partial.md b/tests/testthat/_snaps/adverb-partial.md
index 5ab3850d..39a30d60 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 84b3cfc5..00000000
--- 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 92b10b13..6003b28e 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 e1966e9a..040c1911 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 cca14bb1..cdbb75eb 100644
--- a/tests/testthat/test-adverb-partial.R
+++ b/tests/testthat/test-adverb-partial.R
@@ -152,51 +152,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 86dd88ad..00000000
--- 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 2a91815d..35b70a9e 100644
--- a/tests/testthat/test-detect.R
+++ b/tests/testthat/test-detect.R
@@ -25,20 +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 5f58eb87..49d9bf13 100644
--- a/tests/testthat/test-reduce.R
+++ b/tests/testthat/test-reduce.R
@@ -221,63 +221,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)
- )
-})