Skip to content
Merged
Show file tree
Hide file tree
Changes from all commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
Jump to file
Failed to load files.
Loading
Diff view
Diff view
1 change: 0 additions & 1 deletion R/edition.R
Original file line number Diff line number Diff line change
Expand Up @@ -60,7 +60,6 @@ edition_name <- function(x) {
#' @export
#' @param x Edition Should be a single integer.
#' @param .env Environment that controls scope of changes. For expert use only.
#' @keywords internal
local_edition <- function(x, .env = parent.frame()) {
stopifnot(is_zap(x) || (is.numeric(x) && length(x) == 1))

Expand Down
2 changes: 0 additions & 2 deletions R/expect-constant.R
Original file line number Diff line number Diff line change
Expand Up @@ -50,7 +50,6 @@ expect_false <- function(object, info = NULL, label = NULL) {
#' check for it either with `expect_equal(x, NULL)` or `expect_type(x, "NULL")`.
#'
#' @inheritParams expect_that
#' @keywords internal
#' @export
#' @family expectations
#' @examples
Expand Down Expand Up @@ -83,4 +82,3 @@ expect_waldo_constant <- function(act, constant, info) {

invisible(act$val)
}

2 changes: 0 additions & 2 deletions R/expect-self-test.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,7 +7,6 @@
#' @param expr Expression that evaluates a single expectation.
#' @param message Check that the failure message matches this regexp.
#' @param ... Other arguments passed on to [expect_match()].
#' @keywords internal
#' @export
expect_success <- function(expr) {
exp <- capture_expectation(expr)
Expand Down Expand Up @@ -114,4 +113,3 @@ local_output_override <- function(width = 80, crayon = TRUE, unicode = TRUE,
reporter$unicode <- old_unicode
}, .env)
}

1 change: 0 additions & 1 deletion R/expectation.R
Original file line number Diff line number Diff line change
Expand Up @@ -89,7 +89,6 @@ expect <- function(ok, failure_message,
#' @param message Message describing test failure
#' @param srcref Optional `srcref` giving location of test.
#' @inheritParams expect
#' @keywords internal
#' @export
expectation <- function(type, message, srcref = NULL, trace = NULL) {
new_expectation(type, message, srcref = srcref, trace = trace)
Expand Down
1 change: 0 additions & 1 deletion R/expectations-matches.R
Original file line number Diff line number Diff line change
Expand Up @@ -15,7 +15,6 @@
#' (not a regular expressions). Overrides `perl`.
#' @inheritDotParams base::grepl -pattern -x -perl -fixed
#' @family expectations
#' @keywords internal
#' @export
#' @examples
#' expect_match("Testing is fun", "fun")
Expand Down
1 change: 0 additions & 1 deletion R/test-files.R
Original file line number Diff line number Diff line change
Expand Up @@ -37,7 +37,6 @@
#' Config/testthat/load-all: list(export_all = FALSE, helpers = FALSE)
#' ```
#' @param wrap DEPRECATED
#' @keywords internal
#' @return A list (invisibly) containing data about the test results.
#' @inheritParams with_reporter
#' @inheritParams source_file
Expand Down
5 changes: 5 additions & 0 deletions _pkgdown.yml
Original file line number Diff line number Diff line change
Expand Up @@ -20,12 +20,14 @@ reference:
- subtitle: Objects
contents:
- expect_equal
- expect_null
- expect_type

- subtitle: Vectors
contents:
- expect_length
- expect_gt
- expect_match
- expect_named
- expect_setequal
- expect_true
Expand All @@ -49,6 +51,7 @@ reference:

- title: Test helpers
contents:
- local_edition
- is_testing
- skip
- teardown_env
Expand All @@ -73,7 +76,9 @@ reference:
- title: Expectation internals
contents:
- expect
- expectation
- fail
- expect_success

news:
releases:
Expand Down
1 change: 0 additions & 1 deletion man/expect_match.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 0 additions & 1 deletion man/expect_null.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 0 additions & 1 deletion man/expect_success.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 0 additions & 1 deletion man/expectation.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 0 additions & 1 deletion man/local_edition.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 0 additions & 1 deletion man/test_dir.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

Loading