Disfrute, compromiso y alcohol

Conformación de la base

La base original tenía 510 casos. Por sugerencia de Vani, decidimos quedarnos sólo con los casos menores de 18 años (n = 370; 309 casos completos).

La base tiene sólo los puntajes de las dimensiones ya constituidas, y no los ítems. Entiendo que en los modelos SEM se incluyen los ítems para la formación de variables latentes que posteriormente se relacionan. No estoy seguro si se puede poner directamente las medias de los ítems como si fuesen variables observadas (creería que no). De cualquier manera, avanzo con los análisis con esta base para que podamos avanzar en la escritura y podemos definir más adelante si lo hacemos a partir de los ítems o de las medias.

Los análisis los desarrollé en función de las preguntas que me pasó Vani:

  1. ¿El disfrute total se relaciona con alguna de las variables de consumo (originales o recodificadas) a través del compromiso?
  2. Si no se logra de manera general, ¿qué variable del disfrute se relaciona y a través de qué variable del compromiso?
  3. Si no se logra, ¿funciona mejor si en lugar del disfrute incluimos la realización personal?

Pregunta 1

Frecuencia de consumo

model <- '

# regressions
comprtot ~ a*disfrutetot
AUDIT01 ~ cp*disfrutetot
AUDIT01 ~ b*comprtot

# Efecto indirecto y total
ab := a * b
total := cp + ab
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1


kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS 1 1 0 0
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 1 iteration
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                         6
## 
##                                                   Used       Total
##   Number of observations                           363         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                                 0.000
##   Degrees of freedom                                 0
## 
## Model Test Baseline Model:
## 
##   Test statistic                            453791.396
##   Degrees of freedom                                 3
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    1.000
##   Tucker-Lewis Index (TLI)                       1.000
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.000
##   90 Percent confidence interval - lower         0.000
##   90 Percent confidence interval - upper         0.000
##   P-value H_0: RMSEA <= 0.050                       NA
##   P-value H_0: RMSEA >= 0.080                       NA
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.000
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Regressions:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   comprtot ~                                                            
##     disfruttt  (a)    0.688    0.001  554.580    0.000    0.688    0.578
##   AUDIT01 ~                                                             
##     disfruttt (cp)    0.006    0.002    3.339    0.001    0.006    0.040
##     comprtot   (b)   -0.019    0.001  -14.408    0.000   -0.019   -0.157
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .comprtot         48.579    0.093  523.355    0.000   48.579    0.666
##    .AUDIT01           1.043    0.053   19.838    0.000    1.043    0.981
##     disfrutetot      51.413    0.053  978.205    0.000   51.413    1.000
## 
## R-Square:
##                    Estimate
##     comprtot          0.334
##     AUDIT01           0.019
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab               -0.013    0.001  -14.398    0.000   -0.013   -0.091
##     total            -0.007    0.001   -7.170    0.000   -0.007   -0.051
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

Las estimaciones dan divinas (todas significativas y en el sentido esperado), pero el \(\chi^2\) da 0 y 0 grados de libertad, lo cual no parece correcto. Posiblemente tenga que ver con que no hay variables latentes (al no incluir los ítems, las tres variables se interpretan como variables observadas). Aun así, el efecto directo (\(\beta_{std}\) = 0.04), el efecto indirecto (\(\beta_{std}\) = -0.09) y el efecto total (\(\beta_{std}\) = -0.05) del disfrute sobre el consumo de alcohol es bastante bajo.

Cantidad de consumo

model <- '

# regressions
comprtot ~ a*disfrutetot
AUDIT02 ~ cp*disfrutetot
AUDIT02 ~ b*comprtot

# Efecto indirecto y total
ab := a * b
total := cp + ab
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1

kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS 1 1 0 0
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 1 iteration
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                         6
## 
##                                                   Used       Total
##   Number of observations                           363         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                                 0.000
##   Degrees of freedom                                 0
## 
## Model Test Baseline Model:
## 
##   Test statistic                            442007.863
##   Degrees of freedom                                 3
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    1.000
##   Tucker-Lewis Index (TLI)                       1.000
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.000
##   90 Percent confidence interval - lower         0.000
##   90 Percent confidence interval - upper         0.000
##   P-value H_0: RMSEA <= 0.050                       NA
##   P-value H_0: RMSEA >= 0.080                       NA
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.000
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Regressions:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   comprtot ~                                                            
##     disfruttt  (a)    0.687    0.001  547.843    0.000    0.687    0.573
##   AUDIT02 ~                                                             
##     disfruttt (cp)    0.022    0.002   12.954    0.000    0.022    0.141
##     comprtot   (b)   -0.022    0.001  -16.763    0.000   -0.022   -0.166
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .comprtot         49.141    0.093  530.220    0.000   49.141    0.672
##    .AUDIT02           1.229    0.053   23.345    0.000    1.229    0.979
##     disfrutetot      50.859    0.053  967.651    0.000   50.859    1.000
## 
## R-Square:
##                    Estimate
##     comprtot          0.328
##     AUDIT02           0.021
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab               -0.015    0.001  -16.739    0.000   -0.015   -0.095
##     total             0.007    0.001    6.913    0.000    0.007    0.045
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

Sucede lo mismo que con la frecuencia de consumo, todo da divino pero es sospechoso el tema del \(\chi^2\) y los grados de libertad. En este caso, el efecto directo es un poco más elevado(\(\beta_{std}\) = 0.14) y el efecto indirecto se mantiene igual(\(\beta_{std}\) = -0.09), por lo que el efecto total termina siendo positivo (\(\beta_{std}\) = 0.05) aunque sigue siendo bajo.

Frecuencia de consumo excesivo

model <- '

# regressions
comprtot ~ a*disfrutetot
AUDIT03 ~ cp*disfrutetot
AUDIT03 ~ b*comprtot

# Efecto indirecto y total
ab := a * b
total := cp + ab
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1

kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS Inf 1 1 0 0
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 1 iteration
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                         6
## 
##                                                   Used       Total
##   Number of observations                           364         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                                 0.000
##   Degrees of freedom                                 0
## 
## Model Test Baseline Model:
## 
##   Test statistic                            383458.971
##   Degrees of freedom                                 3
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    1.000
##   Tucker-Lewis Index (TLI)                       1.000
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.000
##   90 Percent confidence interval - lower         0.000
##   90 Percent confidence interval - upper         0.000
##   P-value H_0: RMSEA <= 0.050                       NA
##   P-value H_0: RMSEA >= 0.080                       NA
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.000
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Regressions:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   comprtot ~                                                            
##     disfruttt  (a)    0.667    0.001  514.946    0.000    0.667    0.555
##   AUDIT03 ~                                                             
##     disfruttt (cp)    0.012    0.002    7.116    0.000    0.012    0.079
##     comprtot   (b)   -0.018    0.001  -14.129    0.000   -0.018   -0.143
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .comprtot         48.729    0.091  537.995    0.000   48.729    0.692
##    .AUDIT03           1.135    0.053   21.605    0.000    1.135    0.986
##     disfrutetot      48.704    0.052  927.929    0.000   48.704    1.000
## 
## R-Square:
##                    Estimate
##     comprtot          0.308
##     AUDIT03           0.014
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab               -0.012    0.001  -14.116    0.000   -0.012   -0.079
##     total            -0.000    0.001   -0.001    0.999   -0.000   -0.000
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

Seguimos teniendo el mismo problema que en los otros dos casos. Además, el efecto directo tiene el mismo tamaño (\(\beta_{std}\) = 0.08) que el efecto indirecto (\(\beta_{std}\) = -0.08), por lo que el efecto total del disfrute no resultó significativo.

Pregunta 2

Para responder esta pregunta armé los modelos considerando las subdimensiones como variables observadas. Por ejemplo, disfrute está planteada como una variable latente que determina los valores de dos variables observadas (afecto positivo e involucramiento). Esto se acerca más a la utilización de los ítems observados, lo cual probablmeente mejore el problema que veníamos teniendo.

Frecuencia de consumo

model <- '

disfrute =~ afectopositivo + involucramiento
compromiso =~ confianza + energia + dedicacion + entusiasmo


# regressions
compromiso ~ a*disfrute
AUDIT01 ~ cp*disfrute
AUDIT01 ~ b*compromiso

# Efecto indirecto y total
ab := a * b
total := cp + ab
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1


kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS 68.888 0.992 0.987 0.433 0.035
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 56 iterations
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                        16
## 
##                                                   Used       Total
##   Number of observations                           363         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                               826.660
##   Degrees of freedom                                12
##   P-value (Unknown)                                 NA
## 
## Model Test Baseline Model:
## 
##   Test statistic                            106645.748
##   Degrees of freedom                                21
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    0.992
##   Tucker-Lewis Index (TLI)                       0.987
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.433
##   90 Percent confidence interval - lower         0.408
##   90 Percent confidence interval - upper         0.458
##   P-value H_0: RMSEA <= 0.050                    0.000
##   P-value H_0: RMSEA >= 0.080                    1.000
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.035
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Latent Variables:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   disfrute =~                                                           
##     afectopositivo    1.000                               2.617    0.779
##     involucramient    1.059    0.009  119.430    0.000    2.772    0.548
##   compromiso =~                                                         
##     confianza         1.000                               2.059    0.622
##     energia           0.935    0.008  112.202    0.000    1.926    0.763
##     dedicacion        1.011    0.009  114.606    0.000    2.081    0.781
##     entusiasmo        0.772    0.007  104.472    0.000    1.590    0.730
## 
## Regressions:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso ~                                                          
##     disfrute   (a)    0.674    0.007   94.320    0.000    0.857    0.857
##   AUDIT01 ~                                                             
##     disfrute  (cp)    0.093    0.026    3.503    0.000    0.242    0.235
##     compromis  (b)   -0.176    0.034   -5.233    0.000   -0.362   -0.351
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .afectopositivo    4.435    0.092   48.065    0.000    4.435    0.393
##    .involucramient   17.937    0.100  179.355    0.000   17.937    0.700
##    .confianza         6.702    0.073   91.544    0.000    6.702    0.613
##    .energia           2.660    0.070   37.913    0.000    2.660    0.418
##    .dedicacion        2.762    0.074   37.455    0.000    2.762    0.389
##    .entusiasmo        2.219    0.064   34.692    0.000    2.219    0.467
##    .AUDIT01           1.024    0.054   19.002    0.000    1.024    0.963
##     disfrute          6.848    0.076   90.314    0.000    1.000    1.000
##    .compromiso        1.126    0.044   25.478    0.000    0.266    0.266
## 
## R-Square:
##                    Estimate
##     afectopositivo    0.607
##     involucramient    0.300
##     confianza         0.387
##     energia           0.582
##     dedicacion        0.611
##     entusiasmo        0.533
##     AUDIT01           0.037
##     compromiso        0.734
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab               -0.118    0.023   -5.201    0.000   -0.310   -0.301
##     total            -0.026    0.005   -4.905    0.000   -0.068   -0.066
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
          residuals=F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

Efectivamente, los indicadores de bondad de ajuste ya parecen más normales (aunque el RMSEA de bastante mal). Todos los parámetros estimados fueron significativos. Las relaciones del disfrute son más intensas en este formato, especialmente con el compromiso. El efecto directo del disfrute sobre el consumo de alcohol resultó más elevado (\(\beta_{std}\) = 0.24), pero el efecto indirecto también (\(\beta_{std}\) = -0.30), por lo que el efecto total sigue siendo negativo, aunque bajo (\(\beta_{std}\) = -0.07).

En lo que respecta a las subdimensiones, el afecto positivo tiene bastante más peso que el involucramiento al definir la variable latente “disfrute”. Por otro lado, en el compromiso son la dedicación y la energía las variables de más peso, aunque todas presentan una importancia similar.

Cantidad de consumo

model <- '

disfrute =~ afectopositivo + involucramiento
compromiso =~ confianza + energia + dedicacion + entusiasmo


# regressions
compromiso ~ a*disfrute
AUDIT02 ~ cp*disfrute
AUDIT02 ~ b*compromiso

# Efecto indirecto y total
ab := a * b
total := cp + ab
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1


kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS 76.272 0.991 0.985 0.456 0.041
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 57 iterations
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                        16
## 
##                                                   Used       Total
##   Number of observations                           363         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                               915.259
##   Degrees of freedom                                12
##   P-value (Unknown)                                 NA
## 
## Model Test Baseline Model:
## 
##   Test statistic                            104458.419
##   Degrees of freedom                                21
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    0.991
##   Tucker-Lewis Index (TLI)                       0.985
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.456
##   90 Percent confidence interval - lower         0.431
##   90 Percent confidence interval - upper         0.481
##   P-value H_0: RMSEA <= 0.050                    0.000
##   P-value H_0: RMSEA >= 0.080                    1.000
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.041
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Latent Variables:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   disfrute =~                                                           
##     afectopositivo    1.000                               2.599    0.775
##     involucramient    1.050    0.009  117.979    0.000    2.728    0.541
##   compromiso =~                                                         
##     confianza         1.000                               2.052    0.615
##     energia           0.945    0.008  111.462    0.000    1.939    0.767
##     dedicacion        1.019    0.009  113.725    0.000    2.092    0.784
##     entusiasmo        0.768    0.007  103.259    0.000    1.577    0.728
## 
## Regressions:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso ~                                                          
##     disfrute   (a)    0.675    0.007   92.575    0.000    0.855    0.855
##   AUDIT02 ~                                                             
##     disfrute  (cp)    0.237    0.028    8.467    0.000    0.615    0.549
##     compromis  (b)   -0.310    0.035   -8.800    0.000   -0.636   -0.568
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .afectopositivo    4.504    0.092   48.707    0.000    4.504    0.400
##    .involucramient   17.977    0.099  181.742    0.000   17.977    0.707
##    .confianza         6.911    0.073   94.352    0.000    6.911    0.621
##    .energia           2.635    0.071   37.303    0.000    2.635    0.412
##    .dedicacion        2.747    0.074   37.007    0.000    2.747    0.386
##    .entusiasmo        2.206    0.064   34.543    0.000    2.206    0.470
##    .AUDIT02           1.142    0.058   19.638    0.000    1.142    0.910
##     disfrute          6.756    0.076   88.809    0.000    1.000    1.000
##    .compromiso        1.130    0.044   25.516    0.000    0.268    0.268
## 
## R-Square:
##                    Estimate
##     afectopositivo    0.600
##     involucramient    0.293
##     confianza         0.379
##     energia           0.588
##     dedicacion        0.614
##     entusiasmo        0.530
##     AUDIT02           0.090
##     compromiso        0.732
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab               -0.209    0.024   -8.604    0.000   -0.544   -0.486
##     total             0.027    0.005    5.067    0.000    0.071    0.063
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
          residuals=F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

El modelo ajusta igual que el anterior (bien en todo menos en RMSEA y con todos los parámentros significaivos). En este caso, la relación directa entre el disfrute y el consumo es bastante más intensa (\(\beta_{std}\) = 0.55) y el efecto indirecto también (\(\beta_{std}\) = -49), aunque no lo suficiente como para lograr que el efecto total del disfrute sobre la cantidad de bebidas por ocasión sea negativo (\(\beta_{std}\) = 0.06).

Frecuencia de consumo excesivo

model <- '

disfrute =~ afectopositivo + involucramiento
compromiso =~ confianza + energia + dedicacion + entusiasmo


# regressions
compromiso ~ a*disfrute
AUDIT03 ~ cp*disfrute
AUDIT03 ~ b*compromiso

# Efecto indirecto y total
ab := a * b
total := cp + ab
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1


kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS 81.428 0.99 0.982 0.471 0.04
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 63 iterations
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                        16
## 
##                                                   Used       Total
##   Number of observations                           364         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                               977.140
##   Degrees of freedom                                12
##   P-value (Unknown)                                 NA
## 
## Model Test Baseline Model:
## 
##   Test statistic                             92697.059
##   Degrees of freedom                                21
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    0.990
##   Tucker-Lewis Index (TLI)                       0.982
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.471
##   90 Percent confidence interval - lower         0.446
##   90 Percent confidence interval - upper         0.496
##   P-value H_0: RMSEA <= 0.050                    0.000
##   P-value H_0: RMSEA >= 0.080                    1.000
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.040
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Latent Variables:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   disfrute =~                                                           
##     afectopositivo    1.000                               2.581    0.776
##     involucramient    0.999    0.009  110.166    0.000    2.577    0.522
##   compromiso =~                                                         
##     confianza         1.000                               2.067    0.622
##     energia           0.908    0.009  105.521    0.000    1.877    0.755
##     dedicacion        0.987    0.009  107.864    0.000    2.040    0.776
##     entusiasmo        0.727    0.007   96.966    0.000    1.503    0.712
## 
## Regressions:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso ~                                                          
##     disfrute   (a)    0.674    0.008   86.822    0.000    0.841    0.841
##   AUDIT03 ~                                                             
##     disfrute  (cp)    0.132    0.025    5.221    0.000    0.340    0.317
##     compromis  (b)   -0.195    0.031   -6.245    0.000   -0.404   -0.377
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .afectopositivo    4.407    0.096   46.016    0.000    4.407    0.398
##    .involucramient   17.697    0.096  185.172    0.000   17.697    0.727
##    .confianza         6.780    0.075   90.239    0.000    6.780    0.613
##    .energia           2.654    0.070   37.660    0.000    2.654    0.430
##    .dedicacion        2.740    0.074   36.825    0.000    2.740    0.397
##    .entusiasmo        2.195    0.063   34.640    0.000    2.195    0.493
##    .AUDIT03           1.104    0.055   20.217    0.000    1.104    0.958
##     disfrute          6.660    0.080   83.133    0.000    1.000    1.000
##    .compromiso        1.251    0.047   26.619    0.000    0.293    0.293
## 
## R-Square:
##                    Estimate
##     afectopositivo    0.602
##     involucramient    0.273
##     confianza         0.387
##     energia           0.570
##     dedicacion        0.603
##     entusiasmo        0.507
##     AUDIT03           0.042
##     compromiso        0.707
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab               -0.132    0.021   -6.177    0.000   -0.340   -0.317
##     total            -0.000    0.006   -0.005    0.996   -0.000   -0.000
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
          residuals=F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

Al igual que en los dos anteriores, el modelo ajusta bien salvo por el RMSEA. Casi todos los parámetros son significativos, a excepción del efecto total del disfrute sobre la frecuencia de CEEA (como pasaba en el modelo sin las subdimensiones). Nuevamente, el efecto directo (\(\beta_{std}\) = 0.32) e indirecto (\(\beta_{std}\) = -0.32) tienen magnitudes similares en direcciones opuestas, por lo que el efecto total resulta no significativo.

Pregunta 3

Dado que la propuesta en la pregunta 2 funcionó mejor, usé el compromiso con sus cuatro dimensiones.

Frecuencia de consumo

model <- '

compromiso =~ confianza + energia + dedicacion + entusiasmo


# regressions
compromiso ~ a*realizaciónpersonal
AUDIT01 ~ cp*realizaciónpersonal
AUDIT01 ~ b*compromiso

# Efecto indirecto y total
ab := a * b
total := cp + ab
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1


kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS 23.765 0.997 0.994 0.251 0.022
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 48 iterations
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                        13
## 
##                                                   Used       Total
##   Number of observations                           362         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                               190.122
##   Degrees of freedom                                 8
##   P-value (Unknown)                                 NA
## 
## Model Test Baseline Model:
## 
##   Test statistic                             53763.494
##   Degrees of freedom                                15
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    0.997
##   Tucker-Lewis Index (TLI)                       0.994
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.251
##   90 Percent confidence interval - lower         0.221
##   90 Percent confidence interval - upper         0.283
##   P-value H_0: RMSEA <= 0.050                    0.000
##   P-value H_0: RMSEA >= 0.080                    1.000
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.022
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Latent Variables:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso =~                                                         
##     confianza         1.000                               1.951    0.590
##     energia           0.958    0.011   88.821    0.000    1.869    0.741
##     dedicacion        1.138    0.013   90.720    0.000    2.220    0.834
##     entusiasmo        0.823    0.010   85.108    0.000    1.607    0.737
## 
## Regressions:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso ~                                                          
##     rlzcnprsn  (a)    0.248    0.002  100.540    0.000    0.127    0.518
##   AUDIT01 ~                                                             
##     rlzcnprsn (cp)   -0.065    0.005  -13.242    0.000   -0.065   -0.259
##     compromis  (b)   -0.006    0.011   -0.597    0.551   -0.012   -0.012
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .confianza         7.139    0.077   92.503    0.000    7.139    0.652
##    .energia           2.873    0.075   38.418    0.000    2.873    0.451
##    .dedicacion        2.158    0.086   24.980    0.000    2.158    0.304
##    .entusiasmo        2.175    0.068   31.858    0.000    2.175    0.457
##    .AUDIT01           0.990    0.053   18.658    0.000    0.990    0.930
##    .compromiso        2.788    0.046   60.567    0.000    0.732    0.732
##     realizacnprsnl   16.617    0.053  315.719    0.000   16.617    1.000
## 
## R-Square:
##                    Estimate
##     confianza         0.348
##     energia           0.549
##     dedicacion        0.696
##     entusiasmo        0.543
##     AUDIT01           0.070
##     compromiso        0.268
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab               -0.002    0.003   -0.597    0.551   -0.002   -0.006
##     total            -0.067    0.003  -21.119    0.000   -0.067   -0.265
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
          residuals=F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

El ajuste funciona más o menos como en los modelos anteriores. Pero me parece que se da un resultado medio paradójico y creería que es, nuevamente, por considerar la realización personal como una variable observada. El compromiso no resulta un predictor significativo del consumo. Más allá de eso, el efecto directo de la realización personal sobre la frecuencia de consumo es moderado (\(\beta_{std}\) = -0.26). El efecto indirecto no resultó significativo, por lo que el efecto total es casi el mismo que el directo (\(\beta_{std}\) = -0.27).

Cantidad de consumo

model <- '

compromiso =~ confianza + energia + dedicacion + entusiasmo


# regressions
compromiso ~ a*realizaciónpersonal
AUDIT02 ~ cp*realizaciónpersonal
AUDIT02 ~ b*compromiso

# Efecto indirecto y total
ab := a * b
total := cp + ab
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1


kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS 28.136 0.996 0.992 0.274 0.03
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 44 iterations
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                        13
## 
##                                                   Used       Total
##   Number of observations                           362         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                               225.087
##   Degrees of freedom                                 8
##   P-value (Unknown)                                 NA
## 
## Model Test Baseline Model:
## 
##   Test statistic                             53569.107
##   Degrees of freedom                                15
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    0.996
##   Tucker-Lewis Index (TLI)                       0.992
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.274
##   90 Percent confidence interval - lower         0.244
##   90 Percent confidence interval - upper         0.306
##   P-value H_0: RMSEA <= 0.050                    0.000
##   P-value H_0: RMSEA >= 0.080                    1.000
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.030
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Latent Variables:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso =~                                                         
##     confianza         1.000                               1.959    0.587
##     energia           0.959    0.011   88.975    0.000    1.879    0.743
##     dedicacion        1.135    0.013   90.777    0.000    2.224    0.834
##     entusiasmo        0.811    0.010   84.844    0.000    1.590    0.733
## 
## Regressions:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso ~                                                          
##     rlzcnprsn  (a)    0.250    0.002  100.558    0.000    0.128    0.518
##   AUDIT02 ~                                                             
##     rlzcnprsn (cp)   -0.049    0.005   -9.887    0.000   -0.049   -0.178
##     compromis  (b)   -0.002    0.011   -0.198    0.843   -0.004   -0.004
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .confianza         7.291    0.077   94.174    0.000    7.291    0.655
##    .energia           2.863    0.075   38.146    0.000    2.863    0.448
##    .dedicacion        2.171    0.087   25.094    0.000    2.171    0.305
##    .entusiasmo        2.174    0.068   32.024    0.000    2.174    0.462
##    .AUDIT02           1.218    0.053   23.027    0.000    1.218    0.968
##    .compromiso        2.808    0.046   60.633    0.000    0.731    0.731
##     realizacnprsnl   16.505    0.053  313.595    0.000   16.505    1.000
## 
## R-Square:
##                    Estimate
##     confianza         0.345
##     energia           0.552
##     dedicacion        0.695
##     entusiasmo        0.538
##     AUDIT02           0.032
##     compromiso        0.269
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab               -0.001    0.003   -0.198    0.843   -0.001   -0.002
##     total            -0.050    0.003  -15.571    0.000   -0.050   -0.180
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
          residuals=F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

El modelo ajusta igual. Prácticamente el mismo resultado que para la frecuencia de consumo.

Frecuencia de consumo excesivo

model <- '

compromiso =~ confianza + energia + dedicacion + entusiasmo


# regressions
compromiso ~ a*realizaciónpersonal
AUDIT03 ~ cp*realizaciónpersonal
AUDIT03 ~ b*compromiso

# Efecto indirecto y total
ab := a * b
total := cp + ab
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1


kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS 24.278 0.996 0.993 0.254 0.027
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 54 iterations
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                        13
## 
##                                                   Used       Total
##   Number of observations                           363         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                               194.223
##   Degrees of freedom                                 8
##   P-value (Unknown)                                 NA
## 
## Model Test Baseline Model:
## 
##   Test statistic                             48520.263
##   Degrees of freedom                                15
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    0.996
##   Tucker-Lewis Index (TLI)                       0.993
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.254
##   90 Percent confidence interval - lower         0.223
##   90 Percent confidence interval - upper         0.285
##   P-value H_0: RMSEA <= 0.050                    0.000
##   P-value H_0: RMSEA >= 0.080                    1.000
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.027
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Latent Variables:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso =~                                                         
##     confianza         1.000                               1.963    0.590
##     energia           0.928    0.011   84.954    0.000    1.822    0.733
##     dedicacion        1.108    0.013   86.732    0.000    2.174    0.828
##     entusiasmo        0.775    0.010   80.545    0.000    1.521    0.720
## 
## Regressions:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso ~                                                          
##     rlzcnprsn  (a)    0.246    0.003   96.598    0.000    0.125    0.504
##   AUDIT03 ~                                                             
##     rlzcnprsn (cp)   -0.050    0.005  -10.119    0.000   -0.050   -0.188
##     compromis  (b)   -0.008    0.011   -0.724    0.469   -0.015   -0.014
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .confianza         7.207    0.079   91.240    0.000    7.207    0.652
##    .energia           2.858    0.075   38.272    0.000    2.858    0.463
##    .dedicacion        2.168    0.087   25.021    0.000    2.168    0.314
##    .entusiasmo        2.150    0.067   32.001    0.000    2.150    0.482
##    .AUDIT03           1.111    0.053   21.027    0.000    1.111    0.962
##    .compromiso        2.873    0.049   58.987    0.000    0.746    0.746
##     realizacnprsnl   16.180    0.053  307.841    0.000   16.180    1.000
## 
## R-Square:
##                    Estimate
##     confianza         0.348
##     energia           0.537
##     dedicacion        0.686
##     entusiasmo        0.518
##     AUDIT03           0.038
##     compromiso        0.254
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab               -0.002    0.003   -0.724    0.469   -0.002   -0.007
##     total            -0.052    0.003  -15.977    0.000   -0.052   -0.195
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
          residuals=F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

Prácticamente los mismos resultados que para los dos modelos anteriores.

Propuesta completa

Solo por probar, armé un modelo en el que el disfrute predice el consumo de forma directa y de forma indirecta, tanto a través del compromiso como de la realización personal.

Frecuencia de consumo

model <- '

disfrute =~ afectopositivo + involucramiento
compromiso =~ confianza + energia + dedicacion + entusiasmo



# regressions
compromiso ~ a1*disfrute
realizaciónpersonal ~ a2*disfrute
AUDIT01 ~ cp*disfrute
AUDIT01 ~ b1*compromiso
AUDIT01 ~ b2*realizaciónpersonal

# Efecto indirecto (compromiso)
ab1 := a1 * b1

# Efecto indirecto (realizacion pers)
ab2 := a2 * b2

# Efecto total
total := cp + ab1 + ab2
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1


kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS 269.717 0.971 0.952 0.863 0.045
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 83 iterations
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                        19
## 
##                                                   Used       Total
##   Number of observations                           362         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                              4585.183
##   Degrees of freedom                                17
##   P-value (Unknown)                                 NA
## 
## Model Test Baseline Model:
## 
##   Test statistic                            155398.804
##   Degrees of freedom                                28
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    0.971
##   Tucker-Lewis Index (TLI)                       0.952
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.863
##   90 Percent confidence interval - lower         0.842
##   90 Percent confidence interval - upper         0.884
##   P-value H_0: RMSEA <= 0.050                    0.000
##   P-value H_0: RMSEA >= 0.080                    1.000
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.045
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Latent Variables:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   disfrute =~                                                           
##     afectopositivo    1.000                               2.864    0.856
##     involucramient    0.825    0.006  142.426    0.000    2.364    0.466
##   compromiso =~                                                         
##     confianza         1.000                               1.992    0.602
##     energia           0.963    0.008  123.274    0.000    1.918    0.760
##     dedicacion        1.066    0.008  127.187    0.000    2.123    0.797
##     entusiasmo        0.813    0.007  115.225    0.000    1.619    0.742
## 
## Regressions:
##                         Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso ~                                                               
##     disfrute  (a1)         0.619    0.005  113.950    0.000    0.890    0.890
##   realizaciónpersonal ~                                                      
##     disfrute  (a2)         0.783    0.006  140.700    0.000    2.243    0.550
##   AUDIT01 ~                                                                  
##     disfrute  (cp)         0.162    0.034    4.816    0.000    0.463    0.449
##     compromis (b1)        -0.201    0.046   -4.425    0.000   -0.401   -0.389
##     rlzcnprsn (b2)        -0.081    0.005  -15.281    0.000   -0.081   -0.321
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .afectopositivo    2.983    0.091   32.910    0.000    2.983    0.267
##    .involucramient   20.106    0.076  265.740    0.000   20.106    0.783
##    .confianza         6.979    0.069  100.782    0.000    6.979    0.637
##    .energia           2.689    0.068   39.652    0.000    2.689    0.422
##    .dedicacion        2.580    0.072   35.820    0.000    2.580    0.364
##    .entusiasmo        2.136    0.063   33.952    0.000    2.136    0.449
##    .realizacnprsnl   11.588    0.073  158.926    0.000   11.588    0.697
##    .AUDIT01           0.949    0.056   16.942    0.000    0.949    0.891
##     disfrute          8.202    0.074  111.157    0.000    1.000    1.000
##    .compromiso        0.828    0.037   22.565    0.000    0.209    0.209
## 
## R-Square:
##                    Estimate
##     afectopositivo    0.733
##     involucramient    0.217
##     confianza         0.363
##     energia           0.578
##     dedicacion        0.636
##     entusiasmo        0.551
##     realizacnprsnl    0.303
##     AUDIT01           0.109
##     compromiso        0.791
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab1              -0.125    0.028   -4.410    0.000   -0.357   -0.346
##     ab2              -0.064    0.004  -15.133    0.000   -0.183   -0.177
##     total            -0.027    0.005   -5.373    0.000   -0.076   -0.074
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
          residuals=F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

Los indicadores de bondad de ajuste empeoran, pero siguen siendo aceptables. El efecto directo del disfrute (\(\beta_{std}\) = 0.55) es bastante elevado y positivo. Sin embargo, el efecto indirecto a través del compromiso (\(\beta_{std}\) = -0.35) sumado al efecto indirecto a través de la realización personal (\(\beta_{std}\) = -0.18) permiten contrarrestar esa relación positiva, quedando un efecto total negativo aunque bajo (\(\beta_{std}\) = -0.07).

Cantidad de consumo

model <- '

disfrute =~ afectopositivo + involucramiento
compromiso =~ confianza + energia + dedicacion + entusiasmo



# regressions
compromiso ~ a1*disfrute
realizaciónpersonal ~ a2*disfrute
AUDIT02 ~ cp*disfrute
AUDIT02 ~ b1*compromiso
AUDIT02 ~ b2*realizaciónpersonal

# Efecto indirecto (compromiso)
ab1 := a1 * b1

# Efecto indirecto (realizacion pers)
ab2 := a2 * b2

# Efecto total
total := cp + ab1 + ab2
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1


kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS 281.689 0.969 0.949 0.882 0.05
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 72 iterations
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                        19
## 
##                                                   Used       Total
##   Number of observations                           362         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                              4788.716
##   Degrees of freedom                                17
##   P-value (Unknown)                                 NA
## 
## Model Test Baseline Model:
## 
##   Test statistic                            152676.567
##   Degrees of freedom                                28
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    0.969
##   Tucker-Lewis Index (TLI)                       0.949
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.882
##   90 Percent confidence interval - lower         0.861
##   90 Percent confidence interval - upper         0.903
##   P-value H_0: RMSEA <= 0.050                    0.000
##   P-value H_0: RMSEA >= 0.080                    1.000
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.050
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Latent Variables:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   disfrute =~                                                           
##     afectopositivo    1.000                               2.854    0.854
##     involucramient    0.810    0.006  140.407    0.000    2.312    0.458
##   compromiso =~                                                         
##     confianza         1.000                               1.987    0.596
##     energia           0.972    0.008  122.651    0.000    1.931    0.764
##     dedicacion        1.073    0.008  126.358    0.000    2.132    0.799
##     entusiasmo        0.808    0.007  113.993    0.000    1.605    0.740
## 
## Regressions:
##                         Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso ~                                                               
##     disfrute  (a1)         0.618    0.005  112.568    0.000    0.887    0.887
##   realizaciónpersonal ~                                                      
##     disfrute  (a2)         0.788    0.006  139.472    0.000    2.248    0.553
##   AUDIT02 ~                                                                  
##     disfrute  (cp)         0.319    0.035    9.191    0.000    0.911    0.812
##     compromis (b1)        -0.378    0.047   -8.035    0.000   -0.752   -0.670
##     rlzcnprsn (b2)        -0.083    0.005  -15.313    0.000   -0.083   -0.301
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .afectopositivo    3.016    0.091   33.179    0.000    3.016    0.270
##    .involucramient   20.141    0.075  269.400    0.000   20.141    0.790
##    .confianza         7.181    0.069  103.643    0.000    7.181    0.645
##    .energia           2.664    0.068   39.065    0.000    2.664    0.417
##    .dedicacion        2.572    0.072   35.531    0.000    2.572    0.361
##    .entusiasmo        2.125    0.063   33.823    0.000    2.125    0.452
##    .realizacnprsnl   11.451    0.073  156.215    0.000   11.451    0.694
##    .AUDIT02           1.056    0.063   16.731    0.000    1.056    0.839
##     disfrute          8.145    0.074  109.915    0.000    1.000    1.000
##    .compromiso        0.843    0.037   22.986    0.000    0.213    0.213
## 
## R-Square:
##                    Estimate
##     afectopositivo    0.730
##     involucramient    0.210
##     confianza         0.355
##     energia           0.583
##     dedicacion        0.639
##     entusiasmo        0.548
##     realizacnprsnl    0.306
##     AUDIT02           0.161
##     compromiso        0.787
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab1              -0.234    0.030   -7.920    0.000   -0.667   -0.595
##     ab2              -0.065    0.004  -15.115    0.000   -0.187   -0.166
##     total             0.020    0.005    4.026    0.000    0.058    0.051
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
          residuals=F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

El ajuste es parecido al anterior. El disfrute tiene un efecto directo intenso y positivo en la cantidad de tragos por ocasión (\(\beta_{std}\) = 0.81), que se contrarresta con los efectos indirectos negativos del compromiso (\(\beta_{std}\) = -0.60) y la realización personal (\(\beta_{std}\) = -0.17). En este caso, sin embargo, no alcanza para que el efecto total sea negativo (\(\beta_{std}\) = 0.05).

Frecuencia de consumo excesivo

model <- '

disfrute =~ afectopositivo + involucramiento
compromiso =~ confianza + energia + dedicacion + entusiasmo



# regressions
compromiso ~ a1*disfrute
realizaciónpersonal ~ a2*disfrute
AUDIT03 ~ cp*disfrute
AUDIT03 ~ b1*compromiso
AUDIT03 ~ b2*realizaciónpersonal

# Efecto indirecto (compromiso)
ab1 := a1 * b1

# Efecto indirecto (realizacion pers)
ab2 := a2 * b2

# Efecto total
total := cp + ab1 + ab2
'

####Cálculo de parámetros e índices de bondad de ajuste
fit_uls <- sem(model,estimator= "ULS", data = datos)



tabla_ajustes <- data.frame(Estimador="ULS",
                            "X2/gl"=round(fitmeasures(fit_uls)[c("chisq")]/fitmeasures(fit_uls)[c("df")],3),
                            "CFI"=round(fitmeasures(fit_uls)[c("cfi")],3),
                            "TLI"=round(fitmeasures(fit_uls)[c("tli")],3),
                            "RMSEA"=round(fitmeasures(fit_uls)[c("rmsea")],3),
                            "SRMR"=round(fitmeasures(fit_uls)[c("srmr")],3))
rownames(tabla_ajustes) <- 1


kable(tabla_ajustes,
      "html",
      booktabs = T,
      align = c("r"),
      caption = "Indicadores de ajuste según estimador") %>%
  kable_styling(full_width = F,
                position = "center", font_size = 12)
Indicadores de ajuste según estimador
Estimador X2.gl CFI TLI RMSEA SRMR
ULS 292.624 0.964 0.94 0.898 0.049
summary(fit_uls, standardized = TRUE, fit.measures=T, rsquare=T)
## lavaan 0.6.16 ended normally after 72 iterations
## 
##   Estimator                                        ULS
##   Optimization method                           NLMINB
##   Number of model parameters                        19
## 
##                                                   Used       Total
##   Number of observations                           363         370
## 
## Model Test User Model:
##                                                       
##   Test statistic                              4974.613
##   Degrees of freedom                                17
##   P-value (Unknown)                                 NA
## 
## Model Test Baseline Model:
## 
##   Test statistic                            135922.501
##   Degrees of freedom                                28
##   P-value                                           NA
## 
## User Model versus Baseline Model:
## 
##   Comparative Fit Index (CFI)                    0.964
##   Tucker-Lewis Index (TLI)                       0.940
## 
## Root Mean Square Error of Approximation:
## 
##   RMSEA                                          0.898
##   90 Percent confidence interval - lower         0.877
##   90 Percent confidence interval - upper         0.919
##   P-value H_0: RMSEA <= 0.050                    0.000
##   P-value H_0: RMSEA >= 0.080                    1.000
## 
## Standardized Root Mean Square Residual:
## 
##   SRMR                                           0.049
## 
## Parameter Estimates:
## 
##   Standard errors                             Standard
##   Information                                 Expected
##   Information saturated (h1) model        Unstructured
## 
## Latent Variables:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   disfrute =~                                                           
##     afectopositivo    1.000                               2.851    0.861
##     involucramient    0.753    0.006  130.090    0.000    2.147    0.435
##   compromiso =~                                                         
##     confianza         1.000                               1.995    0.600
##     energia           0.938    0.008  116.085    0.000    1.870    0.753
##     dedicacion        1.044    0.009  119.920    0.000    2.082    0.793
##     entusiasmo        0.770    0.007  107.149    0.000    1.536    0.727
## 
## Regressions:
##                         Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##   compromiso ~                                                               
##     disfrute  (a1)         0.609    0.006  106.284    0.000    0.870    0.870
##   realizaciónpersonal ~                                                      
##     disfrute  (a2)         0.768    0.006  130.730    0.000    2.191    0.545
##   AUDIT03 ~                                                                  
##     disfrute  (cp)         0.185    0.030    6.177    0.000    0.528    0.492
##     compromis (b1)        -0.221    0.040   -5.544    0.000   -0.442   -0.411
##     rlzcnprsn (b2)        -0.072    0.005  -13.152    0.000   -0.072   -0.268
## 
## Variances:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##    .afectopositivo    2.840    0.094   30.118    0.000    2.840    0.259
##    .involucramient   19.794    0.073  272.773    0.000   19.794    0.811
##    .confianza         7.079    0.071  100.201    0.000    7.079    0.640
##    .energia           2.678    0.068   39.349    0.000    2.678    0.434
##    .dedicacion        2.560    0.073   35.238    0.000    2.560    0.371
##    .entusiasmo        2.104    0.062   33.679    0.000    2.104    0.471
##    .realizacnprsnl   11.381    0.074  154.740    0.000   11.381    0.703
##    .AUDIT03           1.049    0.057   18.492    0.000    1.049    0.908
##     disfrute          8.128    0.078  103.802    0.000    1.000    1.000
##    .compromiso        0.969    0.039   25.102    0.000    0.243    0.243
## 
## R-Square:
##                    Estimate
##     afectopositivo    0.741
##     involucramient    0.189
##     confianza         0.360
##     energia           0.566
##     dedicacion        0.629
##     entusiasmo        0.529
##     realizacnprsnl    0.297
##     AUDIT03           0.092
##     compromiso        0.757
## 
## Defined Parameters:
##                    Estimate  Std.Err  z-value  P(>|z|)   Std.lv  Std.all
##     ab1              -0.135    0.024   -5.510    0.000   -0.384   -0.357
##     ab2              -0.055    0.004  -13.030    0.000   -0.157   -0.146
##     total            -0.004    0.005   -0.836    0.403   -0.012   -0.011
semPaths(# Argumentos globales
          fit_uls, what="diagram", whatLabels="std",layout="tree3", rotation = 2, width=50, height=35,exoVar = F,
          residuals=F,
         # Etiquetas
          node.width = 2,
          label.cex=1, 
          edge.label.cex = 1,
         # Forma de las flechas
          asize=2,curvePivot=T, 
         # Color
         border.color = "#BFB29E", edge.color = "#BFB29E", edge.label.bg = "#141415", title.color = "#BFB29E", label.color="#BFB29E",bg="transparent", trans=T, vTrans=0
         
         )

Similares resultados que la frecuencia de consumo. El disfrute tiene un efecto directo moderado y positivo en la cantidad de tragos por ocasión (\(\beta_{std}\) = 0.49), que se contrarresta con los efectos indirectos negativos del compromiso (\(\beta_{std}\) = -0.36) y la realización personal (\(\beta_{std}\) = -0.15). Acá el efecto total vuelve a quedar negativo pero bajo (\(\beta_{std}\) = -0.01).

Conclusion

Lo más importante es probar estos modelos partiendo de los ítems y no de las dimensiones. Sin embargo, creo que con estas pruebas ya hay cositas para decir:

  1. En todas las pruebas, el disfrute se relacionó positivamente con el consumo.
  2. Cuando el efecto total no fue positivo, se debió al efecto indirecto a través de las otras variables.
  3. En los modelos con las subdimensiones, también hay bastante para decir respecto a cuales tienen más peso en la construcción de las latentes.

Si tuviese que elegir a partir de la información que tenemos hasta acá, probaría el modelo completo, partiendo de los ítems. Nos puede dar mucha información y todas parecen variables relevantes.