Skip to content

Commit 7b21f72

Browse files
lorenzwalthertjonmcalder
authored andcommitted
also move @name tag
1 parent 8ebe143 commit 7b21f72

File tree

3 files changed

+6
-6
lines changed

3 files changed

+6
-6
lines changed

R/serialized_tests.R

Lines changed: 1 addition & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -187,6 +187,7 @@ testthat_file <- function(...) {
187187
file.path(rprojroot::find_testthat_root_file(), ...)
188188
}
189189

190+
190191
#' Copy a file to a temporary directory
191192
#'
192193
#' Takes the path to a file as input and returns the path where the temporary
@@ -201,11 +202,6 @@ copy_to_tempdir <- function(path_perm = testthat_file()) {
201202
}
202203

203204

204-
#' Set arguments
205-
#' @param write_tree Whether or not to write tree.
206-
#' @name set_args
207-
NULL
208-
209205
stop_insufficient_r_version <- function() {
210206
stop(paste0(
211207
"Can't write tree with R version ", getRversion(),

R/set-args.R

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
#' Set arguments
2+
#' @param write_tree Whether or not to write tree.
3+
#' @name set_args
4+
NULL
15

26
#' @describeIn set_args Sets the argument `write_tree` in
37
#' [test_collection()] to be `TRUE` for R versions higher or equal to 3.2, and

man/set_args.Rd

Lines changed: 1 addition & 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)