Skip to content

Commit

Permalink
merge upstream
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Aug 6, 2024
2 parents df2af66 + 2c6d162 commit 40c0bea
Show file tree
Hide file tree
Showing 3 changed files with 4 additions and 4 deletions.
4 changes: 2 additions & 2 deletions DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -22,7 +22,7 @@ Depends:
tune (>= 1.2.0)
Imports:
cli,
dials (>= 0.1.0),
dials (>= 0.3.0),
dplyr (>= 1.1.1),
ggplot2,
parsnip (>= 1.1.0),
Expand Down Expand Up @@ -54,4 +54,4 @@ Config/testthat/edition: 3
Encoding: UTF-8
Language: en-US
Roxygen: list(markdown = TRUE)
RoxygenNote: 7.3.1
RoxygenNote: 7.3.2
2 changes: 1 addition & 1 deletion tests/testthat/test-sa-overall.R
Original file line number Diff line number Diff line change
Expand Up @@ -138,7 +138,7 @@ test_that("incompatible parameter objects", {

set.seed(1)
grid_with_bigger_range <-
dials::grid_latin_hypercube(dials::mtry(range = c(1, 16)))
dials::grid_space_filling(dials::mtry(range = c(1, 16)))

set.seed(1)
car_folds <- rsample::vfold_cv(car_prices, v = 2)
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-win-loss-overall.R
Original file line number Diff line number Diff line change
Expand Up @@ -77,7 +77,7 @@ test_that("one player is really bad", {
add_formula(y ~ .) %>%
add_model(rf_spec)

grid <- tibble(min_n = c(1, 400))
grid <- tibble(min_n = c(1, 40))
ctrl <- control_race(burn_in = 2, alpha = .05, randomize = TRUE)
set.seed(3355)
tuning_results <- tune_race_win_loss(
Expand Down

0 comments on commit 40c0bea

Please sign in to comment.