Skip to content

Commit a9ad95f

Browse files
committed
R CMD Check fixes
1 parent 4bf8e88 commit a9ad95f

File tree

1 file changed

+2
-3
lines changed

1 file changed

+2
-3
lines changed

tests/testthat/test_boost_tree_C50.R

Lines changed: 2 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -108,7 +108,6 @@ test_that('C5.0 probabilities', {
108108
test_that('submodel prediction', {
109109

110110
skip_if_not_installed("C50")
111-
library(C50)
112111

113112
vars <- c("female", "tenure", "total_charges", "phone_service", "monthly_charges")
114113
class_fit <-
@@ -121,9 +120,9 @@ test_that('submodel prediction', {
121120
mp_res <- multi_predict(class_fit, new_data = wa_churn[1:4, vars], trees = 4, type = "prob")
122121
mp_res <- do.call("rbind", mp_res$.pred)
123122
expect_equal(mp_res[[".pred_No"]], unname(pred_class[, "No"]))
124-
123+
125124
expect_error(
126-
multi_predict(class_fit, newdata = wa_churn[1:4, vars], trees = 4, type = "prob"),
125+
multi_predict(class_fit, newdata = wa_churn[1:4, vars], trees = 4, type = "prob"),
127126
"Did you mean"
128127
)
129128
})

0 commit comments

Comments
 (0)