如何为不同的插入符号训练模型绘制 AUC ROC?

How to plot AUC ROC for different caret training models?

这是一个代表

library(caret)
library(dplyr)

set.seed(88, sample.kind = "Rounding")

mtcars <- mtcars %>%
  mutate(am = as.factor(am))

test_index <- createDataPartition(mtcars$am, times = 1, p= 0.2, list = F)

train_cars <- mtcars[-test_index,]

test_cars <- mtcars[test_index,]

set.seed(88, sample.kind = "Rounding")
cars_nb <- train(am ~ mpg + cyl,
                data = train_cars, method = "nb", 
                trControl = trainControl(method = "cv", number = 10, savePredictions = "final"))

cars_glm <- train(am ~ mpg + cyl,
                 data = train_cars, method = "glm", 
                 trControl = trainControl(method = "cv", number = 10, savePredictions = "final"))

我的问题是,如何在单个图上创建 AUC ROC 曲线以直观地比较两个模型?

我假设您想在测试集上显示 ROC 曲线,这与使用训练数据的评论 () 中指出的问题不同。

首先要做的是提取对测试数据的预测 (newdata=test_cars),以概率 (type="prob") 的形式:

predictions_nb <- predict(cars_nb, newdata=test_cars, type="prob")
predictions_glm <- predict(cars_glm, newdata=test_cars, type="prob")

这给了我们 data.frame 属于 class 0 或 1 的概率。让我们只使用 class 1 的概率:

predictions_nb <- predict(cars_nb, newdata=test_cars, type="prob")[,"1"]
predictions_glm <- predict(cars_glm, newdata=test_cars, type="prob")[,"1"]

接下来我将使用 pROC 包为训练数据创建 ROC 曲线(免责声明:我是这个包的作者。还有其他方法可以实现结果,但这是我的方法最熟悉的):

library(pROC)
roc_nb <- roc(test_cars$am, predictions_nb)
roc_glm <- roc(test_cars$am, predictions_glm)

终于可以绘制曲线了。要使用 pROC 包获得两条曲线,请使用 lines 函数将第二条 ROC 曲线的线添加到图中

plot(roc_nb, col="green")
lines(roc_glm, col="blue")

为了使其更具可读性,您可以添加图例:

legend("bottomright", col=c("green", "blue"), legend=c("NB", "GLM"), lty=1)

以及 AUC:

legend_nb <- sprintf("NB (AUC: %.2f)", auc(roc_nb))
legend_glm <- sprintf("GLM (AUC: %.2f)", auc(roc_glm))
legend("bottomright",
       col=c("green", "blue"), lty=1,
       legend=c(legend_nb, legend_glm))