Skip to content

Commit 73fc811

Browse files
authored
Added pkgload::run_example() to the docs for run_examples() (#2555)
1 parent 969d81e commit 73fc811

File tree

2 files changed

+9
-2
lines changed

2 files changed

+9
-2
lines changed

R/run-examples.R

Lines changed: 4 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -11,7 +11,8 @@
1111
#' name of `Rd` file to start with (with or without extensions), or
1212
#' a topic name. If omitted, will start with the (lexicographically) first
1313
#' file. This is useful if you have a lot of examples and don't want to
14-
#' rerun them every time you fix a problem.
14+
#' rerun them every time you fix a problem. To run only one example, use
15+
#' [pkgload::run_example()].
1516
#' @family example functions
1617
#' @param show DEPRECATED.
1718
#' @param fresh if `TRUE`, will be run in a fresh R session. This has
@@ -21,6 +22,8 @@
2122
#' @param document if `TRUE`, [document()] will be run to ensure
2223
#' examples are updated before running them.
2324
#' @keywords programming
25+
#'
26+
#' @seealso [pkgload::run_example()] to run a single example.
2427
#' @export
2528
run_examples <- function(pkg = ".", start = NULL, show = deprecated(), run_donttest = FALSE,
2629
run_dontrun = FALSE, fresh = FALSE, document = TRUE,

man/run_examples.Rd

Lines changed: 5 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)