Skip to content

Commit 616b548

Browse files
committed
use less noisy model/engine for sparsevctrs tests
1 parent 7718d67 commit 616b548

File tree

1 file changed

+9
-9
lines changed

1 file changed

+9
-9
lines changed

tests/testthat/test-sparsevctrs.R

Lines changed: 9 additions & 9 deletions
Original file line numberDiff line numberDiff line change
@@ -1,11 +1,11 @@
11
test_that("sparse matrices can be passed to `fit_xy()", {
2-
skip_if_not_installed("LiblineaR")
2+
skip_if_not_installed("xgboost")
33

44
hotel_data <- sparse_hotel_rates()
55

6-
spec <- svm_linear() %>%
6+
spec <- boost_tree() %>%
77
set_mode("regression") %>%
8-
set_engine("LiblineaR")
8+
set_engine("xgboost")
99

1010
expect_no_error(
1111
lm_fit <- fit_xy(spec, x = hotel_data[, -1], y = hotel_data[, 1])
@@ -21,7 +21,7 @@ test_that("sparse matrices can be passed to `fit_xy()", {
2121
})
2222

2323
test_that("to_sparse_data_frame() is used correctly", {
24-
skip_if_not_installed("LiblineaR")
24+
skip_if_not_installed("xgboost")
2525

2626
local_mocked_bindings(
2727
to_sparse_data_frame = function(x, object) {
@@ -50,9 +50,9 @@ test_that("to_sparse_data_frame() is used correctly", {
5050
fit_xy(spec, x = hotel_data[, -1], y = hotel_data[, 1])
5151
)
5252

53-
spec <- svm_linear() %>%
53+
spec <- boost_tree() %>%
5454
set_mode("regression") %>%
55-
set_engine("LiblineaR")
55+
set_engine("xgboost")
5656

5757
expect_snapshot(
5858
error = TRUE,
@@ -61,7 +61,7 @@ test_that("to_sparse_data_frame() is used correctly", {
6161
})
6262

6363
test_that("maybe_sparse_matrix() is used correctly", {
64-
skip_if_not_installed("LiblineaR")
64+
skip_if_not_installed("xgboost")
6565

6666
local_mocked_bindings(
6767
maybe_sparse_matrix = function(x) {
@@ -75,9 +75,9 @@ test_that("maybe_sparse_matrix() is used correctly", {
7575

7676
hotel_data <- sparse_hotel_rates()
7777

78-
spec <- svm_linear() %>%
78+
spec <- boost_tree() %>%
7979
set_mode("regression") %>%
80-
set_engine("LiblineaR")
80+
set_engine("xgboost")
8181

8282
expect_snapshot(
8383
error = TRUE,

0 commit comments

Comments
 (0)