statistical test with ggpredict: first and second differences?

I have a question about executing a simple two-tailed t-test in R to compare marginal effects.

The much-cited Mize 2019 provides an intuitive presentation for assessing Interaction effects via marginal effects, including both plot and table.

The ggpredict (and ggeffect) appears to provide “most” of what I need: (1) output table (pred prob / std error / CIs) and (2) plot (both are somewhat similar to Mize 2019, Figure 12 / Table 3)

But ggpredict does not appear to provide for an easy computation of the accompanying statistical test to assess significance in first and second differences across marginal effects?

Is there an easy way to (automatically) run the relevant t tests with ggpredict output? (Bonus question: can I manipulate ggpredict "output" in a smart way to create a good-looking table?)

Attaching:
1 reprex code
2 Example of table I'm trying to generate, where I require 3 statistical tests (NOTE: fictions numbers in table align with numbers from reprex below)

Thanks Scott
Screen Shot 2020-09-14 at 6.58.22 AM


  library(mlogit)
#> Loading required package: dfidx
#> 
#> Attaching package: 'dfidx'
#> The following object is masked from 'package:stats':
#> 
#>     filter
  library(sjPlot)
  library(ggeffects)
  
  # create ex. data set.  1 row per respondent (dataset shows 2 resp). Each resp answers 3 choice sets, w/ 2 alternatives in each set. 
  cedata.1 <- data.frame( id    =  c(1,1,1,1,1,1,2,2,2,2,2,2),    # respondent ID. 
                          QES    = c(1,1,2,2,3,3,1,1,2,2,3,3),   # Choice set (with 2 alternatives)    
                          Alt    = c(1,2,1,2,1,2,1,2,1,2,1,2),   # Alt 1 or Alt 2 in  choice set 
                          LOC    = c(0,0,1,1,0,1,0,1,1,0,0,1),   # attribute describing alternative. binary categorical variable
                          SIZE   = c(1,1,1,0,0,1,0,0,1,1,0,1),   # attribute describing alternative. binary categorical variable
                          Choice = c(0,1,1,0,1,0,0,1,0,1,0,1),   # if alternative is Chosen (1) or not (0)
                          gender = c(1,1,1,1,1,1,0,0,0,0,0,0)   # male or female (repeats for each indivdual) 
  )
  
  # convert dep var Choice to factor as required by sjPlot
  cedata.1$Choice <- as.factor(cedata.1$Choice)
  cedata.1$LOC <- as.factor(cedata.1$LOC)
  cedata.1$SIZE <- as.factor(cedata.1$SIZE)
  
  # estimate model. 
glm.model <- glm(Choice ~  LOC*SIZE, data=cedata.1, family = binomial(link = "logit"))

  # estimate MEs for use in IE assessment
LOC.SIZE <- ggpredict(glm.model, terms = c("LOC", "SIZE")) 
LOC.SIZE
#> 
#> # Predicted probabilities of Choice
#> # x = LOC
#> 
#> # SIZE = 0
#> 
#> x | Predicted |   SE |       95% CI
#> -----------------------------------
#> 0 |      0.33 | 1.22 | [0.04, 0.85]
#> 1 |      0.50 | 1.41 | [0.06, 0.94]
#> 
#> # SIZE = 1
#> 
#> x | Predicted |   SE |       95% CI
#> -----------------------------------
#> 0 |      0.67 | 1.22 | [0.15, 0.96]
#> 1 |      0.50 | 1.00 | [0.12, 0.88]
#> Standard errors are on the link-scale (untransformed).

  # plot 
  plot(LOC.SIZE, connect.lines = TRUE)

The LOC.SIZE object doesn't contain the p-values

suppressPackageStartupMessages({library(ggeffects)
                               library(mlogit)
                               library(sjPlot)})
cedata.1 <- data.frame( id    =  c(1,1,1,1,1,1,2,2,2,2,2,2),    # respondent ID. 
  QES    = c(1,1,2,2,3,3,1,1,2,2,3,3),   # Choice set (with 2 alternatives)    
  Alt    = c(1,2,1,2,1,2,1,2,1,2,1,2),   # Alt 1 or Alt 2 in  choice set 
  LOC    = c(0,0,1,1,0,1,0,1,1,0,0,1),   # attribute describing alternative. binary categorical variable
  SIZE   = c(1,1,1,0,0,1,0,0,1,1,0,1),   # attribute describing alternative. binary categorical variable
  Choice = c(0,1,1,0,1,0,0,1,0,1,0,1),   # if alternative is Chosen (1) or not (0)
  gender = c(1,1,1,1,1,1,0,0,0,0,0,0)   # male or female (repeats for each indivdual) 
)

cedata.1$Choice <- as.factor(cedata.1$Choice)
cedata.1$LOC <- as.factor(cedata.1$LOC)
cedata.1$SIZE <- as.factor(cedata.1$SIZE)

glm.model <- glm(Choice ~  LOC*SIZE, data=cedata.1, family = binomial(link = "logit"))

LOC.SIZE <- ggpredict(glm.model, terms = c("LOC", "SIZE")) 


str(LOC.SIZE)
#> Classes 'ggeffects' and 'data.frame':    4 obs. of  6 variables:
#>  $ x        : Factor w/ 2 levels "0","1": 1 1 2 2
#>  $ predicted: num  0.333 0.667 0.5 0.5
#>  $ std.error: num  1.22 1.22 1.41 1
#>  $ conf.low : num  0.0434 0.1535 0.0589 0.1235
#>  $ conf.high: num  0.846 0.957 0.941 0.877
#>  $ group    : Factor w/ 2 levels "0","1": 1 2 1 2
#>  - attr(*, "legend.labels")= chr [1:2] "0" "1"
#>  - attr(*, "x.is.factor")= chr "1"
#>  - attr(*, "continuous.group")= logi FALSE
#>  - attr(*, "rawdata")='data.frame':  12 obs. of  3 variables:
#>   ..$ response: Factor w/ 2 levels "0","1": 1 2 2 1 2 1 1 2 1 2 ...
#>   ..$ x       : num [1:12] 0 0 1 1 0 1 0 1 1 0 ...
#>   .. ..- attr(*, "labels")= Named num [1:2] 0 1
#>   .. .. ..- attr(*, "names")= chr [1:2] "0" "1"
#>   ..$ group   : Factor w/ 2 levels "0","1": 2 2 2 1 1 2 1 1 2 2 ...
#>  - attr(*, "title")= chr "Predicted probabilities of Choice"
#>  - attr(*, "x.title")= chr "LOC"
#>  - attr(*, "y.title")= chr "Choice"
#>  - attr(*, "legend.title")= chr "SIZE"
#>  - attr(*, "x.axis.labels")= chr [1:2] "0" "1"
#>  - attr(*, "constant.values")= Named list()
#>  - attr(*, "terms")= chr [1:2] "LOC" "SIZE"
#>  - attr(*, "original.terms")= chr [1:2] "LOC" "SIZE"
#>  - attr(*, "at.list")=List of 2
#>   ..$ LOC : chr [1:2] "0" "1"
#>   ..$ SIZE: chr [1:2] "0" "1"
#>  - attr(*, "ci.lvl")= num 0.95
#>  - attr(*, "family")= chr "binomial"
#>  - attr(*, "link")= chr "logit"
#>  - attr(*, "logistic")= chr "1"
#>  - attr(*, "is.trial")= chr "0"
#>  - attr(*, "fitfun")= chr "glm"
#>  - attr(*, "model.name")= chr "glm.model"
str(glm.model)
#> List of 30
#>  $ coefficients     : Named num [1:4] -0.693 0.693 1.386 -1.386
#>   ..- attr(*, "names")= chr [1:4] "(Intercept)" "LOC1" "SIZE1" "LOC1:SIZE1"
#>  $ residuals        : Named num [1:12] -3 1.5 2 -2 3 ...
#>   ..- attr(*, "names")= chr [1:12] "1" "2" "3" "4" ...
#>  $ fitted.values    : Named num [1:12] 0.667 0.667 0.5 0.5 0.333 ...
#>   ..- attr(*, "names")= chr [1:12] "1" "2" "3" "4" ...
#>  $ effects          : Named num [1:12] 0.00 2.22e-16 -5.66e-01 -5.66e-01 2.12 ...
#>   ..- attr(*, "names")= chr [1:12] "(Intercept)" "LOC1" "SIZE1" "LOC1:SIZE1" ...
#>  $ R                : num [1:4, 1:4] -1.683 0 0 0 -0.891 ...
#>   ..- attr(*, "dimnames")=List of 2
#>   .. ..$ : chr [1:4] "(Intercept)" "LOC1" "SIZE1" "LOC1:SIZE1"
#>   .. ..$ : chr [1:4] "(Intercept)" "LOC1" "SIZE1" "LOC1:SIZE1"
#>  $ rank             : int 4
#>  $ qr               :List of 5
#>   ..$ qr   : num [1:12, 1:4] -1.683 0.28 0.297 0.297 0.28 ...
#>   .. ..- attr(*, "dimnames")=List of 2
#>   .. .. ..$ : chr [1:12] "1" "2" "3" "4" ...
#>   .. .. ..$ : chr [1:4] "(Intercept)" "LOC1" "SIZE1" "LOC1:SIZE1"
#>   ..$ rank : int 4
#>   ..$ qraux: num [1:4] 1.28 1.23 1.2 1.33
#>   ..$ pivot: int [1:4] 1 2 3 4
#>   ..$ tol  : num 1e-11
#>   ..- attr(*, "class")= chr "qr"
#>  $ family           :List of 12
#>   ..$ family    : chr "binomial"
#>   ..$ link      : chr "logit"
#>   ..$ linkfun   :function (mu)  
#>   ..$ linkinv   :function (eta)  
#>   ..$ variance  :function (mu)  
#>   ..$ dev.resids:function (y, mu, wt)  
#>   ..$ aic       :function (y, n, mu, wt, dev)  
#>   ..$ mu.eta    :function (eta)  
#>   ..$ initialize: language {     if (NCOL(y) == 1) { ...
#>   ..$ validmu   :function (mu)  
#>   ..$ valideta  :function (eta)  
#>   ..$ simulate  :function (object, nsim)  
#>   ..- attr(*, "class")= chr "family"
#>  $ linear.predictors: Named num [1:12] 6.93e-01 6.93e-01 6.66e-16 3.33e-16 -6.93e-01 ...
#>   ..- attr(*, "names")= chr [1:12] "1" "2" "3" "4" ...
#>  $ deviance         : num 16
#>  $ aic              : num 24
#>  $ null.deviance    : num 16.6
#>  $ iter             : int 4
#>  $ weights          : Named num [1:12] 0.222 0.222 0.25 0.25 0.222 ...
#>   ..- attr(*, "names")= chr [1:12] "1" "2" "3" "4" ...
#>  $ prior.weights    : Named num [1:12] 1 1 1 1 1 1 1 1 1 1 ...
#>   ..- attr(*, "names")= chr [1:12] "1" "2" "3" "4" ...
#>  $ df.residual      : int 8
#>  $ df.null          : int 11
#>  $ y                : Named num [1:12] 0 1 1 0 1 0 0 1 0 1 ...
#>   ..- attr(*, "names")= chr [1:12] "1" "2" "3" "4" ...
#>  $ converged        : logi TRUE
#>  $ boundary         : logi FALSE
#>  $ model            :'data.frame':   12 obs. of  3 variables:
#>   ..$ Choice: Factor w/ 2 levels "0","1": 1 2 2 1 2 1 1 2 1 2 ...
#>   ..$ LOC   : Factor w/ 2 levels "0","1": 1 1 2 2 1 2 1 2 2 1 ...
#>   ..$ SIZE  : Factor w/ 2 levels "0","1": 2 2 2 1 1 2 1 1 2 2 ...
#>   ..- attr(*, "terms")=Classes 'terms', 'formula'  language Choice ~ LOC * SIZE
#>   .. .. ..- attr(*, "variables")= language list(Choice, LOC, SIZE)
#>   .. .. ..- attr(*, "factors")= int [1:3, 1:3] 0 1 0 0 0 1 0 1 1
#>   .. .. .. ..- attr(*, "dimnames")=List of 2
#>   .. .. .. .. ..$ : chr [1:3] "Choice" "LOC" "SIZE"
#>   .. .. .. .. ..$ : chr [1:3] "LOC" "SIZE" "LOC:SIZE"
#>   .. .. ..- attr(*, "term.labels")= chr [1:3] "LOC" "SIZE" "LOC:SIZE"
#>   .. .. ..- attr(*, "order")= int [1:3] 1 1 2
#>   .. .. ..- attr(*, "intercept")= int 1
#>   .. .. ..- attr(*, "response")= int 1
#>   .. .. ..- attr(*, ".Environment")=<environment: R_GlobalEnv> 
#>   .. .. ..- attr(*, "predvars")= language list(Choice, LOC, SIZE)
#>   .. .. ..- attr(*, "dataClasses")= Named chr [1:3] "factor" "factor" "factor"
#>   .. .. .. ..- attr(*, "names")= chr [1:3] "Choice" "LOC" "SIZE"
#>  $ call             : language glm(formula = Choice ~ LOC * SIZE, family = binomial(link = "logit"), data = cedata.1)
#>  $ formula          :Class 'formula'  language Choice ~ LOC * SIZE
#>   .. ..- attr(*, ".Environment")=<environment: R_GlobalEnv> 
#>  $ terms            :Classes 'terms', 'formula'  language Choice ~ LOC * SIZE
#>   .. ..- attr(*, "variables")= language list(Choice, LOC, SIZE)
#>   .. ..- attr(*, "factors")= int [1:3, 1:3] 0 1 0 0 0 1 0 1 1
#>   .. .. ..- attr(*, "dimnames")=List of 2
#>   .. .. .. ..$ : chr [1:3] "Choice" "LOC" "SIZE"
#>   .. .. .. ..$ : chr [1:3] "LOC" "SIZE" "LOC:SIZE"
#>   .. ..- attr(*, "term.labels")= chr [1:3] "LOC" "SIZE" "LOC:SIZE"
#>   .. ..- attr(*, "order")= int [1:3] 1 1 2
#>   .. ..- attr(*, "intercept")= int 1
#>   .. ..- attr(*, "response")= int 1
#>   .. ..- attr(*, ".Environment")=<environment: R_GlobalEnv> 
#>   .. ..- attr(*, "predvars")= language list(Choice, LOC, SIZE)
#>   .. ..- attr(*, "dataClasses")= Named chr [1:3] "factor" "factor" "factor"
#>   .. .. ..- attr(*, "names")= chr [1:3] "Choice" "LOC" "SIZE"
#>  $ data             :'data.frame':   12 obs. of  7 variables:
#>   ..$ id    : num [1:12] 1 1 1 1 1 1 2 2 2 2 ...
#>   ..$ QES   : num [1:12] 1 1 2 2 3 3 1 1 2 2 ...
#>   ..$ Alt   : num [1:12] 1 2 1 2 1 2 1 2 1 2 ...
#>   ..$ LOC   : Factor w/ 2 levels "0","1": 1 1 2 2 1 2 1 2 2 1 ...
#>   ..$ SIZE  : Factor w/ 2 levels "0","1": 2 2 2 1 1 2 1 1 2 2 ...
#>   ..$ Choice: Factor w/ 2 levels "0","1": 1 2 2 1 2 1 1 2 1 2 ...
#>   ..$ gender: num [1:12] 1 1 1 1 1 1 0 0 0 0 ...
#>  $ offset           : NULL
#>  $ control          :List of 3
#>   ..$ epsilon: num 1e-08
#>   ..$ maxit  : num 25
#>   ..$ trace  : logi FALSE
#>  $ method           : chr "glm.fit"
#>  $ contrasts        :List of 2
#>   ..$ LOC : chr "contr.treatment"
#>   ..$ SIZE: chr "contr.treatment"
#>  $ xlevels          :List of 2
#>   ..$ LOC : chr [1:2] "0" "1"
#>   ..$ SIZE: chr [1:2] "0" "1"
#>  - attr(*, "class")= chr [1:2] "glm" "lm"

Created on 2020-09-13 by the reprex package (v0.3.0)

The two objects do provide all the pieces required to produce data frames for rendering as kable or pander tables.

I understand there are no p-values in ggeffect output. But I wonder if you could be more specific about how kable or pander tables could be used to run the two-tailed t-tests that I need?

It seems tsum.test might do the trick (using summary statistics as input rather than the full "population level data") but I'm unsure how to make this work in a way that allows me to replicate and repeat the test several times across different model specifications. Any input would be much appreciated.

In my reprex case above (2 binary variables) I would need to 3 statistical tests (see updated table in original post, where numbers now match the (fictions) numbers in my reprex).

thanks, Scott

1 Like

Here is an example in pander. To get headers, gt or xtable and passing \LaTeX are two alternatived

suppressPackageStartupMessages({
                                library(mlogit)
                                library(sjPlot)
                                library(ggeffects)})

cedata.1 <- data.frame(id = c(1,1,1,1,1,1,2,2,2,2,2,2),   
                      QES    = c(1,1,2,2,3,3,1,1,2,2,3,3),
                      Alt    = c(1,2,1,2,1,2,1,2,1,2,1,2),
                      LOC    = c(0,0,1,1,0,1,0,1,1,0,0,1),
                      SIZE   = c(1,1,1,0,0,1,0,0,1,1,0,1),
                      Choice = c(0,1,1,0,1,0,0,1,0,1,0,1),
                      gender = c(1,1,1,1,1,1,0,0,0,0,0,0)
                      )

cedata.1$Choice <- as.factor(cedata.1$Choice)
cedata.1$LOC <- as.factor(cedata.1$LOC)
cedata.1$SIZE <- as.factor(cedata.1$SIZE)

glm.model <- glm(Choice ~  LOC*SIZE, data=cedata.1, 
                 family = binomial(link = "logit"))

LOC.SIZE <- ggpredict(glm.model, terms = c("LOC", "SIZE")) 

# FUNCTIONS

mk_2pl <- function(x) {
  prettyNum(x,digits = 2)
}

# CONSTANTS

header_row  <- c("","Probability of choosing",
             "First Difference","Second Difference")
col1  <- c("LOC=0:Size=0","LOC=0:SIZE=1","LOC=1:SIZE=0","LOC=1:SIZE=1")
blank <- ""

# ggpredict results extracted for formatting
the_tests <- LOC.SIZE$predicted
topfst <- LOC.SIZE$predicted[2]-LOC.SIZE$predicted[1]
botfst <- LOC.SIZE$predicted[4]-LOC.SIZE$predicted[3]
secdf  <- botfst - topfst

# convert to strings
col2 <- mk_2pl(the_tests)
piece1 <- paste(mk_2pl(the_tests[2]),"-",mk_2pl(the_tests[1]),"=",mk_2pl(topfst))
piece2 <- paste(mk_2pl(the_tests[4]),"-",mk_2pl(the_tests[3]),"=",mk_2pl(botfst))
col4 <- paste(mk_2pl(botfst),"-",mk_2pl(topfst),"=",mk_2pl(secdf))
col3 <- c(piece1,piece2)

# create data frame

assembled <- as.data.frame(cbind(col1,col2,col3,col4))
colnames(assembled) <- header_row
assembled[2,3] <- blank
assembled[3,3] <- blank
assembled[c(1,3,4),4] <- blank
pander::pander(assembled)
Probability of choosing First Difference Second Difference
LOC=0:Size=0 0.33 0.67 - 0.33 = 0.33
LOC=0:SIZE=1 0.67 0 - 0.33 = -0.33
LOC=1:SIZE=0 0.5
LOC=1:SIZE=1 0.5 0.5 - 0.5 = 0

Created on 2020-09-13 by the reprex package (v0.3.0)

thanks, this is interesting and good to know when it comes to summarizing results in table format.

As I interpret your answer, it doesn't seem possible to run a statistical test given the outputs from ggpredict (or ggeffects), i.e., H0: marginal effects from 1st and 2nd difference are equal? (perhaps i will write a separate post about that question...?)

thanks
scott

Do you mean the effects?

yes, the marginal effects... see my revised question directly above.

> glm.model$effects
  (Intercept)          LOC1         SIZE1    LOC1:SIZE1               
 0.000000e+00  2.220446e-16 -5.659525e-01 -5.659524e-01  2.121540e+00 
                                                                      
-6.324397e-01  2.200239e-04  2.127152e+00 -6.324397e-01  5.514607e-01 
                            
 2.200239e-04  1.367560e+00 

Apologize for communicating poorly. It's not the "$effects" I want to test but rather:

I want to run a statistical test (two-sample t test) to determine whether the first and second difference in your pander table above are statistically significantly different from each other. In other words, three separate tests (two "first diff" tests and 1 second diff test).

Your previous reply said ggeffects does not return p-values. But is there some other way?
tsum.test was a suggestion, but I can't make it work. other options?

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.