Skip to content

Commit

Permalink
speed up baguette case weights test (#208)
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch authored Mar 1, 2024
1 parent 1056af1 commit d18eff2
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions tests/testthat/test-baguette-case-weights.R
Original file line number Diff line number Diff line change
Expand Up @@ -78,7 +78,7 @@ test_that('bag_mars - earth case weights', {
bag_mars() %>%
set_engine("earth", times = 2) %>%
set_mode("regression") %>%
fit(Sale_Price ~ ., data = dat$full, case_weights = dat$wts)
fit(Sale_Price ~ ., data = dat$full[1:100,], case_weights = dat$wts[1:100])
},
regexp = NA)

Expand All @@ -87,7 +87,7 @@ test_that('bag_mars - earth case weights', {
bag_mars() %>%
set_engine("earth", times = 2) %>%
set_mode("regression") %>%
fit(Sale_Price ~ ., data = dat$full)
fit(Sale_Price ~ ., data = dat$full[1:100,])

expect_unequal(unwt_fit$fit$imp, wt_fit$fit$imp)
})
Expand Down

0 comments on commit d18eff2

Please sign in to comment.