tidymodels / tune

Tools for tidy parameter tuning
https://tune.tidymodels.org
Other
273 stars 42 forks source link

`augment.tune_results()` doesn't always return tibbles #759

Closed EmilHvitfeldt closed 9 months ago

EmilHvitfeldt commented 9 months ago
library(tidymodels)

lr_spec <- parsnip::logistic_reg() %>% parsnip::set_engine("glm")

set.seed(1)
two_class_dat <- as.data.frame(two_class_dat)
bt1 <- rsample::bootstraps(two_class_dat, times = 30)

set.seed(1)
fit_1 <- fit_resamples(
  lr_spec,
  Class ~ .,
  bt1,
  control = control_resamples(save_pred = TRUE)
)
augment(fit_1) %>% class()
#> [1] "data.frame"
github-actions[bot] commented 9 months ago

This issue has been automatically locked. If you believe you have found a related problem, please file a new issue (with a reprex: https://reprex.tidyverse.org) and link to this issue.