Skip to content

Commit

Permalink
Add cross-ref between the ellipsis checking functions (#1709)
Browse files Browse the repository at this point in the history
  • Loading branch information
olivroy authored May 31, 2024
1 parent d7be54d commit 7298f2f
Show file tree
Hide file tree
Showing 4 changed files with 21 additions and 0 deletions.
3 changes: 3 additions & 0 deletions R/dots-ellipsis.R
Original file line number Diff line number Diff line change
Expand Up @@ -11,6 +11,7 @@
#' @param env Environment in which to look for `...` and to set up handler.
#' @inheritParams args_error_context
#'
#' @family dots checking functions
#' @details
#' In packages, document `...` with this standard tag:
#'
Expand Down Expand Up @@ -91,6 +92,7 @@ check_dots <- function(env = caller_env(), error, action, call) {
#' fail with an error when named arguments are detected.
#'
#' @inheritParams check_dots_used
#' @family dots checking functions
#' @param env Environment in which to look for `...`.
#' @export
#' @examples
Expand Down Expand Up @@ -139,6 +141,7 @@ check_dots_unnamed <- function(env = caller_env(),
#' @inheritParams check_dots_used
#' @param env Environment in which to look for `...`.
#'
#' @family dots checking functions
#' @details
#' In packages, document `...` with this standard tag:
#'
Expand Down
6 changes: 6 additions & 0 deletions man/check_dots_empty.Rd

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

6 changes: 6 additions & 0 deletions man/check_dots_unnamed.Rd

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

6 changes: 6 additions & 0 deletions man/check_dots_used.Rd

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

0 comments on commit 7298f2f

Please sign in to comment.