Skip to content

This object has the results when a logistic regression model is fit to the training set and is evaluated on the test set.

Value

An object with primary class last_fit.

Details

The code used to produce this object:

  library(tidymodels)
  tidymodels_prefer()

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

  set.seed(1)
  data(two_class_dat)

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

  two_class_split <- initial_split(two_class_dat)
  # ------------------------------------------------------------------------------

  glm_spec <- logistic_reg()

  two_class_final <-
    glm_spec %>%
    last_fit(
      Class  ~ .,
      split = two_class_split
    )