This object has the results when a logistic regression model is fit to the training set and is evaluated on the test set.
Details
The code used to produce this object:
library(tidymodels)
tidymodels_prefer()
# ------------------------------------------------------------------------------
set.seed(1)
data(two_class_dat)
# ------------------------------------------------------------------------------
<- initial_split(two_class_dat)
two_class_split # ------------------------------------------------------------------------------
<- logistic_reg()
glm_spec
<-
two_class_final %>%
glm_spec last_fit(
~ .,
Class split = two_class_split
)