如何使用库(插入符号)更改指标? [英] How to change metrics using the library(caret)?

查看:47
本文介绍了如何使用库(插入符号)更改指标?的处理方法,对大家解决问题具有一定的参考价值,需要的朋友们下面随着小编来一起学习吧!

问题描述

我想使用

 caret library

给定一些示例数据:

  ivar1<-rnorm(500, mean = 3, sd = 1)
  ivar2<-rnorm(500, mean = 4, sd = 1)
  ivar3<-rnorm(500, mean = 5, sd = 1)
  ivar4<-rnorm(500, mean = 4, sd = 1)
  dvar<-rpois(500, exp(3+ 0.1*ivar1 - 0.25*ivar2))

  data<-data.frame(dvar,ivar4,ivar3,ivar2,ivar1)



  ctrl <- rfeControl(functions=rfFuncs,
                  method="cv",
                  repeats = 5,
                  verbose = FALSE,
                  number=5)

model <- rfe(data[,2:4], data[,1], sizes=c(1:4), rfeControl=ctrl)

这里我想改成RMSLE并保持图形的想法

Here I would like to change to RMSLE and keeping the idea of the graph

plot <-ggplot(model,type=c("g", "o"), metric="RMSE")+ scale_x_continuous(breaks = 2:4, labels = names(data)[2:4])

推荐答案

我不确定如何/是否可以轻松地将 RMSE 转换为 RMSLE,因此您可以尝试更改控制功能.

Im not sure how / if you can easily convert RMSE to RMSLE, so you can try changing the control function.

看看rfFuncs$summary,它调用了一个函数postResample.这是计算 RMSE 的地方 - 查看部分

Look at rfFuncs$summary it calls a function postResample. This is where the RMSE is calculated - look at the section

mse <- mean((pred - obs)^2)
n <- length(obs)
out <- c(sqrt(mse), resamplCor^2)

所以你可以修改这个函数来计算RMSLE:

So you can amend this function to calculate the RMSLE instead:

msle <- mean((log(pred) - log(obs))^2)
out <- sqrt(msle)
}
names(out) <- "RMSLE"

如果修改后的函数已经保存在一个名为mypostResample的函数中,那么你需要更新rfFuncs$summary.

Then if this amended function has been saved in a function called mypostResample, you then need to update the rfFuncs$summary.

总之:

首先更新汇总函数 - 这将使用 RMSLE 调用新函数

First update the summary function - this will call the new function with RMSLE

newSumm <- function (data, lev = NULL, model = NULL) 
          {
          if (is.character(data$obs)) 
          data$obs <- factor(data$obs, levels = lev)
          mypostResample(data[, "pred"], data[, "obs"])
          }

然后定义新函数来计算 RMSLE

Then define new function to calculate RMSLE

mypostResample <- function (pred, obs) 
               {
               isNA <- is.na(pred)
               pred <- pred[!isNA]
               obs <- obs[!isNA]

               msle <- mean((log(pred) - log(obs))^2)
               out <- sqrt(msle)
               names(out) <- "RMSLE"

               if (any(is.nan(out))) 
                  out[is.nan(out)] <- NA
               out
               }

更新 rfFuncs

# keep old settings for future use
oldSumm <- rfFuncs$summary 

# update with new function
rfFuncs$summary <- newSumm

ctrl <- rfeControl(functions=rfFuncs,
                   method="cv",
                   repeats = 5,
                   verbose = FALSE,
                   number=5)
set.seed(1)
model <- rfe(data[,2:4], data[,1], sizes=c(1:4), rfeControl=ctrl, metric="RMSLE")

# plot
ggplot(model,type=c("g", "o"), metric="RMSLE")+ scale_x_continuous(breaks = 2:4, labels = names(data)[2:4])

这篇关于如何使用库(插入符号)更改指标?的文章就介绍到这了,希望我们推荐的答案对大家有所帮助,也希望大家多多支持IT屋!

查看全文
登录 关闭
扫码关注1秒登录
发送“验证码”获取 | 15天全站免登陆