Skip to content

Commit 6e71e1a

Browse files
committed
docfix
1 parent 6b44f33 commit 6e71e1a

File tree

2 files changed

+9
-0
lines changed

2 files changed

+9
-0
lines changed

R/boilerplates.R

Lines changed: 3 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -12,9 +12,11 @@ NULL
1212
#' constructor. For layers, these are passed on to [`layer(params)`][layer()].
1313
#' @param checks A list of calls to be evaluated before construction of the
1414
#' object, such as one constructed with [`exprs()`][rlang::exprs()].
15+
#' @param env An environment to search for the object.
1516
#'
1617
#' @return A function
1718
#' @export
19+
#' @keywords internal
1820
#'
1921
#' @examples
2022
#' # For testing purposes, a geom that returns grobs
@@ -40,6 +42,7 @@ boilerplate <- function(x, ...) {
4042
}
4143

4244
#' @export
45+
#' @rdname boilerplate
4346
boilerplate.Geom <- function(x, ..., checks = NULL, env = caller_env()) {
4447

4548
# Check that we can independently find the geom

man/boilerplate.Rd

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

0 commit comments

Comments
 (0)