Skip to content

Commit dcb00db

Browse files
authored
unexport unused check helpers (#852)
1 parent 5d7dae6 commit dcb00db

File tree

3 files changed

+1
-13
lines changed

3 files changed

+1
-13
lines changed

NAMESPACE

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -157,8 +157,6 @@ export(boost_tree)
157157
export(cforest_train)
158158
export(check_empty_ellipse)
159159
export(check_final_param)
160-
export(check_model_doesnt_exist)
161-
export(check_model_exists)
162160
export(condense_control)
163161
export(contr_one_hot)
164162
export(control_parsnip)

R/aaa_models.R

Lines changed: 0 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -123,8 +123,6 @@ check_eng_val <- function(eng) {
123123
invisible(NULL)
124124
}
125125

126-
#' @rdname set_new_model
127-
#' @export
128126
check_model_exists <- function(model) {
129127
if (rlang::is_missing(model) || length(model) != 1 || !is.character(model)) {
130128
rlang::abort("Please supply a character string for a model name (e.g. `'linear_reg'`)")
@@ -139,8 +137,6 @@ check_model_exists <- function(model) {
139137
invisible(NULL)
140138
}
141139

142-
#' @rdname set_new_model
143-
#' @export
144140
check_model_doesnt_exist <- function(model) {
145141
if (rlang::is_missing(model) || length(model) != 1 || !is.character(model)) {
146142
rlang::abort("Please supply a character string for a model name (e.g. `'linear_reg'`)")

man/set_new_model.Rd

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

0 commit comments

Comments
 (0)