This object has the results when a flexible discriminant analysis model was tuned over the interaction degree parameters.
Details
To reduce the object size, five bootstraps were used for resampling and missing data were removed.
The code used to produce this object:
library(tidymodels)
library(discrim)
tidymodels_prefer()
# ------------------------------------------------------------------------------
<- control_grid(save_pred = TRUE)
ctrl_gr
# ------------------------------------------------------------------------------
data(scat)
<- scat[complete.cases(scat), ]
scat
# ------------------------------------------------------------------------------
set.seed(1)
<- bootstraps(scat, times = 5)
scat_rs
<-
scat_fda_bt discrim_flexible(prod_degree = tune()) %>%
tune_grid(
~ .,
Species resamples = scat_rs,
control = ctrl_gr
)