如何使用purrr中的map和dplyr中的mutate来生成glm摘要表?

时间:2018-12-29 09:56:53

标签: r dplyr glm purrr

我正在使用purrr和broom软件包生成一系列glm,并使用模型信息构建表格,以便进行比较。

当我从purrr调用map函数时,代码失败。我认为问题与mutate和map的组合有关。我想为每个glm生成一个表,并为glm的组件创建一个列。

数据和代码

library(broom)
library(tidyverse)

# Produce a dummy dataset
set.seed(123)
dummy <- tibble(ID = 1:50,
                A = sample(x = 1:200, size = 50, replace = T),
                B = as.factor(sample(x = c("day", "night"), size = 50, replace = T)),
                C = as.factor(sample(x = c("blue", "red", "green"), size = 50, replace = T)))

# Nest the data
nested <- dummy %>% select(-ID) %>% nest()

# Define a function for a generalized linear model with a poisson family
mod_f <- function(x, df = nested) {glm(formula = as.formula(x), family = poisson, data = df)}

# Make a list of formulas as a column in a new dataframe
# A is our response variable that we try to predict using B and C
formulas <- c("A ~ 1", "A ~ B", "A ~ C", "A ~ B + C")
tbl <- tibble(forms = formulas)

# Fit the glm's using each of the formulas from the formulas vector
tbl_2 <- tbl %>% mutate(mods = map(formulas, mod_f))
        #gla = mods %>% map(glance),
        #tid = mods %>% map(tidy),
        #aug = mods %>% map(augment),
        #AIC = gla %>% map_dbl("AIC"))

错误

  

mutate_impl(.data,点)中的错误:评估错误:未找到对象'A'

2 个答案:

答案 0 :(得分:2)

您在函数中犯了一个错误:您调用了df而不是dummy.,不确定是否可以重构以将其推广。 在这里:

   mod_f <- function(x, df = nested) {glm(formula = as.formula(x), family = poisson, data = dummy)}

# Make a list of formulas as a column in a new dataframe
# A is our response variable that we try to predict using B and C

    formulas <- c("A ~ 1", "A ~ B", "A ~ C", "A ~ B + C")
    tbl <- tibble(forms = formulas)

    # Fit the glm's using each of the formulas from the formulas vector
    tbl_2 <- tbl %>% mutate(mods = map(formulas, mod_f))

这将产生:

forms     mods     
  <chr>     <list>   
1 A ~ 1     <S3: glm>
2 A ~ B     <S3: glm>
3 A ~ C     <S3: glm>
4 A ~ B + C <S3: glm>
    `Map(mod_f,formulas)` 

收益率等等:

$`A ~ 1`

Call:  glm(formula = as.formula(x), family = poisson, data = dummy)

Coefficients:
(Intercept)  
      4.649  

Degrees of Freedom: 49 Total (i.e. Null);  49 Residual
Null Deviance:      1840 
Residual Deviance: 1840     AIC: 2154

答案 1 :(得分:1)

另一个Stackoverflow用户提供的最终答案:

library(broom)
library(tidyverse)

# Produce a dummy dataset
set.seed(123)
dummy <- tibble(ID = 1:50,
                A = sample(x = 1:200, size = 50, replace = T),
                B = as.factor(sample(x = c("day", "night"), size = 50, replace = T)),
                C = as.factor(sample(x = c("blue", "red", "green"), size = 50, replace = T)))

# Define a function for a generalized linear model with a poisson family
mod_f <- function(x) {glm(formula = as.formula(x), family = poisson, data = dummy)}

# Make a list of formulas as a column in a new dataframe
# A is yhe response variable we try to predict using B and C
formulas <- c("A ~ 1", "A ~ B", "A ~ C", "A ~ B + C")
tbl <- tibble(forms = formulas)

# Fit the glm using each of the formulas stored in the formulas vector
tbl_2 <- tbl %>% mutate(all = map(formulas, mod_f),
                        gla = all %>% map(glance),
                        tid = all %>% map(tidy),
                        aug = all %>% map(augment),
                        AIC = all%>% map_dbl("AIC"))