Skip to content

Commit 915fe04

Browse files
olivroylionel-
authored andcommitted
Add cross-ref between the ellipsis checking functions (#1709)
1 parent d7abd63 commit 915fe04

File tree

4 files changed

+21
-0
lines changed

4 files changed

+21
-0
lines changed

R/dots-ellipsis.R

+3
Original file line numberDiff line numberDiff line change
@@ -11,6 +11,7 @@
1111
#' @param env Environment in which to look for `...` and to set up handler.
1212
#' @inheritParams args_error_context
1313
#'
14+
#' @family dots checking functions
1415
#' @details
1516
#' In packages, document `...` with this standard tag:
1617
#'
@@ -91,6 +92,7 @@ check_dots <- function(env = caller_env(), error, action, call) {
9192
#' fail with an error when named arguments are detected.
9293
#'
9394
#' @inheritParams check_dots_used
95+
#' @family dots checking functions
9496
#' @param env Environment in which to look for `...`.
9597
#' @export
9698
#' @examples
@@ -139,6 +141,7 @@ check_dots_unnamed <- function(env = caller_env(),
139141
#' @inheritParams check_dots_used
140142
#' @param env Environment in which to look for `...`.
141143
#'
144+
#' @family dots checking functions
142145
#' @details
143146
#' In packages, document `...` with this standard tag:
144147
#'

man/check_dots_empty.Rd

+6
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/check_dots_unnamed.Rd

+6
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/check_dots_used.Rd

+6
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)