Skip to content

Commit bf3f505

Browse files
authored
export check_args() (#1059)
1 parent fec8199 commit bf3f505

25 files changed

+53
-1
lines changed

NAMESPACE

Lines changed: 24 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -5,6 +5,29 @@ S3method(.censoring_weights_graf,model_fit)
55
S3method(augment,model_fit)
66
S3method(autoplot,glmnet)
77
S3method(autoplot,model_fit)
8+
S3method(check_args,C5_rules)
9+
S3method(check_args,bag_tree)
10+
S3method(check_args,boost_tree)
11+
S3method(check_args,cubist_rules)
12+
S3method(check_args,decision_tree)
13+
S3method(check_args,default)
14+
S3method(check_args,discrim_flexible)
15+
S3method(check_args,discrim_linear)
16+
S3method(check_args,discrim_regularized)
17+
S3method(check_args,linear_reg)
18+
S3method(check_args,logistic_reg)
19+
S3method(check_args,mars)
20+
S3method(check_args,mlp)
21+
S3method(check_args,multinom_reg)
22+
S3method(check_args,nearest_neighbor)
23+
S3method(check_args,pls)
24+
S3method(check_args,poisson_reg)
25+
S3method(check_args,rand_forest)
26+
S3method(check_args,surv_reg)
27+
S3method(check_args,survival_reg)
28+
S3method(check_args,svm_linear)
29+
S3method(check_args,svm_poly)
30+
S3method(check_args,svm_rbf)
831
S3method(extract_fit_engine,model_fit)
932
S3method(extract_parameter_dials,model_spec)
1033
S3method(extract_parameter_set_dials,model_spec)
@@ -180,6 +203,7 @@ export(bartMachine_interval_calc)
180203
export(boost_tree)
181204
export(case_weights_allowed)
182205
export(cforest_train)
206+
export(check_args)
183207
export(check_empty_ellipse)
184208
export(check_final_param)
185209
export(condense_control)

R/bag_tree.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -84,6 +84,7 @@ update.bag_tree <-
8484

8585
# ------------------------------------------------------------------------------
8686

87+
#' @export
8788
check_args.bag_tree <- function(object) {
8889
if (object$engine == "C5.0" && object$mode == "regression")
8990
stop("C5.0 is classification only.", call. = FALSE)

R/boost_tree.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -163,6 +163,7 @@ translate.boost_tree <- function(x, engine = x$engine, ...) {
163163

164164
# ------------------------------------------------------------------------------
165165

166+
#' @export
166167
check_args.boost_tree <- function(object) {
167168

168169
args <- lapply(object$args, rlang::eval_tidy)

R/c5_rules.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -110,6 +110,7 @@ update.C5_rules <-
110110

111111
# make work in different places
112112

113+
#' @export
113114
check_args.C5_rules <- function(object) {
114115

115116
args <- lapply(object$args, rlang::eval_tidy)

R/cubist_rules.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -134,6 +134,7 @@ update.cubist_rules <-
134134

135135
# make work in different places
136136

137+
#' @export
137138
check_args.cubist_rules <- function(object) {
138139

139140
args <- lapply(object$args, rlang::eval_tidy)

R/decision_tree.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -127,6 +127,7 @@ translate.decision_tree <- function(x, engine = x$engine, ...) {
127127

128128
# ------------------------------------------------------------------------------
129129

130+
#' @export
130131
check_args.decision_tree <- function(object) {
131132
if (object$engine == "C5.0" && object$mode == "regression")
132133
rlang::abort("C5.0 is classification only.")

R/discrim_flexible.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -84,6 +84,7 @@ update.discrim_flexible <-
8484

8585
# ------------------------------------------------------------------------------
8686

87+
#' @export
8788
check_args.discrim_flexible <- function(object) {
8889

8990
args <- lapply(object$args, rlang::eval_tidy)

R/discrim_linear.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -79,6 +79,7 @@ update.discrim_linear <-
7979

8080
# ------------------------------------------------------------------------------
8181

82+
#' @export
8283
check_args.discrim_linear <- function(object) {
8384

8485
args <- lapply(object$args, rlang::eval_tidy)

R/discrim_regularized.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -94,6 +94,7 @@ update.discrim_regularized <-
9494

9595
# ------------------------------------------------------------------------------
9696

97+
#' @export
9798
check_args.discrim_regularized <- function(object) {
9899

99100
args <- lapply(object$args, rlang::eval_tidy)

R/linear_reg.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -105,6 +105,7 @@ update.linear_reg <-
105105

106106
# ------------------------------------------------------------------------------
107107

108+
#' @export
108109
check_args.linear_reg <- function(object) {
109110

110111
args <- lapply(object$args, rlang::eval_tidy)

0 commit comments

Comments
 (0)