r - 如何确保分区具有来自因子每个级别的代表性观察?

标签 r statistics partitioning factors categorical-data

我编写了一个小函数来将我的数据集划分为训练集和测试集。但是,我在处理因子变量时遇到了麻烦。在我的代码的模型验证阶段,如果模型建立在没有来自每个因子级别的表示的数据集上,我会收到错误消息。如何修复此 partition() 函数以包含来自因子变量每个级别的至少一个观察结果?

test.df <- data.frame(a = sample(c(0,1),100, rep = T),
                      b = factor(sample(letters, 100, rep = T)),
                      c = factor(sample(c("apple", "orange"), 100, rep = T)))

set.seed(123)
partition <- function(data, train.size = .7){
  train <- data[sample(1:nrow(data), round(train.size*nrow(data)), rep= FALSE), ]
  test <- data[-as.numeric(row.names(train)), ]
  partitioned.data <- list(train = train, test = test)
  return(partitioned.data)
}

part.data <- partition(test.df)
table(part.data$train[,'b'])
table(part.data$test[,'b'])

编辑 - 使用 'caret' 包和 createDataPartition() 的新函数:
partition <- function(data, factor=NULL, train.size = .7){
  if (("package:caret" %in% search()) == FALSE){
    stop("Install and Load 'caret' package")
  }
  if (is.null(factor)){
    train.index <- createDataPartition(as.numeric(row.names(data)),
                                       times = 1, p = train.size, list = FALSE)
    train <- data[train.index, ]
    test <- data[-train.index, ]
  }
  else{
    train.index <- createDataPartition(factor,
                                       times = 1, p = train.size, list = FALSE)
    train <- data[train.index, ]
    test <- data[-train.index, ]
  }
  partitioned.data <- list(train = train, test = test)
  return(partitioned.data)
}

最佳答案

试试 caret 包,特别是函数 createDataPartition() .它应该完全符合您的需要,可在 CRAN 上找到,主页在这里:

caret - data splitting

我提到的函数部分是我在网上找到的一些代码,然后我稍微修改了它以更好地处理边缘情况(例如,当您要求样本大小大于集合或子集时)。

stratified <- function(df, group, size) {
  # USE: * Specify your data frame and grouping variable (as column
  # number) as the first two arguments.
  # * Decide on your sample size. For a sample proportional to the
  # population, enter "size" as a decimal. For an equal number
  # of samples from each group, enter "size" as a whole number.
  #
  # Example 1: Sample 10% of each group from a data frame named "z",
  # where the grouping variable is the fourth variable, use:
  #
  # > stratified(z, 4, .1)
  #
  # Example 2: Sample 5 observations from each group from a data frame
  # named "z"; grouping variable is the third variable:
  #
  # > stratified(z, 3, 5)
  #
  require(sampling)
  temp = df[order(df[group]),]
  colsToReturn <- ncol(df)

  #Don't want to attempt to sample more than possible
  dfCounts <- table(df[group])
  if (size > min(dfCounts)) {
    size <- min(dfCounts)
  }



  if (size < 1) {
    size = ceiling(table(temp[group]) * size)
  } else if (size >= 1) {
    size = rep(size, times=length(table(temp[group])))
  }
  strat = strata(temp, stratanames = names(temp[group]),
                 size = size, method = "srswor")
  (dsample = getdata(temp, strat))

  dsample <- dsample[order(dsample[1]),]
  dsample <- data.frame(dsample[,1:colsToReturn], row.names=NULL)
  return(dsample)

}

关于r - 如何确保分区具有来自因子每个级别的代表性观察?,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/16493920/

相关文章:

r - 如何在R中根据网格索引坐标数据?

通过字符子集执行查找时保留矩阵维度

python - 修改 soft-max 函数以对列表中的最小值给出最高概率的最佳方法是什么?

python - 有什么方法可以在Python中标记变量吗?

sql-server - 大表分区——索引

apache-spark - 如何在 spark 中使用 repartition() 指定文件大小

r - 找出R表中的列是否包含重复值?

r - 用于运行多个变量的线性模型和方差分析并收集数据框中的 p 值的函数

r - 列表的搜索和子集列表

r - 使用 R 包 fBasics 计算样本过剩峰度