Skip to content

This object has the results when a flexible discriminant analysis model was tuned over the interaction degree parameters.

Value

An object with primary class tune_results.

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()

  # ------------------------------------------------------------------------------

  ctrl_gr <- control_grid(save_pred = TRUE)

  # ------------------------------------------------------------------------------

  data(scat)
  scat <- scat[complete.cases(scat), ]

  # ------------------------------------------------------------------------------

  set.seed(1)
  scat_rs <- bootstraps(scat, times = 5)

  scat_fda_bt <-
    discrim_flexible(prod_degree = tune()) %>%
    tune_grid(
      Species ~ .,
      resamples = scat_rs,
      control = ctrl_gr
    )