Set Directory and Read in Data
setwd("H:/CHAYA")
mot <- read.csv("Longitudinal dataset_W1 to W6 (n=366).csv", fileEncoding="UTF-8-BOM")
Load Library for Analysis
library(lavaan)
## This is lavaan 0.6-8
## lavaan is FREE software! Please report any bugs.
Configural Invariance with HEMD, AVNR and APEN
configural <- '
HEMD1 =~ NA*w1_MJmotive_socialanxiety + w1_MJmotive_sleep + w1_MJmotive_pain + w1_MJmotive_nausea + w1_MJmotive_attention + w1_MJmotive_substitution + w1_MJmotive_naturalmeds
AVNR1 =~ NA*w1_MJmotive_conformity + w1_MJmotive_coping + w1_MJmotive_experiment + w1_MJmotive_boredom + w1_MJmotive_alcohol
APEN1 =~ NA*w1_MJmotive_enjoyment + w1_MJmotive_celebration + w1_MJmotive_alteredpercept + w1_MJmotive_relativelowrisk + w1_MJmotive_availability
HEMD2 =~ NA*W2_MJmotive_socialanxiety + W2_MJmotive_sleep + W2_MJmotive_pain + W2_MJmotive_nausea + W2_MJmotive_attention + W2_MJmotive_substitution + W2_MJmotive_naturalmeds
AVNR2 =~ NA*W2_MJmotive_conformity + W2_MJmotive_coping + W2_MJmotive_experiment + W2_MJmotive_boredom + W2_MJmotive_alcohol
APEN2 =~ NA*W2_MJmotive_enjoyment + W2_MJmotive_celebration + W2_MJmotive_alteredpercept + W2_MJmotive_relativelowrisk + W2_MJmotive_availability
HEMD3 =~ NA*w3_MJmotive_socialanxiety + w3_MJmotive_sleep + w3_MJmotive_pain + w3_MJmotive_nausea + w3_MJmotive_attention + w3_MJmotive_substitution + w3_MJmotive_naturalmeds
AVNR3 =~ NA*w3_MJmotive_conformity + w3_MJmotive_coping + w3_MJmotive_experiment + w3_MJmotive_boredom + w3_MJmotive_alcohol
APEN3 =~ NA*w3_MJmotive_enjoyment + w3_MJmotive_celebration + w3_MJmotive_alteredpercept + w3_MJmotive_relativelowrisk + w3_MJmotive_availability
HEMD4 =~ NA*w4_MJmotive_socialanxiety + w4_MJmotive_sleep + w4_MJmotive_pain + w4_MJmotive_nausea + w4_MJmotive_attention + w4_MJmotive_substitution + w4_MJmotive_naturalmeds
AVNR4 =~ NA*w4_MJmotive_conformity + w4_MJmotive_coping + w4_MJmotive_experiment + w4_MJmotive_boredom + w4_MJmotive_alcohol
APEN4 =~ NA*w4_MJmotive_enjoyment + w4_MJmotive_celebration + w4_MJmotive_alteredpercept + w4_MJmotive_relativelowrisk + w4_MJmotive_availability
HEMD5 =~ NA*w5_MJmotive_socialanxiety + w5_MJmotive_sleep + w5_MJmotive_pain + w5_MJmotive_nausea + w5_MJmotive_attention + w5_MJmotive_substitution + w5_MJmotive_naturalmeds
AVNR5 =~ NA*w5_MJmotive_conformity + w5_MJmotive_coping + w5_MJmotive_experiment + w5_MJmotive_boredom + w5_MJmotive_alcohol
APEN5 =~ NA*w5_MJmotive_enjoyment + w5_MJmotive_celebration + w5_MJmotive_alteredpercept + w5_MJmotive_relativelowrisk + w5_MJmotive_availability
HEMD6 =~ NA*w6_MJmotive_socialanxiety + w6_MJmotive_sleep + w6_MJmotive_pain + w6_MJmotive_nausea + w6_MJmotive_attention + w6_MJmotive_substitution + w6_MJmotive_naturalmeds
AVNR6 =~ NA*w6_MJmotive_conformity + w6_MJmotive_coping + w6_MJmotive_experiment + w6_MJmotive_boredom + w6_MJmotive_alcohol
APEN6 =~ NA*w6_MJmotive_enjoyment + w6_MJmotive_celebration + w6_MJmotive_alteredpercept + w6_MJmotive_relativelowrisk + w6_MJmotive_availability
#SET VARIANCES
HEMD1 ~~ 1*HEMD1
AVNR1 ~~ 1*AVNR1
APEN1 ~~ 1*APEN1
HEMD2 ~~ 1*HEMD2
AVNR2 ~~ 1*AVNR2
APEN2 ~~ 1*APEN2
HEMD3 ~~ 1*HEMD3
AVNR3 ~~ 1*AVNR3
APEN3 ~~ 1*APEN3
HEMD4 ~~ 1*HEMD4
AVNR4 ~~ 1*AVNR4
APEN4 ~~ 1*APEN4
HEMD5 ~~ 1*HEMD5
AVNR5 ~~ 1*AVNR5
APEN5 ~~ 1*APEN5
HEMD6 ~~ 1*HEMD6
AVNR6 ~~ 1*AVNR6
APEN6 ~~ 1*APEN6
#SET MEANS
HEMD1 ~ 0*1
AVNR1 ~ 0*1
APEN1 ~ 0*1
HEMD2 ~ 0*1
AVNR2 ~ 0*1
APEN2 ~ 0*1
HEMD3 ~ 0*1
AVNR3 ~ 0*1
APEN3 ~ 0*1
HEMD4 ~ 0*1
AVNR4 ~ 0*1
APEN4 ~ 0*1
HEMD5 ~ 0*1
AVNR5 ~ 0*1
APEN5 ~ 0*1
HEMD6 ~ 0*1
AVNR6 ~ 0*1
APEN6 ~ 0*1
#CORRELATED RESIDUALS
w1_MJmotive_socialanxiety ~~ W2_MJmotive_socialanxiety + w3_MJmotive_socialanxiety + w4_MJmotive_socialanxiety + w5_MJmotive_socialanxiety + w6_MJmotive_socialanxiety
W2_MJmotive_socialanxiety ~~ w3_MJmotive_socialanxiety + w4_MJmotive_socialanxiety + w5_MJmotive_socialanxiety + w6_MJmotive_socialanxiety
w3_MJmotive_socialanxiety ~~ w4_MJmotive_socialanxiety + w5_MJmotive_socialanxiety + w6_MJmotive_socialanxiety
w4_MJmotive_socialanxiety ~~ w5_MJmotive_socialanxiety + w6_MJmotive_socialanxiety
w5_MJmotive_socialanxiety ~~ w6_MJmotive_socialanxiety
w1_MJmotive_sleep ~~ W2_MJmotive_sleep + w3_MJmotive_sleep + w4_MJmotive_sleep + w5_MJmotive_sleep + w6_MJmotive_sleep
W2_MJmotive_sleep ~~ w3_MJmotive_sleep + w4_MJmotive_sleep + w5_MJmotive_sleep + w6_MJmotive_sleep
w3_MJmotive_sleep ~~ w4_MJmotive_sleep + w5_MJmotive_sleep + w6_MJmotive_sleep
w4_MJmotive_sleep ~~ w5_MJmotive_sleep + w6_MJmotive_sleep
w5_MJmotive_sleep ~~ w6_MJmotive_sleep
w1_MJmotive_pain ~~ W2_MJmotive_pain + w3_MJmotive_pain + w4_MJmotive_pain + w5_MJmotive_pain + w6_MJmotive_pain
W2_MJmotive_pain ~~ w3_MJmotive_pain + w4_MJmotive_pain + w5_MJmotive_pain + w6_MJmotive_pain
w3_MJmotive_pain ~~ w4_MJmotive_pain + w5_MJmotive_pain + w6_MJmotive_pain
w4_MJmotive_pain ~~ w5_MJmotive_pain + w6_MJmotive_pain
w5_MJmotive_pain ~~ w6_MJmotive_pain
w1_MJmotive_nausea ~~ W2_MJmotive_nausea + w3_MJmotive_nausea + w4_MJmotive_nausea + w5_MJmotive_nausea + w6_MJmotive_nausea
W2_MJmotive_nausea ~~ w3_MJmotive_nausea + w4_MJmotive_nausea + w5_MJmotive_nausea + w6_MJmotive_nausea
w3_MJmotive_nausea ~~ w4_MJmotive_nausea + w5_MJmotive_nausea + w6_MJmotive_nausea
w4_MJmotive_nausea ~~ w5_MJmotive_nausea + w6_MJmotive_nausea
w5_MJmotive_nausea ~~ w6_MJmotive_nausea
w1_MJmotive_attention ~~ W2_MJmotive_attention + w3_MJmotive_attention + w4_MJmotive_attention + w5_MJmotive_attention + w6_MJmotive_attention
W2_MJmotive_attention ~~ w3_MJmotive_attention + w4_MJmotive_attention + w5_MJmotive_attention + w6_MJmotive_attention
w3_MJmotive_attention ~~ w4_MJmotive_attention + w5_MJmotive_attention + w6_MJmotive_attention
w4_MJmotive_attention ~~ w5_MJmotive_attention + w6_MJmotive_attention
w5_MJmotive_attention ~~ w6_MJmotive_attention
w1_MJmotive_substitution ~~ W2_MJmotive_substitution + w3_MJmotive_substitution + w4_MJmotive_substitution + w5_MJmotive_substitution + w6_MJmotive_substitution
W2_MJmotive_substitution ~~ w3_MJmotive_substitution + w4_MJmotive_substitution + w5_MJmotive_substitution + w6_MJmotive_substitution
w3_MJmotive_substitution ~~ w4_MJmotive_substitution + w5_MJmotive_substitution + w6_MJmotive_substitution
w4_MJmotive_substitution ~~ w5_MJmotive_substitution + w6_MJmotive_substitution
w5_MJmotive_substitution ~~ w6_MJmotive_substitution
w1_MJmotive_naturalmeds ~~ W2_MJmotive_naturalmeds + w3_MJmotive_naturalmeds + w4_MJmotive_naturalmeds + w5_MJmotive_naturalmeds + w6_MJmotive_naturalmeds
W2_MJmotive_naturalmeds ~~ w3_MJmotive_naturalmeds + w4_MJmotive_naturalmeds + w5_MJmotive_naturalmeds + w6_MJmotive_naturalmeds
w3_MJmotive_naturalmeds ~~ w4_MJmotive_naturalmeds + w5_MJmotive_naturalmeds + w6_MJmotive_naturalmeds
w4_MJmotive_naturalmeds ~~ w5_MJmotive_naturalmeds + w6_MJmotive_naturalmeds
w5_MJmotive_naturalmeds ~~ w6_MJmotive_naturalmeds
w1_MJmotive_conformity ~~ W2_MJmotive_conformity + w3_MJmotive_conformity + w4_MJmotive_conformity + w5_MJmotive_conformity + w6_MJmotive_conformity
W2_MJmotive_conformity ~~ w3_MJmotive_conformity + w4_MJmotive_conformity + w5_MJmotive_conformity + w6_MJmotive_conformity
w3_MJmotive_conformity ~~ w4_MJmotive_conformity + w5_MJmotive_conformity + w6_MJmotive_conformity
w4_MJmotive_conformity ~~ w5_MJmotive_conformity + w6_MJmotive_conformity
w5_MJmotive_conformity ~~ w6_MJmotive_conformity
w1_MJmotive_coping ~~ W2_MJmotive_coping + w3_MJmotive_coping + w4_MJmotive_coping + w5_MJmotive_coping + w6_MJmotive_coping
W2_MJmotive_coping ~~ w3_MJmotive_coping + w4_MJmotive_coping + w5_MJmotive_coping + w6_MJmotive_coping
w3_MJmotive_coping ~~ w4_MJmotive_coping + w5_MJmotive_coping + w6_MJmotive_coping
w4_MJmotive_coping ~~ w5_MJmotive_coping + w6_MJmotive_coping
w5_MJmotive_coping ~~ w6_MJmotive_coping
w1_MJmotive_experiment ~~ W2_MJmotive_experiment + w3_MJmotive_experiment + w4_MJmotive_experiment + w5_MJmotive_experiment + w6_MJmotive_experiment
W2_MJmotive_experiment ~~ w3_MJmotive_experiment + w4_MJmotive_experiment + w5_MJmotive_experiment + w6_MJmotive_experiment
w3_MJmotive_experiment ~~ w4_MJmotive_experiment + w5_MJmotive_experiment + w6_MJmotive_experiment
w4_MJmotive_experiment ~~ w5_MJmotive_experiment + w6_MJmotive_experiment
w5_MJmotive_experiment ~~ w6_MJmotive_experiment
w1_MJmotive_boredom ~~ W2_MJmotive_boredom + w3_MJmotive_boredom + w4_MJmotive_boredom + w5_MJmotive_boredom + w6_MJmotive_boredom
W2_MJmotive_boredom ~~ w3_MJmotive_boredom + w4_MJmotive_boredom + w5_MJmotive_boredom + w6_MJmotive_boredom
w3_MJmotive_boredom ~~ w4_MJmotive_boredom + w5_MJmotive_boredom + w6_MJmotive_boredom
w4_MJmotive_boredom ~~ w5_MJmotive_boredom + w6_MJmotive_boredom
w5_MJmotive_boredom ~~ w6_MJmotive_boredom
w1_MJmotive_alcohol ~~ W2_MJmotive_alcohol + w3_MJmotive_alcohol + w4_MJmotive_alcohol + w5_MJmotive_alcohol + w6_MJmotive_alcohol
W2_MJmotive_alcohol ~~ w3_MJmotive_alcohol + w4_MJmotive_alcohol + w5_MJmotive_alcohol + w6_MJmotive_alcohol
w3_MJmotive_alcohol ~~ w4_MJmotive_alcohol + w5_MJmotive_alcohol + w6_MJmotive_alcohol
w4_MJmotive_alcohol ~~ w5_MJmotive_alcohol + w6_MJmotive_alcohol
w5_MJmotive_alcohol ~~ w6_MJmotive_alcohol
w1_MJmotive_enjoyment ~~ W2_MJmotive_enjoyment + w3_MJmotive_enjoyment + w4_MJmotive_enjoyment + w5_MJmotive_enjoyment + w6_MJmotive_enjoyment
W2_MJmotive_enjoyment ~~ w3_MJmotive_enjoyment + w4_MJmotive_enjoyment + w5_MJmotive_enjoyment + w6_MJmotive_enjoyment
w3_MJmotive_enjoyment ~~ w4_MJmotive_enjoyment + w5_MJmotive_enjoyment + w6_MJmotive_enjoyment
w4_MJmotive_enjoyment ~~ w5_MJmotive_enjoyment + w6_MJmotive_enjoyment
w5_MJmotive_enjoyment ~~ w6_MJmotive_enjoyment
w1_MJmotive_celebration ~~ W2_MJmotive_celebration + w3_MJmotive_celebration + w4_MJmotive_celebration + w5_MJmotive_celebration + w6_MJmotive_celebration
W2_MJmotive_celebration ~~ w3_MJmotive_celebration + w4_MJmotive_celebration + w5_MJmotive_celebration + w6_MJmotive_celebration
w3_MJmotive_celebration ~~ w4_MJmotive_celebration + w5_MJmotive_celebration + w6_MJmotive_celebration
w4_MJmotive_celebration ~~ w5_MJmotive_celebration + w6_MJmotive_celebration
w5_MJmotive_celebration ~~ w6_MJmotive_celebration
w1_MJmotive_alteredpercept ~~ W2_MJmotive_alteredpercept + w3_MJmotive_alteredpercept + w4_MJmotive_alteredpercept + w5_MJmotive_alteredpercept + w6_MJmotive_alteredpercept
W2_MJmotive_alteredpercept ~~ w3_MJmotive_alteredpercept + w4_MJmotive_alteredpercept + w5_MJmotive_alteredpercept + w6_MJmotive_alteredpercept
w3_MJmotive_alteredpercept ~~ w4_MJmotive_alteredpercept + w5_MJmotive_alteredpercept + w6_MJmotive_alteredpercept
w4_MJmotive_alteredpercept ~~ w5_MJmotive_alteredpercept + w6_MJmotive_alteredpercept
w5_MJmotive_alteredpercept ~~ w6_MJmotive_alteredpercept
w1_MJmotive_relativelowrisk ~~ W2_MJmotive_relativelowrisk + w3_MJmotive_relativelowrisk + w4_MJmotive_relativelowrisk + w5_MJmotive_relativelowrisk + w6_MJmotive_relativelowrisk
W2_MJmotive_relativelowrisk ~~ w3_MJmotive_relativelowrisk + w4_MJmotive_relativelowrisk + w5_MJmotive_relativelowrisk + w6_MJmotive_relativelowrisk
w3_MJmotive_relativelowrisk ~~ w4_MJmotive_relativelowrisk + w5_MJmotive_relativelowrisk + w6_MJmotive_relativelowrisk
w4_MJmotive_relativelowrisk ~~ w5_MJmotive_relativelowrisk + w6_MJmotive_relativelowrisk
w5_MJmotive_relativelowrisk ~~ w6_MJmotive_relativelowrisk
w1_MJmotive_availability ~~ W2_MJmotive_availability + w3_MJmotive_availability + w4_MJmotive_availability + w5_MJmotive_availability + w6_MJmotive_availability
W2_MJmotive_availability ~~ w3_MJmotive_availability + w4_MJmotive_availability + w5_MJmotive_availability + w6_MJmotive_availability
w3_MJmotive_availability ~~ w4_MJmotive_availability + w5_MJmotive_availability + w6_MJmotive_availability
w4_MJmotive_availability ~~ w5_MJmotive_availability + w6_MJmotive_availability
w5_MJmotive_availability ~~ w6_MJmotive_availability
'
fit.con <- sem(configural, data = mot, missing = "ML")
summary(fit.con, fit.measures = TRUE)
## lavaan 0.6-8 ended normally after 166 iterations
##
## Estimator ML
## Optimization method NLMINB
## Number of model parameters 714
##
## Number of observations 425
## Number of missing patterns 29
##
## Model Test User Model:
##
## Test statistic 8671.635
## Degrees of freedom 4641
## P-value (Chi-square) 0.000
##
## Model Test Baseline Model:
##
## Test statistic 30282.088
## Degrees of freedom 5151
## P-value 0.000
##
## User Model versus Baseline Model:
##
## Comparative Fit Index (CFI) 0.840
## Tucker-Lewis Index (TLI) 0.822
##
## Loglikelihood and Information Criteria:
##
## Loglikelihood user model (H0) -35560.050
## Loglikelihood unrestricted model (H1) -31224.232
##
## Akaike (AIC) 72548.099
## Bayesian (BIC) 75441.291
## Sample-size adjusted Bayesian (BIC) 73175.513
##
## Root Mean Square Error of Approximation:
##
## RMSEA 0.045
## 90 Percent confidence interval - lower 0.044
## 90 Percent confidence interval - upper 0.047
## P-value RMSEA <= 0.05 1.000
##
## Standardized Root Mean Square Residual:
##
## SRMR 0.080
##
## Parameter Estimates:
##
## Standard errors Standard
## Information Observed
## Observed information based on Hessian
##
## Latent Variables:
## Estimate Std.Err z-value P(>|z|)
## HEMD1 =~
## w1_MJmtv_sclnx 1.011 0.058 17.523 0.000
## w1_MJmotiv_slp 0.820 0.058 14.124 0.000
## w1_MJmotive_pn 1.031 0.059 17.433 0.000
## w1_MJmotive_ns 0.910 0.057 15.910 0.000
## w1_MJmtv_ttntn 0.974 0.057 17.052 0.000
## w1_MJmtv_sbstt 0.863 0.051 16.791 0.000
## w1_MJmtv_ntrlm 0.986 0.061 16.099 0.000
## AVNR1 =~
## w1_MJmtv_cnfrm 0.341 0.033 10.497 0.000
## w1_MJmotv_cpng 0.656 0.051 12.758 0.000
## w1_MJmtv_xprmn 0.710 0.055 12.989 0.000
## w1_MJmotv_brdm 0.890 0.052 17.067 0.000
## w1_MJmotv_lchl 0.425 0.043 9.914 0.000
## APEN1 =~
## w1_MJmtv_njymn 0.802 0.048 16.781 0.000
## w1_MJmtv_clbrt 0.758 0.055 13.883 0.000
## w1_MJmtv_ltrdp 0.863 0.056 15.429 0.000
## w1_MJmtv_rltvl 0.799 0.061 13.179 0.000
## w1_MJmtv_vlblt 0.755 0.053 14.332 0.000
## HEMD2 =~
## W2_MJmtv_sclnx 0.785 0.052 15.027 0.000
## W2_MJmotiv_slp 0.744 0.058 12.905 0.000
## W2_MJmotive_pn 0.956 0.056 17.064 0.000
## W2_MJmotive_ns 0.835 0.050 16.706 0.000
## W2_MJmtv_ttntn 0.825 0.050 16.591 0.000
## W2_MJmtv_sbstt 0.645 0.047 13.733 0.000
## W2_MJmtv_ntrlm 0.908 0.057 15.801 0.000
## AVNR2 =~
## W2_MJmtv_cnfrm 0.329 0.029 11.151 0.000
## W2_MJmotv_cpng 0.542 0.043 12.488 0.000
## W2_MJmtv_xprmn 0.587 0.043 13.723 0.000
## W2_MJmotv_brdm 0.638 0.049 12.924 0.000
## W2_MJmotv_lchl 0.457 0.038 12.128 0.000
## APEN2 =~
## W2_MJmtv_njymn 0.831 0.051 16.259 0.000
## W2_MJmtv_clbrt 0.751 0.055 13.692 0.000
## W2_MJmtv_ltrdp 0.751 0.055 13.707 0.000
## W2_MJmtv_rltvl 0.869 0.062 13.968 0.000
## W2_MJmtv_vlblt 0.701 0.050 14.117 0.000
## HEMD3 =~
## w3_MJmtv_sclnx 0.861 0.054 16.037 0.000
## w3_MJmotiv_slp 0.783 0.060 13.083 0.000
## w3_MJmotive_pn 0.936 0.055 16.885 0.000
## w3_MJmotive_ns 0.748 0.050 15.106 0.000
## w3_MJmtv_ttntn 0.802 0.048 16.655 0.000
## w3_MJmtv_sbstt 0.705 0.048 14.755 0.000
## w3_MJmtv_ntrlm 0.898 0.056 16.089 0.000
## AVNR3 =~
## w3_MJmtv_cnfrm 0.287 0.026 10.938 0.000
## w3_MJmotv_cpng 0.623 0.042 14.680 0.000
## w3_MJmtv_xprmn 0.676 0.044 15.236 0.000
## w3_MJmotv_brdm 0.721 0.047 15.344 0.000
## w3_MJmotv_lchl 0.398 0.037 10.787 0.000
## APEN3 =~
## w3_MJmtv_njymn 0.919 0.052 17.716 0.000
## w3_MJmtv_clbrt 0.846 0.055 15.346 0.000
## w3_MJmtv_ltrdp 0.863 0.052 16.691 0.000
## w3_MJmtv_rltvl 0.867 0.062 14.053 0.000
## w3_MJmtv_vlblt 0.805 0.053 15.316 0.000
## HEMD4 =~
## w4_MJmtv_sclnx 0.898 0.053 16.924 0.000
## w4_MJmotiv_slp 0.790 0.060 13.284 0.000
## w4_MJmotive_pn 0.843 0.052 16.280 0.000
## w4_MJmotive_ns 0.748 0.051 14.779 0.000
## w4_MJmtv_ttntn 0.785 0.050 15.830 0.000
## w4_MJmtv_sbstt 0.682 0.044 15.467 0.000
## w4_MJmtv_ntrlm 0.902 0.058 15.653 0.000
## AVNR4 =~
## w4_MJmtv_cnfrm 0.392 0.034 11.396 0.000
## w4_MJmotv_cpng 0.648 0.045 14.417 0.000
## w4_MJmtv_xprmn 0.677 0.045 15.065 0.000
## w4_MJmotv_brdm 0.748 0.049 15.396 0.000
## w4_MJmotv_lchl 0.457 0.040 11.412 0.000
## APEN4 =~
## w4_MJmtv_njymn 0.785 0.051 15.266 0.000
## w4_MJmtv_clbrt 0.797 0.052 15.350 0.000
## w4_MJmtv_ltrdp 0.865 0.052 16.724 0.000
## w4_MJmtv_rltvl 0.837 0.058 14.399 0.000
## w4_MJmtv_vlblt 0.742 0.050 14.729 0.000
## HEMD5 =~
## w5_MJmtv_sclnx 0.867 0.057 15.114 0.000
## w5_MJmotiv_slp 0.812 0.062 13.173 0.000
## w5_MJmotive_pn 0.977 0.056 17.516 0.000
## w5_MJmotive_ns 0.863 0.054 15.890 0.000
## w5_MJmtv_ttntn 0.949 0.056 17.074 0.000
## w5_MJmtv_sbstt 0.655 0.053 12.389 0.000
## w5_MJmtv_ntrlm 0.972 0.062 15.561 0.000
## AVNR5 =~
## w5_MJmtv_cnfrm 0.426 0.039 10.838 0.000
## w5_MJmotv_cpng 0.706 0.055 12.907 0.000
## w5_MJmtv_xprmn 0.728 0.056 13.043 0.000
## w5_MJmotv_brdm 0.765 0.056 13.594 0.000
## w5_MJmotv_lchl 0.501 0.046 10.904 0.000
## APEN5 =~
## w5_MJmtv_njymn 0.863 0.056 15.530 0.000
## w5_MJmtv_clbrt 0.900 0.056 15.998 0.000
## w5_MJmtv_ltrdp 1.017 0.058 17.624 0.000
## w5_MJmtv_rltvl 0.833 0.060 13.790 0.000
## w5_MJmtv_vlblt 0.722 0.054 13.255 0.000
## HEMD6 =~
## w6_MJmtv_sclnx 1.000 0.061 16.413 0.000
## w6_MJmotiv_slp 0.847 0.065 13.026 0.000
## w6_MJmotive_pn 1.025 0.063 16.148 0.000
## w6_MJmotive_ns 0.916 0.056 16.249 0.000
## w6_MJmtv_ttntn 0.934 0.057 16.328 0.000
## w6_MJmtv_sbstt 0.838 0.058 14.476 0.000
## w6_MJmtv_ntrlm 1.031 0.064 16.106 0.000
## AVNR6 =~
## w6_MJmtv_cnfrm 0.507 0.044 11.594 0.000
## w6_MJmotv_cpng 0.748 0.057 13.181 0.000
## w6_MJmtv_xprmn 0.831 0.056 14.964 0.000
## w6_MJmotv_brdm 0.890 0.059 15.085 0.000
## w6_MJmotv_lchl 0.535 0.047 11.336 0.000
## APEN6 =~
## w6_MJmtv_njymn 0.829 0.060 13.867 0.000
## w6_MJmtv_clbrt 0.800 0.061 13.083 0.000
## w6_MJmtv_ltrdp 0.980 0.062 15.730 0.000
## w6_MJmtv_rltvl 0.921 0.067 13.836 0.000
## w6_MJmtv_vlblt 0.780 0.057 13.650 0.000
##
## Covariances:
## Estimate Std.Err z-value P(>|z|)
## .w1_MJmotive_socialanxiety ~~
## .W2_MJmtv_sclnx 0.173 0.041 4.250 0.000
## .w3_MJmtv_sclnx 0.163 0.041 3.960 0.000
## .w4_MJmtv_sclnx 0.093 0.037 2.529 0.011
## .w5_MJmtv_sclnx 0.118 0.040 2.925 0.003
## .w6_MJmtv_sclnx 0.158 0.043 3.671 0.000
## .W2_MJmotive_socialanxiety ~~
## .w3_MJmtv_sclnx 0.233 0.041 5.653 0.000
## .w4_MJmtv_sclnx 0.155 0.037 4.137 0.000
## .w5_MJmtv_sclnx 0.101 0.040 2.518 0.012
## .w6_MJmtv_sclnx 0.175 0.042 4.143 0.000
## .w3_MJmotive_socialanxiety ~~
## .w4_MJmtv_sclnx 0.171 0.038 4.467 0.000
## .w5_MJmtv_sclnx 0.198 0.043 4.612 0.000
## .w6_MJmtv_sclnx 0.141 0.044 3.226 0.001
## .w4_MJmotive_socialanxiety ~~
## .w5_MJmtv_sclnx 0.097 0.037 2.649 0.008
## .w6_MJmtv_sclnx 0.194 0.039 4.922 0.000
## .w5_MJmotive_socialanxiety ~~
## .w6_MJmtv_sclnx 0.179 0.040 4.451 0.000
## .w1_MJmotive_sleep ~~
## .W2_MJmotiv_slp 0.385 0.059 6.530 0.000
## .w3_MJmotiv_slp 0.402 0.059 6.771 0.000
## .w4_MJmotiv_slp 0.244 0.055 4.402 0.000
## .w5_MJmotiv_slp 0.244 0.057 4.315 0.000
## .w6_MJmotiv_slp 0.276 0.061 4.504 0.000
## .W2_MJmotive_sleep ~~
## .w3_MJmotiv_slp 0.402 0.061 6.607 0.000
## .w4_MJmotiv_slp 0.305 0.056 5.439 0.000
## .w5_MJmotiv_slp 0.331 0.060 5.528 0.000
## .w6_MJmotiv_slp 0.319 0.064 4.988 0.000
## .w3_MJmotive_sleep ~~
## .w4_MJmotiv_slp 0.298 0.058 5.174 0.000
## .w5_MJmotiv_slp 0.278 0.059 4.689 0.000
## .w6_MJmotiv_slp 0.298 0.065 4.559 0.000
## .w4_MJmotive_sleep ~~
## .w5_MJmotiv_slp 0.324 0.056 5.830 0.000
## .w6_MJmotiv_slp 0.302 0.061 4.937 0.000
## .w5_MJmotive_sleep ~~
## .w6_MJmotiv_slp 0.385 0.062 6.201 0.000
## .w1_MJmotive_pain ~~
## .W2_MJmotive_pn 0.190 0.045 4.189 0.000
## .w3_MJmotive_pn 0.252 0.048 5.294 0.000
## .w4_MJmotive_pn 0.192 0.043 4.427 0.000
## .w5_MJmotive_pn 0.137 0.043 3.206 0.001
## .w6_MJmotive_pn 0.139 0.048 2.918 0.004
## .W2_MJmotive_pain ~~
## .w3_MJmotive_pn 0.354 0.050 7.141 0.000
## .w4_MJmotive_pn 0.218 0.043 5.109 0.000
## .w5_MJmotive_pn 0.245 0.042 5.815 0.000
## .w6_MJmotive_pn 0.157 0.046 3.420 0.001
## .w3_MJmotive_pain ~~
## .w4_MJmotive_pn 0.356 0.048 7.389 0.000
## .w5_MJmotive_pn 0.309 0.046 6.664 0.000
## .w6_MJmotive_pn 0.215 0.048 4.470 0.000
## .w4_MJmotive_pain ~~
## .w5_MJmotive_pn 0.289 0.042 6.920 0.000
## .w6_MJmotive_pn 0.181 0.041 4.430 0.000
## .w5_MJmotive_pain ~~
## .w6_MJmotive_pn 0.183 0.042 4.326 0.000
## .w1_MJmotive_nausea ~~
## .W2_MJmotive_ns 0.313 0.045 7.011 0.000
## .w3_MJmotive_ns 0.244 0.045 5.388 0.000
## .w4_MJmotive_ns 0.201 0.043 4.692 0.000
## .w5_MJmotive_ns 0.134 0.040 3.376 0.001
## .w6_MJmotive_ns 0.152 0.046 3.326 0.001
## .W2_MJmotive_nausea ~~
## .w3_MJmotive_ns 0.301 0.042 7.187 0.000
## .w4_MJmotive_ns 0.172 0.038 4.525 0.000
## .w5_MJmotive_ns 0.179 0.036 4.922 0.000
## .w6_MJmotive_ns 0.182 0.038 4.777 0.000
## .w3_MJmotive_nausea ~~
## .w4_MJmotive_ns 0.304 0.042 7.253 0.000
## .w5_MJmotive_ns 0.208 0.038 5.429 0.000
## .w6_MJmotive_ns 0.237 0.040 5.929 0.000
## .w4_MJmotive_nausea ~~
## .w5_MJmotive_ns 0.180 0.038 4.797 0.000
## .w6_MJmotive_ns 0.232 0.041 5.727 0.000
## .w5_MJmotive_nausea ~~
## .w6_MJmotive_ns 0.170 0.037 4.541 0.000
## .w1_MJmotive_attention ~~
## .W2_MJmtv_ttntn 0.275 0.043 6.372 0.000
## .w3_MJmtv_ttntn 0.314 0.044 7.169 0.000
## .w4_MJmtv_ttntn 0.186 0.039 4.746 0.000
## .w5_MJmtv_ttntn 0.159 0.040 4.005 0.000
## .w6_MJmtv_ttntn 0.090 0.043 2.105 0.035
## .W2_MJmotive_attention ~~
## .w3_MJmtv_ttntn 0.266 0.038 7.034 0.000
## .w4_MJmtv_ttntn 0.187 0.035 5.402 0.000
## .w5_MJmtv_ttntn 0.129 0.036 3.616 0.000
## .w6_MJmtv_ttntn 0.094 0.039 2.394 0.017
## .w3_MJmotive_attention ~~
## .w4_MJmtv_ttntn 0.198 0.035 5.602 0.000
## .w5_MJmtv_ttntn 0.211 0.036 5.859 0.000
## .w6_MJmtv_ttntn 0.077 0.039 1.986 0.047
## .w4_MJmotive_attention ~~
## .w5_MJmtv_ttntn 0.114 0.033 3.488 0.000
## .w6_MJmtv_ttntn 0.080 0.035 2.245 0.025
## .w5_MJmotive_attention ~~
## .w6_MJmtv_ttntn 0.152 0.036 4.201 0.000
## .w1_MJmotive_substitution ~~
## .W2_MJmtv_sbstt 0.159 0.036 4.462 0.000
## .w3_MJmtv_sbstt 0.201 0.039 5.214 0.000
## .w4_MJmtv_sbstt 0.174 0.035 4.977 0.000
## .w5_MJmtv_sbstt 0.147 0.040 3.698 0.000
## .w6_MJmtv_sbstt 0.135 0.042 3.229 0.001
## .W2_MJmotive_substitution ~~
## .w3_MJmtv_sbstt 0.184 0.036 5.069 0.000
## .w4_MJmtv_sbstt 0.211 0.034 6.136 0.000
## .w5_MJmtv_sbstt 0.104 0.038 2.699 0.007
## .w6_MJmtv_sbstt 0.111 0.042 2.621 0.009
## .w3_MJmotive_substitution ~~
## .w4_MJmtv_sbstt 0.305 0.038 7.971 0.000
## .w5_MJmtv_sbstt 0.145 0.040 3.645 0.000
## .w6_MJmtv_sbstt 0.238 0.043 5.546 0.000
## .w4_MJmotive_substitution ~~
## .w5_MJmtv_sbstt 0.216 0.037 5.880 0.000
## .w6_MJmtv_sbstt 0.193 0.039 4.975 0.000
## .w5_MJmotive_substitution ~~
## .w6_MJmtv_sbstt 0.225 0.043 5.282 0.000
## .w1_MJmotive_naturalmeds ~~
## .W2_MJmtv_ntrlm 0.385 0.058 6.624 0.000
## .w3_MJmtv_ntrlm 0.323 0.057 5.707 0.000
## .w4_MJmtv_ntrlm 0.209 0.054 3.841 0.000
## .w5_MJmtv_ntrlm 0.135 0.055 2.450 0.014
## .w6_MJmtv_ntrlm 0.110 0.059 1.874 0.061
## .W2_MJmotive_naturalmeds ~~
## .w3_MJmtv_ntrlm 0.435 0.059 7.373 0.000
## .w4_MJmtv_ntrlm 0.320 0.055 5.777 0.000
## .w5_MJmtv_ntrlm 0.335 0.057 5.913 0.000
## .w6_MJmtv_ntrlm 0.222 0.054 4.117 0.000
## .w3_MJmotive_naturalmeds ~~
## .w4_MJmtv_ntrlm 0.417 0.057 7.369 0.000
## .w5_MJmtv_ntrlm 0.394 0.058 6.784 0.000
## .w6_MJmtv_ntrlm 0.241 0.054 4.456 0.000
## .w4_MJmotive_naturalmeds ~~
## .w5_MJmtv_ntrlm 0.330 0.054 6.074 0.000
## .w6_MJmtv_ntrlm 0.241 0.052 4.611 0.000
## .w5_MJmotive_naturalmeds ~~
## .w6_MJmtv_ntrlm 0.305 0.053 5.782 0.000
## .w1_MJmotive_conformity ~~
## .W2_MJmtv_cnfrm 0.074 0.015 4.804 0.000
## .w3_MJmtv_cnfrm 0.063 0.014 4.409 0.000
## .w4_MJmtv_cnfrm 0.069 0.018 3.782 0.000
## .w5_MJmtv_cnfrm 0.099 0.021 4.618 0.000
## .w6_MJmtv_cnfrm 0.062 0.026 2.388 0.017
## .W2_MJmotive_conformity ~~
## .w3_MJmtv_cnfrm 0.055 0.012 4.523 0.000
## .w4_MJmtv_cnfrm 0.046 0.015 3.048 0.002
## .w5_MJmtv_cnfrm 0.041 0.017 2.400 0.016
## .w6_MJmtv_cnfrm 0.043 0.022 1.932 0.053
## .w3_MJmotive_conformity ~~
## .w4_MJmtv_cnfrm 0.103 0.016 6.498 0.000
## .w5_MJmtv_cnfrm 0.035 0.017 2.098 0.036
## .w6_MJmtv_cnfrm 0.057 0.023 2.498 0.012
## .w4_MJmotive_conformity ~~
## .w5_MJmtv_cnfrm 0.089 0.021 4.300 0.000
## .w6_MJmtv_cnfrm 0.103 0.025 4.073 0.000
## .w5_MJmotive_conformity ~~
## .w6_MJmtv_cnfrm 0.160 0.028 5.639 0.000
## .w1_MJmotive_coping ~~
## .W2_MJmotv_cpng 0.431 0.050 8.675 0.000
## .w3_MJmotv_cpng 0.348 0.045 7.729 0.000
## .w4_MJmotv_cpng 0.325 0.045 7.253 0.000
## .w5_MJmotv_cpng 0.286 0.051 5.638 0.000
## .w6_MJmotv_cpng 0.196 0.054 3.615 0.000
## .W2_MJmotive_coping ~~
## .w3_MJmotv_cpng 0.315 0.039 8.121 0.000
## .w4_MJmotv_cpng 0.284 0.038 7.376 0.000
## .w5_MJmotv_cpng 0.234 0.042 5.543 0.000
## .w6_MJmotv_cpng 0.218 0.046 4.737 0.000
## .w3_MJmotive_coping ~~
## .w4_MJmotv_cpng 0.270 0.036 7.563 0.000
## .w5_MJmotv_cpng 0.236 0.040 5.957 0.000
## .w6_MJmotv_cpng 0.246 0.044 5.585 0.000
## .w4_MJmotive_coping ~~
## .w5_MJmotv_cpng 0.256 0.040 6.412 0.000
## .w6_MJmotv_cpng 0.226 0.041 5.501 0.000
## .w5_MJmotive_coping ~~
## .w6_MJmotv_cpng 0.293 0.048 6.069 0.000
## .w1_MJmotive_experiment ~~
## .W2_MJmtv_xprmn 0.158 0.035 4.563 0.000
## .w3_MJmtv_xprmn 0.165 0.037 4.500 0.000
## .w4_MJmtv_xprmn 0.127 0.036 3.533 0.000
## .w5_MJmtv_xprmn 0.195 0.046 4.291 0.000
## .w6_MJmtv_xprmn 0.083 0.048 1.734 0.083
## .W2_MJmotive_experiment ~~
## .w3_MJmtv_xprmn 0.127 0.027 4.691 0.000
## .w4_MJmtv_xprmn 0.088 0.026 3.437 0.001
## .w5_MJmtv_xprmn 0.132 0.033 4.011 0.000
## .w6_MJmtv_xprmn 0.041 0.034 1.185 0.236
## .w3_MJmotive_experiment ~~
## .w4_MJmtv_xprmn 0.143 0.029 4.973 0.000
## .w5_MJmtv_xprmn 0.155 0.035 4.387 0.000
## .w6_MJmtv_xprmn 0.025 0.038 0.669 0.503
## .w4_MJmotive_experiment ~~
## .w5_MJmtv_xprmn 0.203 0.035 5.838 0.000
## .w6_MJmtv_xprmn 0.123 0.034 3.619 0.000
## .w5_MJmotive_experiment ~~
## .w6_MJmtv_xprmn 0.225 0.044 5.069 0.000
## .w1_MJmotive_boredom ~~
## .W2_MJmotv_brdm 0.314 0.046 6.788 0.000
## .w3_MJmotv_brdm 0.295 0.042 6.982 0.000
## .w4_MJmotv_brdm 0.228 0.039 5.783 0.000
## .w5_MJmotv_brdm 0.184 0.044 4.184 0.000
## .w6_MJmotv_brdm 0.212 0.047 4.467 0.000
## .W2_MJmotive_boredom ~~
## .w3_MJmotv_brdm 0.339 0.044 7.678 0.000
## .w4_MJmotv_brdm 0.283 0.041 6.870 0.000
## .w5_MJmotv_brdm 0.271 0.046 5.898 0.000
## .w6_MJmotv_brdm 0.238 0.047 5.008 0.000
## .w3_MJmotive_boredom ~~
## .w4_MJmotv_brdm 0.233 0.038 6.165 0.000
## .w5_MJmotv_brdm 0.242 0.042 5.787 0.000
## .w6_MJmotv_brdm 0.227 0.044 5.119 0.000
## .w4_MJmotive_boredom ~~
## .w5_MJmotv_brdm 0.268 0.041 6.563 0.000
## .w6_MJmotv_brdm 0.199 0.041 4.797 0.000
## .w5_MJmotive_boredom ~~
## .w6_MJmotv_brdm 0.239 0.047 5.051 0.000
## .w1_MJmotive_alcohol ~~
## .W2_MJmotv_lchl 0.206 0.031 6.681 0.000
## .w3_MJmotv_lchl 0.159 0.028 5.610 0.000
## .w4_MJmotv_lchl 0.173 0.031 5.579 0.000
## .w5_MJmotv_lchl 0.147 0.034 4.311 0.000
## .w6_MJmotv_lchl 0.090 0.036 2.495 0.013
## .W2_MJmotive_alcohol ~~
## .w3_MJmotv_lchl 0.179 0.026 6.913 0.000
## .w4_MJmotv_lchl 0.147 0.026 5.575 0.000
## .w5_MJmotv_lchl 0.186 0.030 6.243 0.000
## .w6_MJmotv_lchl 0.156 0.031 5.049 0.000
## .w3_MJmotive_alcohol ~~
## .w4_MJmotv_lchl 0.117 0.024 4.814 0.000
## .w5_MJmotv_lchl 0.139 0.028 4.886 0.000
## .w6_MJmotv_lchl 0.142 0.030 4.769 0.000
## .w4_MJmotive_alcohol ~~
## .w5_MJmotv_lchl 0.189 0.030 6.299 0.000
## .w6_MJmotv_lchl 0.156 0.031 5.005 0.000
## .w5_MJmotive_alcohol ~~
## .w6_MJmotv_lchl 0.198 0.036 5.584 0.000
## .w1_MJmotive_enjoyment ~~
## .W2_MJmtv_njymn 0.291 0.044 6.625 0.000
## .w3_MJmtv_njymn 0.248 0.041 5.976 0.000
## .w4_MJmtv_njymn 0.223 0.040 5.576 0.000
## .w5_MJmtv_njymn 0.204 0.041 4.967 0.000
## .w6_MJmtv_njymn 0.201 0.047 4.279 0.000
## .W2_MJmotive_enjoyment ~~
## .w3_MJmtv_njymn 0.377 0.049 7.699 0.000
## .w4_MJmtv_njymn 0.308 0.046 6.688 0.000
## .w5_MJmtv_njymn 0.318 0.048 6.633 0.000
## .w6_MJmtv_njymn 0.411 0.057 7.250 0.000
## .w3_MJmotive_enjoyment ~~
## .w4_MJmtv_njymn 0.307 0.044 6.907 0.000
## .w5_MJmtv_njymn 0.316 0.046 6.798 0.000
## .w6_MJmtv_njymn 0.404 0.055 7.342 0.000
## .w4_MJmotive_enjoyment ~~
## .w5_MJmtv_njymn 0.308 0.045 6.785 0.000
## .w6_MJmtv_njymn 0.303 0.051 5.912 0.000
## .w5_MJmotive_enjoyment ~~
## .w6_MJmtv_njymn 0.300 0.053 5.691 0.000
## .w1_MJmotive_celebration ~~
## .W2_MJmtv_clbrt 0.276 0.049 5.644 0.000
## .w3_MJmtv_clbrt 0.142 0.044 3.200 0.001
## .w4_MJmtv_clbrt 0.251 0.045 5.551 0.000
## .w5_MJmtv_clbrt 0.150 0.044 3.448 0.001
## .w6_MJmtv_clbrt 0.176 0.053 3.356 0.001
## .W2_MJmotive_celebration ~~
## .w3_MJmtv_clbrt 0.257 0.048 5.383 0.000
## .w4_MJmtv_clbrt 0.287 0.047 6.075 0.000
## .w5_MJmtv_clbrt 0.183 0.046 4.024 0.000
## .w6_MJmtv_clbrt 0.218 0.059 3.723 0.000
## .w3_MJmotive_celebration ~~
## .w4_MJmtv_clbrt 0.199 0.042 4.757 0.000
## .w5_MJmtv_clbrt 0.202 0.043 4.744 0.000
## .w6_MJmtv_clbrt 0.165 0.055 3.002 0.003
## .w4_MJmotive_celebration ~~
## .w5_MJmtv_clbrt 0.251 0.042 5.948 0.000
## .w6_MJmtv_clbrt 0.306 0.050 6.080 0.000
## .w5_MJmotive_celebration ~~
## .w6_MJmtv_clbrt 0.237 0.048 4.970 0.000
## .w1_MJmotive_alteredpercept ~~
## .W2_MJmtv_ltrdp 0.426 0.058 7.396 0.000
## .w3_MJmtv_ltrdp 0.357 0.050 7.141 0.000
## .w4_MJmtv_ltrdp 0.269 0.046 5.861 0.000
## .w5_MJmtv_ltrdp 0.206 0.047 4.386 0.000
## .w6_MJmtv_ltrdp 0.178 0.059 3.022 0.003
## .W2_MJmotive_alteredpercept ~~
## .w3_MJmtv_ltrdp 0.361 0.051 7.045 0.000
## .w4_MJmtv_ltrdp 0.327 0.048 6.788 0.000
## .w5_MJmtv_ltrdp 0.313 0.050 6.306 0.000
## .w6_MJmtv_ltrdp 0.278 0.060 4.652 0.000
## .w3_MJmotive_alteredpercept ~~
## .w4_MJmtv_ltrdp 0.261 0.041 6.281 0.000
## .w5_MJmtv_ltrdp 0.294 0.044 6.619 0.000
## .w6_MJmtv_ltrdp 0.185 0.054 3.438 0.001
## .w4_MJmotive_alteredpercept ~~
## .w5_MJmtv_ltrdp 0.230 0.042 5.531 0.000
## .w6_MJmtv_ltrdp 0.199 0.049 4.030 0.000
## .w5_MJmotive_alteredpercept ~~
## .w6_MJmtv_ltrdp 0.262 0.048 5.443 0.000
## .w1_MJmotive_relativelowrisk ~~
## .W2_MJmtv_rltvl 0.396 0.066 5.996 0.000
## .w3_MJmtv_rltvl 0.439 0.067 6.535 0.000
## .w4_MJmtv_rltvl 0.224 0.060 3.706 0.000
## .w5_MJmtv_rltvl 0.229 0.059 3.898 0.000
## .w6_MJmtv_rltvl 0.204 0.072 2.857 0.004
## .W2_MJmotive_relativelowrisk ~~
## .w3_MJmtv_rltvl 0.546 0.072 7.545 0.000
## .w4_MJmtv_rltvl 0.403 0.064 6.304 0.000
## .w5_MJmtv_rltvl 0.360 0.062 5.764 0.000
## .w6_MJmtv_rltvl 0.333 0.075 4.412 0.000
## .w3_MJmotive_relativelowrisk ~~
## .w4_MJmtv_rltvl 0.420 0.064 6.559 0.000
## .w5_MJmtv_rltvl 0.360 0.063 5.673 0.000
## .w6_MJmtv_rltvl 0.387 0.075 5.167 0.000
## .w4_MJmotive_relativelowrisk ~~
## .w5_MJmtv_rltvl 0.399 0.058 6.828 0.000
## .w6_MJmtv_rltvl 0.438 0.066 6.594 0.000
## .w5_MJmotive_relativelowrisk ~~
## .w6_MJmtv_rltvl 0.404 0.064 6.334 0.000
## .w1_MJmotive_availability ~~
## .W2_MJmtv_vlblt 0.326 0.048 6.807 0.000
## .w3_MJmtv_vlblt 0.208 0.045 4.640 0.000
## .w4_MJmtv_vlblt 0.207 0.043 4.804 0.000
## .w5_MJmtv_vlblt 0.219 0.046 4.795 0.000
## .w6_MJmtv_vlblt 0.221 0.053 4.152 0.000
## .W2_MJmotive_availability ~~
## .w3_MJmtv_vlblt 0.338 0.048 7.121 0.000
## .w4_MJmtv_vlblt 0.285 0.044 6.436 0.000
## .w5_MJmtv_vlblt 0.266 0.046 5.772 0.000
## .w6_MJmtv_vlblt 0.290 0.052 5.615 0.000
## .w3_MJmotive_availability ~~
## .w4_MJmtv_vlblt 0.261 0.043 6.074 0.000
## .w5_MJmtv_vlblt 0.215 0.045 4.816 0.000
## .w6_MJmtv_vlblt 0.266 0.050 5.259 0.000
## .w4_MJmotive_availability ~~
## .w5_MJmtv_vlblt 0.288 0.044 6.561 0.000
## .w6_MJmtv_vlblt 0.229 0.047 4.926 0.000
## .w5_MJmotive_availability ~~
## .w6_MJmtv_vlblt 0.267 0.050 5.338 0.000
## HEMD1 ~~
## AVNR1 0.526 0.051 10.388 0.000
## APEN1 0.643 0.042 15.404 0.000
## HEMD2 0.595 0.041 14.536 0.000
## AVNR2 0.195 0.065 3.008 0.003
## APEN2 0.310 0.060 5.172 0.000
## HEMD3 0.569 0.043 13.185 0.000
## AVNR3 0.218 0.064 3.418 0.001
## APEN3 0.271 0.060 4.509 0.000
## HEMD4 0.477 0.050 9.450 0.000
## AVNR4 0.117 0.066 1.758 0.079
## APEN4 0.214 0.064 3.372 0.001
## HEMD5 0.453 0.055 8.225 0.000
## AVNR5 0.165 0.071 2.322 0.020
## APEN5 0.204 0.066 3.076 0.002
## HEMD6 0.356 0.064 5.537 0.000
## AVNR6 0.125 0.078 1.617 0.106
## APEN6 0.139 0.076 1.821 0.069
## AVNR1 ~~
## APEN1 0.848 0.032 26.514 0.000
## HEMD2 0.139 0.065 2.152 0.031
## AVNR2 0.491 0.054 9.037 0.000
## APEN2 0.393 0.061 6.447 0.000
## HEMD3 0.180 0.065 2.796 0.005
## AVNR3 0.388 0.060 6.459 0.000
## APEN3 0.307 0.063 4.896 0.000
## HEMD4 0.193 0.066 2.911 0.004
## AVNR4 0.289 0.066 4.374 0.000
## APEN4 0.197 0.069 2.867 0.004
## HEMD5 0.109 0.071 1.537 0.124
## AVNR5 0.281 0.072 3.913 0.000
## APEN5 0.250 0.070 3.589 0.000
## HEMD6 0.036 0.076 0.467 0.640
## AVNR6 0.196 0.080 2.443 0.015
## APEN6 0.092 0.082 1.118 0.263
## APEN1 ~~
## HEMD2 0.339 0.058 5.825 0.000
## AVNR2 0.461 0.058 7.917 0.000
## APEN2 0.559 0.047 11.826 0.000
## HEMD3 0.309 0.060 5.197 0.000
## AVNR3 0.341 0.062 5.476 0.000
## APEN3 0.436 0.054 8.073 0.000
## HEMD4 0.252 0.062 4.038 0.000
## AVNR4 0.169 0.068 2.477 0.013
## APEN4 0.301 0.062 4.845 0.000
## HEMD5 0.210 0.068 3.076 0.002
## AVNR5 0.231 0.074 3.126 0.002
## APEN5 0.347 0.065 5.331 0.000
## HEMD6 0.107 0.075 1.416 0.157
## AVNR6 0.096 0.083 1.166 0.243
## APEN6 0.185 0.080 2.317 0.021
## HEMD2 ~~
## AVNR2 0.473 0.056 8.401 0.000
## APEN2 0.622 0.046 13.553 0.000
## HEMD3 0.687 0.035 19.795 0.000
## AVNR3 0.253 0.064 3.924 0.000
## APEN3 0.475 0.053 8.955 0.000
## HEMD4 0.475 0.051 9.385 0.000
## AVNR4 0.132 0.067 1.964 0.050
## APEN4 0.323 0.062 5.243 0.000
## HEMD5 0.468 0.053 8.852 0.000
## AVNR5 0.115 0.071 1.607 0.108
## APEN5 0.256 0.065 3.955 0.000
## HEMD6 0.400 0.063 6.320 0.000
## AVNR6 0.104 0.079 1.317 0.188
## APEN6 0.209 0.077 2.734 0.006
## AVNR2 ~~
## APEN2 0.808 0.039 20.910 0.000
## HEMD3 0.286 0.064 4.505 0.000
## AVNR3 0.519 0.053 9.793 0.000
## APEN3 0.554 0.053 10.524 0.000
## HEMD4 0.146 0.068 2.156 0.031
## AVNR4 0.337 0.064 5.267 0.000
## APEN4 0.362 0.064 5.646 0.000
## HEMD5 0.166 0.069 2.396 0.017
## AVNR5 0.339 0.067 5.079 0.000
## APEN5 0.361 0.065 5.551 0.000
## HEMD6 -0.038 0.079 -0.480 0.631
## AVNR6 0.183 0.085 2.158 0.031
## APEN6 0.121 0.086 1.405 0.160
## APEN2 ~~
## HEMD3 0.410 0.057 7.188 0.000
## AVNR3 0.432 0.060 7.219 0.000
## APEN3 0.699 0.036 19.354 0.000
## HEMD4 0.241 0.063 3.812 0.000
## AVNR4 0.301 0.065 4.630 0.000
## APEN4 0.503 0.052 9.741 0.000
## HEMD5 0.259 0.065 3.983 0.000
## AVNR5 0.288 0.070 4.143 0.000
## APEN5 0.477 0.055 8.676 0.000
## HEMD6 0.187 0.071 2.647 0.008
## AVNR6 0.214 0.076 2.810 0.005
## APEN6 0.322 0.071 4.572 0.000
## HEMD3 ~~
## AVNR3 0.535 0.052 10.194 0.000
## APEN3 0.676 0.041 16.557 0.000
## HEMD4 0.624 0.040 15.527 0.000
## AVNR4 0.234 0.065 3.614 0.000
## APEN4 0.378 0.059 6.394 0.000
## HEMD5 0.547 0.049 11.093 0.000
## AVNR5 0.200 0.071 2.820 0.005
## APEN5 0.322 0.064 5.010 0.000
## HEMD6 0.547 0.056 9.775 0.000
## AVNR6 0.258 0.077 3.364 0.001
## APEN6 0.296 0.075 3.925 0.000
## AVNR3 ~~
## APEN3 0.802 0.035 23.240 0.000
## HEMD4 0.348 0.065 5.347 0.000
## AVNR4 0.515 0.057 9.109 0.000
## APEN4 0.414 0.065 6.397 0.000
## HEMD5 0.221 0.076 2.919 0.004
## AVNR5 0.400 0.072 5.536 0.000
## APEN5 0.370 0.073 5.056 0.000
## HEMD6 0.078 0.084 0.930 0.352
## AVNR6 0.353 0.085 4.165 0.000
## APEN6 0.234 0.091 2.578 0.010
## APEN3 ~~
## HEMD4 0.368 0.058 6.294 0.000
## AVNR4 0.406 0.059 6.829 0.000
## APEN4 0.554 0.048 11.577 0.000
## HEMD5 0.305 0.065 4.719 0.000
## AVNR5 0.322 0.069 4.665 0.000
## APEN5 0.490 0.056 8.794 0.000
## HEMD6 0.255 0.070 3.659 0.000
## AVNR6 0.350 0.073 4.782 0.000
## APEN6 0.418 0.069 6.098 0.000
## HEMD4 ~~
## AVNR4 0.598 0.048 12.340 0.000
## APEN4 0.685 0.041 16.773 0.000
## HEMD5 0.539 0.049 10.965 0.000
## AVNR5 0.312 0.067 4.653 0.000
## APEN5 0.351 0.062 5.665 0.000
## HEMD6 0.491 0.058 8.534 0.000
## AVNR6 0.329 0.072 4.538 0.000
## APEN6 0.291 0.073 3.986 0.000
## AVNR4 ~~
## APEN4 0.825 0.034 24.289 0.000
## HEMD5 0.260 0.067 3.850 0.000
## AVNR5 0.518 0.057 9.154 0.000
## APEN5 0.410 0.063 6.503 0.000
## HEMD6 0.172 0.075 2.294 0.022
## AVNR6 0.483 0.068 7.143 0.000
## APEN6 0.386 0.076 5.059 0.000
## APEN4 ~~
## HEMD5 0.329 0.063 5.223 0.000
## AVNR5 0.436 0.064 6.831 0.000
## APEN5 0.558 0.050 11.222 0.000
## HEMD6 0.234 0.070 3.316 0.001
## AVNR6 0.374 0.073 5.106 0.000
## APEN6 0.470 0.064 7.288 0.000
## HEMD5 ~~
## AVNR5 0.607 0.051 11.882 0.000
## APEN5 0.692 0.040 17.456 0.000
## HEMD6 0.678 0.042 16.287 0.000
## AVNR6 0.446 0.065 6.826 0.000
## APEN6 0.500 0.062 8.112 0.000
## AVNR5 ~~
## APEN5 0.812 0.036 22.463 0.000
## HEMD6 0.316 0.071 4.464 0.000
## AVNR6 0.610 0.055 11.185 0.000
## APEN6 0.541 0.066 8.237 0.000
## APEN5 ~~
## HEMD6 0.424 0.062 6.857 0.000
## AVNR6 0.494 0.063 7.797 0.000
## APEN6 0.611 0.052 11.825 0.000
## HEMD6 ~~
## AVNR6 0.659 0.045 14.794 0.000
## APEN6 0.703 0.041 17.303 0.000
## AVNR6 ~~
## APEN6 0.847 0.034 24.931 0.000
##
## Intercepts:
## Estimate Std.Err z-value P(>|z|)
## HEMD1 0.000
## AVNR1 0.000
## APEN1 0.000
## HEMD2 0.000
## AVNR2 0.000
## APEN2 0.000
## HEMD3 0.000
## AVNR3 0.000
## APEN3 0.000
## HEMD4 0.000
## AVNR4 0.000
## APEN4 0.000
## HEMD5 0.000
## AVNR5 0.000
## APEN5 0.000
## HEMD6 0.000
## AVNR6 0.000
## APEN6 0.000
## .w1_MJmtv_sclnx 2.735 0.067 40.746 0.000
## .w1_MJmotiv_slp 3.371 0.066 51.233 0.000
## .w1_MJmotive_pn 3.028 0.068 44.239 0.000
## .w1_MJmotive_ns 2.182 0.066 33.178 0.000
## .w1_MJmtv_ttntn 2.509 0.068 36.783 0.000
## .w1_MJmtv_sbstt 2.247 0.060 37.700 0.000
## .w1_MJmtv_ntrlm 2.734 0.071 38.406 0.000
## .w1_MJmtv_cnfrm 1.327 0.034 39.508 0.000
## .w1_MJmotv_cpng 2.259 0.060 37.941 0.000
## .w1_MJmtv_xprmn 2.070 0.058 35.696 0.000
## .w1_MJmotv_brdm 2.424 0.060 40.221 0.000
## .w1_MJmotv_lchl 1.718 0.046 37.711 0.000
## .w1_MJmtv_njymn 3.716 0.056 66.237 0.000
## .w1_MJmtv_clbrt 3.061 0.060 50.996 0.000
## .w1_MJmtv_ltrdp 3.057 0.065 46.722 0.000
## .w1_MJmtv_rltvl 3.142 0.067 47.040 0.000
## .w1_MJmtv_vlblt 2.791 0.059 47.393 0.000
## .W2_MJmtv_sclnx 2.289 0.059 38.884 0.000
## .W2_MJmotiv_slp 3.235 0.065 49.802 0.000
## .W2_MJmotive_pn 2.751 0.066 41.711 0.000
## .W2_MJmotive_ns 1.973 0.059 33.210 0.000
## .W2_MJmtv_ttntn 2.116 0.059 35.995 0.000
## .W2_MJmtv_sbstt 1.923 0.052 36.802 0.000
## .W2_MJmtv_ntrlm 2.511 0.068 36.739 0.000
## .W2_MJmtv_cnfrm 1.230 0.030 41.045 0.000
## .W2_MJmotv_cpng 1.977 0.051 39.124 0.000
## .W2_MJmtv_xprmn 1.664 0.045 36.996 0.000
## .W2_MJmotv_brdm 2.149 0.055 39.137 0.000
## .W2_MJmotv_lchl 1.562 0.042 37.386 0.000
## .W2_MJmtv_njymn 3.344 0.061 54.563 0.000
## .W2_MJmtv_clbrt 2.720 0.061 44.823 0.000
## .W2_MJmtv_ltrdp 2.643 0.063 41.871 0.000
## .W2_MJmtv_rltvl 2.712 0.071 38.134 0.000
## .W2_MJmtv_vlblt 2.508 0.058 43.591 0.000
## .w3_MJmtv_sclnx 2.273 0.062 36.721 0.000
## .w3_MJmotiv_slp 3.119 0.067 46.510 0.000
## .w3_MJmotive_pn 2.702 0.067 40.206 0.000
## .w3_MJmotive_ns 1.916 0.058 33.034 0.000
## .w3_MJmtv_ttntn 2.060 0.058 35.560 0.000
## .w3_MJmtv_sbstt 1.930 0.056 34.514 0.000
## .w3_MJmtv_ntrlm 2.523 0.067 37.413 0.000
## .w3_MJmtv_cnfrm 1.209 0.028 43.252 0.000
## .w3_MJmotv_cpng 1.968 0.051 38.794 0.000
## .w3_MJmtv_xprmn 1.672 0.050 33.332 0.000
## .w3_MJmotv_brdm 2.083 0.055 37.756 0.000
## .w3_MJmotv_lchl 1.495 0.039 38.311 0.000
## .w3_MJmtv_njymn 3.303 0.064 51.367 0.000
## .w3_MJmtv_clbrt 2.609 0.063 41.680 0.000
## .w3_MJmtv_ltrdp 2.565 0.063 40.835 0.000
## .w3_MJmtv_rltvl 2.729 0.072 37.723 0.000
## .w3_MJmtv_vlblt 2.511 0.061 40.847 0.000
## .w4_MJmtv_sclnx 2.260 0.062 36.498 0.000
## .w4_MJmotiv_slp 3.005 0.067 44.886 0.000
## .w4_MJmotive_pn 2.513 0.062 40.458 0.000
## .w4_MJmotive_ns 1.958 0.059 33.369 0.000
## .w4_MJmtv_ttntn 2.000 0.057 35.003 0.000
## .w4_MJmtv_sbstt 1.907 0.054 35.631 0.000
## .w4_MJmtv_ntrlm 2.374 0.068 34.746 0.000
## .w4_MJmtv_cnfrm 1.327 0.036 36.347 0.000
## .w4_MJmotv_cpng 2.080 0.052 39.650 0.000
## .w4_MJmtv_xprmn 1.737 0.050 34.517 0.000
## .w4_MJmotv_brdm 2.197 0.056 39.410 0.000
## .w4_MJmotv_lchl 1.589 0.043 36.859 0.000
## .w4_MJmtv_njymn 3.203 0.060 53.047 0.000
## .w4_MJmtv_clbrt 2.577 0.061 42.137 0.000
## .w4_MJmtv_ltrdp 2.570 0.062 41.363 0.000
## .w4_MJmtv_rltvl 2.562 0.068 37.637 0.000
## .w4_MJmtv_vlblt 2.358 0.059 40.020 0.000
## .w5_MJmtv_sclnx 2.318 0.066 35.262 0.000
## .w5_MJmotiv_slp 2.956 0.070 42.530 0.000
## .w5_MJmotive_pn 2.637 0.069 38.337 0.000
## .w5_MJmotive_ns 2.048 0.064 32.216 0.000
## .w5_MJmtv_ttntn 2.114 0.066 31.869 0.000
## .w5_MJmtv_sbstt 1.959 0.059 33.328 0.000
## .w5_MJmtv_ntrlm 2.412 0.075 32.250 0.000
## .w5_MJmtv_cnfrm 1.381 0.041 33.652 0.000
## .w5_MJmotv_cpng 2.215 0.061 36.516 0.000
## .w5_MJmtv_xprmn 1.863 0.060 31.069 0.000
## .w5_MJmotv_brdm 2.276 0.062 36.745 0.000
## .w5_MJmotv_lchl 1.698 0.049 34.363 0.000
## .w5_MJmtv_njymn 3.262 0.066 49.163 0.000
## .w5_MJmtv_clbrt 2.565 0.066 38.650 0.000
## .w5_MJmtv_ltrdp 2.675 0.071 37.833 0.000
## .w5_MJmtv_rltvl 2.622 0.070 37.616 0.000
## .w5_MJmtv_vlblt 2.405 0.062 38.944 0.000
## .w6_MJmtv_sclnx 2.221 0.071 31.439 0.000
## .w6_MJmotiv_slp 2.838 0.072 39.644 0.000
## .w6_MJmotive_pn 2.444 0.072 33.937 0.000
## .w6_MJmotive_ns 1.935 0.065 29.669 0.000
## .w6_MJmtv_ttntn 1.985 0.065 30.339 0.000
## .w6_MJmtv_sbstt 1.919 0.064 29.794 0.000
## .w6_MJmtv_ntrlm 2.249 0.074 30.479 0.000
## .w6_MJmtv_cnfrm 1.385 0.047 29.715 0.000
## .w6_MJmotv_cpng 2.169 0.063 34.251 0.000
## .w6_MJmtv_xprmn 1.788 0.062 28.697 0.000
## .w6_MJmotv_brdm 2.329 0.067 34.674 0.000
## .w6_MJmotv_lchl 1.617 0.051 31.990 0.000
## .w6_MJmtv_njymn 3.266 0.068 48.030 0.000
## .w6_MJmtv_clbrt 2.566 0.067 38.087 0.000
## .w6_MJmtv_ltrdp 2.559 0.072 35.356 0.000
## .w6_MJmtv_rltvl 2.508 0.076 32.855 0.000
## .w6_MJmtv_vlblt 2.316 0.064 35.954 0.000
##
## Variances:
## Estimate Std.Err z-value P(>|z|)
## HEMD1 1.000
## AVNR1 1.000
## APEN1 1.000
## HEMD2 1.000
## AVNR2 1.000
## APEN2 1.000
## HEMD3 1.000
## AVNR3 1.000
## APEN3 1.000
## HEMD4 1.000
## AVNR4 1.000
## APEN4 1.000
## HEMD5 1.000
## AVNR5 1.000
## APEN5 1.000
## HEMD6 1.000
## AVNR6 1.000
## APEN6 1.000
## .w1_MJmtv_sclnx 0.648 0.059 11.061 0.000
## .w1_MJmotiv_slp 0.927 0.075 12.291 0.000
## .w1_MJmotive_pn 0.670 0.062 10.851 0.000
## .w1_MJmotive_ns 0.774 0.066 11.682 0.000
## .w1_MJmtv_ttntn 0.770 0.066 11.747 0.000
## .w1_MJmtv_sbstt 0.570 0.049 11.625 0.000
## .w1_MJmtv_ntrlm 0.896 0.075 11.866 0.000
## .w1_MJmtv_cnfrm 0.297 0.024 12.300 0.000
## .w1_MJmotv_cpng 0.877 0.072 12.135 0.000
## .w1_MJmtv_xprmn 0.726 0.062 11.613 0.000
## .w1_MJmotv_brdm 0.549 0.060 9.153 0.000
## .w1_MJmotv_lchl 0.581 0.046 12.748 0.000
## .w1_MJmtv_njymn 0.516 0.049 10.533 0.000
## .w1_MJmtv_clbrt 0.746 0.064 11.703 0.000
## .w1_MJmtv_ltrdp 0.828 0.072 11.489 0.000
## .w1_MJmtv_rltvl 0.993 0.083 12.039 0.000
## .w1_MJmtv_vlblt 0.707 0.062 11.424 0.000
## .W2_MJmtv_sclnx 0.602 0.054 11.225 0.000
## .W2_MJmotiv_slp 0.929 0.078 11.936 0.000
## .W2_MJmotive_pn 0.620 0.060 10.299 0.000
## .W2_MJmotive_ns 0.556 0.051 10.870 0.000
## .W2_MJmtv_ttntn 0.535 0.048 11.052 0.000
## .W2_MJmtv_sbstt 0.538 0.046 11.788 0.000
## .W2_MJmtv_ntrlm 0.824 0.074 11.158 0.000
## .W2_MJmtv_cnfrm 0.201 0.018 11.217 0.000
## .W2_MJmotv_cpng 0.607 0.052 11.714 0.000
## .W2_MJmtv_xprmn 0.352 0.036 9.850 0.000
## .W2_MJmotv_brdm 0.654 0.061 10.767 0.000
## .W2_MJmotv_lchl 0.401 0.035 11.323 0.000
## .W2_MJmtv_njymn 0.655 0.064 10.291 0.000
## .W2_MJmtv_clbrt 0.723 0.066 10.955 0.000
## .W2_MJmtv_ltrdp 0.841 0.074 11.303 0.000
## .W2_MJmtv_rltvl 1.015 0.091 11.197 0.000
## .W2_MJmtv_vlblt 0.679 0.061 11.067 0.000
## .w3_MJmtv_sclnx 0.569 0.055 10.403 0.000
## .w3_MJmotiv_slp 0.928 0.079 11.734 0.000
## .w3_MJmotive_pn 0.689 0.066 10.512 0.000
## .w3_MJmotive_ns 0.605 0.054 11.124 0.000
## .w3_MJmtv_ttntn 0.513 0.048 10.781 0.000
## .w3_MJmtv_sbstt 0.579 0.051 11.407 0.000
## .w3_MJmtv_ntrlm 0.766 0.072 10.668 0.000
## .w3_MJmtv_cnfrm 0.175 0.015 11.346 0.000
## .w3_MJmotv_cpng 0.492 0.044 11.065 0.000
## .w3_MJmtv_xprmn 0.379 0.039 9.775 0.000
## .w3_MJmotv_brdm 0.519 0.051 10.242 0.000
## .w3_MJmotv_lchl 0.353 0.031 11.441 0.000
## .w3_MJmtv_njymn 0.592 0.058 10.267 0.000
## .w3_MJmtv_clbrt 0.600 0.057 10.454 0.000
## .w3_MJmtv_ltrdp 0.600 0.057 10.593 0.000
## .w3_MJmtv_rltvl 1.035 0.090 11.450 0.000
## .w3_MJmtv_vlblt 0.636 0.059 10.857 0.000
## .w4_MJmtv_sclnx 0.435 0.047 9.188 0.000
## .w4_MJmotiv_slp 0.816 0.072 11.271 0.000
## .w4_MJmotive_pn 0.545 0.054 10.020 0.000
## .w4_MJmotive_ns 0.562 0.052 10.858 0.000
## .w4_MJmtv_ttntn 0.432 0.043 9.948 0.000
## .w4_MJmtv_sbstt 0.469 0.043 11.010 0.000
## .w4_MJmtv_ntrlm 0.703 0.069 10.171 0.000
## .w4_MJmtv_cnfrm 0.269 0.025 10.579 0.000
## .w4_MJmotv_cpng 0.477 0.044 10.723 0.000
## .w4_MJmtv_xprmn 0.349 0.037 9.538 0.000
## .w4_MJmotv_brdm 0.448 0.048 9.351 0.000
## .w4_MJmotv_lchl 0.385 0.035 11.157 0.000
## .w4_MJmtv_njymn 0.571 0.055 10.430 0.000
## .w4_MJmtv_clbrt 0.582 0.055 10.485 0.000
## .w4_MJmtv_ltrdp 0.500 0.051 9.904 0.000
## .w4_MJmtv_rltvl 0.807 0.075 10.775 0.000
## .w4_MJmtv_vlblt 0.566 0.054 10.557 0.000
## .w5_MJmtv_sclnx 0.511 0.053 9.658 0.000
## .w5_MJmotiv_slp 0.769 0.073 10.536 0.000
## .w5_MJmotive_pn 0.469 0.050 9.362 0.000
## .w5_MJmotive_ns 0.448 0.046 9.803 0.000
## .w5_MJmtv_ttntn 0.410 0.045 9.188 0.000
## .w5_MJmtv_sbstt 0.570 0.053 10.683 0.000
## .w5_MJmtv_ntrlm 0.732 0.073 10.064 0.000
## .w5_MJmtv_cnfrm 0.300 0.030 9.926 0.000
## .w5_MJmotv_cpng 0.575 0.058 9.848 0.000
## .w5_MJmtv_xprmn 0.519 0.057 9.129 0.000
## .w5_MJmotv_brdm 0.534 0.059 9.054 0.000
## .w5_MJmotv_lchl 0.453 0.043 10.479 0.000
## .w5_MJmtv_njymn 0.564 0.058 9.739 0.000
## .w5_MJmtv_clbrt 0.479 0.052 9.156 0.000
## .w5_MJmtv_ltrdp 0.459 0.054 8.542 0.000
## .w5_MJmtv_rltvl 0.738 0.072 10.305 0.000
## .w5_MJmtv_vlblt 0.596 0.058 10.208 0.000
## .w6_MJmtv_sclnx 0.459 0.050 9.265 0.000
## .w6_MJmotiv_slp 0.763 0.073 10.401 0.000
## .w6_MJmotive_pn 0.452 0.050 8.979 0.000
## .w6_MJmotive_ns 0.415 0.043 9.551 0.000
## .w6_MJmtv_ttntn 0.358 0.040 9.038 0.000
## .w6_MJmtv_sbstt 0.497 0.049 10.219 0.000
## .w6_MJmtv_ntrlm 0.522 0.056 9.350 0.000
## .w6_MJmtv_cnfrm 0.342 0.035 9.793 0.000
## .w6_MJmotv_cpng 0.568 0.058 9.712 0.000
## .w6_MJmtv_xprmn 0.393 0.046 8.477 0.000
## .w6_MJmotv_brdm 0.480 0.056 8.607 0.000
## .w6_MJmotv_lchl 0.420 0.042 10.047 0.000
## .w6_MJmtv_njymn 0.671 0.072 9.340 0.000
## .w6_MJmtv_clbrt 0.636 0.065 9.805 0.000
## .w6_MJmtv_ltrdp 0.520 0.061 8.504 0.000
## .w6_MJmtv_rltvl 0.813 0.083 9.809 0.000
## .w6_MJmtv_vlblt 0.572 0.060 9.522 0.000
Configural Invariance with HEMD, AVNR and APEN WITH CROSS-LOADINGS
configural.cl <- '
HEMD1 =~ NA*w1_MJmotive_socialanxiety + w1_MJmotive_sleep + w1_MJmotive_pain + w1_MJmotive_nausea + w1_MJmotive_attention + w1_MJmotive_substitution + w1_MJmotive_naturalmeds
AVNR1 =~ NA*w1_MJmotive_conformity + w1_MJmotive_coping + w1_MJmotive_experiment + w1_MJmotive_boredom + w1_MJmotive_alcohol
APEN1 =~ NA*w1_MJmotive_enjoyment + w1_MJmotive_celebration + w1_MJmotive_alteredpercept + w1_MJmotive_relativelowrisk + w1_MJmotive_availability + w1_MJmotive_conformity
HEMD2 =~ NA*W2_MJmotive_socialanxiety + W2_MJmotive_sleep + W2_MJmotive_pain + W2_MJmotive_nausea + W2_MJmotive_attention + W2_MJmotive_substitution + W2_MJmotive_naturalmeds
AVNR2 =~ NA*W2_MJmotive_conformity + W2_MJmotive_coping + W2_MJmotive_experiment + W2_MJmotive_boredom + W2_MJmotive_alcohol
APEN2 =~ NA*W2_MJmotive_enjoyment + W2_MJmotive_celebration + W2_MJmotive_alteredpercept + W2_MJmotive_relativelowrisk + W2_MJmotive_availability + W2_MJmotive_conformity
HEMD3 =~ NA*w3_MJmotive_socialanxiety + w3_MJmotive_sleep + w3_MJmotive_pain + w3_MJmotive_nausea + w3_MJmotive_attention + w3_MJmotive_substitution + w3_MJmotive_naturalmeds
AVNR3 =~ NA*w3_MJmotive_conformity + w3_MJmotive_coping + w3_MJmotive_experiment + w3_MJmotive_boredom + w3_MJmotive_alcohol
APEN3 =~ NA*w3_MJmotive_enjoyment + w3_MJmotive_celebration + w3_MJmotive_alteredpercept + w3_MJmotive_relativelowrisk + w3_MJmotive_availability + w3_MJmotive_conformity
HEMD4 =~ NA*w4_MJmotive_socialanxiety + w4_MJmotive_sleep + w4_MJmotive_pain + w4_MJmotive_nausea + w4_MJmotive_attention + w4_MJmotive_substitution + w4_MJmotive_naturalmeds
AVNR4 =~ NA*w4_MJmotive_conformity + w4_MJmotive_coping + w4_MJmotive_experiment + w4_MJmotive_boredom + w4_MJmotive_alcohol
APEN4 =~ NA*w4_MJmotive_enjoyment + w4_MJmotive_celebration + w4_MJmotive_alteredpercept + w4_MJmotive_relativelowrisk + w4_MJmotive_availability + w4_MJmotive_conformity
HEMD5 =~ NA*w5_MJmotive_socialanxiety + w5_MJmotive_sleep + w5_MJmotive_pain + w5_MJmotive_nausea + w5_MJmotive_attention + w5_MJmotive_substitution + w5_MJmotive_naturalmeds
AVNR5 =~ NA*w5_MJmotive_conformity + w5_MJmotive_coping + w5_MJmotive_experiment + w5_MJmotive_boredom + w5_MJmotive_alcohol
APEN5 =~ NA*w5_MJmotive_enjoyment + w5_MJmotive_celebration + w5_MJmotive_alteredpercept + w5_MJmotive_relativelowrisk + w5_MJmotive_availability + w5_MJmotive_conformity
HEMD6 =~ NA*w6_MJmotive_socialanxiety + w6_MJmotive_sleep + w6_MJmotive_pain + w6_MJmotive_nausea + w6_MJmotive_attention + w6_MJmotive_substitution + w6_MJmotive_naturalmeds
AVNR6 =~ NA*w6_MJmotive_conformity + w6_MJmotive_coping + w6_MJmotive_experiment + w6_MJmotive_boredom + w6_MJmotive_alcohol
APEN6 =~ NA*w6_MJmotive_enjoyment + w6_MJmotive_celebration + w6_MJmotive_alteredpercept + w6_MJmotive_relativelowrisk + w6_MJmotive_availability + w6_MJmotive_conformity
#SET VARIANCES
HEMD1 ~~ 1*HEMD1
AVNR1 ~~ 1*AVNR1
APEN1 ~~ 1*APEN1
HEMD2 ~~ 1*HEMD2
AVNR2 ~~ 1*AVNR2
APEN2 ~~ 1*APEN2
HEMD3 ~~ 1*HEMD3
AVNR3 ~~ 1*AVNR3
APEN3 ~~ 1*APEN3
HEMD4 ~~ 1*HEMD4
AVNR4 ~~ 1*AVNR4
APEN4 ~~ 1*APEN4
HEMD5 ~~ 1*HEMD5
AVNR5 ~~ 1*AVNR5
APEN5 ~~ 1*APEN5
HEMD6 ~~ 1*HEMD6
AVNR6 ~~ 1*AVNR6
APEN6 ~~ 1*APEN6
#SET MEANS
HEMD1 ~ 0*1
AVNR1 ~ 0*1
APEN1 ~ 0*1
HEMD2 ~ 0*1
AVNR2 ~ 0*1
APEN2 ~ 0*1
HEMD3 ~ 0*1
AVNR3 ~ 0*1
APEN3 ~ 0*1
HEMD4 ~ 0*1
AVNR4 ~ 0*1
APEN4 ~ 0*1
HEMD5 ~ 0*1
AVNR5 ~ 0*1
APEN5 ~ 0*1
HEMD6 ~ 0*1
AVNR6 ~ 0*1
APEN6 ~ 0*1
#CORRELATED RESIDUALS
w1_MJmotive_socialanxiety ~~ W2_MJmotive_socialanxiety + w3_MJmotive_socialanxiety + w4_MJmotive_socialanxiety + w5_MJmotive_socialanxiety + w6_MJmotive_socialanxiety
W2_MJmotive_socialanxiety ~~ w3_MJmotive_socialanxiety + w4_MJmotive_socialanxiety + w5_MJmotive_socialanxiety + w6_MJmotive_socialanxiety
w3_MJmotive_socialanxiety ~~ w4_MJmotive_socialanxiety + w5_MJmotive_socialanxiety + w6_MJmotive_socialanxiety
w4_MJmotive_socialanxiety ~~ w5_MJmotive_socialanxiety + w6_MJmotive_socialanxiety
w5_MJmotive_socialanxiety ~~ w6_MJmotive_socialanxiety
w1_MJmotive_sleep ~~ W2_MJmotive_sleep + w3_MJmotive_sleep + w4_MJmotive_sleep + w5_MJmotive_sleep + w6_MJmotive_sleep
W2_MJmotive_sleep ~~ w3_MJmotive_sleep + w4_MJmotive_sleep + w5_MJmotive_sleep + w6_MJmotive_sleep
w3_MJmotive_sleep ~~ w4_MJmotive_sleep + w5_MJmotive_sleep + w6_MJmotive_sleep
w4_MJmotive_sleep ~~ w5_MJmotive_sleep + w6_MJmotive_sleep
w5_MJmotive_sleep ~~ w6_MJmotive_sleep
w1_MJmotive_pain ~~ W2_MJmotive_pain + w3_MJmotive_pain + w4_MJmotive_pain + w5_MJmotive_pain + w6_MJmotive_pain
W2_MJmotive_pain ~~ w3_MJmotive_pain + w4_MJmotive_pain + w5_MJmotive_pain + w6_MJmotive_pain
w3_MJmotive_pain ~~ w4_MJmotive_pain + w5_MJmotive_pain + w6_MJmotive_pain
w4_MJmotive_pain ~~ w5_MJmotive_pain + w6_MJmotive_pain
w5_MJmotive_pain ~~ w6_MJmotive_pain
w1_MJmotive_nausea ~~ W2_MJmotive_nausea + w3_MJmotive_nausea + w4_MJmotive_nausea + w5_MJmotive_nausea + w6_MJmotive_nausea
W2_MJmotive_nausea ~~ w3_MJmotive_nausea + w4_MJmotive_nausea + w5_MJmotive_nausea + w6_MJmotive_nausea
w3_MJmotive_nausea ~~ w4_MJmotive_nausea + w5_MJmotive_nausea + w6_MJmotive_nausea
w4_MJmotive_nausea ~~ w5_MJmotive_nausea + w6_MJmotive_nausea
w5_MJmotive_nausea ~~ w6_MJmotive_nausea
w1_MJmotive_attention ~~ W2_MJmotive_attention + w3_MJmotive_attention + w4_MJmotive_attention + w5_MJmotive_attention + w6_MJmotive_attention
W2_MJmotive_attention ~~ w3_MJmotive_attention + w4_MJmotive_attention + w5_MJmotive_attention + w6_MJmotive_attention
w3_MJmotive_attention ~~ w4_MJmotive_attention + w5_MJmotive_attention + w6_MJmotive_attention
w4_MJmotive_attention ~~ w5_MJmotive_attention + w6_MJmotive_attention
w5_MJmotive_attention ~~ w6_MJmotive_attention
w1_MJmotive_substitution ~~ W2_MJmotive_substitution + w3_MJmotive_substitution + w4_MJmotive_substitution + w5_MJmotive_substitution + w6_MJmotive_substitution
W2_MJmotive_substitution ~~ w3_MJmotive_substitution + w4_MJmotive_substitution + w5_MJmotive_substitution + w6_MJmotive_substitution
w3_MJmotive_substitution ~~ w4_MJmotive_substitution + w5_MJmotive_substitution + w6_MJmotive_substitution
w4_MJmotive_substitution ~~ w5_MJmotive_substitution + w6_MJmotive_substitution
w5_MJmotive_substitution ~~ w6_MJmotive_substitution
w1_MJmotive_naturalmeds ~~ W2_MJmotive_naturalmeds + w3_MJmotive_naturalmeds + w4_MJmotive_naturalmeds + w5_MJmotive_naturalmeds + w6_MJmotive_naturalmeds
W2_MJmotive_naturalmeds ~~ w3_MJmotive_naturalmeds + w4_MJmotive_naturalmeds + w5_MJmotive_naturalmeds + w6_MJmotive_naturalmeds
w3_MJmotive_naturalmeds ~~ w4_MJmotive_naturalmeds + w5_MJmotive_naturalmeds + w6_MJmotive_naturalmeds
w4_MJmotive_naturalmeds ~~ w5_MJmotive_naturalmeds + w6_MJmotive_naturalmeds
w5_MJmotive_naturalmeds ~~ w6_MJmotive_naturalmeds
w1_MJmotive_conformity ~~ W2_MJmotive_conformity + w3_MJmotive_conformity + w4_MJmotive_conformity + w5_MJmotive_conformity + w6_MJmotive_conformity
W2_MJmotive_conformity ~~ w3_MJmotive_conformity + w4_MJmotive_conformity + w5_MJmotive_conformity + w6_MJmotive_conformity
w3_MJmotive_conformity ~~ w4_MJmotive_conformity + w5_MJmotive_conformity + w6_MJmotive_conformity
w4_MJmotive_conformity ~~ w5_MJmotive_conformity + w6_MJmotive_conformity
w5_MJmotive_conformity ~~ w6_MJmotive_conformity
w1_MJmotive_coping ~~ W2_MJmotive_coping + w3_MJmotive_coping + w4_MJmotive_coping + w5_MJmotive_coping + w6_MJmotive_coping
W2_MJmotive_coping ~~ w3_MJmotive_coping + w4_MJmotive_coping + w5_MJmotive_coping + w6_MJmotive_coping
w3_MJmotive_coping ~~ w4_MJmotive_coping + w5_MJmotive_coping + w6_MJmotive_coping
w4_MJmotive_coping ~~ w5_MJmotive_coping + w6_MJmotive_coping
w5_MJmotive_coping ~~ w6_MJmotive_coping
w1_MJmotive_experiment ~~ W2_MJmotive_experiment + w3_MJmotive_experiment + w4_MJmotive_experiment + w5_MJmotive_experiment + w6_MJmotive_experiment
W2_MJmotive_experiment ~~ w3_MJmotive_experiment + w4_MJmotive_experiment + w5_MJmotive_experiment + w6_MJmotive_experiment
w3_MJmotive_experiment ~~ w4_MJmotive_experiment + w5_MJmotive_experiment + w6_MJmotive_experiment
w4_MJmotive_experiment ~~ w5_MJmotive_experiment + w6_MJmotive_experiment
w5_MJmotive_experiment ~~ w6_MJmotive_experiment
w1_MJmotive_boredom ~~ W2_MJmotive_boredom + w3_MJmotive_boredom + w4_MJmotive_boredom + w5_MJmotive_boredom + w6_MJmotive_boredom
W2_MJmotive_boredom ~~ w3_MJmotive_boredom + w4_MJmotive_boredom + w5_MJmotive_boredom + w6_MJmotive_boredom
w3_MJmotive_boredom ~~ w4_MJmotive_boredom + w5_MJmotive_boredom + w6_MJmotive_boredom
w4_MJmotive_boredom ~~ w5_MJmotive_boredom + w6_MJmotive_boredom
w5_MJmotive_boredom ~~ w6_MJmotive_boredom
w1_MJmotive_alcohol ~~ W2_MJmotive_alcohol + w3_MJmotive_alcohol + w4_MJmotive_alcohol + w5_MJmotive_alcohol + w6_MJmotive_alcohol
W2_MJmotive_alcohol ~~ w3_MJmotive_alcohol + w4_MJmotive_alcohol + w5_MJmotive_alcohol + w6_MJmotive_alcohol
w3_MJmotive_alcohol ~~ w4_MJmotive_alcohol + w5_MJmotive_alcohol + w6_MJmotive_alcohol
w4_MJmotive_alcohol ~~ w5_MJmotive_alcohol + w6_MJmotive_alcohol
w5_MJmotive_alcohol ~~ w6_MJmotive_alcohol
w1_MJmotive_enjoyment ~~ W2_MJmotive_enjoyment + w3_MJmotive_enjoyment + w4_MJmotive_enjoyment + w5_MJmotive_enjoyment + w6_MJmotive_enjoyment
W2_MJmotive_enjoyment ~~ w3_MJmotive_enjoyment + w4_MJmotive_enjoyment + w5_MJmotive_enjoyment + w6_MJmotive_enjoyment
w3_MJmotive_enjoyment ~~ w4_MJmotive_enjoyment + w5_MJmotive_enjoyment + w6_MJmotive_enjoyment
w4_MJmotive_enjoyment ~~ w5_MJmotive_enjoyment + w6_MJmotive_enjoyment
w5_MJmotive_enjoyment ~~ w6_MJmotive_enjoyment
w1_MJmotive_celebration ~~ W2_MJmotive_celebration + w3_MJmotive_celebration + w4_MJmotive_celebration + w5_MJmotive_celebration + w6_MJmotive_celebration
W2_MJmotive_celebration ~~ w3_MJmotive_celebration + w4_MJmotive_celebration + w5_MJmotive_celebration + w6_MJmotive_celebration
w3_MJmotive_celebration ~~ w4_MJmotive_celebration + w5_MJmotive_celebration + w6_MJmotive_celebration
w4_MJmotive_celebration ~~ w5_MJmotive_celebration + w6_MJmotive_celebration
w5_MJmotive_celebration ~~ w6_MJmotive_celebration
w1_MJmotive_alteredpercept ~~ W2_MJmotive_alteredpercept + w3_MJmotive_alteredpercept + w4_MJmotive_alteredpercept + w5_MJmotive_alteredpercept + w6_MJmotive_alteredpercept
W2_MJmotive_alteredpercept ~~ w3_MJmotive_alteredpercept + w4_MJmotive_alteredpercept + w5_MJmotive_alteredpercept + w6_MJmotive_alteredpercept
w3_MJmotive_alteredpercept ~~ w4_MJmotive_alteredpercept + w5_MJmotive_alteredpercept + w6_MJmotive_alteredpercept
w4_MJmotive_alteredpercept ~~ w5_MJmotive_alteredpercept + w6_MJmotive_alteredpercept
w5_MJmotive_alteredpercept ~~ w6_MJmotive_alteredpercept
w1_MJmotive_relativelowrisk ~~ W2_MJmotive_relativelowrisk + w3_MJmotive_relativelowrisk + w4_MJmotive_relativelowrisk + w5_MJmotive_relativelowrisk + w6_MJmotive_relativelowrisk
W2_MJmotive_relativelowrisk ~~ w3_MJmotive_relativelowrisk + w4_MJmotive_relativelowrisk + w5_MJmotive_relativelowrisk + w6_MJmotive_relativelowrisk
w3_MJmotive_relativelowrisk ~~ w4_MJmotive_relativelowrisk + w5_MJmotive_relativelowrisk + w6_MJmotive_relativelowrisk
w4_MJmotive_relativelowrisk ~~ w5_MJmotive_relativelowrisk + w6_MJmotive_relativelowrisk
w5_MJmotive_relativelowrisk ~~ w6_MJmotive_relativelowrisk
w1_MJmotive_availability ~~ W2_MJmotive_availability + w3_MJmotive_availability + w4_MJmotive_availability + w5_MJmotive_availability + w6_MJmotive_availability
W2_MJmotive_availability ~~ w3_MJmotive_availability + w4_MJmotive_availability + w5_MJmotive_availability + w6_MJmotive_availability
w3_MJmotive_availability ~~ w4_MJmotive_availability + w5_MJmotive_availability + w6_MJmotive_availability
w4_MJmotive_availability ~~ w5_MJmotive_availability + w6_MJmotive_availability
w5_MJmotive_availability ~~ w6_MJmotive_availability
'
fit.con.cl <- sem(configural.cl, data = mot, missing = "ML")
## Warning in lav_object_post_check(object): lavaan WARNING: some estimated ov
## variances are negative
summary(fit.con.cl, fit.measures = TRUE)
## lavaan 0.6-8 ended normally after 264 iterations
##
## Estimator ML
## Optimization method NLMINB
## Number of model parameters 720
##
## Number of observations 425
## Number of missing patterns 29
##
## Model Test User Model:
##
## Test statistic 8442.087
## Degrees of freedom 4635
## P-value (Chi-square) 0.000
##
## Model Test Baseline Model:
##
## Test statistic 30282.088
## Degrees of freedom 5151
## P-value 0.000
##
## User Model versus Baseline Model:
##
## Comparative Fit Index (CFI) 0.849
## Tucker-Lewis Index (TLI) 0.832
##
## Loglikelihood and Information Criteria:
##
## Loglikelihood user model (H0) -35445.276
## Loglikelihood unrestricted model (H1) -31224.232
##
## Akaike (AIC) 72330.552
## Bayesian (BIC) 75248.056
## Sample-size adjusted Bayesian (BIC) 72963.238
##
## Root Mean Square Error of Approximation:
##
## RMSEA 0.044
## 90 Percent confidence interval - lower 0.042
## 90 Percent confidence interval - upper 0.045
## P-value RMSEA <= 0.05 1.000
##
## Standardized Root Mean Square Residual:
##
## SRMR 0.078
##
## Parameter Estimates:
##
## Standard errors Standard
## Information Observed
## Observed information based on Hessian
##
## Latent Variables:
## Estimate Std.Err z-value P(>|z|)
## HEMD1 =~
## w1_MJmtv_sclnx 1.013 0.058 17.523 0.000
## w1_MJmotiv_slp 0.824 0.058 14.149 0.000
## w1_MJmotive_pn 1.031 0.059 17.366 0.000
## w1_MJmotive_ns 0.911 0.057 15.893 0.000
## w1_MJmtv_ttntn 0.978 0.057 17.111 0.000
## w1_MJmtv_sbstt 0.862 0.052 16.717 0.000
## w1_MJmtv_ntrlm 0.987 0.061 16.092 0.000
## AVNR1 =~
## w1_MJmtv_cnfrm 1.412 0.311 4.544 0.000
## w1_MJmotv_cpng 0.639 0.049 13.003 0.000
## w1_MJmtv_xprmn 0.701 0.052 13.412 0.000
## w1_MJmotv_brdm 0.841 0.049 17.044 0.000
## w1_MJmotv_lchl 0.427 0.041 10.378 0.000
## APEN1 =~
## w1_MJmtv_njymn 0.792 0.047 16.743 0.000
## w1_MJmtv_clbrt 0.752 0.054 13.860 0.000
## w1_MJmtv_ltrdp 0.865 0.055 15.705 0.000
## w1_MJmtv_rltvl 0.792 0.060 13.139 0.000
## w1_MJmtv_vlblt 0.746 0.052 14.221 0.000
## w1_MJmtv_cnfrm -1.096 0.309 -3.552 0.000
## HEMD2 =~
## W2_MJmtv_sclnx 0.786 0.053 14.946 0.000
## W2_MJmotiv_slp 0.750 0.058 12.927 0.000
## W2_MJmotive_pn 0.963 0.056 17.072 0.000
## W2_MJmotive_ns 0.839 0.050 16.670 0.000
## W2_MJmtv_ttntn 0.830 0.050 16.521 0.000
## W2_MJmtv_sbstt 0.649 0.047 13.716 0.000
## W2_MJmtv_ntrlm 0.912 0.058 15.736 0.000
## AVNR2 =~
## W2_MJmtv_cnfrm 1.145 0.243 4.711 0.000
## W2_MJmotv_cpng 0.530 0.042 12.723 0.000
## W2_MJmtv_xprmn 0.573 0.041 13.988 0.000
## W2_MJmotv_brdm 0.662 0.045 14.625 0.000
## W2_MJmotv_lchl 0.468 0.036 13.055 0.000
## APEN2 =~
## W2_MJmtv_njymn 0.813 0.050 16.137 0.000
## W2_MJmtv_clbrt 0.729 0.054 13.460 0.000
## W2_MJmtv_ltrdp 0.728 0.054 13.535 0.000
## W2_MJmtv_rltvl 0.843 0.061 13.742 0.000
## W2_MJmtv_vlblt 0.692 0.049 14.169 0.000
## W2_MJmtv_cnfrm -0.849 0.241 -3.523 0.000
## HEMD3 =~
## w3_MJmtv_sclnx 0.866 0.054 16.010 0.000
## w3_MJmotiv_slp 0.789 0.060 13.090 0.000
## w3_MJmotive_pn 0.940 0.056 16.796 0.000
## w3_MJmotive_ns 0.753 0.050 15.081 0.000
## w3_MJmtv_ttntn 0.806 0.049 16.600 0.000
## w3_MJmtv_sbstt 0.709 0.048 14.730 0.000
## w3_MJmtv_ntrlm 0.901 0.056 16.013 0.000
## AVNR3 =~
## w3_MJmtv_cnfrm 0.847 0.100 8.446 0.000
## w3_MJmotv_cpng 0.620 0.041 15.142 0.000
## w3_MJmtv_xprmn 0.670 0.043 15.725 0.000
## w3_MJmotv_brdm 0.705 0.045 15.684 0.000
## w3_MJmotv_lchl 0.417 0.035 12.030 0.000
## APEN3 =~
## w3_MJmtv_njymn 0.917 0.051 17.852 0.000
## w3_MJmtv_clbrt 0.835 0.055 15.268 0.000
## w3_MJmtv_ltrdp 0.852 0.051 16.680 0.000
## w3_MJmtv_rltvl 0.864 0.061 14.173 0.000
## w3_MJmtv_vlblt 0.801 0.052 15.325 0.000
## w3_MJmtv_cnfrm -0.586 0.098 -5.971 0.000
## HEMD4 =~
## w4_MJmtv_sclnx 0.902 0.053 16.885 0.000
## w4_MJmotiv_slp 0.794 0.060 13.293 0.000
## w4_MJmotive_pn 0.846 0.052 16.234 0.000
## w4_MJmotive_ns 0.750 0.051 14.739 0.000
## w4_MJmtv_ttntn 0.789 0.050 15.808 0.000
## w4_MJmtv_sbstt 0.683 0.044 15.412 0.000
## w4_MJmtv_ntrlm 0.903 0.058 15.585 0.000
## AVNR4 =~
## w4_MJmtv_cnfrm 1.346 0.190 7.101 0.000
## w4_MJmotv_cpng 0.625 0.043 14.582 0.000
## w4_MJmtv_xprmn 0.678 0.043 15.897 0.000
## w4_MJmotv_brdm 0.726 0.046 15.686 0.000
## w4_MJmotv_lchl 0.457 0.038 12.018 0.000
## APEN4 =~
## w4_MJmtv_njymn 0.776 0.051 15.154 0.000
## w4_MJmtv_clbrt 0.789 0.052 15.307 0.000
## w4_MJmtv_ltrdp 0.861 0.051 16.767 0.000
## w4_MJmtv_rltvl 0.828 0.058 14.344 0.000
## w4_MJmtv_vlblt 0.738 0.050 14.721 0.000
## w4_MJmtv_cnfrm -0.980 0.187 -5.255 0.000
## HEMD5 =~
## w5_MJmtv_sclnx 0.878 0.058 15.034 0.000
## w5_MJmotiv_slp 0.821 0.063 13.084 0.000
## w5_MJmotive_pn 0.990 0.057 17.368 0.000
## w5_MJmotive_ns 0.875 0.055 15.784 0.000
## w5_MJmtv_ttntn 0.962 0.057 16.946 0.000
## w5_MJmtv_sbstt 0.665 0.054 12.361 0.000
## w5_MJmtv_ntrlm 0.986 0.064 15.503 0.000
## AVNR5 =~
## w5_MJmtv_cnfrm 1.410 0.249 5.662 0.000
## w5_MJmotv_cpng 0.661 0.052 12.636 0.000
## w5_MJmtv_xprmn 0.736 0.051 14.308 0.000
## w5_MJmotv_brdm 0.728 0.053 13.797 0.000
## w5_MJmotv_lchl 0.482 0.043 11.090 0.000
## APEN5 =~
## w5_MJmtv_njymn 0.872 0.056 15.642 0.000
## w5_MJmtv_clbrt 0.913 0.056 16.193 0.000
## w5_MJmtv_ltrdp 1.020 0.058 17.598 0.000
## w5_MJmtv_rltvl 0.837 0.061 13.803 0.000
## w5_MJmtv_vlblt 0.732 0.055 13.421 0.000
## w5_MJmtv_cnfrm -1.058 0.249 -4.255 0.000
## HEMD6 =~
## w6_MJmtv_sclnx 0.983 0.060 16.353 0.000
## w6_MJmotiv_slp 0.835 0.064 12.976 0.000
## w6_MJmotive_pn 1.014 0.063 16.217 0.000
## w6_MJmotive_ns 0.909 0.055 16.470 0.000
## w6_MJmtv_ttntn 0.924 0.056 16.393 0.000
## w6_MJmtv_sbstt 0.832 0.057 14.602 0.000
## w6_MJmtv_ntrlm 1.022 0.063 16.263 0.000
## AVNR6 =~
## w6_MJmtv_cnfrm 1.903 0.374 5.092 0.000
## w6_MJmotv_cpng 0.720 0.055 13.096 0.000
## w6_MJmtv_xprmn 0.789 0.053 14.756 0.000
## w6_MJmotv_brdm 0.845 0.057 14.899 0.000
## w6_MJmotv_lchl 0.546 0.044 12.310 0.000
## APEN6 =~
## w6_MJmtv_njymn 0.825 0.059 14.061 0.000
## w6_MJmtv_clbrt 0.794 0.061 13.120 0.000
## w6_MJmtv_ltrdp 0.976 0.062 15.818 0.000
## w6_MJmtv_rltvl 0.915 0.067 13.717 0.000
## w6_MJmtv_vlblt 0.793 0.056 14.037 0.000
## w6_MJmtv_cnfrm -1.466 0.374 -3.922 0.000
##
## Covariances:
## Estimate Std.Err z-value P(>|z|)
## .w1_MJmotive_socialanxiety ~~
## .W2_MJmtv_sclnx 0.174 0.041 4.268 0.000
## .w3_MJmtv_sclnx 0.161 0.041 3.927 0.000
## .w4_MJmtv_sclnx 0.093 0.037 2.525 0.012
## .w5_MJmtv_sclnx 0.119 0.040 2.933 0.003
## .w6_MJmtv_sclnx 0.159 0.043 3.680 0.000
## .W2_MJmotive_socialanxiety ~~
## .w3_MJmtv_sclnx 0.234 0.041 5.671 0.000
## .w4_MJmtv_sclnx 0.153 0.037 4.097 0.000
## .w5_MJmtv_sclnx 0.098 0.040 2.468 0.014
## .w6_MJmtv_sclnx 0.171 0.043 4.018 0.000
## .w3_MJmotive_socialanxiety ~~
## .w4_MJmtv_sclnx 0.170 0.038 4.455 0.000
## .w5_MJmtv_sclnx 0.200 0.043 4.661 0.000
## .w6_MJmtv_sclnx 0.132 0.044 3.024 0.002
## .w4_MJmotive_socialanxiety ~~
## .w5_MJmtv_sclnx 0.096 0.036 2.643 0.008
## .w6_MJmtv_sclnx 0.191 0.040 4.820 0.000
## .w5_MJmotive_socialanxiety ~~
## .w6_MJmtv_sclnx 0.171 0.040 4.234 0.000
## .w1_MJmotive_sleep ~~
## .W2_MJmotiv_slp 0.380 0.059 6.468 0.000
## .w3_MJmotiv_slp 0.401 0.059 6.770 0.000
## .w4_MJmotiv_slp 0.244 0.055 4.413 0.000
## .w5_MJmotiv_slp 0.244 0.057 4.310 0.000
## .w6_MJmotiv_slp 0.269 0.062 4.373 0.000
## .W2_MJmotive_sleep ~~
## .w3_MJmotiv_slp 0.399 0.060 6.593 0.000
## .w4_MJmotiv_slp 0.305 0.056 5.461 0.000
## .w5_MJmotiv_slp 0.330 0.060 5.527 0.000
## .w6_MJmotiv_slp 0.309 0.064 4.840 0.000
## .w3_MJmotive_sleep ~~
## .w4_MJmotiv_slp 0.294 0.057 5.137 0.000
## .w5_MJmotiv_slp 0.274 0.059 4.640 0.000
## .w6_MJmotiv_slp 0.290 0.065 4.426 0.000
## .w4_MJmotive_sleep ~~
## .w5_MJmotiv_slp 0.321 0.055 5.809 0.000
## .w6_MJmotiv_slp 0.300 0.061 4.901 0.000
## .w5_MJmotive_sleep ~~
## .w6_MJmotiv_slp 0.378 0.062 6.075 0.000
## .w1_MJmotive_pain ~~
## .W2_MJmotive_pn 0.188 0.045 4.157 0.000
## .w3_MJmotive_pn 0.254 0.048 5.312 0.000
## .w4_MJmotive_pn 0.190 0.043 4.374 0.000
## .w5_MJmotive_pn 0.134 0.043 3.155 0.002
## .w6_MJmotive_pn 0.134 0.048 2.796 0.005
## .W2_MJmotive_pain ~~
## .w3_MJmotive_pn 0.356 0.050 7.184 0.000
## .w4_MJmotive_pn 0.221 0.043 5.189 0.000
## .w5_MJmotive_pn 0.244 0.042 5.804 0.000
## .w6_MJmotive_pn 0.151 0.046 3.296 0.001
## .w3_MJmotive_pain ~~
## .w4_MJmotive_pn 0.358 0.048 7.416 0.000
## .w5_MJmotive_pn 0.308 0.046 6.647 0.000
## .w6_MJmotive_pn 0.212 0.048 4.411 0.000
## .w4_MJmotive_pain ~~
## .w5_MJmotive_pn 0.290 0.042 6.947 0.000
## .w6_MJmotive_pn 0.181 0.041 4.434 0.000
## .w5_MJmotive_pain ~~
## .w6_MJmotive_pn 0.185 0.042 4.369 0.000
## .w1_MJmotive_nausea ~~
## .W2_MJmotive_ns 0.311 0.045 6.978 0.000
## .w3_MJmotive_ns 0.243 0.045 5.359 0.000
## .w4_MJmotive_ns 0.203 0.043 4.725 0.000
## .w5_MJmotive_ns 0.134 0.040 3.358 0.001
## .w6_MJmotive_ns 0.152 0.045 3.365 0.001
## .W2_MJmotive_nausea ~~
## .w3_MJmotive_ns 0.300 0.042 7.185 0.000
## .w4_MJmotive_ns 0.174 0.038 4.545 0.000
## .w5_MJmotive_ns 0.180 0.036 4.955 0.000
## .w6_MJmotive_ns 0.185 0.038 4.892 0.000
## .w3_MJmotive_nausea ~~
## .w4_MJmotive_ns 0.308 0.042 7.307 0.000
## .w5_MJmotive_ns 0.211 0.038 5.478 0.000
## .w6_MJmotive_ns 0.241 0.040 6.067 0.000
## .w4_MJmotive_nausea ~~
## .w5_MJmotive_ns 0.183 0.038 4.833 0.000
## .w6_MJmotive_ns 0.234 0.040 5.824 0.000
## .w5_MJmotive_nausea ~~
## .w6_MJmotive_ns 0.175 0.037 4.699 0.000
## .w1_MJmotive_attention ~~
## .W2_MJmtv_ttntn 0.277 0.043 6.428 0.000
## .w3_MJmtv_ttntn 0.315 0.044 7.194 0.000
## .w4_MJmtv_ttntn 0.189 0.039 4.835 0.000
## .w5_MJmtv_ttntn 0.163 0.040 4.103 0.000
## .w6_MJmtv_ttntn 0.095 0.043 2.239 0.025
## .W2_MJmotive_attention ~~
## .w3_MJmtv_ttntn 0.268 0.038 7.062 0.000
## .w4_MJmtv_ttntn 0.185 0.035 5.355 0.000
## .w5_MJmtv_ttntn 0.132 0.036 3.679 0.000
## .w6_MJmtv_ttntn 0.100 0.040 2.521 0.012
## .w3_MJmotive_attention ~~
## .w4_MJmtv_ttntn 0.199 0.035 5.629 0.000
## .w5_MJmtv_ttntn 0.214 0.036 5.934 0.000
## .w6_MJmtv_ttntn 0.080 0.039 2.059 0.039
## .w4_MJmotive_attention ~~
## .w5_MJmtv_ttntn 0.113 0.033 3.452 0.001
## .w6_MJmtv_ttntn 0.078 0.036 2.182 0.029
## .w5_MJmotive_attention ~~
## .w6_MJmtv_ttntn 0.150 0.036 4.141 0.000
## .w1_MJmotive_substitution ~~
## .W2_MJmtv_sbstt 0.162 0.036 4.518 0.000
## .w3_MJmtv_sbstt 0.200 0.039 5.192 0.000
## .w4_MJmtv_sbstt 0.173 0.035 4.929 0.000
## .w5_MJmtv_sbstt 0.145 0.040 3.631 0.000
## .w6_MJmtv_sbstt 0.139 0.042 3.315 0.001
## .W2_MJmotive_substitution ~~
## .w3_MJmtv_sbstt 0.184 0.036 5.060 0.000
## .w4_MJmtv_sbstt 0.211 0.034 6.146 0.000
## .w5_MJmtv_sbstt 0.104 0.038 2.714 0.007
## .w6_MJmtv_sbstt 0.116 0.042 2.752 0.006
## .w3_MJmotive_substitution ~~
## .w4_MJmtv_sbstt 0.306 0.038 7.991 0.000
## .w5_MJmtv_sbstt 0.146 0.040 3.664 0.000
## .w6_MJmtv_sbstt 0.243 0.043 5.661 0.000
## .w4_MJmotive_substitution ~~
## .w5_MJmtv_sbstt 0.216 0.037 5.859 0.000
## .w6_MJmtv_sbstt 0.196 0.039 5.054 0.000
## .w5_MJmotive_substitution ~~
## .w6_MJmtv_sbstt 0.229 0.043 5.373 0.000
## .w1_MJmotive_naturalmeds ~~
## .W2_MJmtv_ntrlm 0.387 0.058 6.654 0.000
## .w3_MJmtv_ntrlm 0.323 0.057 5.711 0.000
## .w4_MJmtv_ntrlm 0.206 0.054 3.800 0.000
## .w5_MJmtv_ntrlm 0.136 0.055 2.466 0.014
## .w6_MJmtv_ntrlm 0.112 0.059 1.917 0.055
## .W2_MJmotive_naturalmeds ~~
## .w3_MJmtv_ntrlm 0.436 0.059 7.386 0.000
## .w4_MJmtv_ntrlm 0.321 0.055 5.792 0.000
## .w5_MJmtv_ntrlm 0.338 0.057 5.952 0.000
## .w6_MJmtv_ntrlm 0.229 0.054 4.255 0.000
## .w3_MJmotive_naturalmeds ~~
## .w4_MJmtv_ntrlm 0.415 0.057 7.348 0.000
## .w5_MJmtv_ntrlm 0.393 0.058 6.770 0.000
## .w6_MJmtv_ntrlm 0.247 0.054 4.574 0.000
## .w4_MJmotive_naturalmeds ~~
## .w5_MJmtv_ntrlm 0.331 0.054 6.095 0.000
## .w6_MJmtv_ntrlm 0.246 0.052 4.727 0.000
## .w5_MJmotive_naturalmeds ~~
## .w6_MJmtv_ntrlm 0.312 0.053 5.932 0.000
## .w1_MJmotive_conformity ~~
## .W2_MJmtv_cnfrm -0.009 0.025 -0.346 0.729
## .w3_MJmtv_cnfrm 0.002 0.018 0.128 0.898
## .w4_MJmtv_cnfrm -0.031 0.025 -1.206 0.228
## .w5_MJmtv_cnfrm 0.003 0.032 0.102 0.918
## .w6_MJmtv_cnfrm -0.030 0.035 -0.840 0.401
## .W2_MJmotive_conformity ~~
## .w3_MJmtv_cnfrm -0.005 0.016 -0.315 0.753
## .w4_MJmtv_cnfrm -0.034 0.021 -1.632 0.103
## .w5_MJmtv_cnfrm -0.017 0.024 -0.720 0.472
## .w6_MJmtv_cnfrm -0.037 0.031 -1.192 0.233
## .w3_MJmotive_conformity ~~
## .w4_MJmtv_cnfrm 0.011 0.019 0.583 0.560
## .w5_MJmtv_cnfrm -0.026 0.019 -1.372 0.170
## .w6_MJmtv_cnfrm -0.019 0.024 -0.779 0.436
## .w4_MJmotive_conformity ~~
## .w5_MJmtv_cnfrm -0.047 0.030 -1.596 0.110
## .w6_MJmtv_cnfrm -0.064 0.036 -1.784 0.074
## .w5_MJmotive_conformity ~~
## .w6_MJmtv_cnfrm -0.005 0.044 -0.119 0.905
## .w1_MJmotive_coping ~~
## .W2_MJmotv_cpng 0.443 0.050 8.887 0.000
## .w3_MJmotv_cpng 0.371 0.045 8.230 0.000
## .w4_MJmotv_cpng 0.356 0.045 7.917 0.000
## .w5_MJmotv_cpng 0.312 0.051 6.105 0.000
## .w6_MJmotv_cpng 0.225 0.054 4.134 0.000
## .W2_MJmotive_coping ~~
## .w3_MJmotv_cpng 0.344 0.040 8.693 0.000
## .w4_MJmotv_cpng 0.313 0.039 7.942 0.000
## .w5_MJmotv_cpng 0.272 0.043 6.276 0.000
## .w6_MJmotv_cpng 0.239 0.047 5.050 0.000
## .w3_MJmotive_coping ~~
## .w4_MJmotv_cpng 0.296 0.036 8.186 0.000
## .w5_MJmotv_cpng 0.266 0.040 6.597 0.000
## .w6_MJmotv_cpng 0.264 0.045 5.864 0.000
## .w4_MJmotive_coping ~~
## .w5_MJmotv_cpng 0.310 0.042 7.448 0.000
## .w6_MJmotv_cpng 0.263 0.042 6.226 0.000
## .w5_MJmotive_coping ~~
## .w6_MJmotv_cpng 0.329 0.050 6.646 0.000
## .w1_MJmotive_experiment ~~
## .W2_MJmtv_xprmn 0.160 0.033 4.850 0.000
## .w3_MJmtv_xprmn 0.180 0.035 5.098 0.000
## .w4_MJmtv_xprmn 0.145 0.033 4.331 0.000
## .w5_MJmtv_xprmn 0.191 0.042 4.515 0.000
## .w6_MJmtv_xprmn 0.084 0.047 1.781 0.075
## .W2_MJmotive_experiment ~~
## .w3_MJmtv_xprmn 0.142 0.026 5.484 0.000
## .w4_MJmtv_xprmn 0.095 0.024 4.034 0.000
## .w5_MJmtv_xprmn 0.130 0.030 4.280 0.000
## .w6_MJmtv_xprmn 0.063 0.035 1.817 0.069
## .w3_MJmotive_experiment ~~
## .w4_MJmtv_xprmn 0.155 0.026 5.941 0.000
## .w5_MJmtv_xprmn 0.163 0.032 5.048 0.000
## .w6_MJmtv_xprmn 0.047 0.036 1.292 0.196
## .w4_MJmotive_experiment ~~
## .w5_MJmtv_xprmn 0.186 0.030 6.156 0.000
## .w6_MJmtv_xprmn 0.122 0.033 3.751 0.000
## .w5_MJmotive_experiment ~~
## .w6_MJmtv_xprmn 0.215 0.041 5.210 0.000
## .w1_MJmotive_boredom ~~
## .W2_MJmotv_brdm 0.355 0.045 7.867 0.000
## .w3_MJmotv_brdm 0.328 0.042 7.773 0.000
## .w4_MJmotv_brdm 0.272 0.040 6.871 0.000
## .w5_MJmotv_brdm 0.215 0.043 4.949 0.000
## .w6_MJmotv_brdm 0.262 0.048 5.446 0.000
## .W2_MJmotive_boredom ~~
## .w3_MJmotv_brdm 0.354 0.042 8.345 0.000
## .w4_MJmotv_brdm 0.293 0.039 7.432 0.000
## .w5_MJmotv_brdm 0.285 0.044 6.484 0.000
## .w6_MJmotv_brdm 0.268 0.046 5.802 0.000
## .w3_MJmotive_boredom ~~
## .w4_MJmotv_brdm 0.262 0.037 6.992 0.000
## .w5_MJmotv_brdm 0.255 0.041 6.210 0.000
## .w6_MJmotv_brdm 0.256 0.045 5.729 0.000
## .w4_MJmotive_boredom ~~
## .w5_MJmotv_brdm 0.300 0.040 7.438 0.000
## .w6_MJmotv_brdm 0.225 0.041 5.477 0.000
## .w5_MJmotive_boredom ~~
## .w6_MJmotv_brdm 0.289 0.048 6.055 0.000
## .w1_MJmotive_alcohol ~~
## .W2_MJmotv_lchl 0.212 0.030 7.049 0.000
## .w3_MJmotv_lchl 0.156 0.027 5.746 0.000
## .w4_MJmotv_lchl 0.175 0.030 5.821 0.000
## .w5_MJmotv_lchl 0.146 0.033 4.372 0.000
## .w6_MJmotv_lchl 0.094 0.035 2.707 0.007
## .W2_MJmotive_alcohol ~~
## .w3_MJmotv_lchl 0.172 0.024 7.173 0.000
## .w4_MJmotv_lchl 0.146 0.025 5.848 0.000
## .w5_MJmotv_lchl 0.186 0.029 6.505 0.000
## .w6_MJmotv_lchl 0.153 0.029 5.343 0.000
## .w3_MJmotive_alcohol ~~
## .w4_MJmotv_lchl 0.111 0.023 4.925 0.000
## .w5_MJmotv_lchl 0.140 0.027 5.173 0.000
## .w6_MJmotv_lchl 0.137 0.027 5.042 0.000
## .w4_MJmotive_alcohol ~~
## .w5_MJmotv_lchl 0.189 0.029 6.602 0.000
## .w6_MJmotv_lchl 0.149 0.029 5.142 0.000
## .w5_MJmotive_alcohol ~~
## .w6_MJmotv_lchl 0.201 0.034 5.938 0.000
## .w1_MJmotive_enjoyment ~~
## .W2_MJmtv_njymn 0.294 0.043 6.910 0.000
## .w3_MJmtv_njymn 0.247 0.040 6.144 0.000
## .w4_MJmtv_njymn 0.231 0.039 5.897 0.000
## .w5_MJmtv_njymn 0.197 0.040 4.912 0.000
## .w6_MJmtv_njymn 0.208 0.046 4.569 0.000
## .W2_MJmotive_enjoyment ~~
## .w3_MJmtv_njymn 0.378 0.048 7.927 0.000
## .w4_MJmtv_njymn 0.307 0.045 6.851 0.000
## .w5_MJmtv_njymn 0.310 0.046 6.665 0.000
## .w6_MJmtv_njymn 0.399 0.054 7.328 0.000
## .w3_MJmotive_enjoyment ~~
## .w4_MJmtv_njymn 0.306 0.043 7.056 0.000
## .w5_MJmtv_njymn 0.304 0.045 6.764 0.000
## .w6_MJmtv_njymn 0.398 0.053 7.493 0.000
## .w4_MJmotive_enjoyment ~~
## .w5_MJmtv_njymn 0.308 0.044 6.936 0.000
## .w6_MJmtv_njymn 0.307 0.050 6.119 0.000
## .w5_MJmotive_enjoyment ~~
## .w6_MJmtv_njymn 0.293 0.051 5.755 0.000
## .w1_MJmotive_celebration ~~
## .W2_MJmtv_clbrt 0.283 0.049 5.748 0.000
## .w3_MJmtv_clbrt 0.149 0.044 3.356 0.001
## .w4_MJmtv_clbrt 0.254 0.045 5.613 0.000
## .w5_MJmtv_clbrt 0.156 0.044 3.587 0.000
## .w6_MJmtv_clbrt 0.188 0.053 3.549 0.000
## .W2_MJmotive_celebration ~~
## .w3_MJmtv_clbrt 0.274 0.048 5.702 0.000
## .w4_MJmtv_clbrt 0.304 0.048 6.380 0.000
## .w5_MJmtv_clbrt 0.199 0.045 4.378 0.000
## .w6_MJmtv_clbrt 0.229 0.059 3.912 0.000
## .w3_MJmotive_celebration ~~
## .w4_MJmtv_clbrt 0.213 0.042 5.064 0.000
## .w5_MJmtv_clbrt 0.217 0.043 5.087 0.000
## .w6_MJmtv_clbrt 0.171 0.055 3.077 0.002
## .w4_MJmotive_celebration ~~
## .w5_MJmtv_clbrt 0.262 0.042 6.231 0.000
## .w6_MJmtv_clbrt 0.329 0.051 6.501 0.000
## .w5_MJmotive_celebration ~~
## .w6_MJmtv_clbrt 0.251 0.048 5.289 0.000
## .w1_MJmotive_alteredpercept ~~
## .W2_MJmtv_ltrdp 0.434 0.057 7.566 0.000
## .w3_MJmtv_ltrdp 0.362 0.050 7.319 0.000
## .w4_MJmtv_ltrdp 0.278 0.045 6.122 0.000
## .w5_MJmtv_ltrdp 0.213 0.046 4.573 0.000
## .w6_MJmtv_ltrdp 0.190 0.058 3.294 0.001
## .W2_MJmotive_alteredpercept ~~
## .w3_MJmtv_ltrdp 0.363 0.051 7.138 0.000
## .w4_MJmtv_ltrdp 0.337 0.048 7.055 0.000
## .w5_MJmtv_ltrdp 0.321 0.049 6.516 0.000
## .w6_MJmtv_ltrdp 0.284 0.059 4.835 0.000
## .w3_MJmotive_alteredpercept ~~
## .w4_MJmtv_ltrdp 0.270 0.041 6.580 0.000
## .w5_MJmtv_ltrdp 0.300 0.044 6.813 0.000
## .w6_MJmtv_ltrdp 0.193 0.053 3.674 0.000
## .w4_MJmotive_alteredpercept ~~
## .w5_MJmtv_ltrdp 0.238 0.041 5.811 0.000
## .w6_MJmtv_ltrdp 0.198 0.048 4.095 0.000
## .w5_MJmotive_alteredpercept ~~
## .w6_MJmtv_ltrdp 0.260 0.047 5.490 0.000
## .w1_MJmotive_relativelowrisk ~~
## .W2_MJmtv_rltvl 0.408 0.066 6.141 0.000
## .w3_MJmtv_rltvl 0.446 0.067 6.648 0.000
## .w4_MJmtv_rltvl 0.241 0.060 3.991 0.000
## .w5_MJmtv_rltvl 0.235 0.059 3.982 0.000
## .w6_MJmtv_rltvl 0.223 0.072 3.094 0.002
## .W2_MJmotive_relativelowrisk ~~
## .w3_MJmtv_rltvl 0.561 0.072 7.750 0.000
## .w4_MJmtv_rltvl 0.418 0.064 6.507 0.000
## .w5_MJmtv_rltvl 0.374 0.063 5.950 0.000
## .w6_MJmtv_rltvl 0.361 0.077 4.715 0.000
## .w3_MJmotive_relativelowrisk ~~
## .w4_MJmtv_rltvl 0.426 0.064 6.696 0.000
## .w5_MJmtv_rltvl 0.366 0.063 5.775 0.000
## .w6_MJmtv_rltvl 0.387 0.075 5.151 0.000
## .w4_MJmotive_relativelowrisk ~~
## .w5_MJmtv_rltvl 0.406 0.058 6.960 0.000
## .w6_MJmtv_rltvl 0.447 0.067 6.697 0.000
## .w5_MJmotive_relativelowrisk ~~
## .w6_MJmtv_rltvl 0.415 0.064 6.486 0.000
## .w1_MJmotive_availability ~~
## .W2_MJmtv_vlblt 0.322 0.047 6.800 0.000
## .w3_MJmtv_vlblt 0.209 0.045 4.683 0.000
## .w4_MJmtv_vlblt 0.198 0.043 4.657 0.000
## .w5_MJmtv_vlblt 0.217 0.045 4.784 0.000
## .w6_MJmtv_vlblt 0.203 0.052 3.882 0.000
## .W2_MJmotive_availability ~~
## .w3_MJmtv_vlblt 0.343 0.047 7.283 0.000
## .w4_MJmtv_vlblt 0.292 0.044 6.699 0.000
## .w5_MJmtv_vlblt 0.268 0.045 5.906 0.000
## .w6_MJmtv_vlblt 0.280 0.050 5.600 0.000
## .w3_MJmotive_availability ~~
## .w4_MJmtv_vlblt 0.267 0.043 6.248 0.000
## .w5_MJmtv_vlblt 0.218 0.044 4.916 0.000
## .w6_MJmtv_vlblt 0.260 0.049 5.256 0.000
## .w4_MJmotive_availability ~~
## .w5_MJmtv_vlblt 0.295 0.043 6.781 0.000
## .w6_MJmtv_vlblt 0.229 0.045 5.089 0.000
## .w5_MJmotive_availability ~~
## .w6_MJmtv_vlblt 0.266 0.048 5.495 0.000
## HEMD1 ~~
## AVNR1 0.577 0.044 12.988 0.000
## APEN1 0.652 0.039 16.499 0.000
## HEMD2 0.597 0.041 14.637 0.000
## AVNR2 0.241 0.059 4.053 0.000
## APEN2 0.303 0.059 5.133 0.000
## HEMD3 0.571 0.043 13.213 0.000
## AVNR3 0.217 0.060 3.609 0.000
## APEN3 0.278 0.059 4.716 0.000
## HEMD4 0.477 0.051 9.427 0.000
## AVNR4 0.145 0.063 2.321 0.020
## APEN4 0.205 0.063 3.260 0.001
## HEMD5 0.452 0.056 8.142 0.000
## AVNR5 0.199 0.065 3.055 0.002
## APEN5 0.199 0.066 3.021 0.003
## HEMD6 0.354 0.065 5.479 0.000
## AVNR6 0.127 0.074 1.722 0.085
## APEN6 0.144 0.075 1.923 0.054
## AVNR1 ~~
## APEN1 0.933 0.020 45.901 0.000
## HEMD2 0.224 0.061 3.662 0.000
## AVNR2 0.525 0.045 11.633 0.000
## APEN2 0.500 0.049 10.204 0.000
## HEMD3 0.237 0.060 3.929 0.000
## AVNR3 0.398 0.052 7.590 0.000
## APEN3 0.384 0.054 7.081 0.000
## HEMD4 0.211 0.062 3.426 0.001
## AVNR4 0.257 0.060 4.322 0.000
## APEN4 0.255 0.061 4.203 0.000
## HEMD5 0.142 0.068 2.096 0.036
## AVNR5 0.313 0.062 5.030 0.000
## APEN5 0.267 0.065 4.105 0.000
## HEMD6 0.051 0.073 0.699 0.485
## AVNR6 0.149 0.073 2.033 0.042
## APEN6 0.126 0.075 1.674 0.094
## APEN1 ~~
## HEMD2 0.327 0.058 5.664 0.000
## AVNR2 0.490 0.049 9.995 0.000
## APEN2 0.543 0.046 11.741 0.000
## HEMD3 0.303 0.059 5.143 0.000
## AVNR3 0.353 0.056 6.288 0.000
## APEN3 0.423 0.053 7.961 0.000
## HEMD4 0.253 0.062 4.111 0.000
## AVNR4 0.204 0.063 3.252 0.001
## APEN4 0.289 0.061 4.758 0.000
## HEMD5 0.192 0.068 2.833 0.005
## AVNR5 0.297 0.065 4.600 0.000
## APEN5 0.320 0.064 4.985 0.000
## HEMD6 0.134 0.074 1.812 0.070
## AVNR6 0.169 0.076 2.232 0.026
## APEN6 0.204 0.076 2.683 0.007
## HEMD2 ~~
## AVNR2 0.531 0.050 10.602 0.000
## APEN2 0.627 0.044 14.120 0.000
## HEMD3 0.690 0.035 19.919 0.000
## AVNR3 0.300 0.060 4.974 0.000
## APEN3 0.478 0.052 9.145 0.000
## HEMD4 0.478 0.051 9.464 0.000
## AVNR4 0.188 0.064 2.941 0.003
## APEN4 0.316 0.061 5.171 0.000
## HEMD5 0.477 0.053 9.094 0.000
## AVNR5 0.196 0.066 2.980 0.003
## APEN5 0.251 0.064 3.904 0.000
## HEMD6 0.416 0.062 6.702 0.000
## AVNR6 0.157 0.075 2.098 0.036
## APEN6 0.219 0.074 2.951 0.003
## AVNR2 ~~
## APEN2 0.917 0.024 37.924 0.000
## HEMD3 0.343 0.058 5.933 0.000
## AVNR3 0.566 0.044 12.867 0.000
## APEN3 0.619 0.042 14.904 0.000
## HEMD4 0.183 0.062 2.933 0.003
## AVNR4 0.400 0.054 7.435 0.000
## APEN4 0.426 0.054 7.944 0.000
## HEMD5 0.185 0.065 2.855 0.004
## AVNR5 0.394 0.056 7.024 0.000
## APEN5 0.391 0.057 6.859 0.000
## HEMD6 0.052 0.075 0.700 0.484
## AVNR6 0.216 0.073 2.957 0.003
## APEN6 0.207 0.075 2.751 0.006
## APEN2 ~~
## HEMD3 0.405 0.057 7.161 0.000
## AVNR3 0.531 0.049 10.735 0.000
## APEN3 0.686 0.036 19.074 0.000
## HEMD4 0.237 0.063 3.785 0.000
## AVNR4 0.368 0.057 6.449 0.000
## APEN4 0.474 0.052 9.131 0.000
## HEMD5 0.283 0.063 4.462 0.000
## AVNR5 0.412 0.057 7.167 0.000
## APEN5 0.466 0.054 8.573 0.000
## HEMD6 0.188 0.070 2.683 0.007
## AVNR6 0.277 0.069 4.031 0.000
## APEN6 0.326 0.068 4.791 0.000
## HEMD3 ~~
## AVNR3 0.568 0.047 12.018 0.000
## APEN3 0.680 0.040 17.070 0.000
## HEMD4 0.628 0.040 15.647 0.000
## AVNR4 0.280 0.061 4.611 0.000
## APEN4 0.376 0.058 6.443 0.000
## HEMD5 0.548 0.049 11.111 0.000
## AVNR5 0.266 0.066 4.059 0.000
## APEN5 0.317 0.064 4.993 0.000
## HEMD6 0.558 0.054 10.303 0.000
## AVNR6 0.269 0.072 3.718 0.000
## APEN6 0.320 0.072 4.471 0.000
## AVNR3 ~~
## APEN3 0.868 0.025 34.500 0.000
## HEMD4 0.348 0.060 5.767 0.000
## AVNR4 0.534 0.048 11.034 0.000
## APEN4 0.476 0.055 8.683 0.000
## HEMD5 0.211 0.071 2.982 0.003
## AVNR5 0.414 0.063 6.609 0.000
## APEN5 0.389 0.065 5.987 0.000
## HEMD6 0.119 0.077 1.550 0.121
## AVNR6 0.323 0.075 4.285 0.000
## APEN6 0.284 0.079 3.573 0.000
## APEN3 ~~
## HEMD4 0.377 0.058 6.534 0.000
## AVNR4 0.458 0.052 8.796 0.000
## APEN4 0.539 0.048 11.332 0.000
## HEMD5 0.313 0.064 4.869 0.000
## AVNR5 0.412 0.059 6.927 0.000
## APEN5 0.474 0.056 8.441 0.000
## HEMD6 0.264 0.069 3.810 0.000
## AVNR6 0.385 0.067 5.745 0.000
## APEN6 0.431 0.066 6.514 0.000
## HEMD4 ~~
## AVNR4 0.615 0.044 13.858 0.000
## APEN4 0.704 0.038 18.336 0.000
## HEMD5 0.539 0.050 10.871 0.000
## AVNR5 0.326 0.062 5.289 0.000
## APEN5 0.363 0.061 5.987 0.000
## HEMD6 0.480 0.058 8.230 0.000
## AVNR6 0.291 0.070 4.180 0.000
## APEN6 0.305 0.071 4.329 0.000
## AVNR4 ~~
## APEN4 0.897 0.023 39.125 0.000
## HEMD5 0.255 0.064 3.967 0.000
## AVNR5 0.510 0.051 10.067 0.000
## APEN5 0.462 0.055 8.349 0.000
## HEMD6 0.170 0.070 2.444 0.015
## AVNR6 0.454 0.061 7.463 0.000
## APEN6 0.397 0.065 6.057 0.000
## APEN4 ~~
## HEMD5 0.361 0.061 5.926 0.000
## AVNR5 0.506 0.052 9.716 0.000
## APEN5 0.568 0.048 11.859 0.000
## HEMD6 0.248 0.070 3.572 0.000
## AVNR6 0.439 0.063 6.927 0.000
## APEN6 0.484 0.062 7.820 0.000
## HEMD5 ~~
## AVNR5 0.651 0.043 15.129 0.000
## APEN5 0.706 0.038 18.632 0.000
## HEMD6 0.682 0.041 16.726 0.000
## AVNR6 0.447 0.061 7.282 0.000
## APEN6 0.527 0.057 9.176 0.000
## AVNR5 ~~
## APEN5 0.904 0.024 38.343 0.000
## HEMD6 0.386 0.062 6.231 0.000
## AVNR6 0.595 0.049 12.222 0.000
## APEN6 0.600 0.050 11.901 0.000
## APEN5 ~~
## HEMD6 0.430 0.061 7.083 0.000
## AVNR6 0.544 0.055 9.837 0.000
## APEN6 0.636 0.048 13.381 0.000
## HEMD6 ~~
## AVNR6 0.693 0.038 18.193 0.000
## APEN6 0.703 0.039 18.097 0.000
## AVNR6 ~~
## APEN6 0.927 0.022 42.732 0.000
##
## Intercepts:
## Estimate Std.Err z-value P(>|z|)
## HEMD1 0.000
## AVNR1 0.000
## APEN1 0.000
## HEMD2 0.000
## AVNR2 0.000
## APEN2 0.000
## HEMD3 0.000
## AVNR3 0.000
## APEN3 0.000
## HEMD4 0.000
## AVNR4 0.000
## APEN4 0.000
## HEMD5 0.000
## AVNR5 0.000
## APEN5 0.000
## HEMD6 0.000
## AVNR6 0.000
## APEN6 0.000
## .w1_MJmtv_sclnx 2.737 0.067 40.714 0.000
## .w1_MJmotiv_slp 3.372 0.066 51.182 0.000
## .w1_MJmotive_pn 3.029 0.069 44.187 0.000
## .w1_MJmotive_ns 2.183 0.066 33.167 0.000
## .w1_MJmtv_ttntn 2.509 0.068 36.761 0.000
## .w1_MJmtv_sbstt 2.248 0.060 37.688 0.000
## .w1_MJmtv_ntrlm 2.735 0.071 38.397 0.000
## .w1_MJmtv_cnfrm 1.327 0.033 39.702 0.000
## .w1_MJmotv_cpng 2.260 0.060 37.753 0.000
## .w1_MJmtv_xprmn 2.069 0.058 35.682 0.000
## .w1_MJmotv_brdm 2.424 0.060 40.068 0.000
## .w1_MJmotv_lchl 1.718 0.046 37.530 0.000
## .w1_MJmtv_njymn 3.717 0.056 66.360 0.000
## .w1_MJmtv_clbrt 3.062 0.060 51.100 0.000
## .w1_MJmtv_ltrdp 3.058 0.065 46.737 0.000
## .w1_MJmtv_rltvl 3.143 0.067 47.014 0.000
## .w1_MJmtv_vlblt 2.792 0.059 47.470 0.000
## .W2_MJmtv_sclnx 2.293 0.059 38.891 0.000
## .W2_MJmotiv_slp 3.238 0.065 49.813 0.000
## .W2_MJmotive_pn 2.755 0.066 41.673 0.000
## .W2_MJmotive_ns 1.977 0.060 33.200 0.000
## .W2_MJmtv_ttntn 2.120 0.059 35.936 0.000
## .W2_MJmtv_sbstt 1.926 0.052 36.765 0.000
## .W2_MJmtv_ntrlm 2.515 0.069 36.708 0.000
## .W2_MJmtv_cnfrm 1.231 0.030 41.400 0.000
## .W2_MJmotv_cpng 1.978 0.051 38.568 0.000
## .W2_MJmtv_xprmn 1.664 0.046 36.534 0.000
## .W2_MJmotv_brdm 2.151 0.056 38.493 0.000
## .W2_MJmotv_lchl 1.562 0.042 36.932 0.000
## .W2_MJmtv_njymn 3.345 0.061 54.968 0.000
## .W2_MJmtv_clbrt 2.721 0.060 44.999 0.000
## .W2_MJmtv_ltrdp 2.643 0.063 42.195 0.000
## .W2_MJmtv_rltvl 2.713 0.071 38.288 0.000
## .W2_MJmtv_vlblt 2.508 0.057 43.903 0.000
## .w3_MJmtv_sclnx 2.276 0.062 36.679 0.000
## .w3_MJmotiv_slp 3.121 0.067 46.494 0.000
## .w3_MJmotive_pn 2.706 0.067 40.141 0.000
## .w3_MJmotive_ns 1.918 0.058 33.011 0.000
## .w3_MJmtv_ttntn 2.063 0.058 35.513 0.000
## .w3_MJmtv_sbstt 1.932 0.056 34.486 0.000
## .w3_MJmtv_ntrlm 2.526 0.068 37.395 0.000
## .w3_MJmtv_cnfrm 1.208 0.028 42.793 0.000
## .w3_MJmotv_cpng 1.967 0.051 38.245 0.000
## .w3_MJmtv_xprmn 1.671 0.051 32.909 0.000
## .w3_MJmotv_brdm 2.081 0.056 37.328 0.000
## .w3_MJmotv_lchl 1.494 0.039 38.204 0.000
## .w3_MJmtv_njymn 3.305 0.064 51.602 0.000
## .w3_MJmtv_clbrt 2.611 0.063 41.760 0.000
## .w3_MJmtv_ltrdp 2.567 0.062 41.099 0.000
## .w3_MJmtv_rltvl 2.731 0.072 37.836 0.000
## .w3_MJmtv_vlblt 2.512 0.061 40.845 0.000
## .w4_MJmtv_sclnx 2.262 0.062 36.446 0.000
## .w4_MJmotiv_slp 3.007 0.067 44.858 0.000
## .w4_MJmotive_pn 2.515 0.062 40.371 0.000
## .w4_MJmotive_ns 1.959 0.059 33.278 0.000
## .w4_MJmtv_ttntn 2.001 0.057 34.930 0.000
## .w4_MJmtv_sbstt 1.908 0.054 35.584 0.000
## .w4_MJmtv_ntrlm 2.376 0.068 34.719 0.000
## .w4_MJmtv_cnfrm 1.325 0.037 35.955 0.000
## .w4_MJmotv_cpng 2.078 0.053 39.266 0.000
## .w4_MJmtv_xprmn 1.735 0.050 34.415 0.000
## .w4_MJmotv_brdm 2.194 0.056 39.006 0.000
## .w4_MJmotv_lchl 1.588 0.043 36.811 0.000
## .w4_MJmtv_njymn 3.205 0.060 53.251 0.000
## .w4_MJmtv_clbrt 2.579 0.061 42.186 0.000
## .w4_MJmtv_ltrdp 2.573 0.062 41.407 0.000
## .w4_MJmtv_rltvl 2.565 0.068 37.722 0.000
## .w4_MJmtv_vlblt 2.360 0.059 40.065 0.000
## .w5_MJmtv_sclnx 2.325 0.066 35.231 0.000
## .w5_MJmotiv_slp 2.963 0.070 42.507 0.000
## .w5_MJmotive_pn 2.646 0.069 38.258 0.000
## .w5_MJmotive_ns 2.055 0.064 32.141 0.000
## .w5_MJmtv_ttntn 2.122 0.067 31.796 0.000
## .w5_MJmtv_sbstt 1.963 0.059 33.277 0.000
## .w5_MJmtv_ntrlm 2.420 0.075 32.209 0.000
## .w5_MJmtv_cnfrm 1.382 0.040 34.500 0.000
## .w5_MJmotv_cpng 2.214 0.061 36.449 0.000
## .w5_MJmtv_xprmn 1.863 0.060 31.076 0.000
## .w5_MJmotv_brdm 2.277 0.062 36.705 0.000
## .w5_MJmotv_lchl 1.698 0.049 34.527 0.000
## .w5_MJmtv_njymn 3.266 0.066 49.179 0.000
## .w5_MJmtv_clbrt 2.570 0.067 38.460 0.000
## .w5_MJmtv_ltrdp 2.679 0.071 37.716 0.000
## .w5_MJmtv_rltvl 2.625 0.070 37.521 0.000
## .w5_MJmtv_vlblt 2.409 0.062 38.852 0.000
## .w6_MJmtv_sclnx 2.214 0.070 31.544 0.000
## .w6_MJmotiv_slp 2.831 0.071 39.696 0.000
## .w6_MJmotive_pn 2.436 0.072 34.026 0.000
## .w6_MJmotive_ns 1.928 0.065 29.779 0.000
## .w6_MJmtv_ttntn 1.979 0.065 30.432 0.000
## .w6_MJmtv_sbstt 1.913 0.064 29.835 0.000
## .w6_MJmtv_ntrlm 2.241 0.073 30.555 0.000
## .w6_MJmtv_cnfrm 1.378 0.047 29.556 0.000
## .w6_MJmotv_cpng 2.164 0.064 33.943 0.000
## .w6_MJmtv_xprmn 1.784 0.062 28.776 0.000
## .w6_MJmotv_brdm 2.324 0.067 34.666 0.000
## .w6_MJmotv_lchl 1.613 0.051 31.901 0.000
## .w6_MJmtv_njymn 3.263 0.068 48.211 0.000
## .w6_MJmtv_clbrt 2.561 0.067 37.988 0.000
## .w6_MJmtv_ltrdp 2.551 0.072 35.346 0.000
## .w6_MJmtv_rltvl 2.503 0.076 32.730 0.000
## .w6_MJmtv_vlblt 2.311 0.064 35.945 0.000
##
## Variances:
## Estimate Std.Err z-value P(>|z|)
## HEMD1 1.000
## AVNR1 1.000
## APEN1 1.000
## HEMD2 1.000
## AVNR2 1.000
## APEN2 1.000
## HEMD3 1.000
## AVNR3 1.000
## APEN3 1.000
## HEMD4 1.000
## AVNR4 1.000
## APEN4 1.000
## HEMD5 1.000
## AVNR5 1.000
## APEN5 1.000
## HEMD6 1.000
## AVNR6 1.000
## APEN6 1.000
## .w1_MJmtv_sclnx 0.647 0.059 11.063 0.000
## .w1_MJmotiv_slp 0.924 0.075 12.289 0.000
## .w1_MJmotive_pn 0.674 0.062 10.889 0.000
## .w1_MJmotive_ns 0.773 0.066 11.682 0.000
## .w1_MJmtv_ttntn 0.765 0.065 11.733 0.000
## .w1_MJmtv_sbstt 0.574 0.049 11.656 0.000
## .w1_MJmtv_ntrlm 0.895 0.075 11.874 0.000
## .w1_MJmtv_cnfrm 0.104 0.058 1.796 0.072
## .w1_MJmotv_cpng 0.911 0.071 12.771 0.000
## .w1_MJmtv_xprmn 0.735 0.059 12.386 0.000
## .w1_MJmotv_brdm 0.644 0.059 10.955 0.000
## .w1_MJmotv_lchl 0.585 0.045 13.034 0.000
## .w1_MJmtv_njymn 0.528 0.048 11.051 0.000
## .w1_MJmtv_clbrt 0.752 0.064 11.822 0.000
## .w1_MJmtv_ltrdp 0.825 0.071 11.582 0.000
## .w1_MJmtv_rltvl 1.008 0.083 12.170 0.000
## .w1_MJmtv_vlblt 0.715 0.061 11.629 0.000
## .W2_MJmtv_sclnx 0.604 0.054 11.262 0.000
## .W2_MJmotiv_slp 0.923 0.077 11.921 0.000
## .W2_MJmotive_pn 0.616 0.060 10.313 0.000
## .W2_MJmotive_ns 0.557 0.051 10.903 0.000
## .W2_MJmtv_ttntn 0.537 0.048 11.081 0.000
## .W2_MJmtv_sbstt 0.538 0.046 11.797 0.000
## .W2_MJmtv_ntrlm 0.829 0.074 11.212 0.000
## .W2_MJmtv_cnfrm 0.056 0.045 1.231 0.218
## .W2_MJmotv_cpng 0.646 0.052 12.334 0.000
## .W2_MJmtv_xprmn 0.385 0.034 11.395 0.000
## .W2_MJmotv_brdm 0.663 0.056 11.843 0.000
## .W2_MJmotv_lchl 0.406 0.034 12.071 0.000
## .W2_MJmtv_njymn 0.661 0.062 10.632 0.000
## .W2_MJmtv_clbrt 0.745 0.066 11.250 0.000
## .W2_MJmtv_ltrdp 0.854 0.074 11.509 0.000
## .W2_MJmtv_rltvl 1.045 0.091 11.461 0.000
## .W2_MJmtv_vlblt 0.674 0.060 11.173 0.000
## .w3_MJmtv_sclnx 0.568 0.055 10.404 0.000
## .w3_MJmotiv_slp 0.924 0.079 11.721 0.000
## .w3_MJmotive_pn 0.693 0.066 10.545 0.000
## .w3_MJmotive_ns 0.605 0.054 11.120 0.000
## .w3_MJmtv_ttntn 0.515 0.048 10.795 0.000
## .w3_MJmtv_sbstt 0.580 0.051 11.416 0.000
## .w3_MJmtv_ntrlm 0.768 0.072 10.694 0.000
## .w3_MJmtv_cnfrm 0.064 0.022 2.933 0.003
## .w3_MJmotv_cpng 0.519 0.044 11.773 0.000
## .w3_MJmtv_xprmn 0.407 0.036 11.232 0.000
## .w3_MJmotv_brdm 0.562 0.050 11.280 0.000
## .w3_MJmotv_lchl 0.339 0.028 11.936 0.000
## .w3_MJmtv_njymn 0.581 0.056 10.373 0.000
## .w3_MJmtv_clbrt 0.614 0.058 10.662 0.000
## .w3_MJmtv_ltrdp 0.603 0.056 10.720 0.000
## .w3_MJmtv_rltvl 1.031 0.090 11.515 0.000
## .w3_MJmtv_vlblt 0.643 0.058 10.992 0.000
## .w4_MJmtv_sclnx 0.432 0.047 9.169 0.000
## .w4_MJmotiv_slp 0.812 0.072 11.261 0.000
## .w4_MJmotive_pn 0.546 0.054 10.028 0.000
## .w4_MJmotive_ns 0.566 0.052 10.886 0.000
## .w4_MJmtv_ttntn 0.431 0.043 9.962 0.000
## .w4_MJmtv_sbstt 0.470 0.043 11.021 0.000
## .w4_MJmtv_ntrlm 0.703 0.069 10.183 0.000
## .w4_MJmtv_cnfrm 0.027 0.045 0.610 0.542
## .w4_MJmotv_cpng 0.525 0.045 11.606 0.000
## .w4_MJmtv_xprmn 0.350 0.032 11.092 0.000
## .w4_MJmotv_brdm 0.500 0.046 10.880 0.000
## .w4_MJmotv_lchl 0.385 0.033 11.809 0.000
## .w4_MJmtv_njymn 0.578 0.054 10.731 0.000
## .w4_MJmtv_clbrt 0.596 0.056 10.699 0.000
## .w4_MJmtv_ltrdp 0.508 0.050 10.192 0.000
## .w4_MJmtv_rltvl 0.817 0.075 10.962 0.000
## .w4_MJmtv_vlblt 0.572 0.053 10.781 0.000
## .w5_MJmtv_sclnx 0.509 0.053 9.652 0.000
## .w5_MJmotiv_slp 0.768 0.073 10.532 0.000
## .w5_MJmotive_pn 0.469 0.050 9.378 0.000
## .w5_MJmotive_ns 0.450 0.046 9.827 0.000
## .w5_MJmtv_ttntn 0.412 0.045 9.202 0.000
## .w5_MJmtv_sbstt 0.570 0.053 10.683 0.000
## .w5_MJmtv_ntrlm 0.732 0.073 10.068 0.000
## .w5_MJmtv_cnfrm 0.039 0.067 0.579 0.563
## .w5_MJmotv_cpng 0.647 0.060 10.743 0.000
## .w5_MJmtv_xprmn 0.503 0.049 10.276 0.000
## .w5_MJmotv_brdm 0.599 0.058 10.401 0.000
## .w5_MJmotv_lchl 0.466 0.042 11.177 0.000
## .w5_MJmtv_njymn 0.555 0.056 9.857 0.000
## .w5_MJmtv_clbrt 0.482 0.051 9.360 0.000
## .w5_MJmtv_ltrdp 0.473 0.053 8.919 0.000
## .w5_MJmtv_rltvl 0.749 0.072 10.433 0.000
## .w5_MJmtv_vlblt 0.596 0.058 10.338 0.000
## .w6_MJmtv_sclnx 0.466 0.050 9.308 0.000
## .w6_MJmotiv_slp 0.764 0.073 10.407 0.000
## .w6_MJmotive_pn 0.451 0.050 8.988 0.000
## .w6_MJmotive_ns 0.408 0.043 9.554 0.000
## .w6_MJmtv_ttntn 0.358 0.040 9.028 0.000
## .w6_MJmtv_sbstt 0.497 0.049 10.222 0.000
## .w6_MJmtv_ntrlm 0.521 0.056 9.373 0.000
## .w6_MJmtv_cnfrm -0.015 0.085 -0.180 0.857
## .w6_MJmotv_cpng 0.621 0.059 10.458 0.000
## .w6_MJmtv_xprmn 0.433 0.043 10.051 0.000
## .w6_MJmotv_brdm 0.551 0.056 9.867 0.000
## .w6_MJmotv_lchl 0.407 0.038 10.651 0.000
## .w6_MJmtv_njymn 0.668 0.069 9.622 0.000
## .w6_MJmtv_clbrt 0.660 0.065 10.170 0.000
## .w6_MJmtv_ltrdp 0.526 0.059 8.904 0.000
## .w6_MJmtv_rltvl 0.840 0.083 10.072 0.000
## .w6_MJmtv_vlblt 0.554 0.057 9.726 0.000