Skip to content

Commit 0ea300d

Browse files
committed
travis test to see if glmnet is installed
1 parent b440a39 commit 0ea300d

File tree

1 file changed

+3
-3
lines changed

1 file changed

+3
-3
lines changed

tests/testthat/test_linear_reg_glmnet.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -1,7 +1,7 @@
11
library(testthat)
22
library(parsnip)
33
library(rlang)
4-
4+
library(glmnet)
55
# ------------------------------------------------------------------------------
66

77
context("linear regression execution with glmnet")
@@ -198,9 +198,9 @@ test_that('submodel prediction', {
198198
mp_res <- multi_predict(reg_fit, new_data = mtcars[1:4, -1], penalty = .1)
199199
mp_res <- do.call("rbind", mp_res$.pred)
200200
expect_equal(mp_res[[".pred"]], unname(pred_glmn[,1]))
201-
201+
202202
expect_error(
203-
multi_predict(reg_fit, newdata = mtcars[1:4, -1], penalty = .1),
203+
multi_predict(reg_fit, newdata = mtcars[1:4, -1], penalty = .1),
204204
"Did you mean"
205205
)
206206
})

0 commit comments

Comments
 (0)