Skip to content

Commit

Permalink
test dependency mistake
Browse files Browse the repository at this point in the history
  • Loading branch information
robchallen committed Oct 18, 2024
1 parent 659ccf0 commit 7c2892c
Showing 1 changed file with 3 additions and 3 deletions.
6 changes: 3 additions & 3 deletions tests/testthat/test-fix-1760-1761.R
Original file line number Diff line number Diff line change
Expand Up @@ -43,8 +43,8 @@ test_that("inheritDotParams inherits `...` parameters from mulitple parents incl
#' Foo
#'
#' @param .messages like in dtrackr
#' @inheritParams dplyr::mutate
#' @inheritAllDotParams dplyr::mutate
#' @inheritParams purrr::pmap
#' @inheritAllDotParams purrr::pmap
#' @inheritAllDotParams bar
foo <- function(.data, ..., .messages) {}
")[[2]]
Expand All @@ -56,7 +56,7 @@ test_that("inheritDotParams inherits `...` parameters from mulitple parents incl
c(y="ybar")
)

lapply(c("Name-value pairs.", "\\.by", "\\.keep"), function(.x) {
lapply(c("We now generally recommend", "\\.l", "\\.f"), function(.x) {
expect(
stringr::str_detect(out$get_value("param")[["..."]],.x),
paste0("could not find documentation string: ",.x)
Expand Down

0 comments on commit 7c2892c

Please sign in to comment.