nfl <- readr::read_csv("/home/poyser/Downloads/NFL games.csv") %>%
mutate(accuracy=as.factor(accuracy)
, perc=majority/crowd
, perc2=perc^2)
## Parsed with column specification:
## cols(
## decision = col_double(),
## majority = col_double(),
## crowd = col_double(),
## accuracy = col_double()
## )
m1 <- glm(accuracy~perc, data = nfl, family = "binomial")
stargazer::stargazer(m1, type = "text")
##
## =============================================
## Dependent variable:
## ---------------------------
## accuracy
## ---------------------------------------------
## perc 2.531**
## (1.074)
##
## Constant -1.299
## (0.845)
##
## ---------------------------------------------
## Observations 226
## Log Likelihood -141.492
## Akaike Inf. Crit. 286.984
## =============================================
## Note: *p<0.1; **p<0.05; ***p<0.01