Skip to content

Commit 13805e8

Browse files
authored
Polish reference index (#2180)
Fixes #2178
1 parent cf95bd7 commit 13805e8

File tree

94 files changed

+135
-142
lines changed

Some content is hidden

Large Commits have some content hidden by default. Use the searchbox below for content that may be hidden.

94 files changed

+135
-142
lines changed

R/describe.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -26,6 +26,7 @@
2626
#'
2727
#' @param description description of the feature
2828
#' @param code test code containing the specs
29+
#' @keywords internal
2930
#' @export
3031
#' @examples
3132
#' describe("matrix()", {

R/expect-comparison.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
#' Does code return a number greater/less than the expected value?
1+
#' Do you expect a number bigger or smaller than this?
22
#'
33
#' @inheritParams expect_equal
44
#' @param object,expected A value to compare and its expected bound.

R/expect-condition.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
#' Does code throw an error, warning, message, or other condition?
1+
#' Do you expect an error, warning, message, or other condition?
22
#'
33
#' @description
44
#' `expect_error()`, `expect_warning()`, `expect_message()`, and

R/expect-constant.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
#' Does code return `TRUE` or `FALSE`?
1+
#' Do you expect `TRUE` or `FALSE`?
22
#'
33
#' @description
44
#' These are fall-back expectations that you can use when none of the other
@@ -42,7 +42,7 @@ expect_false <- function(object, info = NULL, label = NULL) {
4242
expect_waldo_equal_("equal", act, exp, info = info, ignore_attr = TRUE)
4343
}
4444

45-
#' Does code return `NULL`?
45+
#' Do you expect `NULL`?
4646
#'
4747
#' This is a special case because `NULL` is a singleton so it's possible
4848
#' check for it either with `expect_equal(x, NULL)` or `expect_type(x, "NULL")`.

R/expect-equality.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
#' Does code return the expected value?
1+
#' Do you expect this value?
22
#'
33
#' @description
44
#' These functions provide two levels of strictness when comparing a

R/expect-inheritance.R

Lines changed: 2 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,4 @@
1-
#' Does code return an object inheriting from the expected base type, S3 class,
2-
#' or S4 class?
1+
#' Do you expect an S3/S4/R6/S7 object that inherits from this class?
32
#'
43
#' @description
54
#' See <https://adv-r.hadley.nz/oo.html> for an overview of R's OO systems, and
@@ -207,7 +206,7 @@ expect_s7_class <- function(object, class) {
207206
pass(act$val)
208207
}
209208

210-
#' Does an object inherit from a given class?
209+
#' Do you expect to inherit from this class?
211210
#'
212211
#' @description
213212
#' `r lifecycle::badge("superseded")`

R/expect-invisible.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
#' Does code return a visible or invisible object?
1+
#' Do you expect the result to be (in)visible?
22
#'
33
#' Use this to test whether a function returns a visible or invisible
44
#' output. Typically you'll use this to check that functions called primarily

R/expect-known.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
#' Expectations: is the output or the value equal to a known good value?
1+
#' Do you expect the results/output to equal a known value?
22
#'
33
#' For complex printed output and objects, it is often challenging to describe
44
#' exactly what you expect to see. `expect_known_value()` and
@@ -113,7 +113,7 @@ compare_file <- function(path, lines, ..., update = TRUE, info = NULL) {
113113
pass(NULL)
114114
}
115115

116-
#' Expectations: is the output or the value equal to a known good value?
116+
#' Do you expect the output/result to equal a known good value?
117117
#'
118118
#' `expect_output_file()` behaves identically to [expect_known_output()].
119119
#'

R/expect-length.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
#' Does code return a vector with the specified length?
1+
#' Do you expect a vector with this length?
22
#'
33
#' @seealso [expect_vector()] to make assertions about the "size" of a vector,
44
#' [expect_shape()] for more general assertions about object "shape".

R/expect-match.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
#' Does a string match a regular expression?
1+
#' Do you expect a string to match this pattern?
22
#'
33
#' @details
44
#' `expect_match()` checks if a character vector matches a regular expression,

0 commit comments

Comments
 (0)