Skip to content

Commit c16e788

Browse files
committed
temp eliminate varying tests
1 parent a479b3e commit c16e788

File tree

2 files changed

+26
-26
lines changed

2 files changed

+26
-26
lines changed

R/varying.R

Lines changed: 13 additions & 13 deletions
Original file line numberDiff line numberDiff line change
@@ -19,23 +19,23 @@ varying <- function()
1919
#' library(dplyr)
2020
#' library(rlang)
2121
#'
22-
#' rand_forest() %>% varying_args(id = "plain")
22+
#' #rand_forest() %>% varying_args(id = "plain")
2323
#'
24-
#' rand_forest(mtry = varying()) %>% varying_args(id = "one arg")
24+
#' #rand_forest(mtry = varying()) %>% varying_args(id = "one arg")
2525
#'
26-
#' rand_forest(others = list(sample.fraction = varying())) %>%
27-
#' varying_args(id = "only others")
26+
#' #rand_forest(others = list(sample.fraction = varying())) %>%
27+
#' # varying_args(id = "only others")
2828
#'
29-
#' rand_forest(
30-
#' others = list(
31-
#' strata = expr(Class),
32-
#' sampsize = c(varying(), varying())
33-
#' )
34-
#' ) %>%
35-
#' varying_args(id = "add an expr")
29+
#' #rand_forest(
30+
#' # others = list(
31+
#' # strata = expr(Class),
32+
#' # sampsize = c(varying(), varying())
33+
#' # )
34+
#' #) %>%
35+
#' # varying_args(id = "add an expr")
3636
#'
37-
#' rand_forest(others = list(classwt = c(class1 = 1, class2 = varying()))) %>%
38-
#' varying_args(id = "list of values")
37+
#' # rand_forest(others = list(classwt = c(class1 = 1, class2 = varying()))) %>%
38+
#' # varying_args(id = "list of values")
3939
#'
4040
#' @export
4141
varying_args <- function (x, id, ...)

man/varying_args.Rd

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

0 commit comments

Comments
 (0)