Skip to content

Commit 9a9be42

Browse files
authored
Include more docs in index (#2002)
Fixes #1941. Fixes #1922.
1 parent 41442ac commit 9a9be42

13 files changed

+5
-14
lines changed

β€ŽR/edition.Rβ€Ž

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -60,7 +60,6 @@ edition_name <- function(x) {
6060
#' @export
6161
#' @param x Edition Should be a single integer.
6262
#' @param .env Environment that controls scope of changes. For expert use only.
63-
#' @keywords internal
6463
local_edition <- function(x, .env = parent.frame()) {
6564
stopifnot(is_zap(x) || (is.numeric(x) && length(x) == 1))
6665

β€ŽR/expect-constant.Rβ€Ž

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -50,7 +50,6 @@ expect_false <- function(object, info = NULL, label = NULL) {
5050
#' check for it either with `expect_equal(x, NULL)` or `expect_type(x, "NULL")`.
5151
#'
5252
#' @inheritParams expect_that
53-
#' @keywords internal
5453
#' @export
5554
#' @family expectations
5655
#' @examples
@@ -83,4 +82,3 @@ expect_waldo_constant <- function(act, constant, info) {
8382

8483
invisible(act$val)
8584
}
86-

β€ŽR/expect-self-test.Rβ€Ž

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -7,7 +7,6 @@
77
#' @param expr Expression that evaluates a single expectation.
88
#' @param message Check that the failure message matches this regexp.
99
#' @param ... Other arguments passed on to [expect_match()].
10-
#' @keywords internal
1110
#' @export
1211
expect_success <- function(expr) {
1312
exp <- capture_expectation(expr)
@@ -114,4 +113,3 @@ local_output_override <- function(width = 80, crayon = TRUE, unicode = TRUE,
114113
reporter$unicode <- old_unicode
115114
}, .env)
116115
}
117-

β€ŽR/expectation.Rβ€Ž

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -89,7 +89,6 @@ expect <- function(ok, failure_message,
8989
#' @param message Message describing test failure
9090
#' @param srcref Optional `srcref` giving location of test.
9191
#' @inheritParams expect
92-
#' @keywords internal
9392
#' @export
9493
expectation <- function(type, message, srcref = NULL, trace = NULL) {
9594
new_expectation(type, message, srcref = srcref, trace = trace)

β€ŽR/expectations-matches.Rβ€Ž

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -15,7 +15,6 @@
1515
#' (not a regular expressions). Overrides `perl`.
1616
#' @inheritDotParams base::grepl -pattern -x -perl -fixed
1717
#' @family expectations
18-
#' @keywords internal
1918
#' @export
2019
#' @examples
2120
#' expect_match("Testing is fun", "fun")

β€ŽR/test-files.Rβ€Ž

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -37,7 +37,6 @@
3737
#' Config/testthat/load-all: list(export_all = FALSE, helpers = FALSE)
3838
#' ```
3939
#' @param wrap DEPRECATED
40-
#' @keywords internal
4140
#' @return A list (invisibly) containing data about the test results.
4241
#' @inheritParams with_reporter
4342
#' @inheritParams source_file

β€Ž_pkgdown.ymlβ€Ž

Lines changed: 5 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -20,12 +20,14 @@ reference:
2020
- subtitle: Objects
2121
contents:
2222
- expect_equal
23+
- expect_null
2324
- expect_type
2425

2526
- subtitle: Vectors
2627
contents:
2728
- expect_length
2829
- expect_gt
30+
- expect_match
2931
- expect_named
3032
- expect_setequal
3133
- expect_true
@@ -49,6 +51,7 @@ reference:
4951

5052
- title: Test helpers
5153
contents:
54+
- local_edition
5255
- is_testing
5356
- skip
5457
- teardown_env
@@ -73,7 +76,9 @@ reference:
7376
- title: Expectation internals
7477
contents:
7578
- expect
79+
- expectation
7680
- fail
81+
- expect_success
7782

7883
news:
7984
releases:

β€Žman/expect_match.Rdβ€Ž

Lines changed: 0 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

β€Žman/expect_null.Rdβ€Ž

Lines changed: 0 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

β€Žman/expect_success.Rdβ€Ž

Lines changed: 0 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
Β (0)