Nothing
test_that("racing S3 methods", {
skip_if_not_installed("Matrix", "1.6-2")
skip_if_not_installed("lme4", "1.1-35.1")
library(purrr)
library(dplyr)
library(parsnip)
library(rsample)
library(recipes)
knn_mod_power <-
nearest_neighbor(mode = "regression", dist_power = tune()) %>%
set_engine("kknn")
simple_rec <- recipe(mpg ~ ., data = mtcars)
set.seed(7898)
race_folds <- vfold_cv(mtcars, repeats = 2)
ctrl_rc <- control_race(save_pred = TRUE)
set.seed(9323)
anova_race <-
tune_race_anova(knn_mod_power,
simple_rec,
resamples = race_folds,
grid = tibble::tibble(dist_power = c(1/10, 1, 2)),
control = ctrl_rc)
# ------------------------------------------------------------------------------
# collect metrics
expect_equal(nrow(collect_metrics(anova_race)), 2)
expect_equal(nrow(collect_metrics(anova_race, all_configs = TRUE)), 6)
expect_equal(nrow(collect_metrics(anova_race, summarize = FALSE)), 2 * 20)
expect_equal(
nrow(collect_metrics(anova_race, summarize = FALSE, all_configs = TRUE)),
nrow(map_dfr(anova_race$.metrics, ~ .x))
)
# ------------------------------------------------------------------------------
# collect predictions
expect_equal(
nrow(collect_predictions(anova_race, all_configs = FALSE, summarize = TRUE)),
nrow(mtcars) * 1 # 1 config x nrow(mtcars)
)
expect_equal(
nrow(collect_predictions(anova_race, all_configs = TRUE, summarize = TRUE)),
map_dfr(anova_race$.predictions, ~ .x) %>% distinct(.config, .row) %>% nrow()
)
expect_equal(
nrow(collect_predictions(anova_race, all_configs = FALSE, summarize = FALSE)),
nrow(mtcars) * 1 * 2 # 1 config x 2 repeats x nrow(mtcars)
)
expect_equal(
nrow(collect_predictions(anova_race, all_configs = TRUE, summarize = FALSE)),
nrow(map_dfr(anova_race$.predictions, ~ .x))
)
# ------------------------------------------------------------------------------
# show_best and select_best
expect_equal(nrow(show_best(anova_race, metric = "rmse")), 1)
expect_true(all(show_best(anova_race, metric = "rmse")$n == 20))
expect_equal(nrow(select_best(anova_race, metric = "rmse")), 1)
expect_equal(
nrow(select_by_pct_loss(anova_race, metric = "rmse", dist_power, limit = 10)),
1
)
expect_equal(
nrow(select_by_one_std_err(anova_race, metric = "rmse", dist_power)),
1
)
})
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.