The current aim is to simulate an existing data set by fitting a Vector Auto regression Moving Average (VARMA) model, extracting the parameters, and then simulating a new data set using the extracted parameters.

After the data has been simulated, we will run i-ARIMAX and i-BORTUA on both the raw existing data set and the simulated data set to compare how accurately the relationships in the existing data set have been simulated.

First, we are going to load in an existing data set used in the paper “Characterizing the momentary association between loneliness, depression, and social interactions: Insights from an ecological momentary assessment study” (Kuczynski et al., 2024).

library(readxl)
# Path to the local file
local_file <- "C:/Users/WillLi/Downloads/ProjectPingEMA.xlsx"

# Read the data file using readxl
rawdata <- read_excel(local_file)

rawdata$pid <- match(rawdata$pid, unique(rawdata$pid))
# Create data frame with only variables that we need
rawdata <- rawdata[, c("pid", "pingTotal", "depressedmood_state", "loneliness_state_pmc", "socintsatisfaction_state_pmc", "responsiveness_state_pmc", "selfdisclosure_state_pmc", "otherdisclosure_state_pmc")]

Now that we have loaded and cleaned up the existing data set we will start fitting the data to a VARMA model, extracting the parameters, and then simulating a new data set using the extracted parameters. All this will be done using the MTS package.

First we need to ensure NA values are present for missing values so that we can use the idionomics package to impute missing data.

library(dplyr)
## Warning: package 'dplyr' was built under R version 4.3.3
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
# Convert columns to numeric and ensure NA values are present where needed
cols_of_interest <- c("socintsatisfaction_state_pmc", "responsiveness_state_pmc", "selfdisclosure_state_pmc", "otherdisclosure_state_pmc")
rawdata <- rawdata %>%
  mutate(across(all_of(cols_of_interest), ~ as.numeric(as.character(.))))
## Warning: There were 4 warnings in `mutate()`.
## The first warning was:
## ℹ In argument: `across(all_of(cols_of_interest),
##   ~as.numeric(as.character(.)))`.
## Caused by warning:
## ! NAs introduced by coercion
## ℹ Run `dplyr::last_dplyr_warnings()` to see the 3 remaining warnings.
# Fill missing values using idionomics package
library(idionomics)
imputed <- imputatron_2000(data = rawdata, id_col = "pid", time_col = "pingTotal", cols_of_interest = c("depressedmood_state", "loneliness_state_pmc", "socintsatisfaction_state_pmc", "responsiveness_state_pmc", "selfdisclosure_state_pmc", "otherdisclosure_state_pmc"))
## ~~ Beep Boop Beep Boop ~~ 
## Imputatron will try to impute your dataset 
## ... 
## Imputatron filtered your data 
## Imputatron transformed data to wide format 
## Imputatron extracted start and end indexes for each timeseries 
## Imputatron dynamically created a list of variables + indexes 
## ... 
## ###### Imputatron completed data preprocessing #### 
## Imputatron created longData3d object 
## Imputatron performed copyMeans on your data 
## ... 
## ###### Imputatron completed data imputation #### 
## Imputatron will start data extraction sequence... 
## Imputatron extracted a list of dataframes from longData3d object 
## Imputatron melted each dataframe back to long format 
## Imputatron added names to the list of dataframes 
## ... 
## ###### Imputatron completed data extraction #### 
## Imputatron will start tidy dataframe creation sequence... 
## Imputatron created tidy dataframe with all of your variables 
## ... 
## Imputatron finished the imputation process.
## You can access the following elements:
##    Imputed Dataframe: $imputed_df
##    Long Data Object: $long_data_obj 
##    Long Data Object with imputed data: $imputed_data 
##    Your original data, but filtered: $filtered_data 
##    Filtered data in wide format: $wide_data 
##    The list with variable names and indexes to create the Long Data Object: $timeInData_list
## ... 
## Imputatron turning off... 
## ~~ Beep Boop Beep Boop ~~ Bye!
imputed_rawdata <- imputed$imputed_df
str(imputed$imputed_df)
## 'data.frame':    7140 obs. of  8 variables:
##  $ pid                         : chr  "1" "1" "1" "1" ...
##  $ pingTotal                   : num  1 2 3 4 5 6 7 8 9 10 ...
##  $ depressedmood_state         : num  49.1 50.7 65.7 72.6 64.8 ...
##  $ loneliness_state_pmc        : num  23.3 -5.12 9.21 16.82 18.5 ...
##  $ socintsatisfaction_state_pmc: num  -16.46 -25.46 8.54 -64.46 6.54 ...
##  $ responsiveness_state_pmc    : num  -14.474 -53.911 0.185 -29.907 22.9 ...
##  $ selfdisclosure_state_pmc    : num  -12.91 -43.14 -33.15 -36.87 -9.62 ...
##  $ otherdisclosure_state_pmc   : num  2.355 -0.541 -7.093 -30.629 -18.596 ...
# Remove self-disclosure and other-disclosure columns
imputed_rawdata <- imputed_rawdata[, -c(7,8)]

# Arrange by numerical order of pid
imputed_rawdata <- imputed_rawdata %>%
  mutate(pid = as.numeric(pid)) %>%
  arrange(pid, pingTotal)

I had to remove the self-disclosure and other-disclosure variables because it causes an error when I try to fit a VARMA model and simulate data. I think it’s because the variables are too inter correlated resulting in matrix singularity during fitting process?

simulated_data_list <- lapply(rawdata_list, simulate_individual) Error in solve.default(xpx, xpy): System computationally singular: reciprocal condition number = 2.67632e-20 Additionally: Warning message: In log(det(sse)): NaNs produced

Simulating new data

Then we create a function that fits a VARMA model to each individual’s time series data, extracts the phi (AR), theta (MA), and sigma (Covariance of errors/residuals) matrices for each individual’s model, and then simulates new data with 150 time points using the extracted parameters.

# Split by individuals into a list
rawdata_list <- split(imputed_rawdata, imputed_rawdata$pid)

library(MTS)
## Warning: package 'MTS' was built under R version 4.3.3
# Function to fit VARMA model and simulate new data
simulate_individual <- function(rawdata_list) {
  # Remove ID and time columns for fitting
  individual_matrix <- as.matrix(rawdata_list[, -c(1, 2)])
  
  # Fit VARMA model
  fit <- VARMA(individual_matrix, p = 1, q = 1)
  
  # Extract AR and MA coefficients
  phi <- fit$Phi
  theta <- fit$Theta
  
  # Extract sigma matrix (covariance matrix of the residuals)
  sigma <- fit$Sigma
  
  # Simulate new data using extracted parameters
  set.seed(12345)
  sim_data <- VARMAsim(n = 150, arlags = c(1), malags = c(1), 
                       phi = phi, theta = theta, sigma = sigma, skip = 200)
  
  simulated_series <- sim_data$series
  
  # Return both the fit object and the noisy simulated series
  return(list(fit = fit, simulated_series = simulated_series))
}

# Loop through each individual's data and simulate new data
simulated_data_list <- lapply(rawdata_list, simulate_individual)
## Number of parameters:  36 
## initial estimates:  25.8345 -6.044 -2.7562 -5.5117 0.2572 0.1254 0.1879 -0.3065 0.1305 0.3823 -0.0055 0.0148 0.084 -0.4881 0.3217 -0.1177 0.1463 -0.59 -0.0587 0.1586 -0.0469 0.1791 0.1865 0.3385 -0.1547 0.4774 0.3329 -0.2046 -0.1182 0.6806 -1.0235 0.4969 0.1671 0.5305 -0.6791 0.3874 
## Par. lower-bounds:  14.5276 -17.5904 -18.371 -23.1284 -0.0435 -0.2177 -0.1278 -0.6292 -0.1766 0.0319 -0.3278 -0.3148 -0.3313 -0.962 -0.1142 -0.5634 -0.3222 -1.1247 -0.5505 -0.3442 -0.6867 -0.6251 -0.6846 -0.3532 -0.808 -0.3437 -0.5567 -0.911 -1.0017 -0.4299 -2.2264 -0.4583 -0.8297 -0.7224 -2.0363 -0.6903 
## Par. upper-bounds:  37.1413 5.5024 12.8586 12.105 0.5579 0.4685 0.5035 0.0162 0.4375 0.7327 0.3168 0.3443 0.4992 -0.0143 0.7576 0.3279 0.6148 -0.0554 0.433 0.6614 0.5929 0.9832 1.0575 1.0302 0.4986 1.2986 1.2224 0.5017 0.7653 1.7911 0.1795 1.4522 1.1639 1.7833 0.6781 1.4651 
## Final   Estimates:  25.82883 -6.052471 -2.755686 -5.51163 0.3359108 0.03820995 -0.004979449 -0.3473388 0.1571522 0.2816609 -0.3278286 -0.03327595 0.07832896 -0.369852 0.7220514 -0.0484884 0.1662879 -0.731867 0.06646201 0.1709377 -0.04843064 0.1990509 0.05248554 0.239957 -0.03184787 -0.01522379 0.5575758 -0.08023074 -0.2562148 0.5484669 -0.9735579 0.3543928 -0.06466076 0.4762496 -0.4965915 0.3046605
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)   
## depressedmood_state          25.828830   15.320549    1.686  0.09182 . 
## loneliness_state_pmc         -6.052471   10.729874   -0.564  0.57270   
## socintsatisfaction_state_pmc -2.755686         NaN      NaN      NaN   
## responsiveness_state_pmc     -5.511630   11.737259   -0.470  0.63865   
## depressedmood_state           0.335911    0.385499    0.871  0.38355   
## loneliness_state_pmc          0.038210    0.467405    0.082  0.93485   
## socintsatisfaction_state_pmc -0.004979         NaN      NaN      NaN   
## responsiveness_state_pmc     -0.347339    0.422202   -0.823  0.41069   
## depressedmood_state           0.157152    0.261562    0.601  0.54796   
## loneliness_state_pmc          0.281661    0.500070    0.563  0.57327   
## socintsatisfaction_state_pmc -0.327829    0.323642   -1.013  0.31109   
## responsiveness_state_pmc     -0.033276    0.459653   -0.072  0.94229   
## depressedmood_state           0.078329         NaN      NaN      NaN   
## loneliness_state_pmc         -0.369852    0.338368   -1.093  0.27437   
## socintsatisfaction_state_pmc  0.722051    0.240797    2.999  0.00271 **
## responsiveness_state_pmc     -0.048488    0.377538   -0.128  0.89781   
## depressedmood_state           0.166288    0.302944    0.549  0.58307   
## loneliness_state_pmc         -0.731867    0.594876   -1.230  0.21859   
## socintsatisfaction_state_pmc  0.066462    0.511825    0.130  0.89668   
## responsiveness_state_pmc      0.170938    0.449027    0.381  0.70344   
##                              -0.048431    0.399144   -0.121  0.90342   
##                               0.199051    0.471183    0.422  0.67270   
##                               0.052486         NaN      NaN      NaN   
##                               0.239957    0.444429    0.540  0.58925   
##                              -0.031848    0.183579   -0.173  0.86227   
##                              -0.015224    0.546221   -0.028  0.97776   
##                               0.557576    0.304963    1.828  0.06750 . 
##                              -0.080231    0.436539   -0.184  0.85418   
##                              -0.256215         NaN      NaN      NaN   
##                               0.548467    0.305008    1.798  0.07214 . 
##                              -0.973558    0.302392   -3.220  0.00128 **
##                               0.354393    0.310533    1.141  0.25377   
##                              -0.064661    0.239825   -0.270  0.78746   
##                               0.476250    0.557848    0.854  0.39326   
##                              -0.496591    0.510500   -0.973  0.33068   
##                               0.304661    0.404864    0.753  0.45175   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  25.82883 -6.052471 -2.755686 -5.51163 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]     [,3]    [,4]
## [1,] 0.3359  0.0382 -0.00498 -0.3473
## [2,] 0.1572  0.2817 -0.32783 -0.0333
## [3,] 0.0783 -0.3699  0.72205 -0.0485
## [4,] 0.1663 -0.7319  0.06646  0.1709
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]    [,2]    [,3]    [,4]
## [1,] 0.0484 -0.1991 -0.0525 -0.2400
## [2,] 0.0318  0.0152 -0.5576  0.0802
## [3,] 0.2562 -0.5485  0.9736 -0.3544
## [4,] 0.0647 -0.4762  0.4966 -0.3047
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 156.67092  64.13723 -44.28528 -48.47625
## [2,]  64.13723 113.64283 -20.83032 -38.95494
## [3,] -44.28528 -20.83032 294.00204 233.50171
## [4,] -48.47625 -38.95494 233.50171 319.55323
## ---- 
## aic=  21.0574 
## bic=  22.21377 
## Number of parameters:  36 
## initial estimates:  27.2266 4.4182 3.0397 1.7261 0.0911 -0.1511 0.0866 -0.0665 -0.1439 -0.0825 -0.0576 0.0122 -0.1449 -0.0213 0.5598 -0.1658 -0.0683 0.1419 0.017 0.5877 -0.3272 -0.0374 -0.1589 0.458 -0.1708 -0.3386 0.0771 -0.3798 -1.3335 -1.494 0.1887 -0.5876 0.2913 -0.2783 0.0536 -0.3576 
## Par. lower-bounds:  18.609 -2.9739 -12.6739 -5.3495 -0.1892 -0.4823 -0.0563 -0.3862 -0.3844 -0.3667 -0.1802 -0.262 -0.6561 -0.6253 0.2991 -0.7487 -0.2985 -0.1301 -0.1004 0.3252 -1.1318 -0.9517 -0.5048 -0.2892 -0.8611 -1.1229 -0.2196 -1.0208 -2.8007 -3.1612 -0.442 -1.9501 -0.3694 -1.029 -0.2303 -0.9711 
## Par. upper-bounds:  35.8443 11.8103 18.7532 8.8016 0.3715 0.1802 0.2296 0.2532 0.0965 0.2016 0.065 0.2864 0.3663 0.5828 0.8204 0.4171 0.1619 0.4139 0.1344 0.8502 0.4775 0.8769 0.1869 1.2053 0.5194 0.4457 0.3738 0.2611 0.1337 0.1732 0.8193 0.775 0.952 0.4724 0.3376 0.2559 
## Final   Estimates:  27.23923 4.336323 2.991998 1.696077 0.1442357 -0.2844391 0.06715954 -0.2302647 -0.1402319 0.1478861 -0.02426495 0.1108506 -0.1290431 0.5810749 0.4517294 0.03186358 -0.04881582 0.4039485 0.07421009 0.4682769 -0.001307019 0.1146372 0.1264177 0.5186003 0.1557804 -0.6265901 -0.05512655 -0.3956802 0.04025112 -1.006271 -0.05086123 -0.317046 0.1307605 -0.6468007 -0.06656416 -0.03397326 
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          27.239230    9.769688    2.788 0.005301 ** 
## loneliness_state_pmc          4.336323    7.240434    0.599 0.549237    
## socintsatisfaction_state_pmc  2.991998   19.095910    0.157 0.875495    
## responsiveness_state_pmc      1.696077   13.268320    0.128 0.898284    
## depressedmood_state           0.144236    0.300448    0.480 0.631179    
## loneliness_state_pmc         -0.284439    0.596451   -0.477 0.633443    
## socintsatisfaction_state_pmc  0.067160    0.214406    0.313 0.754102    
## responsiveness_state_pmc     -0.230265    0.342029   -0.673 0.500800    
## depressedmood_state          -0.140232    0.253314   -0.554 0.579859    
## loneliness_state_pmc          0.147886    0.150170    0.985 0.324727    
## socintsatisfaction_state_pmc -0.024265    0.075030   -0.323 0.746389    
## responsiveness_state_pmc      0.110851    0.169087    0.656 0.512092    
## depressedmood_state          -0.129043    0.671585   -0.192 0.847627    
## loneliness_state_pmc          0.581075    0.609485    0.953 0.340394    
## socintsatisfaction_state_pmc  0.451729    0.247133    1.828 0.067568 .  
## responsiveness_state_pmc      0.031864    0.695165    0.046 0.963441    
## depressedmood_state          -0.048816    0.452543   -0.108 0.914099    
## loneliness_state_pmc          0.403948    0.243640    1.658 0.097323 .  
## socintsatisfaction_state_pmc  0.074210    0.161667    0.459 0.646211    
## responsiveness_state_pmc      0.468277    0.225222    2.079 0.037601 *  
##                              -0.001307    0.298920   -0.004 0.996511    
##                               0.114637    0.606734    0.189 0.850139    
##                               0.126418    0.238161    0.531 0.595553    
##                               0.518600    0.423189    1.225 0.220403    
##                               0.155780    0.232795    0.669 0.503385    
##                              -0.626590    0.166879   -3.755 0.000174 ***
##                              -0.055127    0.112812   -0.489 0.625085    
##                              -0.395680    0.215648   -1.835 0.066528 .  
##                               0.040251    0.615171    0.065 0.947831    
##                              -1.006271    0.680052   -1.480 0.138954    
##                              -0.050861    0.251186   -0.202 0.839538    
##                              -0.317046    0.989026   -0.321 0.748541    
##                               0.130760    0.444526    0.294 0.768638    
##                              -0.646801    0.250989   -2.577 0.009966 ** 
##                              -0.066564    0.195729   -0.340 0.733794    
##                              -0.033973    0.280266   -0.121 0.903518    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  27.23923 4.336323 2.991998 1.696077 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]    [,3]    [,4]
## [1,]  0.1442 -0.284  0.0672 -0.2303
## [2,] -0.1402  0.148 -0.0243  0.1109
## [3,] -0.1290  0.581  0.4517  0.0319
## [4,] -0.0488  0.404  0.0742  0.4683
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]   [,2]    [,3]   [,4]
## [1,]  0.00131 -0.115 -0.1264 -0.519
## [2,] -0.15578  0.627  0.0551  0.396
## [3,] -0.04025  1.006  0.0509  0.317
## [4,] -0.13076  0.647  0.0666  0.034
##   
## Residuals cov-matrix: 
##           [,1]       [,2]       [,3]      [,4]
## [1,] 55.630463   9.420559   8.510647  3.309775
## [2,]  9.420559  32.106607 -11.763710 -4.810856
## [3,]  8.510647 -11.763710 157.870197 18.597145
## [4,]  3.309775  -4.810856  18.597145 25.001061
## ---- 
## aic=  16.58229 
## bic=  17.73865 
## Number of parameters:  36 
## initial estimates:  13.3279 -3.3706 -1.6928 3.6399 0.4969 -0.0172 -0.0871 0.1279 0.158 0.1047 0.0872 -0.0282 0.077 -0.0214 0.3459 0.0205 -0.1017 0.3055 0.2617 0.0842 0.1611 -1.1002 0.3485 -0.8279 0.8064 -1.4425 -0.0867 -0.0689 -0.4729 1.1486 -1.0686 1.1023 -0.8624 0.7482 -0.3265 0.1541 
## Par. lower-bounds:  3.0634 -10.8612 -11.9444 -4.611 0.1214 -0.5445 -0.4321 -0.3226 -0.1161 -0.2801 -0.1646 -0.357 -0.2981 -0.548 0.0013 -0.4295 -0.4036 -0.1183 -0.0157 -0.278 -0.7377 -2.358 -0.5347 -1.9419 0.1505 -2.3604 -0.7312 -0.8818 -1.3706 -0.1076 -1.9506 -0.0102 -1.5848 -0.2628 -1.0364 -0.7413 
## Par. upper-bounds:  23.5925 4.1201 8.5589 11.8907 0.8725 0.5101 0.258 0.5785 0.432 0.4895 0.339 0.3007 0.452 0.5053 0.6904 0.4705 0.2002 0.7294 0.539 0.4463 1.0599 0.1575 1.2317 0.286 1.4623 -0.5246 0.5578 0.744 0.4247 2.4048 -0.1865 2.2149 -0.1399 1.7592 0.3834 1.0495 
## Final   Estimates:  13.42606 -3.409897 -1.664789 3.611162 0.3867297 0.255775 0.2029655 0.4226802 0.1233114 0.3257916 -0.1353972 0.2754257 0.1450385 -0.54767 0.6904414 -0.4217736 -0.03327749 0.01711918 0.101446 -0.104664 0.1839033 -0.626066 -0.1714078 -0.5045611 0.2570445 -0.5865905 0.2350613 -0.1911315 -0.2206524 0.9136381 -0.8130445 0.6267934 -0.2940609 0.576014 -0.02985883 0.2978408
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           13.42606    11.42936    1.175 0.240115    
## loneliness_state_pmc          -3.40990     5.14658   -0.663 0.507615    
## socintsatisfaction_state_pmc  -1.66479     5.78722   -0.288 0.773602    
## responsiveness_state_pmc       3.61116     7.01773    0.515 0.606849    
## depressedmood_state            0.38673     0.50717    0.763 0.445745    
## loneliness_state_pmc           0.25577     0.98115    0.261 0.794333    
## socintsatisfaction_state_pmc   0.20297     0.34706    0.585 0.558668    
## responsiveness_state_pmc       0.42268     0.24340    1.737 0.082470 .  
## depressedmood_state            0.12331     0.20544    0.600 0.548350    
## loneliness_state_pmc           0.32579         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.13540     0.20860   -0.649 0.516288    
## responsiveness_state_pmc       0.27543     0.17182    1.603 0.108930    
## depressedmood_state            0.14504     0.22392    0.648 0.517159    
## loneliness_state_pmc          -0.54767     0.34095   -1.606 0.108207    
## socintsatisfaction_state_pmc   0.69044     0.24403    2.829 0.004665 ** 
## responsiveness_state_pmc      -0.42177     0.27342   -1.543 0.122928    
## depressedmood_state           -0.03328     0.29109   -0.114 0.908983    
## loneliness_state_pmc           0.01712     0.41290    0.041 0.966929    
## socintsatisfaction_state_pmc   0.10145     0.19155    0.530 0.596386    
## responsiveness_state_pmc      -0.10466     0.23173   -0.452 0.651513    
##                                0.18390     0.56093    0.328 0.743022    
##                               -0.62607     0.99539   -0.629 0.529370    
##                               -0.17141     0.36337   -0.472 0.637128    
##                               -0.50456     0.26450   -1.908 0.056445 .  
##                                0.25704     0.25702    1.000 0.317264    
##                               -0.58659     0.16942   -3.462 0.000536 ***
##                                0.23506     0.25642    0.917 0.359290    
##                               -0.19113     0.10198   -1.874 0.060908 .  
##                               -0.22065     0.20558   -1.073 0.283126    
##                                0.91364     0.28905    3.161 0.001573 ** 
##                               -0.81304     0.27885   -2.916 0.003548 ** 
##                                0.62679     0.34150    1.835 0.066446 .  
##                               -0.29406     0.33695   -0.873 0.382818    
##                                0.57601     0.41857    1.376 0.168779    
##                               -0.02986     0.18725   -0.159 0.873308    
##                                0.29784     0.34557    0.862 0.388755    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  13.42606 -3.409897 -1.664789 3.611162 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]   [,3]   [,4]
## [1,]  0.3867  0.2558  0.203  0.423
## [2,]  0.1233  0.3258 -0.135  0.275
## [3,]  0.1450 -0.5477  0.690 -0.422
## [4,] -0.0333  0.0171  0.101 -0.105
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]    [,3]   [,4]
## [1,] -0.184  0.626  0.1714  0.505
## [2,] -0.257  0.587 -0.2351  0.191
## [3,]  0.221 -0.914  0.8130 -0.627
## [4,]  0.294 -0.576  0.0299 -0.298
##   
## Residuals cov-matrix: 
##            [,1]      [,2]       [,3]      [,4]
## [1,]  212.11354 108.17462 -106.92403 -82.08277
## [2,]  108.17462 127.44258  -73.94827 -61.71013
## [3,] -106.92403 -73.94827  217.06316 104.95809
## [4,]  -82.08277 -61.71013  104.95809 140.62603
## ---- 
## aic=  20.13429 
## bic=  21.29066 
## Number of parameters:  36 
## initial estimates:  5.5047 -6.366 -3.8395 -0.9145 0.4525 0.1601 -0.0458 -0.0069 0.3809 0.0666 0.2664 -0.4643 0.3064 -0.19 0.4351 0.2651 0.0221 0.0164 0.0146 0.6826 -0.0133 0.238 0.111 0.6001 -0.4371 0.1756 -0.2066 0.6527 0.485 -0.4265 -1.0379 1.6628 0.6652 -0.4155 -0.1315 0.2709 
## Par. lower-bounds:  0.9208 -12.8451 -10.1172 -5.1672 0.1594 -0.1307 -0.3068 -0.3626 -0.0334 -0.3445 -0.1025 -0.967 -0.0951 -0.5882 0.0776 -0.222 -0.2499 -0.2534 -0.2275 0.3527 -0.6818 -0.2425 -0.3515 -0.1735 -1.3819 -0.5035 -0.8603 -0.4407 -0.4306 -1.0845 -1.6713 0.6034 0.045 -0.8612 -0.5606 -0.4467 
## Par. upper-bounds:  10.0886 0.1131 2.4383 3.3381 0.7457 0.4509 0.2152 0.3488 0.7953 0.4777 0.6353 0.0385 0.7079 0.2083 0.7925 0.7522 0.294 0.2862 0.2567 1.0126 0.6552 0.7185 0.5735 1.3736 0.5078 0.8548 0.4471 1.7461 1.4005 0.2316 -0.4045 2.7222 1.2854 0.0303 0.2975 0.9885 
## Final   Estimates:  5.536076 -6.355912 -3.743069 -0.9735475 0.4708634 -0.02236434 0.1686034 -0.1121193 0.6581449 -0.04744442 0.277382 -0.2554249 0.3650648 0.1315258 0.6622823 -0.1904752 0.08299427 0.06749149 -0.08299725 0.5767133 0.01385131 0.2858473 -0.2650214 0.1487002 -0.6888815 0.4444189 -0.2835511 0.03031244 -0.3312489 -0.2237084 -0.7145117 1.274228 0.103962 -0.1824013 0.2975391 0.08638154
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state            5.53608     6.14133    0.901 0.367351    
## loneliness_state_pmc          -6.35591    11.00426   -0.578 0.563543    
## socintsatisfaction_state_pmc  -3.74307     1.10504   -3.387 0.000706 ***
## responsiveness_state_pmc      -0.97355     2.49948   -0.389 0.696906    
## depressedmood_state            0.47086     0.62735    0.751 0.452915    
## loneliness_state_pmc          -0.02236     0.75732   -0.030 0.976441    
## socintsatisfaction_state_pmc   0.16860     0.38771    0.435 0.663659    
## responsiveness_state_pmc      -0.11212     0.63552   -0.176 0.859963    
## depressedmood_state            0.65814     1.11494    0.590 0.554991    
## loneliness_state_pmc          -0.04744     1.42632   -0.033 0.973464    
## socintsatisfaction_state_pmc   0.27738     0.63723    0.435 0.663349    
## responsiveness_state_pmc      -0.25542     0.91085   -0.280 0.779151    
## depressedmood_state            0.36506     0.01677   21.774  < 2e-16 ***
## loneliness_state_pmc           0.13153     0.20114    0.654 0.513175    
## socintsatisfaction_state_pmc   0.66228     0.11380    5.820 5.89e-09 ***
## responsiveness_state_pmc      -0.19048     0.16355   -1.165 0.244172    
## depressedmood_state            0.08299     0.19040    0.436 0.662921    
## loneliness_state_pmc           0.06749     0.31877    0.212 0.832323    
## socintsatisfaction_state_pmc  -0.08300     0.10967   -0.757 0.449159    
## responsiveness_state_pmc       0.57671     0.06817    8.459  < 2e-16 ***
##                                0.01385     0.66542    0.021 0.983393    
##                                0.28585     0.82329    0.347 0.728439    
##                               -0.26502     0.47513   -0.558 0.576990    
##                                0.14870     0.77485    0.192 0.847814    
##                               -0.68888     1.34688   -0.511 0.609027    
##                                0.44442     1.61085    0.276 0.782632    
##                               -0.28355     1.01336   -0.280 0.779622    
##                                0.03031     1.19304    0.025 0.979730    
##                               -0.33125     0.17036   -1.944 0.051849 .  
##                               -0.22371     0.34871   -0.642 0.521179    
##                               -0.71451     0.19400   -3.683 0.000230 ***
##                                1.27423         NaN      NaN      NaN    
##                                0.10396     0.25835    0.402 0.687384    
##                               -0.18240     0.46792   -0.390 0.696674    
##                                0.29754     0.24505    1.214 0.224665    
##                                0.08638     0.22891    0.377 0.705908    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  5.536076 -6.355912 -3.743069 -0.9735475 
## AR coefficient matrix 
## AR( 1 )-matrix 
##       [,1]    [,2]   [,3]   [,4]
## [1,] 0.471 -0.0224  0.169 -0.112
## [2,] 0.658 -0.0474  0.277 -0.255
## [3,] 0.365  0.1315  0.662 -0.190
## [4,] 0.083  0.0675 -0.083  0.577
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,] -0.0139 -0.286  0.265 -0.1487
## [2,]  0.6889 -0.444  0.284 -0.0303
## [3,]  0.3312  0.224  0.715 -1.2742
## [4,] -0.1040  0.182 -0.298 -0.0864
##   
## Residuals cov-matrix: 
##            [,1]       [,2]       [,3]       [,4]
## [1,] 138.287869 106.885034  -5.891397  -7.814896
## [2,] 106.885034 256.138925  23.604791  -8.384796
## [3,]  -5.891397  23.604791 230.234827  99.846243
## [4,]  -7.814896  -8.384796  99.846243 109.442716
## ---- 
## aic=  20.70195 
## bic=  21.85832 
## Number of parameters:  36 
## initial estimates:  17.9117 5.2939 -0.8713 -0.6114 0.1385 0.1222 -0.1477 -0.5098 -0.1952 0.5094 0.01 -1.0653 0.0272 -0.1635 0.4529 0.6323 0.0803 -0.0834 -0.012 0.686 -0.2683 -0.1548 -0.7814 0.6317 0.6262 -0.6455 -0.3696 0.9049 -0.2122 0.0607 0.3951 -1.1528 -0.0025 0.0598 0.275 -0.4826 
## Par. lower-bounds:  8.7586 -7.1468 -7.4412 -3.1067 -0.2828 -0.1567 -0.5255 -1.36 -0.7678 0.1304 -0.5035 -2.2208 -0.2753 -0.3636 0.1818 0.0221 -0.0345 -0.1594 -0.115 0.4542 -1.1277 -0.813 -1.8134 -1.7441 -0.5419 -1.54 -1.7723 -2.3242 -0.8291 -0.4117 -0.3458 -2.8581 -0.2368 -0.1196 -0.0063 -1.1302 
## Par. upper-bounds:  27.0647 17.7345 5.6987 1.8838 0.5598 0.4011 0.23 0.3403 0.3775 0.8885 0.5234 0.0901 0.3296 0.0367 0.7241 1.2425 0.1952 -0.0073 0.091 0.9177 0.5911 0.5033 0.2507 3.0074 1.7944 0.249 1.0332 4.1339 0.4047 0.5331 1.1359 0.5525 0.2318 0.2392 0.5564 0.1651 
## Final   Estimates:  17.79328 5.129969 -1.003206 -0.7700483 0.1036492 -0.1559732 -0.4486161 -0.6076864 -0.2286662 0.850799 0.2361531 -0.9995191 0.01658298 -0.3522151 0.1861834 1.06651 0.06168223 -0.06842801 -0.1108673 0.9163527 -0.1056858 0.362293 0.2502022 0.6979915 0.4832304 -0.706685 -0.2018554 0.1835193 -0.1869878 0.2632424 0.322445 -1.18252 0.09315074 -0.04229411 0.3250415 -0.7589605
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           17.79328         NaN      NaN      NaN    
## loneliness_state_pmc           5.12997     5.54219    0.926  0.35464    
## socintsatisfaction_state_pmc  -1.00321         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.77005     2.67109   -0.288  0.77313    
## depressedmood_state            0.10365         NaN      NaN      NaN    
## loneliness_state_pmc          -0.15597     0.23927   -0.652  0.51448    
## socintsatisfaction_state_pmc  -0.44862         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.60769     0.41545   -1.463  0.14355    
## depressedmood_state           -0.22867     0.29488   -0.775  0.43807    
## loneliness_state_pmc           0.85080     0.14488    5.872 4.29e-09 ***
## socintsatisfaction_state_pmc   0.23615         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.99952     0.38687   -2.584  0.00978 ** 
## depressedmood_state            0.01658         NaN      NaN      NaN    
## loneliness_state_pmc          -0.35222     0.15434   -2.282  0.02249 *  
## socintsatisfaction_state_pmc   0.18618         NaN      NaN      NaN    
## responsiveness_state_pmc       1.06651     0.06652   16.033  < 2e-16 ***
## depressedmood_state            0.06168     0.13150    0.469  0.63902    
## loneliness_state_pmc          -0.06843     0.04825   -1.418  0.15611    
## socintsatisfaction_state_pmc  -0.11087     0.10889   -1.018  0.30858    
## responsiveness_state_pmc       0.91635         NaN      NaN      NaN    
##                               -0.10569         NaN      NaN      NaN    
##                                0.36229     0.19958    1.815  0.06949 .  
##                                0.25020         NaN      NaN      NaN    
##                                0.69799     0.54930    1.271  0.20384    
##                                0.48323     0.36074    1.340  0.18039    
##                               -0.70668         NaN      NaN      NaN    
##                               -0.20186         NaN      NaN      NaN    
##                                0.18352     0.34064    0.539  0.59006    
##                               -0.18699         NaN      NaN      NaN    
##                                0.26324     0.10866    2.423  0.01541 *  
##                                0.32245         NaN      NaN      NaN    
##                               -1.18252         NaN      NaN      NaN    
##                                0.09315     0.11703    0.796  0.42606    
##                               -0.04229         NaN      NaN      NaN    
##                                0.32504     0.14685    2.213  0.02687 *  
##                               -0.75896         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  17.79328 5.129969 -1.003206 -0.7700483 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]   [,3]   [,4]
## [1,]  0.1036 -0.1560 -0.449 -0.608
## [2,] -0.2287  0.8508  0.236 -1.000
## [3,]  0.0166 -0.3522  0.186  1.067
## [4,]  0.0617 -0.0684 -0.111  0.916
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]   [,3]   [,4]
## [1,]  0.1057 -0.3623 -0.250 -0.698
## [2,] -0.4832  0.7067  0.202 -0.184
## [3,]  0.1870 -0.2632 -0.322  1.183
## [4,] -0.0932  0.0423 -0.325  0.759
##   
## Residuals cov-matrix: 
##            [,1]      [,2]      [,3]       [,4]
## [1,] 173.705822 184.12726 -60.31480  -1.927408
## [2,] 184.127263 326.34484 -66.79531 -11.083415
## [3,] -60.314795 -66.79531  67.19492  10.284061
## [4,]  -1.927408 -11.08342  10.28406  17.600705
## ---- 
## aic=  17.60565 
## bic=  18.76202 
## Number of parameters:  36 
## initial estimates:  22.3003 0.3576 5.319 5.4066 0.3065 -0.2328 -0.0349 -0.1604 0.0736 -0.0182 0.1765 -0.4512 -0.2684 0.3446 0.6438 -0.0748 -0.2641 0.2064 -0.0521 0.4854 -0.0316 0.9249 0.4894 -0.3948 0.0679 0.5874 0.2892 -0.1529 0.2405 -1.0194 -0.6558 0.4543 0.0159 -0.6381 -0.0374 -0.1723 
## Par. lower-bounds:  11.7349 -8.4401 -5.0648 -3.7314 -0.0291 -0.6236 -0.4127 -0.6368 -0.2059 -0.3437 -0.1381 -0.8478 -0.5982 -0.0395 0.2725 -0.543 -0.5544 -0.1316 -0.3789 0.0734 -0.7601 -0.2328 -0.2481 -1.5095 -0.5387 -0.3766 -0.3248 -1.0811 -0.4755 -2.1572 -1.3805 -0.6413 -0.6141 -1.6394 -0.6752 -1.1364 
## Par. upper-bounds:  32.8657 9.1553 15.7028 14.5446 0.6421 0.1581 0.3429 0.3159 0.3531 0.3072 0.4911 -0.0545 0.0615 0.7287 1.0151 0.3933 0.0261 0.5444 0.2747 0.8974 0.6968 2.0827 1.2268 0.7199 0.6744 1.5515 0.9032 0.7753 0.9564 0.1184 0.069 1.5498 0.646 0.3632 0.6003 0.7918 
## Final   Estimates:  25.1304 6.386764 6.615097 3.172541 0.1611217 -0.004889173 0.07617474 -0.6367626 -0.2058582 0.2259781 0.2425714 -0.8477956 -0.2473135 0.7286809 0.6798601 0.2519577 -0.1130467 0.5444458 0.1917951 0.4111242 0.2067045 -0.08443954 0.06887692 0.5291166 0.3100959 -0.0698386 -0.0697627 0.5454302 -0.1008644 -0.7314126 -0.4379423 -0.2354841 -0.1744142 -0.736268 -0.3034772 -0.104366
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          25.130405         NaN      NaN      NaN    
## loneliness_state_pmc          6.386764         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  6.615097         NaN      NaN      NaN    
## responsiveness_state_pmc      3.172541    8.165120    0.389    0.698    
## depressedmood_state           0.161122         NaN      NaN      NaN    
## loneliness_state_pmc         -0.004889         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.076175         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.636763         NaN      NaN      NaN    
## depressedmood_state          -0.205858    0.036933   -5.574 2.49e-08 ***
## loneliness_state_pmc          0.225978    0.271182    0.833    0.405    
## socintsatisfaction_state_pmc  0.242571         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.847796         NaN      NaN      NaN    
## depressedmood_state          -0.247313         NaN      NaN      NaN    
## loneliness_state_pmc          0.728681    0.524299    1.390    0.165    
## socintsatisfaction_state_pmc  0.679860         NaN      NaN      NaN    
## responsiveness_state_pmc      0.251958         NaN      NaN      NaN    
## depressedmood_state          -0.113047    0.254266   -0.445    0.657    
## loneliness_state_pmc          0.544446         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.191795         NaN      NaN      NaN    
## responsiveness_state_pmc      0.411124         NaN      NaN      NaN    
##                               0.206704         NaN      NaN      NaN    
##                              -0.084440    0.193898   -0.435    0.663    
##                               0.068877         NaN      NaN      NaN    
##                               0.529117         NaN      NaN      NaN    
##                               0.310096         NaN      NaN      NaN    
##                              -0.069839    0.269104   -0.260    0.795    
##                              -0.069763         NaN      NaN      NaN    
##                               0.545430         NaN      NaN      NaN    
##                              -0.100864         NaN      NaN      NaN    
##                              -0.731413    0.511979   -1.429    0.153    
##                              -0.437942         NaN      NaN      NaN    
##                              -0.235484         NaN      NaN      NaN    
##                              -0.174414    0.191972   -0.909    0.364    
##                              -0.736268         NaN      NaN      NaN    
##                              -0.303477         NaN      NaN      NaN    
##                              -0.104366         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  25.1304 6.386764 6.615097 3.172541 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]     [,2]   [,3]   [,4]
## [1,]  0.161 -0.00489 0.0762 -0.637
## [2,] -0.206  0.22598 0.2426 -0.848
## [3,] -0.247  0.72868 0.6799  0.252
## [4,] -0.113  0.54445 0.1918  0.411
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]    [,3]   [,4]
## [1,] -0.207 0.0844 -0.0689 -0.529
## [2,] -0.310 0.0698  0.0698 -0.545
## [3,]  0.101 0.7314  0.4379  0.235
## [4,]  0.174 0.7363  0.3035  0.104
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  302.9793  123.6563 -134.3262 -121.6444
## [2,]  123.6563  221.3830 -116.9515 -117.8497
## [3,] -134.3262 -116.9515  319.3594  172.6657
## [4,] -121.6444 -117.8497  172.6657  212.1203
## ---- 
## aic=  21.94613 
## bic=  23.1025 
## Number of parameters:  36 
## initial estimates:  16.5274 -0.0975 -0.4133 -2.8472 0.0468 0.0221 -0.1219 0.0332 0.0303 0.1059 -0.0127 0.0313 0.0721 -0.1531 0.2516 0.1464 0.1823 0.3484 0.039 0.543 0.429 -0.1743 0.2518 0.4113 0.2751 -0.0967 -0.108 -0.1781 0.6387 0.0397 -0.1032 -0.324 -3e-04 -0.8987 -0.2303 0.0494 
## Par. lower-bounds:  11.5308 -6.1529 -8.3997 -11.3176 -0.2357 -0.2727 -0.2993 -0.1022 -0.3121 -0.2514 -0.2277 -0.1329 -0.3794 -0.6243 -0.0319 -0.0701 -0.2966 -0.1513 -0.2616 0.3134 -0.2064 -0.6512 -0.1749 0.0204 -0.495 -0.6747 -0.6251 -0.6517 -0.3769 -0.7226 -0.7852 -0.9487 -1.0774 -1.7072 -0.9537 -0.6132 
## Par. upper-bounds:  21.5241 5.9578 7.5732 5.6232 0.3293 0.3169 0.0554 0.1686 0.3726 0.4631 0.2022 0.1954 0.5237 0.3181 0.5351 0.3628 0.6612 0.8482 0.3397 0.7725 1.0644 0.3027 0.6785 0.8021 1.0451 0.4813 0.4091 0.2956 1.6544 0.802 0.5788 0.3007 1.0769 -0.0901 0.493 0.712 
## Final   Estimates:  12.30086 -6.152889 -7.130547 -11.0833 0.2877215 -0.2726964 -0.009535779 -0.0560553 0.3580378 -0.2514395 0.2021826 0.000164309 0.4489037 -0.6243192 -0.03189896 0.1544729 0.6611814 0.8482347 0.1981941 0.4882599 -0.03629263 0.2060714 -0.1748746 0.292098 -0.3021283 0.4167099 -0.4283991 0.09402231 -0.376892 0.7428237 0.4497197 -0.01717057 -0.7618349 -1.14074 -0.1395896 0.1064743
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           1.230e+01         NaN      NaN      NaN    
## loneliness_state_pmc         -6.153e+00         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -7.131e+00         NaN      NaN      NaN    
## responsiveness_state_pmc     -1.108e+01         NaN      NaN      NaN    
## depressedmood_state           2.877e-01         NaN      NaN      NaN    
## loneliness_state_pmc         -2.727e-01         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -9.536e-03         NaN      NaN      NaN    
## responsiveness_state_pmc     -5.606e-02   6.848e-02   -0.819 0.413057    
## depressedmood_state           3.580e-01         NaN      NaN      NaN    
## loneliness_state_pmc         -2.514e-01   2.011e-01   -1.250 0.211244    
## socintsatisfaction_state_pmc  2.022e-01         NaN      NaN      NaN    
## responsiveness_state_pmc      1.643e-04         NaN      NaN      NaN    
## depressedmood_state           4.489e-01         NaN      NaN      NaN    
## loneliness_state_pmc         -6.243e-01         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -3.190e-02         NaN      NaN      NaN    
## responsiveness_state_pmc      1.545e-01   1.481e-01    1.043 0.297069    
## depressedmood_state           6.612e-01         NaN      NaN      NaN    
## loneliness_state_pmc          8.482e-01         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  1.982e-01         NaN      NaN      NaN    
## responsiveness_state_pmc      4.883e-01   1.479e-01    3.302 0.000961 ***
##                              -3.629e-02         NaN      NaN      NaN    
##                               2.061e-01         NaN      NaN      NaN    
##                              -1.749e-01         NaN      NaN      NaN    
##                               2.921e-01   6.561e-02    4.452 8.51e-06 ***
##                              -3.021e-01         NaN      NaN      NaN    
##                               4.167e-01   1.248e-01    3.338 0.000845 ***
##                              -4.284e-01   6.460e-02   -6.632 3.32e-11 ***
##                               9.402e-02         NaN      NaN      NaN    
##                              -3.769e-01         NaN      NaN      NaN    
##                               7.428e-01         NaN      NaN      NaN    
##                               4.497e-01         NaN      NaN      NaN    
##                              -1.717e-02         NaN      NaN      NaN    
##                              -7.618e-01         NaN      NaN      NaN    
##                              -1.141e+00         NaN      NaN      NaN    
##                              -1.396e-01         NaN      NaN      NaN    
##                               1.065e-01   1.610e-01    0.661 0.508458    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  12.30086 -6.152889 -7.130547 -11.0833 
## AR coefficient matrix 
## AR( 1 )-matrix 
##       [,1]   [,2]     [,3]      [,4]
## [1,] 0.288 -0.273 -0.00954 -0.056055
## [2,] 0.358 -0.251  0.20218  0.000164
## [3,] 0.449 -0.624 -0.03190  0.154473
## [4,] 0.661  0.848  0.19819  0.488260
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]   [,3]    [,4]
## [1,] 0.0363 -0.206  0.175 -0.2921
## [2,] 0.3021 -0.417  0.428 -0.0940
## [3,] 0.3769 -0.743 -0.450  0.0172
## [4,] 0.7618  1.141  0.140 -0.1065
##   
## Residuals cov-matrix: 
##           [,1]        [,2]        [,3]      [,4]
## [1,] 33.486728  4.29451419  7.33289223 -8.599458
## [2,]  4.294514 35.92623149  0.07244054  5.311559
## [3,]  7.332892  0.07244054 63.49269049  8.588652
## [4,] -8.599458  5.31155931  8.58865201 45.270845
## ---- 
## aic=  15.92141 
## bic=  17.07778 
## Number of parameters:  36 
## initial estimates:  12.9409 -1.5665 6.258 8.4416 0.3837 -0.1444 -0.0277 -0.1363 0.0733 0.3785 0.0412 -0.1337 -0.371 0.2054 0.3498 -0.1339 -0.3855 0.2054 0.156 0.2607 -0.3655 0.0539 -0.1794 0.2469 -0.1256 -0.5921 -0.7073 0.4259 0.0147 0.3544 0.3642 0.1978 1.2918 -0.789 -0.2692 0.4321 
## Par. lower-bounds:  5.0297 -9.6328 -4.9977 -0.1673 0.0357 -0.5046 -0.3125 -0.4502 -0.2814 0.0111 -0.2493 -0.4538 -0.8661 -0.3072 -0.0556 -0.5805 -0.7642 -0.1866 -0.154 -0.0809 -1.2606 -0.7231 -0.8797 -0.609 -1.0383 -1.3842 -1.4214 -0.4468 -1.2588 -0.751 -0.6323 -1.0199 0.3177 -1.6344 -1.0313 -0.4994 
## Par. upper-bounds:  20.852 6.4999 17.5136 17.0506 0.7316 0.2159 0.2572 0.1776 0.4281 0.7458 0.3317 0.1863 0.124 0.7179 0.7551 0.3127 -0.0069 0.5975 0.466 0.6023 0.5296 0.8308 0.521 1.1028 0.7871 0.2001 0.0068 1.2986 1.2882 1.4598 1.3606 1.4156 2.2659 0.0565 0.493 1.3635 
## Final   Estimates:  13.04709 -1.663771 6.25613 8.411056 0.436612 -0.4230798 0.03903802 -0.3468857 0.1275042 0.6673138 0.2886393 0.02987866 -0.3872189 0.3941306 0.09566528 -0.4734166 -0.4344939 0.4372372 -0.154015 0.3367401 -0.2817938 0.4984235 -0.1028969 0.2882837 0.07488258 -0.773874 -0.478204 -0.3404468 0.3256539 -0.3251628 0.3596194 0.6925741 0.7134507 -0.7636488 0.3399019 -0.02049298
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error    t value Pr(>|t|)    
## depressedmood_state           1.305e+01   1.168e-04 111656.818  < 2e-16 ***
## loneliness_state_pmc         -1.664e+00   2.310e-04  -7203.822  < 2e-16 ***
## socintsatisfaction_state_pmc  6.256e+00   2.779e-04  22512.065  < 2e-16 ***
## responsiveness_state_pmc      8.411e+00   1.969e-04  42710.606  < 2e-16 ***
## depressedmood_state           4.366e-01   5.926e-06  73676.471  < 2e-16 ***
## loneliness_state_pmc         -4.231e-01   5.464e-03    -77.436  < 2e-16 ***
## socintsatisfaction_state_pmc  3.904e-02   2.128e-02      1.834 0.066618 .  
## responsiveness_state_pmc     -3.469e-01   1.014e-02    -34.214  < 2e-16 ***
## depressedmood_state           1.275e-01   5.462e-06  23345.309  < 2e-16 ***
## loneliness_state_pmc          6.673e-01   1.753e-05  38060.114  < 2e-16 ***
## socintsatisfaction_state_pmc  2.886e-01   6.575e-05   4389.721  < 2e-16 ***
## responsiveness_state_pmc      2.988e-02   2.268e-02      1.317 0.187685    
## depressedmood_state          -3.872e-01   5.214e-05  -7427.004  < 2e-16 ***
## loneliness_state_pmc          3.941e-01   9.976e-02      3.951 7.79e-05 ***
## socintsatisfaction_state_pmc  9.567e-02   9.078e-03     10.538  < 2e-16 ***
## responsiveness_state_pmc     -4.734e-01   1.274e-01     -3.715 0.000203 ***
## depressedmood_state          -4.345e-01   1.456e-05 -29849.179  < 2e-16 ***
## loneliness_state_pmc          4.372e-01   4.055e-01      1.078 0.280909    
## socintsatisfaction_state_pmc -1.540e-01   1.434e-01     -1.074 0.282920    
## responsiveness_state_pmc      3.367e-01   3.224e-02     10.443  < 2e-16 ***
##                              -2.818e-01   3.595e-03    -78.385  < 2e-16 ***
##                               4.984e-01   3.217e-01      1.549 0.121336    
##                              -1.029e-01   6.098e-03    -16.874  < 2e-16 ***
##                               2.883e-01         NaN        NaN      NaN    
##                               7.488e-02   1.625e-02      4.609 4.04e-06 ***
##                              -7.739e-01   8.009e-03    -96.624  < 2e-16 ***
##                              -4.782e-01   1.950e-05 -24522.648  < 2e-16 ***
##                              -3.404e-01   5.770e-06 -59007.445  < 2e-16 ***
##                               3.257e-01   9.348e-02      3.484 0.000494 ***
##                              -3.252e-01   3.459e-01     -0.940 0.347232    
##                               3.596e-01   8.965e-04    401.153  < 2e-16 ***
##                               6.926e-01   5.241e-03    132.134  < 2e-16 ***
##                               7.135e-01   9.686e-05   7365.755  < 2e-16 ***
##                              -7.636e-01   6.680e-01     -1.143 0.252978    
##                               3.399e-01   1.348e-03    252.061  < 2e-16 ***
##                              -2.049e-02   2.563e-02     -0.800 0.423922    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  13.04709 -1.663771 6.25613 8.411056 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]    [,3]    [,4]
## [1,]  0.437 -0.423  0.0390 -0.3469
## [2,]  0.128  0.667  0.2886  0.0299
## [3,] -0.387  0.394  0.0957 -0.4734
## [4,] -0.434  0.437 -0.1540  0.3367
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,]  0.2818 -0.498  0.103 -0.2883
## [2,] -0.0749  0.774  0.478  0.3404
## [3,] -0.3257  0.325 -0.360 -0.6926
## [4,] -0.7135  0.764 -0.340  0.0205
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 109.58394  82.24991 -35.77800 -30.78788
## [2,]  82.24991 150.47143 -89.88985 -58.24375
## [3,] -35.77800 -89.88985 221.81236 112.56208
## [4,] -30.78788 -58.24375 112.56208 143.64438
## ---- 
## aic=  19.75827 
## bic=  20.91464 
## Number of parameters:  36 
## initial estimates:  27.3914 -25.506 16.343 6.8951 0.6073 -0.156 -0.0526 -0.1421 0.3772 0.192 -0.0267 0.0693 -0.2354 0.634 0.52 0.3101 -0.1361 -0.141 0.1936 0.1576 -0.6387 0.9229 0.0755 -0.2503 -0.7507 -0.0925 -0.165 0.0587 0.5382 -1.087 0.1148 -0.3546 0.1775 -0.3659 -0.3943 0.1462 
## Par. lower-bounds:  5.0064 -51.0232 -28.7005 -19.9242 0.2853 -0.5189 -0.1961 -0.4272 0.0102 -0.2217 -0.1903 -0.2557 -0.8832 -0.0963 0.2312 -0.2636 -0.5218 -0.5758 0.0217 -0.184 -1.226 0.2071 -0.3656 -0.9825 -1.4201 -0.9084 -0.6678 -0.776 -0.6436 -2.5273 -0.7728 -1.828 -0.5262 -1.2235 -0.9228 -0.7311 
## Par. upper-bounds:  49.7763 0.0112 61.3865 33.7145 0.9292 0.2069 0.0909 0.143 0.7442 0.6057 0.1369 0.3943 0.4125 1.3642 0.8088 0.8838 0.2496 0.2938 0.3656 0.4992 -0.0513 1.6387 0.5166 0.482 -0.0812 0.7235 0.3378 0.8934 1.72 0.3533 1.0024 1.1188 0.8811 0.4917 0.1342 1.0235 
## Final   Estimates:  27.03606 -25.41289 16.74428 7.131213 0.5884157 -0.5189313 -0.1015882 -0.4272114 0.3946043 0.1761845 -0.0105321 0.1573481 -0.2896019 1.031385 0.6479645 -0.2635547 -0.1411633 -0.5704098 0.3655753 -0.1839559 -0.5569871 0.8575339 0.2107457 0.317003 -0.7428975 0.266718 -0.0993434 0.1088757 0.2326824 -0.9293174 -0.2696737 0.9081583 0.1761147 0.4916824 -0.3624842 0.4780917 
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           27.03606    11.07271    2.442 0.014619 *  
## loneliness_state_pmc         -25.41289     9.30764   -2.730 0.006327 ** 
## socintsatisfaction_state_pmc  16.74428    19.39561    0.863 0.387971    
## responsiveness_state_pmc       7.13121    31.02171    0.230 0.818186    
## depressedmood_state            0.58842     0.17510    3.360 0.000778 ***
## loneliness_state_pmc          -0.51893     0.21462   -2.418 0.015610 *  
## socintsatisfaction_state_pmc  -0.10159     0.14165   -0.717 0.473269    
## responsiveness_state_pmc      -0.42721     0.49693   -0.860 0.389956    
## depressedmood_state            0.39460     0.13578    2.906 0.003658 ** 
## loneliness_state_pmc           0.17618     0.33489    0.526 0.598822    
## socintsatisfaction_state_pmc  -0.01053     0.10266   -0.103 0.918284    
## responsiveness_state_pmc       0.15735     0.15845    0.993 0.320677    
## depressedmood_state           -0.28960     0.29907   -0.968 0.332874    
## loneliness_state_pmc           1.03139     0.57535    1.793 0.073034 .  
## socintsatisfaction_state_pmc   0.64796     0.39629    1.635 0.102032    
## responsiveness_state_pmc      -0.26355     0.46071   -0.572 0.567282    
## depressedmood_state           -0.14116     0.46663   -0.303 0.762260    
## loneliness_state_pmc          -0.57041     0.36799   -1.550 0.121128    
## socintsatisfaction_state_pmc   0.36558     0.18032    2.027 0.042621 *  
## responsiveness_state_pmc      -0.18396     0.25231   -0.729 0.465945    
##                               -0.55699     0.20645   -2.698 0.006976 ** 
##                                0.85753     0.24874    3.448 0.000566 ***
##                                0.21075     0.20116    1.048 0.294807    
##                                0.31700     0.55821    0.568 0.570105    
##                               -0.74290     0.17865   -4.158  3.2e-05 ***
##                                0.26672     0.39033    0.683 0.494405    
##                               -0.09934     0.08649   -1.149 0.250738    
##                                0.10888     0.13856    0.786 0.432010    
##                                0.23268     0.50719    0.459 0.646398    
##                               -0.92932     0.47617   -1.952 0.050981 .  
##                               -0.26967     0.51377   -0.525 0.599660    
##                                0.90816     0.52251    1.738 0.082201 .  
##                                0.17611     0.26587    0.662 0.507715    
##                                0.49168     0.22722    2.164 0.030471 *  
##                               -0.36248     0.12900   -2.810 0.004955 ** 
##                                0.47809     0.27405    1.745 0.081060 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  27.03606 -25.41289 16.74428 7.131213 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]    [,3]   [,4]
## [1,]  0.588 -0.519 -0.1016 -0.427
## [2,]  0.395  0.176 -0.0105  0.157
## [3,] -0.290  1.031  0.6480 -0.264
## [4,] -0.141 -0.570  0.3656 -0.184
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]    [,3]   [,4]
## [1,]  0.557 -0.858 -0.2107 -0.317
## [2,]  0.743 -0.267  0.0993 -0.109
## [3,] -0.233  0.929  0.2697 -0.908
## [4,] -0.176 -0.492  0.3625 -0.478
##   
## Residuals cov-matrix: 
##           [,1]       [,2]       [,3]      [,4]
## [1,] 139.24737   54.30125  -33.88379 -18.42285
## [2,]  54.30125  149.36681 -100.15468 -58.63706
## [3,] -33.88379 -100.15468  430.06797 132.22021
## [4,] -18.42285  -58.63706  132.22021 135.71711
## ---- 
## aic=  21.19957 
## bic=  22.35594 
## Number of parameters:  36 
## initial estimates:  7.1809 2.4792 0.465 -0.9446 -0.1553 0.1251 -0.083 -0.0359 -0.3233 0.5077 -0.1435 -0.1752 -0.0824 -0.0045 0.1214 0.0676 0.1945 -0.1891 -0.0713 0.4596 0.2759 -0.4038 -0.0147 -0.1649 0.2107 -0.5415 -0.0746 0.1922 -0.222 0.021 -0.1923 -0.2633 0.0453 0.3047 0.358 -0.7237 
## Par. lower-bounds:  4.299 -2.0373 -3.9724 -4.2654 -0.5266 -0.0857 -0.2837 -0.3117 -0.9052 0.1774 -0.4581 -0.6075 -0.6541 -0.3291 -0.1876 -0.3571 -0.2333 -0.432 -0.3026 0.1418 -0.3864 -0.8669 -0.3992 -0.725 -0.8273 -1.2673 -0.6772 -0.6855 -1.2418 -0.6921 -0.7843 -1.1257 -0.7179 -0.2289 -0.085 -1.369 
## Par. upper-bounds:  10.0628 6.9958 4.9024 2.3762 0.216 0.3359 0.1177 0.24 0.2587 0.8381 0.171 0.2571 0.4893 0.32 0.4304 0.4923 0.6224 0.0538 0.16 0.7774 0.9382 0.0594 0.3698 0.3951 1.2486 0.1843 0.5279 1.07 0.7978 0.7341 0.3997 0.599 0.8084 0.8383 0.801 -0.0783 
## Final   Estimates:  7.147136 2.425318 0.4446753 -0.9542727 -0.1829995 0.3352146 -0.04414155 -0.02537872 -0.450507 0.8339693 -0.3846141 -0.3073367 -0.07239962 0.02028882 0.275912 0.2106612 0.1232821 -0.06951446 -0.1365368 0.7761779 0.00171684 -0.4874753 -0.2065879 0.07991474 0.04493926 -0.9363941 0.006180446 0.4149143 -0.3935375 -0.01388215 -0.4693304 0.1638302 0.2003059 0.06753618 0.2411002 -0.6009348
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error   t value Pr(>|t|)    
## depressedmood_state           7.1471361   1.8303436     3.905 9.43e-05 ***
## loneliness_state_pmc          2.4253180         NaN       NaN      NaN    
## socintsatisfaction_state_pmc  0.4446753   1.0613827     0.419  0.67525    
## responsiveness_state_pmc     -0.9542727   0.9381707    -1.017  0.30908    
## depressedmood_state          -0.1829995   0.3342693    -0.547  0.58406    
## loneliness_state_pmc          0.3352146   0.0778054     4.308 1.64e-05 ***
## socintsatisfaction_state_pmc -0.0441415   0.1582340    -0.279  0.78027    
## responsiveness_state_pmc     -0.0253787   0.2784394    -0.091  0.92738    
## depressedmood_state          -0.4505070         NaN       NaN      NaN    
## loneliness_state_pmc          0.8339693         NaN       NaN      NaN    
## socintsatisfaction_state_pmc -0.3846141   0.1044223    -3.683  0.00023 ***
## responsiveness_state_pmc     -0.3073367         NaN       NaN      NaN    
## depressedmood_state          -0.0723996   0.1282788    -0.564  0.57249    
## loneliness_state_pmc          0.0202888   0.1399161     0.145  0.88471    
## socintsatisfaction_state_pmc  0.2759120   0.0398037     6.932 4.15e-12 ***
## responsiveness_state_pmc      0.2106612   0.2265943     0.930  0.35253    
## depressedmood_state           0.1232821   0.1424213     0.866  0.38670    
## loneliness_state_pmc         -0.0695145   0.0319641    -2.175  0.02965 *  
## socintsatisfaction_state_pmc -0.1365368         NaN       NaN      NaN    
## responsiveness_state_pmc      0.7761779         NaN       NaN      NaN    
##                               0.0017168   0.2977887     0.006  0.99540    
##                              -0.4874753   0.0589365    -8.271 2.22e-16 ***
##                              -0.2065879   0.1468635    -1.407  0.15953    
##                               0.0799147   0.3068428     0.260  0.79452    
##                               0.0449393         NaN       NaN      NaN    
##                              -0.9363941   0.0006442 -1453.584  < 2e-16 ***
##                               0.0061804         NaN       NaN      NaN    
##                               0.4149143         NaN       NaN      NaN    
##                              -0.3935375   0.0503605    -7.814 5.55e-15 ***
##                              -0.0138822   0.1901891    -0.073  0.94181    
##                              -0.4693304         NaN       NaN      NaN    
##                               0.1638302   0.1597859     1.025  0.30522    
##                               0.2003059   0.2176895     0.920  0.35750    
##                               0.0675362   0.1105469     0.611  0.54125    
##                               0.2411002         NaN       NaN      NaN    
##                              -0.6009348         NaN       NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  7.147136 2.425318 0.4446753 -0.9542727 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]    [,3]    [,4]
## [1,] -0.1830  0.3352 -0.0441 -0.0254
## [2,] -0.4505  0.8340 -0.3846 -0.3073
## [3,] -0.0724  0.0203  0.2759  0.2107
## [4,]  0.1233 -0.0695 -0.1365  0.7762
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]    [,2]     [,3]    [,4]
## [1,] -0.00172  0.4875  0.20659 -0.0799
## [2,] -0.04494  0.9364 -0.00618 -0.4149
## [3,]  0.39354  0.0139  0.46933 -0.1638
## [4,] -0.20031 -0.0675 -0.24110  0.6009
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  39.73885  29.55196 -24.08104 -10.82752
## [2,]  29.55196 105.59142 -37.87661 -17.95429
## [3,] -24.08104 -37.87661 122.34815  51.94536
## [4,] -10.82752 -17.95429  51.94536  71.55658
## ---- 
## aic=  17.67297 
## bic=  18.82933 
## Number of parameters:  36 
## initial estimates:  19.4775 -3.8942 8.0935 -0.3984 0.5468 -0.145 -0.1014 0.3297 0.108 -0.0641 -0.1253 0.3352 -0.1776 0.2042 0.5385 -0.5188 -0.0113 -0.0472 0.0957 0.1138 -0.6827 0.5402 -0.0973 -0.1712 -0.0328 0.1014 0.2148 -0.1127 1.2563 -0.9176 -0.5771 1.1734 0.467 -0.3517 -0.0639 -0.3017 
## Par. lower-bounds:  6.1566 -13.0154 -8.8156 -11.2369 0.2387 -0.6789 -0.3373 -0.0772 -0.103 -0.4297 -0.2869 0.0566 -0.5688 -0.4734 0.239 -1.0353 -0.262 -0.4815 -0.0963 -0.2172 -1.5586 -0.5867 -0.5522 -0.9678 -0.6325 -0.6702 -0.0966 -0.6582 0.1445 -2.348 -1.1545 0.1622 -0.2457 -1.2686 -0.434 -0.9499 
## Par. upper-bounds:  32.7984 5.2271 25.0026 10.4401 0.855 0.3888 0.1345 0.7366 0.319 0.3014 0.0362 0.6138 0.2136 0.8818 0.838 -0.0024 0.2395 0.3872 0.2876 0.4449 0.1932 1.6672 0.3575 0.6254 0.5669 0.873 0.5263 0.4327 2.3681 0.5129 3e-04 2.1846 1.1796 0.5652 0.3062 0.3464 
## Final   Estimates:  19.46147 -3.900711 8.120813 -0.372218 0.5117917 -0.2016955 0.1306547 0.4286819 0.08173295 -0.2889524 -0.2868632 0.05679271 -0.1601414 0.8494821 0.2420419 -1.035221 0.006461253 -0.01842536 0.258841 0.1574093 -0.01122951 -0.02798504 -0.1577443 -0.4348842 0.1516208 0.1477083 0.4486751 5.798484e-05 0.5006015 -1.161558 -0.05600789 1.105446 0.3042661 -0.462874 -0.4298398 0.2627353
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           1.946e+01         NaN      NaN      NaN    
## loneliness_state_pmc         -3.901e+00         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  8.121e+00         NaN      NaN      NaN    
## responsiveness_state_pmc     -3.722e-01   3.575e+00   -0.104 0.917085    
## depressedmood_state           5.118e-01         NaN      NaN      NaN    
## loneliness_state_pmc         -2.017e-01         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  1.307e-01         NaN      NaN      NaN    
## responsiveness_state_pmc      4.287e-01         NaN      NaN      NaN    
## depressedmood_state           8.173e-02         NaN      NaN      NaN    
## loneliness_state_pmc         -2.890e-01   1.651e-01   -1.750 0.080041 .  
## socintsatisfaction_state_pmc -2.869e-01         NaN      NaN      NaN    
## responsiveness_state_pmc      5.679e-02   8.654e-02    0.656 0.511677    
## depressedmood_state          -1.601e-01         NaN      NaN      NaN    
## loneliness_state_pmc          8.495e-01   1.892e-01    4.489 7.17e-06 ***
## socintsatisfaction_state_pmc  2.420e-01   9.473e-02    2.555 0.010617 *  
## responsiveness_state_pmc     -1.035e+00   1.218e-01   -8.498  < 2e-16 ***
## depressedmood_state           6.461e-03   7.598e-02    0.085 0.932230    
## loneliness_state_pmc         -1.843e-02         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  2.588e-01   7.263e-02    3.564 0.000366 ***
## responsiveness_state_pmc      1.574e-01   8.064e-02    1.952 0.050943 .  
##                              -1.123e-02         NaN      NaN      NaN    
##                              -2.799e-02         NaN      NaN      NaN    
##                              -1.577e-01         NaN      NaN      NaN    
##                              -4.349e-01         NaN      NaN      NaN    
##                               1.516e-01         NaN      NaN      NaN    
##                               1.477e-01         NaN      NaN      NaN    
##                               4.487e-01         NaN      NaN      NaN    
##                               5.798e-05   2.051e-02    0.003 0.997744    
##                               5.006e-01         NaN      NaN      NaN    
##                              -1.162e+00         NaN      NaN      NaN    
##                              -5.601e-02   9.048e-02   -0.619 0.535917    
##                               1.105e+00   4.035e-02   27.398  < 2e-16 ***
##                               3.043e-01         NaN      NaN      NaN    
##                              -4.629e-01         NaN      NaN      NaN    
##                              -4.298e-01         NaN      NaN      NaN    
##                               2.627e-01   1.495e-02   17.570  < 2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  19.46147 -3.900711 8.120813 -0.372218 
## AR coefficient matrix 
## AR( 1 )-matrix 
##          [,1]    [,2]   [,3]    [,4]
## [1,]  0.51179 -0.2017  0.131  0.4287
## [2,]  0.08173 -0.2890 -0.287  0.0568
## [3,] -0.16014  0.8495  0.242 -1.0352
## [4,]  0.00646 -0.0184  0.259  0.1574
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]      [,4]
## [1,]  0.0112  0.028  0.158  0.434884
## [2,] -0.1516 -0.148 -0.449 -0.000058
## [3,] -0.5006  1.162  0.056 -1.105446
## [4,] -0.3043  0.463  0.430 -0.262735
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 182.60564  74.67149 -43.13901 -18.26865
## [2,]  74.67149  67.79577 -14.26637   2.39245
## [3,] -43.13901 -14.26637 206.20499  47.11211
## [4,] -18.26865   2.39245  47.11211 100.68566
## ---- 
## aic=  19.59954 
## bic=  20.75591 
## Number of parameters:  36 
## initial estimates:  22.9293 4.5084 -5.041 -2.5172 -0.1281 0.494 -0.1278 -0.0536 -0.1819 0.6231 -0.0204 0.0949 0.1975 -0.2046 -0.1159 0.2382 0.2196 -0.3968 -0.0222 0.1435 0.1495 -0.1553 0.2872 0.0276 0.2393 -1.0234 -0.5493 0.0751 -0.4148 -0.0245 0.1982 -0.0523 -1e-04 0.4337 0.7369 -0.1782 
## Par. lower-bounds:  15.4226 -3.7522 -14.7085 -12.8547 -0.4872 0.144 -0.4162 -0.3031 -0.5772 0.2379 -0.3378 -0.1798 -0.2651 -0.6555 -0.4873 -0.0833 -0.275 -0.8789 -0.4194 -0.2002 -0.5668 -0.9232 -0.5999 -0.7434 -0.549 -1.8684 -1.5255 -0.7734 -1.3373 -1.0134 -0.9443 -1.0452 -0.9865 -0.6237 -0.4848 -1.2399 
## Par. upper-bounds:  30.436 12.7689 4.6265 7.8203 0.2311 0.8441 0.1606 0.196 0.2133 1.0083 0.2969 0.3696 0.6601 0.2462 0.2555 0.5596 0.7142 0.0852 0.3749 0.4872 0.8658 0.6126 1.1744 0.7987 1.0275 -0.1784 0.4269 0.9235 0.5077 0.9644 1.3407 0.9407 0.9864 1.4912 1.9585 0.8836 
## Final   Estimates:  22.74003 4.583168 -5.171263 -2.390097 -0.1357729 0.8167219 -0.4161726 -0.3031473 -0.2522736 0.7667672 0.2808615 -0.1784267 0.3058707 -0.6554568 -0.4873312 -0.0832579 0.135572 -0.4227369 0.3749237 -0.1470469 0.2722007 -0.5703252 0.3593465 0.3258462 0.311321 -0.5610752 -0.4098428 0.272788 -0.6185113 0.8981004 0.4759826 0.2544774 -0.3122998 0.4578733 -0.434367 0.5218337
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           22.74003     7.97470    2.852  0.00435 ** 
## loneliness_state_pmc           4.58317    12.87495    0.356  0.72186    
## socintsatisfaction_state_pmc  -5.17126    10.47313   -0.494  0.62147    
## responsiveness_state_pmc      -2.39010     2.24245   -1.066  0.28650    
## depressedmood_state           -0.13577     0.42192   -0.322  0.74761    
## loneliness_state_pmc           0.81672     0.20147    4.054 5.04e-05 ***
## socintsatisfaction_state_pmc  -0.41617     0.51907   -0.802  0.42269    
## responsiveness_state_pmc      -0.30315     0.46724   -0.649  0.51646    
## depressedmood_state           -0.25227     0.63982   -0.394  0.69337    
## loneliness_state_pmc           0.76677     0.61449    1.248  0.21210    
## socintsatisfaction_state_pmc   0.28086     0.25042    1.122  0.26205    
## responsiveness_state_pmc      -0.17843     0.37107   -0.481  0.63063    
## depressedmood_state            0.30587     0.48047    0.637  0.52438    
## loneliness_state_pmc          -0.65546     0.62779   -1.044  0.29645    
## socintsatisfaction_state_pmc  -0.48733     0.26957   -1.808  0.07064 .  
## responsiveness_state_pmc      -0.08326     0.14356   -0.580  0.56196    
## depressedmood_state            0.13557         NaN      NaN      NaN    
## loneliness_state_pmc          -0.42274     0.81191   -0.521  0.60260    
## socintsatisfaction_state_pmc   0.37492     0.47040    0.797  0.42544    
## responsiveness_state_pmc      -0.14705         NaN      NaN      NaN    
##                                0.27220     0.44472    0.612  0.54049    
##                               -0.57033         NaN      NaN      NaN    
##                                0.35935     0.45862    0.784  0.43331    
##                                0.32585     0.48550    0.671  0.50212    
##                                0.31132     0.57892    0.538  0.59074    
##                               -0.56108     0.55770   -1.006  0.31439    
##                               -0.40984     0.07357   -5.571 2.53e-08 ***
##                                0.27279     0.41330    0.660  0.50924    
##                               -0.61851     0.46954   -1.317  0.18775    
##                                0.89810     0.62012    1.448  0.14754    
##                                0.47598     0.27157    1.753  0.07965 .  
##                                0.25448         NaN      NaN      NaN    
##                               -0.31230     0.49695   -0.628  0.52972    
##                                0.45787     0.81991    0.558  0.57654    
##                               -0.43437     0.40068   -1.084  0.27833    
##                                0.52183         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  22.74003 4.583168 -5.171263 -2.390097 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]   [,3]    [,4]
## [1,] -0.136  0.817 -0.416 -0.3031
## [2,] -0.252  0.767  0.281 -0.1784
## [3,]  0.306 -0.655 -0.487 -0.0833
## [4,]  0.136 -0.423  0.375 -0.1470
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]   [,3]   [,4]
## [1,] -0.272  0.570 -0.359 -0.326
## [2,] -0.311  0.561  0.410 -0.273
## [3,]  0.619 -0.898 -0.476 -0.254
## [4,]  0.312 -0.458  0.434 -0.522
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 115.04772  68.21645 -80.40646 -19.46186
## [2,]  68.21645 145.14598 -96.84398 -88.38875
## [3,] -80.40646 -96.84398 226.33669 129.97707
## [4,] -19.46186 -88.38875 129.97707 243.33953
## ---- 
## aic=  20.35603 
## bic=  21.5124 
## Number of parameters:  36 
## initial estimates:  13.7657 -3.5982 4.8679 4.3046 0.4606 -0.1452 -0.1507 -0.1935 0.1636 0.2239 -0.0686 -0.1538 -0.1857 -0.2406 0.3484 0.099 -0.1752 0.0272 0.2101 0.1053 -0.3156 -0.2732 0.5189 -0.6858 -0.927 -0.654 -0.9025 0.7132 -0.2182 0.6122 -0.0839 0.056 0.0998 -0.0188 -0.2764 0.0323 
## Par. lower-bounds:  5.7931 -11.6056 -4.3385 -2.1275 0.1685 -0.5065 -0.4515 -0.6461 -0.1298 -0.139 -0.3708 -0.6084 -0.5231 -0.6578 0.001 -0.4236 -0.4109 -0.2643 -0.0327 -0.2598 -1.0634 -0.7916 -0.2634 -1.5997 -1.6782 -1.1747 -1.6882 -0.2047 -1.0819 0.0136 -0.9872 -0.9993 -0.5036 -0.4371 -0.9075 -0.705 
## Par. upper-bounds:  21.7383 4.4092 14.0743 10.7367 0.7528 0.2161 0.1502 0.2592 0.457 0.5868 0.2336 0.3008 0.1516 0.1766 0.6958 0.6217 0.0605 0.3187 0.4528 0.4705 0.4323 0.2452 1.3012 0.2281 -0.1759 -0.1334 -0.1168 1.6311 0.6454 1.2109 0.8194 1.1114 0.7032 0.3994 0.3548 0.7696 
## Final   Estimates:  13.72017 -4.010874 4.559161 4.730106 0.4654855 0.1829754 0.01764628 -0.6136441 0.1331904 0.5857164 0.2335675 -0.4529805 -0.1346923 -0.08533006 0.4395924 -0.3241076 -0.1568557 0.3186837 0.05227894 0.4670116 -0.2899563 -0.4724988 -0.07899526 0.2281255 -0.1916822 -0.7452085 -0.5884497 0.1073442 -0.03417389 0.01677856 0.1516148 0.6550225 -0.1054144 -0.4370657 0.2260187 -0.6735285
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           13.72017         NaN      NaN      NaN    
## loneliness_state_pmc          -4.01087         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   4.55916         NaN      NaN      NaN    
## responsiveness_state_pmc       4.73011     3.85700    1.226  0.22006    
## depressedmood_state            0.46549         NaN      NaN      NaN    
## loneliness_state_pmc           0.18298         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.01765         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.61364         NaN      NaN      NaN    
## depressedmood_state            0.13319         NaN      NaN      NaN    
## loneliness_state_pmc           0.58572         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.23357     0.07970    2.931  0.00338 ** 
## responsiveness_state_pmc      -0.45298         NaN      NaN      NaN    
## depressedmood_state           -0.13469         NaN      NaN      NaN    
## loneliness_state_pmc          -0.08533         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.43959     0.13736    3.200  0.00137 ** 
## responsiveness_state_pmc      -0.32411         NaN      NaN      NaN    
## depressedmood_state           -0.15686     0.11279   -1.391  0.16433    
## loneliness_state_pmc           0.31868         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.05228         NaN      NaN      NaN    
## responsiveness_state_pmc       0.46701     0.07987    5.847 5.01e-09 ***
##                               -0.28996         NaN      NaN      NaN    
##                               -0.47250         NaN      NaN      NaN    
##                               -0.07900         NaN      NaN      NaN    
##                                0.22813         NaN      NaN      NaN    
##                               -0.19168         NaN      NaN      NaN    
##                               -0.74521     0.12436   -5.992 2.07e-09 ***
##                               -0.58845     0.09781   -6.016 1.79e-09 ***
##                                0.10734         NaN      NaN      NaN    
##                               -0.03417         NaN      NaN      NaN    
##                                0.01678         NaN      NaN      NaN    
##                                0.15161     0.15345    0.988  0.32314    
##                                0.65502         NaN      NaN      NaN    
##                               -0.10541         NaN      NaN      NaN    
##                               -0.43707         NaN      NaN      NaN    
##                                0.22602         NaN      NaN      NaN    
##                               -0.67353         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  13.72017 -4.010874 4.559161 4.730106 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]   [,3]   [,4]
## [1,]  0.465  0.1830 0.0176 -0.614
## [2,]  0.133  0.5857 0.2336 -0.453
## [3,] -0.135 -0.0853 0.4396 -0.324
## [4,] -0.157  0.3187 0.0523  0.467
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]    [,2]   [,3]   [,4]
## [1,] 0.2900  0.4725  0.079 -0.228
## [2,] 0.1917  0.7452  0.588 -0.107
## [3,] 0.0342 -0.0168 -0.152 -0.655
## [4,] 0.1054  0.4371 -0.226  0.674
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 109.28495  46.94969 -43.68835 -25.08870
## [2,]  46.94969 124.24865 -43.56833 -14.93996
## [3,] -43.68835 -43.56833 135.30848  45.89899
## [4,] -25.08870 -14.93996  45.89899  67.36897
## ---- 
## aic=  19.00905 
## bic=  20.16542 
## Number of parameters:  36 
## initial estimates:  21.2351 0.3121 -11.2721 -3.3039 0.3276 0.4261 0.3891 -0.2032 0.0384 0.3896 0.2414 -0.0968 0.2782 0.0839 0.4046 0.0212 0.0438 0.1735 -0.2916 0.733 -0.6214 -0.3473 -0.4088 0.298 -0.1138 -0.122 -0.3484 -0.076 -0.0919 -0.0383 -0.4541 0.3914 -0.0464 -0.4882 -0.296 -0.0445 
## Par. lower-bounds:  10.9756 -6.1722 -18.8912 -8.5093 0.0026 -0.1031 0.0584 -0.5773 -0.167 0.0551 0.0324 -0.3332 0.0369 -0.3091 0.1591 -0.2566 -0.1211 -0.095 -0.4594 0.5431 -1.5125 -1.57 -1.2586 -0.8098 -0.677 -0.8948 -0.8855 -0.7762 -0.7537 -0.9463 -1.0852 -0.4314 -0.4985 -1.1085 -0.7272 -0.6066 
## Par. upper-bounds:  31.4947 6.7965 -3.6529 1.9015 0.6526 0.9554 0.7198 0.1709 0.2438 0.7241 0.4504 0.1397 0.5195 0.4769 0.6502 0.2991 0.2086 0.442 -0.1239 0.9228 0.2697 0.8754 0.441 1.4059 0.4494 0.6508 0.1887 0.6242 0.5699 0.8698 0.177 1.2141 0.4058 0.1322 0.1352 0.5176 
## Final   Estimates:  15.03408 -3.825157 -8.880416 -2.70221 0.4792986 0.9553562 0.0583906 -0.08757846 0.1550963 0.7240888 0.03240001 -0.07380051 0.2840418 -0.3091345 0.6502292 0.1422712 0.07341363 0.02552209 -0.1238546 0.7558843 -0.4112169 -0.8930917 -0.08692115 -0.1557827 -0.2057019 -0.6564009 -0.07018758 0.0107175 -0.1016332 0.5507767 0.03738888 -0.06037181 -0.1098819 0.1322115 -0.05718348 0.1432699
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           15.03408         NaN      NaN      NaN    
## loneliness_state_pmc          -3.82516         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -8.88042         NaN      NaN      NaN    
## responsiveness_state_pmc      -2.70221         NaN      NaN      NaN    
## depressedmood_state            0.47930         NaN      NaN      NaN    
## loneliness_state_pmc           0.95536         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.05839     0.08398    0.695 0.486869    
## responsiveness_state_pmc      -0.08758     0.07672   -1.142 0.253625    
## depressedmood_state            0.15510         NaN      NaN      NaN    
## loneliness_state_pmc           0.72409         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.03240         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.07380     0.02034   -3.628 0.000286 ***
## depressedmood_state            0.28404         NaN      NaN      NaN    
## loneliness_state_pmc          -0.30913         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.65023     0.10832    6.003 1.94e-09 ***
## responsiveness_state_pmc       0.14227         NaN      NaN      NaN    
## depressedmood_state            0.07341         NaN      NaN      NaN    
## loneliness_state_pmc           0.02552         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.12385     0.04464   -2.775 0.005529 ** 
## responsiveness_state_pmc       0.75588     0.13405    5.639 1.71e-08 ***
##                               -0.41122         NaN      NaN      NaN    
##                               -0.89309         NaN      NaN      NaN    
##                               -0.08692         NaN      NaN      NaN    
##                               -0.15578         NaN      NaN      NaN    
##                               -0.20570         NaN      NaN      NaN    
##                               -0.65640         NaN      NaN      NaN    
##                               -0.07019         NaN      NaN      NaN    
##                                0.01072         NaN      NaN      NaN    
##                               -0.10163         NaN      NaN      NaN    
##                                0.55078         NaN      NaN      NaN    
##                                0.03739     0.19178    0.195 0.845425    
##                               -0.06037         NaN      NaN      NaN    
##                               -0.10988         NaN      NaN      NaN    
##                                0.13221         NaN      NaN      NaN    
##                               -0.05718     0.11557   -0.495 0.620741    
##                                0.14327     0.14649    0.978 0.328063    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  15.03408 -3.825157 -8.880416 -2.70221 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]    [,3]    [,4]
## [1,] 0.4793  0.9554  0.0584 -0.0876
## [2,] 0.1551  0.7241  0.0324 -0.0738
## [3,] 0.2840 -0.3091  0.6502  0.1423
## [4,] 0.0734  0.0255 -0.1239  0.7559
## MA coefficient matrix 
## MA( 1 )-matrix 
##       [,1]   [,2]    [,3]    [,4]
## [1,] 0.411  0.893  0.0869  0.1558
## [2,] 0.206  0.656  0.0702 -0.0107
## [3,] 0.102 -0.551 -0.0374  0.0604
## [4,] 0.110 -0.132  0.0572 -0.1433
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]       [,4]
## [1,] 124.19411 38.146050  11.72782 -12.132161
## [2,]  38.14605 60.047829   4.33806   4.790522
## [3,]  11.72782  4.338060 104.39317  46.555032
## [4,] -12.13216  4.790522  46.55503  52.209053
## ---- 
## aic=  17.68409 
## bic=  18.84046 
## Number of parameters:  36 
## initial estimates:  22.3987 -3.0927 15.0594 11.8254 0.5513 -0.3326 0.2138 -0.6396 0.0568 0.26 0.1072 -0.3692 -0.2645 0.1086 0.0128 0.2621 -0.2118 0.2375 -0.2596 0.5503 -0.8583 0.6235 -0.2399 -0.0055 -0.0276 -0.7288 -0.0729 -0.0058 0.1596 0.1865 0.3318 -0.3432 0.1625 0.5045 0.6357 -0.2328 
## Par. lower-bounds:  3.5341 -14.8523 -3.7123 -0.6181 0.1937 -0.964 -0.1463 -1.1386 -0.1662 -0.1336 -0.1173 -0.6803 -0.6204 -0.5197 -0.3456 -0.2344 -0.4477 -0.179 -0.4972 0.2212 -1.6352 -0.4617 -0.9464 -0.9222 -0.5119 -1.4053 -0.5133 -0.5772 -0.6134 -0.8934 -0.3711 -1.2553 -0.35 -0.2113 0.1697 -0.8375 
## Par. upper-bounds:  41.2633 8.667 33.8311 24.2689 0.9089 0.2988 0.574 -0.1406 0.2797 0.6536 0.3317 -0.0582 0.0913 0.7369 0.3712 0.7587 0.024 0.6539 -0.022 0.8795 -0.0814 1.7087 0.4665 0.9111 0.4567 -0.0523 0.3675 0.5656 0.9327 1.2663 1.0348 0.569 0.675 1.2204 1.1017 0.3718 
## Final   Estimates:  22.3245 -2.982499 15.06105 11.83416 0.5266776 -0.5864384 0.2187813 -0.7570033 0.03084824 0.5906643 0.3274364 -0.05815376 -0.2716253 -0.009454725 -0.2105459 0.534548 -0.1935108 -0.02548367 -0.4971866 0.5350439 -0.4594655 0.9057653 -0.06933643 -0.02474894 0.2093053 -0.7510069 -0.3418906 -0.2814277 0.2202161 0.1065602 0.2956767 -0.2025002 0.1027666 0.2073542 0.448117 0.01284433
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          22.324496    4.288003    5.206 1.93e-07 ***
## loneliness_state_pmc         -2.982499    3.938121   -0.757  0.44885    
## socintsatisfaction_state_pmc 15.061052   10.226811    1.473  0.14083    
## responsiveness_state_pmc     11.834161    7.697008    1.538  0.12417    
## depressedmood_state           0.526678    0.118337    4.451 8.56e-06 ***
## loneliness_state_pmc         -0.586438    0.476536   -1.231  0.21846    
## socintsatisfaction_state_pmc  0.218781    0.599909    0.365  0.71534    
## responsiveness_state_pmc     -0.757003    0.432230   -1.751  0.07988 .  
## depressedmood_state           0.030848    0.087968    0.351  0.72583    
## loneliness_state_pmc          0.590664    0.351522    1.680  0.09290 .  
## socintsatisfaction_state_pmc  0.327436    0.292664    1.119  0.26322    
## responsiveness_state_pmc     -0.058154    0.354973   -0.164  0.86987    
## depressedmood_state          -0.271625    0.177067   -1.534  0.12502    
## loneliness_state_pmc         -0.009455    0.731116   -0.013  0.98968    
## socintsatisfaction_state_pmc -0.210546    1.480153   -0.142  0.88689    
## responsiveness_state_pmc      0.534548    1.955622    0.273  0.78459    
## depressedmood_state          -0.193511    0.141344   -1.369  0.17098    
## loneliness_state_pmc         -0.025484    0.541146   -0.047  0.96244    
## socintsatisfaction_state_pmc -0.497187         NaN      NaN      NaN    
## responsiveness_state_pmc      0.535044         NaN      NaN      NaN    
##                              -0.459466    0.162266   -2.832  0.00463 ** 
##                               0.905765    0.342433    2.645  0.00817 ** 
##                              -0.069336    0.594526   -0.117  0.90716    
##                              -0.024749    0.452258   -0.055  0.95636    
##                               0.209305    0.104043    2.012  0.04425 *  
##                              -0.751007    0.274691   -2.734  0.00626 ** 
##                              -0.341891    0.308358   -1.109  0.26754    
##                              -0.281428    0.434655   -0.647  0.51733    
##                               0.220216    0.207842    1.060  0.28935    
##                               0.106560    0.727031    0.147  0.88347    
##                               0.295677    1.554271    0.190  0.84913    
##                              -0.202500    2.150923   -0.094  0.92499    
##                               0.102767    0.124328    0.827  0.40848    
##                               0.207354    0.492591    0.421  0.67379    
##                               0.448117         NaN      NaN      NaN    
##                               0.012844         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  22.3245 -2.982499 15.06105 11.83416 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]     [,2]   [,3]    [,4]
## [1,]  0.5267 -0.58644  0.219 -0.7570
## [2,]  0.0308  0.59066  0.327 -0.0582
## [3,] -0.2716 -0.00945 -0.211  0.5345
## [4,] -0.1935 -0.02548 -0.497  0.5350
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]    [,3]    [,4]
## [1,]  0.459 -0.906  0.0693  0.0247
## [2,] -0.209  0.751  0.3419  0.2814
## [3,] -0.220 -0.107 -0.2957  0.2025
## [4,] -0.103 -0.207 -0.4481 -0.0128
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 280.51736 120.01109 -80.54435 -91.59384
## [2,] 120.01109 115.04934 -66.62514 -46.73916
## [3,] -80.54435 -66.62514 318.79259 104.08569
## [4,] -91.59384 -46.73916 104.08569 142.07589
## ---- 
## aic=  20.97064 
## bic=  22.12701 
## Number of parameters:  36 
## initial estimates:  3.3997 0.7794 -1.0925 -1.5172 -0.1595 0.2631 0.0657 -0.0629 -0.2467 0.4021 0.1222 -0.1127 0.2305 -0.6211 -0.136 -0.1409 0.2524 -0.3715 -0.2103 0.1619 0.4048 -0.3634 -0.1444 0.4021 0.8667 0.1672 0.6006 -0.7104 -0.84 0.8485 -0.0341 -0.0322 -0.233 0.8169 0.375 -0.2219 
## Par. lower-bounds:  0.8614 -2.2898 -4.6297 -4.3276 -0.622 0.0244 -0.2458 -0.4052 -0.806 0.1136 -0.2544 -0.5267 -0.4141 -0.9537 -0.5701 -0.618 -0.2597 -0.6357 -0.5551 -0.2171 -0.6061 -0.9825 -1.2103 -0.7528 -0.3556 -0.5814 -0.6882 -2.1068 -2.2486 -0.0142 -1.5195 -1.6416 -1.3521 0.1314 -0.8051 -1.5006 
## Par. upper-bounds:  5.9381 3.8486 2.4447 1.2932 0.3031 0.5017 0.3772 0.2795 0.3127 0.6907 0.4988 0.3012 0.8751 -0.2885 0.298 0.3361 0.7646 -0.1072 0.1346 0.541 1.4156 0.2556 0.9214 1.557 2.0889 0.9158 1.8894 0.686 0.5686 1.7112 1.4512 1.5772 0.8862 1.5023 1.5551 1.0567 
## Final   Estimates:  3.507009 0.7544868 -1.198929 -1.302777 -0.2027429 0.2661051 0.3771718 -0.4051848 -0.4250892 0.4684361 -0.254427 -0.01996776 0.758053 -0.5105792 -0.08246796 -0.4094571 0.6492996 -0.6306356 -0.5262973 0.532958 0.05406241 0.01081513 -0.499625 0.433866 0.6855308 -0.2311177 0.440622 -0.1343904 -0.6801287 0.01962864 0.002731779 0.6272073 -0.5983162 0.4364408 0.6412918 -0.393579
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           3.507009         NaN      NaN      NaN    
## loneliness_state_pmc          0.754487    1.228021    0.614 0.538956    
## socintsatisfaction_state_pmc -1.198929         NaN      NaN      NaN    
## responsiveness_state_pmc     -1.302777         NaN      NaN      NaN    
## depressedmood_state          -0.202743         NaN      NaN      NaN    
## loneliness_state_pmc          0.266105         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.377172    0.179963    2.096 0.036098 *  
## responsiveness_state_pmc     -0.405185    0.318871   -1.271 0.203840    
## depressedmood_state          -0.425089    0.399466   -1.064 0.287264    
## loneliness_state_pmc          0.468436    0.141764    3.304 0.000952 ***
## socintsatisfaction_state_pmc -0.254427    0.272699   -0.933 0.350821    
## responsiveness_state_pmc     -0.019968    0.208203   -0.096 0.923596    
## depressedmood_state           0.758053         NaN      NaN      NaN    
## loneliness_state_pmc         -0.510579    0.183542   -2.782 0.005406 ** 
## socintsatisfaction_state_pmc -0.082468    0.399503   -0.206 0.836458    
## responsiveness_state_pmc     -0.409457    0.610984   -0.670 0.502756    
## depressedmood_state           0.649300         NaN      NaN      NaN    
## loneliness_state_pmc         -0.630636    0.167814   -3.758 0.000171 ***
## socintsatisfaction_state_pmc -0.526297    0.219132   -2.402 0.016317 *  
## responsiveness_state_pmc      0.532958    0.535265    0.996 0.319401    
##                               0.054062         NaN      NaN      NaN    
##                               0.010815         NaN      NaN      NaN    
##                              -0.499625    0.134891   -3.704 0.000212 ***
##                               0.433866    0.230171    1.885 0.059433 .  
##                               0.685531    0.359067    1.909 0.056236 .  
##                              -0.231118         NaN      NaN      NaN    
##                               0.440622    0.221102    1.993 0.046278 *  
##                              -0.134390         NaN      NaN      NaN    
##                              -0.680129         NaN      NaN      NaN    
##                               0.019629    0.186700    0.105 0.916269    
##                               0.002732    0.260240    0.010 0.991625    
##                               0.627207    0.533571    1.175 0.239799    
##                              -0.598316         NaN      NaN      NaN    
##                               0.436441    0.082422    5.295 1.19e-07 ***
##                               0.641292    0.202462    3.167 0.001538 ** 
##                              -0.393579    0.507364   -0.776 0.437907    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  3.507009 0.7544868 -1.198929 -1.302777 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]    [,3]   [,4]
## [1,] -0.203  0.266  0.3772 -0.405
## [2,] -0.425  0.468 -0.2544 -0.020
## [3,]  0.758 -0.511 -0.0825 -0.409
## [4,]  0.649 -0.631 -0.5263  0.533
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]     [,3]   [,4]
## [1,] -0.0541 -0.0108  0.49962 -0.434
## [2,] -0.6855  0.2311 -0.44062  0.134
## [3,]  0.6801 -0.0196 -0.00273 -0.627
## [4,]  0.5983 -0.4364 -0.64129  0.394
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  57.21230  16.64616 -63.61404 -36.89764
## [2,]  16.64616 100.23435 -14.34245 -13.34612
## [3,] -63.61404 -14.34245 115.02473  59.69802
## [4,] -36.89764 -13.34612  59.69802  67.55683
## ---- 
## aic=  16.99486 
## bic=  18.15123 
## Number of parameters:  36 
## initial estimates:  6.2489 -4.3657 7.9096 2.487 0.3139 0.1038 -0.0591 0.0652 0.0657 0.3731 0.1222 -0.0582 -0.4006 0.2385 0.3144 -0.0534 -0.1219 0.0451 0.4274 0.1394 -0.3554 0.0489 -0.1518 -0.2827 0.4853 -0.2374 0.0391 0.1923 -0.3829 0.1717 -0.6901 0.5215 0.865 -0.1088 -0.1984 0.3269 
## Par. lower-bounds:  2.1361 -10.2819 1.7873 -5.8345 -0.0054 -0.0803 -0.2569 -0.1017 -0.3936 0.1083 -0.1623 -0.2983 -0.8759 -0.0356 0.02 -0.3018 -0.768 -0.3274 0.0272 -0.1983 -1.0604 -0.4088 -0.5886 -0.6696 -0.5288 -0.8959 -0.5892 -0.3642 -1.4323 -0.5097 -1.3402 -0.0544 -0.5614 -1.0351 -1.082 -0.4559 
## Par. upper-bounds:  10.3616 1.5505 14.0318 10.8085 0.6332 0.288 0.1386 0.232 0.525 0.638 0.4067 0.1818 0.0747 0.5126 0.6088 0.195 0.5242 0.4176 0.8275 0.4771 0.3496 0.5067 0.2849 0.1042 1.4995 0.4211 0.6673 0.7489 0.6666 0.8531 -0.0399 1.0974 2.2914 0.8174 0.6853 1.1097 
## Final   Estimates:  7.14448 -4.215732 7.560472 2.367021 0.2711308 0.2879534 -0.2568145 0.2020182 0.4406242 0.5727942 0.0187379 -0.2983052 -0.5599945 -0.01546585 0.205851 0.0924474 -0.1496824 -0.2816145 0.827525 -0.1982528 -0.1680616 -0.3508243 0.05093629 -0.1940509 -0.3409882 -0.1631876 -0.05576114 0.3389009 0.5642338 0.1846465 -0.03991768 0.0614351 0.6464857 0.3311783 -0.5984608 0.4011432
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state            7.14448     5.41009    1.321 0.186640    
## loneliness_state_pmc          -4.21573     3.45652   -1.220 0.222599    
## socintsatisfaction_state_pmc   7.56047    13.38867    0.565 0.572284    
## responsiveness_state_pmc       2.36702     7.47915    0.316 0.751636    
## depressedmood_state            0.27113     0.47750    0.568 0.570163    
## loneliness_state_pmc           0.28795     0.10340    2.785 0.005356 ** 
## socintsatisfaction_state_pmc  -0.25681     0.38934   -0.660 0.509505    
## responsiveness_state_pmc       0.20202         NaN      NaN      NaN    
## depressedmood_state            0.44062     0.35480    1.242 0.214271    
## loneliness_state_pmc           0.57279     0.16488    3.474 0.000513 ***
## socintsatisfaction_state_pmc   0.01874     0.41267    0.045 0.963784    
## responsiveness_state_pmc      -0.29831     0.38824   -0.768 0.442273    
## depressedmood_state           -0.55999     1.24814   -0.449 0.653675    
## loneliness_state_pmc          -0.01547     0.25155   -0.061 0.950974    
## socintsatisfaction_state_pmc   0.20585     0.51473    0.400 0.689213    
## responsiveness_state_pmc       0.09245     0.14182    0.652 0.514489    
## depressedmood_state           -0.14968     0.65631   -0.228 0.819594    
## loneliness_state_pmc          -0.28161         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.82752     0.81010    1.022 0.307010    
## responsiveness_state_pmc      -0.19825     0.59035   -0.336 0.737003    
##                               -0.16806     0.41606   -0.404 0.686262    
##                               -0.35082     0.11908   -2.946 0.003218 ** 
##                                0.05094     0.31942    0.159 0.873301    
##                               -0.19405         NaN      NaN      NaN    
##                               -0.34099     0.47906   -0.712 0.476598    
##                               -0.16319     0.25563   -0.638 0.523228    
##                               -0.05576     0.45430   -0.123 0.902312    
##                                0.33890     0.39716    0.853 0.393482    
##                                0.56423     1.38777    0.407 0.684320    
##                                0.18465     0.20666    0.893 0.371603    
##                               -0.03992     0.53190   -0.075 0.940177    
##                                0.06144     0.26564    0.231 0.817105    
##                                0.64649     0.82457    0.784 0.433026    
##                                0.33118         NaN      NaN      NaN    
##                               -0.59846     0.76565   -0.782 0.434431    
##                                0.40114     0.68770    0.583 0.559685    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  7.14448 -4.215732 7.560472 2.367021 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]    [,3]    [,4]
## [1,]  0.271  0.2880 -0.2568  0.2020
## [2,]  0.441  0.5728  0.0187 -0.2983
## [3,] -0.560 -0.0155  0.2059  0.0924
## [4,] -0.150 -0.2816  0.8275 -0.1983
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]    [,3]    [,4]
## [1,]  0.168  0.351 -0.0509  0.1941
## [2,]  0.341  0.163  0.0558 -0.3389
## [3,] -0.564 -0.185  0.0399 -0.0614
## [4,] -0.646 -0.331  0.5985 -0.4011
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  83.10583  42.30196 -35.24235 -54.15940
## [2,]  42.30196 176.99387 -40.34516 -79.10813
## [3,] -35.24235 -40.34516 260.57384 155.95398
## [4,] -54.15940 -79.10813 155.95398 318.12487
## ---- 
## aic=  21.28751 
## bic=  22.44388 
## Number of parameters:  36 
## initial estimates:  15.2744 -19.1989 -2.2538 -3.9487 0.6502 0.0382 -0.0368 0.0571 0.4692 -0.045 0.0266 -0.1488 0.0482 0.1216 0.7796 -0.2186 0.0891 0.1011 -0.0156 0.7533 -0.2338 0.1531 0.4625 -0.1622 -0.1279 -0.4217 -0.0743 0.1922 -0.4468 0.722 -0.5299 0.4233 -0.5647 0.3428 -0.4319 0.2644 
## Par. lower-bounds:  3.618 -34.189 -14.8047 -13.3614 0.3781 -0.2101 -0.2689 -0.204 0.1193 -0.3643 -0.2718 -0.4846 -0.2448 -0.1457 0.5298 -0.4997 -0.1306 -0.0994 -0.2029 0.5424 -0.9708 -0.3552 -0.2878 -1.0693 -1.0758 -1.0754 -1.0391 -0.9743 -1.2405 0.1747 -1.3378 -0.5534 -1.1599 -0.0677 -1.0377 -0.4681 
## Par. upper-bounds:  26.9307 -4.2088 10.297 5.4641 0.9223 0.2865 0.1952 0.3182 0.8192 0.2743 0.325 0.187 0.3412 0.3889 1.0294 0.0625 0.3088 0.3016 0.1718 0.9641 0.5033 0.6614 1.2128 0.7448 0.82 0.232 0.8906 1.3586 0.3468 1.2694 0.2779 1.3999 0.0305 0.7532 0.174 0.9968 
## Final   Estimates:  14.98408 -19.05197 -2.333029 -4.128516 0.6400024 -0.1029296 0.1951672 0.0001198171 0.4786716 -0.1381006 0.3208126 -0.1883665 0.04008581 0.1122744 0.7547408 -0.2617611 0.09719871 -0.09935656 0.1717981 0.5567358 -0.300905 0.1291765 -0.1400558 -0.07164073 -0.3379457 -0.06960444 -0.4541814 -0.01844329 0.2074645 0.2572946 -0.2691033 0.3360889 0.03049439 0.3405809 -0.4285241 0.2544433
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           1.498e+01         NaN      NaN      NaN    
## loneliness_state_pmc         -1.905e+01         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -2.333e+00         NaN      NaN      NaN    
## responsiveness_state_pmc     -4.129e+00         NaN      NaN      NaN    
## depressedmood_state           6.400e-01         NaN      NaN      NaN    
## loneliness_state_pmc         -1.029e-01         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  1.952e-01         NaN      NaN      NaN    
## responsiveness_state_pmc      1.198e-04   5.967e-02    0.002  0.99840    
## depressedmood_state           4.787e-01         NaN      NaN      NaN    
## loneliness_state_pmc         -1.381e-01         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  3.208e-01   6.151e-02    5.216 1.83e-07 ***
## responsiveness_state_pmc     -1.884e-01   6.439e-02   -2.925  0.00344 ** 
## depressedmood_state           4.009e-02         NaN      NaN      NaN    
## loneliness_state_pmc          1.123e-01         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  7.547e-01   7.581e-02    9.956  < 2e-16 ***
## responsiveness_state_pmc     -2.618e-01         NaN      NaN      NaN    
## depressedmood_state           9.720e-02         NaN      NaN      NaN    
## loneliness_state_pmc         -9.936e-02         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  1.718e-01   6.981e-02    2.461  0.01385 *  
## responsiveness_state_pmc      5.567e-01         NaN      NaN      NaN    
##                              -3.009e-01         NaN      NaN      NaN    
##                               1.292e-01         NaN      NaN      NaN    
##                              -1.401e-01         NaN      NaN      NaN    
##                              -7.164e-02   5.189e-02   -1.381  0.16742    
##                              -3.379e-01         NaN      NaN      NaN    
##                              -6.960e-02         NaN      NaN      NaN    
##                              -4.542e-01   1.386e-01   -3.276  0.00105 ** 
##                              -1.844e-02         NaN      NaN      NaN    
##                               2.075e-01         NaN      NaN      NaN    
##                               2.573e-01         NaN      NaN      NaN    
##                              -2.691e-01   1.120e-01   -2.403  0.01626 *  
##                               3.361e-01   2.715e-01    1.238  0.21579    
##                               3.049e-02         NaN      NaN      NaN    
##                               3.406e-01         NaN      NaN      NaN    
##                              -4.285e-01   1.888e-01   -2.269  0.02324 *  
##                               2.544e-01         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  14.98408 -19.05197 -2.333029 -4.128516 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]  [,3]     [,4]
## [1,] 0.6400 -0.1029 0.195  0.00012
## [2,] 0.4787 -0.1381 0.321 -0.18837
## [3,] 0.0401  0.1123 0.755 -0.26176
## [4,] 0.0972 -0.0994 0.172  0.55674
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]  [,3]    [,4]
## [1,]  0.3009 -0.1292 0.140  0.0716
## [2,]  0.3379  0.0696 0.454  0.0184
## [3,] -0.2075 -0.2573 0.269 -0.3361
## [4,] -0.0305 -0.3406 0.429 -0.2544
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 152.13175  68.21350 -47.77932 -54.94472
## [2,]  68.21350 184.35749 -35.47603 -36.67231
## [3,] -47.77932 -35.47603 225.44246 113.04946
## [4,] -54.94472 -36.67231 113.04946 122.08591
## ---- 
## aic=  20.49964 
## bic=  21.65601 
## Number of parameters:  36 
## initial estimates:  13.0378 -6.3769 4.5991 4.2441 0.3209 -0.0556 -0.271 0.2383 0.3373 -0.4007 -0.3535 0.0562 -0.234 0.2223 0.7942 -0.027 -0.1689 0.3009 0.482 0.4426 -0.7828 0.6321 0.9568 -0.1882 -0.6395 0.8657 1.0003 -0.0429 -0.0117 -0.0132 -0.0507 0.104 0.2838 -0.4178 -0.6075 -0.2182 
## Par. lower-bounds:  5.6835 -14.54 -0.2106 -5.5722 -0.0427 -0.4059 -0.5366 0.0469 -0.0663 -0.7894 -0.6484 -0.1562 -0.4718 -0.0067 0.6205 -0.1521 -0.6543 -0.1666 0.1274 0.1872 -1.5065 -0.1832 0.1806 -0.8176 -1.4428 -0.0392 0.1387 -0.7415 -0.4851 -0.5464 -0.5583 -0.3076 -0.6822 -1.506 -1.6435 -1.0583 
## Par. upper-bounds:  20.3922 1.7863 9.4088 14.0604 0.6846 0.2946 -0.0053 0.4296 0.7409 -0.0119 -0.0586 0.2686 0.0039 0.4514 0.968 0.0982 0.3165 0.7684 0.8366 0.698 -0.059 1.4473 1.7329 0.4411 0.1639 1.7706 1.8618 0.6557 0.4616 0.52 0.4569 0.5156 1.2499 0.6704 0.4285 0.6218 
## Final   Estimates:  12.57531 -5.849766 7.304657 2.988791 0.3391993 0.1300815 -0.3371136 0.411512 0.3349387 -0.3180519 -0.5486233 0.2685513 -0.3702599 0.4513753 0.7742847 -0.1521012 -0.1420036 0.4177669 0.3974546 0.2916015 -0.2969083 -0.05404369 0.2695168 -0.3327075 -0.1312036 -0.03921081 0.7203191 -0.3381745 0.3118138 -0.3862956 -0.1517731 0.1738929 0.1299714 -0.1286508 -0.03756904 0.3058355
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)  
## depressedmood_state           12.57531         NaN      NaN      NaN  
## loneliness_state_pmc          -5.84977     4.22035   -1.386   0.1657  
## socintsatisfaction_state_pmc   7.30466     4.91820    1.485   0.1375  
## responsiveness_state_pmc       2.98879         NaN      NaN      NaN  
## depressedmood_state            0.33920         NaN      NaN      NaN  
## loneliness_state_pmc           0.13008     0.33505    0.388   0.6978  
## socintsatisfaction_state_pmc  -0.33711     0.18451   -1.827   0.0677 .
## responsiveness_state_pmc       0.41151         NaN      NaN      NaN  
## depressedmood_state            0.33494     0.22216    1.508   0.1316  
## loneliness_state_pmc          -0.31805     0.34820   -0.913   0.3610  
## socintsatisfaction_state_pmc  -0.54862     0.23385   -2.346   0.0190 *
## responsiveness_state_pmc       0.26855     0.22677    1.184   0.2363  
## depressedmood_state           -0.37026     0.26316   -1.407   0.1594  
## loneliness_state_pmc           0.45138     0.23500    1.921   0.0548 .
## socintsatisfaction_state_pmc   0.77428         NaN      NaN      NaN  
## responsiveness_state_pmc      -0.15210         NaN      NaN      NaN  
## depressedmood_state           -0.14200         NaN      NaN      NaN  
## loneliness_state_pmc           0.41777     0.38314    1.090   0.2755  
## socintsatisfaction_state_pmc   0.39745         NaN      NaN      NaN  
## responsiveness_state_pmc       0.29160     0.25770    1.132   0.2578  
##                               -0.29691         NaN      NaN      NaN  
##                               -0.05404     0.33055   -0.163   0.8701  
##                                0.26952     0.33361    0.808   0.4192  
##                               -0.33271         NaN      NaN      NaN  
##                               -0.13120         NaN      NaN      NaN  
##                               -0.03921     0.33067   -0.119   0.9056  
##                                0.72032     0.28966    2.487   0.0129 *
##                               -0.33817     0.26789   -1.262   0.2068  
##                                0.31181     0.27798    1.122   0.2620  
##                               -0.38630     0.21242   -1.819   0.0690 .
##                               -0.15177         NaN      NaN      NaN  
##                                0.17389         NaN      NaN      NaN  
##                                0.12997         NaN      NaN      NaN  
##                               -0.12865     0.36828   -0.349   0.7268  
##                               -0.03757         NaN      NaN      NaN  
##                                0.30584     0.27088    1.129   0.2589  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  12.57531 -5.849766 7.304657 2.988791 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]   [,3]   [,4]
## [1,]  0.339  0.130 -0.337  0.412
## [2,]  0.335 -0.318 -0.549  0.269
## [3,] -0.370  0.451  0.774 -0.152
## [4,] -0.142  0.418  0.397  0.292
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]    [,3]   [,4]
## [1,]  0.297 0.0540 -0.2695  0.333
## [2,]  0.131 0.0392 -0.7203  0.338
## [3,] -0.312 0.3863  0.1518 -0.174
## [4,] -0.130 0.1287  0.0376 -0.306
##   
## Residuals cov-matrix: 
##            [,1]        [,2]       [,3]       [,4]
## [1,]  53.082277  33.1219803 -7.2242308 -19.124287
## [2,]  33.121980  57.5961630 -0.3354033 -25.504106
## [3,]  -7.224231  -0.3354033 31.1295353  -4.333951
## [4,] -19.124287 -25.5041063 -4.3339511  77.387827
## ---- 
## aic=  16.16679 
## bic=  17.32316 
## Number of parameters:  36 
## initial estimates:  29.6924 -1.7138 18.5941 9.6758 0.3235 -0.2132 0.2688 -0.3701 0.0431 -0.0861 0.1951 -0.2832 -0.433 0.1191 -0.1971 0.2327 -0.2232 -0.057 -0.1634 0.1665 0.4281 -0.4514 -0.3595 0.0126 1.4598 -0.9554 -0.6106 -0.4362 0.3892 0.0068 0.2941 0.166 0.1695 0.3658 0.0955 0.6399 
## Par. lower-bounds:  13.5068 -20.0233 -1.0842 -6.4714 -0.0326 -0.5593 -0.0895 -0.7474 -0.3597 -0.4777 -0.2101 -0.71 -0.8659 -0.3018 -0.6326 -0.2261 -0.5784 -0.4023 -0.5208 -0.21 -0.6716 -1.2661 -1.0129 -0.7938 0.2158 -1.8771 -1.3498 -1.3484 -0.9478 -0.9837 -0.5004 -0.8144 -0.9276 -0.447 -0.5564 -0.1646 
## Par. upper-bounds:  45.878 16.5957 38.2725 25.823 0.6796 0.133 0.627 0.0073 0.4459 0.3055 0.6003 0.1437 0 0.5399 0.2384 0.6915 0.132 0.2884 0.194 0.5429 1.5278 0.3634 0.294 0.819 2.7039 -0.0338 0.1286 0.476 1.7263 0.9974 1.0886 1.1464 1.2667 1.1785 0.7475 1.4443 
## Final   Estimates:  29.55262 -1.413436 18.60859 9.763958 0.3267958 0.1329653 0.6075778 -0.2614515 0.01698397 0.2870596 0.6003408 0.1340754 -0.4313566 -0.2876047 0.2384298 -0.2243441 -0.2335381 0.02286605 0.193727 -0.1983788 -0.3453002 -0.7687236 -0.6163592 -0.1933543 0.224394 -0.7759675 -0.5080871 -0.6019958 0.7435157 0.605194 -0.01974963 0.444815 0.3665564 0.3138826 -0.1301482 0.7051928
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           29.55262    17.06810    1.731  0.08337 .  
## loneliness_state_pmc          -1.41344     6.54940   -0.216  0.82913    
## socintsatisfaction_state_pmc  18.60859     5.59431    3.326  0.00088 ***
## responsiveness_state_pmc       9.76396    20.49283    0.476  0.63375    
## depressedmood_state            0.32680     0.46821    0.698  0.48520    
## loneliness_state_pmc           0.13297         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.60758     0.45573    1.333  0.18247    
## responsiveness_state_pmc      -0.26145     0.60768   -0.430  0.66702    
## depressedmood_state            0.01698     0.15880    0.107  0.91483    
## loneliness_state_pmc           0.28706     0.20675    1.388  0.16501    
## socintsatisfaction_state_pmc   0.60034     1.06687    0.563  0.57363    
## responsiveness_state_pmc       0.13408     2.20590    0.061  0.95153    
## depressedmood_state           -0.43136     0.18504   -2.331  0.01974 *  
## loneliness_state_pmc          -0.28760         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.23843     1.65750    0.144  0.88562    
## responsiveness_state_pmc      -0.22434     2.08644   -0.108  0.91437    
## depressedmood_state           -0.23354     0.42202   -0.553  0.58000    
## loneliness_state_pmc           0.02287     0.90052    0.025  0.97974    
## socintsatisfaction_state_pmc   0.19373     0.15369    1.261  0.20749    
## responsiveness_state_pmc      -0.19838     0.37008   -0.536  0.59193    
##                               -0.34530     0.26088   -1.324  0.18564    
##                               -0.76872         NaN      NaN      NaN    
##                               -0.61636     0.59871   -1.029  0.30325    
##                               -0.19335     0.55538   -0.348  0.72773    
##                                0.22439         NaN      NaN      NaN    
##                               -0.77597     0.16878   -4.598 4.28e-06 ***
##                               -0.50809     1.60917   -0.316  0.75220    
##                               -0.60200     2.12835   -0.283  0.77729    
##                                0.74352     0.31281    2.377  0.01746 *  
##                                0.60519         NaN      NaN      NaN    
##                               -0.01975     2.03966   -0.010  0.99227    
##                                0.44482     1.97437    0.225  0.82175    
##                                0.36656     0.74970    0.489  0.62488    
##                                0.31388     1.02297    0.307  0.75897    
##                               -0.13015     0.23239   -0.560  0.57544    
##                                0.70519     0.33209    2.123  0.03371 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  29.55262 -1.413436 18.60859 9.763958 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]  [,3]   [,4]
## [1,]  0.327  0.1330 0.608 -0.261
## [2,]  0.017  0.2871 0.600  0.134
## [3,] -0.431 -0.2876 0.238 -0.224
## [4,] -0.234  0.0229 0.194 -0.198
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]   [,3]   [,4]
## [1,]  0.345  0.769 0.6164  0.193
## [2,] -0.224  0.776 0.5081  0.602
## [3,] -0.744 -0.605 0.0197 -0.445
## [4,] -0.367 -0.314 0.1301 -0.705
##   
## Residuals cov-matrix: 
##            [,1]       [,2]      [,3]       [,4]
## [1,]  187.52840   95.59269 -117.9966  -71.16213
## [2,]   95.59269  224.09371 -153.2859 -119.42315
## [3,] -117.99660 -153.28590  364.5697  153.21765
## [4,]  -71.16213 -119.42315  153.2177  230.92618
## ---- 
## aic=  21.90634 
## bic=  23.06271 
## Number of parameters:  36 
## initial estimates:  19.5564 -10.647 5.2684 2.6874 0.4511 0.5769 0.422 -0.2429 0.2332 0.2067 0.1307 0.0566 -0.0658 -0.2056 0.4607 -0.0445 -0.0785 -0.2805 -0.1624 0.6224 -0.5915 -0.771 -1.1374 1.5171 -0.0719 -0.6554 -0.7823 -0.1276 -0.2012 0.1991 0.0868 0.1357 -0.1522 0.172 -0.2072 0.5168 
## Par. lower-bounds:  8.116 -17.6235 -3.9977 -2.2014 0.1955 0.0959 0.045 -0.755 0.0773 -0.0866 -0.0992 -0.2557 -0.2728 -0.5951 0.1554 -0.4593 -0.1878 -0.486 -0.3235 0.4036 -1.3274 -1.8033 -2.0349 -0.0264 -0.5206 -1.2849 -1.3297 -1.0689 -0.7972 -0.637 -0.6402 -1.1145 -0.4667 -0.2691 -0.5908 -0.1428 
## Par. upper-bounds:  30.9967 -3.6704 14.5344 7.5763 0.7067 1.0578 0.799 0.2692 0.3891 0.4999 0.3606 0.3689 0.1413 0.1839 0.766 0.3702 0.0307 -0.075 -0.0013 0.8413 0.1443 0.2613 -0.2398 3.0606 0.3769 -0.0259 -0.235 0.8137 0.3948 1.0352 0.8137 1.3858 0.1622 0.6131 0.1763 1.1764 
## Final   Estimates:  19.54718 -10.65558 5.239249 2.710292 0.4712974 0.9449149 0.38182 -0.5957805 0.2697759 0.401966 0.1479958 0.1063528 -0.1174673 -0.1050781 0.5429315 -0.4019947 -0.098463 -0.4532098 -0.1923112 0.4035939 -0.3610114 -0.8054268 -0.6581071 1.345578 -0.1342457 -0.4524158 -0.6321682 0.3074656 -0.1691337 0.05289429 0.09070854 0.211034 0.008422106 0.4076102 0.1763466 0.0412263 
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           19.547178   10.759108    1.817  0.06925 .  
## loneliness_state_pmc         -10.655575    4.773283   -2.232  0.02559 *  
## socintsatisfaction_state_pmc   5.239249    5.069108    1.034  0.30134    
## responsiveness_state_pmc       2.710292    4.244122    0.639  0.52308    
## depressedmood_state            0.471297    0.339130    1.390  0.16461    
## loneliness_state_pmc           0.944915    0.528685    1.787  0.07389 .  
## socintsatisfaction_state_pmc   0.381820    0.349029    1.094  0.27398    
## responsiveness_state_pmc      -0.595780    0.823635   -0.723  0.46946    
## depressedmood_state            0.269776    0.123199    2.190  0.02854 *  
## loneliness_state_pmc           0.401966    0.186363    2.157  0.03101 *  
## socintsatisfaction_state_pmc   0.147996    0.113626    1.302  0.19275    
## responsiveness_state_pmc       0.106353    0.355183    0.299  0.76461    
## depressedmood_state           -0.117467    0.151071   -0.778  0.43683    
## loneliness_state_pmc          -0.105078    0.109613   -0.959  0.33775    
## socintsatisfaction_state_pmc   0.542931    0.112078    4.844 1.27e-06 ***
## responsiveness_state_pmc      -0.401995    0.758580   -0.530  0.59616    
## depressedmood_state           -0.098463    0.121119   -0.813  0.41625    
## loneliness_state_pmc          -0.453210    0.321792   -1.408  0.15901    
## socintsatisfaction_state_pmc  -0.192311    0.142974   -1.345  0.17860    
## responsiveness_state_pmc       0.403594    0.210782    1.915  0.05552 .  
##                               -0.361011    0.417641   -0.864  0.38737    
##                               -0.805427    0.569358   -1.415  0.15718    
##                               -0.658107    0.474531   -1.387  0.16549    
##                                1.345578    1.081371    1.244  0.21338    
##                               -0.134246    0.137304   -0.978  0.32821    
##                               -0.452416    0.221655   -2.041  0.04124 *  
##                               -0.632168    0.222833   -2.837  0.00455 ** 
##                                0.307466    0.493970    0.622  0.53365    
##                               -0.169134    0.253739   -0.667  0.50505    
##                                0.052894    0.184460    0.287  0.77430    
##                                0.090709    0.156295    0.580  0.56167    
##                                0.211034    0.929589    0.227  0.82041    
##                                0.008422    0.090070    0.094  0.92550    
##                                0.407610    0.197296    2.066  0.03883 *  
##                                0.176347    0.171472    1.028  0.30375    
##                                0.041226    0.284781    0.145  0.88490    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  19.54718 -10.65558 5.239249 2.710292 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,]  0.4713  0.945  0.382 -0.596
## [2,]  0.2698  0.402  0.148  0.106
## [3,] -0.1175 -0.105  0.543 -0.402
## [4,] -0.0985 -0.453 -0.192  0.404
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]    [,2]    [,3]    [,4]
## [1,]  0.36101  0.8054  0.6581 -1.3456
## [2,]  0.13425  0.4524  0.6322 -0.3075
## [3,]  0.16913 -0.0529 -0.0907 -0.2110
## [4,] -0.00842 -0.4076 -0.1763 -0.0412
##   
## Residuals cov-matrix: 
##             [,1]       [,2]      [,3]       [,4]
## [1,]  382.869095  125.31464 -103.3711   7.715774
## [2,]  125.314641  264.39128 -126.1509 -33.873021
## [3,] -103.371086 -126.15087  313.2598 136.279124
## [4,]    7.715774  -33.87302  136.2791 129.207140
## ---- 
## aic=  22.01597 
## bic=  23.17234 
## Number of parameters:  36 
## initial estimates:  5.3527 1.6016 -0.4478 1.3345 -0.0196 0.0745 0.0917 -0.3201 -0.2918 0.0699 -0.0306 -0.2516 -0.0849 0.1924 -0.2106 0.2494 -0.152 0.2302 -0.2516 0.1954 -0.4222 0.1753 -0.01 0.5291 0.2173 -0.1597 -0.1124 0.1146 0.5133 0.2954 0.4833 0.0341 0.2633 -0.1646 0.2347 -0.5238 
## Par. lower-bounds:  2.8731 -1.4515 -5.878 -2.8815 -0.3659 -0.2021 -0.0923 -0.5373 -0.7182 -0.2706 -0.2572 -0.5191 -0.8432 -0.4133 -0.6135 -0.2264 -0.7407 -0.24 -0.5644 -0.174 -1.1292 -0.5234 -0.3141 0.0474 -0.6533 -1.02 -0.4868 -0.4785 -1.035 -1.2347 -0.1826 -1.0207 -0.9388 -1.3525 -0.2822 -1.3427 
## Par. upper-bounds:  7.8324 4.6547 4.9824 5.5504 0.3266 0.3511 0.2757 -0.1028 0.1345 0.4105 0.1959 0.016 0.6734 0.7981 0.1923 0.7252 0.4367 0.7005 0.0612 0.5648 0.2849 0.8741 0.2941 1.0107 1.0878 0.7006 0.2619 0.7076 2.0616 1.8255 1.1492 1.0888 1.4655 1.0234 0.7517 0.2951 
## Final   Estimates:  5.440847 1.578081 -0.4251226 1.348513 0.09807073 0.3511137 -0.09227519 -0.5067828 -0.2542107 0.2207021 0.1959093 -0.4932948 -0.2156316 -0.2574351 -0.613526 0.2211949 -0.1060571 0.7005069 -0.2778678 0.4188563 -0.08868805 -0.4540255 0.1768801 0.3702337 0.2938765 -0.3119821 -0.3985664 0.7076284 0.7178618 0.5747188 0.5376797 0.1066002 0.2024615 -0.9215926 0.04419867 -0.5877786
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           5.440847    0.104103   52.264  < 2e-16 ***
## loneliness_state_pmc          1.578081    1.060070    1.489   0.1366    
## socintsatisfaction_state_pmc -0.425123         NaN      NaN      NaN    
## responsiveness_state_pmc      1.348513    1.332284    1.012   0.3115    
## depressedmood_state           0.098071    0.006246   15.702  < 2e-16 ***
## loneliness_state_pmc          0.351114    0.056446    6.220 4.96e-10 ***
## socintsatisfaction_state_pmc -0.092275         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.506783    0.092812   -5.460 4.75e-08 ***
## depressedmood_state          -0.254211    0.024190  -10.509  < 2e-16 ***
## loneliness_state_pmc          0.220702    0.090266    2.445   0.0145 *  
## socintsatisfaction_state_pmc  0.195909    0.034643    5.655 1.56e-08 ***
## responsiveness_state_pmc     -0.493295    0.080197   -6.151 7.70e-10 ***
## depressedmood_state          -0.215632         NaN      NaN      NaN    
## loneliness_state_pmc         -0.257435         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.613526         NaN      NaN      NaN    
## responsiveness_state_pmc      0.221195    0.130395    1.696   0.0898 .  
## depressedmood_state          -0.106057    0.105648   -1.004   0.3154    
## loneliness_state_pmc          0.700507    0.094236    7.434 1.06e-13 ***
## socintsatisfaction_state_pmc -0.277868         NaN      NaN      NaN    
## responsiveness_state_pmc      0.418856    0.106423    3.936 8.29e-05 ***
##                              -0.088688         NaN      NaN      NaN    
##                              -0.454025    0.071429   -6.356 2.07e-10 ***
##                               0.176880         NaN      NaN      NaN    
##                               0.370234    0.065907    5.618 1.94e-08 ***
##                               0.293877         NaN      NaN      NaN    
##                              -0.311982    0.100978   -3.090   0.0020 ** 
##                              -0.398566         NaN      NaN      NaN    
##                               0.707628    0.039594   17.872  < 2e-16 ***
##                               0.717862    0.110037    6.524 6.85e-11 ***
##                               0.574719    0.075673    7.595 3.09e-14 ***
##                               0.537680         NaN      NaN      NaN    
##                               0.106600         NaN      NaN      NaN    
##                               0.202461    0.130255    1.554   0.1201    
##                              -0.921593    0.109045   -8.452  < 2e-16 ***
##                               0.044199         NaN      NaN      NaN    
##                              -0.587779    0.065027   -9.039  < 2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  5.440847 1.578081 -0.4251226 1.348513 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,]  0.0981  0.351 -0.0923 -0.507
## [2,] -0.2542  0.221  0.1959 -0.493
## [3,] -0.2156 -0.257 -0.6135  0.221
## [4,] -0.1061  0.701 -0.2779  0.419
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,]  0.0887  0.454 -0.1769 -0.370
## [2,] -0.2939  0.312  0.3986 -0.708
## [3,] -0.7179 -0.575 -0.5377 -0.107
## [4,] -0.2025  0.922 -0.0442  0.588
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  39.73272  24.30338 -18.63321 -22.90454
## [2,]  24.30338  50.18901 -33.90703 -25.73072
## [3,] -18.63321 -33.90703 229.60329  66.20788
## [4,] -22.90454 -25.73072  66.20788 107.09201
## ---- 
## aic=  17.97316 
## bic=  19.12953 
## Number of parameters:  36 
## initial estimates:  7.8298 -2.2349 0.7238 -2.0431 0.2838 -0.165 0.1223 0.0266 0.2367 0.0835 0.1433 -0.0371 -0.0892 -0.1914 0.2055 0.2311 0.1137 -0.2255 0.1282 0.4345 -0.2265 0.643 -0.3751 -0.1075 0.0201 -0.512 -0.6385 0.1669 0.9316 -0.3271 -0.2974 -0.2635 -0.5614 0.8204 0.1287 -0.3045 
## Par. lower-bounds:  3.7516 -5.9149 -3.94 -4.9898 -0.0361 -0.5292 -0.1315 -0.3513 -0.0519 -0.2452 -0.0857 -0.3781 -0.455 -0.608 -0.0847 -0.2011 -0.1175 -0.4887 -0.0552 0.1614 -1.0321 -0.1913 -0.9523 -0.829 -0.7069 -1.2649 -1.1594 -0.4841 0.0103 -1.2811 -0.9575 -1.0885 -1.1435 0.2176 -0.2884 -0.8258 
## Par. upper-bounds:  11.9081 1.4452 5.3875 0.9037 0.6037 0.1993 0.376 0.4045 0.5254 0.4122 0.3723 0.304 0.2766 0.2251 0.4957 0.6632 0.3448 0.0377 0.3116 0.7076 0.5792 1.4773 0.2021 0.6139 0.747 0.2408 -0.1177 0.8179 1.8529 0.627 0.3626 0.5615 0.0208 1.4233 0.5457 0.2168 
## Final   Estimates:  8.12924 -2.057479 1.020724 -1.819124 0.297592 -0.4770411 0.3760433 0.1055691 0.1568802 0.4103019 0.3445491 -0.3449338 -0.08587255 0.2207844 -0.05797398 0.5044786 0.1545509 -0.4169805 -0.02924242 0.6757657 -0.03974531 0.508374 -0.3992661 -0.09289401 -0.1010457 -0.8311545 -0.4294867 0.3978156 0.2847278 -0.5184514 0.3626026 -0.4667792 -0.1015481 0.4335877 0.1736809 -0.2353882
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state            8.12924     4.10715    1.979 0.047783 *  
## loneliness_state_pmc          -2.05748     0.19595  -10.500  < 2e-16 ***
## socintsatisfaction_state_pmc   1.02072     3.05745    0.334 0.738494    
## responsiveness_state_pmc      -1.81912     2.66821   -0.682 0.495381    
## depressedmood_state            0.29759     0.39216    0.759 0.447946    
## loneliness_state_pmc          -0.47704     0.36899   -1.293 0.196068    
## socintsatisfaction_state_pmc   0.37604         NaN      NaN      NaN    
## responsiveness_state_pmc       0.10557     0.04739    2.228 0.025908 *  
## depressedmood_state            0.15688     0.05340    2.938 0.003306 ** 
## loneliness_state_pmc           0.41030     0.08909    4.606 4.11e-06 ***
## socintsatisfaction_state_pmc   0.34455     0.13265    2.598 0.009390 ** 
## responsiveness_state_pmc      -0.34493     0.08458   -4.078 4.54e-05 ***
## depressedmood_state           -0.08587     0.33432   -0.257 0.797288    
## loneliness_state_pmc           0.22078     0.25250    0.874 0.381896    
## socintsatisfaction_state_pmc  -0.05797     0.42439   -0.137 0.891344    
## responsiveness_state_pmc       0.50448     0.24446    2.064 0.039051 *  
## depressedmood_state            0.15455     0.23928    0.646 0.518344    
## loneliness_state_pmc          -0.41698     0.23033   -1.810 0.070239 .  
## socintsatisfaction_state_pmc  -0.02924     0.22531   -0.130 0.896735    
## responsiveness_state_pmc       0.67577     0.19505    3.465 0.000531 ***
##                               -0.03975     0.34444   -0.115 0.908136    
##                                0.50837     0.45107    1.127 0.259725    
##                               -0.39927     0.18312   -2.180 0.029232 *  
##                               -0.09289     0.13964   -0.665 0.505892    
##                               -0.10105     0.08896   -1.136 0.256019    
##                               -0.83115     0.08778   -9.469  < 2e-16 ***
##                               -0.42949     0.06255   -6.866 6.61e-12 ***
##                                0.39782     0.11885    3.347 0.000816 ***
##                                0.28473     0.33724    0.844 0.398503    
##                               -0.51845     0.27540   -1.883 0.059764 .  
##                                0.36260     0.34765    1.043 0.296937    
##                               -0.46678     0.44149   -1.057 0.290378    
##                               -0.10155     0.24944   -0.407 0.683930    
##                                0.43359     0.22434    1.933 0.053268 .  
##                                0.17368     0.23259    0.747 0.455231    
##                               -0.23539     0.22685   -1.038 0.299447    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  8.12924 -2.057479 1.020724 -1.819124 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,]  0.2976 -0.477  0.3760  0.106
## [2,]  0.1569  0.410  0.3445 -0.345
## [3,] -0.0859  0.221 -0.0580  0.504
## [4,]  0.1546 -0.417 -0.0292  0.676
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,]  0.0397 -0.508  0.399  0.0929
## [2,]  0.1010  0.831  0.429 -0.3978
## [3,] -0.2847  0.518 -0.363  0.4668
## [4,]  0.1015 -0.434 -0.174  0.2354
##   
## Residuals cov-matrix: 
##            [,1]       [,2]       [,3]      [,4]
## [1,]  71.200396  27.689270 -28.308430 -8.596255
## [2,]  27.689270  55.370744 -12.559093 -8.227644
## [3,] -28.308430 -12.559093 106.330165  2.749418
## [4,]  -8.596255  -8.227644   2.749418 36.482645
## ---- 
## aic=  17.19852 
## bic=  18.35489 
## Number of parameters:  36 
## initial estimates:  21.5572 -11.2679 3.828 3.1249 0.3468 0.2701 0.0225 -0.0814 0.3329 0.0093 -0.0709 -0.1105 -0.0838 0.2167 0.3608 0.1284 -0.1116 0.1189 0.1379 0.4429 -0.4525 -1.0306 -0.2331 0.0421 -0.0201 -0.6249 -0.3272 0.13 0.1747 2.0293 0.0176 1.2257 0.0953 0.7282 0.0049 0.3077 
## Par. lower-bounds:  10.2212 -22.914 -13.3165 -8.0649 0.0085 -0.1088 -0.1972 -0.4025 -0.0147 -0.38 -0.2966 -0.4404 -0.5954 -0.3564 0.0285 -0.3572 -0.4455 -0.2552 -0.0789 0.126 -1.1418 -1.8467 -0.6477 -0.7944 -0.7283 -1.4634 -0.7532 -0.7293 -0.8679 0.795 -0.6095 -0.0394 -0.5852 -0.0774 -0.4044 -0.518 
## Par. upper-bounds:  32.8932 0.3782 20.9726 14.3147 0.6851 0.6491 0.2422 0.2397 0.6804 0.3986 0.1547 0.2194 0.4279 0.7898 0.693 0.6141 0.2223 0.4929 0.3548 0.7599 0.2369 -0.2145 0.1815 0.8786 0.6882 0.2135 0.0987 0.9894 1.2173 3.2635 0.6446 2.4908 0.7757 1.5338 0.4142 1.1334 
## Final   Estimates:  21.5554 -11.27089 3.83089 3.109498 0.3547603 0.4495292 0.1235451 0.0156803 0.3238795 -0.02703202 0.00576668 -0.3058549 -0.1597772 -0.2225208 0.2586852 -0.1897901 -0.1386221 -0.1145923 -0.07894221 0.2410287 -0.1526826 -0.5414606 -0.2168407 -0.1300623 0.05720633 -0.2952728 -0.20434 0.2414734 -0.07016119 1.616847 0.3013483 0.9904203 0.03587667 0.7281834 0.3392501 0.6813354
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           21.555398         NaN      NaN      NaN    
## loneliness_state_pmc         -11.270894    6.573189   -1.715 0.086405 .  
## socintsatisfaction_state_pmc   3.830890   16.081476    0.238 0.811712    
## responsiveness_state_pmc       3.109498         NaN      NaN      NaN    
## depressedmood_state            0.354760         NaN      NaN      NaN    
## loneliness_state_pmc           0.449529    0.121873    3.688 0.000226 ***
## socintsatisfaction_state_pmc   0.123545    0.182112    0.678 0.497516    
## responsiveness_state_pmc       0.015680    0.254458    0.062 0.950864    
## depressedmood_state            0.323880    0.194056    1.669 0.095117 .  
## loneliness_state_pmc          -0.027032    0.198486   -0.136 0.891670    
## socintsatisfaction_state_pmc   0.005767         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.305855    0.146509   -2.088 0.036833 *  
## depressedmood_state           -0.159777    0.513276   -0.311 0.755581    
## loneliness_state_pmc          -0.222521    0.221666   -1.004 0.315449    
## socintsatisfaction_state_pmc   0.258685         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.189790         NaN      NaN      NaN    
## depressedmood_state           -0.138622         NaN      NaN      NaN    
## loneliness_state_pmc          -0.114592         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.078942    0.100001   -0.789 0.429871    
## responsiveness_state_pmc       0.241029    0.099102    2.432 0.015010 *  
##                               -0.152683         NaN      NaN      NaN    
##                               -0.541461    0.135964   -3.982 6.82e-05 ***
##                               -0.216841    0.195961   -1.107 0.268489    
##                               -0.130062    0.340351   -0.382 0.702357    
##                                0.057206    0.256635    0.223 0.823606    
##                               -0.295273    0.160497   -1.840 0.065806 .  
##                               -0.204340         NaN      NaN      NaN    
##                                0.241473         NaN      NaN      NaN    
##                               -0.070161    0.593427   -0.118 0.905885    
##                                1.616847    0.177041    9.133  < 2e-16 ***
##                                0.301348         NaN      NaN      NaN    
##                                0.990420         NaN      NaN      NaN    
##                                0.035877         NaN      NaN      NaN    
##                                0.728183    0.124880    5.831 5.51e-09 ***
##                                0.339250    0.087950    3.857 0.000115 ***
##                                0.681335         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  21.5554 -11.27089 3.83089 3.109498 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]     [,3]    [,4]
## [1,]  0.355  0.450  0.12355  0.0157
## [2,]  0.324 -0.027  0.00577 -0.3059
## [3,] -0.160 -0.223  0.25869 -0.1898
## [4,] -0.139 -0.115 -0.07894  0.2410
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,]  0.1527  0.541  0.217  0.130
## [2,] -0.0572  0.295  0.204 -0.241
## [3,]  0.0702 -1.617 -0.301 -0.990
## [4,] -0.0359 -0.728 -0.339 -0.681
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 112.82202  54.02270 -65.04019 -31.31968
## [2,]  54.02270  80.72579 -51.18407 -35.91057
## [3,] -65.04019 -51.18407 221.92121  52.89135
## [4,] -31.31968 -35.91057  52.89135  54.82240
## ---- 
## aic=  18.46161 
## bic=  19.61798 
## Number of parameters:  36 
## initial estimates:  26.4685 -9.1507 4.3435 -7.0775 0.0348 0.1468 -0.1842 -0.0828 0.3173 -0.0712 -0.0304 -0.0111 -0.2055 0.0711 0.5083 0.1487 0.246 -0.2102 -0.0664 0.6598 0.2883 -0.3703 0.2105 0.0371 0.2557 -0.2404 0.357 0.0687 -0.0556 -0.5726 -0.2087 -0.4402 -0.2378 -0.0381 -4e-04 -0.301 
## Par. lower-bounds:  16.2355 -18.8791 -10.6823 -16.9108 -0.3357 -0.186 -0.3817 -0.3535 -0.0349 -0.3876 -0.2181 -0.2685 -0.7496 -0.4175 0.2184 -0.2489 -0.11 -0.53 -0.2562 0.3996 -0.39 -1.0965 -0.3267 -0.5917 -0.3892 -0.9308 -0.1537 -0.5291 -1.0515 -1.6389 -0.9975 -1.3636 -0.8895 -0.7359 -0.5166 -0.9053 
## Par. upper-bounds:  36.7014 0.5777 19.3693 2.7558 0.4054 0.4796 0.0132 0.188 0.6696 0.2452 0.1573 0.2464 0.3386 0.5598 0.7982 0.5463 0.6021 0.1096 0.1233 0.92 0.9665 0.3559 0.7476 0.666 0.9005 0.45 0.8677 0.6665 0.9404 0.4938 0.58 0.4831 0.414 0.6598 0.5158 0.3033 
## Final   Estimates:  27.37397 -7.134892 6.008559 -10.61024 -0.01704779 0.4795786 -0.3008047 -0.018707 0.2623664 0.2451562 0.07335168 -0.2684847 -0.2320426 0.223713 0.6552944 0.3546389 0.4054069 0.1095672 0.1233191 0.6619031 0.198696 -0.6754846 0.2769433 -0.1519883 -0.003338592 -0.4806352 -0.0582008 0.3724269 -0.1380129 -0.2245979 -0.2883382 -0.4841262 -0.357678 -0.1606223 -0.2723238 -0.2004305
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           27.373966   20.251823    1.352 0.176478    
## loneliness_state_pmc          -7.134892    1.428517   -4.995  5.9e-07 ***
## socintsatisfaction_state_pmc   6.008559   26.940284    0.223 0.823510    
## responsiveness_state_pmc     -10.610243    6.748341   -1.572 0.115887    
## depressedmood_state           -0.017048    0.756899   -0.023 0.982031    
## loneliness_state_pmc           0.479579    0.287768    1.667 0.095604 .  
## socintsatisfaction_state_pmc  -0.300805    0.278872   -1.079 0.280745    
## responsiveness_state_pmc      -0.018707    0.167744   -0.112 0.911203    
## depressedmood_state            0.262366         NaN      NaN      NaN    
## loneliness_state_pmc           0.245156    0.214776    1.141 0.253682    
## socintsatisfaction_state_pmc   0.073352    0.081164    0.904 0.366128    
## responsiveness_state_pmc      -0.268485    0.093034   -2.886 0.003903 ** 
## depressedmood_state           -0.232043    1.020272   -0.227 0.820088    
## loneliness_state_pmc           0.223713         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.655294    0.434255    1.509 0.131297    
## responsiveness_state_pmc       0.354639    0.238578    1.486 0.137155    
## depressedmood_state            0.405407    0.250059    1.621 0.104965    
## loneliness_state_pmc           0.109567         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.123319    0.129209    0.954 0.339873    
## responsiveness_state_pmc       0.661903    0.177999    3.719 0.000200 ***
##                                0.198696    0.719807    0.276 0.782517    
##                               -0.675485    0.190373   -3.548 0.000388 ***
##                                0.276943    0.349147    0.793 0.427661    
##                               -0.151988    0.268566   -0.566 0.571444    
##                               -0.003339    0.382421   -0.009 0.993034    
##                               -0.480635    0.161626   -2.974 0.002942 ** 
##                               -0.058201    0.150436   -0.387 0.698844    
##                                0.372427    0.040484    9.199  < 2e-16 ***
##                               -0.138013    1.272185   -0.108 0.913611    
##                               -0.224598         NaN      NaN      NaN    
##                               -0.288338    0.564055   -0.511 0.609219    
##                               -0.484126    0.332897   -1.454 0.145868    
##                               -0.357678    0.268195   -1.334 0.182319    
##                               -0.160622         NaN      NaN      NaN    
##                               -0.272324    0.133274   -2.043 0.041019 *  
##                               -0.200431    0.193784   -1.034 0.300998    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  27.37397 -7.134892 6.008559 -10.61024 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]  [,2]    [,3]    [,4]
## [1,] -0.017 0.480 -0.3008 -0.0187
## [2,]  0.262 0.245  0.0734 -0.2685
## [3,] -0.232 0.224  0.6553  0.3546
## [4,]  0.405 0.110  0.1233  0.6619
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]  [,2]    [,3]   [,4]
## [1,] -0.19870 0.675 -0.2769  0.152
## [2,]  0.00334 0.481  0.0582 -0.372
## [3,]  0.13801 0.225  0.2883  0.484
## [4,]  0.35768 0.161  0.2723  0.200
##   
## Residuals cov-matrix: 
##           [,1]       [,2]       [,3]      [,4]
## [1,]  39.76496  16.635758 -27.374863 -20.54865
## [2,]  16.63576  52.310336  -5.968715 -17.62869
## [3,] -27.37486  -5.968715  93.359362  28.91497
## [4,] -20.54865 -17.628690  28.914974  50.78685
## ---- 
## aic=  16.38232 
## bic=  17.53869 
## Number of parameters:  36 
## initial estimates:  22.5453 4.8118 -1.8957 -1.1409 -0.1478 -0.138 0.1511 -0.0913 -0.3083 0.0879 -0.0168 -0.0434 -0.0154 -0.0512 0.9021 -0.0044 0.078 -0.0801 0.0759 0.9014 0.2029 -0.0372 0.5954 -0.295 1.1963 -0.9247 1.5233 -0.4731 0.1406 -0.0581 -1.6107 1.1793 -0.1267 0.0893 -0.558 0.2193 
## Par. lower-bounds:  16.3618 -2.7989 -5.8183 -4.2668 -0.4415 -0.3613 -0.007 -0.2714 -0.6697 -0.1868 -0.2114 -0.2651 -0.2017 -0.1928 0.8018 -0.1187 -0.0704 -0.1929 -0.0041 0.8103 -0.6008 -0.5982 -0.6815 -1.8726 0.2072 -1.6152 -0.0484 -2.4147 -0.3692 -0.414 -2.4207 0.1786 -0.533 -0.1943 -1.2035 -0.5781 
## Par. upper-bounds:  28.7287 12.4224 2.0268 1.9849 0.1459 0.0853 0.3093 0.0889 0.0532 0.3627 0.1779 0.1783 0.1709 0.0905 1.0024 0.1098 0.2265 0.0328 0.1558 0.9924 1.0065 0.5238 1.8724 1.2825 2.1855 -0.2342 3.095 1.4685 0.6504 0.2978 -0.8006 2.18 0.2796 0.3729 0.0875 1.0168 
## Final   Estimates:  22.45757 4.892126 -1.900291 -1.14318 -0.2159341 -0.159303 -0.003823571 0.0719551 -0.3261026 0.01792245 -0.1542759 0.1782921 0.08426513 -0.02081175 1.002401 -0.06048741 0.07160295 0.03280097 0.123727 0.8103122 0.5233753 0.05313807 0.3577901 -0.1273182 0.7423323 -0.2341579 0.6724234 -0.6938433 -0.3692054 0.04475716 -0.8006143 1.04509 -0.09355827 -0.1943066 -0.2968048 -0.1465132
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          22.457572         NaN      NaN      NaN    
## loneliness_state_pmc          4.892126         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -1.900291         NaN      NaN      NaN    
## responsiveness_state_pmc     -1.143180    5.278404   -0.217  0.82854    
## depressedmood_state          -0.215934         NaN      NaN      NaN    
## loneliness_state_pmc         -0.159303    0.059989   -2.656  0.00792 ** 
## socintsatisfaction_state_pmc -0.003824    0.086846   -0.044  0.96488    
## responsiveness_state_pmc      0.071955    0.175722    0.409  0.68219    
## depressedmood_state          -0.326103         NaN      NaN      NaN    
## loneliness_state_pmc          0.017922         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.154276    0.077396   -1.993  0.04622 *  
## responsiveness_state_pmc      0.178292    0.201682    0.884  0.37668    
## depressedmood_state           0.084265         NaN      NaN      NaN    
## loneliness_state_pmc         -0.020812    0.169004   -0.123  0.90199    
## socintsatisfaction_state_pmc  1.002401    0.030457   32.912  < 2e-16 ***
## responsiveness_state_pmc     -0.060487    0.108561   -0.557  0.57741    
## depressedmood_state           0.071603    0.262557    0.273  0.78507    
## loneliness_state_pmc          0.032801    0.155509    0.211  0.83294    
## socintsatisfaction_state_pmc  0.123727    0.078661    1.573  0.11574    
## responsiveness_state_pmc      0.810312    0.103881    7.800 6.22e-15 ***
##                               0.523375         NaN      NaN      NaN    
##                               0.053138         NaN      NaN      NaN    
##                               0.357790         NaN      NaN      NaN    
##                              -0.127318    0.094598   -1.346  0.17834    
##                               0.742332    0.115349    6.436 1.23e-10 ***
##                              -0.234158    0.196633   -1.191  0.23372    
##                               0.672423         NaN      NaN      NaN    
##                              -0.693843    0.285364   -2.431  0.01504 *  
##                              -0.369205         NaN      NaN      NaN    
##                               0.044757    0.099281    0.451  0.65213    
##                              -0.800614         NaN      NaN      NaN    
##                               1.045090    0.212937    4.908 9.20e-07 ***
##                              -0.093558    0.205833   -0.455  0.64944    
##                              -0.194307    0.190282   -1.021  0.30718    
##                              -0.296805    0.147752   -2.009  0.04456 *  
##                              -0.146513    0.197476   -0.742  0.45813    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  22.45757 4.892126 -1.900291 -1.14318 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]     [,3]    [,4]
## [1,] -0.2159 -0.1593 -0.00382  0.0720
## [2,] -0.3261  0.0179 -0.15428  0.1783
## [3,]  0.0843 -0.0208  1.00240 -0.0605
## [4,]  0.0716  0.0328  0.12373  0.8103
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]   [,3]   [,4]
## [1,] -0.5234 -0.0531 -0.358  0.127
## [2,] -0.7423  0.2342 -0.672  0.694
## [3,]  0.3692 -0.0448  0.801 -1.045
## [4,]  0.0936  0.1943  0.297  0.147
##   
## Residuals cov-matrix: 
##            [,1]      [,2]       [,3]      [,4]
## [1,]  32.401763  23.76068 -25.273726 -3.073445
## [2,]  23.760683  55.64142 -38.235564 -1.526930
## [3,] -25.273726 -38.23556 112.983083 -4.709721
## [4,]  -3.073445  -1.52693  -4.709721 13.600886
## ---- 
## aic=  15.11582 
## bic=  16.27218 
## Number of parameters:  36 
## initial estimates:  22.7104 7.5489 -9.2411 -1.0272 0.0548 0.0171 0.1201 -0.1788 -0.2608 0.1156 0.1033 -0.054 0.434 -0.1701 0.4925 0.057 0.0601 0.0236 -0.0887 0.7892 0.1517 0.2611 0.2664 -0.1356 0.3929 -0.4303 0.225 0.2733 0.0602 -0.8081 1.2632 -0.1626 0.058 -0.1383 0.4655 -0.4908 
## Par. lower-bounds:  13.4613 0.0425 -16.7059 -6.911 -0.3164 -0.3374 -0.1099 -0.5118 -0.5621 -0.1721 -0.0834 -0.3242 0.1344 -0.4562 0.3069 -0.2118 -0.1761 -0.2019 -0.2351 0.5773 -0.3772 -0.6009 -0.45 -1.0933 -0.0363 -1.1299 -0.3564 -0.504 -0.3667 -1.5038 0.685 -0.9356 -0.2784 -0.6867 0.0098 -1.1001 
## Par. upper-bounds:  31.9594 15.0553 -1.7764 4.8567 0.426 0.3716 0.3501 0.1543 0.0405 0.4033 0.29 0.2163 0.7336 0.116 0.6782 0.3257 0.2962 0.2492 0.0576 1.001 0.6805 1.1231 0.9828 0.8222 0.8221 0.2693 0.8064 1.0507 0.487 -0.1124 1.8414 0.6104 0.3944 0.4101 0.9213 0.1185 
## Final   Estimates:  23.95487 5.529103 -7.906773 -2.239688 -0.01216483 0.3716353 0.2313272 -0.2590632 -0.2053078 0.2404772 0.2882833 0.09709994 0.2524644 -0.1040439 0.3076111 0.08802782 0.06596196 0.2491617 -0.1776461 0.7091614 0.1429951 -0.4570874 -0.1681056 0.2078824 -0.03630194 -0.02697508 -0.3563123 -0.5039524 0.3369083 -0.2305931 0.6971047 0.2149753 0.1234265 -0.3127835 0.3318528 0.1185087
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           23.95487     4.06588    5.892 3.82e-09 ***
## loneliness_state_pmc           5.52910         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -7.90677     3.06403   -2.581  0.00987 ** 
## responsiveness_state_pmc      -2.23969     2.79227   -0.802  0.42249    
## depressedmood_state           -0.01216     0.15918   -0.076  0.93908    
## loneliness_state_pmc           0.37164     0.24176    1.537  0.12425    
## socintsatisfaction_state_pmc   0.23133     0.15321    1.510  0.13108    
## responsiveness_state_pmc      -0.25906     0.26071   -0.994  0.32037    
## depressedmood_state           -0.20531         NaN      NaN      NaN    
## loneliness_state_pmc           0.24048     0.14497    1.659  0.09717 .  
## socintsatisfaction_state_pmc   0.28828     0.12499    2.306  0.02109 *  
## responsiveness_state_pmc       0.09710     0.21166    0.459  0.64641    
## depressedmood_state            0.25246     0.12127    2.082  0.03735 *  
## loneliness_state_pmc          -0.10404     0.27485   -0.379  0.70502    
## socintsatisfaction_state_pmc   0.30761         NaN      NaN      NaN    
## responsiveness_state_pmc       0.08803         NaN      NaN      NaN    
## depressedmood_state            0.06596     0.12520    0.527  0.59829    
## loneliness_state_pmc           0.24916     0.10998    2.265  0.02348 *  
## socintsatisfaction_state_pmc  -0.17765         NaN      NaN      NaN    
## responsiveness_state_pmc       0.70916         NaN      NaN      NaN    
##                                0.14300     0.18345    0.779  0.43569    
##                               -0.45709     0.26746   -1.709  0.08745 .  
##                               -0.16811     0.18183   -0.925  0.35522    
##                                0.20788     0.30525    0.681  0.49586    
##                               -0.03630         NaN      NaN      NaN    
##                               -0.02698     0.07112   -0.379  0.70447    
##                               -0.35631     0.19847   -1.795  0.07261 .  
##                               -0.50395     0.31456   -1.602  0.10913    
##                                0.33691     0.15434    2.183  0.02905 *  
##                               -0.23059     0.25077   -0.920  0.35781    
##                                0.69710     0.07545    9.239  < 2e-16 ***
##                                0.21498     0.17805    1.207  0.22729    
##                                0.12343     0.12351    0.999  0.31766    
##                               -0.31278     0.13197   -2.370  0.01779 *  
##                                0.33185     0.08334    3.982 6.84e-05 ***
##                                0.11851     0.13566    0.874  0.38235    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  23.95487 5.529103 -7.906773 -2.239688 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,] -0.0122  0.372  0.231 -0.2591
## [2,] -0.2053  0.240  0.288  0.0971
## [3,]  0.2525 -0.104  0.308  0.0880
## [4,]  0.0660  0.249 -0.178  0.7092
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]  [,2]   [,3]   [,4]
## [1,] -0.1430 0.457  0.168 -0.208
## [2,]  0.0363 0.027  0.356  0.504
## [3,] -0.3369 0.231 -0.697 -0.215
## [4,] -0.1234 0.313 -0.332 -0.119
##   
## Residuals cov-matrix: 
##            [,1]      [,2]       [,3]       [,4]
## [1,] 86.6496257 17.906763  -7.001322  0.9614735
## [2,] 17.9067626 65.941024  22.777871  6.1212425
## [3,] -7.0013216 22.777871 115.934201 30.4926163
## [4,]  0.9614735  6.121243  30.492616 36.0506877
## ---- 
## aic=  17.61421 
## bic=  18.77058 
## Number of parameters:  36 
## initial estimates:  15.9076 -10.6028 -5.6897 -9.0244 0.6181 -0.0922 0.1184 -0.1336 0.2029 0.048 -0.0093 -0.1453 0.116 -0.3577 0.7073 -0.1054 0.197 -0.3814 0.1206 0.385 -0.7908 0.3435 -0.7218 0.1575 -0.004 0.0283 -0.3462 0.2839 -0.2784 0.5094 -0.083 0.6851 -0.8103 0.4209 0.1729 0.0698 
## Par. lower-bounds:  3.9866 -22.3722 -19.3151 -21.8417 0.355 -0.4785 -0.055 -0.3692 -0.0569 -0.3334 -0.1805 -0.3778 -0.1847 -0.7993 0.5091 -0.3746 -0.0859 -0.7967 -0.0659 0.1318 -1.4369 -0.2975 -1.2695 -0.5414 -0.6418 -0.6045 -0.8869 -0.406 -1.0168 -0.2232 -0.709 -0.1136 -1.5049 -0.2682 -0.416 -0.6816 
## Par. upper-bounds:  27.8286 1.1666 7.9357 3.7928 0.8812 0.2942 0.2918 0.1019 0.4626 0.4295 0.1619 0.0873 0.4167 0.0839 0.9055 0.1638 0.4798 0.034 0.307 0.6383 -0.1448 0.9845 -0.1741 0.8563 0.6338 0.6611 0.1946 0.9738 0.46 1.242 0.543 1.4838 -0.1157 1.1101 0.7618 0.8211 
## Final   Estimates:  16.01186 -10.53965 -5.514284 -8.875093 0.6461512 0.0004496376 0.1932162 -0.3262565 0.2315211 0.3530185 0.09748758 -0.01430662 0.07251229 -0.3995823 0.5091473 -0.207382 0.1788202 -0.2295544 0.1168299 0.5110256 -0.1515541 -0.1250863 -0.2317565 0.01720638 0.03001902 -0.4592558 -0.328383 -0.3599622 -0.1008927 0.248124 0.4375468 0.2086663 -0.2670653 -0.157909 0.08927439 -0.2193553
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           1.601e+01   1.407e+01    1.138 0.255087    
## loneliness_state_pmc         -1.054e+01         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -5.514e+00         NaN      NaN      NaN    
## responsiveness_state_pmc     -8.875e+00   4.132e+01   -0.215 0.829918    
## depressedmood_state           6.462e-01   3.045e-01    2.122 0.033839 *  
## loneliness_state_pmc          4.496e-04   3.592e-01    0.001 0.999001    
## socintsatisfaction_state_pmc  1.932e-01   3.856e-01    0.501 0.616314    
## responsiveness_state_pmc     -3.263e-01   4.592e-01   -0.711 0.477357    
## depressedmood_state           2.315e-01         NaN      NaN      NaN    
## loneliness_state_pmc          3.530e-01         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  9.749e-02   3.052e-01    0.319 0.749407    
## responsiveness_state_pmc     -1.431e-02   6.597e-01   -0.022 0.982698    
## depressedmood_state           7.251e-02         NaN      NaN      NaN    
## loneliness_state_pmc         -3.996e-01   2.023e-01   -1.975 0.048219 *  
## socintsatisfaction_state_pmc  5.091e-01   1.508e-01    3.376 0.000735 ***
## responsiveness_state_pmc     -2.074e-01   4.682e-01   -0.443 0.657813    
## depressedmood_state           1.788e-01   8.828e-01    0.203 0.839479    
## loneliness_state_pmc         -2.296e-01   1.719e+00   -0.134 0.893737    
## socintsatisfaction_state_pmc  1.168e-01   2.540e-01    0.460 0.645530    
## responsiveness_state_pmc      5.110e-01   1.540e-01    3.318 0.000907 ***
##                              -1.516e-01   2.851e-01   -0.532 0.595067    
##                              -1.251e-01   6.200e-01   -0.202 0.840105    
##                              -2.318e-01   4.532e-01   -0.511 0.609086    
##                               1.721e-02   4.182e-01    0.041 0.967183    
##                               3.002e-02         NaN      NaN      NaN    
##                              -4.593e-01         NaN      NaN      NaN    
##                              -3.284e-01   4.458e-01   -0.737 0.461400    
##                              -3.600e-01   1.047e+00   -0.344 0.731055    
##                              -1.009e-01         NaN      NaN      NaN    
##                               2.481e-01   2.788e-01    0.890 0.373463    
##                               4.375e-01   1.285e-01    3.405 0.000661 ***
##                               2.087e-01   4.159e-01    0.502 0.615902    
##                              -2.671e-01   9.428e-01   -0.283 0.776960    
##                              -1.579e-01   2.054e+00   -0.077 0.938726    
##                               8.927e-02   1.891e-01    0.472 0.636847    
##                              -2.194e-01   1.426e-01   -1.538 0.124113    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  16.01186 -10.53965 -5.514284 -8.875093 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]     [,2]   [,3]    [,4]
## [1,] 0.6462  0.00045 0.1932 -0.3263
## [2,] 0.2315  0.35302 0.0975 -0.0143
## [3,] 0.0725 -0.39958 0.5091 -0.2074
## [4,] 0.1788 -0.22955 0.1168  0.5110
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]    [,3]    [,4]
## [1,]  0.152  0.125  0.2318 -0.0172
## [2,] -0.030  0.459  0.3284  0.3600
## [3,]  0.101 -0.248 -0.4375 -0.2087
## [4,]  0.267  0.158 -0.0893  0.2194
##   
## Residuals cov-matrix: 
##             [,1]       [,2]        [,3]       [,4]
## [1,] 153.3281832  58.831429  -0.5193958  -8.195697
## [2,]  58.8314286 107.404336   4.4198407 -34.022104
## [3,]  -0.5193958   4.419841 147.3423652  38.717927
## [4,]  -8.1956967 -34.022104  38.7179272 115.605457
## ---- 
## aic=  20.02381 
## bic=  21.18018 
## Number of parameters:  36 
## initial estimates:  7.011 1.251 4.2451 -4.3672 0.3133 -0.0547 0.0149 -0.017 -0.0367 0.3453 -0.0754 -0.0855 -0.639 -0.318 0.5333 -0.1994 0.3086 -0.0983 0.0641 0.4504 -1.0532 -0.18 -0.0396 -0.0802 0.1328 -0.2765 0.0704 0.2743 -1.4012 0.3296 -0.7367 0.7381 0.21 -0.0635 -0.4273 0.3257 
## Par. lower-bounds:  4.2053 -4.1163 -8.0019 -11.7388 0.0616 -0.2204 -0.0549 -0.1414 -0.5182 0.0284 -0.209 -0.3234 -1.7377 -1.0411 0.2285 -0.7422 -0.3528 -0.5335 -0.1194 0.1237 -1.7582 -0.4793 -0.2378 -0.3552 -1.2158 -0.8491 -0.3089 -0.2518 -4.4785 -0.9768 -1.6021 -0.4622 -1.6422 -0.8498 -0.9482 -0.3968 
## Par. upper-bounds:  9.8166 6.6184 16.4921 3.0044 0.565 0.1109 0.0848 0.1073 0.4449 0.6623 0.0582 0.1524 0.4597 0.4052 0.8382 0.3434 0.9699 0.337 0.2476 0.7772 -0.3482 0.1193 0.1587 0.1948 1.4815 0.296 0.4497 0.8003 1.676 1.636 0.1287 1.9384 2.0623 0.7229 0.0936 1.0482 
## Final   Estimates:  7.044899 1.306134 4.218818 -4.317806 0.360225 0.09310465 0.08124952 -0.1257545 -0.1104774 0.6267353 -0.1565067 -0.2287251 -0.3685946 -0.3945883 0.6332759 -0.3476561 0.3959076 -0.198128 0.2419792 0.42359 -0.428776 -0.4166813 -0.1298187 0.1428026 -0.2658549 -0.8490513 0.08423802 0.2795262 -0.9571645 0.3671106 -0.4177084 0.5695706 0.01582219 0.378409 -0.3381674 0.116259
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state            7.04490     2.22736    3.163  0.00156 ** 
## loneliness_state_pmc           1.30613     0.21469    6.084 1.17e-09 ***
## socintsatisfaction_state_pmc   4.21882     9.72957    0.434  0.66457    
## responsiveness_state_pmc      -4.31781         NaN      NaN      NaN    
## depressedmood_state            0.36023     0.18588    1.938  0.05264 .  
## loneliness_state_pmc           0.09310         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.08125     0.07993    1.017  0.30937    
## responsiveness_state_pmc      -0.12575         NaN      NaN      NaN    
## depressedmood_state           -0.11048     0.10481   -1.054  0.29185    
## loneliness_state_pmc           0.62674     0.13556    4.623 3.78e-06 ***
## socintsatisfaction_state_pmc  -0.15651     0.09650   -1.622  0.10483    
## responsiveness_state_pmc      -0.22873     0.11683   -1.958  0.05026 .  
## depressedmood_state           -0.36859     1.01001   -0.365  0.71516    
## loneliness_state_pmc          -0.39459     0.71591   -0.551  0.58152    
## socintsatisfaction_state_pmc   0.63328     0.21087    3.003  0.00267 ** 
## responsiveness_state_pmc      -0.34766     0.55947   -0.621  0.53434    
## depressedmood_state            0.39591         NaN      NaN      NaN    
## loneliness_state_pmc          -0.19813     0.25058   -0.791  0.42913    
## socintsatisfaction_state_pmc   0.24198     0.19915    1.215  0.22434    
## responsiveness_state_pmc       0.42359     0.19110    2.217  0.02665 *  
##                               -0.42878     0.21611   -1.984  0.04724 *  
##                               -0.41668     0.05728   -7.274 3.48e-13 ***
##                               -0.12982     0.08983   -1.445  0.14842    
##                                0.14280         NaN      NaN      NaN    
##                               -0.26585         NaN      NaN      NaN    
##                               -0.84905     0.14991   -5.664 1.48e-08 ***
##                                0.08424     0.09893    0.851  0.39450    
##                                0.27953     0.11432    2.445  0.01448 *  
##                               -0.95716     0.97558   -0.981  0.32653    
##                                0.36711     0.81960    0.448  0.65422    
##                               -0.41771     0.23746   -1.759  0.07857 .  
##                                0.56957     0.63512    0.897  0.36983    
##                                0.01582         NaN      NaN      NaN    
##                                0.37841     0.27758    1.363  0.17281    
##                               -0.33817     0.21645   -1.562  0.11821    
##                                0.11626     0.20635    0.563  0.57316    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  7.044899 1.306134 4.218818 -4.317806 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]    [,3]   [,4]
## [1,]  0.360  0.0931  0.0812 -0.126
## [2,] -0.110  0.6267 -0.1565 -0.229
## [3,] -0.369 -0.3946  0.6333 -0.348
## [4,]  0.396 -0.1981  0.2420  0.424
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,]  0.4288  0.417  0.1298 -0.143
## [2,]  0.2659  0.849 -0.0842 -0.280
## [3,]  0.9572 -0.367  0.4177 -0.570
## [4,] -0.0158 -0.378  0.3382 -0.116
##   
## Residuals cov-matrix: 
##            [,1]      [,2]      [,3]       [,4]
## [1,]  22.186593 -17.79715  12.90122   6.644592
## [2,] -17.797146  75.42287 -54.71919 -41.353813
## [3,]  12.901223 -54.71919 470.33931 177.993605
## [4,]   6.644592 -41.35381 177.99360 158.577537
## ---- 
## aic=  18.74346 
## bic=  19.89983 
## Number of parameters:  36 
## initial estimates:  7.2592 -4.7655 1.2821 -1.5459 0.2634 -0.0786 -0.0889 -0.0422 0.3256 -0.0584 -0.1707 -0.5364 -0.1489 0.0664 0.462 0.32 0.0969 0.0456 0.3356 0.0987 0.0575 0.0321 0.1629 -0.2825 -0.3089 -0.129 0.5897 -0.7971 1.4186 -0.2472 -0.7234 1.4063 0.3972 -0.2101 -0.4899 0.6831 
## Par. lower-bounds:  3.1876 -13.864 -6.9118 -6.2754 -0.0951 -0.273 -0.292 -0.4051 -0.4754 -0.4927 -0.6246 -1.3474 -0.8703 -0.3248 0.0533 -0.4103 -0.3194 -0.1802 0.0996 -0.3229 -0.82 -0.3498 -0.2211 -0.9122 -2.2698 -0.9824 -0.2683 -2.2042 -0.3474 -1.0158 -1.4961 0.1391 -0.6221 -0.6538 -0.9359 -0.0483 
## Par. upper-bounds:  11.3308 4.333 9.4759 3.1837 0.6218 0.1157 0.1142 0.3208 1.1266 0.376 0.2832 0.2746 0.5725 0.4576 0.8708 1.0504 0.5133 0.2714 0.5715 0.5203 0.935 0.414 0.5468 0.3471 1.6521 0.7245 1.4476 0.61 3.1845 0.5214 0.0492 2.6735 1.4166 0.2335 -0.0439 1.4145 
## Final   Estimates:  8.062758 -6.962148 -0.1824975 -1.542613 0.2405601 -0.2497974 -0.2920059 0.3207623 0.5365824 -0.4927436 -0.4556974 -0.09113432 -0.02231247 -0.3247622 0.2422275 0.1495413 0.1377865 0.271351 0.3258062 0.04720739 0.1050327 0.2767195 0.4294582 -0.4886024 -0.1554084 0.5609006 0.5536734 -0.4685429 -0.0206049 0.2908439 0.04704343 0.2883275 0.01042644 -0.4637263 -0.1128032 -0.04833339
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state            8.06276     3.15417    2.556 0.010582 *  
## loneliness_state_pmc          -6.96215         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.18250         NaN      NaN      NaN    
## responsiveness_state_pmc      -1.54261         NaN      NaN      NaN    
## depressedmood_state            0.24056     0.29524    0.815 0.415188    
## loneliness_state_pmc          -0.24980         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.29201         NaN      NaN      NaN    
## responsiveness_state_pmc       0.32076     0.15098    2.125 0.033626 *  
## depressedmood_state            0.53658         NaN      NaN      NaN    
## loneliness_state_pmc          -0.49274         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.45570     0.20710   -2.200 0.027778 *  
## responsiveness_state_pmc      -0.09113     0.27550   -0.331 0.740803    
## depressedmood_state           -0.02231         NaN      NaN      NaN    
## loneliness_state_pmc          -0.32476     0.22157   -1.466 0.142714    
## socintsatisfaction_state_pmc   0.24223     0.20978    1.155 0.248223    
## responsiveness_state_pmc       0.14954     0.64407    0.232 0.816398    
## depressedmood_state            0.13779         NaN      NaN      NaN    
## loneliness_state_pmc           0.27135     0.02962    9.161  < 2e-16 ***
## socintsatisfaction_state_pmc   0.32581     0.21090    1.545 0.122382    
## responsiveness_state_pmc       0.04721     0.36399    0.130 0.896809    
##                                0.10503     0.30692    0.342 0.732185    
##                                0.27672         NaN      NaN      NaN    
##                                0.42946         NaN      NaN      NaN    
##                               -0.48860     0.18966   -2.576 0.009988 ** 
##                               -0.15541         NaN      NaN      NaN    
##                                0.56090         NaN      NaN      NaN    
##                                0.55367     0.16313    3.394 0.000689 ***
##                               -0.46854     0.35078   -1.336 0.181636    
##                               -0.02060         NaN      NaN      NaN    
##                                0.29084     0.07282    3.994 6.49e-05 ***
##                                0.04704     0.21217    0.222 0.824530    
##                                0.28833     0.67579    0.427 0.669631    
##                                0.01043         NaN      NaN      NaN    
##                               -0.46373         NaN      NaN      NaN    
##                               -0.11280     0.18776   -0.601 0.547987    
##                               -0.04833     0.40094   -0.121 0.904047    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  8.062758 -6.962148 -0.1824975 -1.542613 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,]  0.2406 -0.250 -0.292  0.3208
## [2,]  0.5366 -0.493 -0.456 -0.0911
## [3,] -0.0223 -0.325  0.242  0.1495
## [4,]  0.1378  0.271  0.326  0.0472
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,] -0.1050 -0.277 -0.429  0.4886
## [2,]  0.1554 -0.561 -0.554  0.4685
## [3,]  0.0206 -0.291 -0.047 -0.2883
## [4,] -0.0104  0.464  0.113  0.0483
##   
## Residuals cov-matrix: 
##            [,1]      [,2]      [,3]       [,4]
## [1,]  40.829986  53.72158 -20.50646  -9.860812
## [2,]  53.721584 212.47079 -94.27934 -58.227736
## [3,] -20.506461 -94.27934 148.40125  62.236233
## [4,]  -9.860812 -58.22774  62.23623  53.795457
## ---- 
## aic=  17.57192 
## bic=  18.72829 
## Number of parameters:  36 
## initial estimates:  50.5146 -1.2653 4.6238 3.8025 -0.0589 -0.1185 -0.2541 -0.1423 0.0361 0.0327 -0.2806 0.2079 -0.0933 0.1622 0.5354 -0.1916 -0.0776 0.0056 -0.0485 0.2331 0.3816 0.0612 -0.4134 1.1629 0.1419 0.0794 0.4701 -0.4477 0.3742 0.0302 -1.1039 1.7206 0.1154 -0.375 -0.0132 0.0834 
## Par. lower-bounds:  34.3932 -12.706 -10.9992 -5.1039 -0.3824 -0.5815 -0.5332 -0.7251 -0.1935 -0.2958 -0.4787 -0.2057 -0.4068 -0.2864 0.2649 -0.7564 -0.2563 -0.2502 -0.2027 -0.0889 -0.2144 -0.845 -1.3648 -0.3437 -0.2811 -0.5637 -0.205 -1.517 -0.2034 -0.8481 -2.0258 0.2605 -0.2139 -0.8756 -0.5388 -0.749 
## Par. upper-bounds:  66.6361 10.1753 20.2469 12.709 0.2646 0.3444 0.025 0.4405 0.2657 0.3613 -0.0825 0.6215 0.2202 0.6109 0.8059 0.3732 0.1011 0.2614 0.1057 0.5551 0.9777 0.9675 0.5379 2.6696 0.5649 0.7226 1.1452 0.6215 0.9519 0.9084 -0.1819 3.1807 0.4447 0.1257 0.5123 0.9158 
## Final   Estimates:  50.4907 -1.236444 4.660678 3.757335 -0.145958 0.2051395 -0.2495798 -0.4134736 -0.0514284 -0.2958138 -0.4009997 -0.200386 -0.1496639 -0.2843546 0.3909034 -0.1930596 -0.07886746 0.2558782 0.1057426 0.1113707 0.2951255 -0.5496411 -0.3325609 1.047261 0.2371648 0.3026957 -0.008923576 0.6209447 0.1691139 0.5566186 -0.1829024 0.5236669 0.05514019 -0.4339221 -0.4892011 0.7262472
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          50.490700         NaN      NaN      NaN    
## loneliness_state_pmc         -1.236444    6.390896   -0.193  0.84659    
## socintsatisfaction_state_pmc  4.660678         NaN      NaN      NaN    
## responsiveness_state_pmc      3.757335         NaN      NaN      NaN    
## depressedmood_state          -0.145958         NaN      NaN      NaN    
## loneliness_state_pmc          0.205140         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.249580         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.413474    0.144367   -2.864  0.00418 ** 
## depressedmood_state          -0.051428    0.113141   -0.455  0.64943    
## loneliness_state_pmc         -0.295814    0.104508   -2.831  0.00465 ** 
## socintsatisfaction_state_pmc -0.401000         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.200386    0.102312   -1.959  0.05016 .  
## depressedmood_state          -0.149664         NaN      NaN      NaN    
## loneliness_state_pmc         -0.284355         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.390903    0.169826    2.302  0.02135 *  
## responsiveness_state_pmc     -0.193060    0.190222   -1.015  0.31014    
## depressedmood_state          -0.078867         NaN      NaN      NaN    
## loneliness_state_pmc          0.255878    0.024709   10.356  < 2e-16 ***
## socintsatisfaction_state_pmc  0.105743         NaN      NaN      NaN    
## responsiveness_state_pmc      0.111371    0.127264    0.875  0.38151    
##                               0.295126         NaN      NaN      NaN    
##                              -0.549641         NaN      NaN      NaN    
##                              -0.332561         NaN      NaN      NaN    
##                               1.047261         NaN      NaN      NaN    
##                               0.237165    0.037272    6.363 1.98e-10 ***
##                               0.302696    0.109256    2.771  0.00560 ** 
##                              -0.008924         NaN      NaN      NaN    
##                               0.620945         NaN      NaN      NaN    
##                               0.169114         NaN      NaN      NaN    
##                               0.556619         NaN      NaN      NaN    
##                              -0.182902    0.114156   -1.602  0.10911    
##                               0.523667         NaN      NaN      NaN    
##                               0.055140         NaN      NaN      NaN    
##                              -0.433922         NaN      NaN      NaN    
##                              -0.489201         NaN      NaN      NaN    
##                               0.726247         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  50.4907 -1.236444 4.660678 3.757335 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,] -0.1460  0.205 -0.250 -0.413
## [2,] -0.0514 -0.296 -0.401 -0.200
## [3,] -0.1497 -0.284  0.391 -0.193
## [4,] -0.0789  0.256  0.106  0.111
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,] -0.2951  0.550 0.33256 -1.047
## [2,] -0.2372 -0.303 0.00892 -0.621
## [3,] -0.1691 -0.557 0.18290 -0.524
## [4,] -0.0551  0.434 0.48920 -0.726
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 354.75035  83.71897  -5.58263 -25.18015
## [2,]  83.71897 176.90460 -59.32318 -24.19828
## [3,]  -5.58263 -59.32318 411.87523 164.47394
## [4,] -25.18015 -24.19828 164.47394 123.86876
## ---- 
## aic=  21.95934 
## bic=  23.11571 
## Number of parameters:  36 
## initial estimates:  44.164 -9.2618 -5.5058 4.4467 0.1429 0.1274 0.4622 -1.0607 0.1829 -0.1051 -0.1479 0.1858 0.0897 -0.0604 0.8629 0.2193 -0.0792 -0.0063 0.0852 0.7805 -0.0013 -0.2138 -1.4189 0.5254 -0.2847 0.1522 -1.2011 2.3543 0.1199 0.0158 -0.9933 2.0568 0.2408 0.0272 -0.2435 0.2358 
## Par. lower-bounds:  30.3835 -23.8329 -16.6198 -1.7104 -0.1259 -0.1392 0.1817 -1.6527 -0.1013 -0.3869 -0.4445 -0.4401 -0.127 -0.2754 0.6367 -0.2581 -0.1993 -0.1254 -0.0402 0.5161 -0.5517 -0.8796 -2.7013 -2.1919 -0.8667 -0.5518 -2.5571 -0.5189 -0.324 -0.5212 -2.0276 -0.1347 -0.0051 -0.2703 -0.8165 -0.9783 
## Par. upper-bounds:  57.9444 5.3092 5.6082 10.6039 0.4117 0.394 0.7427 -0.4688 0.467 0.1768 0.1487 0.8117 0.3065 0.1546 1.0891 0.6967 0.0409 0.1128 0.2105 1.045 0.5491 0.452 -0.1364 3.2427 0.2973 0.8562 0.1549 5.2275 0.5638 0.5528 0.0411 4.2483 0.4868 0.3247 0.3295 1.4499 
## Final   Estimates:  44.16986 -9.270428 -5.444622 4.356474 0.1468602 0.1499172 0.4868872 -1.089205 0.2005973 -0.248354 -0.07995824 0.0158651 0.1142287 -0.2367517 0.9853418 -0.06969116 -0.073451 -0.05612386 0.09862496 0.7371998 0.005437803 -0.05405478 -0.9193348 0.6234202 -0.1399283 0.1323889 -1.145842 1.988831 0.1152412 0.1326511 -0.683748 1.561517 0.1961414 -0.02163658 -0.218858 0.5528443
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          44.169864         NaN      NaN      NaN    
## loneliness_state_pmc         -9.270428         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -5.444622         NaN      NaN      NaN    
## responsiveness_state_pmc      4.356474    3.284806    1.326   0.1848    
## depressedmood_state           0.146860         NaN      NaN      NaN    
## loneliness_state_pmc          0.149917         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.486887         NaN      NaN      NaN    
## responsiveness_state_pmc     -1.089205         NaN      NaN      NaN    
## depressedmood_state           0.200597         NaN      NaN      NaN    
## loneliness_state_pmc         -0.248354    0.151837   -1.636   0.1019    
## socintsatisfaction_state_pmc -0.079958    0.134341   -0.595   0.5517    
## responsiveness_state_pmc      0.015865    0.239236    0.066   0.9471    
## depressedmood_state           0.114229         NaN      NaN      NaN    
## loneliness_state_pmc         -0.236752    0.171184   -1.383   0.1667    
## socintsatisfaction_state_pmc  0.985342    0.077211   12.762  < 2e-16 ***
## responsiveness_state_pmc     -0.069691    0.147491   -0.473   0.6366    
## depressedmood_state          -0.073451    0.056561   -1.299   0.1941    
## loneliness_state_pmc         -0.056124    0.116294   -0.483   0.6294    
## socintsatisfaction_state_pmc  0.098625    0.068141    1.447   0.1478    
## responsiveness_state_pmc      0.737200    0.123917    5.949 2.70e-09 ***
##                               0.005438         NaN      NaN      NaN    
##                              -0.054055         NaN      NaN      NaN    
##                              -0.919335    0.144932   -6.343 2.25e-10 ***
##                               0.623420    0.943352    0.661   0.5087    
##                              -0.139928         NaN      NaN      NaN    
##                               0.132389    0.023326    5.676 1.38e-08 ***
##                              -1.145842    0.777387   -1.474   0.1405    
##                               1.988831    0.766884    2.593   0.0095 ** 
##                               0.115241         NaN      NaN      NaN    
##                               0.132651    0.130536    1.016   0.3095    
##                              -0.683748    0.322890   -2.118   0.0342 *  
##                               1.561517         NaN      NaN      NaN    
##                               0.196141         NaN      NaN      NaN    
##                              -0.021637    0.097303   -0.222   0.8240    
##                              -0.218858    0.190896   -1.146   0.2516    
##                               0.552844    0.137296    4.027 5.66e-05 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  44.16986 -9.270428 -5.444622 4.356474 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]    [,3]    [,4]
## [1,]  0.1469  0.1499  0.4869 -1.0892
## [2,]  0.2006 -0.2484 -0.0800  0.0159
## [3,]  0.1142 -0.2368  0.9853 -0.0697
## [4,] -0.0735 -0.0561  0.0986  0.7372
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]    [,2]  [,3]   [,4]
## [1,] -0.00544  0.0541 0.919 -0.623
## [2,]  0.13993 -0.1324 1.146 -1.989
## [3,] -0.11524 -0.1327 0.684 -1.562
## [4,] -0.19614  0.0216 0.219 -0.553
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]     [,4]
## [1,] 38.041760 12.528323  4.825334 1.641869
## [2,] 12.528323 63.769951 20.053032 6.910673
## [3,]  4.825334 20.053032 24.600256 8.589112
## [4,]  1.641869  6.910673  8.589112 5.603233
## ---- 
## aic=  12.61815 
## bic=  13.77452 
## Number of parameters:  36 
## initial estimates:  74.889 -18.7093 -27.4478 -2.4716 0.1872 0.1959 0.025 -0.0078 0.2009 0.2718 -0.0873 -0.1581 0.2946 -0.3333 0.7296 -0.3874 0.0293 -0.3109 0.1132 0.2278 -0.3171 0.4015 -0.1214 0.9503 0.6425 -1.0683 -0.4248 0.3784 -0.694 0.3419 -0.469 0.1841 0.0319 0.4469 0.6697 -0.7372 
## Par. lower-bounds:  42.7918 -57.4684 -86.0044 -38.3814 -0.162 -0.0494 -0.1616 -0.2732 -0.2208 -0.0244 -0.3126 -0.4785 -0.3424 -0.7808 0.3891 -0.8716 -0.3613 -0.5853 -0.0956 -0.0691 -0.9123 -0.2233 -0.5266 0.1827 -0.0761 -1.8228 -0.914 -0.5485 -1.7797 -0.798 -1.2081 -1.2162 -0.6339 -0.2521 0.2164 -1.5959 
## Par. upper-bounds:  106.9861 20.0497 31.1088 33.4382 0.5363 0.4412 0.2117 0.2575 0.6225 0.568 0.1381 0.1624 0.9316 0.1142 1.0701 0.0967 0.4199 -0.0364 0.322 0.5247 0.278 1.0263 0.2838 1.7179 1.3612 -0.3138 0.0645 1.3053 0.3918 1.4818 0.2702 1.5844 0.6977 1.146 1.123 0.1216 
## Final   Estimates:  74.88897 -18.70932 -27.44777 -2.471609 0.1871652 0.195894 0.02503354 -0.007836331 0.2008588 0.2717805 -0.08725402 -0.1580616 0.2946246 -0.3333017 0.7295899 -0.3874419 0.02929302 -0.3108871 0.113236 0.2277621 -0.3171308 0.4015243 -0.121413 0.9503069 0.6425398 -1.068337 -0.4247544 0.378391 -0.693955 0.3418644 -0.468965 0.1840832 0.03190569 0.4469186 0.6696834 -0.7371589 
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)
## depressedmood_state           74.888969         NaN      NaN      NaN
## loneliness_state_pmc         -18.709317         NaN      NaN      NaN
## socintsatisfaction_state_pmc -27.447773         NaN      NaN      NaN
## responsiveness_state_pmc      -2.471609         NaN      NaN      NaN
## depressedmood_state            0.187165         NaN      NaN      NaN
## loneliness_state_pmc           0.195894         NaN      NaN      NaN
## socintsatisfaction_state_pmc   0.025034         NaN      NaN      NaN
## responsiveness_state_pmc      -0.007836         NaN      NaN      NaN
## depressedmood_state            0.200859         NaN      NaN      NaN
## loneliness_state_pmc           0.271781         NaN      NaN      NaN
## socintsatisfaction_state_pmc  -0.087254         NaN      NaN      NaN
## responsiveness_state_pmc      -0.158062         NaN      NaN      NaN
## depressedmood_state            0.294625         NaN      NaN      NaN
## loneliness_state_pmc          -0.333302         NaN      NaN      NaN
## socintsatisfaction_state_pmc   0.729590         NaN      NaN      NaN
## responsiveness_state_pmc      -0.387442         NaN      NaN      NaN
## depressedmood_state            0.029293         NaN      NaN      NaN
## loneliness_state_pmc          -0.310887         NaN      NaN      NaN
## socintsatisfaction_state_pmc   0.113236         NaN      NaN      NaN
## responsiveness_state_pmc       0.227762         NaN      NaN      NaN
##                               -0.317131         NaN      NaN      NaN
##                                0.401524         NaN      NaN      NaN
##                               -0.121413         NaN      NaN      NaN
##                                0.950307         NaN      NaN      NaN
##                                0.642540         NaN      NaN      NaN
##                               -1.068337         NaN      NaN      NaN
##                               -0.424754         NaN      NaN      NaN
##                                0.378391         NaN      NaN      NaN
##                               -0.693955         NaN      NaN      NaN
##                                0.341864         NaN      NaN      NaN
##                               -0.468965         NaN      NaN      NaN
##                                0.184083         NaN      NaN      NaN
##                                0.031906         NaN      NaN      NaN
##                                0.446919         NaN      NaN      NaN
##                                0.669683         NaN      NaN      NaN
##                               -0.737159         NaN      NaN      NaN
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  74.88897 -18.70932 -27.44777 -2.471609 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]    [,3]     [,4]
## [1,] 0.1872  0.196  0.0250 -0.00784
## [2,] 0.2009  0.272 -0.0873 -0.15806
## [3,] 0.2946 -0.333  0.7296 -0.38744
## [4,] 0.0293 -0.311  0.1132  0.22776
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,]  0.3171 -0.402  0.121 -0.950
## [2,] -0.6425  1.068  0.425 -0.378
## [3,]  0.6940 -0.342  0.469 -0.184
## [4,] -0.0319 -0.447 -0.670  0.737
##   
## Residuals cov-matrix: 
##               [,1]          [,2]          [,3]          [,4]
## [1,]  6.993195e+18  3.803711e+18  5.627234e+18 -8.760221e+18
## [2,]  3.803711e+18  2.068900e+18  3.060743e+18 -4.764825e+18
## [3,]  5.627234e+18  3.060743e+18  4.528082e+18 -7.049112e+18
## [4,] -8.760221e+18 -4.764825e+18 -7.049112e+18  1.097374e+19
## Warning in log(dd): NaNs produced
## ---- 
## aic=  NaN 
## bic=  NaN 
## Number of parameters:  36 
## initial estimates:  14.4635 -9.5579 3.8695 3.1671 0.4877 -0.0014 0.0336 -0.0757 0.3724 -0.2008 0.1421 -0.0707 -0.1408 0.1325 0.5316 0.1261 -0.1587 0.0862 -0.1748 0.7358 -0.4512 -0.2714 -0.0836 0.5531 -0.1482 -0.0168 -0.1608 -0.036 -0.166 -0.0282 0.0778 0.3083 0.1232 0.4184 0.5108 -0.6596 
## Par. lower-bounds:  5.581 -19.3979 -4.8097 -5.6901 0.1864 -0.2819 -0.2226 -0.3291 0.0386 -0.5115 -0.1418 -0.3514 -0.4352 -0.1416 0.2813 -0.1215 -0.4591 -0.1935 -0.4303 0.4832 -1.1071 -0.799 -0.7998 -0.49 -0.8748 -0.6013 -0.9542 -1.1915 -0.8069 -0.5437 -0.622 -0.7109 -0.5308 -0.1077 -0.2033 -1.6997 
## Par. upper-bounds:  23.346 0.2822 12.5486 12.0243 0.789 0.2791 0.2898 0.1776 0.7061 0.11 0.4259 0.21 0.1535 0.4067 0.782 0.3736 0.1417 0.3659 0.0807 0.9885 0.2047 0.2562 0.6326 1.5962 0.5783 0.5677 0.6326 1.1195 0.4749 0.4874 0.7776 1.3275 0.7772 0.9445 1.2249 0.3806 
## Final   Estimates:  13.10186 -12.93717 5.355709 4.183147 0.5329679 0.279131 -0.2226377 0.08308608 0.474823 0.1100203 0.05951814 -0.03112797 -0.183953 -0.1415721 0.4968089 0.1418037 -0.2015953 -0.1935447 0.07654754 0.4831882 -0.2077522 -0.2750179 0.5021945 -0.2092636 -0.2596753 -0.2646171 0.04884124 -0.03988447 0.3039033 0.1456404 0.2692132 0.02002827 0.3072533 0.3316436 -0.01476139 0.3805541 
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)
## depressedmood_state           13.10186    57.87133    0.226    0.821
## loneliness_state_pmc         -12.93717    53.70312   -0.241    0.810
## socintsatisfaction_state_pmc   5.35571    67.57674    0.079    0.937
## responsiveness_state_pmc       4.18315    23.37190    0.179    0.858
## depressedmood_state            0.53297     2.29042    0.233    0.816
## loneliness_state_pmc           0.27913     4.03295    0.069    0.945
## socintsatisfaction_state_pmc  -0.22264     1.00587   -0.221    0.825
## responsiveness_state_pmc       0.08309     1.16220    0.071    0.943
## depressedmood_state            0.47482     1.81532    0.262    0.794
## loneliness_state_pmc           0.11002     3.30869    0.033    0.973
## socintsatisfaction_state_pmc   0.05952     0.84923    0.070    0.944
## responsiveness_state_pmc      -0.03113     0.91784   -0.034    0.973
## depressedmood_state           -0.18395     2.59996   -0.071    0.944
## loneliness_state_pmc          -0.14157     2.69780   -0.052    0.958
## socintsatisfaction_state_pmc   0.49681     1.24209    0.400    0.689
## responsiveness_state_pmc       0.14180     2.27051    0.062    0.950
## depressedmood_state           -0.20160     0.64751   -0.311    0.756
## loneliness_state_pmc          -0.19354     4.47420   -0.043    0.965
## socintsatisfaction_state_pmc   0.07655     1.97993    0.039    0.969
## responsiveness_state_pmc       0.48319     2.54450    0.190    0.849
##                               -0.20775     2.05570   -0.101    0.920
##                               -0.27502     3.27805   -0.084    0.933
##                                0.50219     1.65475    0.303    0.762
##                               -0.20926     1.62695   -0.129    0.898
##                               -0.25968     0.82164   -0.316    0.752
##                               -0.26462     2.29135   -0.115    0.908
##                                0.04884     0.51829    0.094    0.925
##                               -0.03988     0.73754   -0.054    0.957
##                                0.30390     2.21439    0.137    0.891
##                                0.14564     3.51870    0.041    0.967
##                                0.26921     1.89787    0.142    0.887
##                                0.02003     2.56659    0.008    0.994
##                                0.30725     0.26673    1.152    0.249
##                                0.33164     5.12367    0.065    0.948
##                               -0.01476     1.97232   -0.007    0.994
##                                0.38055     2.78666    0.137    0.891
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  13.10186 -12.93717 5.355709 4.183147 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]    [,3]    [,4]
## [1,]  0.533  0.279 -0.2226  0.0831
## [2,]  0.475  0.110  0.0595 -0.0311
## [3,] -0.184 -0.142  0.4968  0.1418
## [4,] -0.202 -0.194  0.0765  0.4832
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]    [,3]    [,4]
## [1,]  0.208  0.275 -0.5022  0.2093
## [2,]  0.260  0.265 -0.0488  0.0399
## [3,] -0.304 -0.146 -0.2692 -0.0200
## [4,] -0.307 -0.332  0.0148 -0.3806
##   
## Residuals cov-matrix: 
##            [,1]      [,2]       [,3]      [,4]
## [1,]  55.352008 13.499678 -20.357840 -8.531143
## [2,]  13.499678 86.622591  -9.160834 -4.026310
## [3,] -20.357840 -9.160834  66.450357 37.617426
## [4,]  -8.531143 -4.026310  37.617426 67.629467
## ---- 
## aic=  17.37029 
## bic=  18.52665 
## Number of parameters:  36 
## initial estimates:  16.8582 2.0643 -14.1331 0.2979 0.0489 0.0449 0.0459 -0.1288 -0.0661 0.1953 -0.0795 0.0193 0.6895 -0.2154 0.5703 -0.4288 -0.0812 -0.3198 0.1847 -0.124 -0.0089 -0.2943 0.0999 0.1414 -0.2965 -0.6647 0.3672 -0.1414 -1.2153 0.8041 -0.4947 0.5021 0.4571 0.6832 -0.1114 0.2458 
## Par. lower-bounds:  10.2848 -7.2828 -31.807 -11.2852 -0.3163 -0.1997 -0.1012 -0.3789 -0.5855 -0.1525 -0.2887 -0.3364 -0.2925 -0.873 0.1747 -1.1012 -0.7248 -0.7508 -0.0745 -0.5648 -0.8264 -0.8192 -0.1764 -0.345 -1.4589 -1.4111 -0.0256 -0.8331 -3.4132 -0.6074 -1.2375 -0.8058 -0.9834 -0.2419 -0.5983 -0.6114 
## Par. upper-bounds:  23.4316 11.4115 3.5409 11.8809 0.4142 0.2895 0.193 0.1213 0.4532 0.5431 0.1298 0.3749 1.6715 0.4423 0.9659 0.2437 0.5624 0.1112 0.444 0.3167 0.8086 0.2307 0.3762 0.6279 0.8659 0.0818 0.7601 0.5503 0.9827 2.2155 0.2482 1.81 1.8976 1.6082 0.3754 1.1029 
## Final   Estimates:  17.13112 1.983365 -14.11866 0.3733868 -0.00856636 0.2894539 0.1434324 -0.2877825 -0.1730933 0.1078774 -0.2881665 0.04866175 0.9018424 0.1102032 0.7780574 -0.5796263 0.02673185 -0.298622 0.149643 0.3166688 0.1440501 -0.3657735 -0.1763813 0.3342216 0.1186989 -0.006319125 0.3158325 -0.02042513 -1.14901 0.1908689 -0.4220994 0.4805613 -0.04123725 0.06707698 0.0652144 -0.5244924
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           17.131125         NaN      NaN      NaN    
## loneliness_state_pmc           1.983365    2.220316    0.893  0.37171    
## socintsatisfaction_state_pmc -14.118661         NaN      NaN      NaN    
## responsiveness_state_pmc       0.373387         NaN      NaN      NaN    
## depressedmood_state           -0.008566         NaN      NaN      NaN    
## loneliness_state_pmc           0.289454    0.190692    1.518  0.12904    
## socintsatisfaction_state_pmc   0.143432    0.094630    1.516  0.12959    
## responsiveness_state_pmc      -0.287782    0.194593   -1.479  0.13917    
## depressedmood_state           -0.173093    0.181820   -0.952  0.34109    
## loneliness_state_pmc           0.107877    0.322272    0.335  0.73782    
## socintsatisfaction_state_pmc  -0.288167    0.130426   -2.209  0.02715 *  
## responsiveness_state_pmc       0.048662    0.224303    0.217  0.82825    
## depressedmood_state            0.901842         NaN      NaN      NaN    
## loneliness_state_pmc           0.110203         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.778057    0.316969    2.455  0.01410 *  
## responsiveness_state_pmc      -0.579626    0.364727   -1.589  0.11201    
## depressedmood_state            0.026732         NaN      NaN      NaN    
## loneliness_state_pmc          -0.298622         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.149643         NaN      NaN      NaN    
## responsiveness_state_pmc       0.316669         NaN      NaN      NaN    
##                                0.144050         NaN      NaN      NaN    
##                               -0.365773    0.058590   -6.243 4.29e-10 ***
##                               -0.176381         NaN      NaN      NaN    
##                                0.334222    0.108603    3.077  0.00209 ** 
##                                0.118699    0.369164    0.322  0.74781    
##                               -0.006319    0.266478   -0.024  0.98108    
##                                0.315833    0.045163    6.993 2.69e-12 ***
##                               -0.020425    0.258118   -0.079  0.93693    
##                               -1.149010    0.735714   -1.562  0.11834    
##                                0.190869         NaN      NaN      NaN    
##                               -0.422099    0.333471   -1.266  0.20559    
##                                0.480561    0.452039    1.063  0.28774    
##                               -0.041237         NaN      NaN      NaN    
##                                0.067077         NaN      NaN      NaN    
##                                0.065214         NaN      NaN      NaN    
##                               -0.524492    0.097289   -5.391 7.00e-08 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  17.13112 1.983365 -14.11866 0.3733868 
## AR coefficient matrix 
## AR( 1 )-matrix 
##          [,1]   [,2]   [,3]    [,4]
## [1,] -0.00857  0.289  0.143 -0.2878
## [2,] -0.17309  0.108 -0.288  0.0487
## [3,]  0.90184  0.110  0.778 -0.5796
## [4,]  0.02673 -0.299  0.150  0.3167
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]     [,2]    [,3]    [,4]
## [1,] -0.1441  0.36577  0.1764 -0.3342
## [2,] -0.1187  0.00632 -0.3158  0.0204
## [3,]  1.1490 -0.19087  0.4221 -0.4806
## [4,]  0.0412 -0.06708 -0.0652  0.5245
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  69.88890  68.51496 -62.20870 -55.16546
## [2,]  68.51496 154.89505 -87.39699 -84.27035
## [3,] -62.20870 -87.39699 456.36310 215.12353
## [4,] -55.16546 -84.27035 215.12353 192.73453
## ---- 
## aic=  20.05623 
## bic=  21.21259 
## Number of parameters:  36 
## initial estimates:  34.6476 -7.6761 13.4567 17.8057 0.3097 -0.0975 0.0965 -0.3103 0.1226 0.1667 0.2894 -0.4104 -0.2412 0.3777 -0.0895 0.7798 -0.328 0.1898 -0.1509 0.4813 -1.2939 1.0492 0.1317 -0.1784 -1.1135 0.6656 -0.4481 0.1702 1.8361 -1.5321 -0.1017 0.1187 1.4457 -0.8482 0.3844 -0.0243 
## Par. lower-bounds:  12.1276 -28.8858 -11.9837 -5.0859 -0.114 -0.6572 -0.3956 -0.8355 -0.2765 -0.3604 -0.174 -0.905 -0.7199 -0.2546 -0.6454 0.1865 -0.7588 -0.3791 -0.6511 -0.0526 -2.4721 -0.2331 -0.8183 -1.5832 -2.2231 -0.5421 -1.3428 -1.1529 0.5051 -2.9807 -1.1748 -1.4683 0.2482 -2.1516 -0.5812 -1.4523 
## Par. upper-bounds:  57.1675 13.5336 38.8971 40.6973 0.7334 0.4622 0.5885 0.215 0.5217 0.6939 0.7528 0.0843 0.2375 1.01 0.4664 1.3732 0.1027 0.7588 0.3493 1.0152 -0.1158 2.3314 1.0816 1.2265 -0.0039 1.8733 0.4465 1.4933 3.167 -0.0836 0.9714 1.7057 2.6433 0.4553 1.35 1.4038 
## Final   Estimates:  34.62866 -7.684263 13.46284 17.85386 0.3163284 -0.657186 -0.395613 0.214256 0.1553746 -0.03625559 0.4939399 -0.8874217 -0.2635904 0.3023819 -0.3983098 1.023689 -0.3532009 0.6335625 -0.2521733 0.5895162 -0.6860601 0.9634497 0.4559348 -0.626974 -0.6481965 0.5358743 -0.4745243 0.6625949 0.8327856 -0.4749061 0.5156852 -0.3370611 0.8767824 -0.9516149 0.269971 -0.1762849
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           34.62866    21.19736    1.634  0.10234    
## loneliness_state_pmc          -7.68426    21.22154   -0.362  0.71728    
## socintsatisfaction_state_pmc  13.46284    37.74208    0.357  0.72131    
## responsiveness_state_pmc      17.85386    25.22611    0.708  0.47910    
## depressedmood_state            0.31633     0.40513    0.781  0.43492    
## loneliness_state_pmc          -0.65719         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.39561     0.21981   -1.800  0.07189 .  
## responsiveness_state_pmc       0.21426         NaN      NaN      NaN    
## depressedmood_state            0.15537     0.41781    0.372  0.70998    
## loneliness_state_pmc          -0.03626         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.49394         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.88742     0.29280   -3.031  0.00244 ** 
## depressedmood_state           -0.26359     0.74095   -0.356  0.72203    
## loneliness_state_pmc           0.30238         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.39831         NaN      NaN      NaN    
## responsiveness_state_pmc       1.02369     0.08629   11.864  < 2e-16 ***
## depressedmood_state           -0.35320     0.48721   -0.725  0.46848    
## loneliness_state_pmc           0.63356         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.25217         NaN      NaN      NaN    
## responsiveness_state_pmc       0.58952         NaN      NaN      NaN    
##                               -0.68606     0.53259   -1.288  0.19769    
##                                0.96345         NaN      NaN      NaN    
##                                0.45593     0.26865    1.697  0.08967 .  
##                               -0.62697         NaN      NaN      NaN    
##                               -0.64820     0.45407   -1.428  0.15343    
##                                0.53587     0.12947    4.139 3.49e-05 ***
##                               -0.47452         NaN      NaN      NaN    
##                                0.66259     0.24530    2.701  0.00691 ** 
##                                0.83279     0.82346    1.011  0.31186    
##                               -0.47491         NaN      NaN      NaN    
##                                0.51569         NaN      NaN      NaN    
##                               -0.33706     0.26493   -1.272  0.20328    
##                                0.87678     0.54257    1.616  0.10610    
##                               -0.95161         NaN      NaN      NaN    
##                                0.26997         NaN      NaN      NaN    
##                               -0.17628     0.11465   -1.538  0.12415    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  34.62866 -7.684263 13.46284 17.85386 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]   [,3]   [,4]
## [1,]  0.316 -0.6572 -0.396  0.214
## [2,]  0.155 -0.0363  0.494 -0.887
## [3,] -0.264  0.3024 -0.398  1.024
## [4,] -0.353  0.6336 -0.252  0.590
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]   [,3]   [,4]
## [1,]  0.686 -0.963 -0.456  0.627
## [2,]  0.648 -0.536  0.475 -0.663
## [3,] -0.833  0.475 -0.516  0.337
## [4,] -0.877  0.952 -0.270  0.176
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  538.5286  364.1328 -442.1950 -346.0043
## [2,]  364.1328  405.2169 -364.2382 -313.9123
## [3,] -442.1950 -364.2382  600.8941  427.5467
## [4,] -346.0043 -313.9123  427.5467  473.8588
## ---- 
## aic=  22.77105 
## bic=  23.92742 
## Number of parameters:  36 
## initial estimates:  2.5253 -1.5568 0.7232 0.0789 0.3494 0.1973 -0.2284 0.0411 0.2929 0.1778 0.5805 0.1411 -2e-04 -0.0451 -0.0717 -0.0307 -0.2023 -0.169 0.1343 0.2627 -0.3457 -0.1596 -0.6705 -0.0847 -0.3996 -0.2596 -1.6215 0.0782 -0.0661 0.0973 0.2347 -0.0132 0.587 -0.0683 -1.0776 -0.3997 
## Par. lower-bounds:  0.6055 -4.4496 -0.1944 -2.4677 0.0673 -0.0104 -0.8417 -0.1688 -0.1321 -0.1352 -0.3436 -0.1752 -0.135 -0.1443 -0.3648 -0.131 -0.5765 -0.4445 -0.6793 -0.0157 -1.1953 -0.69 -2.3895 -0.5617 -1.6798 -1.0589 -4.2118 -0.6407 -0.4722 -0.1562 -0.5869 -0.2413 -0.54 -0.7718 -3.3579 -1.0325 
## Par. upper-bounds:  4.4451 1.3359 1.6408 2.6255 0.6315 0.405 0.3849 0.251 0.718 0.4907 1.5047 0.4573 0.1347 0.0542 0.2214 0.0696 0.1719 0.1065 0.9478 0.5411 0.5039 0.3708 1.0486 0.3924 0.8806 0.5396 0.9687 0.797 0.34 0.3508 1.0564 0.2148 1.714 0.6353 1.2027 0.2332 
## Final   Estimates:  2.221421 -1.965367 0.4290945 1.039136 0.2089229 0.2202445 0.3849016 -0.07718998 0.5442444 0.4907413 0.7339272 -0.1752173 -0.1349895 -0.1443286 0.2214385 -0.1310372 -0.4312261 0.00671411 -0.3911419 0.5411223 -0.05863278 -0.09078985 -0.8105748 0.07801393 -0.684131 -0.5638664 -1.211826 0.5606204 0.3399956 0.05017319 -0.1839244 0.1009317 0.4608176 -0.1971737 0.4070572 -0.313957
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           2.221421    1.236096    1.797  0.07232 .  
## loneliness_state_pmc         -1.965367    2.486976   -0.790  0.42937    
## socintsatisfaction_state_pmc  0.429095    0.749854    0.572  0.56716    
## responsiveness_state_pmc      1.039136    0.378324    2.747  0.00602 ** 
## depressedmood_state           0.208923    0.254551    0.821  0.41179    
## loneliness_state_pmc          0.220244    0.180534    1.220  0.22248    
## socintsatisfaction_state_pmc  0.384902         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.077190         NaN      NaN      NaN    
## depressedmood_state           0.544244    0.952211    0.572  0.56762    
## loneliness_state_pmc          0.490741    0.496616    0.988  0.32307    
## socintsatisfaction_state_pmc  0.733927         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.175217    0.162628   -1.077  0.28130    
## depressedmood_state          -0.134990    0.204370   -0.661  0.50892    
## loneliness_state_pmc         -0.144329    0.144857   -0.996  0.31908    
## socintsatisfaction_state_pmc  0.221439    0.213129    1.039  0.29881    
## responsiveness_state_pmc     -0.131037    0.243485   -0.538  0.59046    
## depressedmood_state          -0.431226         NaN      NaN      NaN    
## loneliness_state_pmc          0.006714    0.244679    0.027  0.97811    
## socintsatisfaction_state_pmc -0.391142    0.778793   -0.502  0.61550    
## responsiveness_state_pmc      0.541122    0.061422    8.810  < 2e-16 ***
##                              -0.058633    0.349511   -0.168  0.86677    
##                              -0.090790    0.104470   -0.869  0.38482    
##                              -0.810575         NaN      NaN      NaN    
##                               0.078014         NaN      NaN      NaN    
##                              -0.684131    0.925796   -0.739  0.45993    
##                              -0.563866    0.478874   -1.177  0.23900    
##                              -1.211826         NaN      NaN      NaN    
##                               0.560620    0.139705    4.013    6e-05 ***
##                               0.339996    0.206046    1.650  0.09892 .  
##                               0.050173    0.177417    0.283  0.77733    
##                              -0.183924    0.285457   -0.644  0.51937    
##                               0.100932    0.261068    0.387  0.69904    
##                               0.460818         NaN      NaN      NaN    
##                              -0.197174    0.164745   -1.197  0.23137    
##                               0.407057    0.210028    1.938  0.05261 .  
##                              -0.313957         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  2.221421 -1.965367 0.4290945 1.039136 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]     [,2]   [,3]    [,4]
## [1,]  0.209  0.22024  0.385 -0.0772
## [2,]  0.544  0.49074  0.734 -0.1752
## [3,] -0.135 -0.14433  0.221 -0.1310
## [4,] -0.431  0.00671 -0.391  0.5411
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]   [,3]   [,4]
## [1,]  0.0586  0.0908  0.811 -0.078
## [2,]  0.6841  0.5639  1.212 -0.561
## [3,] -0.3400 -0.0502  0.184 -0.101
## [4,] -0.4608  0.1972 -0.407  0.314
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 36.665064 25.790724 -3.477519  0.951643
## [2,] 25.790724 66.752726 -4.487374  5.038017
## [3,] -3.477519 -4.487374 10.958296  5.248498
## [4,]  0.951643  5.038017  5.248498 57.115183
## ---- 
## aic=  14.85506 
## bic=  16.01143 
## Number of parameters:  36 
## initial estimates:  44.2767 7.1694 -3.6124 -21.2008 -0.086 -0.0284 -0.2271 -0.0055 -0.1254 0.1483 -7e-04 0.0418 0.0809 -0.168 0.2893 -0.3305 0.5024 -0.4894 0.2121 -0.0839 0.3747 -0.7755 -0.33 0.1458 0.266 -0.3161 -0.5206 0.3703 -0.3618 0.9149 0.7457 -0.2449 -0.7591 1.5479 0.3597 -0.2321 
## Par. lower-bounds:  26.3955 -8.5933 -22.7949 -36.6782 -0.5321 -0.5161 -0.563 -0.433 -0.5186 -0.2816 -0.2969 -0.3351 -0.3977 -0.6911 -0.0712 -0.7892 0.1163 -0.9115 -0.0787 -0.454 -0.432 -1.9513 -1.1828 -0.7217 -0.4451 -1.3527 -1.2724 -0.3945 -1.2271 -0.3465 -0.1692 -1.1756 -1.4574 0.5302 -0.3785 -0.983 
## Par. upper-bounds:  62.1579 22.9321 15.5701 -5.7233 0.3601 0.4592 0.1089 0.4221 0.2679 0.5782 0.2955 0.4187 0.5595 0.3551 0.6497 0.1282 0.8886 -0.0673 0.503 0.2862 1.1813 0.4003 0.5229 1.0134 0.9771 0.7204 0.2312 1.135 0.5036 2.1763 1.6606 0.6858 -0.0609 2.5657 1.0979 0.5188 
## Final   Estimates:  44.25764 7.107023 -3.316471 -21.04611 -0.1368634 0.4592199 -0.2643625 0.2266096 -0.1665881 0.578151 -0.2491381 0.2051141 0.07654613 -0.6911472 0.5928986 -0.3511256 0.5561149 -0.9114814 0.2666638 0.2861673 0.3164948 -0.5437887 0.152296 -0.4119894 0.2316481 -0.4022926 0.231209 -0.2873222 -0.1643391 0.6429421 -0.1691546 0.08647885 -0.4010957 0.6017084 -0.1647779 -0.2300066
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)  
## depressedmood_state           44.25764         NaN      NaN      NaN  
## loneliness_state_pmc           7.10702         NaN      NaN      NaN  
## socintsatisfaction_state_pmc  -3.31647         NaN      NaN      NaN  
## responsiveness_state_pmc     -21.04611         NaN      NaN      NaN  
## depressedmood_state           -0.13686         NaN      NaN      NaN  
## loneliness_state_pmc           0.45922         NaN      NaN      NaN  
## socintsatisfaction_state_pmc  -0.26436         NaN      NaN      NaN  
## responsiveness_state_pmc       0.22661         NaN      NaN      NaN  
## depressedmood_state           -0.16659         NaN      NaN      NaN  
## loneliness_state_pmc           0.57815     0.28065     2.06   0.0394 *
## socintsatisfaction_state_pmc  -0.24914         NaN      NaN      NaN  
## responsiveness_state_pmc       0.20511         NaN      NaN      NaN  
## depressedmood_state            0.07655         NaN      NaN      NaN  
## loneliness_state_pmc          -0.69115         NaN      NaN      NaN  
## socintsatisfaction_state_pmc   0.59290         NaN      NaN      NaN  
## responsiveness_state_pmc      -0.35113         NaN      NaN      NaN  
## depressedmood_state            0.55611         NaN      NaN      NaN  
## loneliness_state_pmc          -0.91148         NaN      NaN      NaN  
## socintsatisfaction_state_pmc   0.26666         NaN      NaN      NaN  
## responsiveness_state_pmc       0.28617         NaN      NaN      NaN  
##                                0.31649         NaN      NaN      NaN  
##                               -0.54379         NaN      NaN      NaN  
##                                0.15230         NaN      NaN      NaN  
##                               -0.41199         NaN      NaN      NaN  
##                                0.23165         NaN      NaN      NaN  
##                               -0.40229         NaN      NaN      NaN  
##                                0.23121         NaN      NaN      NaN  
##                               -0.28732         NaN      NaN      NaN  
##                               -0.16434         NaN      NaN      NaN  
##                                0.64294         NaN      NaN      NaN  
##                               -0.16915         NaN      NaN      NaN  
##                                0.08648         NaN      NaN      NaN  
##                               -0.40110         NaN      NaN      NaN  
##                                0.60171         NaN      NaN      NaN  
##                               -0.16478         NaN      NaN      NaN  
##                               -0.23001         NaN      NaN      NaN  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  44.25764 7.107023 -3.316471 -21.04611 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,] -0.1369  0.459 -0.264  0.227
## [2,] -0.1666  0.578 -0.249  0.205
## [3,]  0.0765 -0.691  0.593 -0.351
## [4,]  0.5561 -0.911  0.267  0.286
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]   [,3]    [,4]
## [1,] -0.316  0.544 -0.152  0.4120
## [2,] -0.232  0.402 -0.231  0.2873
## [3,]  0.164 -0.643  0.169 -0.0865
## [4,]  0.401 -0.602  0.165  0.2300
##   
## Residuals cov-matrix: 
##            [,1]       [,2]      [,3]      [,4]
## [1,]  323.86127  213.02491 -104.5184 -90.06472
## [2,]  213.02491  242.06042 -109.6812 -89.06925
## [3,] -104.51839 -109.68117  282.2879 127.52047
## [4,]  -90.06472  -89.06925  127.5205 198.48910
## ---- 
## aic=  21.76709 
## bic=  22.92346 
## Number of parameters:  36 
## initial estimates:  24.9425 -5.4349 -6.0984 0.6399 0.372 0.1566 0.0133 0.0324 0.1174 0.3765 -0.092 -0.2026 0.1223 -0.3181 0.4707 -0.0591 -0.0195 -0.1359 -0.0371 0.5741 -0.3408 0.2048 -0.2414 0.5109 0.2503 -0.1553 0.2678 0.7975 0.1136 0.2807 0.2145 -0.2667 0.0567 0.1412 -0.1097 0.1368 
## Par. lower-bounds:  11.7368 -22.7182 -23.9722 -10.8225 0.0487 -0.0775 -0.2331 -0.3057 -0.3057 0.0702 -0.4145 -0.6452 -0.3153 -0.6348 0.1372 -0.5168 -0.3002 -0.3391 -0.251 0.2806 -0.9163 -0.4386 -0.8204 -0.5778 -0.5028 -0.9974 -0.4899 -0.6274 -0.6653 -0.5902 -0.5691 -1.7403 -0.4428 -0.4173 -0.6122 -0.8082 
## Par. upper-bounds:  38.1482 11.8483 11.7754 12.1023 0.6953 0.3906 0.2597 0.3706 0.5406 0.6828 0.2305 0.2399 0.5599 -0.0013 0.8042 0.3986 0.2611 0.0672 0.1768 0.8676 0.2346 0.8483 0.3376 1.5996 1.0034 0.6869 1.0256 2.2224 0.8925 1.1516 0.9982 1.2069 0.5562 0.6998 0.3929 1.0818 
## Final   Estimates:  25.02605 -5.377282 -6.056349 0.656483 0.3700614 0.02459051 -0.1796877 0.3602161 0.09010999 0.1042856 -0.4113177 0.1653198 0.1178384 -0.2258056 0.1960334 0.3892205 -0.006362591 0.06613542 -0.1884818 0.4392778 -0.03282647 0.2051685 0.3018358 -0.4525942 0.1616473 0.5086138 0.8226433 -0.4059317 0.1264525 -0.031436 0.5074198 -0.5913338 -0.08557602 -0.2881228 0.08226232 0.4088629 
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          25.026049    8.244681    3.035  0.00240 ** 
## loneliness_state_pmc         -5.377282    7.494726   -0.717  0.47308    
## socintsatisfaction_state_pmc -6.056349   10.119926   -0.598  0.54953    
## responsiveness_state_pmc      0.656483    3.269872    0.201  0.84088    
## depressedmood_state           0.370061    0.190616    1.941  0.05221 .  
## loneliness_state_pmc          0.024591    0.446597    0.055  0.95609    
## socintsatisfaction_state_pmc -0.179688    0.170678   -1.053  0.29244    
## responsiveness_state_pmc      0.360216    0.296048    1.217  0.22370    
## depressedmood_state           0.090110    0.171659    0.525  0.59963    
## loneliness_state_pmc          0.104286    0.207178    0.503  0.61471    
## socintsatisfaction_state_pmc -0.411318    0.136112   -3.022  0.00251 ** 
## responsiveness_state_pmc      0.165320    0.216192    0.765  0.44446    
## depressedmood_state           0.117838    0.241345    0.488  0.62537    
## loneliness_state_pmc         -0.225806    0.202257   -1.116  0.26424    
## socintsatisfaction_state_pmc  0.196033    0.179274    1.093  0.27418    
## responsiveness_state_pmc      0.389221    0.301722    1.290  0.19705    
## depressedmood_state          -0.006363    0.080218   -0.079  0.93678    
## loneliness_state_pmc          0.066135    0.144972    0.456  0.64825    
## socintsatisfaction_state_pmc -0.188482    0.118997   -1.584  0.11321    
## responsiveness_state_pmc      0.439278    0.201503    2.180  0.02926 *  
##                              -0.032826    0.215815   -0.152  0.87910    
##                               0.205168    0.710992    0.289  0.77291    
##                               0.301836    0.206279    1.463  0.14340    
##                              -0.452594    0.366088   -1.236  0.21635    
##                               0.161647    0.206351    0.783  0.43342    
##                               0.508614    0.236976    2.146  0.03185 *  
##                               0.822643    0.181042    4.544 5.52e-06 ***
##                              -0.405932    0.286184   -1.418  0.15607    
##                               0.126452    0.324801    0.389  0.69704    
##                              -0.031436    0.238735   -0.132  0.89524    
##                               0.507420    0.205795    2.466  0.01368 *  
##                              -0.591334    0.474072   -1.247  0.21227    
##                              -0.085576    0.102963   -0.831  0.40590    
##                              -0.288123    0.161415   -1.785  0.07426 .  
##                               0.082262    0.114177    0.720  0.47123    
##                               0.408863    0.157178    2.601  0.00929 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  25.02605 -5.377282 -6.056349 0.656483 
## AR coefficient matrix 
## AR( 1 )-matrix 
##          [,1]    [,2]   [,3]  [,4]
## [1,]  0.37006  0.0246 -0.180 0.360
## [2,]  0.09011  0.1043 -0.411 0.165
## [3,]  0.11784 -0.2258  0.196 0.389
## [4,] -0.00636  0.0661 -0.188 0.439
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]    [,3]   [,4]
## [1,]  0.0328 -0.2052 -0.3018  0.453
## [2,] -0.1616 -0.5086 -0.8226  0.406
## [3,] -0.1265  0.0314 -0.5074  0.591
## [4,]  0.0856  0.2881 -0.0823 -0.409
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  82.16066  33.65208 -19.57441 -10.40419
## [2,]  33.65208  93.18640 -55.99475 -31.93303
## [3,] -19.57441 -55.99475 102.08244  40.04819
## [4,] -10.40419 -31.93303  40.04819  43.96258
## ---- 
## aic=  17.32035 
## bic=  18.47672 
## Number of parameters:  36 
## initial estimates:  19.0017 2.6407 1.0427 0.7305 0.0651 -0.0183 -0.0649 -0.1105 -0.0092 0.2997 0.0251 -0.2608 -1e-04 -0.2295 0.7569 0.0112 0.0226 -0.2428 -0.0601 0.7665 0.0258 0.0094 -0.5179 1.2518 0.1344 -0.7257 0.0197 0.451 -0.1422 0.1731 -0.1895 0.5653 -0.0047 0.1036 -0.1881 0.2512 
## Par. lower-bounds:  11.9392 -5.0156 -3.7331 -2.8913 -0.2723 -0.3333 -0.3953 -0.5302 -0.3749 -0.0418 -0.333 -0.7158 -0.2283 -0.4425 0.5335 -0.2726 -0.1504 -0.4043 -0.2296 0.5513 -1.0357 -0.8003 -1.5462 0.0294 -1.0164 -1.6034 -1.095 -0.874 -0.86 -0.3743 -0.8848 -0.2613 -0.5491 -0.3116 -0.7154 -0.3757 
## Par. upper-bounds:  26.0643 10.2969 5.8184 4.3524 0.4025 0.2967 0.2654 0.3092 0.3566 0.6411 0.3833 0.1942 0.228 -0.0165 0.9803 0.2951 0.1956 -0.0813 0.1093 0.9818 1.0873 0.819 0.5104 2.4741 1.2851 0.152 1.1345 1.7761 0.5756 0.7206 0.5059 1.3918 0.5397 0.5189 0.3393 0.878 
## Final   Estimates:  19.01443 2.632946 1.144184 0.6768687 -0.03511186 -0.3070812 0.04694127 -0.1776166 -0.1774328 0.6411319 0.1580576 -0.1036352 -0.006558981 -0.4425076 0.7612869 -0.2204872 -0.001174124 -0.08126605 0.0875649 0.6016427 0.009235183 0.3487088 -0.7751631 0.1419754 0.188978 -0.5361578 -0.5054941 -0.2109955 0.1163192 0.3728821 0.2633848 0.2231982 0.1344455 -0.07418713 0.02677239 0.1711629
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          19.014426    0.733696   25.916  < 2e-16 ***
## loneliness_state_pmc          2.632946         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  1.144184    3.249523    0.352  0.72476    
## responsiveness_state_pmc      0.676869    9.163713    0.074  0.94112    
## depressedmood_state          -0.035112         NaN      NaN      NaN    
## loneliness_state_pmc         -0.307081         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.046941    0.263281    0.178  0.85849    
## responsiveness_state_pmc     -0.177617    0.244217   -0.727  0.46705    
## depressedmood_state          -0.177433         NaN      NaN      NaN    
## loneliness_state_pmc          0.641132         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.158058    0.117369    1.347  0.17809    
## responsiveness_state_pmc     -0.103635    0.247954   -0.418  0.67598    
## depressedmood_state          -0.006559    0.068548   -0.096  0.92377    
## loneliness_state_pmc         -0.442508         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.761287    0.175800    4.330 1.49e-05 ***
## responsiveness_state_pmc     -0.220487    0.361589   -0.610  0.54201    
## depressedmood_state          -0.001174    0.485392   -0.002  0.99807    
## loneliness_state_pmc         -0.081266         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.087565    0.165609    0.529  0.59698    
## responsiveness_state_pmc      0.601643    0.197069    3.053  0.00227 ** 
##                               0.009235    0.229331    0.040  0.96788    
##                               0.348709         NaN      NaN      NaN    
##                              -0.775163    0.296292   -2.616  0.00889 ** 
##                               0.141975    0.409976    0.346  0.72912    
##                               0.188978         NaN      NaN      NaN    
##                              -0.536158         NaN      NaN      NaN    
##                              -0.505494    0.216442   -2.335  0.01952 *  
##                              -0.210995    0.354465   -0.595  0.55168    
##                               0.116319         NaN      NaN      NaN    
##                               0.372882         NaN      NaN      NaN    
##                               0.263385    0.219210    1.202  0.22955    
##                               0.223198    0.424000    0.526  0.59860    
##                               0.134445    0.474419    0.283  0.77688    
##                              -0.074187    0.039077   -1.898  0.05763 .  
##                               0.026772    0.231704    0.116  0.90801    
##                               0.171163    0.291820    0.587  0.55751    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  19.01443 2.632946 1.144184 0.6768687 
## AR coefficient matrix 
## AR( 1 )-matrix 
##          [,1]    [,2]   [,3]   [,4]
## [1,] -0.03511 -0.3071 0.0469 -0.178
## [2,] -0.17743  0.6411 0.1581 -0.104
## [3,] -0.00656 -0.4425 0.7613 -0.220
## [4,] -0.00117 -0.0813 0.0876  0.602
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]    [,2]    [,3]   [,4]
## [1,] -0.00924 -0.3487  0.7752 -0.142
## [2,] -0.18898  0.5362  0.5055  0.211
## [3,] -0.11632 -0.3729 -0.2634 -0.223
## [4,] -0.13445  0.0742 -0.0268 -0.171
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 154.39003 115.63460 -27.08213 -29.78605
## [2,] 115.63460 190.66437 -15.06278 -20.77481
## [3,] -27.08213 -15.06278  72.43329  47.68708
## [4,] -29.78605 -20.77481  47.68708  64.17918
## ---- 
## aic=  18.38227 
## bic=  19.53864 
## Number of parameters:  36 
## initial estimates:  13.0813 -4.1265 3.572 4.9905 0.5073 0.3497 0.1572 -0.2486 0.1818 -0.0259 -0.0433 -0.1462 -0.1784 -0.1859 0.1113 -0.0411 -0.1519 0.2277 0.1667 0.1547 -0.3984 0.2555 -0.1106 0.1684 -0.1717 -0.0564 -0.103 0.148 0.7886 -0.1085 0.7745 -1.2391 0.0788 0.1611 0.0975 -0.886 
## Par. lower-bounds:  4.1832 -11.3213 -12.5864 -2.9081 0.2034 -0.1038 -0.0514 -0.5898 -0.064 -0.3926 -0.2119 -0.4221 -0.7303 -1.0095 -0.2674 -0.6607 -0.4216 -0.1749 -0.0184 -0.1482 -1.2436 -0.9599 -0.9177 -0.7712 -0.8551 -1.0391 -0.7556 -0.6117 -0.7463 -2.3154 -0.6911 -2.9453 -0.6714 -0.9177 -0.6189 -1.72 
## Par. upper-bounds:  21.9793 3.0683 19.7304 12.8891 0.8112 0.8032 0.3657 0.0926 0.4275 0.3408 0.1253 0.1297 0.3735 0.6376 0.49 0.5786 0.1179 0.6302 0.3518 0.4576 0.4469 1.4708 0.6964 1.1079 0.5118 0.9263 0.5496 0.9077 2.3235 2.0985 2.24 0.4672 0.8291 1.2399 0.8139 -0.0519 
## Final   Estimates:  12.9635 -4.020367 3.79585 4.682697 0.4928824 0.8031962 0.20536 0.09262246 0.2056699 0.1193486 0.1207754 -0.4220672 -0.3003076 0.4159531 -0.2673656 0.2553781 -0.1717113 0.3638039 -0.01839156 -0.01252115 -0.2391931 -0.7635404 -0.2951265 -0.2975951 -0.3163638 -0.2352083 -0.4124059 0.3957121 0.8343036 -0.9479779 0.9047444 -0.4683833 0.1117496 -0.1267607 0.4248874 -0.05192689
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)   
## depressedmood_state           12.96350         NaN      NaN      NaN   
## loneliness_state_pmc          -4.02037         NaN      NaN      NaN   
## socintsatisfaction_state_pmc   3.79585         NaN      NaN      NaN   
## responsiveness_state_pmc       4.68270         NaN      NaN      NaN   
## depressedmood_state            0.49288         NaN      NaN      NaN   
## loneliness_state_pmc           0.80320         NaN      NaN      NaN   
## socintsatisfaction_state_pmc   0.20536         NaN      NaN      NaN   
## responsiveness_state_pmc       0.09262         NaN      NaN      NaN   
## depressedmood_state            0.20567         NaN      NaN      NaN   
## loneliness_state_pmc           0.11935         NaN      NaN      NaN   
## socintsatisfaction_state_pmc   0.12078     0.09609    1.257  0.20881   
## responsiveness_state_pmc      -0.42207         NaN      NaN      NaN   
## depressedmood_state           -0.30031         NaN      NaN      NaN   
## loneliness_state_pmc           0.41595         NaN      NaN      NaN   
## socintsatisfaction_state_pmc  -0.26737         NaN      NaN      NaN   
## responsiveness_state_pmc       0.25538         NaN      NaN      NaN   
## depressedmood_state           -0.17171         NaN      NaN      NaN   
## loneliness_state_pmc           0.36380     0.47735    0.762  0.44598   
## socintsatisfaction_state_pmc  -0.01839         NaN      NaN      NaN   
## responsiveness_state_pmc      -0.01252         NaN      NaN      NaN   
##                               -0.23919         NaN      NaN      NaN   
##                               -0.76354         NaN      NaN      NaN   
##                               -0.29513         NaN      NaN      NaN   
##                               -0.29760         NaN      NaN      NaN   
##                               -0.31636         NaN      NaN      NaN   
##                               -0.23521         NaN      NaN      NaN   
##                               -0.41241     0.15233   -2.707  0.00678 **
##                                0.39571         NaN      NaN      NaN   
##                                0.83430         NaN      NaN      NaN   
##                               -0.94798         NaN      NaN      NaN   
##                                0.90474         NaN      NaN      NaN   
##                               -0.46838         NaN      NaN      NaN   
##                                0.11175         NaN      NaN      NaN   
##                               -0.12676     0.48217   -0.263  0.79263   
##                                0.42489         NaN      NaN      NaN   
##                               -0.05193         NaN      NaN      NaN   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  12.9635 -4.020367 3.79585 4.682697 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]  [,2]    [,3]    [,4]
## [1,]  0.493 0.803  0.2054  0.0926
## [2,]  0.206 0.119  0.1208 -0.4221
## [3,] -0.300 0.416 -0.2674  0.2554
## [4,] -0.172 0.364 -0.0184 -0.0125
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]  [,2]   [,3]    [,4]
## [1,]  0.239 0.764  0.295  0.2976
## [2,]  0.316 0.235  0.412 -0.3957
## [3,] -0.834 0.948 -0.905  0.4684
## [4,] -0.112 0.127 -0.425  0.0519
##   
## Residuals cov-matrix: 
##            [,1]       [,2]      [,3]      [,4]
## [1,]  176.26067   76.11422 -145.4410 -44.23157
## [2,]   76.11422  104.80526 -121.0470 -43.29097
## [3,] -145.44102 -121.04703  486.6132 173.08232
## [4,]  -44.23157  -43.29097  173.0823 183.47374
## ---- 
## aic=  21.04192 
## bic=  22.19829 
## Number of parameters:  36 
## initial estimates:  4.8841 -5.999 5.2485 0.9882 0.8624 -0.4156 -0.0544 0.0117 0.2317 -0.0028 0.1416 0 -0.2156 -0.0394 0.2621 0.2635 -0.0632 -0.1864 0.0476 0.2283 -0.6611 -0.1027 -0.2434 0.2687 -0.2164 -0.6667 -0.2636 -0.3161 0.2237 1.3739 -0.0878 0.2021 0.3276 -0.1745 0.1137 -0.3105 
## Par. lower-bounds:  -1.4573 -10.8014 -4.14 -5.0055 0.6641 -0.7782 -0.2953 -0.3939 0.0816 -0.2774 -0.0408 -0.3072 -0.5092 -0.5763 -0.0946 -0.3371 -0.2507 -0.5291 -0.1801 -0.1551 -1.2243 -1.2258 -0.6708 -0.4071 -0.643 -1.5172 -0.5872 -0.8279 -0.6102 -0.2889 -0.7205 -0.7985 -0.2048 -1.236 -0.2902 -0.9492 
## Par. upper-bounds:  11.2255 -1.1965 14.637 6.982 1.0606 -0.053 0.1866 0.4174 0.3819 0.2718 0.3241 0.3072 0.078 0.4975 0.6188 0.8641 0.1242 0.1564 0.2753 0.6117 -0.0979 1.0204 0.1839 0.9445 0.2101 0.1839 0.0601 0.1958 1.0576 3.0367 0.5449 1.2027 0.8599 0.8871 0.5176 0.3283 
## Final   Estimates:  4.572334 -5.819334 5.291842 1.094227 0.8482362 -0.4513614 0.002126582 -0.3939069 0.2071957 0.2718359 0.05886013 0.3072065 -0.1771288 -0.5686885 0.1609906 -0.336822 -0.0342386 -0.4147612 -0.05245409 0.4849243 -0.3554915 0.2500516 -0.179672 0.5389722 -0.03988408 -0.3934378 0.05761993 -0.3759819 0.02223842 0.7820351 -0.1861545 1.038463 0.1592037 0.108473 0.271553 -0.5019266
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           4.572334    1.331703    3.433 0.000596 ***
## loneliness_state_pmc         -5.819334    1.230547   -4.729 2.26e-06 ***
## socintsatisfaction_state_pmc  5.291842   10.226592    0.517 0.604836    
## responsiveness_state_pmc      1.094227    5.162871    0.212 0.832153    
## depressedmood_state           0.848236    0.051920   16.338  < 2e-16 ***
## loneliness_state_pmc         -0.451361    0.480671   -0.939 0.347719    
## socintsatisfaction_state_pmc  0.002127    0.393619    0.005 0.995689    
## responsiveness_state_pmc     -0.393907    0.801695   -0.491 0.623184    
## depressedmood_state           0.207196    0.048726    4.252 2.12e-05 ***
## loneliness_state_pmc          0.271836         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.058860         NaN      NaN      NaN    
## responsiveness_state_pmc      0.307207    0.370437    0.829 0.406930    
## depressedmood_state          -0.177129    0.403088   -0.439 0.660351    
## loneliness_state_pmc         -0.568689    2.068778   -0.275 0.783400    
## socintsatisfaction_state_pmc  0.160991    1.058573    0.152 0.879122    
## responsiveness_state_pmc     -0.336822    0.604528   -0.557 0.577415    
## depressedmood_state          -0.034239    0.205903   -0.166 0.867933    
## loneliness_state_pmc         -0.414761    1.036790   -0.400 0.689124    
## socintsatisfaction_state_pmc -0.052454    0.416988   -0.126 0.899896    
## responsiveness_state_pmc      0.484924    0.273908    1.770 0.076662 .  
##                              -0.355491    0.183961   -1.932 0.053307 .  
##                               0.250052    0.403219    0.620 0.535167    
##                              -0.179672    0.489161   -0.367 0.713390    
##                               0.538972    0.862930    0.625 0.532244    
##                              -0.039884    0.136708   -0.292 0.770480    
##                              -0.393438         NaN      NaN      NaN    
##                               0.057620    0.069633    0.827 0.407962    
##                              -0.375982    0.427683   -0.879 0.379340    
##                               0.022238    0.463383    0.048 0.961723    
##                               0.782035    1.988429    0.393 0.694103    
##                              -0.186155    1.194894   -0.156 0.876197    
##                               1.038463    0.688809    1.508 0.131651    
##                               0.159204    0.203082    0.784 0.433076    
##                               0.108473    0.844278    0.128 0.897769    
##                               0.271553    0.467088    0.581 0.560989    
##                              -0.501927    0.269750   -1.861 0.062785 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  4.572334 -5.819334 5.291842 1.094227 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]     [,3]   [,4]
## [1,]  0.8482 -0.451  0.00213 -0.394
## [2,]  0.2072  0.272  0.05886  0.307
## [3,] -0.1771 -0.569  0.16099 -0.337
## [4,] -0.0342 -0.415 -0.05245  0.485
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,]  0.3555 -0.250  0.1797 -0.539
## [2,]  0.0399  0.393 -0.0576  0.376
## [3,] -0.0222 -0.782  0.1862 -1.038
## [4,] -0.1592 -0.108 -0.2716  0.502
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 103.02783  23.99614 -50.58522 -37.96849
## [2,]  23.99614  72.80471 -24.90252 -22.16027
## [3,] -50.58522 -24.90252 235.52431  79.16614
## [4,] -37.96849 -22.16027  79.16614 112.77875
## ---- 
## aic=  19.59198 
## bic=  20.74835 
## Number of parameters:  36 
## initial estimates:  11.9477 0.6748 4.0838 2.1735 0.3512 -0.2944 -0.1048 0.0238 0.0099 0.114 0.005 -0.1871 -0.2355 -0.2288 0.4042 -0.199 -0.1663 -0.0115 0.1144 0.3079 0.3558 0.2625 0.3944 -0.0301 -0.2861 -0.0364 0.0305 -0.0015 -0.8172 -0.5178 -0.554 -0.5627 0.297 -0.6835 -0.2217 -0.6816 
## Par. lower-bounds:  5.4462 -8.1422 -12.4848 -7.1999 -0.0156 -0.5811 -0.252 -0.2469 -0.4876 -0.2749 -0.1947 -0.5542 -1.1702 -0.9595 0.0289 -0.8888 -0.6951 -0.4249 -0.0979 -0.0824 -0.6062 -0.4564 0.0455 -0.509 -1.5906 -1.0114 -0.4426 -0.6509 -3.2686 -2.3499 -1.4429 -1.7831 -1.0898 -1.72 -0.7246 -1.372 
## Par. upper-bounds:  18.4493 9.4918 20.6524 11.5468 0.718 -0.0076 0.0425 0.2944 0.5073 0.5029 0.2047 0.1799 0.6993 0.502 0.7794 0.4907 0.3625 0.4019 0.3267 0.6981 1.3177 0.9815 0.7432 0.4488 1.0184 0.9386 0.5035 0.648 1.6342 1.3143 0.335 0.6577 1.6839 0.353 0.2812 0.0089 
## Final   Estimates:  11.97334 0.6667388 4.041771 2.145461 0.3213576 -0.007611028 -0.2520313 -0.2468767 -0.05795387 0.1265275 -0.07905428 -0.3606364 -0.09997776 0.3759041 0.04451183 -0.04185725 -0.08554496 0.202924 -0.09792807 0.669068 0.04553616 -0.121598 0.3152509 0.1820013 0.38463 -0.1198527 0.2419505 0.1202478 -0.8281607 -0.6394774 -0.1041452 -0.001302059 -0.1093684 -0.2867308 0.04006934 -0.407858
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          11.973341    3.405942    3.515 0.000439 ***
## loneliness_state_pmc          0.666739         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  4.041771    4.646181    0.870 0.384348    
## responsiveness_state_pmc      2.145461         NaN      NaN      NaN    
## depressedmood_state           0.321358    0.189355    1.697 0.089674 .  
## loneliness_state_pmc         -0.007611         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.252031    0.040216   -6.267 3.68e-10 ***
## responsiveness_state_pmc     -0.246877         NaN      NaN      NaN    
## depressedmood_state          -0.057954         NaN      NaN      NaN    
## loneliness_state_pmc          0.126527         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.079054    0.149561   -0.529 0.597100    
## responsiveness_state_pmc     -0.360636    0.256014   -1.409 0.158937    
## depressedmood_state          -0.099978    0.264297   -0.378 0.705224    
## loneliness_state_pmc          0.375904    0.614104    0.612 0.540460    
## socintsatisfaction_state_pmc  0.044512    0.240022    0.185 0.852877    
## responsiveness_state_pmc     -0.041857         NaN      NaN      NaN    
## depressedmood_state          -0.085545         NaN      NaN      NaN    
## loneliness_state_pmc          0.202924         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.097928         NaN      NaN      NaN    
## responsiveness_state_pmc      0.669068         NaN      NaN      NaN    
##                               0.045536    0.187217    0.243 0.807829    
##                              -0.121598         NaN      NaN      NaN    
##                               0.315251         NaN      NaN      NaN    
##                               0.182001         NaN      NaN      NaN    
##                               0.384630    0.095747    4.017 5.89e-05 ***
##                              -0.119853         NaN      NaN      NaN    
##                               0.241950    0.136625    1.771 0.076576 .  
##                               0.120248         NaN      NaN      NaN    
##                              -0.828161    0.387377   -2.138 0.032528 *  
##                              -0.639477    0.652537   -0.980 0.327093    
##                              -0.104145    0.269905   -0.386 0.699601    
##                              -0.001302         NaN      NaN      NaN    
##                              -0.109368         NaN      NaN      NaN    
##                              -0.286731         NaN      NaN      NaN    
##                               0.040069         NaN      NaN      NaN    
##                              -0.407858         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  11.97334 0.6667388 4.041771 2.145461 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]     [,2]    [,3]    [,4]
## [1,]  0.3214 -0.00761 -0.2520 -0.2469
## [2,] -0.0580  0.12653 -0.0791 -0.3606
## [3,] -0.1000  0.37590  0.0445 -0.0419
## [4,] -0.0855  0.20292 -0.0979  0.6691
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]  [,2]    [,3]    [,4]
## [1,] -0.0455 0.122 -0.3153 -0.1820
## [2,] -0.3846 0.120 -0.2420 -0.1202
## [3,]  0.8282 0.639  0.1041  0.0013
## [4,]  0.1094 0.287 -0.0401  0.4079
##   
## Residuals cov-matrix: 
##           [,1]       [,2]       [,3]      [,4]
## [1,]  50.96716   47.25452  -77.33679 -43.83417
## [2,]  47.25452  131.91330 -159.05452 -85.82465
## [3,] -77.33679 -159.05452  526.79192 210.19592
## [4,] -43.83417  -85.82465  210.19592 163.26604
## ---- 
## aic=  19.49351 
## bic=  20.64988 
## Number of parameters:  36 
## initial estimates:  34.7191 -13.0051 -1.9728 0.761 0.2079 -0.076 -0.0936 0.035 0.2609 0.0097 -0.2217 -0.1163 0.0881 0.073 0.4843 -0.1267 -0.0072 -0.1121 -0.2769 0.6885 -0.4972 -0.0656 0.0449 -0.0517 -0.079 -0.2903 0.2284 0.7031 0.3637 -0.4793 0.0437 0.4872 0.294 0.1242 0.1994 0.1686 
## Par. lower-bounds:  20.1942 -34.3739 -25.8293 -18.8775 -0.1174 -0.2709 -0.2484 -0.1132 -0.2177 -0.277 -0.4495 -0.3344 -0.4462 -0.2471 0.2301 -0.3702 -0.447 -0.3756 -0.4862 0.4881 -1.1126 -0.5446 -0.3693 -0.5514 -0.9844 -0.995 -0.381 -0.0321 -0.647 -1.266 -0.6367 -0.3336 -0.538 -0.5234 -0.3606 -0.5071 
## Par. upper-bounds:  49.244 8.3638 21.8836 20.3994 0.5331 0.1189 0.0612 0.1833 0.7394 0.2965 0.006 0.1018 0.6223 0.3932 0.7386 0.1167 0.4326 0.1515 -0.0676 0.8889 0.1182 0.4134 0.4591 0.4481 0.8264 0.4144 0.8378 1.4383 1.3745 0.3074 0.724 1.308 1.1261 0.7719 0.7594 0.8443 
## Final   Estimates:  34.67533 -13.13928 -1.99827 0.7752526 0.2514809 -0.2709278 -0.2484495 -0.08358617 0.2913314 0.2965118 -0.02219039 -0.2292184 0.06909238 -0.1587609 0.4661485 -0.3075195 0.002391317 -0.3673249 -0.4862463 0.6534474 -0.01545996 0.4109725 -0.04831714 0.4480506 0.2412797 -0.6081856 -0.2837328 0.7522423 -0.0374867 0.007089334 0.2903683 0.459303 0.1834709 -0.01254708 0.680673 -0.5070662
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           34.675330    6.822998    5.082 3.73e-07 ***
## loneliness_state_pmc         -13.139280    6.093575   -2.156 0.031064 *  
## socintsatisfaction_state_pmc  -1.998270   12.353872   -0.162 0.871501    
## responsiveness_state_pmc       0.775253   11.309177    0.069 0.945347    
## depressedmood_state            0.251481    0.139501    1.803 0.071433 .  
## loneliness_state_pmc          -0.270928    0.229958   -1.178 0.238733    
## socintsatisfaction_state_pmc  -0.248449    0.156854   -1.584 0.113204    
## responsiveness_state_pmc      -0.083586    0.203486   -0.411 0.681241    
## depressedmood_state            0.291331    0.122115    2.386 0.017046 *  
## loneliness_state_pmc           0.296512    0.225820    1.313 0.189169    
## socintsatisfaction_state_pmc  -0.022190    0.132986   -0.167 0.867478    
## responsiveness_state_pmc      -0.229218    0.194757   -1.177 0.239218    
## depressedmood_state            0.069092    0.269437    0.256 0.797617    
## loneliness_state_pmc          -0.158761    0.105743   -1.501 0.133254    
## socintsatisfaction_state_pmc   0.466149    0.236398    1.972 0.048623 *  
## responsiveness_state_pmc      -0.307520    0.297176   -1.035 0.300759    
## depressedmood_state            0.002391    0.241640    0.010 0.992104    
## loneliness_state_pmc          -0.367325    0.155973   -2.355 0.018520 *  
## socintsatisfaction_state_pmc  -0.486246    0.143203   -3.396 0.000685 ***
## responsiveness_state_pmc       0.653447    0.066752    9.789  < 2e-16 ***
##                               -0.015460    0.289947   -0.053 0.957477    
##                                0.410972    0.224790    1.828 0.067511 .  
##                               -0.048317    0.174481   -0.277 0.781842    
##                                0.448051    0.281857    1.590 0.111916    
##                                0.241280    0.179075    1.347 0.177861    
##                               -0.608186         NaN      NaN      NaN    
##                               -0.283733    0.131918   -2.151 0.031490 *  
##                                0.752242    0.299861    2.509 0.012120 *  
##                               -0.037487    0.313492   -0.120 0.904818    
##                                0.007089    0.144945    0.049 0.960991    
##                                0.290368    0.328364    0.884 0.376540    
##                                0.459303    0.328933    1.396 0.162611    
##                                0.183471    0.278467    0.659 0.509986    
##                               -0.012547    0.146112   -0.086 0.931567    
##                                0.680673    0.202625    3.359 0.000781 ***
##                               -0.507066         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  34.67533 -13.13928 -1.99827 0.7752526 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]    [,3]    [,4]
## [1,] 0.25148 -0.271 -0.2484 -0.0836
## [2,] 0.29133  0.297 -0.0222 -0.2292
## [3,] 0.06909 -0.159  0.4661 -0.3075
## [4,] 0.00239 -0.367 -0.4862  0.6534
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]     [,2]    [,3]   [,4]
## [1,]  0.0155 -0.41097  0.0483 -0.448
## [2,] -0.2413  0.60819  0.2837 -0.752
## [3,]  0.0375 -0.00709 -0.2904 -0.459
## [4,] -0.1835  0.01255 -0.6807  0.507
##   
## Residuals cov-matrix: 
##           [,1]      [,2]       [,3]       [,4]
## [1,]  49.96454 33.098248 -12.182360 -15.039662
## [2,]  33.09825 56.170540   5.066057  -3.056906
## [3,] -12.18236  5.066057  60.859558  18.390789
## [4,] -15.03966 -3.056906  18.390789  51.166521
## ---- 
## aic=  16.19012 
## bic=  17.34649 
## Number of parameters:  36 
## initial estimates:  30.0024 -9.6838 -6.4397 -4.0452 0.3989 0.0213 -0.0346 0.1649 0.1757 0.0231 -0.1728 0.3876 0.1808 -0.1696 -0.0747 -0.0205 0.1055 0.0366 0.0971 -0.0054 -0.1789 -0.4364 0.3997 -0.8442 0.0629 -0.6692 0.7325 -1.0932 -0.2531 0.7858 -0.0183 1.0202 -0.1124 0.1564 -0.3275 0.299 
## Par. lower-bounds:  13.5623 -22.3576 -25.7539 -18.3322 0.0852 -0.4222 -0.2932 -0.2851 -0.0661 -0.3188 -0.3721 0.0407 -0.1878 -0.6906 -0.3785 -0.549 -0.1672 -0.3488 -0.1276 -0.3964 -1.0237 -1.365 -0.1408 -1.6191 -0.5884 -1.385 0.3159 -1.6905 -1.2456 -0.3051 -0.6532 0.1099 -0.8466 -0.6505 -0.7972 -0.3744 
## Par. upper-bounds:  46.4426 2.9899 12.8744 10.2418 0.7126 0.4648 0.2239 0.6148 0.4175 0.3649 0.0265 0.7344 0.5493 0.3514 0.2291 0.5081 0.3781 0.422 0.3218 0.3856 0.666 0.4921 0.9401 -0.0693 0.7142 0.0467 1.1491 -0.4959 0.7395 1.8767 0.6166 1.9305 0.6218 0.9633 0.1421 0.9724 
## Final   Estimates:  29.92247 -9.642436 -6.498364 -3.941761 0.395821 0.4647642 -0.02805893 0.1712612 0.2029216 -0.1818725 -0.2493499 0.7344272 0.1162625 0.3513555 -0.3784799 -0.3398295 0.067156 0.4219645 -0.04369922 -0.3964092 0.004758325 -0.692614 0.1935036 -0.3332993 -0.086816 0.04666369 0.3514879 -0.6951368 0.1600139 -0.2027975 0.4672947 0.9079198 0.1565503 -0.327959 0.06015173 0.5821174
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          29.922474         NaN      NaN      NaN    
## loneliness_state_pmc         -9.642436    1.427629   -6.754 1.44e-11 ***
## socintsatisfaction_state_pmc -6.498364    9.087963   -0.715  0.47458    
## responsiveness_state_pmc     -3.941761    6.188613   -0.637  0.52417    
## depressedmood_state           0.395821         NaN      NaN      NaN    
## loneliness_state_pmc          0.464764         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.028059         NaN      NaN      NaN    
## responsiveness_state_pmc      0.171261         NaN      NaN      NaN    
## depressedmood_state           0.202922         NaN      NaN      NaN    
## loneliness_state_pmc         -0.181873         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.249350         NaN      NaN      NaN    
## responsiveness_state_pmc      0.734427    0.310310    2.367  0.01794 *  
## depressedmood_state           0.116263    0.167820    0.693  0.48845    
## loneliness_state_pmc          0.351356         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.378480         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.339830         NaN      NaN      NaN    
## depressedmood_state           0.067156    0.110423    0.608  0.54308    
## loneliness_state_pmc          0.421964    0.087503    4.822 1.42e-06 ***
## socintsatisfaction_state_pmc -0.043699         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.396409         NaN      NaN      NaN    
##                               0.004758         NaN      NaN      NaN    
##                              -0.692614         NaN      NaN      NaN    
##                               0.193504         NaN      NaN      NaN    
##                              -0.333299         NaN      NaN      NaN    
##                              -0.086816         NaN      NaN      NaN    
##                               0.046664    0.018298    2.550  0.01077 *  
##                               0.351488         NaN      NaN      NaN    
##                              -0.695137    0.372313   -1.867  0.06189 .  
##                               0.160014         NaN      NaN      NaN    
##                              -0.202797         NaN      NaN      NaN    
##                               0.467295         NaN      NaN      NaN    
##                               0.907920         NaN      NaN      NaN    
##                               0.156550    0.104857    1.493  0.13544    
##                              -0.327959    0.113205   -2.897  0.00377 ** 
##                               0.060152         NaN      NaN      NaN    
##                               0.582117         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  29.92247 -9.642436 -6.498364 -3.941761 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]    [,3]   [,4]
## [1,] 0.3958  0.465 -0.0281  0.171
## [2,] 0.2029 -0.182 -0.2493  0.734
## [3,] 0.1163  0.351 -0.3785 -0.340
## [4,] 0.0672  0.422 -0.0437 -0.396
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]    [,2]    [,3]   [,4]
## [1,] -0.00476  0.6926 -0.1935  0.333
## [2,]  0.08682 -0.0467 -0.3515  0.695
## [3,] -0.16001  0.2028 -0.4673 -0.908
## [4,] -0.15655  0.3280 -0.0602 -0.582
##   
## Residuals cov-matrix: 
##           [,1]       [,2]      [,3]       [,4]
## [1,] 223.44863  108.03048 -97.90090  -92.93185
## [2,] 108.03048  176.82785 -63.72705 -103.59266
## [3,] -97.90090  -63.72705 297.26108   60.49538
## [4,] -92.93185 -103.59266  60.49538  160.82040
## ---- 
## aic=  21.33613 
## bic=  22.4925 
## Number of parameters:  36 
## initial estimates:  6.8118 -2.7842 -0.6763 -0.3321 0.398 0.063 0.3177 0.255 0.2443 -0.0192 0.1125 0.2378 0.0919 0.1369 0.3179 -0.0813 0.1032 -0.1277 -0.1159 0.1601 -0.0823 0.2431 -1.2561 0.8713 -0.2169 0.2642 -0.2836 0.0169 -0.4581 -0.5735 -0.0696 -0.3219 -0.4727 -0.1599 0.5067 -0.4556 
## Par. lower-bounds:  2.3614 -7.6445 -6.0761 -4.1411 0.1149 -0.2718 0.0115 -0.3272 -0.0649 -0.3849 -0.2219 -0.3981 -0.2516 -0.2694 -0.0536 -0.7878 -0.1391 -0.4143 -0.378 -0.3382 -0.8868 -0.6024 -2.0958 -0.0275 -1.0955 -0.6592 -1.2006 -0.9649 -1.4341 -1.5995 -1.0883 -1.4126 -1.1611 -0.8836 -0.2119 -1.2249 
## Par. upper-bounds:  11.2622 2.0762 4.7236 3.4768 0.6812 0.3979 0.6239 0.8373 0.5535 0.3465 0.447 0.8737 0.4355 0.5432 0.6895 0.6252 0.3456 0.1589 0.1462 0.6585 0.7221 1.0887 -0.4165 1.7702 0.6616 1.1877 0.6334 0.9986 0.5179 0.4524 0.9492 0.7688 0.2158 0.5638 1.2253 0.3137 
## Final   Estimates:  7.211081 -2.767503 -0.2863989 -0.4311039 0.1794249 -0.2718263 0.6239068 0.1574469 0.08544532 -0.3129287 -0.170874 0.2767436 0.1222002 0.5432305 0.2395248 0.625203 0.1815781 0.1588792 -0.3778188 -0.090986 0.2191944 0.5118138 -0.4165173 -0.02754977 0.05807086 0.5856198 0.2951027 -0.1312309 -0.09870235 -0.5765122 -0.08804172 -0.8184471 -0.2158829 -0.2569951 0.3507996 0.2972453
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)  
## depressedmood_state            7.21108     4.66942    1.544   0.1225  
## loneliness_state_pmc          -2.76750         NaN      NaN      NaN  
## socintsatisfaction_state_pmc  -0.28640         NaN      NaN      NaN  
## responsiveness_state_pmc      -0.43110         NaN      NaN      NaN  
## depressedmood_state            0.17942     0.33083    0.542   0.5876  
## loneliness_state_pmc          -0.27183         NaN      NaN      NaN  
## socintsatisfaction_state_pmc   0.62391     0.52212    1.195   0.2321  
## responsiveness_state_pmc       0.15745         NaN      NaN      NaN  
## depressedmood_state            0.08545         NaN      NaN      NaN  
## loneliness_state_pmc          -0.31293         NaN      NaN      NaN  
## socintsatisfaction_state_pmc  -0.17087     0.25420   -0.672   0.5015  
## responsiveness_state_pmc       0.27674         NaN      NaN      NaN  
## depressedmood_state            0.12220         NaN      NaN      NaN  
## loneliness_state_pmc           0.54323         NaN      NaN      NaN  
## socintsatisfaction_state_pmc   0.23952     0.41776    0.573   0.5664  
## responsiveness_state_pmc       0.62520         NaN      NaN      NaN  
## depressedmood_state            0.18158         NaN      NaN      NaN  
## loneliness_state_pmc           0.15888         NaN      NaN      NaN  
## socintsatisfaction_state_pmc  -0.37782     0.19762   -1.912   0.0559 .
## responsiveness_state_pmc      -0.09099         NaN      NaN      NaN  
##                                0.21919     0.30402    0.721   0.4709  
##                                0.51181         NaN      NaN      NaN  
##                               -0.41652         NaN      NaN      NaN  
##                               -0.02755         NaN      NaN      NaN  
##                                0.05807         NaN      NaN      NaN  
##                                0.58562         NaN      NaN      NaN  
##                                0.29510         NaN      NaN      NaN  
##                               -0.13123         NaN      NaN      NaN  
##                               -0.09870         NaN      NaN      NaN  
##                               -0.57651         NaN      NaN      NaN  
##                               -0.08804     0.39890   -0.221   0.8253  
##                               -0.81845         NaN      NaN      NaN  
##                               -0.21588         NaN      NaN      NaN  
##                               -0.25700         NaN      NaN      NaN  
##                                0.35080     0.32918    1.066   0.2866  
##                                0.29725         NaN      NaN      NaN  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  7.211081 -2.767503 -0.2863989 -0.4311039 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]   [,3]   [,4]
## [1,] 0.1794 -0.272  0.624  0.157
## [2,] 0.0854 -0.313 -0.171  0.277
## [3,] 0.1222  0.543  0.240  0.625
## [4,] 0.1816  0.159 -0.378 -0.091
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,] -0.2192 -0.512  0.417  0.0275
## [2,] -0.0581 -0.586 -0.295  0.1312
## [3,]  0.0987  0.577  0.088  0.8184
## [4,]  0.2159  0.257 -0.351 -0.2972
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 139.73327  74.53342 -54.23171 -28.84599
## [2,]  74.53342 140.22608 -68.74442 -22.18661
## [3,] -54.23171 -68.74442 180.24407  77.69361
## [4,] -28.84599 -22.18661  77.69361  98.10898
## ---- 
## aic=  19.69195 
## bic=  20.84831 
## Number of parameters:  36 
## initial estimates:  16.3001 -3.0395 -8.4137 -5.9709 0.2117 0.2279 -0.1608 -0.0151 0.1147 0.3929 -0.0579 -0.0151 0.5147 -0.3216 -0.073 0.3183 0.3004 -0.3566 -0.0685 0.3675 -0.0474 -0.1088 0.4926 -0.0233 9e-04 -0.5011 0.6827 -0.1054 -0.726 0.5236 -0.2935 0.1883 -0.321 0.6018 -0.0964 0.2123 
## Par. lower-bounds:  8.2868 -11.9254 -17.1589 -16.1154 -0.1304 -0.1394 -0.4873 -0.3048 -0.2647 -0.0143 -0.4199 -0.3363 0.1413 -0.7225 -0.4293 0.0022 -0.1327 -0.8216 -0.4818 8e-04 -0.7973 -0.8061 -0.0788 -0.6204 -0.8307 -1.2743 0.049 -0.7676 -1.5444 -0.2374 -0.9172 -0.4634 -1.2704 -0.2809 -0.8198 -0.5437 
## Par. upper-bounds:  24.3133 5.8465 0.3314 4.1736 0.5538 0.5952 0.1656 0.2745 0.4941 0.8002 0.3041 0.3061 0.8881 0.0792 0.2833 0.6344 0.7336 0.1083 0.3448 0.7342 0.7026 0.5884 1.0641 0.5739 0.8325 0.2721 1.3164 0.5568 0.0924 1.2845 0.3301 0.84 0.6284 1.4845 0.6271 0.9682 
## Final   Estimates:  16.42178 -3.028447 -8.433366 -5.995172 0.1577925 0.5901339 -0.1023746 0.2744544 -0.1462483 -0.01434172 0.07720522 0.3060738 0.5587225 0.07917657 0.2832991 0.1721276 0.3393007 -0.8188367 0.3446827 0.0008254872 0.2237377 -0.6643338 0.300143 -0.6204173 0.2067273 0.1257034 0.04897989 -0.5486825 -0.3119665 -0.2373689 -0.3379308 0.175363 0.005351699 0.9565431 -0.6515451 0.6497303 
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          16.4217816   4.8542304    3.383 0.000717 ***
## loneliness_state_pmc         -3.0284465   3.5773092   -0.847 0.397234    
## socintsatisfaction_state_pmc -8.4333662  14.7314687   -0.572 0.567002    
## responsiveness_state_pmc     -5.9951718   7.4667994   -0.803 0.422026    
## depressedmood_state           0.1577925   0.1977319    0.798 0.424863    
## loneliness_state_pmc          0.5901339   0.0945534    6.241 4.34e-10 ***
## socintsatisfaction_state_pmc -0.1023746   0.3721669   -0.275 0.783257    
## responsiveness_state_pmc      0.2744544   0.1456506    1.884 0.059520 .  
## depressedmood_state          -0.1462483   0.0494478   -2.958 0.003100 ** 
## loneliness_state_pmc         -0.0143417   0.2657189   -0.054 0.956956    
## socintsatisfaction_state_pmc  0.0772052   0.2512338    0.307 0.758612    
## responsiveness_state_pmc      0.3060738   0.0853844    3.585 0.000338 ***
## depressedmood_state           0.5587225   0.6441216    0.867 0.385713    
## loneliness_state_pmc          0.0791766   0.6643452    0.119 0.905133    
## socintsatisfaction_state_pmc  0.2832991   0.4493350    0.630 0.528377    
## responsiveness_state_pmc      0.1721276   0.4040764    0.426 0.670124    
## depressedmood_state           0.3393007   0.3211742    1.056 0.290768    
## loneliness_state_pmc         -0.8188367   0.1559663   -5.250 1.52e-07 ***
## socintsatisfaction_state_pmc  0.3446827   0.1780031    1.936 0.052821 .  
## responsiveness_state_pmc      0.0008255   0.2088178    0.004 0.996846    
##                               0.2237377   0.3094957    0.723 0.469735    
##                              -0.6643338   0.1440529   -4.612 3.99e-06 ***
##                               0.3001430   0.3794133    0.791 0.428902    
##                              -0.6204173   0.1695919   -3.658 0.000254 ***
##                               0.2067273   0.1578365    1.310 0.190279    
##                               0.1257034   0.2784253    0.451 0.651644    
##                               0.0489799   0.2684631    0.182 0.855233    
##                              -0.5486825   0.0662504   -8.282 2.22e-16 ***
##                              -0.3119665   0.9554698   -0.327 0.744042    
##                              -0.2373689   0.6388601   -0.372 0.710227    
##                              -0.3379308   0.4561337   -0.741 0.458779    
##                               0.1753630   0.4703277    0.373 0.709258    
##                               0.0053517   0.4236199    0.013 0.989920    
##                               0.9565431   0.0594974   16.077  < 2e-16 ***
##                              -0.6515451   0.1551713   -4.199 2.68e-05 ***
##                               0.6497303   0.2564502    2.534 0.011291 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  16.42178 -3.028447 -8.433366 -5.995172 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]    [,3]     [,4]
## [1,]  0.158  0.5901 -0.1024 0.274454
## [2,] -0.146 -0.0143  0.0772 0.306074
## [3,]  0.559  0.0792  0.2833 0.172128
## [4,]  0.339 -0.8188  0.3447 0.000825
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]   [,2]   [,3]   [,4]
## [1,] -0.22374  0.664 -0.300  0.620
## [2,] -0.20673 -0.126 -0.049  0.549
## [3,]  0.31197  0.237  0.338 -0.175
## [4,] -0.00535 -0.957  0.652 -0.650
##   
## Residuals cov-matrix: 
##           [,1]       [,2]      [,3]       [,4]
## [1,] 178.93371  154.77400 -62.10155  -74.57314
## [2,] 154.77400  296.12235 -81.89192 -165.01592
## [3,] -62.10155  -81.89192 251.57066  115.58295
## [4,] -74.57314 -165.01592 115.58295  296.64809
## ---- 
## aic=  21.91496 
## bic=  23.07133 
## Number of parameters:  36 
## initial estimates:  16.1754 -1.3078 -2.0215 0.6114 0.1935 -0.2343 -0.4493 -0.0685 0.0228 -0.2184 -1.1433 0.3746 -0.0173 0.054 0.4751 0.0881 -0.1052 0.0675 0.2714 0.1523 0.2094 -0.0154 0.1444 0.2781 0.4876 -0.4488 1.9259 -1.3221 -0.0459 -0.0834 -0.3448 -0.0481 -0.15 -0.0061 -0.5045 0.0272 
## Par. lower-bounds:  5.2425 -12.0999 -8.6565 -6.1512 -0.2119 -0.704 -1.5021 -1.0637 -0.3774 -0.6821 -2.1825 -0.6078 -0.2633 -0.2311 -0.1638 -0.5159 -0.356 -0.2231 -0.3798 -0.4633 -0.974 -1.1001 -2.0059 -1.7441 -0.6806 -1.5195 -0.1967 -3.3182 -0.7641 -0.7417 -1.6498 -1.2753 -0.882 -0.677 -1.8346 -1.2236 
## Par. upper-bounds:  27.1083 9.4843 4.6135 7.374 0.5989 0.2355 0.6035 0.9267 0.423 0.2453 -0.104 1.357 0.2287 0.3391 1.1141 0.692 0.1455 0.3581 0.9226 0.7679 1.3929 1.0692 2.2947 2.3002 1.6558 0.6219 4.0485 0.6739 0.6723 0.5749 0.9602 1.1791 0.582 0.6648 0.8256 1.278 
## Final   Estimates:  16.1876 -1.326888 -1.98767 0.5947443 0.01860152 -0.4964234 -0.3480101 -0.1727925 -0.03781456 -0.04325967 -1.389748 0.4856052 0.07897461 -0.0718443 0.5094378 0.0421579 -0.02181247 0.1924696 0.3251633 0.2670733 0.1573965 0.3455699 -0.06404535 -0.005256471 0.1931684 -0.2802507 1.654078 -1.156616 -0.2542823 0.2599895 -0.5057471 0.4449289 -0.09878635 -0.1499778 -0.3223309 0.1021014
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          16.187599    2.353196    6.879 6.03e-12 ***
## loneliness_state_pmc         -1.326888         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -1.987670    0.443098   -4.486 7.26e-06 ***
## responsiveness_state_pmc      0.594744         NaN      NaN      NaN    
## depressedmood_state           0.018602    0.086194    0.216 0.829137    
## loneliness_state_pmc         -0.496423    0.432540   -1.148 0.251095    
## socintsatisfaction_state_pmc -0.348010    0.235916   -1.475 0.140174    
## responsiveness_state_pmc     -0.172792    0.278673   -0.620 0.535222    
## depressedmood_state          -0.037815    0.070450   -0.537 0.591433    
## loneliness_state_pmc         -0.043260    0.158118   -0.274 0.784399    
## socintsatisfaction_state_pmc -1.389748         NaN      NaN      NaN    
## responsiveness_state_pmc      0.485605    0.186221    2.608 0.009116 ** 
## depressedmood_state           0.078975    0.055532    1.422 0.154987    
## loneliness_state_pmc         -0.071844    0.080557   -0.892 0.372479    
## socintsatisfaction_state_pmc  0.509438         NaN      NaN      NaN    
## responsiveness_state_pmc      0.042158    0.091256    0.462 0.644101    
## depressedmood_state          -0.021812    0.131636   -0.166 0.868391    
## loneliness_state_pmc          0.192470    0.090936    2.117 0.034299 *  
## socintsatisfaction_state_pmc  0.325163    0.053839    6.040 1.55e-09 ***
## responsiveness_state_pmc      0.267073    0.066945    3.989 6.62e-05 ***
##                               0.157396    0.179084    0.879 0.379458    
##                               0.345570    0.491590    0.703 0.482079    
##                              -0.064045         NaN      NaN      NaN    
##                              -0.005256    0.258693   -0.020 0.983789    
##                               0.193168    0.114354    1.689 0.091179 .  
##                              -0.280251    0.221231   -1.267 0.205235    
##                               1.654078         NaN      NaN      NaN    
##                              -1.156616    0.122427   -9.447  < 2e-16 ***
##                              -0.254282    0.064670   -3.932 8.42e-05 ***
##                               0.259989    0.067326    3.862 0.000113 ***
##                              -0.505747         NaN      NaN      NaN    
##                               0.444929    0.106357    4.183 2.87e-05 ***
##                              -0.098786    0.167130   -0.591 0.554471    
##                              -0.149978    0.013435  -11.163  < 2e-16 ***
##                              -0.322331         NaN      NaN      NaN    
##                               0.102101         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  16.1876 -1.326888 -1.98767 0.5947443 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]   [,3]    [,4]
## [1,]  0.0186 -0.4964 -0.348 -0.1728
## [2,] -0.0378 -0.0433 -1.390  0.4856
## [3,]  0.0790 -0.0718  0.509  0.0422
## [4,] -0.0218  0.1925  0.325  0.2671
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]     [,4]
## [1,] -0.1574 -0.346  0.064  0.00526
## [2,] -0.1932  0.280 -1.654  1.15662
## [3,]  0.2543 -0.260  0.506 -0.44493
## [4,]  0.0988  0.150  0.322 -0.10210
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  566.3769  428.5905 -236.3902 -244.7286
## [2,]  428.5905  627.5739 -214.3178 -230.4318
## [3,] -236.3902 -214.3178  221.1434  203.7057
## [4,] -244.7286 -230.4318  203.7057  245.7627
## ---- 
## aic=  21.86221 
## bic=  23.01858 
## Number of parameters:  36 
## initial estimates:  12.8005 -14.1099 19.5056 11.3046 0.61 0.3696 0.284 -0.1167 0.3736 0.2986 0.1324 0.2313 -0.4955 -0.059 -0.1101 -0.1431 -0.2893 -0.1269 -0.4392 0.5824 -1.1001 0.5562 -0.073 -0.4541 -1.0582 0.5256 0.0738 -0.4025 0.6869 -0.6018 -0.1869 0.9216 0.0848 0.2536 0.2947 0.1656 
## Par. lower-bounds:  -1.5531 -25.0847 4.8824 3.0721 0.2293 -0.1691 -0.1147 -0.5927 0.0825 -0.1133 -0.1725 -0.1326 -0.8834 -0.6078 -0.5163 -0.628 -0.5077 -0.4359 -0.6679 0.3094 -2.2823 -0.6117 -0.7673 -1.6437 -1.9621 -0.3674 -0.4571 -1.312 -0.5175 -1.7916 -0.8943 -0.2903 -0.5932 -0.4162 -0.1035 -0.5167 
## Par. upper-bounds:  27.1542 -3.1351 34.1287 19.5371 0.9908 0.9083 0.6828 0.3592 0.6648 0.7104 0.4372 0.5952 -0.1076 0.4898 0.2962 0.3418 -0.071 0.182 -0.2105 0.8554 0.082 1.7241 0.6214 0.7355 -0.1544 1.4185 0.6047 0.5071 1.8912 0.588 0.5204 2.1335 0.7628 0.9235 0.6929 0.8479 
## Final   Estimates:  12.42939 -14.8347 19.37987 10.53163 0.6628299 -0.1690723 -0.08452848 0.009231886 0.4165579 0.3789375 0.437235 0.2175088 -0.5462804 0.4897744 0.05921296 0.04946471 -0.2887005 -0.2959122 -0.667905 0.5323502 -0.300693 0.4904191 0.2810189 -0.8099976 -0.1543511 -0.2427416 -0.4529398 -0.459955 0.1489085 -0.5212586 -0.1075249 0.1031506 -0.05259476 0.4320928 0.3617142 0.2714212
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)   
## depressedmood_state           12.429391    9.054817    1.373  0.16985   
## loneliness_state_pmc         -14.834698   12.193752   -1.217  0.22376   
## socintsatisfaction_state_pmc  19.379865         NaN      NaN      NaN   
## responsiveness_state_pmc      10.531633   10.601673    0.993  0.32052   
## depressedmood_state            0.662830    0.242710    2.731  0.00632 **
## loneliness_state_pmc          -0.169072    1.023223   -0.165  0.86876   
## socintsatisfaction_state_pmc  -0.084528    0.663533   -0.127  0.89863   
## responsiveness_state_pmc       0.009232    0.365440    0.025  0.97985   
## depressedmood_state            0.416558    0.337508    1.234  0.21712   
## loneliness_state_pmc           0.378938    0.705342    0.537  0.59110   
## socintsatisfaction_state_pmc   0.437235    0.647422    0.675  0.49945   
## responsiveness_state_pmc       0.217509    0.297968    0.730  0.46541   
## depressedmood_state           -0.546280         NaN      NaN      NaN   
## loneliness_state_pmc           0.489774    0.642565    0.762  0.44593   
## socintsatisfaction_state_pmc   0.059213    0.055022    1.076  0.28185   
## responsiveness_state_pmc       0.049465    0.272888    0.181  0.85616   
## depressedmood_state           -0.288701    0.289608   -0.997  0.31883   
## loneliness_state_pmc          -0.295912    0.508027   -0.582  0.56025   
## socintsatisfaction_state_pmc  -0.667905    0.359058   -1.860  0.06286 . 
## responsiveness_state_pmc       0.532350    0.283053    1.881  0.06001 . 
##                               -0.300693    0.407386   -0.738  0.46045   
##                                0.490419    1.104132    0.444  0.65692   
##                                0.281019    0.724877    0.388  0.69825   
##                               -0.809998    0.495702   -1.634  0.10225   
##                               -0.154351    0.336045   -0.459  0.64601   
##                               -0.242742    0.717272   -0.338  0.73504   
##                               -0.452940    0.687466   -0.659  0.50999   
##                               -0.459955    0.354550   -1.297  0.19453   
##                                0.148909         NaN      NaN      NaN   
##                               -0.521259    0.657046   -0.793  0.42758   
##                               -0.107525         NaN      NaN      NaN   
##                                0.103151    0.358839    0.287  0.77376   
##                               -0.052595    0.309997   -0.170  0.86528   
##                                0.432093    0.501489    0.862  0.38890   
##                                0.361714    0.370768    0.976  0.32927   
##                                0.271421    0.284241    0.955  0.33963   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  12.42939 -14.8347 19.37987 10.53163 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]    [,3]    [,4]
## [1,]  0.663 -0.169 -0.0845 0.00923
## [2,]  0.417  0.379  0.4372 0.21751
## [3,] -0.546  0.490  0.0592 0.04946
## [4,] -0.289 -0.296 -0.6679 0.53235
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,]  0.3007 -0.490 -0.281  0.810
## [2,]  0.1544  0.243  0.453  0.460
## [3,] -0.1489  0.521  0.108 -0.103
## [4,]  0.0526 -0.432 -0.362 -0.271
##   
## Residuals cov-matrix: 
##            [,1]      [,2]       [,3]      [,4]
## [1,]  231.07415 126.57847 -111.33963 -42.98721
## [2,]  126.57847 129.89892  -64.71389 -20.59525
## [3,] -111.33963 -64.71389  251.57080  91.18789
## [4,]  -42.98721 -20.59525   91.18789  70.97007
## ---- 
## aic=  19.48806 
## bic=  20.64443 
## Number of parameters:  36 
## initial estimates:  -16.9585 -34.5952 52.4772 36.8733 2.0714 -0.3317 0.5275 -0.1522 2.2246 -0.7494 0.1034 -0.2925 -3.2972 1.6818 -0.8525 0.5136 -2.3294 0.4847 -0.3984 0.6874 -2.0121 0.3356 -0.5554 0.1618 -2.26 0.85 -0.1343 0.2367 3.2651 -1.4171 0.9988 -0.3941 2.2986 -0.3131 0.2731 -0.2122 
## Par. lower-bounds:  -69.9432 -86.3694 -28.7455 -31.6555 -1.3134 -2.817 -0.3597 -0.9095 -1.0828 -3.1779 -0.7636 -1.0325 -8.4859 -2.128 -2.2126 -0.6473 -6.7072 -2.7297 -1.546 -0.292 -5.4101 -2.173 -1.4674 -0.6378 -5.5803 -1.6013 -1.0254 -0.5446 -1.9438 -5.2627 -0.3993 -1.6198 -2.0962 -3.5577 -0.9064 -1.2464 
## Par. upper-bounds:  36.0262 17.179 133.6999 105.4022 5.4562 2.1536 1.4147 0.6051 5.532 1.6792 0.9703 0.4475 1.8915 5.4917 0.5075 1.6745 2.0483 3.6991 0.7491 1.6669 1.3858 2.8442 0.3565 0.9614 1.0604 3.3013 0.7569 1.0181 8.474 2.4284 2.3968 0.8317 6.6934 2.9314 1.4526 0.822 
## Final   Estimates:  -16.95848 -34.59519 52.47718 36.87333 2.071401 -0.3316786 0.5275213 -0.1521826 2.224585 -0.7493764 0.1033552 -0.2924596 -3.297193 1.681821 -0.8525185 0.5135961 -2.329438 0.4847087 -0.3984467 0.6874384 -2.012139 0.3355906 -0.5554449 0.161816 -2.259965 0.8500076 -0.1342707 0.236719 3.265128 -1.417149 0.9987558 -0.3940676 2.298616 -0.3131363 0.2731112 -0.2121842 
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)
## depressedmood_state           -16.9585         NaN      NaN      NaN
## loneliness_state_pmc          -34.5952         NaN      NaN      NaN
## socintsatisfaction_state_pmc   52.4772         NaN      NaN      NaN
## responsiveness_state_pmc       36.8733         NaN      NaN      NaN
## depressedmood_state             2.0714         NaN      NaN      NaN
## loneliness_state_pmc           -0.3317         NaN      NaN      NaN
## socintsatisfaction_state_pmc    0.5275         NaN      NaN      NaN
## responsiveness_state_pmc       -0.1522         NaN      NaN      NaN
## depressedmood_state             2.2246         NaN      NaN      NaN
## loneliness_state_pmc           -0.7494         NaN      NaN      NaN
## socintsatisfaction_state_pmc    0.1034         NaN      NaN      NaN
## responsiveness_state_pmc       -0.2925         NaN      NaN      NaN
## depressedmood_state            -3.2972         NaN      NaN      NaN
## loneliness_state_pmc            1.6818         NaN      NaN      NaN
## socintsatisfaction_state_pmc   -0.8525         NaN      NaN      NaN
## responsiveness_state_pmc        0.5136         NaN      NaN      NaN
## depressedmood_state            -2.3294         NaN      NaN      NaN
## loneliness_state_pmc            0.4847         NaN      NaN      NaN
## socintsatisfaction_state_pmc   -0.3984         NaN      NaN      NaN
## responsiveness_state_pmc        0.6874         NaN      NaN      NaN
##                                -2.0121         NaN      NaN      NaN
##                                 0.3356         NaN      NaN      NaN
##                                -0.5554         NaN      NaN      NaN
##                                 0.1618         NaN      NaN      NaN
##                                -2.2600         NaN      NaN      NaN
##                                 0.8500         NaN      NaN      NaN
##                                -0.1343         NaN      NaN      NaN
##                                 0.2367         NaN      NaN      NaN
##                                 3.2651         NaN      NaN      NaN
##                                -1.4171         NaN      NaN      NaN
##                                 0.9988         NaN      NaN      NaN
##                                -0.3941         NaN      NaN      NaN
##                                 2.2986         NaN      NaN      NaN
##                                -0.3131         NaN      NaN      NaN
##                                 0.2731         NaN      NaN      NaN
##                                -0.2122         NaN      NaN      NaN
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  -16.95848 -34.59519 52.47718 36.87333 
## AR coefficient matrix 
## AR( 1 )-matrix 
##       [,1]   [,2]   [,3]   [,4]
## [1,]  2.07 -0.332  0.528 -0.152
## [2,]  2.22 -0.749  0.103 -0.292
## [3,] -3.30  1.682 -0.853  0.514
## [4,] -2.33  0.485 -0.398  0.687
## MA coefficient matrix 
## MA( 1 )-matrix 
##       [,1]   [,2]   [,3]   [,4]
## [1,]  2.01 -0.336  0.555 -0.162
## [2,]  2.26 -0.850  0.134 -0.237
## [3,] -3.27  1.417 -0.999  0.394
## [4,] -2.30  0.313 -0.273  0.212
##   
## Residuals cov-matrix: 
##               [,1]          [,2]          [,3]          [,4]
## [1,]  7.858989e+18  8.916706e+18 -7.545681e+18 -1.172068e+19
## [2,]  8.916706e+18  1.011678e+19 -8.561231e+18 -1.329813e+19
## [3,] -7.545681e+18 -8.561231e+18  7.244863e+18  1.125342e+19
## [4,] -1.172068e+19 -1.329813e+19  1.125342e+19  1.747990e+19
## ---- 
## aic=  68.62125 
## bic=  69.77761 
## Number of parameters:  36 
## initial estimates:  8.2437 -4.3707 2.5337 2.5934 0.507 -0.29 -0.2328 0.0758 0.2769 -0.0722 -0.1543 0.132 -0.0478 0.6062 0.6937 -0.3756 -0.0943 0.4336 0.4059 -0.1041 -0.1597 0.3824 0.0608 -0.075 -0.0075 0.0488 0.0386 -0.0196 -0.1984 -0.0675 -0.5723 0.9847 -0.3795 0.1401 -0.2263 0.366 
## Par. lower-bounds:  1.7188 -9.134 -9.2407 -6.5648 0.1693 -0.8465 -0.6214 -0.4179 0.0304 -0.4784 -0.438 -0.2285 -0.6572 -0.3979 -0.0074 -1.2666 -0.5683 -0.3474 -0.1394 -0.7971 -0.9811 -0.6471 -0.6602 -1.0467 -0.6072 -0.7027 -0.4877 -0.7289 -1.6807 -1.9252 -1.8734 -0.7687 -1.5325 -1.3048 -1.2383 -0.9978 
## Par. upper-bounds:  14.7687 0.3926 14.3081 11.7516 0.8447 0.2665 0.1557 0.5696 0.5234 0.3341 0.1293 0.4924 0.5616 1.6103 1.3948 0.5154 0.3797 1.2146 0.9512 0.589 0.6618 1.4119 0.7818 0.8967 0.5922 0.8004 0.565 0.6897 1.284 1.7902 0.7288 2.7381 0.7735 1.585 0.7856 1.7298 
## Final   Estimates:  7.896467 -4.744435 2.258036 2.71658 0.5209648 0.2280009 0.1099034 -0.02125017 0.3186813 0.3339339 -0.119136 0.1399513 -0.1293596 0.5772268 0.7877239 0.2673622 -0.2273575 0.3681328 0.9057477 -0.3966075 -0.4437302 -0.2457833 -0.4024308 0.0778648 -0.2700826 -0.3847187 0.02086742 -0.09241777 0.04659565 -0.2472673 -0.8164378 -0.004343182 0.1419394 -0.1948764 -1.055593 0.7648598
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           7.896467    2.957490    2.670  0.00759 ** 
## loneliness_state_pmc         -4.744435         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  2.258036    2.282841    0.989  0.32260    
## responsiveness_state_pmc      2.716580    2.745691    0.989  0.32247    
## depressedmood_state           0.520965    0.176827    2.946  0.00322 ** 
## loneliness_state_pmc          0.228001    0.307916    0.740  0.45902    
## socintsatisfaction_state_pmc  0.109903    0.127952    0.859  0.39037    
## responsiveness_state_pmc     -0.021250    0.063090   -0.337  0.73625    
## depressedmood_state           0.318681         NaN      NaN      NaN    
## loneliness_state_pmc          0.333934         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.119136    0.527763   -0.226  0.82141    
## responsiveness_state_pmc      0.139951    0.715625    0.196  0.84495    
## depressedmood_state          -0.129360    0.132732   -0.975  0.32976    
## loneliness_state_pmc          0.577227    0.322580    1.789  0.07355 .  
## socintsatisfaction_state_pmc  0.787724    0.435066    1.811  0.07021 .  
## responsiveness_state_pmc      0.267362    0.535588    0.499  0.61764    
## depressedmood_state          -0.227357    0.132162   -1.720  0.08538 .  
## loneliness_state_pmc          0.368133    0.567348    0.649  0.51642    
## socintsatisfaction_state_pmc  0.905748    0.474043    1.911  0.05605 .  
## responsiveness_state_pmc     -0.396608    0.335328   -1.183  0.23691    
##                              -0.443730    0.184767   -2.402  0.01633 *  
##                              -0.245783    0.318331   -0.772  0.44006    
##                              -0.402431    0.063586   -6.329 2.47e-10 ***
##                               0.077865         NaN      NaN      NaN    
##                              -0.270083         NaN      NaN      NaN    
##                              -0.384719         NaN      NaN      NaN    
##                               0.020867    0.533036    0.039  0.96877    
##                              -0.092418    0.717969   -0.129  0.89758    
##                               0.046596    0.139814    0.333  0.73893    
##                              -0.247267    0.256783   -0.963  0.33558    
##                              -0.816438    0.258130   -3.163  0.00156 ** 
##                              -0.004343    0.350899   -0.012  0.99012    
##                               0.141939    0.219664    0.646  0.51817    
##                              -0.194876    0.577457   -0.337  0.73576    
##                              -1.055593    0.374165   -2.821  0.00478 ** 
##                               0.764860    0.182327    4.195 2.73e-05 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  7.896467 -4.744435 2.258036 2.71658 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]  [,2]   [,3]    [,4]
## [1,]  0.521 0.228  0.110 -0.0213
## [2,]  0.319 0.334 -0.119  0.1400
## [3,] -0.129 0.577  0.788  0.2674
## [4,] -0.227 0.368  0.906 -0.3966
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]  [,2]    [,3]     [,4]
## [1,]  0.4437 0.246  0.4024 -0.07786
## [2,]  0.2701 0.385 -0.0209  0.09242
## [3,] -0.0466 0.247  0.8164  0.00434
## [4,] -0.1419 0.195  1.0556 -0.76486
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 121.75579  41.01076 -47.99931 -56.35568
## [2,]  41.01076  71.35173 -74.41504 -63.54413
## [3,] -47.99931 -74.41504 556.15611 406.21293
## [4,] -56.35568 -63.54413 406.21293 367.07690
## ---- 
## aic=  20.24827 
## bic=  21.40464 
## Number of parameters:  36 
## initial estimates:  41.9993 3.7195 -12.3059 -6.2711 0.0489 0.0235 0.1672 -0.2434 -0.0538 0.0559 0.1746 -0.2984 0.2153 0.0715 0.0256 0.3007 0.1223 -0.0653 -0.0896 0.3358 0.8715 -0.0574 -0.2555 0.4712 0.7306 -0.2047 -0.3958 0.5784 -0.3077 -0.3247 0.2788 -0.3067 -0.8836 -0.0762 0.013 -0.0295 
## Par. lower-bounds:  28.4984 -14.0549 -38.421 -25.2746 -0.2572 -0.2556 -0.0257 -0.5083 -0.4567 -0.3116 -0.0793 -0.6471 -0.3768 -0.4684 -0.3475 -0.2116 -0.3086 -0.4582 -0.361 -0.037 -0.1132 -0.8697 -0.814 -0.1989 -0.5658 -1.2741 -1.1311 -0.3037 -2.2123 -1.896 -0.8015 -1.6027 -2.2696 -1.2196 -0.7731 -0.9726 
## Par. upper-bounds:  55.5001 21.4938 13.8091 12.7324 0.355 0.3026 0.36 0.0214 0.3492 0.4233 0.4285 0.0503 0.8074 0.6114 0.3986 0.813 0.5531 0.3276 0.1819 0.7086 1.8561 0.7549 0.303 1.1412 2.0269 0.8647 0.3395 1.4605 1.597 1.2465 1.3591 0.9893 0.5024 1.0672 0.7991 0.9136 
## Final   Estimates:  41.93031 3.819473 -12.38037 -6.154517 0.02642167 -0.190507 0.3600266 -0.5082666 -0.07957802 -0.3116229 -0.07934652 -0.4815343 0.2742727 0.6114129 0.1092891 0.1981203 0.1411127 -0.4581506 0.00416063 -0.03703396 0.2784216 0.3913852 -0.2726972 0.3743691 0.2130367 0.5328914 0.2030062 0.3388824 -0.2495363 -0.7554171 0.1000485 -0.03730582 0.02991742 0.03330252 -0.03462936 0.3086037
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           41.930313    5.800521    7.229 4.88e-13 ***
## loneliness_state_pmc           3.819473   11.596781    0.329 0.741886    
## socintsatisfaction_state_pmc -12.380373    6.063738   -2.042 0.041181 *  
## responsiveness_state_pmc      -6.154517   12.445442   -0.495 0.620939    
## depressedmood_state            0.026422    0.128772    0.205 0.837430    
## loneliness_state_pmc          -0.190507         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.360027    0.274494    1.312 0.189656    
## responsiveness_state_pmc      -0.508267    0.337808   -1.505 0.132427    
## depressedmood_state           -0.079578    0.271770   -0.293 0.769664    
## loneliness_state_pmc          -0.311623         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.079347         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.481534    0.023583  -20.419  < 2e-16 ***
## depressedmood_state            0.274273    0.132308    2.073 0.038174 *  
## loneliness_state_pmc           0.611413         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.109289         NaN      NaN      NaN    
## responsiveness_state_pmc       0.198120         NaN      NaN      NaN    
## depressedmood_state            0.141113    0.290299    0.486 0.626901    
## loneliness_state_pmc          -0.458151    0.151274   -3.029 0.002457 ** 
## socintsatisfaction_state_pmc   0.004161    0.326321    0.013 0.989827    
## responsiveness_state_pmc      -0.037034    0.364639   -0.102 0.919103    
##                                0.278422         NaN      NaN      NaN    
##                                0.391385         NaN      NaN      NaN    
##                               -0.272697    0.331449   -0.823 0.410655    
##                                0.374369    0.383904    0.975 0.329479    
##                                0.213037    0.303468    0.702 0.482674    
##                                0.532891         NaN      NaN      NaN    
##                                0.203006    0.094197    2.155 0.031153 *  
##                                0.338882    0.079622    4.256 2.08e-05 ***
##                               -0.249536    0.217260   -1.149 0.250738    
##                               -0.755417    0.212062   -3.562 0.000368 ***
##                                0.100049         NaN      NaN      NaN    
##                               -0.037306         NaN      NaN      NaN    
##                                0.029917    0.272012    0.110 0.912421    
##                                0.033303    0.060828    0.547 0.584046    
##                               -0.034629    0.372029   -0.093 0.925838    
##                                0.308604    0.402781    0.766 0.443568    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  41.93031 3.819473 -12.38037 -6.154517 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]     [,3]   [,4]
## [1,]  0.0264 -0.191  0.36003 -0.508
## [2,] -0.0796 -0.312 -0.07935 -0.482
## [3,]  0.2743  0.611  0.10929  0.198
## [4,]  0.1411 -0.458  0.00416 -0.037
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]    [,3]    [,4]
## [1,] -0.2784 -0.3914  0.2727 -0.3744
## [2,] -0.2130 -0.5329 -0.2030 -0.3389
## [3,]  0.2495  0.7554 -0.1000  0.0373
## [4,] -0.0299 -0.0333  0.0346 -0.3086
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  65.41047  51.84369 -34.36160 -27.63847
## [2,]  51.84369 129.92154 -45.54026 -40.81481
## [3,] -34.36160 -45.54026 225.53096 104.85852
## [4,] -27.63847 -40.81481 104.85852 114.77842
## ---- 
## aic=  19.14613 
## bic=  20.3025 
## Number of parameters:  36 
## initial estimates:  40.3411 -15.8815 12.8626 14.0103 0.3627 0.1269 -0.245 0.3221 0.2137 -0.0166 -0.4481 0.4331 -0.234 0.0874 0.8198 -0.1618 -0.2195 0.2703 0.1934 0.4854 0.0868 0.1433 0.1428 -0.4804 0.0106 0.0036 0.4115 -0.7979 0.2606 -0.2227 0.1652 -0.1463 0.1748 -0.6273 -0.0411 -0.2543 
## Par. lower-bounds:  20.6348 -31.2567 -11.3101 -5.7911 0.0579 -0.2508 -0.4867 -0.0195 -0.024 -0.3112 -0.6368 0.1666 -0.6078 -0.3758 0.5232 -0.5809 -0.5257 -0.1091 -0.0495 0.1421 -0.5476 -0.6618 -0.6375 -1.2427 -0.4844 -0.6245 -0.1973 -1.3927 -0.5175 -1.2102 -0.792 -1.0814 -0.4626 -1.4362 -0.8252 -1.0203 
## Par. upper-bounds:  60.0474 -0.5063 37.0353 33.8116 0.6674 0.5045 -0.0032 0.6638 0.4515 0.2781 -0.2595 0.6997 0.1398 0.5507 1.1163 0.2573 0.0868 0.6498 0.4364 0.8287 0.7211 0.9483 0.9231 0.2819 0.5055 0.6317 1.0203 -0.2032 1.0388 0.7648 1.1223 0.7888 0.8122 0.1817 0.743 0.5117 
## Final   Estimates:  40.32213 -15.71806 12.92711 14.00884 0.3345218 -0.2436596 -0.371762 -0.01953893 0.2078492 -0.3112198 -0.636783 0.5971162 -0.2450781 -0.09622596 0.7672071 -0.2118603 -0.2183914 0.3676377 0.436383 0.1421077 -0.05293933 0.6280372 0.1941947 0.2590428 -0.05193462 0.5546544 0.3731593 -0.6009664 0.2164686 0.05871157 -0.1051414 0.1107963 -0.02123396 -0.1433176 -0.5051307 0.4193702
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)   
## depressedmood_state           40.32213    20.01153    2.015  0.04391 * 
## loneliness_state_pmc         -15.71806         NaN      NaN      NaN   
## socintsatisfaction_state_pmc  12.92711    12.53542    1.031  0.30243   
## responsiveness_state_pmc      14.00884    16.34132    0.857  0.39130   
## depressedmood_state            0.33452     0.31728    1.054  0.29172   
## loneliness_state_pmc          -0.24366     0.38205   -0.638  0.52362   
## socintsatisfaction_state_pmc  -0.37176     0.21994   -1.690  0.09097 . 
## responsiveness_state_pmc      -0.01954     0.36518   -0.054  0.95733   
## depressedmood_state            0.20785         NaN      NaN      NaN   
## loneliness_state_pmc          -0.31122     0.31956   -0.974  0.33011   
## socintsatisfaction_state_pmc  -0.63678     0.19786   -3.218  0.00129 **
## responsiveness_state_pmc       0.59712     0.40827    1.463  0.14359   
## depressedmood_state           -0.24508     0.18036   -1.359  0.17419   
## loneliness_state_pmc          -0.09623     0.57456   -0.167  0.86699   
## socintsatisfaction_state_pmc   0.76721     0.34495    2.224  0.02614 * 
## responsiveness_state_pmc      -0.21186     0.44723   -0.474  0.63570   
## depressedmood_state           -0.21839     0.25746   -0.848  0.39629   
## loneliness_state_pmc           0.36764     0.41263    0.891  0.37295   
## socintsatisfaction_state_pmc   0.43638     0.34512    1.264  0.20608   
## responsiveness_state_pmc       0.14211     0.60200    0.236  0.81339   
##                               -0.05294     0.39217   -0.135  0.89262   
##                                0.62804     0.41223    1.524  0.12763   
##                                0.19419     0.23437    0.829  0.40734   
##                                0.25904     0.37981    0.682  0.49522   
##                               -0.05193         NaN      NaN      NaN   
##                                0.55465     0.29474    1.882  0.05986 . 
##                                0.37316     0.23896    1.562  0.11839   
##                               -0.60097     0.32736   -1.836  0.06639 . 
##                                0.21647     0.19089    1.134  0.25679   
##                                0.05871     0.63251    0.093  0.92604   
##                               -0.10514     0.39546   -0.266  0.79034   
##                                0.11080     0.50333    0.220  0.82577   
##                               -0.02123     0.27470   -0.077  0.93839   
##                               -0.14332     0.43348   -0.331  0.74093   
##                               -0.50513     0.38150   -1.324  0.18548   
##                                0.41937     0.58618    0.715  0.47434   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  40.32213 -15.71806 12.92711 14.00884 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]   [,3]    [,4]
## [1,]  0.335 -0.2437 -0.372 -0.0195
## [2,]  0.208 -0.3112 -0.637  0.5971
## [3,] -0.245 -0.0962  0.767 -0.2119
## [4,] -0.218  0.3676  0.436  0.1421
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]   [,3]   [,4]
## [1,]  0.0529 -0.6280 -0.194 -0.259
## [2,]  0.0519 -0.5547 -0.373  0.601
## [3,] -0.2165 -0.0587  0.105 -0.111
## [4,]  0.0212  0.1433  0.505 -0.419
##   
## Residuals cov-matrix: 
##            [,1]      [,2]      [,3]       [,4]
## [1,]  92.865197  28.77780 -12.74983   7.578996
## [2,]  28.777802  73.97047 -12.13099 -14.061767
## [3,] -12.749835 -12.13099 158.29887  81.217267
## [4,]   7.578996 -14.06177  81.21727  98.103161
## ---- 
## aic=  18.73279 
## bic=  19.88916 
## Number of parameters:  36 
## initial estimates:  9.7213 -2.9939 -0.5934 1.3381 0.4213 0.0644 -0.0984 0.2656 0.2276 -0.0295 0.0532 -0.0714 -0.0578 0.5163 0.6482 -0.0734 -0.0985 0.3221 -0.1297 0.7739 -0.514 -0.0297 0.5454 -1.0177 0.0399 -0.2345 0.4714 0.0639 -0.6225 -0.4666 -0.2867 0.2236 -0.1594 -0.2143 -0.51 0.0397 
## Par. lower-bounds:  4.5263 -7.022 -5.848 -2.1011 0.1783 -0.3134 -0.2878 -0.0076 0.0392 -0.3224 -0.0936 -0.2832 -0.3036 0.1343 0.4566 -0.3497 -0.2594 0.072 -0.2551 0.5931 -1.1692 -0.9352 -0.3763 -2.3091 -0.4681 -0.9366 -0.2432 -0.9375 -1.2852 -1.3824 -1.2189 -1.0827 -0.5932 -0.8137 -1.1202 -0.8153 
## Par. upper-bounds:  14.9164 1.0342 4.6612 4.7773 0.6642 0.4421 0.0909 0.5388 0.416 0.2634 0.2001 0.1404 0.188 0.8984 0.8397 0.2029 0.0624 0.5721 -0.0043 0.9548 0.1413 0.8757 1.4671 0.2738 0.548 0.4676 1.1861 1.0653 0.0403 0.4492 0.6456 1.5298 0.2744 0.3851 0.1001 0.8946 
## Final   Estimates:  6.600124 -2.516308 -1.576638 -0.3758609 0.6383417 0.4420938 -0.2719332 0.002769917 0.1482699 0.2363116 0.1614223 -0.1998345 0.0420417 0.1342504 0.8165825 -0.04260683 0.04672562 0.5721287 -0.004323269 0.7075126 -0.3555176 -0.367929 0.3698462 0.2737687 0.01128592 -0.1815173 -0.2424781 0.3411175 -0.2533485 0.1833224 -0.4849913 0.01591673 -0.1520775 -0.4266718 -0.2964499 0.2037885
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           6.600124         NaN      NaN      NaN    
## loneliness_state_pmc         -2.516308    1.837544   -1.369 0.170879    
## socintsatisfaction_state_pmc -1.576638         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.375861    1.485132   -0.253 0.800205    
## depressedmood_state           0.638342         NaN      NaN      NaN    
## loneliness_state_pmc          0.442094         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.271933    0.105753   -2.571 0.010129 *  
## responsiveness_state_pmc      0.002770    0.049520    0.056 0.955394    
## depressedmood_state           0.148270    0.099013    1.497 0.134270    
## loneliness_state_pmc          0.236312    0.239721    0.986 0.324243    
## socintsatisfaction_state_pmc  0.161422    0.071820    2.248 0.024603 *  
## responsiveness_state_pmc     -0.199834    0.108453   -1.843 0.065389 .  
## depressedmood_state           0.042042         NaN      NaN      NaN    
## loneliness_state_pmc          0.134250         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.816583    0.085033    9.603  < 2e-16 ***
## responsiveness_state_pmc     -0.042607    0.100072   -0.426 0.670280    
## depressedmood_state           0.046726    0.080078    0.584 0.559556    
## loneliness_state_pmc          0.572129    0.234810    2.437 0.014828 *  
## socintsatisfaction_state_pmc -0.004323    0.117990   -0.037 0.970771    
## responsiveness_state_pmc      0.707513    0.121688    5.814 6.09e-09 ***
##                              -0.355518    0.086658   -4.103 4.09e-05 ***
##                              -0.367929         NaN      NaN      NaN    
##                               0.369846    0.095893    3.857 0.000115 ***
##                               0.273769         NaN      NaN      NaN    
##                               0.011286         NaN      NaN      NaN    
##                              -0.181517    0.244133   -0.744 0.457168    
##                              -0.242478         NaN      NaN      NaN    
##                               0.341117    0.202248    1.687 0.091674 .  
##                              -0.253349         NaN      NaN      NaN    
##                               0.183322         NaN      NaN      NaN    
##                              -0.484991    0.147696   -3.284 0.001024 ** 
##                               0.015917    0.354874    0.045 0.964225    
##                              -0.152077    0.078272   -1.943 0.052025 .  
##                              -0.426672    0.242151   -1.762 0.078068 .  
##                              -0.296450    0.118469   -2.502 0.012337 *  
##                               0.203788    0.144430    1.411 0.158249    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  6.600124 -2.516308 -1.576638 -0.3758609 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]  [,2]     [,3]     [,4]
## [1,] 0.6383 0.442 -0.27193  0.00277
## [2,] 0.1483 0.236  0.16142 -0.19983
## [3,] 0.0420 0.134  0.81658 -0.04261
## [4,] 0.0467 0.572 -0.00432  0.70751
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,]  0.3555  0.368 -0.370 -0.2738
## [2,] -0.0113  0.182  0.242 -0.3411
## [3,]  0.2533 -0.183  0.485 -0.0159
## [4,]  0.1521  0.427  0.296 -0.2038
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 116.49080  11.21873 -34.35228 -19.24261
## [2,]  11.21873  87.53445 -17.06082 -17.84049
## [3,] -34.35228 -17.06082 164.11992  42.07969
## [4,] -19.24261 -17.84049  42.07969  39.63904
## ---- 
## aic=  18.52476 
## bic=  19.68113 
## Number of parameters:  36 
## initial estimates:  16.1708 -8.3013 1.562 1.2579 0.1142 -0.11 -0.0163 -0.1133 0.4497 0.189 -0.0158 -0.1999 -0.0526 -0.229 0.6225 -0.0903 -0.0594 -0.1403 0.0259 0.4328 0.038 -0.2101 -0.2105 0.2823 0.0424 -0.2742 -0.4741 0.8378 -0.3976 0.3306 -0.2599 0.096 -0.6822 -0.0761 0.3423 -0.8276 
## Par. lower-bounds:  10.8452 -14.4118 -8.1421 -6.6777 -0.1641 -0.3575 -0.1562 -0.307 0.1303 -0.0949 -0.1764 -0.4221 -0.5599 -0.68 0.3675 -0.4432 -0.4742 -0.5091 -0.1826 0.1441 -0.7323 -0.7417 -0.5688 -0.278 -0.8414 -0.8841 -0.8853 0.1949 -1.8012 -0.6381 -0.9129 -0.925 -1.83 -0.8682 -0.1917 -1.6625 
## Par. upper-bounds:  21.4964 -2.1908 11.2661 9.1935 0.3926 0.1375 0.1236 0.0804 0.7691 0.473 0.1447 0.0224 0.4546 0.2219 0.8774 0.2627 0.3554 0.2285 0.2344 0.7214 0.8083 0.3216 0.1479 0.8426 0.9262 0.3358 -0.063 1.4807 1.006 1.2993 0.3931 1.1169 0.4656 0.7161 0.8762 0.0073 
## Final   Estimates:  16.26745 -8.256131 1.58165 1.153948 0.08654168 -0.06337519 0.06344262 -0.2709909 0.4573436 0.4568309 0.09028372 -0.387267 -0.118994 -0.4806933 0.6169863 0.1323147 -0.06845993 -0.2499561 0.1553304 0.3198078 0.118728 -0.1668801 -0.1612329 0.2374104 0.0377042 -0.8841161 -0.06389134 0.3886881 -0.1138577 0.7422073 -0.1125218 -0.3065131 -0.2171764 0.4120739 -0.1917042 -0.02218807
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           16.26745     2.77071    5.871 4.33e-09 ***
## loneliness_state_pmc          -8.25613     1.64605   -5.016 5.28e-07 ***
## socintsatisfaction_state_pmc   1.58165     3.66990    0.431 0.666484    
## responsiveness_state_pmc       1.15395     5.64441    0.204 0.838009    
## depressedmood_state            0.08654     0.15088    0.574 0.566248    
## loneliness_state_pmc          -0.06338     0.22027   -0.288 0.773565    
## socintsatisfaction_state_pmc   0.06344         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.27099         NaN      NaN      NaN    
## depressedmood_state            0.45734     0.07093    6.448 1.13e-10 ***
## loneliness_state_pmc           0.45683     0.12747    3.584 0.000339 ***
## socintsatisfaction_state_pmc   0.09028     0.03851    2.344 0.019062 *  
## responsiveness_state_pmc      -0.38727         NaN      NaN      NaN    
## depressedmood_state           -0.11899     0.16766   -0.710 0.477880    
## loneliness_state_pmc          -0.48069         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.61699     0.14713    4.194 2.75e-05 ***
## responsiveness_state_pmc       0.13231         NaN      NaN      NaN    
## depressedmood_state           -0.06846     0.30301   -0.226 0.821255    
## loneliness_state_pmc          -0.24996     0.22593   -1.106 0.268576    
## socintsatisfaction_state_pmc   0.15533         NaN      NaN      NaN    
## responsiveness_state_pmc       0.31981     0.04497    7.112 1.14e-12 ***
##                                0.11873         NaN      NaN      NaN    
##                               -0.16688     0.23542   -0.709 0.478418    
##                               -0.16123         NaN      NaN      NaN    
##                                0.23741     0.02226   10.666  < 2e-16 ***
##                                0.03770     0.03949    0.955 0.339691    
##                               -0.88412         NaN      NaN      NaN    
##                               -0.06389     0.06633   -0.963 0.335450    
##                                0.38869         NaN      NaN      NaN    
##                               -0.11386         NaN      NaN      NaN    
##                                0.74221         NaN      NaN      NaN    
##                               -0.11252     0.18270   -0.616 0.537982    
##                               -0.30651         NaN      NaN      NaN    
##                               -0.21718     0.30781   -0.706 0.480464    
##                                0.41207     0.23849    1.728 0.084018 .  
##                               -0.19170     0.02731   -7.019 2.23e-12 ***
##                               -0.02219         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  16.26745 -8.256131 1.58165 1.153948 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]   [,3]   [,4]
## [1,]  0.0865 -0.0634 0.0634 -0.271
## [2,]  0.4573  0.4568 0.0903 -0.387
## [3,] -0.1190 -0.4807 0.6170  0.132
## [4,] -0.0685 -0.2500 0.1553  0.320
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,] -0.1187  0.167 0.1612 -0.2374
## [2,] -0.0377  0.884 0.0639 -0.3887
## [3,]  0.1139 -0.742 0.1125  0.3065
## [4,]  0.2172 -0.412 0.1917  0.0222
##   
## Residuals cov-matrix: 
##            [,1]      [,2]       [,3]      [,4]
## [1,]  38.344202  10.98842  -7.154753 -10.63313
## [2,]  10.988420  49.98234  -5.188140 -21.36293
## [3,]  -7.154753  -5.18814 122.552066  27.43730
## [4,] -10.633127 -21.36293  27.437304  76.30587
## ---- 
## aic=  17.43412 
## bic=  18.59048 
## Number of parameters:  36 
## initial estimates:  33.3621 1.2098 37.5812 16.3763 0.5159 0.2311 0.0686 -0.4142 0.011 0.079 0.0226 -0.1416 -0.5485 0.0451 0.2941 -0.8466 -0.2517 0.0747 0.0068 -0.141 -0.528 -0.2627 -0.155 0.6757 0.0265 -0.0425 -0.1146 0.887 1.4596 -0.901 -0.5378 1.9238 0.5056 -0.4769 6e-04 0.5047 
## Par. lower-bounds:  15.2041 -13.871 5.124 4.2381 0.2535 -0.1544 -0.115 -0.9187 -0.207 -0.2411 -0.1298 -0.5606 -1.0175 -0.644 -0.0339 -1.7483 -0.4271 -0.183 -0.1159 -0.4782 -1.1951 -1.0785 -0.5838 -0.3442 -0.5275 -0.72 -0.4707 0.04 0.2672 -2.3592 -1.3043 0.1009 0.0596 -1.0222 -0.286 -0.177 
## Par. upper-bounds:  51.52 16.2905 70.0384 28.5144 0.7783 0.6166 0.2521 0.0902 0.2289 0.3992 0.175 0.2773 -0.0794 0.7341 0.6221 0.0551 -0.0763 0.3324 0.1295 0.1962 0.1391 0.553 0.2738 1.6955 0.5806 0.635 0.2415 1.734 2.6521 0.5571 0.2287 3.7468 0.9515 0.0684 0.2873 1.1865 
## Final   Estimates:  33.36543 1.126751 37.54256 16.33444 0.50871 0.2092365 0.1658835 -0.5453211 0.005617299 0.2523593 -0.03570221 -0.5272186 -0.5416849 0.1604823 0.01991098 -1.105432 -0.255812 0.3324017 0.06980383 0.09216427 -0.126831 -0.1415366 -0.2785484 0.6269138 0.1541659 -0.1055618 -0.01241038 0.7901355 0.6872115 -0.6683096 -0.2410038 2.168258 0.06774098 -0.609417 -0.2860335 0.2182996
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          33.365426    3.380351    9.870  < 2e-16 ***
## loneliness_state_pmc          1.126751    2.553958    0.441 0.659084    
## socintsatisfaction_state_pmc 37.542564    5.463172    6.872 6.33e-12 ***
## responsiveness_state_pmc     16.334442    1.315832   12.414  < 2e-16 ***
## depressedmood_state           0.508710    0.044117   11.531  < 2e-16 ***
## loneliness_state_pmc          0.209237         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.165884         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.545321         NaN      NaN      NaN    
## depressedmood_state           0.005617    0.040063    0.140 0.888492    
## loneliness_state_pmc          0.252359    0.178846    1.411 0.158232    
## socintsatisfaction_state_pmc -0.035702         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.527219         NaN      NaN      NaN    
## depressedmood_state          -0.541685    0.069900   -7.749 9.33e-15 ***
## loneliness_state_pmc          0.160482    0.151786    1.057 0.290377    
## socintsatisfaction_state_pmc  0.019911         NaN      NaN      NaN    
## responsiveness_state_pmc     -1.105432         NaN      NaN      NaN    
## depressedmood_state          -0.255812    0.015509  -16.495  < 2e-16 ***
## loneliness_state_pmc          0.332402         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.069804         NaN      NaN      NaN    
## responsiveness_state_pmc      0.092164         NaN      NaN      NaN    
##                              -0.126831    0.066754   -1.900 0.057436 .  
##                              -0.141537         NaN      NaN      NaN    
##                              -0.278548         NaN      NaN      NaN    
##                               0.626914         NaN      NaN      NaN    
##                               0.154166         NaN      NaN      NaN    
##                              -0.105562    0.132652   -0.796 0.426160    
##                              -0.012410    0.085440   -0.145 0.884512    
##                               0.790136    0.229420    3.444 0.000573 ***
##                               0.687211         NaN      NaN      NaN    
##                              -0.668310         NaN      NaN      NaN    
##                              -0.241004    0.002882  -83.621  < 2e-16 ***
##                               2.168258    0.350200    6.191 5.96e-10 ***
##                               0.067741    0.024096    2.811 0.004934 ** 
##                              -0.609417         NaN      NaN      NaN    
##                              -0.286034         NaN      NaN      NaN    
##                               0.218300         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  33.36543 1.126751 37.54256 16.33444 
## AR coefficient matrix 
## AR( 1 )-matrix 
##          [,1]  [,2]    [,3]    [,4]
## [1,]  0.50871 0.209  0.1659 -0.5453
## [2,]  0.00562 0.252 -0.0357 -0.5272
## [3,] -0.54168 0.160  0.0199 -1.1054
## [4,] -0.25581 0.332  0.0698  0.0922
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]  [,2]   [,3]   [,4]
## [1,]  0.1268 0.142 0.2785 -0.627
## [2,] -0.1542 0.106 0.0124 -0.790
## [3,] -0.6872 0.668 0.2410 -2.168
## [4,] -0.0677 0.609 0.2860 -0.218
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 151.86443  47.27410 -32.28925 -24.93642
## [2,]  47.27410 122.71318 -44.70957 -13.55905
## [3,] -32.28925 -44.70957 491.99859 139.46048
## [4,] -24.93642 -13.55905 139.46048  98.43474
## ---- 
## aic=  20.93977 
## bic=  22.09614 
## Number of parameters:  36 
## initial estimates:  9.748 -10.6925 -8.4729 -15.8924 0.6871 0.0012 -0.0883 -0.1697 0.3452 -1.1625 0.3153 -0.4385 0.2846 -0.1945 0.3741 0.2606 0.5172 0.2752 0.2427 0.2239 -0.4919 0.2045 0.3204 0.1761 -0.2132 1.0109 -0.3456 0.4744 -0.3508 0.1605 0.1345 -0.1843 -0.5124 -0.2966 -0.1618 0.2501 
## Par. lower-bounds:  -13.1127 -29.1254 -35.9529 -37.6231 -0.0381 -1.3309 -0.6425 -0.8363 -0.2395 -2.2366 -0.1315 -0.976 -0.5871 -1.7958 -0.292 -0.5407 -0.1721 -0.9911 -0.2841 -0.4098 -1.267 -1.1732 -0.2835 -0.5509 -0.8381 -0.1 -0.8325 -0.1118 -1.2824 -1.4957 -0.5915 -1.0581 -1.2491 -1.6062 -0.7359 -0.4409 
## Par. upper-bounds:  32.6086 7.7404 19.0072 5.8384 1.4124 1.3333 0.4659 0.497 0.93 -0.0885 0.7622 0.099 1.1564 1.4067 1.0403 1.062 1.2066 1.5414 0.7695 0.8576 0.2831 1.5823 0.9243 0.903 0.4117 2.1218 0.1414 1.0605 0.5808 1.8166 0.8604 0.6896 0.2243 1.0131 0.4123 0.9411 
## Final   Estimates:  11.22129 -11.05142 -8.289051 -17.33043 0.6429447 0.1574121 0.1558739 -0.726565 0.359182 -0.2331398 0.7621755 -0.9513848 0.2803844 -0.1184074 0.3813958 -0.01924991 0.5753682 -0.2624614 -0.1977958 0.4765489 -0.443115 -0.04594147 0.03642884 0.9030108 -0.2265472 -0.1000298 -0.8323497 1.009649 -0.564971 0.469069 0.07389847 0.2227692 -0.7034375 0.3782677 0.4040329 -0.1465887
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           11.22129     6.06916    1.849 0.064472 .  
## loneliness_state_pmc         -11.05142         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -8.28905    13.07677   -0.634 0.526162    
## responsiveness_state_pmc     -17.33043     7.82422   -2.215 0.026762 *  
## depressedmood_state            0.64294     0.19174    3.353 0.000799 ***
## loneliness_state_pmc           0.15741     0.07449    2.113 0.034590 *  
## socintsatisfaction_state_pmc   0.15587     0.45436    0.343 0.731554    
## responsiveness_state_pmc      -0.72656     0.33531   -2.167 0.030246 *  
## depressedmood_state            0.35918         NaN      NaN      NaN    
## loneliness_state_pmc          -0.23314     0.48753   -0.478 0.632504    
## socintsatisfaction_state_pmc   0.76218     0.56415    1.351 0.176688    
## responsiveness_state_pmc      -0.95138     0.71832   -1.324 0.185348    
## depressedmood_state            0.28038     0.41630    0.674 0.500615    
## loneliness_state_pmc          -0.11841     0.23981   -0.494 0.621473    
## socintsatisfaction_state_pmc   0.38140     0.64938    0.587 0.556985    
## responsiveness_state_pmc      -0.01925     0.63671   -0.030 0.975881    
## depressedmood_state            0.57537     0.24930    2.308 0.021001 *  
## loneliness_state_pmc          -0.26246     0.31342   -0.837 0.402361    
## socintsatisfaction_state_pmc  -0.19780     0.60625   -0.326 0.744226    
## responsiveness_state_pmc       0.47655     0.60863    0.783 0.433635    
##                               -0.44311     0.22590   -1.962 0.049819 *  
##                               -0.04594     0.22588   -0.203 0.838830    
##                                0.03643     0.50384    0.072 0.942361    
##                                0.90301     0.32090    2.814 0.004893 ** 
##                               -0.22655         NaN      NaN      NaN    
##                               -0.10003     0.54565   -0.183 0.854545    
##                               -0.83235     0.53829   -1.546 0.122037    
##                                1.00965     0.71537    1.411 0.158138    
##                               -0.56497     0.39352   -1.436 0.151092    
##                                0.46907     0.09932    4.723 2.33e-06 ***
##                                0.07390     0.59595    0.124 0.901314    
##                                0.22277     0.61661    0.361 0.717888    
##                               -0.70344     0.27664   -2.543 0.010997 *  
##                                0.37827     0.25890    1.461 0.144001    
##                                0.40403     0.57496    0.703 0.482237    
##                               -0.14659     0.63495   -0.231 0.817418    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  11.22129 -11.05142 -8.289051 -17.33043 
## AR coefficient matrix 
## AR( 1 )-matrix 
##       [,1]   [,2]   [,3]    [,4]
## [1,] 0.643  0.157  0.156 -0.7266
## [2,] 0.359 -0.233  0.762 -0.9514
## [3,] 0.280 -0.118  0.381 -0.0192
## [4,] 0.575 -0.262 -0.198  0.4765
## MA coefficient matrix 
## MA( 1 )-matrix 
##       [,1]    [,2]    [,3]   [,4]
## [1,] 0.443  0.0459 -0.0364 -0.903
## [2,] 0.227  0.1000  0.8323 -1.010
## [3,] 0.565 -0.4691 -0.0739 -0.223
## [4,] 0.703 -0.3783 -0.4040  0.147
##   
## Residuals cov-matrix: 
##           [,1]      [,2]       [,3]       [,4]
## [1,] 93.174510  32.83876   8.739705  -3.061015
## [2,] 32.838757  61.44974 -35.671829 -31.396515
## [3,]  8.739705 -35.67183 166.867339  65.326759
## [4,] -3.061015 -31.39651  65.326759 100.876023
## ---- 
## aic=  18.62372 
## bic=  19.78009 
## Number of parameters:  36 
## initial estimates:  44.1705 2.3258 3.1024 -8.6836 -0.1867 0.1015 -0.1307 0.1657 -0.0013 -0.2414 -0.3818 0.2439 -0.0691 -0.1423 0.5789 -0.2119 0.218 0.1255 0.1813 0.3342 0.2418 -0.129 0.2755 -0.4481 0.0869 -0.287 0.5901 -0.4777 -0.3885 0.8223 0.097 -0.6013 -0.4431 0.5035 -0.0602 -0.5431 
## Par. lower-bounds:  33.3041 -14.4492 -34.8279 -30.7309 -0.4782 -0.0767 -0.2342 0.0018 -0.4513 -0.5164 -0.5415 -0.0091 -1.0867 -0.7641 0.2178 -0.7841 -0.3735 -0.2359 -0.0286 0.0017 -0.4498 -0.4625 0.0098 -0.9372 -0.9808 -0.8018 0.1799 -1.2328 -2.8027 -0.3418 -0.8305 -2.3086 -1.8464 -0.1732 -0.5993 -1.5355 
## Par. upper-bounds:  55.0368 19.1007 41.0326 13.3636 0.1049 0.2796 -0.0273 0.3296 0.4487 0.0336 -0.2221 0.4969 0.9485 0.4794 0.94 0.3602 0.8095 0.4869 0.3911 0.6668 0.9334 0.2045 0.5412 0.041 1.1546 0.2278 1.0003 0.2774 2.0258 1.9865 1.0245 1.1061 0.9602 1.1802 0.479 0.4493 
## Final   Estimates:  44.15915 2.334079 3.084524 -8.719916 -0.1976221 0.257534 -0.03594087 0.3296169 -0.05678356 -0.0418374 -0.4301977 0.3770457 -0.0785452 0.2032212 0.3618822 -0.2440299 0.2409594 0.1712432 0.04579636 0.214379 0.1092117 -0.1820441 0.00980469 -0.419667 -0.006233075 0.1133438 0.3519064 -0.6150337 -0.1148538 -0.03245704 0.2680902 0.09077977 -0.2459296 0.0934197 0.07232377 0.2472528
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          44.159149   10.323478    4.278 1.89e-05 ***
## loneliness_state_pmc          2.334079         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  3.084524   11.186948    0.276   0.7828    
## responsiveness_state_pmc     -8.719916   12.311076   -0.708   0.4788    
## depressedmood_state          -0.197622    0.291730   -0.677   0.4981    
## loneliness_state_pmc          0.257534    1.499420    0.172   0.8636    
## socintsatisfaction_state_pmc -0.035941    0.484537   -0.074   0.9409    
## responsiveness_state_pmc      0.329617    0.204943    1.608   0.1078    
## depressedmood_state          -0.056784         NaN      NaN      NaN    
## loneliness_state_pmc         -0.041837    0.971391   -0.043   0.9656    
## socintsatisfaction_state_pmc -0.430198    0.234441   -1.835   0.0665 .  
## responsiveness_state_pmc      0.377046    0.228904    1.647   0.0995 .  
## depressedmood_state          -0.078545    0.295781   -0.266   0.7906    
## loneliness_state_pmc          0.203221    0.574212    0.354   0.7234    
## socintsatisfaction_state_pmc  0.361882    0.639837    0.566   0.5717    
## responsiveness_state_pmc     -0.244030    1.701193   -0.143   0.8859    
## depressedmood_state           0.240959    0.331101    0.728   0.4668    
## loneliness_state_pmc          0.171243    0.976715    0.175   0.8608    
## socintsatisfaction_state_pmc  0.045796    0.543080    0.084   0.9328    
## responsiveness_state_pmc      0.214379    1.219443    0.176   0.8605    
##                               0.109212    0.475807    0.230   0.8185    
##                              -0.182044    1.546204   -0.118   0.9063    
##                               0.009805    0.475780    0.021   0.9836    
##                              -0.419667    0.209917   -1.999   0.0456 *  
##                              -0.006233    0.414925   -0.015   0.9880    
##                               0.113344    0.775906    0.146   0.8839    
##                               0.351906    0.185298    1.899   0.0575 .  
##                              -0.615034    0.414486   -1.484   0.1378    
##                              -0.114854    0.753175   -0.152   0.8788    
##                              -0.032457    0.405008   -0.080   0.9361    
##                               0.268090    0.954364    0.281   0.7788    
##                               0.090780    2.177557    0.042   0.9667    
##                              -0.245930    0.486488   -0.506   0.6132    
##                               0.093420    0.915656    0.102   0.9187    
##                               0.072324    0.827402    0.087   0.9303    
##                               0.247253    1.665480    0.148   0.8820    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  44.15915 2.334079 3.084524 -8.719916 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]    [,3]   [,4]
## [1,] -0.1976  0.2575 -0.0359  0.330
## [2,] -0.0568 -0.0418 -0.4302  0.377
## [3,] -0.0785  0.2032  0.3619 -0.244
## [4,]  0.2410  0.1712  0.0458  0.214
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]    [,2]    [,3]    [,4]
## [1,] -0.10921  0.1820 -0.0098  0.4197
## [2,]  0.00623 -0.1133 -0.3519  0.6150
## [3,]  0.11485  0.0325 -0.2681 -0.0908
## [4,]  0.24593 -0.0934 -0.0723 -0.2473
##   
## Residuals cov-matrix: 
##            [,1]       [,2]       [,3]        [,4]
## [1,] 24.3268044   6.008198  -3.968362   0.3330115
## [2,]  6.0081984  95.300739 -18.354570 -14.4743250
## [3,] -3.9683618 -18.354570 261.575154 109.5206599
## [4,]  0.3330115 -14.474325 109.520660 104.4202835
## ---- 
## aic=  18.37086 
## bic=  19.52723 
## Number of parameters:  36 
## initial estimates:  41.1742 3.9614 -16.0604 -11.5478 0.1238 0.1598 0.0289 -0.1295 -0.1057 0.1925 -0.0278 -0.2137 0.3392 -0.0521 0.3931 0.3859 0.2512 -0.0215 0.0834 0.4367 -0.2047 0.0026 -0.2858 0.3345 0.0365 0.0885 -0.0177 0.4214 -0.7035 0.2204 -0.4476 -0.098 -0.335 0.5613 0.192 -0.1033 
## Par. lower-bounds:  24.6534 -11.1849 -33.9251 -27.6399 -0.2132 -0.2704 -0.2814 -0.4907 -0.4147 -0.2019 -0.3122 -0.5448 -0.0252 -0.5173 0.0577 -0.0047 -0.077 -0.4406 -0.2188 0.0849 -0.9129 -0.8334 -1 -0.4467 -0.6128 -0.678 -0.6725 -0.2949 -1.4693 -0.6836 -1.2199 -0.9428 -1.0248 -0.2529 -0.5037 -0.8642 
## Par. upper-bounds:  57.6949 19.1078 1.8044 4.5443 0.4608 0.5901 0.3391 0.2317 0.2033 0.5869 0.2566 0.1175 0.7036 0.4131 0.7286 0.7765 0.5795 0.3975 0.3856 0.7886 0.5036 0.8386 0.4284 1.1157 0.6858 0.8549 0.6371 1.1376 0.0624 1.1243 0.3247 0.7467 0.3549 1.3756 0.8876 0.6577 
## Final   Estimates:  41.08627 3.931692 -16.2008 -11.48865 0.07124573 0.05629014 -0.1580621 -0.1128914 -0.1062043 0.07404787 -0.3122276 0.06261929 0.3782556 0.4131407 0.0576782 0.6550099 0.2430232 -0.4405824 -0.2187616 0.08489629 0.1139954 0.005422992 0.02400791 0.1282079 0.0007155256 0.2078617 0.2216302 -0.232347 -0.1783825 -0.6836151 0.3025629 -0.5235098 -0.009165406 0.4691869 0.3682244 0.3938286
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)
## depressedmood_state           4.109e+01         NaN      NaN      NaN
## loneliness_state_pmc          3.932e+00   9.143e+00    0.430    0.667
## socintsatisfaction_state_pmc -1.620e+01         NaN      NaN      NaN
## responsiveness_state_pmc     -1.149e+01   9.605e+00   -1.196    0.232
## depressedmood_state           7.125e-02         NaN      NaN      NaN
## loneliness_state_pmc          5.629e-02         NaN      NaN      NaN
## socintsatisfaction_state_pmc -1.581e-01         NaN      NaN      NaN
## responsiveness_state_pmc     -1.129e-01         NaN      NaN      NaN
## depressedmood_state          -1.062e-01   2.021e-01   -0.526    0.599
## loneliness_state_pmc          7.405e-02         NaN      NaN      NaN
## socintsatisfaction_state_pmc -3.122e-01         NaN      NaN      NaN
## responsiveness_state_pmc      6.262e-02         NaN      NaN      NaN
## depressedmood_state           3.783e-01         NaN      NaN      NaN
## loneliness_state_pmc          4.131e-01         NaN      NaN      NaN
## socintsatisfaction_state_pmc  5.768e-02         NaN      NaN      NaN
## responsiveness_state_pmc      6.550e-01         NaN      NaN      NaN
## depressedmood_state           2.430e-01   2.092e-01    1.162    0.245
## loneliness_state_pmc         -4.406e-01         NaN      NaN      NaN
## socintsatisfaction_state_pmc -2.188e-01         NaN      NaN      NaN
## responsiveness_state_pmc      8.490e-02         NaN      NaN      NaN
##                               1.140e-01         NaN      NaN      NaN
##                               5.423e-03         NaN      NaN      NaN
##                               2.401e-02         NaN      NaN      NaN
##                               1.282e-01         NaN      NaN      NaN
##                               7.155e-04   2.403e-01    0.003    0.998
##                               2.079e-01         NaN      NaN      NaN
##                               2.216e-01         NaN      NaN      NaN
##                              -2.323e-01         NaN      NaN      NaN
##                              -1.784e-01         NaN      NaN      NaN
##                              -6.836e-01         NaN      NaN      NaN
##                               3.026e-01         NaN      NaN      NaN
##                              -5.235e-01         NaN      NaN      NaN
##                              -9.165e-03   1.689e-01   -0.054    0.957
##                               4.692e-01         NaN      NaN      NaN
##                               3.682e-01         NaN      NaN      NaN
##                               3.938e-01         NaN      NaN      NaN
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  41.08627 3.931692 -16.2008 -11.48865 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]    [,3]    [,4]
## [1,]  0.0712  0.0563 -0.1581 -0.1129
## [2,] -0.1062  0.0740 -0.3122  0.0626
## [3,]  0.3783  0.4131  0.0577  0.6550
## [4,]  0.2430 -0.4406 -0.2188  0.0849
## MA coefficient matrix 
## MA( 1 )-matrix 
##           [,1]     [,2]   [,3]   [,4]
## [1,] -0.113995 -0.00542 -0.024 -0.128
## [2,] -0.000716 -0.20786 -0.222  0.232
## [3,]  0.178382  0.68362 -0.303  0.524
## [4,]  0.009165 -0.46919 -0.368 -0.394
##   
## Residuals cov-matrix: 
##           [,1]       [,2]       [,3]      [,4]
## [1,] 359.87635  172.03872  -82.25036 -78.32956
## [2,] 172.03872  279.09642 -150.36461 -95.67339
## [3,] -82.25036 -150.36461  502.69165 256.44717
## [4,] -78.32956  -95.67339  256.44717 305.38458
## ---- 
## aic=  23.37975 
## bic=  24.53612 
## Number of parameters:  36 
## initial estimates:  16.1998 -17.9371 11.9095 13.0215 0.6171 0.2986 -0.2984 0.3837 0.4358 0.2343 -0.2054 0.1465 -0.3352 0.1534 0.3658 0.0366 -0.3617 0.239 0.0334 0.2276 -0.4106 0.2293 -0.1348 -0.3373 -0.2547 -0.2075 -0.2663 0.022 0.4393 -1.0053 -0.0126 -0.1806 0.2499 -0.6399 0.3547 -0.3313 
## Par. lower-bounds:  0.0499 -32.9899 -3.2554 1.6584 0.2369 -0.1733 -0.6632 -0.061 0.0814 -0.2055 -0.5454 -0.268 -0.6922 -0.2897 0.0232 -0.381 -0.6293 -0.0929 -0.2233 -0.0853 -1.3256 -0.8114 -1.011 -1.6344 -1.1075 -1.1775 -1.083 -1.1871 -0.4199 -1.9825 -0.8354 -1.3986 -0.3939 -1.3721 -0.2618 -1.2439 
## Par. upper-bounds:  32.3497 -2.8844 27.0744 24.3846 0.9973 0.7704 0.0665 0.8284 0.7902 0.6741 0.1347 0.561 0.0219 0.5964 0.7084 0.4541 -0.0942 0.571 0.2901 0.5405 0.5044 1.2699 0.7414 0.9599 0.5982 0.7624 0.5503 1.231 1.2985 -0.0281 0.8101 1.0375 0.8937 0.0923 0.9712 0.5814 
## Final   Estimates:  16.18253 -17.96782 11.90178 13.00167 0.5916805 0.3270391 -0.4508522 0.5053172 0.4717756 0.3795028 0.1320678 0.149435 -0.3591925 0.155083 0.2176879 0.08565714 -0.3413392 0.5519958 0.2536527 0.5370975 -0.2434733 -0.1351125 0.1834426 -0.2908708 -0.3978315 -0.2674746 -0.4514751 -0.3176161 0.4771354 -0.6201909 0.001225876 0.07218401 0.1437806 -0.7647364 -0.1569506 -0.7652546
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error    t value Pr(>|t|)    
## depressedmood_state           1.618e+01         NaN        NaN      NaN    
## loneliness_state_pmc         -1.797e+01   2.034e-04 -88331.729  < 2e-16 ***
## socintsatisfaction_state_pmc  1.190e+01   2.909e-03   4090.704  < 2e-16 ***
## responsiveness_state_pmc      1.300e+01   4.524e-04  28737.028  < 2e-16 ***
## depressedmood_state           5.917e-01         NaN        NaN      NaN    
## loneliness_state_pmc          3.270e-01         NaN        NaN      NaN    
## socintsatisfaction_state_pmc -4.509e-01         NaN        NaN      NaN    
## responsiveness_state_pmc      5.053e-01         NaN        NaN      NaN    
## depressedmood_state           4.718e-01   1.529e-05  30859.307  < 2e-16 ***
## loneliness_state_pmc          3.795e-01   3.269e-04   1161.071  < 2e-16 ***
## socintsatisfaction_state_pmc  1.321e-01   1.540e-02      8.575  < 2e-16 ***
## responsiveness_state_pmc      1.494e-01         NaN        NaN      NaN    
## depressedmood_state          -3.592e-01   2.156e-04  -1665.803  < 2e-16 ***
## loneliness_state_pmc          1.551e-01   3.875e-03     40.023  < 2e-16 ***
## socintsatisfaction_state_pmc  2.177e-01         NaN        NaN      NaN    
## responsiveness_state_pmc      8.566e-02         NaN        NaN      NaN    
## depressedmood_state          -3.413e-01   5.925e-05  -5761.034  < 2e-16 ***
## loneliness_state_pmc          5.520e-01   2.009e-04   2748.351  < 2e-16 ***
## socintsatisfaction_state_pmc  2.537e-01         NaN        NaN      NaN    
## responsiveness_state_pmc      5.371e-01         NaN        NaN      NaN    
##                              -2.435e-01         NaN        NaN      NaN    
##                              -1.351e-01         NaN        NaN      NaN    
##                               1.834e-01         NaN        NaN      NaN    
##                              -2.909e-01         NaN        NaN      NaN    
##                              -3.978e-01   1.691e-02    -23.520  < 2e-16 ***
##                              -2.675e-01         NaN        NaN      NaN    
##                              -4.515e-01         NaN        NaN      NaN    
##                              -3.176e-01         NaN        NaN      NaN    
##                               4.771e-01   7.347e-02      6.494 8.36e-11 ***
##                              -6.202e-01         NaN        NaN      NaN    
##                               1.226e-03         NaN        NaN      NaN    
##                               7.218e-02   1.441e-01      0.501    0.616    
##                               1.438e-01         NaN        NaN      NaN    
##                              -7.647e-01         NaN        NaN      NaN    
##                              -1.570e-01   2.389e-02     -6.571 5.00e-11 ***
##                              -7.653e-01         NaN        NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  16.18253 -17.96782 11.90178 13.00167 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]  [,2]   [,3]   [,4]
## [1,]  0.592 0.327 -0.451 0.5053
## [2,]  0.472 0.380  0.132 0.1494
## [3,] -0.359 0.155  0.218 0.0857
## [4,] -0.341 0.552  0.254 0.5371
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]  [,2]     [,3]    [,4]
## [1,]  0.243 0.135 -0.18344  0.2909
## [2,]  0.398 0.267  0.45148  0.3176
## [3,] -0.477 0.620 -0.00123 -0.0722
## [4,] -0.144 0.765  0.15695  0.7653
##   
## Residuals cov-matrix: 
##            [,1]      [,2]       [,3]      [,4]
## [1,]  193.54756 147.47030 -105.57192 -72.60106
## [2,]  147.47030 186.16401  -96.27659 -68.73725
## [3,] -105.57192 -96.27659  207.73945  82.35035
## [4,]  -72.60106 -68.73725   82.35035  82.35626
## ---- 
## aic=  19.31836 
## bic=  20.47473 
## Number of parameters:  36 
## initial estimates:  9.3446 -1.6378 2.9666 -0.8339 0.2016 0.1947 0.1367 0.1011 0.3354 0.0457 0.2732 -0.149 -0.3142 -0.0342 0.024 0.0914 -0.0363 -0.3842 -0.3996 0.2241 0.1338 -0.3141 -0.4027 0.0242 -0.3027 -0.1817 -0.2846 0.0984 -0.0585 0.1878 -0.0874 -0.4362 0.0969 0.2435 0.6548 -0.8472 
## Par. lower-bounds:  5.1491 -8.2428 -3.7727 -5.676 -0.1245 -0.0519 -0.077 -0.1409 -0.1781 -0.3425 -0.0631 -0.53 -0.8381 -0.4303 -0.3192 -0.2973 -0.4127 -0.6688 -0.6461 -0.0552 -0.5067 -0.6843 -0.8219 -0.5766 -1.3111 -0.7645 -0.9445 -0.8474 -1.0874 -0.4068 -0.7607 -1.4012 -0.6424 -0.1837 0.171 -1.5406 
## Par. upper-bounds:  13.5401 4.9672 9.7058 4.0082 0.5277 0.4413 0.3503 0.3431 0.8488 0.4339 0.6095 0.232 0.2097 0.3619 0.3671 0.4801 0.3401 -0.0996 -0.153 0.5034 0.7744 0.0561 0.0165 0.6249 0.7057 0.4011 0.3753 1.0442 0.9704 0.7825 0.586 0.5288 0.8362 0.6708 1.1385 -0.1539 
## Final   Estimates:  9.360159 -1.786582 2.912342 -0.8151368 0.1753157 -0.000361318 0.3498049 -0.06899023 0.1472038 0.4339262 0.426154 -0.3231333 -0.2241134 -0.399561 0.3663645 0.4801325 0.08727711 -0.6688074 -0.3436605 0.4549371 0.004937252 0.052934 -0.4415056 0.1077149 -0.1770451 -0.4751542 -0.3409928 -0.02414669 0.02796332 0.5156497 -0.3254505 -0.6671775 0.1700156 0.4416323 0.1709655 -0.4448639
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           9.3601589   3.8650612    2.422  0.01545 *  
## loneliness_state_pmc         -1.7865825         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  2.9123419   1.8694731    1.558  0.11927    
## responsiveness_state_pmc     -0.8151368         NaN      NaN      NaN    
## depressedmood_state           0.1753157   0.3235250    0.542  0.58789    
## loneliness_state_pmc         -0.0003613   0.2456271   -0.001  0.99883    
## socintsatisfaction_state_pmc  0.3498049   0.2881888    1.214  0.22482    
## responsiveness_state_pmc     -0.0689902   0.2221838   -0.311  0.75617    
## depressedmood_state           0.1472038         NaN      NaN      NaN    
## loneliness_state_pmc          0.4339262   0.2089162    2.077  0.03780 *  
## socintsatisfaction_state_pmc  0.4261540   0.0497242    8.570  < 2e-16 ***
## responsiveness_state_pmc     -0.3231333   0.2533553   -1.275  0.20216    
## depressedmood_state          -0.2241134   0.1818290   -1.233  0.21774    
## loneliness_state_pmc         -0.3995610         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.3663645   0.2398927    1.527  0.12671    
## responsiveness_state_pmc      0.4801325         NaN      NaN      NaN    
## depressedmood_state           0.0872771         NaN      NaN      NaN    
## loneliness_state_pmc         -0.6688074   0.0958879   -6.975 3.06e-12 ***
## socintsatisfaction_state_pmc -0.3436605   0.2296104   -1.497  0.13447    
## responsiveness_state_pmc      0.4549371         NaN      NaN      NaN    
##                               0.0049373   0.3130869    0.016  0.98742    
##                               0.0529340   0.1865781    0.284  0.77663    
##                              -0.4415056   0.3000705   -1.471  0.14120    
##                               0.1077149   0.1764025    0.611  0.54145    
##                              -0.1770451         NaN      NaN      NaN    
##                              -0.4751542   0.1098487   -4.326 1.52e-05 ***
##                              -0.3409928   0.1279299   -2.665  0.00769 ** 
##                              -0.0241467   0.1928609   -0.125  0.90036    
##                               0.0279633   0.3486714    0.080  0.93608    
##                               0.5156497         NaN      NaN      NaN    
##                              -0.3254505   0.1529561   -2.128  0.03336 *  
##                              -0.6671775         NaN      NaN      NaN    
##                               0.1700156         NaN      NaN      NaN    
##                               0.4416323   0.2158588    2.046  0.04076 *  
##                               0.1709655   0.1873809    0.912  0.36156    
##                              -0.4448639         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  9.360159 -1.786582 2.912342 -0.8151368 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]      [,2]   [,3]   [,4]
## [1,]  0.1753 -0.000361  0.350 -0.069
## [2,]  0.1472  0.433926  0.426 -0.323
## [3,] -0.2241 -0.399561  0.366  0.480
## [4,]  0.0873 -0.668807 -0.344  0.455
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]    [,2]   [,3]    [,4]
## [1,] -0.00494 -0.0529  0.442 -0.1077
## [2,]  0.17705  0.4752  0.341  0.0241
## [3,] -0.02796 -0.5156  0.325  0.6672
## [4,] -0.17002 -0.4416 -0.171  0.4449
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  73.56414  44.99688 -35.02930 -13.26899
## [2,]  44.99688 168.62623 -60.62666 -26.27603
## [3,] -35.02930 -60.62666 143.46789  47.02938
## [4,] -13.26899 -26.27603  47.02938  99.42294
## ---- 
## aic=  19.45636 
## bic=  20.61273 
## Number of parameters:  36 
## initial estimates:  20.5516 6.9017 3.4287 0.1762 0.1877 0.1372 0.097 -0.246 -0.3323 0.3024 -0.005 -0.3452 -0.1567 0.1477 0.3017 0.5742 -0.0234 0.0979 0.0052 0.6291 -1.0013 -0.0448 -0.8163 0.4438 -0.2597 -0.6437 -0.6084 0.5583 1.4343 -0.5479 0.3609 -0.3711 0.6246 -0.1057 0.116 -0.1167 
## Par. lower-bounds:  9.2502 -3.9078 -13.9859 -9.7008 -0.2288 -0.2845 -0.1737 -0.6764 -0.7306 -0.1009 -0.2639 -0.7569 -0.7984 -0.502 -0.1154 -0.0891 -0.3873 -0.2706 -0.2314 0.253 -1.9922 -1.3448 -1.4856 -1.1293 -1.2075 -1.8871 -1.2486 -0.9464 -0.0926 -2.5511 -0.6705 -2.7953 -0.2414 -1.2419 -0.469 -1.4916 
## Par. upper-bounds:  31.8531 17.7113 20.8433 10.0532 0.6041 0.5588 0.3677 0.1844 0.0661 0.7057 0.2539 0.0665 0.485 0.7975 0.7188 1.2374 0.3406 0.4664 0.2417 1.0053 -0.0104 1.2552 -0.1469 2.017 0.688 0.5998 0.0318 2.063 2.9612 1.4553 1.3923 2.053 1.4906 1.0304 0.701 1.2582 
## Final   Estimates:  20.53322 6.859372 3.502377 0.1937772 0.2580192 0.06040774 0.1807738 -0.1608187 -0.258277 0.7028173 0.2537999 -0.6850124 -0.1709145 0.3299588 0.2421806 0.9123267 -0.02102602 0.2680847 0.09446666 0.800073 -0.01198775 -0.02734268 -0.3352335 0.1747979 0.5605847 -1.093091 -0.3776457 0.5812951 -0.01755014 -0.3920546 0.111665 -0.868908 -0.1535363 -0.2208286 -0.1671576 -0.4643389
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           20.53322         NaN      NaN      NaN    
## loneliness_state_pmc           6.85937         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   3.50238     4.16219    0.841  0.40008    
## responsiveness_state_pmc       0.19378         NaN      NaN      NaN    
## depressedmood_state            0.25802         NaN      NaN      NaN    
## loneliness_state_pmc           0.06041     0.48004    0.126  0.89986    
## socintsatisfaction_state_pmc   0.18077         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.16082         NaN      NaN      NaN    
## depressedmood_state           -0.25828         NaN      NaN      NaN    
## loneliness_state_pmc           0.70282     0.23228    3.026  0.00248 ** 
## socintsatisfaction_state_pmc   0.25380     0.17340    1.464  0.14328    
## responsiveness_state_pmc      -0.68501     0.30815   -2.223  0.02622 *  
## depressedmood_state           -0.17091     0.12446   -1.373  0.16969    
## loneliness_state_pmc           0.32996         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.24218         NaN      NaN      NaN    
## responsiveness_state_pmc       0.91233         NaN      NaN      NaN    
## depressedmood_state           -0.02103         NaN      NaN      NaN    
## loneliness_state_pmc           0.26808     0.16407    1.634  0.10227    
## socintsatisfaction_state_pmc   0.09447         NaN      NaN      NaN    
## responsiveness_state_pmc       0.80007         NaN      NaN      NaN    
##                               -0.01199         NaN      NaN      NaN    
##                               -0.02734     0.52420   -0.052  0.95840    
##                               -0.33523     0.25159   -1.332  0.18271    
##                                0.17480         NaN      NaN      NaN    
##                                0.56058         NaN      NaN      NaN    
##                               -1.09309     0.20137   -5.428 5.69e-08 ***
##                               -0.37765         NaN      NaN      NaN    
##                                0.58130     0.39714    1.464  0.14328    
##                               -0.01755     0.41094   -0.043  0.96593    
##                               -0.39205         NaN      NaN      NaN    
##                                0.11167         NaN      NaN      NaN    
##                               -0.86891         NaN      NaN      NaN    
##                               -0.15354     0.14012   -1.096  0.27321    
##                               -0.22083     0.21074   -1.048  0.29471    
##                               -0.16716         NaN      NaN      NaN    
##                               -0.46434         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  20.53322 6.859372 3.502377 0.1937772 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]   [,3]   [,4]
## [1,]  0.258 0.0604 0.1808 -0.161
## [2,] -0.258 0.7028 0.2538 -0.685
## [3,] -0.171 0.3300 0.2422  0.912
## [4,] -0.021 0.2681 0.0945  0.800
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,]  0.0120 0.0273  0.335 -0.175
## [2,] -0.5606 1.0931  0.378 -0.581
## [3,]  0.0176 0.3921 -0.112  0.869
## [4,]  0.1535 0.2208  0.167  0.464
##   
## Residuals cov-matrix: 
##            [,1]       [,2]      [,3]      [,4]
## [1,]  224.55161  133.88271 -163.0120 -84.71072
## [2,]  133.88271  150.71357 -161.6772 -96.43205
## [3,] -163.01197 -161.67724  392.0107 163.36024
## [4,]  -84.71072  -96.43205  163.3602 137.22799
## ---- 
## aic=  20.14739 
## bic=  21.30375 
## Number of parameters:  36 
## initial estimates:  23.5498 2.3318 -8.0865 -2.543 -0.1122 0.3216 0.2348 -0.4278 -0.1536 0.5554 -0.0062 -0.1773 0.4083 0.0357 0.2711 0.7255 0.094 -0.2576 -0.0788 0.4989 0.1014 -0.3955 -0.1353 0.4118 0.3173 -0.8435 -0.0758 -0.0656 -0.1131 -0.4084 0.0406 -0.5983 0.5671 -0.5865 0.0791 -0.4447 
## Par. lower-bounds:  14.3491 -8.2937 -20.6004 -13.9607 -0.5231 -0.0661 -0.1107 -0.7757 -0.6281 0.1077 -0.4051 -0.5791 -0.1505 -0.4916 -0.1987 0.2523 -0.4159 -0.7387 -0.5075 0.0672 -1.0432 -1.745 -1.1034 -0.3515 -1.0045 -2.402 -1.1939 -0.9472 -1.6698 -2.2439 -1.2762 -1.6366 -0.8532 -2.2612 -1.1224 -1.392 
## Par. upper-bounds:  32.7505 12.9573 4.4275 8.8746 0.2987 0.7093 0.5802 -0.0799 0.321 1.0032 0.3927 0.2244 0.9672 0.563 0.7409 1.1986 0.6039 0.2236 0.3499 0.9306 1.2459 0.9541 0.8329 1.1752 1.6391 0.715 1.0422 0.816 1.4437 1.4272 1.3574 0.44 1.9874 1.0882 1.2805 0.5026 
## Final   Estimates:  23.20103 2.682679 -8.437237 -2.377956 -0.2245285 -0.06433323 0.1625496 -0.6340772 -0.2498152 0.1831478 -0.4051455 -0.03343829 0.5477319 0.3429273 -0.03363233 1.198637 0.1376836 -0.5667838 0.3196286 0.07374275 0.1503052 0.3359675 0.1331573 0.1584343 0.07647797 0.3920158 0.9867309 -0.5877856 -0.3101584 -0.5874648 0.3784629 -0.8871455 0.04369362 0.2311805 -0.4998594 0.4555629
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           23.20103         NaN      NaN      NaN    
## loneliness_state_pmc           2.68268     9.19230    0.292  0.77041    
## socintsatisfaction_state_pmc  -8.43724    14.60330   -0.578  0.56342    
## responsiveness_state_pmc      -2.37796    16.00844   -0.149  0.88191    
## depressedmood_state           -0.22453         NaN      NaN      NaN    
## loneliness_state_pmc          -0.06433     0.32069   -0.201  0.84100    
## socintsatisfaction_state_pmc   0.16255     0.06992    2.325  0.02008 *  
## responsiveness_state_pmc      -0.63408     0.44892   -1.412  0.15782    
## depressedmood_state           -0.24982     0.44802   -0.558  0.57712    
## loneliness_state_pmc           0.18315     0.14841    1.234  0.21719    
## socintsatisfaction_state_pmc  -0.40515     0.14451   -2.804  0.00505 ** 
## responsiveness_state_pmc      -0.03344         NaN      NaN      NaN    
## depressedmood_state            0.54773     0.70616    0.776  0.43796    
## loneliness_state_pmc           0.34293     0.16414    2.089  0.03668 *  
## socintsatisfaction_state_pmc  -0.03363         NaN      NaN      NaN    
## responsiveness_state_pmc       1.19864         NaN      NaN      NaN    
## depressedmood_state            0.13768     0.81358    0.169  0.86561    
## loneliness_state_pmc          -0.56678     0.17367   -3.264  0.00110 ** 
## socintsatisfaction_state_pmc   0.31963     0.18269    1.750  0.08020 .  
## responsiveness_state_pmc       0.07374         NaN      NaN      NaN    
##                                0.15031         NaN      NaN      NaN    
##                                0.33597     0.24202    1.388  0.16507    
##                                0.13316     0.10637    1.252  0.21063    
##                                0.15843     0.50054    0.317  0.75160    
##                                0.07648     0.50035    0.153  0.87852    
##                                0.39202         NaN      NaN      NaN    
##                                0.98673     0.06121   16.121  < 2e-16 ***
##                               -0.58779         NaN      NaN      NaN    
##                               -0.31016     0.71888   -0.431  0.66615    
##                               -0.58746         NaN      NaN      NaN    
##                                0.37846         NaN      NaN      NaN    
##                               -0.88715         NaN      NaN      NaN    
##                                0.04369     0.82670    0.053  0.95785    
##                                0.23118         NaN      NaN      NaN    
##                               -0.49986         NaN      NaN      NaN    
##                                0.45556         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  23.20103 2.682679 -8.437237 -2.377956 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]    [,3]    [,4]
## [1,] -0.225 -0.0643  0.1625 -0.6341
## [2,] -0.250  0.1831 -0.4051 -0.0334
## [3,]  0.548  0.3429 -0.0336  1.1986
## [4,]  0.138 -0.5668  0.3196  0.0737
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,] -0.1503 -0.336 -0.133 -0.158
## [2,] -0.0765 -0.392 -0.987  0.588
## [3,]  0.3102  0.587 -0.378  0.887
## [4,] -0.0437 -0.231  0.500 -0.456
##   
## Residuals cov-matrix: 
##            [,1]       [,2]      [,3]      [,4]
## [1,]  113.67357   93.43544 -112.8195 -85.36536
## [2,]   93.43544  175.79014 -144.1935 -85.17848
## [3,] -112.81949 -144.19350  219.7163 153.11365
## [4,]  -85.36536  -85.17848  153.1136 169.57084
## ---- 
## aic=  18.80942 
## bic=  19.96579 
## Number of parameters:  36 
## initial estimates:  19.9617 -7.875 35.3755 21.3828 0.4635 0.5558 0.0309 0.1759 0.2094 0.4554 0.0385 -0.0024 -0.9588 0.4122 -0.1776 0.3246 -0.5481 0.0118 0.0535 0.1809 -0.1619 -0.8021 -0.184 -0.2862 0.2595 -1.1633 5e-04 -0.3624 1.3939 0.2297 0.4283 -0.1551 0.9972 -0.0699 -0.0581 0.3199 
## Par. lower-bounds:  5.3173 -21.9819 14.1522 6.2847 0.0853 0.1439 -0.2291 -0.1911 -0.1549 0.0586 -0.212 -0.3559 -1.5069 -0.1847 -0.5544 -0.2072 -0.9379 -0.4129 -0.2146 -0.1975 -0.9795 -1.5273 -0.7192 -1.1173 -0.5281 -1.862 -0.515 -1.163 0.209 -0.8213 -0.3474 -1.3596 0.1543 -0.8176 -0.6099 -0.5369 
## Par. upper-bounds:  34.6062 6.2318 56.5988 36.481 0.8416 0.9678 0.2909 0.5429 0.5737 0.8522 0.289 0.3511 -0.4108 1.0092 0.1993 0.8565 -0.1582 0.4365 0.3216 0.5593 0.6557 -0.0768 0.3512 0.5449 1.047 -0.4647 0.5161 0.4382 2.5788 1.2808 1.2039 1.0494 1.8401 0.6778 0.4937 1.1768 
## Final   Estimates:  19.96746 -7.878571 35.37829 21.38453 0.4589805 0.6252952 -0.007757369 0.1909867 0.2185035 0.7996958 0.02771307 0.1619889 -1.045617 0.3780863 -0.2390605 0.4154638 -0.6064027 0.05031422 0.09561894 0.1601952 -0.296021 -0.6815398 -0.01766716 -0.2286723 0.06819495 -1.186253 -0.01891838 -0.1794644 1.180581 0.1858431 0.3715875 -0.07867777 0.8566027 -0.09083217 -0.04105444 0.2508542
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)
## depressedmood_state          19.967458         NaN      NaN      NaN
## loneliness_state_pmc         -7.878571         NaN      NaN      NaN
## socintsatisfaction_state_pmc 35.378293         NaN      NaN      NaN
## responsiveness_state_pmc     21.384532         NaN      NaN      NaN
## depressedmood_state           0.458980         NaN      NaN      NaN
## loneliness_state_pmc          0.625295         NaN      NaN      NaN
## socintsatisfaction_state_pmc -0.007757         NaN      NaN      NaN
## responsiveness_state_pmc      0.190987         NaN      NaN      NaN
## depressedmood_state           0.218503         NaN      NaN      NaN
## loneliness_state_pmc          0.799696         NaN      NaN      NaN
## socintsatisfaction_state_pmc  0.027713    0.021819     1.27    0.204
## responsiveness_state_pmc      0.161989         NaN      NaN      NaN
## depressedmood_state          -1.045617         NaN      NaN      NaN
## loneliness_state_pmc          0.378086         NaN      NaN      NaN
## socintsatisfaction_state_pmc -0.239060         NaN      NaN      NaN
## responsiveness_state_pmc      0.415464         NaN      NaN      NaN
## depressedmood_state          -0.606403         NaN      NaN      NaN
## loneliness_state_pmc          0.050314         NaN      NaN      NaN
## socintsatisfaction_state_pmc  0.095619         NaN      NaN      NaN
## responsiveness_state_pmc      0.160195         NaN      NaN      NaN
##                              -0.296021         NaN      NaN      NaN
##                              -0.681540         NaN      NaN      NaN
##                              -0.017667         NaN      NaN      NaN
##                              -0.228672         NaN      NaN      NaN
##                               0.068195         NaN      NaN      NaN
##                              -1.186253         NaN      NaN      NaN
##                              -0.018918         NaN      NaN      NaN
##                              -0.179464         NaN      NaN      NaN
##                               1.180581         NaN      NaN      NaN
##                               0.185843         NaN      NaN      NaN
##                               0.371588         NaN      NaN      NaN
##                              -0.078678         NaN      NaN      NaN
##                               0.856603         NaN      NaN      NaN
##                              -0.090832         NaN      NaN      NaN
##                              -0.041054         NaN      NaN      NaN
##                               0.250854         NaN      NaN      NaN
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  19.96746 -7.878571 35.37829 21.38453 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]     [,3]  [,4]
## [1,]  0.459 0.6253 -0.00776 0.191
## [2,]  0.219 0.7997  0.02771 0.162
## [3,] -1.046 0.3781 -0.23906 0.415
## [4,] -0.606 0.0503  0.09562 0.160
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]    [,3]    [,4]
## [1,]  0.2960  0.6815  0.0177  0.2287
## [2,] -0.0682  1.1863  0.0189  0.1795
## [3,] -1.1806 -0.1858 -0.3716  0.0787
## [4,] -0.8566  0.0908  0.0411 -0.2509
##   
## Residuals cov-matrix: 
##           [,1]      [,2]       [,3]       [,4]
## [1,]  213.4239 118.02099 -133.76012 -109.22390
## [2,]  118.0210 187.11522  -87.73598  -67.19048
## [3,] -133.7601 -87.73598  553.15762  305.40848
## [4,] -109.2239 -67.19048  305.40848  288.40952
## ---- 
## aic=  22.06893 
## bic=  23.2253 
## Number of parameters:  36 
## initial estimates:  21.6093 -12.0557 25.6253 2.7014 0.2922 0.221 -0.0688 0.4983 0.4425 0.0899 -0.2249 0.4725 -0.902 -0.0381 0.5058 -0.6659 -0.1094 -0.2857 0.1548 -0.2907 -0.0692 -0.6464 -0.0999 -0.4221 -0.4632 -0.1641 0.2117 -0.1535 0.339 -0.6448 -0.0736 -0.855 -0.2352 0.132 -0.1579 -0.5017 
## Par. lower-bounds:  9.4366 -24.1299 1.684 -7.812 -0.1149 -0.1469 -0.2295 0.1153 0.0387 -0.2749 -0.3843 0.0927 -1.7027 -0.7616 0.1898 -1.4192 -0.461 -0.6033 0.016 -0.6214 -0.6933 -1.341 -0.4005 -1.3354 -1.0823 -0.8532 -0.0865 -1.0594 -0.8886 -2.0111 -0.6649 -2.6512 -0.7743 -0.468 -0.4176 -1.2905 
## Par. upper-bounds:  33.782 0.0185 49.5665 13.2149 0.6993 0.5888 0.0919 0.8813 0.8463 0.4548 -0.0655 0.8524 -0.1013 0.6853 0.8218 0.0873 0.2422 0.032 0.2936 0.0401 0.5549 0.0483 0.2007 0.4912 0.1559 0.5249 0.5099 0.7524 1.5665 0.7215 0.5177 0.9412 0.3038 0.7319 0.1017 0.2871 
## Final   Estimates:  21.70829 -12.25078 25.71712 2.669242 0.250273 0.5882986 -0.2242489 0.8560354 0.4420128 0.4207137 -0.3831636 0.8524044 -0.9737774 -0.255165 0.4347994 -0.3906884 -0.1137993 0.03159632 0.2616217 0.0400898 -0.08420112 -0.6197453 0.1939124 -0.6088875 -0.45654 -0.3393016 0.3671909 -0.7752997 0.4197757 0.3929821 -0.008467639 -0.2921244 0.001663916 -0.141405 -0.1357755 -0.3175059
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           21.708291    6.377806    3.404 0.000665 ***
## loneliness_state_pmc         -12.250781    4.767443   -2.570 0.010179 *  
## socintsatisfaction_state_pmc  25.717116    7.385210    3.482 0.000497 ***
## responsiveness_state_pmc       2.669242         NaN      NaN      NaN    
## depressedmood_state            0.250273    0.267409    0.936 0.349316    
## loneliness_state_pmc           0.588299    0.245630    2.395 0.016618 *  
## socintsatisfaction_state_pmc  -0.224249         NaN      NaN      NaN    
## responsiveness_state_pmc       0.856035         NaN      NaN      NaN    
## depressedmood_state            0.442013    0.216428    2.042 0.041121 *  
## loneliness_state_pmc           0.420714    0.242855    1.732 0.083209 .  
## socintsatisfaction_state_pmc  -0.383164         NaN      NaN      NaN    
## responsiveness_state_pmc       0.852404         NaN      NaN      NaN    
## depressedmood_state           -0.973777    0.304973   -3.193 0.001408 ** 
## loneliness_state_pmc          -0.255165    0.549649   -0.464 0.642481    
## socintsatisfaction_state_pmc   0.434799         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.390688    0.263671   -1.482 0.138413    
## depressedmood_state           -0.113799         NaN      NaN      NaN    
## loneliness_state_pmc           0.031596         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.261622         NaN      NaN      NaN    
## responsiveness_state_pmc       0.040090    0.202262    0.198 0.842883    
##                               -0.084201    0.292900   -0.287 0.773750    
##                               -0.619745    0.307067   -2.018 0.043563 *  
##                                0.193912         NaN      NaN      NaN    
##                               -0.608887         NaN      NaN      NaN    
##                               -0.456540    0.185212   -2.465 0.013703 *  
##                               -0.339302         NaN      NaN      NaN    
##                                0.367191         NaN      NaN      NaN    
##                               -0.775300         NaN      NaN      NaN    
##                                0.419776    0.219873    1.909 0.056239 .  
##                                0.392982         NaN      NaN      NaN    
##                               -0.008468         NaN      NaN      NaN    
##                               -0.292124         NaN      NaN      NaN    
##                                0.001664         NaN      NaN      NaN    
##                               -0.141405         NaN      NaN      NaN    
##                               -0.135776         NaN      NaN      NaN    
##                               -0.317506    0.182341   -1.741 0.081635 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  21.70829 -12.25078 25.71712 2.669242 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]   [,3]    [,4]
## [1,]  0.250  0.5883 -0.224  0.8560
## [2,]  0.442  0.4207 -0.383  0.8524
## [3,] -0.974 -0.2552  0.435 -0.3907
## [4,] -0.114  0.0316  0.262  0.0401
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]   [,2]     [,3]  [,4]
## [1,]  0.08420  0.620 -0.19391 0.609
## [2,]  0.45654  0.339 -0.36719 0.775
## [3,] -0.41978 -0.393  0.00847 0.292
## [4,] -0.00166  0.141  0.13578 0.318
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 114.30027  57.54957  37.98587 -31.80961
## [2,]  57.54957 113.88308 -38.57525 -36.42597
## [3,]  37.98587 -38.57525 492.08894  80.15045
## [4,] -31.80961 -36.42597  80.15045 103.87188
## ---- 
## aic=  20.63618 
## bic=  21.79255 
## Number of parameters:  36 
## initial estimates:  26.6716 -9.5884 32.6454 7.8644 0.2657 -0.2371 -0.0549 0.1147 0.2008 -0.2235 0.0102 0.0159 -0.8105 0.2651 -0.1163 -0.0358 -0.2093 0.1024 -0.0999 0.1263 0.0961 -1.619 -0.2852 -0.6925 -0.0845 -0.2069 -0.1897 -0.3584 1.2287 -1.4723 -0.307 0.7607 0.0318 0.9909 0.2437 0.5601 
## Par. lower-bounds:  12.1489 -18.7896 8.9843 -2.457 -0.1058 -0.7143 -0.2933 -0.4132 -0.0346 -0.5259 -0.1408 -0.3185 -1.4158 -0.5124 -0.5048 -0.8958 -0.4733 -0.2367 -0.2694 -0.2488 -0.6436 -3.8815 -0.8527 -1.8699 -0.5532 -1.6404 -0.5492 -1.1043 0.0235 -5.1585 -1.2315 -1.1575 -0.4939 -0.6172 -0.1596 -0.2766 
## Par. upper-bounds:  41.1943 -0.3872 56.3065 18.1858 0.6372 0.2402 0.1836 0.6425 0.4362 0.0788 0.1613 0.3503 -0.2052 1.0426 0.2722 0.8241 0.0547 0.4416 0.0695 0.5014 0.8359 0.6436 0.2822 0.4848 0.3842 1.2266 0.1698 0.3875 2.4339 2.214 0.6175 2.6788 0.5575 2.5989 0.647 1.3968 
## Final   Estimates:  26.59411 -9.454812 32.7112 7.832344 0.3084309 0.2401577 -0.05224508 0.1864185 0.2581262 0.0788176 0.1613326 0.3503141 -0.8913957 0.6812733 0.2721969 -0.2796044 -0.2200495 0.05012867 0.06954559 -0.1485081 -0.4657805 -0.7531919 -0.2664074 -0.07240982 -0.3214952 -0.4401476 -0.3279197 -0.4265904 0.9820825 -0.6923522 -0.364566 0.4521679 0.116355 0.1995128 -0.09142674 0.2641833
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           26.59411         NaN      NaN      NaN    
## loneliness_state_pmc          -9.45481         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  32.71120    11.13263    2.938 0.003300 ** 
## responsiveness_state_pmc       7.83234         NaN      NaN      NaN    
## depressedmood_state            0.30843         NaN      NaN      NaN    
## loneliness_state_pmc           0.24016     0.68438    0.351 0.725655    
## socintsatisfaction_state_pmc  -0.05225         NaN      NaN      NaN    
## responsiveness_state_pmc       0.18642     0.60934    0.306 0.759652    
## depressedmood_state            0.25813         NaN      NaN      NaN    
## loneliness_state_pmc           0.07882         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.16133     0.12001    1.344 0.178827    
## responsiveness_state_pmc       0.35031     0.34900    1.004 0.315490    
## depressedmood_state           -0.89140     0.28908   -3.084 0.002045 ** 
## loneliness_state_pmc           0.68127         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.27220         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.27960     0.59543   -0.470 0.638654    
## depressedmood_state           -0.22005         NaN      NaN      NaN    
## loneliness_state_pmc           0.05013         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.06955         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.14851     0.56149   -0.264 0.791402    
##                               -0.46578         NaN      NaN      NaN    
##                               -0.75319     0.64361   -1.170 0.241893    
##                               -0.26641         NaN      NaN      NaN    
##                               -0.07241     0.49569   -0.146 0.883859    
##                               -0.32150     0.08800   -3.653 0.000259 ***
##                               -0.44015         NaN      NaN      NaN    
##                               -0.32792     0.15067   -2.176 0.029520 *  
##                               -0.42659     0.30938   -1.379 0.167939    
##                                0.98208     0.32178    3.052 0.002273 ** 
##                               -0.69235         NaN      NaN      NaN    
##                               -0.36457         NaN      NaN      NaN    
##                                0.45217     0.42187    1.072 0.283800    
##                                0.11635         NaN      NaN      NaN    
##                                0.19951         NaN      NaN      NaN    
##                               -0.09143         NaN      NaN      NaN    
##                                0.26418     0.50994    0.518 0.604409    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  26.59411 -9.454812 32.7112 7.832344 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]    [,3]   [,4]
## [1,]  0.308 0.2402 -0.0522  0.186
## [2,]  0.258 0.0788  0.1613  0.350
## [3,] -0.891 0.6813  0.2722 -0.280
## [4,] -0.220 0.0501  0.0695 -0.149
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]   [,3]    [,4]
## [1,]  0.466  0.753 0.2664  0.0724
## [2,]  0.321  0.440 0.3279  0.4266
## [3,] -0.982  0.692 0.3646 -0.4522
## [4,] -0.116 -0.200 0.0914 -0.2642
##   
## Residuals cov-matrix: 
##            [,1]       [,2]      [,3]      [,4]
## [1,]  218.89493   76.20768 -175.6047 -81.38337
## [2,]   76.20768   92.38823 -128.3808 -40.49264
## [3,] -175.60466 -128.38082  555.4565 159.31513
## [4,]  -81.38337  -40.49264  159.3151 107.65639
## ---- 
## aic=  20.47441 
## bic=  21.63077 
## Number of parameters:  36 
## initial estimates:  24.1038 2.5902 -19.5209 -6.3567 0.2393 -5e-04 -0.2754 0.232 -0.1173 0.3132 -0.2416 0.1175 0.6202 -0.4312 0.4601 0.275 0.2377 -0.1757 0.3213 0.2887 0.1641 0.0126 0.3652 -0.1388 -0.2845 -0.0476 0.0428 0.1057 -0.8607 -0.0192 -0.1286 -0.474 -0.3894 0.1368 0.104 -0.2402 
## Par. lower-bounds:  9.3685 -10.5439 -33.8533 -17.2656 -0.134 -0.4296 -0.6182 -0.2544 -0.45 -0.0692 -0.5471 -0.3161 0.2571 -0.8485 0.1267 -0.1981 -0.0387 -0.4933 0.0675 -0.0714 -0.8286 -1.0378 -0.5977 -1.121 -1.1694 -0.9839 -0.8154 -0.7697 -1.8263 -1.0409 -1.0651 -1.4293 -1.1244 -0.6409 -0.6089 -0.9673 
## Par. upper-bounds:  38.8391 15.7243 -5.1886 4.5522 0.6126 0.4285 0.0674 0.7184 0.2154 0.6956 0.064 0.551 0.9833 -0.0139 0.7936 0.7481 0.514 0.1419 0.5751 0.6488 1.1569 1.0631 1.3281 0.8433 0.6004 0.8887 0.9011 0.9811 0.105 1.0026 0.808 0.4812 0.3455 0.9145 0.8169 0.4869 
## Final   Estimates:  24.00559 2.795252 -19.78425 -6.545771 0.2292177 0.3600563 -0.07046664 0.1941218 -0.1032621 0.6956242 0.0639624 -0.2584447 0.7531877 -0.01404304 0.7935629 -0.06622971 0.281629 -0.1383226 0.1036259 0.648676 0.03663016 -0.5976569 -0.4067972 -0.1137125 0.1106597 -0.7352581 -0.3626415 0.3981245 -0.5523709 -0.4052725 -0.3927178 0.09022441 -0.2427485 -0.06400519 0.05415448 -0.5170676
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           24.00559     5.31160    4.519 6.20e-06 ***
## loneliness_state_pmc           2.79525         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -19.78425     4.57687   -4.323 1.54e-05 ***
## responsiveness_state_pmc      -6.54577     1.93615   -3.381 0.000723 ***
## depressedmood_state            0.22922     0.18238    1.257 0.208810    
## loneliness_state_pmc           0.36006         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.07047     0.29017   -0.243 0.808125    
## responsiveness_state_pmc       0.19412     0.56047    0.346 0.729075    
## depressedmood_state           -0.10326         NaN      NaN      NaN    
## loneliness_state_pmc           0.69562         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.06396     0.09680    0.661 0.508767    
## responsiveness_state_pmc      -0.25844     0.16694   -1.548 0.121597    
## depressedmood_state            0.75319     0.18582    4.053 5.05e-05 ***
## loneliness_state_pmc          -0.01404         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.79356     0.31565    2.514 0.011935 *  
## responsiveness_state_pmc      -0.06623     0.50596   -0.131 0.895854    
## depressedmood_state            0.28163     0.07484    3.763 0.000168 ***
## loneliness_state_pmc          -0.13832         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.10363         NaN      NaN      NaN    
## responsiveness_state_pmc       0.64868         NaN      NaN      NaN    
##                                0.03663     0.32238    0.114 0.909536    
##                               -0.59766     0.09011   -6.633 3.29e-11 ***
##                               -0.40680     0.29588   -1.375 0.169165    
##                               -0.11371     0.57311   -0.198 0.842723    
##                                0.11066         NaN      NaN      NaN    
##                               -0.73526         NaN      NaN      NaN    
##                               -0.36264     0.10804   -3.357 0.000789 ***
##                                0.39812     0.11349    3.508 0.000451 ***
##                               -0.55237     0.15919   -3.470 0.000521 ***
##                               -0.40527         NaN      NaN      NaN    
##                               -0.39272     0.29017   -1.353 0.175925    
##                                0.09022     0.43005    0.210 0.833823    
##                               -0.24275         NaN      NaN      NaN    
##                               -0.06401         NaN      NaN      NaN    
##                                0.05415         NaN      NaN      NaN    
##                               -0.51707         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  24.00559 2.795252 -19.78425 -6.545771 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]    [,3]    [,4]
## [1,]  0.229  0.360 -0.0705  0.1941
## [2,] -0.103  0.696  0.0640 -0.2584
## [3,]  0.753 -0.014  0.7936 -0.0662
## [4,]  0.282 -0.138  0.1036  0.6487
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]  [,2]    [,3]    [,4]
## [1,] -0.0366 0.598  0.4068  0.1137
## [2,] -0.1107 0.735  0.3626 -0.3981
## [3,]  0.5524 0.405  0.3927 -0.0902
## [4,]  0.2427 0.064 -0.0542  0.5171
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  664.7207  403.8963 -242.2672 -233.1145
## [2,]  403.8963  545.9737 -203.0003 -245.9463
## [3,] -242.2672 -203.0003  569.7920  242.8209
## [4,] -233.1145 -245.9463  242.8209  442.4888
## ---- 
## aic=  25.0371 
## bic=  26.19347 
## Number of parameters:  36 
## initial estimates:  21.6496 -16.7937 3.2237 -1.5868 0.2847 0.0349 -0.2026 0.0807 0.586 0.224 -0.1894 0.054 -0.1208 -0.0776 0.3327 0.0358 0.0181 0.0483 0.268 0.2476 0.2816 -0.3312 -0.1673 -0.1464 -0.2198 -0.4504 0.0374 -0.6723 -0.4383 0.1932 -0.153 0.3323 -0.3682 0.1531 -0.5331 0.2612 
## Par. lower-bounds:  9.7922 -33.8194 -15.2747 -20.62 -0.0949 -0.2304 -0.528 -0.2344 0.0408 -0.157 -0.6568 -0.3983 -0.7131 -0.4915 -0.1751 -0.4556 -0.5914 -0.3776 -0.2544 -0.2581 -0.4647 -0.8399 -0.6653 -0.667 -1.2915 -1.1809 -0.6777 -1.4198 -1.6027 -0.6004 -0.93 -0.4799 -1.5662 -0.6634 -1.3325 -0.5745 
## Par. upper-bounds:  33.5071 0.2321 21.7221 17.4464 0.6644 0.3003 0.1229 0.3957 1.1311 0.605 0.2779 0.5063 0.4715 0.3364 0.8404 0.5273 0.6275 0.4742 0.7905 0.7532 1.028 0.1775 0.3307 0.3742 0.8518 0.28 0.7525 0.0753 0.726 0.9868 0.624 1.1445 0.8299 0.9697 0.2663 1.0968 
## Final   Estimates:  21.7473 -16.79999 3.194033 -1.569407 0.2456341 0.2133767 0.1228922 -0.2275066 0.6069356 0.5099283 0.110201 0.5063279 -0.1510133 -0.071643 -0.03177348 0.2135228 0.01077998 -0.02958562 0.1977218 -0.2580713 0.1866556 -0.4179097 -0.4450971 0.2694562 -0.007965149 -0.4934079 -0.3929353 -0.6223606 -0.2403801 0.1796926 0.595938 -0.2411223 -0.2946689 0.2206435 -0.09244129 0.5750025
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)
## depressedmood_state           21.747302         NaN      NaN      NaN
## loneliness_state_pmc         -16.799991         NaN      NaN      NaN
## socintsatisfaction_state_pmc   3.194033    7.416536    0.431    0.667
## responsiveness_state_pmc      -1.569407         NaN      NaN      NaN
## depressedmood_state            0.245634         NaN      NaN      NaN
## loneliness_state_pmc           0.213377         NaN      NaN      NaN
## socintsatisfaction_state_pmc   0.122892    0.412242    0.298    0.766
## responsiveness_state_pmc      -0.227507         NaN      NaN      NaN
## depressedmood_state            0.606936         NaN      NaN      NaN
## loneliness_state_pmc           0.509928         NaN      NaN      NaN
## socintsatisfaction_state_pmc   0.110201    0.268054    0.411    0.681
## responsiveness_state_pmc       0.506328         NaN      NaN      NaN
## depressedmood_state           -0.151013    0.353779   -0.427    0.669
## loneliness_state_pmc          -0.071643         NaN      NaN      NaN
## socintsatisfaction_state_pmc  -0.031773         NaN      NaN      NaN
## responsiveness_state_pmc       0.213523         NaN      NaN      NaN
## depressedmood_state            0.010780         NaN      NaN      NaN
## loneliness_state_pmc          -0.029586         NaN      NaN      NaN
## socintsatisfaction_state_pmc   0.197722         NaN      NaN      NaN
## responsiveness_state_pmc      -0.258071    0.323321   -0.798    0.425
##                                0.186656         NaN      NaN      NaN
##                               -0.417910         NaN      NaN      NaN
##                               -0.445097    0.379720   -1.172    0.241
##                                0.269456         NaN      NaN      NaN
##                               -0.007965         NaN      NaN      NaN
##                               -0.493408         NaN      NaN      NaN
##                               -0.392935         NaN      NaN      NaN
##                               -0.622361         NaN      NaN      NaN
##                               -0.240380    0.404037   -0.595    0.552
##                                0.179693         NaN      NaN      NaN
##                                0.595938         NaN      NaN      NaN
##                               -0.241122         NaN      NaN      NaN
##                               -0.294669         NaN      NaN      NaN
##                                0.220644         NaN      NaN      NaN
##                               -0.092441         NaN      NaN      NaN
##                                0.575002    0.438576    1.311    0.190
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  21.7473 -16.79999 3.194033 -1.569407 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]    [,3]   [,4]
## [1,]  0.2456  0.2134  0.1229 -0.228
## [2,]  0.6069  0.5099  0.1102  0.506
## [3,] -0.1510 -0.0716 -0.0318  0.214
## [4,]  0.0108 -0.0296  0.1977 -0.258
## MA coefficient matrix 
## MA( 1 )-matrix 
##          [,1]   [,2]    [,3]   [,4]
## [1,] -0.18666  0.418  0.4451 -0.269
## [2,]  0.00797  0.493  0.3929  0.622
## [3,]  0.24038 -0.180 -0.5959  0.241
## [4,]  0.29467 -0.221  0.0924 -0.575
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  175.7023  160.5117 -128.7083 -137.0395
## [2,]  160.5117  376.2710 -236.6068 -271.7965
## [3,] -128.7083 -236.6068  475.7112  350.7964
## [4,] -137.0395 -271.7965  350.7964  490.1754
## ---- 
## aic=  22.67201 
## bic=  23.82838 
## Number of parameters:  36 
## initial estimates:  25.4824 3.5559 -1.3732 -2.8665 0.0833 0.3026 0.217 -0.5424 -0.0776 0.3255 0.1091 -0.2565 0.0238 -0.0411 0.5281 0.0897 0.0934 -0.1599 0.0241 0.61 -0.2516 -0.1844 -0.4983 0.4549 -0.2665 -0.0733 -0.0486 0.1479 -1.1432 0.7847 9e-04 -0.8295 -0.6529 0.2844 0.1533 -0.8951 
## Par. lower-bounds:  16.9917 -7.9509 -18.471 -13.5562 -0.2149 0.0406 0.0463 -0.866 -0.4818 -0.0296 -0.1222 -0.6951 -0.5767 -0.5687 0.1844 -0.562 -0.2821 -0.4898 -0.1908 0.2026 -1.035 -0.6666 -0.8607 -0.2012 -1.3283 -0.7269 -0.5398 -0.7413 -2.7209 -0.1864 -0.7289 -2.1507 -1.6393 -0.3228 -0.303 -1.7211 
## Par. upper-bounds:  33.9731 15.0627 15.7246 7.8232 0.3816 0.5646 0.3877 -0.2188 0.3265 0.6806 0.3404 0.182 0.6244 0.4866 0.8718 0.7414 0.4689 0.17 0.239 1.0175 0.5319 0.2978 -0.1359 1.1111 0.7953 0.5802 0.4425 1.0371 0.4345 1.7558 0.7307 0.4917 0.3336 0.8915 0.6095 -0.069 
## Final   Estimates:  25.39632 3.53558 -1.517621 -2.758665 0.02979599 0.4828997 0.3871642 -0.7486654 -0.1713504 -0.01500479 0.3257349 -0.6779909 0.08017182 0.4662151 0.4370497 0.329114 0.08012875 -0.4738382 0.04282869 0.5293662 -0.05656768 -0.2273714 -0.4288785 0.4387232 0.2376709 0.4549257 -0.5043699 0.8860027 -0.1803707 -0.1853993 0.2260186 -0.4689765 -0.04874224 0.6785204 0.1005993 -0.1587895 
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          25.3963243  14.0321014    1.810  0.07032 .  
## loneliness_state_pmc          3.5355804   1.3545459    2.610  0.00905 ** 
## socintsatisfaction_state_pmc -1.5176213   6.5318102   -0.232  0.81627    
## responsiveness_state_pmc     -2.7586655   7.4595646   -0.370  0.71152    
## depressedmood_state           0.0297960   0.5438135    0.055  0.95631    
## loneliness_state_pmc          0.4828997   0.4883942    0.989  0.32279    
## socintsatisfaction_state_pmc  0.3871642   0.2133777    1.814  0.06961 .  
## responsiveness_state_pmc     -0.7486654   0.5904326   -1.268  0.20480    
## depressedmood_state          -0.1713504   0.0613933   -2.791  0.00525 ** 
## loneliness_state_pmc         -0.0150048   0.0582642   -0.258  0.79677    
## socintsatisfaction_state_pmc  0.3257349   0.1229315    2.650  0.00806 ** 
## responsiveness_state_pmc     -0.6779909   0.0146494  -46.281  < 2e-16 ***
## depressedmood_state           0.0801718   0.2217279    0.362  0.71767    
## loneliness_state_pmc          0.4662151   0.2613372    1.784  0.07443 .  
## socintsatisfaction_state_pmc  0.4370497   0.1993434    2.192  0.02835 *  
## responsiveness_state_pmc      0.3291140   0.2978655    1.105  0.26920    
## depressedmood_state           0.0801287   0.2676831    0.299  0.76468    
## loneliness_state_pmc         -0.4738382   0.0797316   -5.943 2.80e-09 ***
## socintsatisfaction_state_pmc  0.0428287   0.1724431    0.248  0.80385    
## responsiveness_state_pmc      0.5293662   0.0589739    8.976  < 2e-16 ***
##                              -0.0565677   0.7144307   -0.079  0.93689    
##                              -0.2273714   0.6602556   -0.344  0.73057    
##                              -0.4288785   0.2899834   -1.479  0.13915    
##                               0.4387232   0.7119858    0.616  0.53776    
##                               0.2376709   0.1271457    1.869  0.06158 .  
##                               0.4549257   0.0283735   16.033  < 2e-16 ***
##                              -0.5043699   0.1848925   -2.728  0.00637 ** 
##                               0.8860027   0.0003142 2819.699  < 2e-16 ***
##                              -0.1803707   0.3680286   -0.490  0.62406    
##                              -0.1853993   0.2728736   -0.679  0.49686    
##                               0.2260186   0.2132953    1.060  0.28930    
##                              -0.4689765   0.0848246   -5.529 3.22e-08 ***
##                              -0.0487422   0.3480705   -0.140  0.88863    
##                               0.6785204   0.0073402   92.439  < 2e-16 ***
##                               0.1005993   0.3382156    0.297  0.76613    
##                              -0.1587895   0.2280362   -0.696  0.48622    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  25.39632 3.53558 -1.517621 -2.758665 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,]  0.0298  0.483 0.3872 -0.749
## [2,] -0.1714 -0.015 0.3257 -0.678
## [3,]  0.0802  0.466 0.4370  0.329
## [4,]  0.0801 -0.474 0.0428  0.529
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,]  0.0566  0.227  0.429 -0.439
## [2,] -0.2377 -0.455  0.504 -0.886
## [3,]  0.1804  0.185 -0.226  0.469
## [4,]  0.0487 -0.679 -0.101  0.159
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  69.67322  39.07749 -17.65485 -34.58124
## [2,]  39.07749 100.86984 -52.53042 -53.34193
## [3,] -17.65485 -52.53042 316.70272 112.37668
## [4,] -34.58124 -53.34193 112.37668 117.78389
## ---- 
## aic=  19.41722 
## bic=  20.57359 
## Number of parameters:  36 
## initial estimates:  36.6099 -3.3913 4.458 0.4776 0.0257 0.057 -0.2244 -0.0296 0.0843 -0.0772 -0.1949 -0.0581 -0.0884 0.3274 0.4017 0.0313 0.0124 0.2115 0.0881 0.6647 0.8811 -0.2145 -0.1922 1.1766 0.0747 -0.2272 0.7723 -0.1822 -0.0209 -0.5397 -0.6695 0.3724 -0.1778 -0.2027 -0.3244 -0.2494 
## Par. lower-bounds:  20.6927 -17.37 -11.5246 -10.2005 -0.3898 -0.4376 -0.582 -0.433 -0.2806 -0.5116 -0.509 -0.4125 -0.5057 -0.1693 0.0425 -0.3739 -0.2663 -0.1203 -0.1518 0.394 -0.1611 -1.1012 -1.2187 -0.3536 -0.8406 -1.0059 -0.1293 -1.5261 -1.0674 -1.4301 -1.7002 -1.1641 -0.877 -0.7976 -1.013 -1.2759 
## Par. upper-bounds:  52.5271 10.5873 20.4407 11.1558 0.4412 0.5517 0.1333 0.3739 0.4493 0.3572 0.1192 0.2962 0.3288 0.8241 0.7608 0.4364 0.2912 0.5434 0.328 0.9354 1.9233 0.6723 0.8343 2.7069 0.99 0.5515 1.6738 1.1616 1.0256 0.3507 0.3613 1.9089 0.5214 0.3922 0.3643 0.7772 
## Final   Estimates:  36.60711 -3.329188 4.45878 0.4252324 0.01838165 0.4838353 0.1024794 -0.1966853 0.1047462 0.1400436 -0.5083104 0.2094203 -0.08858343 0.6771991 0.7607987 -0.02427967 0.04753839 0.5433992 -0.01113151 0.4527159 0.3270514 -0.4683553 -0.09119965 0.4360461 0.2510709 -0.5008885 0.8135732 -0.4459827 -0.05695884 -0.8326306 -0.7962272 -0.2203846 -0.1942034 -0.5305454 -0.1232863 0.1126422
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           36.60711    12.40478    2.951  0.00317 ** 
## loneliness_state_pmc          -3.32919     7.99910   -0.416  0.67727    
## socintsatisfaction_state_pmc   4.45878     3.55488    1.254  0.20974    
## responsiveness_state_pmc       0.42523    14.04773    0.030  0.97585    
## depressedmood_state            0.01838     0.32386    0.057  0.95474    
## loneliness_state_pmc           0.48384     0.37559    1.288  0.19768    
## socintsatisfaction_state_pmc   0.10248         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.19669     0.35563   -0.553  0.58022    
## depressedmood_state            0.10475     0.21266    0.493  0.62233    
## loneliness_state_pmc           0.14004     0.22168    0.632  0.52756    
## socintsatisfaction_state_pmc  -0.50831     0.10306   -4.932 8.13e-07 ***
## responsiveness_state_pmc       0.20942     0.12666    1.653  0.09824 .  
## depressedmood_state           -0.08858     0.09846   -0.900  0.36829    
## loneliness_state_pmc           0.67720     0.14841    4.563 5.04e-06 ***
## socintsatisfaction_state_pmc   0.76080     0.09103    8.358  < 2e-16 ***
## responsiveness_state_pmc      -0.02428     0.14868   -0.163  0.87028    
## depressedmood_state            0.04754     0.39132    0.121  0.90331    
## loneliness_state_pmc           0.54340     0.40702    1.335  0.18185    
## socintsatisfaction_state_pmc  -0.01113     0.06053   -0.184  0.85409    
## responsiveness_state_pmc       0.45272     0.28859    1.569  0.11671    
##                                0.32705     0.50794    0.644  0.51965    
##                               -0.46836     0.50874   -0.921  0.35725    
##                               -0.09120         NaN      NaN      NaN    
##                                0.43605     0.68635    0.635  0.52523    
##                                0.25107     0.25373    0.990  0.32240    
##                               -0.50089     0.29548   -1.695  0.09004 .  
##                                0.81357     0.09793    8.307  < 2e-16 ***
##                               -0.44598     0.07652   -5.829 5.59e-09 ***
##                               -0.05696     0.13809   -0.412  0.67999    
##                               -0.83263     0.16190   -5.143 2.71e-07 ***
##                               -0.79623     0.06787  -11.731  < 2e-16 ***
##                               -0.22038     0.12385   -1.779  0.07517 .  
##                               -0.19420     0.44559   -0.436  0.66295    
##                               -0.53055     0.50981   -1.041  0.29803    
##                               -0.12329         NaN      NaN      NaN    
##                                0.11264     0.29550    0.381  0.70307    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  36.60711 -3.329188 4.45878 0.4252324 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]  [,2]    [,3]    [,4]
## [1,]  0.0184 0.484  0.1025 -0.1967
## [2,]  0.1047 0.140 -0.5083  0.2094
## [3,] -0.0886 0.677  0.7608 -0.0243
## [4,]  0.0475 0.543 -0.0111  0.4527
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]  [,2]    [,3]   [,4]
## [1,] -0.327 0.468  0.0912 -0.436
## [2,] -0.251 0.501 -0.8136  0.446
## [3,]  0.057 0.833  0.7962  0.220
## [4,]  0.194 0.531  0.1233 -0.113
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 175.44829  86.40907 -60.09003 -52.67888
## [2,]  86.40907 110.35991 -36.05723 -37.90454
## [3,] -60.09003 -36.05723 149.06466  63.96089
## [4,] -52.67888 -37.90454  63.96089  74.50094
## ---- 
## aic=  18.97448 
## bic=  20.13085 
## Number of parameters:  36 
## initial estimates:  9.0451 -4.2383 -1.7033 -4.7447 0.2152 -0.1809 -0.0018 -0.0283 0.1169 -0.1491 -0.008 -0.0416 0.2773 0.3516 0.5819 -0.4054 0.4955 0.1032 0.0781 0.0692 -0.2322 -0.2134 -0.322 0.4341 -0.1369 -0.3212 -0.1265 0.4636 0.7013 -0.0144 0.8975 -0.5377 0.291 0.4909 0.916 -0.4082 
## Par. lower-bounds:  4.7282 -9.5469 -11.0749 -11.3235 -0.1051 -0.4049 -0.167 -0.2774 -0.2771 -0.4245 -0.2111 -0.3479 -0.4182 -0.1346 0.2234 -0.9462 0.0073 -0.2381 -0.1737 -0.3104 -0.7897 -0.7917 -0.7904 -0.0693 -0.8226 -1.0324 -0.7025 -0.1555 -0.5091 -1.2698 -0.1192 -1.6306 -0.5587 -0.3904 0.2023 -1.1754 
## Par. upper-bounds:  13.362 1.0702 7.6683 1.8341 0.5356 0.043 0.1634 0.2207 0.5108 0.1264 0.1952 0.2647 0.9728 0.8378 0.9405 0.1354 0.9838 0.4446 0.3298 0.4488 0.3254 0.3649 0.1463 0.9376 0.5487 0.3899 0.4494 1.0827 1.9117 1.2411 1.9142 0.5552 1.1407 1.3722 1.6297 0.359 
## Final   Estimates:  8.30124 -4.359526 -0.4953313 -5.131754 0.4185125 0.04303321 -0.04366902 -0.2774441 0.2938467 0.1263516 -0.1421441 -0.3479094 -0.0897077 -0.1346161 0.2974153 0.1353681 0.3437398 -0.2380581 -0.01937135 0.4487983 0.09141889 -0.1227639 -0.1056736 0.5529479 0.1640461 -0.06546671 0.08770695 0.5589567 0.356163 -0.1095693 0.3243617 -0.7979005 -0.179891 -0.05605228 0.222989 -0.6557595
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)  
## depressedmood_state            8.30124         NaN      NaN      NaN  
## loneliness_state_pmc          -4.35953         NaN      NaN      NaN  
## socintsatisfaction_state_pmc  -0.49533     3.80949   -0.130    0.897  
## responsiveness_state_pmc      -5.13175         NaN      NaN      NaN  
## depressedmood_state            0.41851         NaN      NaN      NaN  
## loneliness_state_pmc           0.04303     0.25300    0.170    0.865  
## socintsatisfaction_state_pmc  -0.04367     0.15130   -0.289    0.773  
## responsiveness_state_pmc      -0.27744         NaN      NaN      NaN  
## depressedmood_state            0.29385         NaN      NaN      NaN  
## loneliness_state_pmc           0.12635     0.21317    0.593    0.553  
## socintsatisfaction_state_pmc  -0.14214         NaN      NaN      NaN  
## responsiveness_state_pmc      -0.34791         NaN      NaN      NaN  
## depressedmood_state           -0.08971     0.20011   -0.448    0.654  
## loneliness_state_pmc          -0.13462         NaN      NaN      NaN  
## socintsatisfaction_state_pmc   0.29742     0.20388    1.459    0.145  
## responsiveness_state_pmc       0.13537     0.83004    0.163    0.870  
## depressedmood_state            0.34374         NaN      NaN      NaN  
## loneliness_state_pmc          -0.23806     0.16464   -1.446    0.148  
## socintsatisfaction_state_pmc  -0.01937         NaN      NaN      NaN  
## responsiveness_state_pmc       0.44880         NaN      NaN      NaN  
##                                0.09142         NaN      NaN      NaN  
##                               -0.12276     0.17998   -0.682    0.495  
##                               -0.10567     0.20491   -0.516    0.606  
##                                0.55295         NaN      NaN      NaN  
##                                0.16405         NaN      NaN      NaN  
##                               -0.06547     0.13182   -0.497    0.619  
##                                0.08771     0.11383    0.771    0.441  
##                                0.55896         NaN      NaN      NaN  
##                                0.35616     0.14788    2.408    0.016 *
##                               -0.10957         NaN      NaN      NaN  
##                                0.32436     0.25431    1.275    0.202  
##                               -0.79790     1.03463   -0.771    0.441  
##                               -0.17989         NaN      NaN      NaN  
##                               -0.05605     0.11200   -0.500    0.617  
##                                0.22299         NaN      NaN      NaN  
##                               -0.65576         NaN      NaN      NaN  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  8.30124 -4.359526 -0.4953313 -5.131754 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,]  0.4185  0.043 -0.0437 -0.277
## [2,]  0.2938  0.126 -0.1421 -0.348
## [3,] -0.0897 -0.135  0.2974  0.135
## [4,]  0.3437 -0.238 -0.0194  0.449
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,] -0.0914 0.1228  0.1057 -0.553
## [2,] -0.1640 0.0655 -0.0877 -0.559
## [3,] -0.3562 0.1096 -0.3244  0.798
## [4,]  0.1799 0.0561 -0.2230  0.656
##   
## Residuals cov-matrix: 
##           [,1]      [,2]     [,3]      [,4]
## [1,]  49.76745   6.63923 -19.0428 -24.50897
## [2,]   6.63923  74.18561 -60.9168 -29.48947
## [3,] -19.04280 -60.91680 343.2337 157.66262
## [4,] -24.50897 -29.48947 157.6626 140.69577
## ---- 
## aic=  19.04434 
## bic=  20.20071 
## Number of parameters:  36 
## initial estimates:  19.2837 3.0659 -1.6115 -3.1 0.266 -0.1376 -0.129 -0.4359 -0.0196 -0.0069 -0.012 -0.5164 0.006 0.2391 0.3874 0.464 0.063 0.1291 0.1351 0.3895 -0.3289 -0.2635 -0.6926 0.3123 -0.0866 0.0991 -0.2591 0.1572 -0.2239 0.1805 -0.3128 0.0919 -0.5437 -0.0959 -0.5677 0.0307 
## Par. lower-bounds:  10.4131 -4.4134 -9.0658 -10.0676 -0.0535 -0.5457 -0.4876 -0.8744 -0.289 -0.351 -0.3144 -0.8861 -0.2625 -0.1038 0.086 0.0955 -0.188 -0.1914 -0.1465 0.0451 -1.2864 -1.0837 -1.638 -0.5242 -0.8939 -0.5925 -1.0562 -0.5481 -1.0285 -0.5087 -1.1072 -0.611 -1.2957 -0.7402 -1.3103 -0.6263 
## Par. upper-bounds:  28.1543 10.5452 5.8429 3.8677 0.5855 0.2705 0.2296 0.0026 0.2498 0.3372 0.2903 -0.1467 0.2745 0.5821 0.6887 0.8325 0.314 0.4497 0.4168 0.7339 0.6285 0.5567 0.2528 1.1487 0.7207 0.7906 0.538 0.8625 0.5806 0.8697 0.4817 0.7948 0.2084 0.5483 0.1749 0.6877 
## Final   Estimates:  19.39906 3.335048 -1.134273 -2.804135 0.1686536 -0.4468822 0.1910019 -0.8554242 -0.2538409 -0.2533463 0.0005545037 -0.8853353 -0.04652323 -0.09795267 0.08974498 0.8239092 0.1558652 0.4496944 0.4167921 0.6420486 0.2317409 0.1911572 -0.7505388 0.9639532 0.4206425 0.3218816 -0.3342026 0.8477393 -0.0007789628 0.5503409 0.2575793 -0.3869237 -0.287675 -0.4404613 -0.5024432 -0.1262758
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          19.3990627   2.9128079    6.660 2.74e-11 ***
## loneliness_state_pmc          3.3350480   2.9416985    1.134 0.256914    
## socintsatisfaction_state_pmc -1.1342727         NaN      NaN      NaN    
## responsiveness_state_pmc     -2.8041351         NaN      NaN      NaN    
## depressedmood_state           0.1686536   0.1423428    1.185 0.236080    
## loneliness_state_pmc         -0.4468822   0.1061425   -4.210 2.55e-05 ***
## socintsatisfaction_state_pmc  0.1910019   0.1446952    1.320 0.186825    
## responsiveness_state_pmc     -0.8554242   0.1816521   -4.709 2.49e-06 ***
## depressedmood_state          -0.2538409   0.1097781   -2.312 0.020761 *  
## loneliness_state_pmc         -0.2533463   0.1141525   -2.219 0.026462 *  
## socintsatisfaction_state_pmc  0.0005545         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.8853353         NaN      NaN      NaN    
## depressedmood_state          -0.0465232         NaN      NaN      NaN    
## loneliness_state_pmc         -0.0979527         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.0897450   0.0628157    1.429 0.153090    
## responsiveness_state_pmc      0.8239092         NaN      NaN      NaN    
## depressedmood_state           0.1558652         NaN      NaN      NaN    
## loneliness_state_pmc          0.4496944         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.4167921   0.0593046    7.028 2.10e-12 ***
## responsiveness_state_pmc      0.6420486         NaN      NaN      NaN    
##                               0.2317409   0.1257073    1.843 0.065257 .  
##                               0.1911572         NaN      NaN      NaN    
##                              -0.7505388   0.1309657   -5.731 1.00e-08 ***
##                               0.9639532   0.1729783    5.573 2.51e-08 ***
##                               0.4206425   0.1226295    3.430 0.000603 ***
##                               0.3218816   0.0962523    3.344 0.000825 ***
##                              -0.3342026   0.0629115   -5.312 1.08e-07 ***
##                               0.8477393   0.0410885   20.632  < 2e-16 ***
##                              -0.0007790         NaN      NaN      NaN    
##                               0.5503409         NaN      NaN      NaN    
##                               0.2575793         NaN      NaN      NaN    
##                              -0.3869237   0.0904825   -4.276 1.90e-05 ***
##                              -0.2876750         NaN      NaN      NaN    
##                              -0.4404613         NaN      NaN      NaN    
##                              -0.5024432         NaN      NaN      NaN    
##                              -0.1262758   0.1157164   -1.091 0.275162    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  19.39906 3.335048 -1.134273 -2.804135 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]     [,3]   [,4]
## [1,]  0.1687 -0.447 0.191002 -0.855
## [2,] -0.2538 -0.253 0.000555 -0.885
## [3,] -0.0465 -0.098 0.089745  0.824
## [4,]  0.1559  0.450 0.416792  0.642
## MA coefficient matrix 
## MA( 1 )-matrix 
##           [,1]   [,2]   [,3]   [,4]
## [1,] -0.231741 -0.191  0.751 -0.964
## [2,] -0.420643 -0.322  0.334 -0.848
## [3,]  0.000779 -0.550 -0.258  0.387
## [4,]  0.287675  0.440  0.502  0.126
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 163.75284  71.49063 -53.15812 -16.32080
## [2,]  71.49063 163.13277 -13.07020  -5.95457
## [3,] -53.15812 -13.07020 160.50135  78.69831
## [4,] -16.32080  -5.95457  78.69831 146.44755
## ---- 
## aic=  20.64188 
## bic=  21.79825 
## Number of parameters:  36 
## initial estimates:  26.5603 -6.536 3.8444 1.3249 0.6725 -0.3743 -0.0413 -0.1095 0.0881 -0.1497 -0.0189 -0.2197 -0.0706 0.0958 0.8435 0.073 -0.0198 0.0818 0.0631 0.8506 -0.5637 0.4921 -0.2434 0.4704 1.325 -0.8888 -0.2382 0.7305 0.411 -0.0294 1.2631 -1.3607 0.2348 -0.0045 0.6806 -0.7007 
## Par. lower-bounds:  4.0133 -30.8196 -13.9688 -10.9634 0.3852 -0.6777 -0.3102 -0.479 -0.2213 -0.4765 -0.3085 -0.6175 -0.2975 -0.1439 0.6311 -0.2188 -0.1764 -0.0836 -0.0834 0.6493 -1.6197 -0.2142 -1.4434 -1.5522 0.1877 -1.6495 -1.5306 -1.448 -0.4233 -0.5874 0.315 -2.9587 -0.3407 -0.3894 0.0266 -1.803 
## Par. upper-bounds:  49.1073 17.7477 21.6576 13.6131 0.9598 -0.0709 0.2276 0.2599 0.3975 0.1771 0.2707 0.1782 0.1564 0.3355 1.056 0.3649 0.1367 0.2472 0.2097 1.0519 0.4923 1.1984 0.9566 2.4931 2.4623 -0.1281 1.0542 2.9089 1.2452 0.5286 2.2111 0.2373 0.8103 0.3805 1.3346 0.4017 
## Final   Estimates:  26.5603 -6.53595 3.844421 1.324895 0.6725013 -0.3742817 -0.04132224 -0.1095438 0.08808829 -0.1496858 -0.01889998 -0.2196669 -0.07057167 0.09580594 0.8435355 0.07304174 -0.01982997 0.08179858 0.06311459 0.8505956 -0.5636937 0.4920712 -0.2433712 0.4704492 1.32496 -0.888777 -0.2382164 0.7304678 0.4109568 -0.02943198 1.263087 -1.360718 0.234767 -0.004452154 0.6806255 -0.7006684 
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)
## depressedmood_state          26.560304         NaN      NaN      NaN
## loneliness_state_pmc         -6.535950         NaN      NaN      NaN
## socintsatisfaction_state_pmc  3.844421         NaN      NaN      NaN
## responsiveness_state_pmc      1.324895         NaN      NaN      NaN
## depressedmood_state           0.672501         NaN      NaN      NaN
## loneliness_state_pmc         -0.374282         NaN      NaN      NaN
## socintsatisfaction_state_pmc -0.041322         NaN      NaN      NaN
## responsiveness_state_pmc     -0.109544         NaN      NaN      NaN
## depressedmood_state           0.088088         NaN      NaN      NaN
## loneliness_state_pmc         -0.149686         NaN      NaN      NaN
## socintsatisfaction_state_pmc -0.018900         NaN      NaN      NaN
## responsiveness_state_pmc     -0.219667         NaN      NaN      NaN
## depressedmood_state          -0.070572         NaN      NaN      NaN
## loneliness_state_pmc          0.095806         NaN      NaN      NaN
## socintsatisfaction_state_pmc  0.843535         NaN      NaN      NaN
## responsiveness_state_pmc      0.073042         NaN      NaN      NaN
## depressedmood_state          -0.019830         NaN      NaN      NaN
## loneliness_state_pmc          0.081799         NaN      NaN      NaN
## socintsatisfaction_state_pmc  0.063115         NaN      NaN      NaN
## responsiveness_state_pmc      0.850596         NaN      NaN      NaN
##                              -0.563694         NaN      NaN      NaN
##                               0.492071         NaN      NaN      NaN
##                              -0.243371         NaN      NaN      NaN
##                               0.470449         NaN      NaN      NaN
##                               1.324960         NaN      NaN      NaN
##                              -0.888777         NaN      NaN      NaN
##                              -0.238216         NaN      NaN      NaN
##                               0.730468         NaN      NaN      NaN
##                               0.410957         NaN      NaN      NaN
##                              -0.029432         NaN      NaN      NaN
##                               1.263087         NaN      NaN      NaN
##                              -1.360718         NaN      NaN      NaN
##                               0.234767         NaN      NaN      NaN
##                              -0.004452         NaN      NaN      NaN
##                               0.680625         NaN      NaN      NaN
##                              -0.700668         NaN      NaN      NaN
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  26.5603 -6.53595 3.844421 1.324895 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]    [,3]   [,4]
## [1,]  0.6725 -0.3743 -0.0413 -0.110
## [2,]  0.0881 -0.1497 -0.0189 -0.220
## [3,] -0.0706  0.0958  0.8435  0.073
## [4,] -0.0198  0.0818  0.0631  0.851
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]     [,2]   [,3]   [,4]
## [1,]  0.564 -0.49207  0.243 -0.470
## [2,] -1.325  0.88878  0.238 -0.730
## [3,] -0.411  0.02943 -1.263  1.361
## [4,] -0.235  0.00445 -0.681  0.701
##   
## Residuals cov-matrix: 
##               [,1]          [,2]          [,3]          [,4]
## [1,]  8.299516e+25 -1.650803e+26 -1.835955e+25 -9.194096e+24
## [2,] -1.650803e+26  3.283503e+26  3.651778e+25  1.828738e+25
## [3,] -1.835955e+25  3.651778e+25  4.061359e+24  2.033847e+24
## [4,] -9.194096e+24  1.828738e+25  2.033847e+24  1.018510e+24
## Warning in log(dd): NaNs produced
## ---- 
## aic=  NaN 
## bic=  NaN 
## Number of parameters:  36 
## initial estimates:  30.815 5.9296 -22.3387 -15.3124 -0.1656 0.3014 -0.2767 0.0816 -0.2702 0.4486 -0.3143 0.0226 0.8034 -0.4564 0.3226 0.3811 0.6045 -0.3222 -0.138 0.7599 0.5257 -0.3637 0.6748 -0.5958 0.2812 -0.2463 1.0018 -0.4523 -1.4424 0.8903 0.0726 -0.3895 -1.0001 0.5424 0.6385 -0.9481 
## Par. lower-bounds:  16.6027 -14.4972 -42.6676 -30.1335 -0.6672 -0.0897 -0.6447 -0.3647 -0.9912 -0.1135 -0.8432 -0.6188 0.0858 -1.0159 -0.2037 -0.2573 0.0813 -0.73 -0.5217 0.2946 -0.3699 -1.0435 -0.0918 -1.5114 -1.006 -1.2234 -0.0999 -1.7682 -2.7234 -0.0821 -1.0239 -1.6991 -1.9341 -0.1665 -0.1608 -1.9029 
## Par. upper-bounds:  45.0274 26.3564 -2.0097 -0.4914 0.3361 0.6925 0.0913 0.5278 0.4509 1.0108 0.2146 0.664 1.521 0.1031 0.849 1.0194 1.1277 0.0857 0.2457 1.2253 1.4213 0.3161 1.4414 0.3197 1.5683 0.7307 2.1036 0.8635 -0.1614 1.8627 1.169 0.9201 -0.0662 1.2513 1.4379 0.0066 
## Final   Estimates:  30.85211 5.907924 -22.36985 -15.27522 -0.216627 0.3556366 -0.3233165 0.4833506 -0.279042 0.7397955 -0.1523623 0.4138589 0.8784755 -0.1622799 0.477509 0.2447353 0.5593832 -0.5508228 -0.3678086 0.8071731 0.728827 -0.503937 0.08908539 -0.5866073 0.4716122 -0.7474105 0.1257384 -0.8428902 -0.8772831 0.005641546 -0.145038 -0.08994525 -0.7815371 0.7643779 0.8000441 -0.7288241
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           30.852111    7.110116    4.339 1.43e-05 ***
## loneliness_state_pmc           5.907924    2.648888    2.230 0.025725 *  
## socintsatisfaction_state_pmc -22.369850    3.613854   -6.190 6.02e-10 ***
## responsiveness_state_pmc     -15.275225    2.980207   -5.126 2.97e-07 ***
## depressedmood_state           -0.216627    0.244407   -0.886 0.375436    
## loneliness_state_pmc           0.355637    0.201950    1.761 0.078236 .  
## socintsatisfaction_state_pmc  -0.323316    0.230245   -1.404 0.160251    
## responsiveness_state_pmc       0.483351    0.223847    2.159 0.030828 *  
## depressedmood_state           -0.279042         NaN      NaN      NaN    
## loneliness_state_pmc           0.739795    0.175166    4.223 2.41e-05 ***
## socintsatisfaction_state_pmc  -0.152362    0.229816   -0.663 0.507346    
## responsiveness_state_pmc       0.413859    0.291446    1.420 0.155603    
## depressedmood_state            0.878475    0.061780   14.220  < 2e-16 ***
## loneliness_state_pmc          -0.162280    0.205685   -0.789 0.430128    
## socintsatisfaction_state_pmc   0.477509    0.327436    1.458 0.144750    
## responsiveness_state_pmc       0.244735    0.351621    0.696 0.486417    
## depressedmood_state            0.559383    0.079889    7.002 2.52e-12 ***
## loneliness_state_pmc          -0.550823    0.155167   -3.550 0.000385 ***
## socintsatisfaction_state_pmc  -0.367809    0.244544   -1.504 0.132567    
## responsiveness_state_pmc       0.807173    0.266627    3.027 0.002467 ** 
##                                0.728827    0.233962    3.115 0.001838 ** 
##                               -0.503937    0.222319   -2.267 0.023407 *  
##                                0.089085    0.118473    0.752 0.452081    
##                               -0.586607         NaN      NaN      NaN    
##                                0.471612         NaN      NaN      NaN    
##                               -0.747410    0.180650   -4.137 3.51e-05 ***
##                                0.125738    0.110772    1.135 0.256329    
##                               -0.842890    0.223457   -3.772 0.000162 ***
##                               -0.877283    0.184174   -4.763 1.90e-06 ***
##                                0.005642    0.100900    0.056 0.955412    
##                               -0.145038    0.144002   -1.007 0.313842    
##                               -0.089945    0.158651   -0.567 0.570756    
##                               -0.781537    0.168365   -4.642 3.45e-06 ***
##                                0.764378    0.088381    8.649  < 2e-16 ***
##                                0.800044    0.157802    5.070 3.98e-07 ***
##                               -0.728824    0.167454   -4.352 1.35e-05 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  30.85211 5.907924 -22.36985 -15.27522 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]   [,3]  [,4]
## [1,] -0.217  0.356 -0.323 0.483
## [2,] -0.279  0.740 -0.152 0.414
## [3,]  0.878 -0.162  0.478 0.245
## [4,]  0.559 -0.551 -0.368 0.807
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]     [,2]    [,3]   [,4]
## [1,] -0.729  0.50394 -0.0891 0.5866
## [2,] -0.472  0.74741 -0.1257 0.8429
## [3,]  0.877 -0.00564  0.1450 0.0899
## [4,]  0.782 -0.76438 -0.8000 0.7288
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  196.6098  230.1153 -177.9133 -126.1575
## [2,]  230.1153  413.4694 -308.0184 -204.4297
## [3,] -177.9133 -308.0184  414.7742  256.0210
## [4,] -126.1575 -204.4297  256.0210  235.3875
## ---- 
## aic=  20.8185 
## bic=  21.97487 
## Number of parameters:  36 
## initial estimates:  21.4095 8.9326 -9.9302 -3.9505 -0.1369 0.1166 0.0464 -0.0199 -0.4411 0.0703 -0.0099 -0.1286 0.5875 -0.0341 0.2942 0.0124 0.1908 0.0751 0.136 0.5389 0.5426 -0.3956 0.0085 0.6656 1.0424 -0.1893 -0.1268 0.6367 -0.6608 -0.1861 0.0497 -0.2165 -0.9693 -0.0188 -0.1331 -0.5747 
## Par. lower-bounds:  15.2646 -0.9997 -23.8833 -16.1449 -0.4567 -0.0927 -0.0863 -0.1438 -0.958 -0.268 -0.2245 -0.3289 -0.1387 -0.5092 -0.0072 -0.2689 -0.4438 -0.3401 -0.1275 0.293 -0.3605 -1.1452 -0.3454 0.251 -0.4172 -1.401 -0.6989 -0.0333 -2.7113 -1.8882 -0.754 -1.1578 -2.7614 -1.5064 -0.8356 -1.3974 
## Par. upper-bounds:  27.5543 18.8648 4.0228 8.244 0.1829 0.3258 0.1792 0.104 0.0758 0.4085 0.2046 0.0717 1.3137 0.441 0.5956 0.2938 0.8255 0.4904 0.3994 0.7848 1.4456 0.354 0.3625 1.0801 2.5021 1.0223 0.4453 1.3067 1.3898 1.5161 0.8534 0.7248 0.8228 1.4688 0.5693 0.2479 
## Final   Estimates:  21.33483 8.93145 -9.957672 -4.077883 -0.1720389 0.3258164 0.1791607 -0.1437992 -0.5119374 -0.2650349 0.2046238 -0.1426307 0.5368193 0.05109501 0.5956283 0.2221908 0.2734644 0.3897592 0.3993913 0.5993447 0.3106451 -0.4700419 -0.1642071 0.2510397 0.6372104 0.03965518 -0.3274732 -0.03334 -0.1874587 -0.5268149 -0.577712 -0.446183 -0.7467155 -0.228888 -0.4383774 -0.139252
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           21.33483     6.31384    3.379 0.000727 ***
## loneliness_state_pmc           8.93145     5.51358    1.620 0.105254    
## socintsatisfaction_state_pmc  -9.95767     5.15799   -1.931 0.053541 .  
## responsiveness_state_pmc      -4.07788         NaN      NaN      NaN    
## depressedmood_state           -0.17204     0.30835   -0.558 0.576890    
## loneliness_state_pmc           0.32582     0.27321    1.193 0.233046    
## socintsatisfaction_state_pmc   0.17916     0.15030    1.192 0.233252    
## responsiveness_state_pmc      -0.14380     0.04710   -3.053 0.002267 ** 
## depressedmood_state           -0.51194     0.29814   -1.717 0.085965 .  
## loneliness_state_pmc          -0.26503     0.46545   -0.569 0.569072    
## socintsatisfaction_state_pmc   0.20462     0.12884    1.588 0.112242    
## responsiveness_state_pmc      -0.14263     0.32027   -0.445 0.656069    
## depressedmood_state            0.53682     0.21941    2.447 0.014419 *  
## loneliness_state_pmc           0.05110     0.25751    0.198 0.842720    
## socintsatisfaction_state_pmc   0.59563     0.09460    6.296 3.05e-10 ***
## responsiveness_state_pmc       0.22219     0.16013    1.388 0.165260    
## depressedmood_state            0.27346         NaN      NaN      NaN    
## loneliness_state_pmc           0.38976     0.47815    0.815 0.414991    
## socintsatisfaction_state_pmc   0.39939     0.10022    3.985 6.74e-05 ***
## responsiveness_state_pmc       0.59934     0.14151    4.235 2.28e-05 ***
##                                0.31065     0.28627    1.085 0.277850    
##                               -0.47004     0.26407   -1.780 0.075082 .  
##                               -0.16421     0.19933   -0.824 0.410067    
##                                0.25104         NaN      NaN      NaN    
##                                0.63721     0.35780    1.781 0.074926 .  
##                                0.03966     0.42390    0.094 0.925467    
##                               -0.32747     0.11711   -2.796 0.005167 ** 
##                               -0.03334     0.19338   -0.172 0.863115    
##                               -0.18746         NaN      NaN      NaN    
##                               -0.52681     0.28225   -1.866 0.061977 .  
##                               -0.57771     0.10188   -5.671 1.42e-08 ***
##                               -0.44618     0.13296   -3.356 0.000792 ***
##                               -0.74672         NaN      NaN      NaN    
##                               -0.22889     0.51188   -0.447 0.654765    
##                               -0.43838     0.02686  -16.323  < 2e-16 ***
##                               -0.13925     0.06435   -2.164 0.030453 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  21.33483 8.93145 -9.957672 -4.077883 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]  [,3]   [,4]
## [1,] -0.172  0.3258 0.179 -0.144
## [2,] -0.512 -0.2650 0.205 -0.143
## [3,]  0.537  0.0511 0.596  0.222
## [4,]  0.273  0.3898 0.399  0.599
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]    [,2]  [,3]    [,4]
## [1,] -0.311  0.4700 0.164 -0.2510
## [2,] -0.637 -0.0397 0.327  0.0333
## [3,]  0.187  0.5268 0.578  0.4462
## [4,]  0.747  0.2289 0.438  0.1393
##   
## Residuals cov-matrix: 
##           [,1]      [,2]       [,3]       [,4]
## [1,] 55.129595  41.13700  -8.406145   2.416483
## [2,] 41.137000 101.00571 -42.455603 -30.152226
## [3,] -8.406145 -42.45560 197.326640  13.766724
## [4,]  2.416483 -30.15223  13.766724 118.579661
## ---- 
## aic=  19.11334 
## bic=  20.2697 
## Number of parameters:  36 
## initial estimates:  66.4103 -2.5276 11.2874 -9.4712 0.2184 -0.0613 -0.0616 -0.0953 0.0366 0.0075 0.038 -0.0223 -0.1195 0.0068 0.4346 0.2902 0.1041 -0.0349 0.0526 0.5237 0.1676 -0.072 -0.0936 0.2496 0.0391 0.3623 -0.29 0.8652 0.0688 -0.3638 0.1363 -0.9076 -0.0268 0.1192 -0.0117 -0.2098 
## Par. lower-bounds:  36.1144 -34.8725 -42.9981 -35.6912 -0.1409 -0.4005 -0.2391 -0.4446 -0.347 -0.3546 -0.1515 -0.3953 -0.7634 -0.6009 0.1165 -0.3358 -0.2069 -0.3284 -0.101 0.2214 -0.9078 -0.8975 -0.4596 -0.6504 -1.109 -0.519 -0.6808 -0.0956 -1.8581 -1.843 -0.5196 -2.5202 -0.9576 -0.5953 -0.3285 -0.9887 
## Par. upper-bounds:  96.7063 29.8172 65.573 16.7489 0.5778 0.2778 0.1159 0.2541 0.4202 0.3696 0.2276 0.3507 0.5243 0.6145 0.7526 0.9161 0.4151 0.2586 0.2062 0.8261 1.2431 0.7535 0.2725 1.1496 1.1873 1.2436 0.1008 1.8261 1.9958 1.1154 0.7922 0.705 0.9039 0.8336 0.3051 0.5691 
## Final   Estimates:  66.4068 -2.503915 11.27324 -9.474101 0.2184675 -0.4004869 -0.06908341 0.1066796 0.02725542 0.1459407 0.2275659 -0.3292574 -0.1307035 0.5255515 0.4805843 0.5277341 0.1071128 -0.3284002 0.01136029 0.6093826 0.01556334 0.2583526 -0.05165885 -0.1920825 -0.05478745 0.01064665 -0.3623794 0.5180506 -0.06200186 -0.3911781 0.1696953 -0.7276359 -0.2064606 0.5124055 0.08573731 -0.3098459
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           66.40680    18.22665    3.643 0.000269 ***
## loneliness_state_pmc          -2.50391         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  11.27324         NaN      NaN      NaN    
## responsiveness_state_pmc      -9.47410         NaN      NaN      NaN    
## depressedmood_state            0.21847     0.21631    1.010 0.312504    
## loneliness_state_pmc          -0.40049     0.32772   -1.222 0.221695    
## socintsatisfaction_state_pmc  -0.06908     0.13723   -0.503 0.614666    
## responsiveness_state_pmc       0.10668         NaN      NaN      NaN    
## depressedmood_state            0.02726         NaN      NaN      NaN    
## loneliness_state_pmc           0.14594         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.22757         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.32926         NaN      NaN      NaN    
## depressedmood_state           -0.13070         NaN      NaN      NaN    
## loneliness_state_pmc           0.52555         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.48058     0.19867    2.419 0.015564 *  
## responsiveness_state_pmc       0.52773     0.63908    0.826 0.408934    
## depressedmood_state            0.10711         NaN      NaN      NaN    
## loneliness_state_pmc          -0.32840         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.01136         NaN      NaN      NaN    
## responsiveness_state_pmc       0.60938         NaN      NaN      NaN    
##                                0.01556     0.28718    0.054 0.956781    
##                                0.25835     0.30031    0.860 0.389624    
##                               -0.05166     0.15258   -0.339 0.734939    
##                               -0.19208         NaN      NaN      NaN    
##                               -0.05479         NaN      NaN      NaN    
##                                0.01065         NaN      NaN      NaN    
##                               -0.36238     0.11189   -3.239 0.001201 ** 
##                                0.51805         NaN      NaN      NaN    
##                               -0.06200         NaN      NaN      NaN    
##                               -0.39118         NaN      NaN      NaN    
##                                0.16970     0.14580    1.164 0.244453    
##                               -0.72764     0.68078   -1.069 0.285149    
##                               -0.20646         NaN      NaN      NaN    
##                                0.51241         NaN      NaN      NaN    
##                                0.08574         NaN      NaN      NaN    
##                               -0.30985         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  66.4068 -2.503915 11.27324 -9.474101 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,]  0.2185 -0.400 -0.0691  0.107
## [2,]  0.0273  0.146  0.2276 -0.329
## [3,] -0.1307  0.526  0.4806  0.528
## [4,]  0.1071 -0.328  0.0114  0.609
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]    [,3]   [,4]
## [1,] -0.0156 -0.2584  0.0517  0.192
## [2,]  0.0548 -0.0106  0.3624 -0.518
## [3,]  0.0620  0.3912 -0.1697  0.728
## [4,]  0.2065 -0.5124 -0.0857  0.310
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  69.51939  54.00692 -18.24357 -19.51456
## [2,]  54.00692 101.81205  -2.74937 -11.18830
## [3,] -18.24357  -2.74937 231.49607  60.20881
## [4,] -19.51456 -11.18830  60.20881  50.61402
## ---- 
## aic=  18.23327 
## bic=  19.38964 
## Number of parameters:  36 
## initial estimates:  11.2648 -5.2507 -4.3863 3.0566 0.7298 -0.4226 0.0074 -0.3687 0.1879 -0.0756 -0.0858 -0.2467 0.0794 0.2562 0.7615 0.0373 -0.0897 0.2368 0.1745 0.5816 -0.2164 0.3434 -0.5146 0.4438 0.0514 -1.256 -0.2189 -0.118 0.3533 -0.8351 0.2744 0.0864 0.2196 -0.0709 -0.0164 0.1806 
## Par. lower-bounds:  1.4107 -14.3314 -14.0788 -4.7483 0.4791 -0.7558 -0.2366 -0.7335 -0.0431 -0.3827 -0.3105 -0.5829 -0.1673 -0.0716 0.5216 -0.3215 -0.2883 -0.0272 -0.0187 0.2926 -0.9358 -0.7354 -1.4796 -0.5362 -0.6115 -2.2501 -1.1082 -1.021 -0.3542 -1.8962 -0.6749 -0.8775 -0.3501 -0.9253 -0.7808 -0.5956 
## Par. upper-bounds:  21.1188 3.83 5.3061 10.8614 0.9805 -0.0893 0.2513 -0.0039 0.419 0.2315 0.139 0.0895 0.326 0.584 1.0014 0.3962 0.1089 0.5007 0.3677 0.8706 0.5029 1.4221 0.4505 1.4238 0.7143 -0.262 0.6705 0.7851 1.0609 0.2259 1.2236 1.0503 0.7894 0.7835 0.748 0.9568 
## Final   Estimates:  11.26476 -5.250702 -4.386347 3.056557 0.7297995 -0.4225505 0.00736776 -0.3687148 0.18792 -0.07559042 -0.08575407 -0.2466654 0.07937716 0.2561965 0.7615064 0.03732385 -0.08971426 0.2367776 0.1744991 0.5815947 -0.2164286 0.3433547 -0.5145533 0.4438088 0.05137999 -1.256045 -0.2188579 -0.1179569 0.3533258 -0.8351364 0.2743686 0.08639009 0.219612 -0.07092383 -0.01637332 0.1805889 
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)
## depressedmood_state          11.264762         NaN      NaN      NaN
## loneliness_state_pmc         -5.250702         NaN      NaN      NaN
## socintsatisfaction_state_pmc -4.386347         NaN      NaN      NaN
## responsiveness_state_pmc      3.056557         NaN      NaN      NaN
## depressedmood_state           0.729799         NaN      NaN      NaN
## loneliness_state_pmc         -0.422551         NaN      NaN      NaN
## socintsatisfaction_state_pmc  0.007368         NaN      NaN      NaN
## responsiveness_state_pmc     -0.368715         NaN      NaN      NaN
## depressedmood_state           0.187920         NaN      NaN      NaN
## loneliness_state_pmc         -0.075590         NaN      NaN      NaN
## socintsatisfaction_state_pmc -0.085754         NaN      NaN      NaN
## responsiveness_state_pmc     -0.246665         NaN      NaN      NaN
## depressedmood_state           0.079377         NaN      NaN      NaN
## loneliness_state_pmc          0.256197         NaN      NaN      NaN
## socintsatisfaction_state_pmc  0.761506         NaN      NaN      NaN
## responsiveness_state_pmc      0.037324         NaN      NaN      NaN
## depressedmood_state          -0.089714         NaN      NaN      NaN
## loneliness_state_pmc          0.236778         NaN      NaN      NaN
## socintsatisfaction_state_pmc  0.174499         NaN      NaN      NaN
## responsiveness_state_pmc      0.581595         NaN      NaN      NaN
##                              -0.216429         NaN      NaN      NaN
##                               0.343355         NaN      NaN      NaN
##                              -0.514553         NaN      NaN      NaN
##                               0.443809         NaN      NaN      NaN
##                               0.051380         NaN      NaN      NaN
##                              -1.256045         NaN      NaN      NaN
##                              -0.218858         NaN      NaN      NaN
##                              -0.117957         NaN      NaN      NaN
##                               0.353326         NaN      NaN      NaN
##                              -0.835136         NaN      NaN      NaN
##                               0.274369         NaN      NaN      NaN
##                               0.086390         NaN      NaN      NaN
##                               0.219612         NaN      NaN      NaN
##                              -0.070924         NaN      NaN      NaN
##                              -0.016373         NaN      NaN      NaN
##                               0.180589         NaN      NaN      NaN
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  11.26476 -5.250702 -4.386347 3.056557 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]     [,3]    [,4]
## [1,]  0.7298 -0.4226  0.00737 -0.3687
## [2,]  0.1879 -0.0756 -0.08575 -0.2467
## [3,]  0.0794  0.2562  0.76151  0.0373
## [4,] -0.0897  0.2368  0.17450  0.5816
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]    [,3]    [,4]
## [1,]  0.2164 -0.3434  0.5146 -0.4438
## [2,] -0.0514  1.2560  0.2189  0.1180
## [3,] -0.3533  0.8351 -0.2744 -0.0864
## [4,] -0.2196  0.0709  0.0164 -0.1806
##   
## Residuals cov-matrix: 
##               [,1]          [,2]          [,3]          [,4]
## [1,]  1.836349e+18 -2.059076e+19 -1.070612e+19 -1.304942e+18
## [2,] -2.059076e+19  2.308816e+20  1.200464e+20  1.463216e+19
## [3,] -1.070612e+19  1.200464e+20  6.241788e+19  7.607958e+18
## [4,] -1.304942e+18  1.463216e+19  7.607958e+18  9.273149e+17
## Warning in log(dd): NaNs produced
## ---- 
## aic=  NaN 
## bic=  NaN 
## Number of parameters:  36 
## initial estimates:  48.2475 9.0091 -20.7617 -70.3745 -0.3047 1.4382 1.1588 -1.8227 -0.2462 2.2408 0.1516 1.0832 0.5061 -1.6943 -5.3339 8.3991 1.8822 -6.6913 -5.9965 6.1644 0.5637 -1.591 -0.9973 1.4707 0.1838 -2.1697 -0.0543 -1.3682 -0.1769 1.4113 5.3339 -8.0873 -1.6049 6.5179 6.1039 -5.9247 
## Par. lower-bounds:  -91.3952 -110.2404 -129.0273 -152.5068 -3.9626 -10.215 -16.6995 -24.9991 -3.3699 -7.7105 -15.0987 -18.7086 -2.3298 -10.729 -19.1795 -9.5697 -0.2692 -13.5453 -16.5001 -7.4671 -3.1146 -13.2515 -18.8621 -21.7105 -2.9573 -12.1273 -15.3101 -21.1641 -3.0287 -7.6291 -8.5168 -26.0598 -3.7684 -0.3404 -4.4035 -19.559 
## Par. upper-bounds:  187.8902 128.2587 87.5038 11.7578 3.3531 13.0914 19.0171 21.3537 2.8774 12.1922 15.4019 20.875 3.342 7.3405 8.5117 26.3678 4.0336 0.1626 4.507 19.7958 4.242 10.0696 16.8675 24.6519 3.3249 7.788 15.2016 18.4277 2.6749 10.4518 19.1845 9.8852 0.5585 13.3762 16.6112 7.7096 
## Final   Estimates:  48.24748 9.00915 -20.76173 -70.3745 -0.3047295 1.438201 1.158823 -1.822707 -0.2462297 2.24083 0.1516424 1.083173 0.5061115 -1.694261 -5.333914 8.39906 1.882208 -6.691316 -5.996548 6.164374 0.563667 -1.590986 -0.9973344 1.470657 0.1838066 -2.169668 -0.05428412 -1.368191 -0.1769319 1.411337 5.333864 -8.087326 -1.604922 6.517915 6.103866 -5.924708 
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)
## depressedmood_state           48.24748         NaN      NaN      NaN
## loneliness_state_pmc           9.00915         NaN      NaN      NaN
## socintsatisfaction_state_pmc -20.76173         NaN      NaN      NaN
## responsiveness_state_pmc     -70.37450         NaN      NaN      NaN
## depressedmood_state           -0.30473         NaN      NaN      NaN
## loneliness_state_pmc           1.43820         NaN      NaN      NaN
## socintsatisfaction_state_pmc   1.15882         NaN      NaN      NaN
## responsiveness_state_pmc      -1.82271         NaN      NaN      NaN
## depressedmood_state           -0.24623         NaN      NaN      NaN
## loneliness_state_pmc           2.24083         NaN      NaN      NaN
## socintsatisfaction_state_pmc   0.15164         NaN      NaN      NaN
## responsiveness_state_pmc       1.08317         NaN      NaN      NaN
## depressedmood_state            0.50611         NaN      NaN      NaN
## loneliness_state_pmc          -1.69426         NaN      NaN      NaN
## socintsatisfaction_state_pmc  -5.33391         NaN      NaN      NaN
## responsiveness_state_pmc       8.39906         NaN      NaN      NaN
## depressedmood_state            1.88221         NaN      NaN      NaN
## loneliness_state_pmc          -6.69132         NaN      NaN      NaN
## socintsatisfaction_state_pmc  -5.99655         NaN      NaN      NaN
## responsiveness_state_pmc       6.16437         NaN      NaN      NaN
##                                0.56367         NaN      NaN      NaN
##                               -1.59099         NaN      NaN      NaN
##                               -0.99733         NaN      NaN      NaN
##                                1.47066         NaN      NaN      NaN
##                                0.18381         NaN      NaN      NaN
##                               -2.16967         NaN      NaN      NaN
##                               -0.05428         NaN      NaN      NaN
##                               -1.36819         NaN      NaN      NaN
##                               -0.17693         NaN      NaN      NaN
##                                1.41134         NaN      NaN      NaN
##                                5.33386         NaN      NaN      NaN
##                               -8.08733         NaN      NaN      NaN
##                               -1.60492         NaN      NaN      NaN
##                                6.51791         NaN      NaN      NaN
##                                6.10387         NaN      NaN      NaN
##                               -5.92471         NaN      NaN      NaN
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  48.24748 9.00915 -20.76173 -70.3745 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]  [,2]   [,3]  [,4]
## [1,] -0.305  1.44  1.159 -1.82
## [2,] -0.246  2.24  0.152  1.08
## [3,]  0.506 -1.69 -5.334  8.40
## [4,]  1.882 -6.69 -5.997  6.16
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]  [,2]    [,3]  [,4]
## [1,] -0.564  1.59  0.9973 -1.47
## [2,] -0.184  2.17  0.0543  1.37
## [3,]  0.177 -1.41 -5.3339  8.09
## [4,]  1.605 -6.52 -6.1039  5.92
##   
## Residuals cov-matrix: 
##                [,1]           [,2]           [,3]           [,4]
## [1,]  1.149681e+102 -2.036370e+102 -6.622822e+102 -2.423229e+102
## [2,] -2.036370e+102  4.081885e+102  1.221794e+103  3.678619e+102
## [3,] -6.622822e+102  1.221794e+103  3.865118e+103  1.332977e+103
## [4,] -2.423229e+102  3.678619e+102  1.332977e+103  5.900026e+102
## Warning in log(dd): NaNs produced
## ---- 
## aic=  NaN 
## bic=  NaN 
## Number of parameters:  36 
## initial estimates:  31.0111 12.7177 -18.5757 -15.4929 -0.1396 0.2554 0.0854 -0.0936 -0.4036 -0.0097 0.0792 -0.1099 0.6096 0.1444 0.1704 0.2229 0.5177 -0.0602 0.0738 0.0868 0.5103 -0.7273 0.1176 -0.1588 1.0576 -0.9613 0.0896 -0.0078 -0.988 0.5063 -0.0049 -0.5766 -1.0492 0.3462 -0.151 -0.588 
## Par. lower-bounds:  20.2725 3.3567 -36.1706 -29.8352 -0.516 -0.1378 -0.1215 -0.3443 -0.7318 -0.3524 -0.1012 -0.3285 -0.0072 -0.4998 -0.1686 -0.1879 0.0149 -0.5853 -0.2025 -0.248 -0.2064 -1.8845 -0.242 -0.9021 0.4328 -1.9701 -0.2239 -0.6558 -2.1624 -1.3897 -0.5942 -1.7945 -2.0065 -1.1993 -0.6313 -1.5808 
## Par. upper-bounds:  41.7497 22.0787 -0.9807 -1.1505 0.2369 0.6485 0.2923 0.1571 -0.0754 0.333 0.2595 0.1086 1.2264 0.7886 0.5093 0.6336 1.0205 0.465 0.3501 0.4217 1.2271 0.43 0.4773 0.5846 1.6824 0.0474 0.4031 0.6401 0.1863 2.4024 0.5843 0.6413 -0.092 1.8918 0.3294 0.4048 
## Final   Estimates:  31.17222 12.64753 -18.60945 -15.4785 -0.2097776 0.3091913 -0.1215087 0.1149862 -0.4983119 -0.096684 0.2595343 -0.3110065 0.7617762 -0.003383177 0.1123804 -0.1878627 0.6375401 -0.5849296 0.3501144 0.1045688 0.2758704 0.02823892 0.4465039 -0.1877541 0.6256166 0.04744983 -0.1709144 0.3397089 -1.102578 0.8725521 0.05341174 0.6413452 -0.6079826 0.3127427 -0.5643698 -0.07230814
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           31.172224   10.978760    2.839 0.004521 ** 
## loneliness_state_pmc          12.647529         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -18.609448    4.539262   -4.100 4.14e-05 ***
## responsiveness_state_pmc     -15.478498   12.187026   -1.270 0.204056    
## depressedmood_state           -0.209778    0.388802   -0.540 0.589509    
## loneliness_state_pmc           0.309191    0.190271    1.625 0.104162    
## socintsatisfaction_state_pmc  -0.121509    0.051014   -2.382 0.017226 *  
## responsiveness_state_pmc       0.114986    0.254815    0.451 0.651807    
## depressedmood_state           -0.498312         NaN      NaN      NaN    
## loneliness_state_pmc          -0.096684    0.155064   -0.624 0.532949    
## socintsatisfaction_state_pmc   0.259534    0.109677    2.366 0.017965 *  
## responsiveness_state_pmc      -0.311007    0.091571   -3.396 0.000683 ***
## depressedmood_state            0.761776    0.099616    7.647 2.07e-14 ***
## loneliness_state_pmc          -0.003383    0.193347   -0.017 0.986039    
## socintsatisfaction_state_pmc   0.112380    0.137621    0.817 0.414162    
## responsiveness_state_pmc      -0.187863    0.087272   -2.153 0.031350 *  
## depressedmood_state            0.637540    0.480535    1.327 0.184598    
## loneliness_state_pmc          -0.584930    0.274970   -2.127 0.033400 *  
## socintsatisfaction_state_pmc   0.350114    0.181187    1.932 0.053318 .  
## responsiveness_state_pmc       0.104569    0.436015    0.240 0.810463    
##                                0.275870    0.512116    0.539 0.590103    
##                                0.028239         NaN      NaN      NaN    
##                                0.446504    0.109000    4.096 4.20e-05 ***
##                               -0.187754    0.234965   -0.799 0.424248    
##                                0.625617    0.189107    3.308 0.000939 ***
##                                0.047450         NaN      NaN      NaN    
##                               -0.170914    0.106474   -1.605 0.108444    
##                                0.339709         NaN      NaN      NaN    
##                               -1.102578    0.146198   -7.542 4.64e-14 ***
##                                0.872552    0.093795    9.303  < 2e-16 ***
##                                0.053412    0.134118    0.398 0.690451    
##                                0.641345    0.081742    7.846 4.22e-15 ***
##                               -0.607983    0.632576   -0.961 0.336491    
##                                0.312743    0.157390    1.987 0.046917 *  
##                               -0.564370    0.231275   -2.440 0.014677 *  
##                               -0.072308    0.438050   -0.165 0.868890    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  31.17222 12.64753 -18.60945 -15.4785 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]     [,2]   [,3]   [,4]
## [1,] -0.210  0.30919 -0.122  0.115
## [2,] -0.498 -0.09668  0.260 -0.311
## [3,]  0.762 -0.00338  0.112 -0.188
## [4,]  0.638 -0.58493  0.350  0.105
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]    [,2]    [,3]    [,4]
## [1,] -0.276 -0.0282 -0.4465  0.1878
## [2,] -0.626 -0.0474  0.1709 -0.3397
## [3,]  1.103 -0.8726 -0.0534 -0.6413
## [4,]  0.608 -0.3127  0.5644  0.0723
##   
## Residuals cov-matrix: 
##            [,1]      [,2]       [,3]      [,4]
## [1,]  190.13754  101.5260  -68.04488 -100.0892
## [2,]  101.52598  151.6311 -141.73571 -139.7823
## [3,]  -68.04488 -141.7357  426.72611  199.7609
## [4,] -100.08924 -139.7823  199.76087  285.4616
## ---- 
## aic=  21.45399 
## bic=  22.61036 
## Number of parameters:  36 
## initial estimates:  28.7498 -16.5009 7.831 -0.5778 0.3961 0.1159 0.046 -0.1717 0.364 0.2014 0.0498 -0.1077 -0.1385 0.0079 0.4401 -0.1886 0.0298 -0.03 0.1515 0.4022 -0.1006 0.0742 -0.3162 0.0656 -0.3332 -0.3595 -0.3051 0.1488 0.1724 0.5211 -0.1465 0.466 -0.2709 0.8216 0.3329 -0.1604 
## Par. lower-bounds:  14.8079 -31.5858 -10.066 -16.9291 0.1013 -0.1631 -0.1821 -0.4179 0.045 -0.1004 -0.1969 -0.374 -0.517 -0.3503 0.1473 -0.5047 -0.316 -0.3572 -0.116 0.1134 -0.6485 -0.7125 -1.0363 -0.484 -0.9261 -1.2106 -1.0843 -0.4459 -0.5309 -0.4887 -1.0709 -0.2396 -0.9135 -0.101 -0.5117 -0.805 
## Par. upper-bounds:  42.6916 -1.416 25.7279 15.7734 0.6909 0.3948 0.2741 0.0745 0.683 0.5033 0.2966 0.1587 0.2399 0.366 0.7329 0.1274 0.3755 0.2971 0.419 0.6909 0.4473 0.8608 0.404 0.6153 0.2596 0.4917 0.4741 0.7435 0.8758 1.5309 0.778 1.1715 0.3718 1.7442 1.1775 0.4842 
## Final   Estimates:  28.75844 -16.49664 7.868351 -0.6459015 0.3904769 0.394844 0.02195063 -0.3425767 0.3478429 0.5032768 0.2966306 0.1587004 -0.1490174 0.2042374 0.317518 -0.101852 0.02139082 0.07327298 0.417721 0.1134493 -0.1939092 -0.2259846 -0.01417066 0.3187787 -0.1342696 -0.4319767 -0.4223439 -0.2372061 -0.08556641 -0.00822297 0.260925 -0.1594861 -0.2126764 0.0707474 -0.2173919 0.137255
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           28.758437    9.643238    2.982 0.002861 ** 
## loneliness_state_pmc         -16.496636    8.270508   -1.995 0.046083 *  
## socintsatisfaction_state_pmc   7.868351   18.620085    0.423 0.672607    
## responsiveness_state_pmc      -0.645902         NaN      NaN      NaN    
## depressedmood_state            0.390477    0.207023    1.886 0.059275 .  
## loneliness_state_pmc           0.394844    0.238507    1.655 0.097826 .  
## socintsatisfaction_state_pmc   0.021951    0.326397    0.067 0.946382    
## responsiveness_state_pmc      -0.342577    0.320691   -1.068 0.285410    
## depressedmood_state            0.347843    0.179257    1.940 0.052323 .  
## loneliness_state_pmc           0.503277    0.139002    3.621 0.000294 ***
## socintsatisfaction_state_pmc   0.296631    0.247899    1.197 0.231470    
## responsiveness_state_pmc       0.158700    0.206946    0.767 0.443159    
## depressedmood_state           -0.149017    0.397875   -0.375 0.708007    
## loneliness_state_pmc           0.204237    0.430923    0.474 0.635533    
## socintsatisfaction_state_pmc   0.317518    0.154717    2.052 0.040146 *  
## responsiveness_state_pmc      -0.101852    0.318883   -0.319 0.749422    
## depressedmood_state            0.021391         NaN      NaN      NaN    
## loneliness_state_pmc           0.073273    0.272283    0.269 0.787848    
## socintsatisfaction_state_pmc   0.417721    0.295233    1.415 0.157102    
## responsiveness_state_pmc       0.113449    0.176102    0.644 0.519428    
##                               -0.193909    0.218935   -0.886 0.375783    
##                               -0.225985    0.264348   -0.855 0.392620    
##                               -0.014171    0.373519   -0.038 0.969737    
##                                0.318779    0.332201    0.960 0.337258    
##                               -0.134270    0.222829   -0.603 0.546796    
##                               -0.431977    0.185203   -2.332 0.019677 *  
##                               -0.422344    0.276999   -1.525 0.127331    
##                               -0.237206    0.184765   -1.284 0.199203    
##                               -0.085566    0.411230   -0.208 0.835171    
##                               -0.008223    0.526669   -0.016 0.987543    
##                                0.260925    0.136233    1.915 0.055456 .  
##                               -0.159486    0.260667   -0.612 0.540644    
##                               -0.212676    0.171704   -1.239 0.215484    
##                                0.070747    0.443067    0.160 0.873136    
##                               -0.217392    0.232897   -0.933 0.350600    
##                                0.137255         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  28.75844 -16.49664 7.868351 -0.6459015 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]  [,3]   [,4]
## [1,]  0.3905 0.3948 0.022 -0.343
## [2,]  0.3478 0.5033 0.297  0.159
## [3,] -0.1490 0.2042 0.318 -0.102
## [4,]  0.0214 0.0733 0.418  0.113
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]     [,2]    [,3]   [,4]
## [1,] 0.1939  0.22598  0.0142 -0.319
## [2,] 0.1343  0.43198  0.4223  0.237
## [3,] 0.0856  0.00822 -0.2609  0.159
## [4,] 0.2127 -0.07075  0.2174 -0.137
##   
## Residuals cov-matrix: 
##           [,1]      [,2]       [,3]      [,4]
## [1,] 78.718728  26.04216  -7.157789  -7.50222
## [2,] 26.042156  73.21220 -27.562366 -22.12425
## [3,] -7.157789 -27.56237 146.636736  80.65307
## [4,] -7.502220 -22.12425  80.653065 139.78402
## ---- 
## aic=  19.0271 
## bic=  20.18347 
## Number of parameters:  36 
## initial estimates:  14.047 -1.4033 1.4381 4.6264 0.0861 0.0325 -0.029 -0.2292 0.0573 0.396 0.1029 -0.4107 -0.0992 -0.2751 0.3429 0.2229 -0.2807 0.0554 -0.0534 0.3483 0.0452 0.2311 -0.1704 -0.0291 -0.2497 -0.0229 0.0241 0.2713 -0.061 -0.474 -0.4278 -0.7217 0.41 -0.5814 -0.0279 -0.4528 
## Par. lower-bounds:  8.0797 -7.8277 -8.6919 -1.9211 -0.248 -0.2328 -0.2069 -0.5504 -0.3024 0.1104 -0.0886 -0.7564 -0.6664 -0.7254 0.041 -0.3223 -0.6473 -0.2357 -0.2485 -0.0041 -0.6025 -0.4475 -0.6271 -0.7552 -0.947 -0.7534 -0.4677 -0.5104 -1.1605 -1.6259 -1.2032 -1.9543 -0.3006 -1.3259 -0.5291 -1.2494 
## Par. upper-bounds:  20.0143 5.0211 11.5682 11.1739 0.4202 0.2978 0.1488 0.0919 0.417 0.6816 0.2943 -0.0649 0.468 0.1753 0.6447 0.7681 0.0859 0.3465 0.1417 0.7006 0.6929 0.9096 0.2864 0.6969 0.4475 0.7077 0.5158 1.053 1.0385 0.678 0.3476 0.5108 1.1207 0.1632 0.4733 0.3439 
## Final   Estimates:  12.0432 1.341525 -0.5162777 11.07395 0.2565881 0.2977508 0.1114689 0.09192512 -0.09243171 0.4465407 -0.005507236 -0.06493779 0.1184968 0.1752927 0.1722005 0.4622732 -0.6472583 0.3429728 0.05782965 -0.004109049 -0.07627033 -0.3095037 -0.1420752 -0.4416034 0.06817889 0.0689248 0.1329173 -0.3529329 -0.3090834 -0.6217453 0.3475749 -0.4470793 0.7362103 -0.460351 -0.05591089 0.3160247
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          12.043202    3.150042    3.823 0.000132 ***
## loneliness_state_pmc          1.341525    6.215003    0.216 0.829103    
## socintsatisfaction_state_pmc -0.516278   48.047801   -0.011 0.991427    
## responsiveness_state_pmc     11.073948    8.852755    1.251 0.210969    
## depressedmood_state           0.256588    0.140831    1.822 0.068462 .  
## loneliness_state_pmc          0.297751    0.482148    0.618 0.536871    
## socintsatisfaction_state_pmc  0.111469    0.614113    0.182 0.855966    
## responsiveness_state_pmc      0.091925    0.914276    0.101 0.919912    
## depressedmood_state          -0.092432    0.274424   -0.337 0.736252    
## loneliness_state_pmc          0.446541    1.181096    0.378 0.705376    
## socintsatisfaction_state_pmc -0.005507    0.728760   -0.008 0.993970    
## responsiveness_state_pmc     -0.064938         NaN      NaN      NaN    
## depressedmood_state           0.118497    2.825579    0.042 0.966549    
## loneliness_state_pmc          0.175293    1.099447    0.159 0.873325    
## socintsatisfaction_state_pmc  0.172201    0.123562    1.394 0.163429    
## responsiveness_state_pmc      0.462273    0.401950    1.150 0.250112    
## depressedmood_state          -0.647258    0.475013   -1.363 0.173005    
## loneliness_state_pmc          0.342973    0.972326    0.353 0.724288    
## socintsatisfaction_state_pmc  0.057830    0.885321    0.065 0.947919    
## responsiveness_state_pmc     -0.004109    0.292106   -0.014 0.988777    
##                              -0.076270    0.109854   -0.694 0.487503    
##                              -0.309504    0.918835   -0.337 0.736235    
##                              -0.142075    0.818218   -0.174 0.862149    
##                              -0.441603    1.028140   -0.430 0.667547    
##                               0.068179         NaN      NaN      NaN    
##                               0.068925    1.443943    0.048 0.961928    
##                               0.132917    0.852760    0.156 0.876138    
##                              -0.352933    0.133924   -2.635 0.008406 ** 
##                              -0.309083    2.974791   -0.104 0.917248    
##                              -0.621745    0.740792   -0.839 0.401302    
##                               0.347575         NaN      NaN      NaN    
##                              -0.447079    0.664021   -0.673 0.500762    
##                               0.736210    0.699305    1.053 0.292444    
##                              -0.460351    0.970904   -0.474 0.635395    
##                              -0.055911    0.735492   -0.076 0.939405    
##                               0.316025         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  12.0432 1.341525 -0.5162777 11.07395 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]  [,2]     [,3]     [,4]
## [1,]  0.2566 0.298  0.11147  0.09193
## [2,] -0.0924 0.447 -0.00551 -0.06494
## [3,]  0.1185 0.175  0.17220  0.46227
## [4,] -0.6473 0.343  0.05783 -0.00411
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]    [,3]   [,4]
## [1,]  0.0763  0.3095  0.1421  0.442
## [2,] -0.0682 -0.0689 -0.1329  0.353
## [3,]  0.3091  0.6217 -0.3476  0.447
## [4,] -0.7362  0.4604  0.0559 -0.316
##   
## Residuals cov-matrix: 
##            [,1]      [,2]      [,3]       [,4]
## [1,] 119.901605  45.32119 -22.09671   8.044277
## [2,]  45.321191 140.15207 -50.90192 -47.850213
## [3,] -22.096706 -50.90192 318.46196 118.584510
## [4,]   8.044277 -47.85021 118.58451 152.625364
## ---- 
## aic=  20.89462 
## bic=  22.05099 
## Number of parameters:  36 
## initial estimates:  31.0299 -4.6408 -4.1162 6.4228 0.1588 0.0721 0.0588 -0.2345 0.1481 0.1584 -0.0142 -0.1298 0.1274 -0.2659 0.661 -0.2798 -0.1467 0.1018 0.238 0.2823 -0.3237 0.3042 -0.3007 0.0885 0.3437 -0.4066 0.043 -0.0279 -0.1715 0.4673 -0.1529 0.3004 0.3481 0.2839 -0.1177 -0.043 
## Par. lower-bounds:  19.4895 -15.7111 -21.9366 -5.2234 -0.1478 -0.2516 -0.1634 -0.576 -0.1461 -0.1521 -0.2273 -0.4574 -0.3461 -0.7657 0.3179 -0.8071 -0.4562 -0.2248 0.0138 -0.0623 -1.0983 -0.4925 -0.8269 -0.813 -0.3993 -1.1708 -0.4619 -0.8927 -1.3675 -0.7629 -0.9656 -1.0916 -0.4336 -0.52 -0.6488 -0.9527 
## Par. upper-bounds:  42.5703 6.4296 13.7041 18.069 0.4654 0.3958 0.281 0.1069 0.4422 0.4689 0.199 0.1978 0.6009 0.234 1.0042 0.2475 0.1627 0.4285 0.4623 0.6269 0.4508 1.1008 0.2256 0.99 1.0868 0.3576 0.5478 0.8368 1.0246 1.6974 0.6597 1.6925 1.1298 1.0879 0.4134 0.8668 
## Final   Estimates:  30.1809 -7.544429 -6.126099 5.920815 0.1320001 0.3958413 0.2810274 -0.02537681 0.2387177 -0.1521093 0.130005 -0.4573583 0.2263698 -0.7657302 0.3178888 -0.5373873 -0.1102674 -0.2248423 0.01377666 -0.06231752 0.2442844 -0.4598145 -0.5049914 -0.1055861 0.02799457 0.2941418 -0.3509454 0.3641351 -0.2263765 0.9913103 0.5035177 0.3557841 0.129192 0.5075778 0.2722868 0.2971074
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           30.18090         NaN      NaN      NaN    
## loneliness_state_pmc          -7.54443     6.38560   -1.181 0.237414    
## socintsatisfaction_state_pmc  -6.12610     9.31430   -0.658 0.510725    
## responsiveness_state_pmc       5.92081     5.24498    1.129 0.258960    
## depressedmood_state            0.13200         NaN      NaN      NaN    
## loneliness_state_pmc           0.39584     0.26609    1.488 0.136857    
## socintsatisfaction_state_pmc   0.28103     0.25786    1.090 0.275789    
## responsiveness_state_pmc      -0.02538     0.32604   -0.078 0.937961    
## depressedmood_state            0.23872     0.18555    1.287 0.198261    
## loneliness_state_pmc          -0.15211     0.17464   -0.871 0.383747    
## socintsatisfaction_state_pmc   0.13000     0.17836    0.729 0.466066    
## responsiveness_state_pmc      -0.45736         NaN      NaN      NaN    
## depressedmood_state            0.22637     0.26174    0.865 0.387106    
## loneliness_state_pmc          -0.76573     0.37721   -2.030 0.042359 *  
## socintsatisfaction_state_pmc   0.31789     0.39544    0.804 0.421458    
## responsiveness_state_pmc      -0.53739         NaN      NaN      NaN    
## depressedmood_state           -0.11027     0.14434   -0.764 0.444896    
## loneliness_state_pmc          -0.22484     0.24863   -0.904 0.365828    
## socintsatisfaction_state_pmc   0.01378         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.06232         NaN      NaN      NaN    
##                                0.24428         NaN      NaN      NaN    
##                               -0.45981     0.32763   -1.403 0.160482    
##                               -0.50499     0.28374   -1.780 0.075117 .  
##                               -0.10559     0.35838   -0.295 0.768281    
##                                0.02799     0.18781    0.149 0.881509    
##                                0.29414     0.15913    1.848 0.064537 .  
##                               -0.35095     0.09444   -3.716 0.000202 ***
##                                0.36414         NaN      NaN      NaN    
##                               -0.22638     0.28931   -0.782 0.433941    
##                                0.99131     0.33066    2.998 0.002717 ** 
##                                0.50352     0.29923    1.683 0.092436 .  
##                                0.35578         NaN      NaN      NaN    
##                                0.12919         NaN      NaN      NaN    
##                                0.50758     0.26325    1.928 0.053844 .  
##                                0.27229         NaN      NaN      NaN    
##                                0.29711         NaN      NaN      NaN    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  30.1809 -7.544429 -6.126099 5.920815 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]   [,3]    [,4]
## [1,]  0.132  0.396 0.2810 -0.0254
## [2,]  0.239 -0.152 0.1300 -0.4574
## [3,]  0.226 -0.766 0.3179 -0.5374
## [4,] -0.110 -0.225 0.0138 -0.0623
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]   [,3]   [,4]
## [1,] -0.244  0.460  0.505  0.106
## [2,] -0.028 -0.294  0.351 -0.364
## [3,]  0.226 -0.991 -0.504 -0.356
## [4,] -0.129 -0.508 -0.272 -0.297
##   
## Residuals cov-matrix: 
##           [,1]       [,2]       [,3]       [,4]
## [1,] 62.661445  12.910845   7.162794  -5.433451
## [2,] 12.910845  66.980858 -19.625440  -1.739868
## [3,]  7.162794 -19.625440 172.695963  79.833557
## [4,] -5.433451  -1.739868  79.833557 101.061209
## ---- 
## aic=  18.55558 
## bic=  19.71195 
## Number of parameters:  36 
## initial estimates:  41.7488 19.0493 -13.081 -15.6623 -0.0544 0.3411 -0.2295 0.113 -0.4793 0.6037 -0.179 0.0426 0.392 -0.1043 0.3344 0.1994 0.3974 -0.0022 0.1481 0.4067 -0.5983 0.3381 -0.1449 0.1237 -0.2074 0.1265 -0.2949 0.255 0.4969 -0.5811 0.1225 -0.3139 -0.4067 -0.1671 -0.1227 -0.3252 
## Par. lower-bounds:  25.5992 0.2688 -28.8927 -32.278 -0.4601 -0.0739 -0.6256 -0.264 -0.951 0.1211 -0.6396 -0.3958 -0.0052 -0.5106 -0.0534 -0.1697 -0.02 -0.4292 -0.2595 0.0188 -1.9215 -0.4721 -1.0378 -0.6159 -1.7461 -0.8156 -1.3332 -0.6052 -0.7985 -1.3743 -0.7517 -1.0381 -1.768 -1.0007 -1.0413 -1.0862 
## Par. upper-bounds:  57.8984 37.8298 2.7307 0.9533 0.3512 0.7561 0.1666 0.49 -0.0075 1.0863 0.2816 0.481 0.7891 0.302 0.7222 0.5685 0.8147 0.4247 0.5556 0.7945 0.7248 1.1482 0.7479 0.8634 1.3312 1.0687 0.7434 1.1152 1.7924 0.2122 0.9967 0.4103 0.9546 0.6665 0.796 0.4359 
## Final   Estimates:  41.70278 18.99642 -13.13093 -15.6504 -0.02193786 0.5713008 0.1665744 0.1440553 -0.4481852 0.8784078 -0.1406118 0.4809763 0.306192 0.3019598 0.4310889 0.1657416 0.3583899 -0.001189136 0.4309593 0.02587871 -0.1905771 -0.3000775 -0.6035617 -0.04213844 -0.1126744 -0.3624914 -0.1976869 -0.5627694 0.1833631 -0.6249706 0.01624648 -0.05069248 0.1641076 -0.1805707 -0.3844378 0.4358505
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)   
## depressedmood_state           41.702780         NaN      NaN      NaN   
## loneliness_state_pmc          18.996416         NaN      NaN      NaN   
## socintsatisfaction_state_pmc -13.130930         NaN      NaN      NaN   
## responsiveness_state_pmc     -15.650398         NaN      NaN      NaN   
## depressedmood_state           -0.021938         NaN      NaN      NaN   
## loneliness_state_pmc           0.571301         NaN      NaN      NaN   
## socintsatisfaction_state_pmc   0.166574         NaN      NaN      NaN   
## responsiveness_state_pmc       0.144055         NaN      NaN      NaN   
## depressedmood_state           -0.448185         NaN      NaN      NaN   
## loneliness_state_pmc           0.878408    0.294468    2.983  0.00285 **
## socintsatisfaction_state_pmc  -0.140612         NaN      NaN      NaN   
## responsiveness_state_pmc       0.480976         NaN      NaN      NaN   
## depressedmood_state            0.306192         NaN      NaN      NaN   
## loneliness_state_pmc           0.301960         NaN      NaN      NaN   
## socintsatisfaction_state_pmc   0.431089    0.226818    1.901  0.05736 . 
## responsiveness_state_pmc       0.165742    0.122519    1.353  0.17612   
## depressedmood_state            0.358390         NaN      NaN      NaN   
## loneliness_state_pmc          -0.001189    0.169408   -0.007  0.99440   
## socintsatisfaction_state_pmc   0.430959         NaN      NaN      NaN   
## responsiveness_state_pmc       0.025879         NaN      NaN      NaN   
##                               -0.190577         NaN      NaN      NaN   
##                               -0.300077    0.119271   -2.516  0.01187 * 
##                               -0.603562         NaN      NaN      NaN   
##                               -0.042138         NaN      NaN      NaN   
##                               -0.112674         NaN      NaN      NaN   
##                               -0.362491    0.340140   -1.066  0.28655   
##                               -0.197687         NaN      NaN      NaN   
##                               -0.562769         NaN      NaN      NaN   
##                                0.183363         NaN      NaN      NaN   
##                               -0.624971         NaN      NaN      NaN   
##                                0.016246    0.195294    0.083  0.93370   
##                               -0.050692    0.070028   -0.724  0.46913   
##                                0.164108         NaN      NaN      NaN   
##                               -0.180571    0.227064   -0.795  0.42647   
##                               -0.384438         NaN      NaN      NaN   
##                                0.435850         NaN      NaN      NaN   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  41.70278 18.99642 -13.13093 -15.6504 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]     [,2]   [,3]   [,4]
## [1,] -0.0219  0.57130  0.167 0.1441
## [2,] -0.4482  0.87841 -0.141 0.4810
## [3,]  0.3062  0.30196  0.431 0.1657
## [4,]  0.3584 -0.00119  0.431 0.0259
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]  [,2]    [,3]    [,4]
## [1,]  0.191 0.300  0.6036  0.0421
## [2,]  0.113 0.362  0.1977  0.5628
## [3,] -0.183 0.625 -0.0162  0.0507
## [4,] -0.164 0.181  0.3844 -0.4359
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  235.4311  187.2299 -133.7988 -102.6135
## [2,]  187.2299  300.7867 -122.8270 -118.5761
## [3,] -133.7988 -122.8270  316.3614  194.5059
## [4,] -102.6135 -118.5761  194.5059  278.4696
## ---- 
## aic=  22.00823 
## bic=  23.1646 
## Number of parameters:  36 
## initial estimates:  37.2469 5.7558 -9.7562 -8.5539 -0.0384 0.0808 -0.5584 0.0776 -0.1392 0.3466 -0.3566 -0.054 0.2185 0.0096 0.4222 0.3896 0.2307 0.0858 0.1496 0.6866 -0.5244 -0.0651 0.1418 -0.7753 -0.2289 -0.2052 0.1393 -0.2219 -0.6483 0.1433 -0.4519 0.316 -0.1854 -0.1853 -0.5049 0.0082 
## Par. lower-bounds:  22.2312 -11.8043 -25.2982 -20.2942 -0.4451 -0.2593 -0.9422 -0.2741 -0.6148 -0.0512 -0.8053 -0.4652 -0.2025 -0.3425 0.025 0.0256 -0.0873 -0.1801 -0.1504 0.4117 -1.4928 -1.0112 -0.8195 -1.626 -1.3615 -1.3117 -0.9849 -1.2167 -1.6506 -0.836 -1.447 -0.5645 -0.9426 -0.9251 -1.2565 -0.6569 
## Par. upper-bounds:  52.2626 23.316 5.7858 3.1863 0.3683 0.4209 -0.1747 0.4292 0.3364 0.7443 0.0922 0.3573 0.6394 0.3616 0.8193 0.7535 0.5487 0.3517 0.4497 0.9616 0.444 0.8811 1.1031 0.0754 0.9036 0.9013 1.2635 0.773 0.3541 1.1226 0.5431 1.1965 0.5718 0.5544 0.2468 0.6734 
## Final   Estimates:  37.24012 5.749857 -9.769388 -8.5412 -0.06512754 0.2560191 -0.7953039 0.2558798 -0.1695282 0.6070111 -0.2587442 0.06064736 0.2466209 0.004557027 0.5079335 0.1994397 0.2674551 0.2630796 0.4487839 0.6717378 -0.4702953 -0.2072466 0.2716862 -0.4800826 -0.2612542 -0.3067418 -0.02764235 -0.2579503 -0.3190129 0.07683981 -0.2484156 0.1345453 -0.3438854 -0.2347915 -0.462581 -0.3405829
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          37.240123    5.728421    6.501 7.98e-11 ***
## loneliness_state_pmc          5.749857    6.299981    0.913  0.36141    
## socintsatisfaction_state_pmc -9.769388   29.974891   -0.326  0.74449    
## responsiveness_state_pmc     -8.541200   10.871757   -0.786  0.43208    
## depressedmood_state          -0.065128    0.158002   -0.412  0.68020    
## loneliness_state_pmc          0.256019    0.324460    0.789  0.43008    
## socintsatisfaction_state_pmc -0.795304    0.139106   -5.717 1.08e-08 ***
## responsiveness_state_pmc      0.255880    0.569488    0.449  0.65320    
## depressedmood_state          -0.169528    0.170771   -0.993  0.32085    
## loneliness_state_pmc          0.607011    0.223711    2.713  0.00666 ** 
## socintsatisfaction_state_pmc -0.258744    1.249785   -0.207  0.83599    
## responsiveness_state_pmc      0.060647    0.535760    0.113  0.90987    
## depressedmood_state           0.246621    0.768174    0.321  0.74817    
## loneliness_state_pmc          0.004557    0.377092    0.012  0.99036    
## socintsatisfaction_state_pmc  0.507934    0.156366    3.248  0.00116 ** 
## responsiveness_state_pmc      0.199440    0.383483    0.520  0.60301    
## depressedmood_state           0.267455    0.252868    1.058  0.29020    
## loneliness_state_pmc          0.263080    0.251638    1.045  0.29581    
## socintsatisfaction_state_pmc  0.448784    0.222605    2.016  0.04379 *  
## responsiveness_state_pmc      0.671738    0.575994    1.166  0.24352    
##                              -0.470295    0.360503   -1.305  0.19205    
##                              -0.207247    0.528760   -0.392  0.69510    
##                               0.271686    0.227763    1.193  0.23293    
##                              -0.480083    0.609901   -0.787  0.43120    
##                              -0.261254    0.454909   -0.574  0.56576    
##                              -0.306742    0.183225   -1.674  0.09411 .  
##                              -0.027642    1.209043   -0.023  0.98176    
##                              -0.257950    0.524710   -0.492  0.62300    
##                              -0.319013    0.570869   -0.559  0.57628    
##                               0.076840    0.326171    0.236  0.81376    
##                              -0.248416         NaN      NaN      NaN    
##                               0.134545    0.526938    0.255  0.79847    
##                              -0.343885    0.162991   -2.110  0.03487 *  
##                              -0.234791    0.460366   -0.510  0.61004    
##                              -0.462581         NaN      NaN      NaN    
##                              -0.340583    1.302700   -0.261  0.79375    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  37.24012 5.749857 -9.769388 -8.5412 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]   [,3]   [,4]
## [1,] -0.0651 0.25602 -0.795 0.2559
## [2,] -0.1695 0.60701 -0.259 0.0606
## [3,]  0.2466 0.00456  0.508 0.1994
## [4,]  0.2675 0.26308  0.449 0.6717
## MA coefficient matrix 
## MA( 1 )-matrix 
##       [,1]    [,2]    [,3]   [,4]
## [1,] 0.470  0.2072 -0.2717  0.480
## [2,] 0.261  0.3067  0.0276  0.258
## [3,] 0.319 -0.0768  0.2484 -0.135
## [4,] 0.344  0.2348  0.4626  0.341
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  351.2225  305.3421 -283.8634 -107.1711
## [2,]  305.3421  479.1564 -314.3049 -159.9814
## [3,] -283.8634 -314.3049  446.7201  191.2717
## [4,] -107.1711 -159.9814  191.2717  248.1548
## ---- 
## aic=  22.60107 
## bic=  23.75744 
## Number of parameters:  36 
## initial estimates:  31.7998 4.0714 0.284 -0.8081 -0.033 0.4004 -1.3545 -4e-04 -0.1284 0.3703 -0.7588 0.3051 0.0046 -0.1583 0.3777 -0.048 0.0124 0.053 0.158 0.269 0.2208 -1.0346 0.7546 -1.1296 -0.8566 -0.1165 1.1509 -1.6068 -0.1764 0.3626 -0.1513 0.3259 0.5818 -0.5989 -0.5847 0.7961 
## Par. lower-bounds:  20.724 -5.9576 -5.1214 -7.5261 -0.3713 -0.0152 -2.0663 -0.4401 -0.4347 -0.006 -1.4034 -0.0931 -0.1605 -0.3611 0.0303 -0.2626 -0.1928 -0.199 -0.2737 0.0023 -0.7192 -1.9126 -0.4362 -2.3992 -1.7078 -0.9114 0.0727 -2.7564 -0.6352 -0.0659 -0.7324 -0.2937 0.0117 -1.1314 -1.307 0.026 
## Par. upper-bounds:  42.8757 14.1004 5.6894 5.9099 0.3053 0.8159 -0.6427 0.4394 0.178 0.7466 -0.1143 0.7032 0.1697 0.0445 0.7251 0.1666 0.2176 0.3051 0.5898 0.5357 1.1608 -0.1567 1.9453 0.14 -0.0055 0.6785 2.2291 -0.4572 0.2823 0.791 0.4298 0.9455 1.152 -0.0663 0.1375 1.5662 
## Final   Estimates:  31.79982 4.071399 0.2840102 -0.808106 -0.03304098 0.4003625 -1.354478 -0.0003684454 -0.128355 0.3703025 -0.7588355 0.305063 0.00456708 -0.1582595 0.3776748 -0.04798102 0.0123819 0.05303387 0.1580411 0.2689776 0.2208027 -1.034629 0.7545679 -1.129642 -0.8566411 -0.1164836 1.15091 -1.606825 -0.1764385 0.3625707 -0.1512717 0.3258783 0.5818454 -0.5988525 -0.5847337 0.7960916 
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)
## depressedmood_state          31.7998232         NaN      NaN      NaN
## loneliness_state_pmc          4.0713986         NaN      NaN      NaN
## socintsatisfaction_state_pmc  0.2840102         NaN      NaN      NaN
## responsiveness_state_pmc     -0.8081060         NaN      NaN      NaN
## depressedmood_state          -0.0330410         NaN      NaN      NaN
## loneliness_state_pmc          0.4003625         NaN      NaN      NaN
## socintsatisfaction_state_pmc -1.3544777         NaN      NaN      NaN
## responsiveness_state_pmc     -0.0003684         NaN      NaN      NaN
## depressedmood_state          -0.1283550         NaN      NaN      NaN
## loneliness_state_pmc          0.3703025         NaN      NaN      NaN
## socintsatisfaction_state_pmc -0.7588355         NaN      NaN      NaN
## responsiveness_state_pmc      0.3050630         NaN      NaN      NaN
## depressedmood_state           0.0045671         NaN      NaN      NaN
## loneliness_state_pmc         -0.1582595         NaN      NaN      NaN
## socintsatisfaction_state_pmc  0.3776748         NaN      NaN      NaN
## responsiveness_state_pmc     -0.0479810         NaN      NaN      NaN
## depressedmood_state           0.0123819         NaN      NaN      NaN
## loneliness_state_pmc          0.0530339         NaN      NaN      NaN
## socintsatisfaction_state_pmc  0.1580411         NaN      NaN      NaN
## responsiveness_state_pmc      0.2689776         NaN      NaN      NaN
##                               0.2208027         NaN      NaN      NaN
##                              -1.0346286         NaN      NaN      NaN
##                               0.7545679         NaN      NaN      NaN
##                              -1.1296421         NaN      NaN      NaN
##                              -0.8566411         NaN      NaN      NaN
##                              -0.1164836         NaN      NaN      NaN
##                               1.1509102         NaN      NaN      NaN
##                              -1.6068253         NaN      NaN      NaN
##                              -0.1764385         NaN      NaN      NaN
##                               0.3625707         NaN      NaN      NaN
##                              -0.1512717         NaN      NaN      NaN
##                               0.3258783         NaN      NaN      NaN
##                               0.5818454         NaN      NaN      NaN
##                              -0.5988525         NaN      NaN      NaN
##                              -0.5847337         NaN      NaN      NaN
##                               0.7960916         NaN      NaN      NaN
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  31.79982 4.071399 0.2840102 -0.808106 
## AR coefficient matrix 
## AR( 1 )-matrix 
##          [,1]   [,2]   [,3]      [,4]
## [1,] -0.03304  0.400 -1.354 -0.000368
## [2,] -0.12835  0.370 -0.759  0.305063
## [3,]  0.00457 -0.158  0.378 -0.047981
## [4,]  0.01238  0.053  0.158  0.268978
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]   [,3]   [,4]
## [1,] -0.221  1.035 -0.755  1.130
## [2,]  0.857  0.116 -1.151  1.607
## [3,]  0.176 -0.363  0.151 -0.326
## [4,] -0.582  0.599  0.585 -0.796
##   
## Residuals cov-matrix: 
##               [,1]          [,2]          [,3]          [,4]
## [1,]  1.393880e+18  2.482184e+19  6.503044e+17 -2.375917e+19
## [2,]  2.482184e+19  4.420207e+20  1.158045e+19 -4.230970e+20
## [3,]  6.503044e+17  1.158045e+19  3.033948e+17 -1.108467e+19
## [4,] -2.375917e+19 -4.230970e+20 -1.108467e+19  4.049834e+20
## Warning in log(dd): NaNs produced
## ---- 
## aic=  NaN 
## bic=  NaN 
## Number of parameters:  36 
## initial estimates:  12.8455 -17.8527 19.0854 16.6147 0.4813 -0.3197 -0.1596 -0.2329 0.56 -0.4823 -0.2334 -0.0317 -0.6133 0.3398 0.6163 -0.2927 -0.5031 0.4082 0.4518 -0.1831 -0.3169 0.3902 0.052 0.5437 -0.4611 0.0564 -0.1473 0.2437 0.4357 -0.8835 -0.5431 0.8438 0.7998 -0.4718 -0.145 0.1173 
## Par. lower-bounds:  3.4867 -25.1643 8.8204 8.2821 0.1598 -0.7551 -0.4705 -0.6588 0.3089 -0.8225 -0.4763 -0.3644 -0.9659 -0.1378 0.2753 -0.7598 -0.7894 0.0205 0.175 -0.5623 -0.9688 -0.4789 -0.5287 -0.2171 -0.9704 -0.6226 -0.6009 -0.3507 -0.2793 -1.8368 -1.18 0.0093 0.2194 -1.2457 -0.662 -0.5601 
## Par. upper-bounds:  22.2044 -10.5411 29.3503 24.9472 0.8028 0.1158 0.1514 0.1929 0.8112 -0.1421 0.0096 0.301 -0.2607 0.8174 0.9574 0.1743 -0.2169 0.7959 0.7287 0.196 0.335 1.2594 0.6327 1.3046 0.0482 0.7355 0.3064 0.8381 1.1507 0.0698 0.0939 1.6783 1.3802 0.302 0.372 0.7948 
## Final   Estimates:  12.69715 -17.96753 19.03915 16.56366 0.5370763 -0.7551283 -0.2357787 -0.6587953 0.6438054 -0.793323 -0.2216342 -0.3644091 -0.6478718 0.08820428 0.2752897 0.05661592 -0.5559374 0.02046897 0.7286669 -0.5599686 0.0001229756 0.9853159 0.2534413 0.7829379 -0.2581701 0.6004173 0.1432373 0.364778 0.4952995 0.06984101 0.06805421 0.1570485 0.3675128 0.04128469 -0.5903818 0.5686842
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           12.697155    3.815615    3.328 0.000876 ***
## loneliness_state_pmc         -17.967534    7.533496   -2.385 0.017078 *  
## socintsatisfaction_state_pmc  19.039152   13.709851    1.389 0.164918    
## responsiveness_state_pmc      16.563662   12.802968    1.294 0.195757    
## depressedmood_state            0.537076    0.120129    4.471 7.79e-06 ***
## loneliness_state_pmc          -0.755128    0.547359   -1.380 0.167715    
## socintsatisfaction_state_pmc  -0.235779    0.502184   -0.470 0.638708    
## responsiveness_state_pmc      -0.658795    0.595740   -1.106 0.268795    
## depressedmood_state            0.643805    0.262218    2.455 0.014079 *  
## loneliness_state_pmc          -0.793323    0.675166   -1.175 0.239993    
## socintsatisfaction_state_pmc  -0.221634    0.317928   -0.697 0.485727    
## responsiveness_state_pmc      -0.364409    0.336227   -1.084 0.278445    
## depressedmood_state           -0.647872    0.473171   -1.369 0.170933    
## loneliness_state_pmc           0.088204    0.466045    0.189 0.849888    
## socintsatisfaction_state_pmc   0.275290    0.428853    0.642 0.520925    
## responsiveness_state_pmc       0.056616    0.521487    0.109 0.913546    
## depressedmood_state           -0.555937    0.453549   -1.226 0.220293    
## loneliness_state_pmc           0.020469    0.642573    0.032 0.974588    
## socintsatisfaction_state_pmc   0.728667    0.301853    2.414 0.015779 *  
## responsiveness_state_pmc      -0.559969    0.369457   -1.516 0.129607    
##                                0.000123         NaN      NaN      NaN    
##                                0.985316    0.570718    1.726 0.084266 .  
##                                0.253441    0.522028    0.485 0.627326    
##                                0.782938    0.708264    1.105 0.268973    
##                               -0.258170    0.253523   -1.018 0.308522    
##                                0.600417    0.637457    0.942 0.346247    
##                                0.143237    0.285232    0.502 0.615543    
##                                0.364778    0.252801    1.443 0.149035    
##                                0.495300    0.452536    1.094 0.273737    
##                                0.069841    0.518178    0.135 0.892784    
##                                0.068054    0.431934    0.158 0.874806    
##                                0.157049    0.506508    0.310 0.756514    
##                                0.367513    0.359510    1.022 0.306658    
##                                0.041285    0.653771    0.063 0.949648    
##                               -0.590382    0.277374   -2.128 0.033298 *  
##                                0.568684    0.294086    1.934 0.053146 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  12.69715 -17.96753 19.03915 16.56366 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]   [,3]    [,4]
## [1,]  0.537 -0.7551 -0.236 -0.6588
## [2,]  0.644 -0.7933 -0.222 -0.3644
## [3,] -0.648  0.0882  0.275  0.0566
## [4,] -0.556  0.0205  0.729 -0.5600
## MA coefficient matrix 
## MA( 1 )-matrix 
##           [,1]    [,2]    [,3]   [,4]
## [1,] -0.000123 -0.9853 -0.2534 -0.783
## [2,]  0.258170 -0.6004 -0.1432 -0.365
## [3,] -0.495300 -0.0698 -0.0681 -0.157
## [4,] -0.367513 -0.0413  0.5904 -0.569
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 102.57808  39.92010 -26.39325 -50.58404
## [2,]  39.92010 120.09119 -84.44747 -61.44507
## [3,] -26.39325 -84.44747 210.31236  74.28815
## [4,] -50.58404 -61.44507  74.28815 108.65101
## ---- 
## aic=  19.42635 
## bic=  20.58272 
## Number of parameters:  36 
## initial estimates:  27.809 -13.9699 18.3846 14.6117 0.5492 -0.0344 -0.1247 0.0393 0.2355 0.2332 -0.2446 0.2386 -0.327 -0.0434 0.4441 -0.1955 -0.2411 -0.0979 0.0965 0.3917 -0.713 0.6926 -0.3215 0.8556 -0.0579 -0.0617 0.2296 -0.2764 -0.0315 0.271 0.0166 0.4065 -0.1599 0.4855 -0.0719 0.5287 
## Par. lower-bounds:  5.3608 -36.1082 -12.5669 -8.1786 0.1838 -0.4181 -0.377 -0.25 -0.1248 -0.1452 -0.4934 -0.0467 -0.8308 -0.5724 0.0962 -0.5944 -0.6121 -0.4874 -0.1596 0.0979 -1.8402 -0.4102 -0.9816 -0.4503 -1.1695 -1.1492 -0.4214 -1.5643 -1.5856 -1.2494 -0.8935 -1.3941 -1.3043 -0.634 -0.7421 -0.7971 
## Par. upper-bounds:  50.2573 8.1683 49.3361 37.4019 0.9146 0.3493 0.1276 0.3286 0.5959 0.6116 0.0041 0.5239 0.1768 0.4856 0.7919 0.2034 0.1298 0.2916 0.3526 0.6854 0.4142 1.7953 0.3386 2.1615 1.0537 1.0258 0.8806 1.0115 1.5227 1.7914 0.9268 2.2071 0.9844 1.6051 0.5982 1.8545 
## Final   Estimates:  27.78435 -14.06008 18.40102 14.57569 0.5392386 0.1632895 -0.1324323 0.07466259 0.2466639 0.2343702 -0.2145341 0.1285936 -0.2896881 -0.572419 0.09624081 -0.4001472 -0.2171451 -0.4045531 0.1240544 0.0979353 -0.05528615 -0.2406265 -0.03545921 0.007087873 -0.05210054 -0.06241022 0.01082998 0.1452063 -0.03473222 0.8056468 0.5468204 0.4856943 -0.0377102 0.5569553 -0.0863806 0.6006896 
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)   
## depressedmood_state           27.784351   43.355466    0.641  0.52162   
## loneliness_state_pmc         -14.060079   32.790904   -0.429  0.66808   
## socintsatisfaction_state_pmc  18.401017   28.072796    0.655  0.51216   
## responsiveness_state_pmc      14.575692   24.096110    0.605  0.54525   
## depressedmood_state            0.539239    0.726099    0.743  0.45769   
## loneliness_state_pmc           0.163290    0.750878    0.217  0.82785   
## socintsatisfaction_state_pmc  -0.132432    0.272309   -0.486  0.62673   
## responsiveness_state_pmc       0.074663    0.366136    0.204  0.83842   
## depressedmood_state            0.246664    0.552873    0.446  0.65549   
## loneliness_state_pmc           0.234370    0.868919    0.270  0.78737   
## socintsatisfaction_state_pmc  -0.214534    0.242149   -0.886  0.37564   
## responsiveness_state_pmc       0.128594    0.287259    0.448  0.65440   
## depressedmood_state           -0.289688    0.471024   -0.615  0.53854   
## loneliness_state_pmc          -0.572419    0.391368   -1.463  0.14357   
## socintsatisfaction_state_pmc   0.096241    0.251094    0.383  0.70151   
## responsiveness_state_pmc      -0.400147    0.228716   -1.750  0.08020 . 
## depressedmood_state           -0.217145    0.405513   -0.535  0.59232   
## loneliness_state_pmc          -0.404553    0.444023   -0.911  0.36224   
## socintsatisfaction_state_pmc   0.124054    0.195579    0.634  0.52589   
## responsiveness_state_pmc       0.097935    0.226322    0.433  0.66521   
##                               -0.055286    0.771123   -0.072  0.94284   
##                               -0.240627    0.779238   -0.309  0.75748   
##                               -0.035459    0.374646   -0.095  0.92460   
##                                0.007088    0.505714    0.014  0.98882   
##                               -0.052101    0.705595   -0.074  0.94114   
##                               -0.062410    0.989772   -0.063  0.94972   
##                                0.010830    0.284023    0.038  0.96958   
##                                0.145206    0.406166    0.358  0.72071   
##                               -0.034732    0.518017   -0.067  0.94654   
##                                0.805647    0.442012    1.823  0.06835 . 
##                                0.546820    0.232336    2.354  0.01859 * 
##                                0.485694    0.184933    2.626  0.00863 **
##                               -0.037710    0.416140   -0.091  0.92780   
##                                0.556955    0.457140    1.218  0.22309   
##                               -0.086381    0.177162   -0.488  0.62585   
##                                0.600690    0.231644    2.593  0.00951 **
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  27.78435 -14.06008 18.40102 14.57569 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]    [,3]    [,4]
## [1,]  0.539  0.163 -0.1324  0.0747
## [2,]  0.247  0.234 -0.2145  0.1286
## [3,] -0.290 -0.572  0.0962 -0.4001
## [4,] -0.217 -0.405  0.1241  0.0979
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]    [,2]    [,3]     [,4]
## [1,] 0.0553  0.2406  0.0355 -0.00709
## [2,] 0.0521  0.0624 -0.0108 -0.14521
## [3,] 0.0347 -0.8056 -0.5468 -0.48569
## [4,] 0.0377 -0.5570  0.0864 -0.60069
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 262.98384 152.13099 -80.38245 -50.37110
## [2,] 152.13099 231.88033 -70.42164 -70.39518
## [3,] -80.38245 -70.42164 358.35168 174.62804
## [4,] -50.37110 -70.39518 174.62804 230.47663
## ---- 
## aic=  22.29972 
## bic=  23.45608 
## Number of parameters:  36 
## initial estimates:  42.9385 9.7964 -5.3762 -7.8291 0.1478 0.2483 -0.0957 -0.2003 -0.1699 0.2406 -0.1248 -0.2934 0.1011 -0.0837 0.3652 -0.0091 0.159 -0.1238 0.007 0.2914 -0.4878 -0.7477 -0.7611 0.4404 0.1562 -0.559 -0.2651 0.0362 0.2672 0.2046 0.2229 0.2054 0.2948 -0.3695 -0.2697 0.545 
## Par. lower-bounds:  23.4496 -6.7197 -23.9415 -17.9637 -0.2388 -0.1252 -0.4488 -0.6813 -0.4974 -0.076 -0.4242 -0.701 -0.2671 -0.4395 0.0287 -0.4673 -0.042 -0.318 -0.1766 0.0412 -1.2984 -1.987 -1.7754 -0.7635 -0.5308 -1.6092 -1.1248 -0.984 -0.505 -0.9759 -0.7434 -0.9414 -0.1268 -1.0139 -0.7972 -0.081 
## Par. upper-bounds:  62.4274 26.3126 13.1891 2.3056 0.5343 0.6218 0.2575 0.2807 0.1577 0.5571 0.1745 0.1143 0.4693 0.2722 0.7016 0.4491 0.36 0.0705 0.1907 0.5415 0.3229 0.4916 0.2533 1.6442 0.8432 0.4912 0.5945 1.0564 1.0395 1.3852 1.1892 1.3521 0.7163 0.275 0.2578 1.171 
## Final   Estimates:  43.11998 9.009901 -5.919664 -7.341611 0.1180585 0.07951282 0.257521 -0.2205904 -0.1796067 0.5026884 0.1744667 -0.7010003 0.1366264 -0.4395085 0.2205995 -0.4673473 0.1516466 0.07045438 0.1906915 0.410621 -0.1015713 0.1892729 -0.609357 0.2441134 -0.001997039 -0.1249318 -0.3540848 0.7948385 -0.02275244 0.4597765 0.2566046 0.4620234 -0.1147804 -0.1340776 -0.3620257 -0.0750199
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)  
## depressedmood_state          43.119980         NaN      NaN      NaN  
## loneliness_state_pmc          9.009901   14.362463    0.627   0.5304  
## socintsatisfaction_state_pmc -5.919664   21.867483   -0.271   0.7866  
## responsiveness_state_pmc     -7.341611         NaN      NaN      NaN  
## depressedmood_state           0.118059         NaN      NaN      NaN  
## loneliness_state_pmc          0.079513    0.937296    0.085   0.9324  
## socintsatisfaction_state_pmc  0.257521    0.326737    0.788   0.4306  
## responsiveness_state_pmc     -0.220590    0.844565   -0.261   0.7939  
## depressedmood_state          -0.179607    0.287123   -0.626   0.5316  
## loneliness_state_pmc          0.502688    0.304862    1.649   0.0992 .
## socintsatisfaction_state_pmc  0.174467    0.665749    0.262   0.7933  
## responsiveness_state_pmc     -0.701000    0.346782   -2.021   0.0432 *
## depressedmood_state           0.136626    0.451386    0.303   0.7621  
## loneliness_state_pmc         -0.439508    1.163450   -0.378   0.7056  
## socintsatisfaction_state_pmc  0.220600    0.354859    0.622   0.5342  
## responsiveness_state_pmc     -0.467347    0.530240   -0.881   0.3781  
## depressedmood_state           0.151647         NaN      NaN      NaN  
## loneliness_state_pmc          0.070454    0.169136    0.417   0.6770  
## socintsatisfaction_state_pmc  0.190691    0.172676    1.104   0.2694  
## responsiveness_state_pmc      0.410621    0.309025    1.329   0.1839  
##                              -0.101571         NaN      NaN      NaN  
##                               0.189273    0.877357    0.216   0.8292  
##                              -0.609357    0.355322   -1.715   0.0864 .
##                               0.244113    0.855309    0.285   0.7753  
##                              -0.001997    0.538326   -0.004   0.9970  
##                              -0.124932    0.304450   -0.410   0.6815  
##                              -0.354085    0.950212   -0.373   0.7094  
##                               0.794839         NaN      NaN      NaN  
##                              -0.022752    0.244036   -0.093   0.9257  
##                               0.459777    1.112177    0.413   0.6793  
##                               0.256605    0.290191    0.884   0.3766  
##                               0.462023    0.456280    1.013   0.3113  
##                              -0.114780    0.203267   -0.565   0.5723  
##                              -0.134078         NaN      NaN      NaN  
##                              -0.362026    0.230079   -1.573   0.1156  
##                              -0.075020    0.359923   -0.208   0.8349  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  43.11998 9.009901 -5.919664 -7.341611 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]  [,3]   [,4]
## [1,]  0.118  0.0795 0.258 -0.221
## [2,] -0.180  0.5027 0.174 -0.701
## [3,]  0.137 -0.4395 0.221 -0.467
## [4,]  0.152  0.0705 0.191  0.411
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]   [,2]   [,3]   [,4]
## [1,] 0.1016 -0.189  0.609 -0.244
## [2,] 0.0020  0.125  0.354 -0.795
## [3,] 0.0228 -0.460 -0.257 -0.462
## [4,] 0.1148  0.134  0.362  0.075
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 137.30106  66.98805 -68.48591 -29.52783
## [2,]  66.98805 102.00683 -36.26238 -17.83925
## [3,] -68.48591 -36.26238  95.99717  32.65627
## [4,] -29.52783 -17.83925  32.65627  44.65696
## ---- 
## aic=  17.80897 
## bic=  18.96534 
## Number of parameters:  36 
## initial estimates:  29.1272 4.3658 23.6271 12.1882 0.4589 -0.2166 -0.2078 0.1021 -0.0391 -0.0295 -0.2122 -0.0062 -0.4428 -0.2435 0.1882 0.0018 -0.2446 -0.1555 -0.091 0.0534 0.1355 -1.1834 -0.1217 -0.1273 0.5073 -0.5633 0.0618 0.1664 -0.2234 0.9295 -0.1848 -0.2882 -0.1345 0.8619 0.2226 -0.1834 
## Par. lower-bounds:  11.2567 -10.4789 -12.0616 -13.6387 0.1213 -0.6486 -0.4257 -0.166 -0.3195 -0.3884 -0.3932 -0.2289 -1.117 -1.1063 -0.2471 -0.5335 -0.7324 -0.7799 -0.406 -0.3339 -0.647 -2.6729 -0.8622 -0.9176 -0.1427 -1.8007 -0.5533 -0.4901 -1.7861 -2.0452 -1.6636 -1.8666 -1.2653 -1.2909 -0.8476 -1.3256 
## Par. upper-bounds:  46.9978 19.2104 59.3158 38.0151 0.7964 0.2154 0.0101 0.3701 0.2413 0.3293 -0.0312 0.2164 0.2313 0.6192 0.6234 0.5371 0.2433 0.4688 0.2239 0.4408 0.9179 0.3062 0.6187 0.6631 1.1572 0.674 0.6769 0.823 1.3392 3.9043 1.2939 1.2902 0.9963 3.0146 1.2927 0.9589 
## Final   Estimates:  29.11619 4.498029 23.58425 12.23081 0.4493589 -0.2641328 -0.008624153 0.3700939 -0.08400679 0.329327 -0.05116777 -0.2202474 -0.4393215 0.1967041 0.4415758 -0.4942609 -0.2297303 0.3852618 -0.1609698 0.4198773 -0.01894843 0.0800393 -0.1914491 -0.2072815 0.1133653 -0.007175047 -0.07216277 0.2988668 0.06954108 -0.1931812 -0.193147 0.1148187 0.07466996 -0.92136 0.1962008 -0.7118977
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)   
## depressedmood_state          29.116188   19.829972    1.468  0.14202   
## loneliness_state_pmc          4.498029    7.078647    0.635  0.52514   
## socintsatisfaction_state_pmc 23.584248         NaN      NaN      NaN   
## responsiveness_state_pmc     12.230809         NaN      NaN      NaN   
## depressedmood_state           0.449359    0.370225    1.214  0.22485   
## loneliness_state_pmc         -0.264133    0.493316   -0.535  0.59236   
## socintsatisfaction_state_pmc -0.008624    0.271848   -0.032  0.97469   
## responsiveness_state_pmc      0.370094         NaN      NaN      NaN   
## depressedmood_state          -0.084007    0.129976   -0.646  0.51807   
## loneliness_state_pmc          0.329327    0.139646    2.358  0.01836 * 
## socintsatisfaction_state_pmc -0.051168    0.071413   -0.717  0.47368   
## responsiveness_state_pmc     -0.220247    0.081548   -2.701  0.00692 **
## depressedmood_state          -0.439322         NaN      NaN      NaN   
## loneliness_state_pmc          0.196704    0.713836    0.276  0.78289   
## socintsatisfaction_state_pmc  0.441576    0.182596    2.418  0.01559 * 
## responsiveness_state_pmc     -0.494261    0.933585   -0.529  0.59651   
## depressedmood_state          -0.229730         NaN      NaN      NaN   
## loneliness_state_pmc          0.385262    0.799670    0.482  0.62997   
## socintsatisfaction_state_pmc -0.160970    0.128008   -1.258  0.20857   
## responsiveness_state_pmc      0.419877    0.582220    0.721  0.47081   
##                              -0.018948    0.404114   -0.047  0.96260   
##                               0.080039    0.480281    0.167  0.86764   
##                              -0.191449    0.264168   -0.725  0.46862   
##                              -0.207281         NaN      NaN      NaN   
##                               0.113365    0.155732    0.728  0.46664   
##                              -0.007175    0.218004   -0.033  0.97374   
##                              -0.072163         NaN      NaN      NaN   
##                               0.298867         NaN      NaN      NaN   
##                               0.069541    0.269329    0.258  0.79625   
##                              -0.193181    0.459267   -0.421  0.67403   
##                              -0.193147    0.165730   -1.165  0.24384   
##                               0.114819    1.073523    0.107  0.91482   
##                               0.074670         NaN      NaN      NaN   
##                              -0.921360    0.819084   -1.125  0.26065   
##                               0.196201    0.221336    0.886  0.37538   
##                              -0.711898    0.746653   -0.953  0.34036   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  29.11619 4.498029 23.58425 12.23081 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]     [,3]   [,4]
## [1,]  0.449 -0.264 -0.00862  0.370
## [2,] -0.084  0.329 -0.05117 -0.220
## [3,] -0.439  0.197  0.44158 -0.494
## [4,] -0.230  0.385 -0.16097  0.420
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]     [,2]    [,3]   [,4]
## [1,]  0.0189 -0.08004  0.1914  0.207
## [2,] -0.1134  0.00718  0.0722 -0.299
## [3,] -0.0695  0.19318  0.1931 -0.115
## [4,] -0.0747  0.92136 -0.1962  0.712
##   
## Residuals cov-matrix: 
##            [,1]       [,2]      [,3]      [,4]
## [1,]   92.57456   62.96584 -110.8168 -66.75121
## [2,]   62.96584   94.97061 -128.7969 -71.64537
## [3,] -110.81683 -128.79687  413.1783 203.13484
## [4,]  -66.75121  -71.64537  203.1348 191.25868
## ---- 
## aic=  19.4167 
## bic=  20.57307 
## Number of parameters:  36 
## initial estimates:  20.3875 -8.2664 1.5737 -1.5211 0.2112 -0.0917 0.1216 0.0105 0.3851 -0.3389 -0.2712 0.2319 -0.1067 0.0062 0.0029 -0.0271 0.0433 0.2042 0.112 0.2075 -0.5139 0.6289 0.243 -0.6584 -0.1334 -0.5297 -0.0391 -0.8486 0.1433 -0.2023 -0.0177 0.2337 0.669 -0.9407 -0.0864 0.0254 
## Par. lower-bounds:  10.0977 -20.9865 -9.583 -12.9176 -0.1696 -0.3965 -0.1775 -0.2965 -0.0856 -0.7157 -0.6409 -0.1476 -0.5196 -0.3243 -0.3214 -0.36 -0.3784 -0.1334 -0.2193 -0.1325 -1.486 -0.5744 -0.3418 -1.2293 -1.3351 -2.0172 -0.7621 -1.5542 -0.9108 -1.507 -0.6519 -0.3852 -0.4076 -2.2735 -0.7342 -0.6068 
## Par. upper-bounds:  30.6774 4.4538 12.7304 9.8755 0.5919 0.2131 0.4207 0.3175 0.8558 0.0379 0.0985 0.6114 0.3061 0.3366 0.3271 0.3057 0.465 0.5418 0.4432 0.5475 0.4582 1.8323 0.8279 -0.0876 1.0683 0.9579 0.6839 -0.143 1.1973 1.1024 0.6164 0.8526 1.7457 0.392 0.5613 0.6576 
## Final   Estimates:  21.57808 -9.594952 1.912596 -1.091828 0.1216691 -0.396489 -0.1417301 0.3107384 0.4792191 -0.665294 -0.6409189 0.6113556 -0.07630673 -0.3242989 0.3271361 -0.359995 0.04344961 0.1468879 0.4432035 0.5474747 0.1052608 0.36217 0.4244918 -0.5240734 -0.3651792 0.4972335 0.5637105 -0.6805457 -0.2803345 0.5656428 -0.3690486 0.5512597 -0.1002934 -0.01492847 -0.2484019 -0.4581889
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           21.57808     5.10984    4.223 2.41e-05 ***
## loneliness_state_pmc          -9.59495     2.91452   -3.292 0.000994 ***
## socintsatisfaction_state_pmc   1.91260         NaN      NaN      NaN    
## responsiveness_state_pmc      -1.09183     3.59059   -0.304 0.761067    
## depressedmood_state            0.12167     0.20092    0.606 0.544799    
## loneliness_state_pmc          -0.39649     0.15505   -2.557 0.010553 *  
## socintsatisfaction_state_pmc  -0.14173     0.14603   -0.971 0.331777    
## responsiveness_state_pmc       0.31074     0.12873    2.414 0.015781 *  
## depressedmood_state            0.47922     0.09624    4.979 6.38e-07 ***
## loneliness_state_pmc          -0.66529     0.09276   -7.172 7.38e-13 ***
## socintsatisfaction_state_pmc  -0.64092     0.18841   -3.402 0.000670 ***
## responsiveness_state_pmc       0.61136     0.08447    7.238 4.57e-13 ***
## depressedmood_state           -0.07631         NaN      NaN      NaN    
## loneliness_state_pmc          -0.32430     0.31573   -1.027 0.304354    
## socintsatisfaction_state_pmc   0.32714         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.35999     0.29689   -1.213 0.225297    
## depressedmood_state            0.04345     0.14655    0.296 0.766868    
## loneliness_state_pmc           0.14689         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.44320     0.13795    3.213 0.001315 ** 
## responsiveness_state_pmc       0.54747     0.14276    3.835 0.000126 ***
##                                0.10526     0.14478    0.727 0.467190    
##                                0.36217     0.16036    2.258 0.023915 *  
##                                0.42449     0.20769    2.044 0.040969 *  
##                               -0.52407     0.23021   -2.276 0.022818 *  
##                               -0.36518         NaN      NaN      NaN    
##                                0.49723         NaN      NaN      NaN    
##                                0.56371     0.16937    3.328 0.000874 ***
##                               -0.68055     0.10985   -6.195 5.82e-10 ***
##                               -0.28033         NaN      NaN      NaN    
##                                0.56564     0.21828    2.591 0.009561 ** 
##                               -0.36905         NaN      NaN      NaN    
##                                0.55126     0.41187    1.338 0.180758    
##                               -0.10029         NaN      NaN      NaN    
##                               -0.01493         NaN      NaN      NaN    
##                               -0.24840     0.15401   -1.613 0.106775    
##                               -0.45819     0.22408   -2.045 0.040881 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  21.57808 -9.594952 1.912596 -1.091828 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,]  0.1217 -0.396 -0.142  0.311
## [2,]  0.4792 -0.665 -0.641  0.611
## [3,] -0.0763 -0.324  0.327 -0.360
## [4,]  0.0434  0.147  0.443  0.547
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]    [,2]   [,3]   [,4]
## [1,] -0.105 -0.3622 -0.424  0.524
## [2,]  0.365 -0.4972 -0.564  0.681
## [3,]  0.280 -0.5656  0.369 -0.551
## [4,]  0.100  0.0149  0.248  0.458
##   
## Residuals cov-matrix: 
##           [,1]      [,2]       [,3]       [,4]
## [1,] 191.62646  153.6215  -69.87302  -69.39943
## [2,] 153.62154  281.1419 -136.62791 -127.73980
## [3,] -69.87302 -136.6279  270.74314  117.65079
## [4,] -69.39943 -127.7398  117.65079  238.07837
## ---- 
## aic=  21.77086 
## bic=  22.92723 
## Number of parameters:  36 
## initial estimates:  12.4424 -1.2612 1.0345 2.2623 -0.0177 0.0428 -0.2067 0.1429 -0.1865 0.001 -0.0795 -0.0063 0.2155 0.4188 0.5025 0.0326 0.1009 0.3484 0.2653 -0.0155 0.151 -0.2142 0.1624 -0.1087 0.372 -0.1807 -0.0828 0.2235 -0.4716 -0.9695 -0.4806 -0.2153 -0.6095 -0.5291 -0.6876 0.2882 
## Par. lower-bounds:  7.2682 -6.7382 -6.2685 -4.9567 -0.3636 -0.2747 -0.4382 -0.1447 -0.5526 -0.3351 -0.3247 -0.3107 -0.2727 -0.0293 0.1757 -0.3733 -0.3818 -0.0946 -0.0578 -0.4168 -0.5035 -0.8387 -0.3488 -0.5537 -0.3208 -0.8418 -0.6239 -0.2476 -1.3954 -1.851 -1.2022 -0.8434 -1.5226 -1.4005 -1.4009 -0.3327 
## Par. upper-bounds:  17.6166 4.2157 8.3375 9.4814 0.3282 0.3603 0.0249 0.4306 0.1797 0.3371 0.1656 0.2982 0.7037 0.8669 0.8294 0.4386 0.5835 0.7914 0.5884 0.3858 0.8055 0.4104 0.6737 0.3363 1.0648 0.4803 0.4584 0.6945 0.4521 -0.088 0.241 0.4128 0.3037 0.3422 0.0257 0.9091 
## Final   Estimates:  12.47472 -1.289755 0.9441798 2.228137 0.1230803 0.05338962 -0.1305552 -0.1447075 0.1010615 0.3350173 -0.2261211 0.02623818 -0.09560958 0.4226843 0.8275403 0.438604 -0.129364 0.2542604 0.5398497 0.1060842 0.0487864 0.1131145 -0.03941833 0.2590745 0.0256152 -0.1642145 -0.03431062 0.03777498 0.1269768 -0.7394333 -0.8269341 -0.3002931 -0.1006779 -0.2702628 -0.6581458 0.1391922
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)  
## depressedmood_state           12.47472    10.50891    1.187    0.235  
## loneliness_state_pmc          -1.28975     5.77005   -0.224    0.823  
## socintsatisfaction_state_pmc   0.94418     2.76023    0.342    0.732  
## responsiveness_state_pmc       2.22814         NaN      NaN      NaN  
## depressedmood_state            0.12308     0.73517    0.167    0.867  
## loneliness_state_pmc           0.05339     0.74858    0.071    0.943  
## socintsatisfaction_state_pmc  -0.13056     0.18148   -0.719    0.472  
## responsiveness_state_pmc      -0.14471         NaN      NaN      NaN  
## depressedmood_state            0.10106     0.41089    0.246    0.806  
## loneliness_state_pmc           0.33502     0.30138    1.112    0.266  
## socintsatisfaction_state_pmc  -0.22612         NaN      NaN      NaN  
## responsiveness_state_pmc       0.02624         NaN      NaN      NaN  
## depressedmood_state           -0.09561     0.17801   -0.537    0.591  
## loneliness_state_pmc           0.42268     0.27636    1.529    0.126  
## socintsatisfaction_state_pmc   0.82754         NaN      NaN      NaN  
## responsiveness_state_pmc       0.43860         NaN      NaN      NaN  
## depressedmood_state           -0.12936         NaN      NaN      NaN  
## loneliness_state_pmc           0.25426         NaN      NaN      NaN  
## socintsatisfaction_state_pmc   0.53985         NaN      NaN      NaN  
## responsiveness_state_pmc       0.10608         NaN      NaN      NaN  
##                                0.04879     0.73155    0.067    0.947  
##                                0.11311     0.70221    0.161    0.872  
##                               -0.03942         NaN      NaN      NaN  
##                                0.25907         NaN      NaN      NaN  
##                                0.02562     0.46898    0.055    0.956  
##                               -0.16421     0.12864   -1.277    0.202  
##                               -0.03431         NaN      NaN      NaN  
##                                0.03777         NaN      NaN      NaN  
##                                0.12698     0.15150    0.838    0.402  
##                               -0.73943     0.34476   -2.145    0.032 *
##                               -0.82693         NaN      NaN      NaN  
##                               -0.30029         NaN      NaN      NaN  
##                               -0.10068     0.10026   -1.004    0.315  
##                               -0.27026         NaN      NaN      NaN  
##                               -0.65815         NaN      NaN      NaN  
##                                0.13919         NaN      NaN      NaN  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  12.47472 -1.289755 0.9441798 2.228137 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,]  0.1231 0.0534 -0.131 -0.1447
## [2,]  0.1011 0.3350 -0.226  0.0262
## [3,] -0.0956 0.4227  0.828  0.4386
## [4,] -0.1294 0.2543  0.540  0.1061
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,] -0.0488 -0.113 0.0394 -0.2591
## [2,] -0.0256  0.164 0.0343 -0.0378
## [3,] -0.1270  0.739 0.8269  0.3003
## [4,]  0.1007  0.270 0.6581 -0.1392
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  79.12439  49.35474 -43.41572 -34.89307
## [2,]  49.35474 100.80688 -54.66243 -39.19257
## [3,] -43.41572 -54.66243 162.58308  92.88668
## [4,] -34.89307 -39.19257  92.88668 140.35415
## ---- 
## aic=  18.95 
## bic=  20.10637 
## Number of parameters:  36 
## initial estimates:  17.3837 -1.6698 12.0111 6.7224 0.2603 -0.2663 0.0502 -0.173 0.0284 -0.331 -0.0108 -0.1641 -0.4166 0.2643 -0.2684 0.4328 -0.2756 0.3801 -0.0726 0.3381 -0.3156 0.7549 -0.4009 0.5706 0.1547 -0.2625 -0.6297 0.2193 0.389 -0.4702 0.496 -1.0209 0.4437 -0.4691 0.6721 -1.2002 
## Par. lower-bounds:  6.9549 -11.9044 1.1337 -3.0325 -0.1342 -0.6319 -0.3156 -0.4884 -0.3588 -0.6898 -0.3698 -0.4736 -0.8281 -0.1171 -0.65 0.1039 -0.6447 0.0381 -0.4148 0.0432 -1.2464 -0.071 -1.1902 -0.582 -0.7588 -1.073 -1.4044 -0.9119 -0.5819 -1.3317 -0.3273 -2.2232 -0.427 -1.2417 -0.0663 -2.2784 
## Par. upper-bounds:  27.8125 8.5648 22.8885 16.4773 0.6548 0.0993 0.4161 0.1423 0.4156 0.0278 0.3483 0.1453 -0.0051 0.6456 0.1132 0.7617 0.0934 0.7221 0.2696 0.6331 0.6152 1.5809 0.3885 1.7233 1.0682 0.5481 0.1449 1.3505 1.3598 0.3912 1.3193 0.1813 1.3144 0.3035 1.4104 -0.122 
## Final   Estimates:  17.19849 -1.864375 12.07322 5.725176 0.2952453 -0.6319174 -0.01741932 -0.4883647 0.0807741 -0.1808477 -0.2888347 -0.3174367 -0.4682928 0.6456271 -0.176683 0.7616772 -0.1757924 0.557774 0.1461649 0.14937 -0.3236015 0.7757893 -0.06560876 0.5464349 -0.1545143 -0.1528093 0.005041161 0.4395633 0.05933939 -0.5360766 0.06615498 -0.7617059 -0.0387475 -0.2622273 0.08317306 -0.1220099
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)  
## depressedmood_state          17.198493         NaN      NaN      NaN  
## loneliness_state_pmc         -1.864375    2.327081   -0.801   0.4230  
## socintsatisfaction_state_pmc 12.073218         NaN      NaN      NaN  
## responsiveness_state_pmc      5.725176         NaN      NaN      NaN  
## depressedmood_state           0.295245         NaN      NaN      NaN  
## loneliness_state_pmc         -0.631917         NaN      NaN      NaN  
## socintsatisfaction_state_pmc -0.017419    0.332489   -0.052   0.9582  
## responsiveness_state_pmc     -0.488365    0.238672   -2.046   0.0407 *
## depressedmood_state           0.080774    0.084394    0.957   0.3385  
## loneliness_state_pmc         -0.180848    0.327278   -0.553   0.5806  
## socintsatisfaction_state_pmc -0.288835    0.273520   -1.056   0.2910  
## responsiveness_state_pmc     -0.317437    0.444729   -0.714   0.4754  
## depressedmood_state          -0.468293         NaN      NaN      NaN  
## loneliness_state_pmc          0.645627    0.366524    1.761   0.0782 .
## socintsatisfaction_state_pmc -0.176683         NaN      NaN      NaN  
## responsiveness_state_pmc      0.761677         NaN      NaN      NaN  
## depressedmood_state          -0.175792         NaN      NaN      NaN  
## loneliness_state_pmc          0.557774         NaN      NaN      NaN  
## socintsatisfaction_state_pmc  0.146165    0.252931    0.578   0.5633  
## responsiveness_state_pmc      0.149370    0.242407    0.616   0.5378  
##                              -0.323602         NaN      NaN      NaN  
##                               0.775789         NaN      NaN      NaN  
##                              -0.065609    0.360960   -0.182   0.8558  
##                               0.546435         NaN      NaN      NaN  
##                              -0.154514         NaN      NaN      NaN  
##                              -0.152809         NaN      NaN      NaN  
##                               0.005041    0.154831    0.033   0.9740  
##                               0.439563    0.415554    1.058   0.2902  
##                               0.059339         NaN      NaN      NaN  
##                              -0.536077    0.335811   -1.596   0.1104  
##                               0.066155         NaN      NaN      NaN  
##                              -0.761706         NaN      NaN      NaN  
##                              -0.038748         NaN      NaN      NaN  
##                              -0.262227         NaN      NaN      NaN  
##                               0.083173         NaN      NaN      NaN  
##                              -0.122010    0.303763   -0.402   0.6879  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  17.19849 -1.864375 12.07322 5.725176 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,]  0.2952 -0.632 -0.0174 -0.488
## [2,]  0.0808 -0.181 -0.2888 -0.317
## [3,] -0.4683  0.646 -0.1767  0.762
## [4,] -0.1758  0.558  0.1462  0.149
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]     [,3]   [,4]
## [1,]  0.3236 -0.776  0.06561 -0.546
## [2,]  0.1545  0.153 -0.00504 -0.440
## [3,] -0.0593  0.536 -0.06615  0.762
## [4,]  0.0387  0.262 -0.08317  0.122
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  225.7772  149.4923 -120.1269 -108.7248
## [2,]  149.4923  220.1287 -168.1037 -105.1372
## [3,] -120.1269 -168.1037  294.4314  169.6569
## [4,] -108.7248 -105.1372  169.6569  227.5568
## ---- 
## aic=  21.14208 
## bic=  22.29845 
## Number of parameters:  36 
## initial estimates:  6.8944 -23.5593 12.1859 14.8319 0.7628 -0.1277 0.1653 -0.151 0.649 -0.1143 0.0888 0.0671 -0.3801 0.1028 0.0265 0.2355 -0.4586 0.1761 -0.1348 0.2026 -0.7187 0.6355 0.6242 -0.796 -0.2187 -0.2302 0.1158 -0.1149 -0.3325 0.1999 0.1611 -0.6966 -0.0546 -0.0077 0.3884 -0.383 
## Par. lower-bounds:  -7.2978 -36.76 -6.7782 0.6518 0.3544 -0.5817 -0.2012 -0.5695 0.2692 -0.5366 -0.2521 -0.3221 -0.9258 -0.5039 -0.4633 -0.3237 -0.8666 -0.2775 -0.501 -0.2155 -1.7894 -0.6646 -0.2265 -2.0824 -1.2146 -1.4395 -0.6755 -1.3115 -1.7632 -1.5375 -0.9756 -2.4156 -1.1244 -1.3068 -0.4616 -1.6683 
## Par. upper-bounds:  21.0865 -10.3586 31.15 29.0121 1.1711 0.3264 0.5318 0.2674 1.0289 0.308 0.4298 0.4563 0.1655 0.7095 0.5163 0.7946 -0.0506 0.6298 0.2314 0.6207 0.352 1.9357 1.4749 0.4904 0.7772 0.9792 0.907 1.0816 1.0982 1.9372 1.2979 1.0223 1.0151 1.2913 1.2384 0.9023 
## Final   Estimates:  6.895296 -23.60338 12.14728 14.8422 0.8013736 -0.3053613 -0.2001955 -0.1188577 0.6509467 -0.2149983 -0.03461042 0.3464737 -0.3596154 0.1635413 -0.4101712 0.7930185 -0.4230012 -0.06767492 -0.5007642 -0.1258117 0.04559402 0.3206501 0.6457467 0.04132051 -0.154491 0.180215 0.2121057 -0.311982 -0.4438239 -0.06835605 0.2535298 -1.099441 -0.110765 0.2723877 0.6702523 -0.02127012
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state            6.89530     5.23649    1.317 0.187913    
## loneliness_state_pmc         -23.60338         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  12.14728     5.16334    2.353 0.018643 *  
## responsiveness_state_pmc      14.84220     4.63465    3.202 0.001363 ** 
## depressedmood_state            0.80137     0.13669    5.863 4.56e-09 ***
## loneliness_state_pmc          -0.30536     0.36005   -0.848 0.396373    
## socintsatisfaction_state_pmc  -0.20020         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.11886     0.13799   -0.861 0.389030    
## depressedmood_state            0.65095         NaN      NaN      NaN    
## loneliness_state_pmc          -0.21500         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.03461         NaN      NaN      NaN    
## responsiveness_state_pmc       0.34647     0.20108    1.723 0.084875 .  
## depressedmood_state           -0.35962     0.13518   -2.660 0.007806 ** 
## loneliness_state_pmc           0.16354     0.17345    0.943 0.345743    
## socintsatisfaction_state_pmc  -0.41017     0.12181   -3.367 0.000759 ***
## responsiveness_state_pmc       0.79302     0.17577    4.512 6.43e-06 ***
## depressedmood_state           -0.42300     0.12416   -3.407 0.000657 ***
## loneliness_state_pmc          -0.06767         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.50076         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.12581     0.12938   -0.972 0.330840    
##                                0.04559     0.10086    0.452 0.651223    
##                                0.32065     0.24249    1.322 0.186060    
##                                0.64575         NaN      NaN      NaN    
##                                0.04132         NaN      NaN      NaN    
##                               -0.15449         NaN      NaN      NaN    
##                                0.18021         NaN      NaN      NaN    
##                                0.21211         NaN      NaN      NaN    
##                               -0.31198         NaN      NaN      NaN    
##                               -0.44382         NaN      NaN      NaN    
##                               -0.06836         NaN      NaN      NaN    
##                                0.25353     0.07162    3.540 0.000400 ***
##                               -1.09944     0.09785  -11.236  < 2e-16 ***
##                               -0.11077         NaN      NaN      NaN    
##                                0.27239         NaN      NaN      NaN    
##                                0.67025     0.07553    8.874  < 2e-16 ***
##                               -0.02127     0.08062   -0.264 0.791912    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  6.895296 -23.60338 12.14728 14.8422 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]    [,3]   [,4]
## [1,]  0.801 -0.3054 -0.2002 -0.119
## [2,]  0.651 -0.2150 -0.0346  0.346
## [3,] -0.360  0.1635 -0.4102  0.793
## [4,] -0.423 -0.0677 -0.5008 -0.126
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]   [,3]    [,4]
## [1,] -0.0456 -0.3207 -0.646 -0.0413
## [2,]  0.1545 -0.1802 -0.212  0.3120
## [3,]  0.4438  0.0684 -0.254  1.0994
## [4,]  0.1108 -0.2724 -0.670  0.0213
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  197.5672  135.9089 -173.1365 -144.6981
## [2,]  135.9089  160.4841 -154.5058 -110.7775
## [3,] -173.1365 -154.5058  325.8841  196.3536
## [4,] -144.6981 -110.7775  196.3536  201.2634
## ---- 
## aic=  19.77574 
## bic=  20.93211 
## Number of parameters:  36 
## initial estimates:  22.0273 -2.5901 -1.2818 -3.159 0.1742 0.5378 0.1859 0.1144 0.1403 0.3492 0.0916 0.0327 -0.0982 -0.4284 0.1786 -0.4006 0.0777 -0.3664 0.1899 -0.1717 -0.5116 -0.4575 -0.5137 -0.4268 -0.448 -0.5275 -0.2712 -0.5395 1.1084 3e-04 0.0021 0.9803 0.5042 0.2459 0.0543 0.6407 
## Par. lower-bounds:  10.2684 -12.3215 -15.9691 -14.3152 -0.2681 -0.0162 -0.1936 -0.3098 -0.2258 -0.1093 -0.2225 -0.3183 -0.6507 -1.1204 -0.2955 -0.9304 -0.3419 -0.8921 -0.1702 -0.5742 -1.4987 -1.8937 -1.2372 -1.7185 -1.2649 -1.7161 -0.87 -1.6085 -0.1245 -1.7936 -0.9017 -0.6331 -0.4322 -1.1167 -0.6322 -0.5848 
## Par. upper-bounds:  33.7863 7.1413 13.4055 7.9972 0.6165 1.0919 0.5655 0.5385 0.5063 0.8077 0.4057 0.3837 0.4542 0.2636 0.6526 0.1292 0.4973 0.1592 0.55 0.2307 0.4754 0.9788 0.2099 0.865 0.3689 0.6611 0.3276 0.5295 2.3413 1.7942 0.9059 2.5938 1.4407 1.6085 0.7408 1.8663 
## Final   Estimates:  22.07924 -2.602259 -1.182613 -3.066492 0.1558248 1.074255 0.4772468 -0.3097957 0.1063992 0.5983086 -0.2224803 0.2409873 -0.03300168 -0.519648 0.2231493 -0.4850492 0.06615687 -0.1304845 0.5362616 -0.5731968 -0.09136094 -0.6844781 -0.4901536 0.5203491 -0.1545721 -0.3685659 0.1738118 -0.1384212 0.2821737 0.02130276 0.1560785 -0.0118482 0.1671539 -0.3013673 -0.3804741 0.3643807 
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           22.07924     6.53153    3.380 0.000724 ***
## loneliness_state_pmc          -2.60226     9.09087   -0.286 0.774687    
## socintsatisfaction_state_pmc  -1.18261     5.70739   -0.207 0.835848    
## responsiveness_state_pmc      -3.06649    13.80380   -0.222 0.824198    
## depressedmood_state            0.15582     0.23531    0.662 0.507833    
## loneliness_state_pmc           1.07425     0.95184    1.129 0.259063    
## socintsatisfaction_state_pmc   0.47725     0.80771    0.591 0.554613    
## responsiveness_state_pmc      -0.30980     0.83871   -0.369 0.711851    
## depressedmood_state            0.10640     0.35413    0.300 0.763832    
## loneliness_state_pmc           0.59831     0.72252    0.828 0.407619    
## socintsatisfaction_state_pmc  -0.22248     1.05005   -0.212 0.832204    
## responsiveness_state_pmc       0.24099     1.51566    0.159 0.873670    
## depressedmood_state           -0.03300     0.23349   -0.141 0.887601    
## loneliness_state_pmc          -0.51965     1.83955   -0.282 0.777571    
## socintsatisfaction_state_pmc   0.22315     1.10106    0.203 0.839395    
## responsiveness_state_pmc      -0.48505     0.69918   -0.694 0.487844    
## depressedmood_state            0.06616     0.56308    0.117 0.906471    
## loneliness_state_pmc          -0.13048     0.76051   -0.172 0.863772    
## socintsatisfaction_state_pmc   0.53626     0.97277    0.551 0.581447    
## responsiveness_state_pmc      -0.57320     0.40023   -1.432 0.152098    
##                               -0.09136     0.35831   -0.255 0.798738    
##                               -0.68448     1.06359   -0.644 0.519863    
##                               -0.49015     0.93303   -0.525 0.599349    
##                                0.52035     0.88589    0.587 0.556950    
##                               -0.15457     0.40475   -0.382 0.702536    
##                               -0.36857     0.69035   -0.534 0.593425    
##                                0.17381     1.10844    0.157 0.875396    
##                               -0.13842     1.55557   -0.089 0.929095    
##                                0.28217     0.32389    0.871 0.383637    
##                                0.02130     2.09585    0.010 0.991890    
##                                0.15608     1.21219    0.129 0.897550    
##                               -0.01185     0.75944   -0.016 0.987552    
##                                0.16715     0.68559    0.244 0.807377    
##                               -0.30137     0.86401   -0.349 0.727239    
##                               -0.38047     1.15368   -0.330 0.741556    
##                                0.36438     0.50714    0.719 0.472446    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  22.07924 -2.602259 -1.182613 -3.066492 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]   [,3]   [,4]
## [1,]  0.1558  1.074  0.477 -0.310
## [2,]  0.1064  0.598 -0.222  0.241
## [3,] -0.0330 -0.520  0.223 -0.485
## [4,]  0.0662 -0.130  0.536 -0.573
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]   [,3]    [,4]
## [1,]  0.0914  0.6845  0.490 -0.5203
## [2,]  0.1546  0.3686 -0.174  0.1384
## [3,] -0.2822 -0.0213 -0.156  0.0118
## [4,] -0.1672  0.3014  0.380 -0.3644
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  219.9675  148.3578 -192.5708 -136.8691
## [2,]  148.3578  181.2064 -183.4660 -127.8030
## [3,] -192.5708 -183.4660  398.8422  222.3755
## [4,] -136.8691 -127.8030  222.3755  227.0492
## ---- 
## aic=  20.6365 
## bic=  21.79287 
## Number of parameters:  36 
## initial estimates:  35.0103 6.2206 -3.8812 -10.638 0.1123 0.1497 -0.0179 -0.2076 -0.1513 -0.0413 -0.0594 -0.2512 0.2021 0.2034 0.4901 -0.0362 0.2858 0.0322 0.0769 0.2871 -0.2815 0.3394 -0.0012 0.7167 0.0199 0.6233 0.1742 0.1104 -1.1559 -0.3748 -0.5861 0.4113 -0.572 0.2585 0.0581 -0.255 
## Par. lower-bounds:  22.5804 -4.4497 -24.5793 -21.1703 -0.193 -0.2674 -0.1961 -0.63 -0.4134 -0.3994 -0.2124 -0.6139 -0.3063 -0.4911 0.1932 -0.7397 0.0271 -0.3212 -0.0742 -0.0708 -1.028 -0.4083 -0.4466 -0.1803 -0.6209 -0.0185 -0.2082 -0.6595 -2.3989 -1.6199 -1.3278 -1.0823 -1.2045 -0.375 -0.3193 -1.015 
## Par. upper-bounds:  47.4403 16.8908 16.8169 -0.1057 0.4176 0.5668 0.1604 0.2149 0.1108 0.3167 0.0936 0.1114 0.7105 0.898 0.7869 0.6673 0.5444 0.3856 0.228 0.6451 0.465 1.0872 0.4442 1.6136 0.6607 1.2652 0.5565 0.8804 0.0872 0.8703 0.1556 1.9048 0.0605 0.8921 0.4355 0.505 
## Final   Estimates:  35.14822 6.023335 -4.241888 -9.833831 0.05821882 -0.2673554 0.08354625 -0.6300137 -0.1372737 -0.1703271 -0.1430901 0.1114247 0.1560461 0.1086086 0.3768583 0.6672673 0.2383413 -0.2270492 0.04302978 0.01945368 0.03069802 0.6160546 -0.01847631 0.7132003 -0.1762703 0.3808805 0.1808523 -0.3266603 -0.2202075 0.211112 0.1555857 -0.783319 -0.04666177 0.377571 0.05568115 0.2758895
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           35.14822         NaN      NaN      NaN    
## loneliness_state_pmc           6.02333     4.68862    1.285  0.19891    
## socintsatisfaction_state_pmc  -4.24189    11.55092   -0.367  0.71344    
## responsiveness_state_pmc      -9.83383         NaN      NaN      NaN    
## depressedmood_state            0.05822         NaN      NaN      NaN    
## loneliness_state_pmc          -0.26736     0.39851   -0.671  0.50229    
## socintsatisfaction_state_pmc   0.08355     0.16467    0.507  0.61192    
## responsiveness_state_pmc      -0.63001     0.22571   -2.791  0.00525 ** 
## depressedmood_state           -0.13727     0.12548   -1.094  0.27395    
## loneliness_state_pmc          -0.17033     0.37641   -0.453  0.65091    
## socintsatisfaction_state_pmc  -0.14309     0.07417   -1.929  0.05371 .  
## responsiveness_state_pmc       0.11142     0.29604    0.376  0.70663    
## depressedmood_state            0.15605     0.27809    0.561  0.57471    
## loneliness_state_pmc           0.10861         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.37686         NaN      NaN      NaN    
## responsiveness_state_pmc       0.66727     0.46512    1.435  0.15140    
## depressedmood_state            0.23834         NaN      NaN      NaN    
## loneliness_state_pmc          -0.22705         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.04303         NaN      NaN      NaN    
## responsiveness_state_pmc       0.01945     0.14248    0.137  0.89140    
##                                0.03070         NaN      NaN      NaN    
##                                0.61605     0.35185    1.751  0.07996 .  
##                               -0.01848     0.16753   -0.110  0.91218    
##                                0.71320         NaN      NaN      NaN    
##                               -0.17627     0.05910   -2.982  0.00286 ** 
##                                0.38088     0.51642    0.738  0.46079    
##                                0.18085     0.08587    2.106  0.03519 *  
##                               -0.32666     0.29067   -1.124  0.26110    
##                               -0.22021     0.33196   -0.663  0.50710    
##                                0.21111     0.09382    2.250  0.02444 *  
##                                0.15559         NaN      NaN      NaN    
##                               -0.78332     0.64521   -1.214  0.22473    
##                               -0.04666         NaN      NaN      NaN    
##                                0.37757         NaN      NaN      NaN    
##                                0.05568     0.09299    0.599  0.54932    
##                                0.27589     0.04366    6.320 2.62e-10 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  35.14822 6.023335 -4.241888 -9.833831 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]    [,3]    [,4]
## [1,]  0.0582 -0.267  0.0835 -0.6300
## [2,] -0.1373 -0.170 -0.1431  0.1114
## [3,]  0.1560  0.109  0.3769  0.6673
## [4,]  0.2383 -0.227  0.0430  0.0195
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,] -0.0307 -0.616  0.0185 -0.713
## [2,]  0.1763 -0.381 -0.1809  0.327
## [3,]  0.2202 -0.211 -0.1556  0.783
## [4,]  0.0467 -0.378 -0.0557 -0.276
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 168.65045  55.73129 -18.05945 -22.90806
## [2,]  55.73129 116.58455 -80.85629 -49.79125
## [3,] -18.05945 -80.85629 509.09840 121.52166
## [4,] -22.90806 -49.79125 121.52166 138.71620
## ---- 
## aic=  21.46436 
## bic=  22.62073 
## Number of parameters:  36 
## initial estimates:  27.6239 4.1125 -2.3085 -5.6143 0.6695 0.0498 -0.0643 0.0813 -0.0854 0.4732 -0.1236 -0.1156 0.0265 0.1252 1.0462 -0.1524 0.0686 0.0605 0.1915 0.6562 -0.9093 -0.0262 -0.2319 -0.1788 0.1947 -0.6466 0.2131 -1.2762 0.2568 -0.2055 -0.1451 0.5651 -0.0514 -0.1607 0.2334 -0.4512 
## Par. lower-bounds:  9.4411 -39.9712 -27.3014 -24.343 0.4533 -0.0662 -0.2179 -0.1722 -0.6094 0.1919 -0.4959 -0.7301 -0.2706 -0.0343 0.8352 -0.5008 -0.1541 -0.0591 0.0334 0.3951 -1.5496 -0.339 -1.1497 -1.1144 -1.3576 -1.4052 -2.0121 -3.5446 -0.6233 -0.6356 -1.4066 -0.7209 -0.7109 -0.483 -0.712 -1.4149 
## Par. upper-bounds:  45.8066 48.1963 22.6844 13.1145 0.8856 0.1659 0.0892 0.3347 0.4387 0.7546 0.2487 0.4989 0.3237 0.2847 1.2573 0.1959 0.2912 0.18 0.3497 0.9173 -0.269 0.2867 0.686 0.7568 1.747 0.1119 2.4383 0.9921 1.1369 0.2245 1.1165 1.8512 0.6081 0.1615 1.1788 0.5125 
## Final   Estimates:  27.5938 4.120099 -2.286489 -5.659347 0.6716919 0.06388151 -0.05267385 0.09196183 -0.07642925 0.5400227 -0.1215892 -0.03954912 0.02381944 0.244896 1.048514 -0.1322387 0.06313073 0.002726403 0.08163826 0.7945502 -0.3639209 0.002239944 -0.1419146 -0.0669705 0.08129311 -0.3661153 0.2628529 -1.147665 0.1343406 -0.2408893 0.02277157 0.539199 0.01925082 0.04122156 0.2528281 -0.2224117
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          27.593799    6.336928    4.354 1.33e-05 ***
## loneliness_state_pmc          4.120099         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -2.286489         NaN      NaN      NaN    
## responsiveness_state_pmc     -5.659347         NaN      NaN      NaN    
## depressedmood_state           0.671692    0.077201    8.701  < 2e-16 ***
## loneliness_state_pmc          0.063882         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.052674    0.030422   -1.731   0.0834 .  
## responsiveness_state_pmc      0.091962         NaN      NaN      NaN    
## depressedmood_state          -0.076429         NaN      NaN      NaN    
## loneliness_state_pmc          0.540023    0.222422    2.428   0.0152 *  
## socintsatisfaction_state_pmc -0.121589    0.068188   -1.783   0.0746 .  
## responsiveness_state_pmc     -0.039549    0.124789   -0.317   0.7513    
## depressedmood_state           0.023819         NaN      NaN      NaN    
## loneliness_state_pmc          0.244896    0.207982    1.177   0.2390    
## socintsatisfaction_state_pmc  1.048514    0.104308   10.052  < 2e-16 ***
## responsiveness_state_pmc     -0.132239    0.249713   -0.530   0.5964    
## depressedmood_state           0.063131         NaN      NaN      NaN    
## loneliness_state_pmc          0.002726    0.103781    0.026   0.9790    
## socintsatisfaction_state_pmc  0.081638    0.078366    1.042   0.2975    
## responsiveness_state_pmc      0.794550    0.143664    5.531 3.19e-08 ***
##                              -0.363921    0.090459   -4.023 5.74e-05 ***
##                               0.002240         NaN      NaN      NaN    
##                              -0.141915         NaN      NaN      NaN    
##                              -0.066970         NaN      NaN      NaN    
##                               0.081293    0.144226    0.564   0.5730    
##                              -0.366115    0.236441   -1.548   0.1215    
##                               0.262853    0.188402    1.395   0.1630    
##                              -1.147665         NaN      NaN      NaN    
##                               0.134341         NaN      NaN      NaN    
##                              -0.240889    0.209981   -1.147   0.2513    
##                               0.022772    0.213734    0.107   0.9152    
##                               0.539199    0.317929    1.696   0.0899 .  
##                               0.019251         NaN      NaN      NaN    
##                               0.041222    0.119040    0.346   0.7291    
##                               0.252828    0.099205    2.549   0.0108 *  
##                              -0.222412    0.191756   -1.160   0.2461    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  27.5938 4.120099 -2.286489 -5.659347 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]    [,3]    [,4]
## [1,]  0.6717 0.06388 -0.0527  0.0920
## [2,] -0.0764 0.54002 -0.1216 -0.0395
## [3,]  0.0238 0.24490  1.0485 -0.1322
## [4,]  0.0631 0.00273  0.0816  0.7946
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]     [,2]    [,3]   [,4]
## [1,]  0.3639 -0.00224  0.1419  0.067
## [2,] -0.0813  0.36612 -0.2629  1.148
## [3,] -0.1343  0.24089 -0.0228 -0.539
## [4,] -0.0193 -0.04122 -0.2528  0.222
##   
## Residuals cov-matrix: 
##           [,1]       [,2]      [,3]      [,4]
## [1,] 41.091163  21.752900 -3.772892 -5.126754
## [2,] 21.752900 198.485572  1.035508 -7.714672
## [3,] -3.772892   1.035508 49.961509 29.135168
## [4,] -5.126754  -7.714672 29.135168 34.399833
## ---- 
## aic=  16.70921 
## bic=  17.86558 
## Number of parameters:  36 
## initial estimates:  17.6806 6.2266 6.8 -1.0563 -0.1746 0.0517 -0.2135 -0.077 -0.3139 0.4348 -0.1367 -0.2986 -0.2626 -0.1686 0.2802 -0.0142 0.0868 -0.1452 -0.0858 0.6131 0.4121 -0.1703 -0.4992 0.9161 0.4925 -0.1401 -0.1422 1.0278 -0.0856 0.5461 0.4928 -0.746 -0.0311 0.4137 0.4438 -0.9306 
## Par. lower-bounds:  11.9649 -1.0998 -1.2135 -8.4339 -0.513 -0.1851 -0.4649 -0.3352 -0.7476 0.1313 -0.4589 -0.6295 -0.737 -0.5006 -0.0722 -0.3762 -0.35 -0.4509 -0.4103 0.2798 -0.2325 -0.6236 -1.1306 0.0869 -0.3338 -0.7211 -0.9514 -0.0351 -0.9894 -0.0894 -0.3923 -1.9086 -0.8632 -0.1713 -0.3711 -2.0009 
## Par. upper-bounds:  23.3962 13.5531 14.8134 6.3212 0.1638 0.2885 0.0378 0.1812 0.1199 0.7383 0.1855 0.0324 0.2118 0.1634 0.6326 0.3477 0.5235 0.1604 0.2386 0.9464 1.0567 0.2829 0.1321 1.7453 1.3188 0.4408 0.6671 2.0907 0.8182 1.1815 1.378 0.4165 0.801 0.9987 1.2587 0.1397 
## Final   Estimates:  17.50705 6.262891 6.825199 -1.078512 -0.1878159 0.04452905 0.03781352 -0.292423 -0.3684089 0.7382895 0.02395872 -0.3647938 -0.557082 0.09957668 0.5668574 0.3477364 0.05325146 -0.3986295 -0.2025585 0.8197066 -0.1609294 0.03004733 -0.5046387 0.3900088 0.2314189 -0.3920333 -0.1762358 0.4214379 0.8182211 -0.08939703 0.06111989 -0.9895129 0.3240739 0.4913777 0.5753825 -0.8397846
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           17.50705     2.32768    7.521 5.42e-14 ***
## loneliness_state_pmc           6.26289     5.64874    1.109  0.26755    
## socintsatisfaction_state_pmc   6.82520     6.25558    1.091  0.27525    
## responsiveness_state_pmc      -1.07851     2.65039   -0.407  0.68406    
## depressedmood_state           -0.18782     0.14088   -1.333  0.18247    
## loneliness_state_pmc           0.04453         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.03781     0.06997    0.540  0.58889    
## responsiveness_state_pmc      -0.29242         NaN      NaN      NaN    
## depressedmood_state           -0.36841     0.39423   -0.934  0.35005    
## loneliness_state_pmc           0.73829     0.28201    2.618  0.00885 ** 
## socintsatisfaction_state_pmc   0.02396     0.08087    0.296  0.76704    
## responsiveness_state_pmc      -0.36479     0.16021   -2.277  0.02279 *  
## depressedmood_state           -0.55708     0.42556   -1.309  0.19052    
## loneliness_state_pmc           0.09958     0.38683    0.257  0.79686    
## socintsatisfaction_state_pmc   0.56686     0.12472    4.545 5.49e-06 ***
## responsiveness_state_pmc       0.34774     0.13249    2.625  0.00868 ** 
## depressedmood_state            0.05325     0.12649    0.421  0.67376    
## loneliness_state_pmc          -0.39863     0.21262   -1.875  0.06081 .  
## socintsatisfaction_state_pmc  -0.20256     0.09923   -2.041  0.04123 *  
## responsiveness_state_pmc       0.81971     0.21047    3.895 9.83e-05 ***
##                               -0.16093     0.11488   -1.401  0.16125    
##                                0.03005         NaN      NaN      NaN    
##                               -0.50464     0.11926   -4.232 2.32e-05 ***
##                                0.39001         NaN      NaN      NaN    
##                                0.23142     0.30292    0.764  0.44489    
##                               -0.39203     0.34924   -1.123  0.26163    
##                               -0.17624     0.17026   -1.035  0.30061    
##                                0.42144     0.25533    1.651  0.09883 .  
##                                0.81822     0.31312    2.613  0.00897 ** 
##                               -0.08940     0.37041   -0.241  0.80929    
##                                0.06112     0.15828    0.386  0.69938    
##                               -0.98951     0.16325   -6.061 1.35e-09 ***
##                                0.32407         NaN      NaN      NaN    
##                                0.49138     0.24317    2.021  0.04331 *  
##                                0.57538     0.12478    4.611 4.00e-06 ***
##                               -0.83978     0.26797   -3.134  0.00173 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  17.50705 6.262891 6.825199 -1.078512 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]    [,3]   [,4]
## [1,] -0.1878  0.0445  0.0378 -0.292
## [2,] -0.3684  0.7383  0.0240 -0.365
## [3,] -0.5571  0.0996  0.5669  0.348
## [4,]  0.0533 -0.3986 -0.2026  0.820
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]    [,2]    [,3]   [,4]
## [1,]  0.161 -0.0300  0.5046 -0.390
## [2,] -0.231  0.3920  0.1762 -0.421
## [3,] -0.818  0.0894 -0.0611  0.990
## [4,] -0.324 -0.4914 -0.5754  0.840
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,] 134.60530  71.52301 -27.69624 -47.90169
## [2,]  71.52301 190.85746 -43.42845 -21.78252
## [3,] -27.69624 -43.42845 213.44143  90.12314
## [4,] -47.90169 -21.78252  90.12314 159.47525
## ---- 
## aic=  20.97043 
## bic=  22.1268 
## Number of parameters:  36 
## initial estimates:  33.8267 -0.9824 -4.3274 -13.059 0.1313 0.1238 0.0788 -0.2296 0.0304 0.0452 -0.0218 -0.101 0.1039 -0.1322 0.4758 0.2432 0.3671 -0.4655 -0.0517 0.7852 -0.3386 -0.2469 -0.1377 0.6648 0.2489 -0.6168 -0.331 0.6467 -0.0571 0.4693 0.8757 -1.5547 -0.5072 0.3636 0.3506 -0.7484 
## Par. lower-bounds:  17.3734 -14.6637 -25.5859 -26.0205 -0.2579 -0.393 -0.2339 -0.6508 -0.2932 -0.3846 -0.2818 -0.4512 -0.3991 -0.8 0.0718 -0.3009 0.0605 -0.8727 -0.2981 0.4534 -1.142 -1.1403 -0.8628 -0.6078 -0.4191 -1.3596 -0.9339 -0.4115 -1.0951 -0.685 -0.0611 -3.199 -1.1401 -0.3401 -0.2206 -1.751 
## Par. upper-bounds:  50.2799 12.6989 16.9312 -0.0975 0.5206 0.6407 0.3915 0.1915 0.3541 0.4749 0.2383 0.2492 0.6068 0.5357 0.8799 0.7874 0.6738 -0.0584 0.1946 1.117 0.4647 0.6464 0.5874 1.9375 0.9169 0.1261 0.2719 1.705 0.9808 1.6236 1.8125 0.0897 0.1256 1.0674 0.9218 0.2541 
## Final   Estimates:  33.88457 -1.156442 -4.395146 -13.03786 0.1786052 -0.3871745 0.2210515 -0.4124825 0.02972502 0.4749473 0.213774 -0.1892071 0.1229945 -0.4823535 0.3807414 0.3807866 0.3406931 -0.07434183 -0.2021206 0.9607521 -0.1720056 0.6464087 -0.08928231 0.2644719 0.02526102 -0.4405909 -0.4321218 0.4760664 -0.07657322 0.5130972 0.397884 -0.7567538 -0.1490066 -0.3401218 0.3655571 -0.6700723 
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)   
## depressedmood_state           33.88457    29.42265    1.152  0.24947   
## loneliness_state_pmc          -1.15644     9.64442   -0.120  0.90456   
## socintsatisfaction_state_pmc  -4.39515    38.11003   -0.115  0.90819   
## responsiveness_state_pmc     -13.03786    22.51618   -0.579  0.56256   
## depressedmood_state            0.17861     0.72038    0.248  0.80419   
## loneliness_state_pmc          -0.38717     0.88171   -0.439  0.66058   
## socintsatisfaction_state_pmc   0.22105     0.29098    0.760  0.44744   
## responsiveness_state_pmc      -0.41248     0.43717   -0.944  0.34541   
## depressedmood_state            0.02973     0.23133    0.128  0.89776   
## loneliness_state_pmc           0.47495     0.26011    1.826  0.06786 . 
## socintsatisfaction_state_pmc   0.21377     0.14298    1.495  0.13488   
## responsiveness_state_pmc      -0.18921     0.21789   -0.868  0.38519   
## depressedmood_state            0.12299     0.95566    0.129  0.89759   
## loneliness_state_pmc          -0.48235     0.77474   -0.623  0.53355   
## socintsatisfaction_state_pmc   0.38074     0.47688    0.798  0.42464   
## responsiveness_state_pmc       0.38079     0.48409    0.787  0.43151   
## depressedmood_state            0.34069     0.53760    0.634  0.52625   
## loneliness_state_pmc          -0.07434     0.55470   -0.134  0.89339   
## socintsatisfaction_state_pmc  -0.20212     0.16205   -1.247  0.21229   
## responsiveness_state_pmc       0.96075     0.34955    2.749  0.00599 **
##                               -0.17201     0.96590   -0.178  0.85866   
##                                0.64641     0.99970    0.647  0.51789   
##                               -0.08928     0.27875   -0.320  0.74874   
##                                0.26447     0.53351    0.496  0.62009   
##                                0.02526     0.33022    0.076  0.93902   
##                               -0.44059     0.46512   -0.947  0.34351   
##                               -0.43212     0.16487   -2.621  0.00877 **
##                                0.47607     0.20560    2.315  0.02059 * 
##                               -0.07657     1.04114   -0.074  0.94137   
##                                0.51310     0.91689    0.560  0.57575   
##                                0.39788     0.54017    0.737  0.46137   
##                               -0.75675     0.41970   -1.803  0.07138 . 
##                               -0.14901     0.55235   -0.270  0.78734   
##                               -0.34012     0.64531   -0.527  0.59815   
##                                0.36556     0.18151    2.014  0.04401 * 
##                               -0.67007     0.34800   -1.926  0.05417 . 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  33.88457 -1.156442 -4.395146 -13.03786 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]    [,2]   [,3]   [,4]
## [1,] 0.1786 -0.3872  0.221 -0.412
## [2,] 0.0297  0.4749  0.214 -0.189
## [3,] 0.1230 -0.4824  0.381  0.381
## [4,] 0.3407 -0.0743 -0.202  0.961
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]    [,3]   [,4]
## [1,]  0.1720 -0.646  0.0893 -0.264
## [2,] -0.0253  0.441  0.4321 -0.476
## [3,]  0.0766 -0.513 -0.3979  0.757
## [4,]  0.1490  0.340 -0.3656  0.670
##   
## Residuals cov-matrix: 
##            [,1]       [,2]      [,3]      [,4]
## [1,]  189.52380   95.88377 -120.1421 -71.35922
## [2,]   95.88377  147.81074 -129.9099 -68.12391
## [3,] -120.14207 -129.90990  300.1374 124.05558
## [4,]  -71.35922  -68.12391  124.0556 116.07877
## ---- 
## aic=  20.14707 
## bic=  21.30344 
## Number of parameters:  36 
## initial estimates:  24.6827 -2.4299 -2.8957 -0.5922 0.3495 0.528 0.0549 0.1438 -0.0173 0.3823 -0.3662 0.3368 0.0893 -0.5974 0.1792 -0.0218 0.0789 -0.3398 0.1141 0.0808 -0.8124 -1.1588 -0.7672 -0.4905 0.4009 0.1043 0.2743 -0.261 0.209 0.7054 -0.014 0.74 0.13 0.6712 -9e-04 0.059 
## Par. lower-bounds:  13.9348 -14.4772 -21.429 -12.0491 0.1011 0.2187 -0.1662 -0.2102 -0.2957 0.0356 -0.6141 -0.06 -0.339 -1.1307 -0.2021 -0.6322 -0.1859 -0.6695 -0.1217 -0.2966 -1.4877 -1.8614 -1.26 -1.1293 -0.3559 -0.6832 -0.278 -0.977 -0.9553 -0.5061 -0.8638 -0.3616 -0.5898 -0.0777 -0.5262 -0.622 
## Par. upper-bounds:  35.4305 9.6175 15.6377 10.8648 0.5978 0.8372 0.2761 0.4978 0.2611 0.7289 -0.1183 0.7336 0.5176 -0.0641 0.5606 0.5886 0.3437 -0.0102 0.3499 0.4581 -0.1372 -0.4562 -0.2745 0.1483 1.1578 0.8918 0.8267 0.4551 1.3734 1.9169 0.8357 1.8416 0.8498 1.4201 0.5244 0.74 
## Final   Estimates:  24.63458 -2.292573 -2.873624 -0.5773693 0.3855896 0.8116075 0.2761101 0.4787591 0.004552798 0.5276741 -0.1183012 0.07175988 0.02051612 -0.7238144 0.5605919 -0.6321594 0.02540421 -0.1083715 0.3498547 0.2646589 -0.307954 -0.8829131 -0.5893788 -0.5896949 -0.06905115 -0.3901196 -0.2779577 0.1298663 0.692814 0.7169732 -0.2562527 1.017072 0.06541026 -0.07669747 -0.2543845 -0.07789138
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state          24.634584    3.987163    6.178 6.47e-10 ***
## loneliness_state_pmc         -2.292573         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -2.873624    3.059074   -0.939 0.347537    
## responsiveness_state_pmc     -0.577369    6.671421   -0.087 0.931034    
## depressedmood_state           0.385590    0.099518    3.875 0.000107 ***
## loneliness_state_pmc          0.811608         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.276110    0.040766    6.773 1.26e-11 ***
## responsiveness_state_pmc      0.478759         NaN      NaN      NaN    
## depressedmood_state           0.004553         NaN      NaN      NaN    
## loneliness_state_pmc          0.527674         NaN      NaN      NaN    
## socintsatisfaction_state_pmc -0.118301         NaN      NaN      NaN    
## responsiveness_state_pmc      0.071760         NaN      NaN      NaN    
## depressedmood_state           0.020516         NaN      NaN      NaN    
## loneliness_state_pmc         -0.723814         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  0.560592         NaN      NaN      NaN    
## responsiveness_state_pmc     -0.632159         NaN      NaN      NaN    
## depressedmood_state           0.025404    0.151166    0.168 0.866540    
## loneliness_state_pmc         -0.108371    0.305913   -0.354 0.723148    
## socintsatisfaction_state_pmc  0.349855         NaN      NaN      NaN    
## responsiveness_state_pmc      0.264659    0.017732   14.926  < 2e-16 ***
##                              -0.307954    0.117598   -2.619 0.008827 ** 
##                              -0.882913         NaN      NaN      NaN    
##                              -0.589379         NaN      NaN      NaN    
##                              -0.589695         NaN      NaN      NaN    
##                              -0.069051         NaN      NaN      NaN    
##                              -0.390120         NaN      NaN      NaN    
##                              -0.277958         NaN      NaN      NaN    
##                               0.129866    0.227657    0.570 0.568374    
##                               0.692814         NaN      NaN      NaN    
##                               0.716973         NaN      NaN      NaN    
##                              -0.256253         NaN      NaN      NaN    
##                               1.017072         NaN      NaN      NaN    
##                               0.065410         NaN      NaN      NaN    
##                              -0.076697    0.311527   -0.246 0.805529    
##                              -0.254384         NaN      NaN      NaN    
##                              -0.077891    0.202048   -0.386 0.699861    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  24.63458 -2.292573 -2.873624 -0.5773693 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]   [,3]    [,4]
## [1,] 0.38559  0.812  0.276  0.4788
## [2,] 0.00455  0.528 -0.118  0.0718
## [3,] 0.02052 -0.724  0.561 -0.6322
## [4,] 0.02540 -0.108  0.350  0.2647
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]  [,3]    [,4]
## [1,]  0.3080  0.8829 0.589  0.5897
## [2,]  0.0691  0.3901 0.278 -0.1299
## [3,] -0.6928 -0.7170 0.256 -1.0171
## [4,] -0.0654  0.0767 0.254  0.0779
##   
## Residuals cov-matrix: 
##            [,1]       [,2]      [,3]      [,4]
## [1,]  267.57576   78.35208 -147.2588 -112.0482
## [2,]   78.35208  311.83696 -322.5000 -153.4280
## [3,] -147.25884 -322.49998  797.0304  268.2827
## [4,] -112.04816 -153.42801  268.2827  314.6865
## ---- 
## aic=  23.67847 
## bic=  24.83484 
## Number of parameters:  36 
## initial estimates:  24.3942 -16.7921 6.1431 4.8323 0.2058 -0.135 0.1926 -0.0341 0.5207 -0.1446 0.3397 -0.2452 -0.206 0.0036 -0.2479 0.0525 -0.1548 -0.139 -0.0828 0.0147 0.4643 -0.0246 0.4972 -0.0463 -0.2504 0.072 -0.108 0.5491 -0.0941 -0.569 -0.6379 0.1908 0.0117 0.1084 -0.3366 0.2453 
## Par. lower-bounds:  11.9215 -30.9772 -14.9124 -8.8616 -0.181 -0.4095 -0.0613 -0.3613 0.0808 -0.4567 0.0509 -0.6174 -0.859 -0.4597 -0.6766 -0.4999 -0.5795 -0.4403 -0.3616 -0.3446 -0.2385 -0.8097 -0.1681 -0.8499 -1.0497 -0.8209 -0.8647 -0.3647 -1.2805 -1.8944 -1.761 -1.1657 -0.7599 -0.7536 -1.067 -0.6369 
## Par. upper-bounds:  36.867 -2.6069 27.1987 18.5262 0.5926 0.1395 0.4466 0.2931 0.9606 0.1676 0.6285 0.1269 0.447 0.4669 0.1807 0.6049 0.2699 0.1624 0.196 0.3739 1.167 0.7605 1.1625 0.7572 0.5488 0.9648 0.6486 1.463 1.0922 0.7563 0.4852 1.5472 0.7833 0.9704 0.3938 1.1275 
## Final   Estimates:  19.93512 -17.85401 2.711682 9.147893 0.3400767 0.1394554 0.05499742 0.004858244 0.5744579 -0.4567277 0.05093088 0.08481647 -0.1020276 -0.4596993 0.1807386 0.6049362 -0.2959466 0.1623569 0.1959512 0.3739206 -0.09756968 -0.3766438 0.1886646 -0.1408505 -0.3016892 0.3370222 0.2082888 -0.3647103 0.06999241 0.5136299 -0.601509 -0.3222495 0.1873262 -0.2857542 -0.3640083 -0.1487215
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                                Estimate  Std. Error  t value Pr(>|t|)   
## depressedmood_state           19.935122         NaN      NaN      NaN   
## loneliness_state_pmc         -17.854013    9.559573   -1.868  0.06181 . 
## socintsatisfaction_state_pmc   2.711682   12.872084    0.211  0.83315   
## responsiveness_state_pmc       9.147893    8.276393    1.105  0.26903   
## depressedmood_state            0.340077         NaN      NaN      NaN   
## loneliness_state_pmc           0.139455         NaN      NaN      NaN   
## socintsatisfaction_state_pmc   0.054997    0.166108    0.331  0.74057   
## responsiveness_state_pmc       0.004858    0.321257    0.015  0.98793   
## depressedmood_state            0.574458    0.314301    1.828  0.06759 . 
## loneliness_state_pmc          -0.456728         NaN      NaN      NaN   
## socintsatisfaction_state_pmc   0.050931    0.174725    0.291  0.77068   
## responsiveness_state_pmc       0.084816         NaN      NaN      NaN   
## depressedmood_state           -0.102028    0.433929   -0.235  0.81411   
## loneliness_state_pmc          -0.459699         NaN      NaN      NaN   
## socintsatisfaction_state_pmc   0.180739    0.459190    0.394  0.69387   
## responsiveness_state_pmc       0.604936    0.566066    1.069  0.28522   
## depressedmood_state           -0.295947    0.275703   -1.073  0.28308   
## loneliness_state_pmc           0.162357         NaN      NaN      NaN   
## socintsatisfaction_state_pmc   0.195951    0.196226    0.999  0.31799   
## responsiveness_state_pmc       0.373921    0.135395    2.762  0.00575 **
##                               -0.097570         NaN      NaN      NaN   
##                               -0.376644         NaN      NaN      NaN   
##                                0.188665    0.138914    1.358  0.17442   
##                               -0.140850    0.318044   -0.443  0.65786   
##                               -0.301689    0.363916   -0.829  0.40710   
##                                0.337022         NaN      NaN      NaN   
##                                0.208289    0.146381    1.423  0.15476   
##                               -0.364710         NaN      NaN      NaN   
##                                0.069992    0.547916    0.128  0.89835   
##                                0.513630         NaN      NaN      NaN   
##                               -0.601509    0.436219   -1.379  0.16792   
##                               -0.322249    0.497168   -0.648  0.51688   
##                                0.187326    0.285213    0.657  0.51131   
##                               -0.285754    0.172639   -1.655  0.09788 . 
##                               -0.364008    0.193852   -1.878  0.06041 . 
##                               -0.148721    0.184064   -0.808  0.41910   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  19.93512 -17.85401 2.711682 9.147893 
## AR coefficient matrix 
## AR( 1 )-matrix 
##        [,1]   [,2]   [,3]    [,4]
## [1,]  0.340  0.139 0.0550 0.00486
## [2,]  0.574 -0.457 0.0509 0.08482
## [3,] -0.102 -0.460 0.1807 0.60494
## [4,] -0.296  0.162 0.1960 0.37392
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]   [,2]   [,3]  [,4]
## [1,]  0.0976  0.377 -0.189 0.141
## [2,]  0.3017 -0.337 -0.208 0.365
## [3,] -0.0700 -0.514  0.602 0.322
## [4,] -0.1873  0.286  0.364 0.149
##   
## Residuals cov-matrix: 
##            [,1]       [,2]      [,3]      [,4]
## [1,]  211.13089  119.24031 -221.3554 -95.15135
## [2,]  119.24031  232.29390 -156.5159 -76.70335
## [3,] -221.35535 -156.51589  507.2397 205.03514
## [4,]  -95.15135  -76.70335  205.0351 189.06780
## ---- 
## aic=  21.73754 
## bic=  22.8939 
## Number of parameters:  36 
## initial estimates:  8.1305 1.3396 1.2344 0.0161 0.4157 -0.0806 0.1403 -0.1143 -0.0809 0.4236 0.0806 0.0797 -0.0847 0.1631 0.1683 -0.1102 -0.0423 -0.132 -0.0413 -0.103 -0.627 0.7124 -0.2706 0.3206 -0.8014 0.0821 -0.4842 -0.3575 0.4785 -0.4905 -0.0738 -0.1123 0.7028 0.183 0.3722 0.1648 
## Par. lower-bounds:  2.0737 -6.1392 -8.0255 -7.0241 0.0561 -0.3795 -0.1175 -0.486 -0.5249 0.0546 -0.2378 -0.3793 -0.6344 -0.2938 -0.2259 -0.6785 -0.4603 -0.4794 -0.341 -0.5351 -1.7189 -0.3982 -0.8306 -0.32 -2.1496 -1.2893 -1.1758 -1.1485 -1.1908 -2.1885 -0.9301 -1.0917 -0.5663 -1.108 -0.2788 -0.5798 
## Par. upper-bounds:  14.1874 8.8184 10.4942 7.0563 0.7753 0.2183 0.3982 0.2575 0.363 0.7927 0.399 0.5387 0.465 0.6201 0.5624 0.4581 0.3756 0.2154 0.2584 0.3291 0.4649 1.8231 0.2895 0.9612 0.5468 1.4535 0.2073 0.4335 2.1477 1.2075 0.7824 0.867 1.972 1.474 1.0232 0.9095 
## Final   Estimates:  8.279354 1.09393 1.236901 0.02609686 0.5001204 -0.3795351 0.3981503 -0.0367166 -0.03963823 0.6326135 0.07740392 -0.1487612 -0.09471897 0.4293088 0.4485937 0.4450572 -0.01577478 -0.2413339 -0.2143559 -0.3293619 -0.1267665 0.5029456 -0.3509838 0.09579193 -0.03876825 -0.3268708 -0.2207718 0.3143777 -0.03546077 -0.6402753 -0.9300985 -0.2009431 0.3627574 0.07245812 0.160911 0.4522131 
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           8.279354   10.886511    0.761  0.44695    
## loneliness_state_pmc          1.093930    1.221147    0.896  0.37035    
## socintsatisfaction_state_pmc  1.236901    1.737496    0.712  0.47653    
## responsiveness_state_pmc      0.026097   15.471911    0.002  0.99865    
## depressedmood_state           0.500120    0.545917    0.916  0.35961    
## loneliness_state_pmc         -0.379535    0.779794   -0.487  0.62646    
## socintsatisfaction_state_pmc  0.398150    0.538415    0.739  0.45961    
## responsiveness_state_pmc     -0.036717    0.293859   -0.125  0.90057    
## depressedmood_state          -0.039638    0.118924   -0.333  0.73890    
## loneliness_state_pmc          0.632614    0.237157    2.667  0.00764 ** 
## socintsatisfaction_state_pmc  0.077404    0.277963    0.278  0.78065    
## responsiveness_state_pmc     -0.148761    0.796933   -0.187  0.85192    
## depressedmood_state          -0.094719    0.009992   -9.479  < 2e-16 ***
## loneliness_state_pmc          0.429309    0.244158    1.758  0.07869 .  
## socintsatisfaction_state_pmc  0.448594    0.229509    1.955  0.05063 .  
## responsiveness_state_pmc      0.445057    0.603166    0.738  0.46059    
## depressedmood_state          -0.015775    0.884347   -0.018  0.98577    
## loneliness_state_pmc         -0.241334    0.576167   -0.419  0.67532    
## socintsatisfaction_state_pmc -0.214356    0.676305   -0.317  0.75128    
## responsiveness_state_pmc     -0.329362    0.405111   -0.813  0.41621    
##                              -0.126766    0.454999   -0.279  0.78055    
##                               0.502946    0.731190    0.688  0.49155    
##                              -0.350984    0.585581   -0.599  0.54892    
##                               0.095792    0.261948    0.366  0.71460    
##                              -0.038768    0.377241   -0.103  0.91815    
##                              -0.326871    0.313313   -1.043  0.29682    
##                              -0.220772    0.067166   -3.287  0.00101 ** 
##                               0.314378    0.806582    0.390  0.69671    
##                              -0.035461    0.242815   -0.146  0.88389    
##                              -0.640275    0.283738   -2.257  0.02403 *  
##                              -0.930098    0.088962  -10.455  < 2e-16 ***
##                              -0.200943    0.614395   -0.327  0.74362    
##                               0.362757    0.825942    0.439  0.66051    
##                               0.072458    0.607254    0.119  0.90502    
##                               0.160911    0.676204    0.238  0.81191    
##                               0.452213    0.430400    1.051  0.29340    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  8.279354 1.09393 1.236901 0.02609686 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]   [,2]    [,3]    [,4]
## [1,]  0.5001 -0.380  0.3982 -0.0367
## [2,] -0.0396  0.633  0.0774 -0.1488
## [3,] -0.0947  0.429  0.4486  0.4451
## [4,] -0.0158 -0.241 -0.2144 -0.3294
## MA coefficient matrix 
## MA( 1 )-matrix 
##         [,1]    [,2]   [,3]    [,4]
## [1,]  0.1268 -0.5029  0.351 -0.0958
## [2,]  0.0388  0.3269  0.221 -0.3144
## [3,]  0.0355  0.6403  0.930  0.2009
## [4,] -0.3628 -0.0725 -0.161 -0.4522
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  149.7418  116.9481 -119.5059  -74.3979
## [2,]  116.9481  205.0561 -156.2767 -122.3944
## [3,] -119.5059 -156.2767  280.3223  165.9826
## [4,]  -74.3979 -122.3944  165.9826  192.7798
## ---- 
## aic=  20.23537 
## bic=  21.39174 
## Number of parameters:  36 
## initial estimates:  32.253 2.1838 -5.7987 -3.6909 0.1027 0.0484 -0.1992 -0.048 -0.0583 0.0923 -0.3161 -0.0989 0.1459 0.0358 0.301 0.2221 0.0947 0.0241 0.2687 0.2222 0.248 0.2133 0.1169 0.3743 0.5415 0.0534 0.5797 0.4437 -0.5581 0.0981 -1.1439 0.3714 -0.0551 -0.5149 -0.9558 0.1592 
## Par. lower-bounds:  11.1985 -19.0461 -22.7047 -19.3717 -0.4711 -0.5232 -0.8696 -0.7317 -0.6368 -0.484 -0.9921 -0.7883 -0.3149 -0.4231 -0.2373 -0.3269 -0.3326 -0.4016 -0.2306 -0.287 -1.1855 -1.1601 -1.5123 -1.4436 -0.9039 -1.3314 -1.0632 -1.3894 -1.7091 -1.0047 -2.4522 -1.0883 -1.1227 -1.5377 -2.1693 -1.1947 
## Par. upper-bounds:  53.3075 23.4136 11.1074 11.9899 0.6765 0.62 0.4713 0.6357 0.5203 0.6686 0.3599 0.5905 0.6066 0.4948 0.8394 0.7711 0.5221 0.4498 0.7681 0.7314 1.6814 1.5867 1.7462 2.1922 1.9869 1.4382 2.2225 2.2767 0.5929 1.2009 0.1643 1.8311 1.0125 0.508 0.2576 1.5132 
## Final   Estimates:  32.24695 2.187875 -5.808803 -3.685422 0.07581018 0.06556326 -0.1653745 -0.1186584 -0.06826048 0.06076237 -0.435628 -0.2260531 0.1593651 -0.01438478 0.4702764 0.1997179 0.09355855 0.1418786 0.3253448 0.2821409 0.260207 0.08564879 0.1351931 0.3455126 0.3602534 0.03523157 0.4818694 0.2962511 -0.2719966 -0.05291515 -0.9826925 0.3254495 -0.2349323 -0.3366221 -0.9361126 0.1891961
## Warning in sqrt(diag(solve(Hessian))): NaNs produced
## 
## Coefficient(s):
##                               Estimate  Std. Error  t value Pr(>|t|)    
## depressedmood_state           32.24695         NaN      NaN      NaN    
## loneliness_state_pmc           2.18788         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -5.80880         NaN      NaN      NaN    
## responsiveness_state_pmc      -3.68542         NaN      NaN      NaN    
## depressedmood_state            0.07581         NaN      NaN      NaN    
## loneliness_state_pmc           0.06556         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.16537         NaN      NaN      NaN    
## responsiveness_state_pmc      -0.11866         NaN      NaN      NaN    
## depressedmood_state           -0.06826         NaN      NaN      NaN    
## loneliness_state_pmc           0.06076         NaN      NaN      NaN    
## socintsatisfaction_state_pmc  -0.43563     0.12579   -3.463 0.000534 ***
## responsiveness_state_pmc      -0.22605     0.22959   -0.985 0.324822    
## depressedmood_state            0.15937         NaN      NaN      NaN    
## loneliness_state_pmc          -0.01438         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.47028         NaN      NaN      NaN    
## responsiveness_state_pmc       0.19972     0.59638    0.335 0.737711    
## depressedmood_state            0.09356         NaN      NaN      NaN    
## loneliness_state_pmc           0.14188         NaN      NaN      NaN    
## socintsatisfaction_state_pmc   0.32534     0.32804    0.992 0.321306    
## responsiveness_state_pmc       0.28214     0.06870    4.107 4.01e-05 ***
##                                0.26021         NaN      NaN      NaN    
##                                0.08565     0.36226    0.236 0.813100    
##                                0.13519         NaN      NaN      NaN    
##                                0.34551         NaN      NaN      NaN    
##                                0.36025     0.24254    1.485 0.137453    
##                                0.03523         NaN      NaN      NaN    
##                                0.48187     0.39219    1.229 0.219203    
##                                0.29625     0.18913    1.566 0.117258    
##                               -0.27200         NaN      NaN      NaN    
##                               -0.05292         NaN      NaN      NaN    
##                               -0.98269         NaN      NaN      NaN    
##                                0.32545     0.87302    0.373 0.709307    
##                               -0.23493         NaN      NaN      NaN    
##                               -0.33662         NaN      NaN      NaN    
##                               -0.93611         NaN      NaN      NaN    
##                                0.18920     0.51603    0.367 0.713890    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## --- 
## Estimates in matrix form: 
## Constant term:  
## Estimates:  32.24695 2.187875 -5.808803 -3.685422 
## AR coefficient matrix 
## AR( 1 )-matrix 
##         [,1]    [,2]   [,3]   [,4]
## [1,]  0.0758  0.0656 -0.165 -0.119
## [2,] -0.0683  0.0608 -0.436 -0.226
## [3,]  0.1594 -0.0144  0.470  0.200
## [4,]  0.0936  0.1419  0.325  0.282
## MA coefficient matrix 
## MA( 1 )-matrix 
##        [,1]    [,2]   [,3]   [,4]
## [1,] -0.260 -0.0856 -0.135 -0.346
## [2,] -0.360 -0.0352 -0.482 -0.296
## [3,]  0.272  0.0529  0.983 -0.325
## [4,]  0.235  0.3366  0.936 -0.189
##   
## Residuals cov-matrix: 
##           [,1]      [,2]      [,3]      [,4]
## [1,]  268.5383  238.0297 -135.0640 -125.1753
## [2,]  238.0297  286.1840 -143.0732 -133.2885
## [3,] -135.0640 -143.0732  241.4738  202.4921
## [4,] -125.1753 -133.2885  202.4921  231.8085
## ---- 
## aic=  20.16782 
## bic=  21.32418
# Extract fit results and noisy simulated series into separate lists
fit_results_list <- lapply(simulated_data_list, function(x) x$fit)
simulated_data_list5 <- lapply(simulated_data_list, function(x) x$simulated_series)

# Combine into one large data frame for further analysis
combined_simulated_data_list5 <- do.call(rbind, lapply(1:length(simulated_data_list5), function(i) {
  individual_df <- as.data.frame(simulated_data_list5[[i]])
  individual_df$ID <- i
  individual_df$time <- 1:nrow(individual_df)
  return(individual_df)
}))

Running i-ARIMAX on data sets

Next we are going to run i-ARIMAX on both the original raw data set and the simulated data set using the idionomics package to see how they compare.

# i-ARIMAX on existing raw data set 
imputeThese <- c("depressedmood_state", "loneliness_state_pmc", "socintsatisfaction_state_pmc", "responsiveness_state_pmc")

# Within person standardization
zDataraw <- i_standarbot_300(imputed_rawdata, imputeThese, "pid", explanation = TRUE)
## This function will create a dataframe with person-mean standardized variables 
## ... 
##    If all values for a feature within ID are NA, will return NA 
##    If there is less than two values, will return 0 (zero variance) 
##    If values are constant, will return 0 (zero variance) 
##    If there is enough variance, will return deviations from the mean 
## 
##    Standardization finished: Your original dataframe with standardized columns appended at the end was returned
# Create list of independent variables
IV <- c("loneliness_state_pmc_PSD","socintsatisfaction_state_pmc_PSD","responsiveness_state_pmc_PSD")

# Initialize an empty list to store the results
hoard.iarimax1 <- list()

# Loop through each independent variable (IV)
for (i in seq_along(IV)) {
  # Create a unique model name for each IV
  model_name <- paste0("IV_", i)
  
  # Run the IARIMAXoid_Pro function and store the result in the list
  hoard.iarimax1[[model_name]] <- IARIMAXoid_Pro(
    zDataraw,
    x_series = IV[[i]],  # Current independent variable
    y_series = "depressedmood_state_PSD",  # The single dependent variable
    id_var = "pid",
    hlm_compare = TRUE,
    timevar = "pingTotal",
    metaanalysis = TRUE
  )
}
## Filtering your data based on specified minimum non NA per subject and variance... 
##  
## Your data was filtered: 102 subjects will be used for the analyses 
##  
## Running I-ARIMAX algorithm... 
##  
##   Applying auto ARIMAX to case:  1  ...
## Registered S3 method overwritten by 'quantmod':
##   method            from
##   as.zoo.data.frame zoo
## 1 % completed 
##   Applying auto ARIMAX to case:  2  ... 2 % completed 
##   Applying auto ARIMAX to case:  3  ... 2.9 % completed 
##   Applying auto ARIMAX to case:  4  ... 3.9 % completed 
##   Applying auto ARIMAX to case:  5  ... 4.9 % completed 
##   Applying auto ARIMAX to case:  6  ... 5.9 % completed 
##   Applying auto ARIMAX to case:  7  ... 6.9 % completed 
##   Applying auto ARIMAX to case:  8  ... 7.8 % completed 
##   Applying auto ARIMAX to case:  9  ... 8.8 % completed 
##   Applying auto ARIMAX to case:  10  ... 9.8 % completed 
##   Applying auto ARIMAX to case:  11  ... 10.8 % completed 
##   Applying auto ARIMAX to case:  12  ... 11.8 % completed 
##   Applying auto ARIMAX to case:  13  ... 12.7 % completed 
##   Applying auto ARIMAX to case:  14  ... 13.7 % completed 
##   Applying auto ARIMAX to case:  15  ... 14.7 % completed 
##   Applying auto ARIMAX to case:  16  ... 15.7 % completed 
##   Applying auto ARIMAX to case:  17  ... 16.7 % completed 
##   Applying auto ARIMAX to case:  18  ... 17.6 % completed 
##   Applying auto ARIMAX to case:  19  ... 18.6 % completed 
##   Applying auto ARIMAX to case:  20  ... 19.6 % completed 
##   Applying auto ARIMAX to case:  21  ... 20.6 % completed 
##   Applying auto ARIMAX to case:  22  ... 21.6 % completed 
##   Applying auto ARIMAX to case:  23  ... 22.5 % completed 
##   Applying auto ARIMAX to case:  24  ... 23.5 % completed 
##   Applying auto ARIMAX to case:  25  ... 24.5 % completed 
##   Applying auto ARIMAX to case:  26  ... 25.5 % completed 
##   Applying auto ARIMAX to case:  27  ... 26.5 % completed 
##   Applying auto ARIMAX to case:  28  ... 27.5 % completed 
##   Applying auto ARIMAX to case:  29  ... 28.4 % completed 
##   Applying auto ARIMAX to case:  30  ... 29.4 % completed 
##   Applying auto ARIMAX to case:  31  ... 30.4 % completed 
##   Applying auto ARIMAX to case:  32  ... 31.4 % completed 
##   Applying auto ARIMAX to case:  33  ... 32.4 % completed 
##   Applying auto ARIMAX to case:  34  ... 33.3 % completed 
##   Applying auto ARIMAX to case:  35  ... 34.3 % completed 
##   Applying auto ARIMAX to case:  36  ... 35.3 % completed 
##   Applying auto ARIMAX to case:  37  ... 36.3 % completed 
##   Applying auto ARIMAX to case:  38  ... 37.3 % completed 
##   Applying auto ARIMAX to case:  39  ... 38.2 % completed 
##   Applying auto ARIMAX to case:  40  ... 39.2 % completed 
##   Applying auto ARIMAX to case:  41  ... 40.2 % completed 
##   Applying auto ARIMAX to case:  42  ... 41.2 % completed 
##   Applying auto ARIMAX to case:  43  ... 42.2 % completed 
##   Applying auto ARIMAX to case:  44  ... 43.1 % completed 
##   Applying auto ARIMAX to case:  45  ... 44.1 % completed 
##   Applying auto ARIMAX to case:  46  ... 45.1 % completed 
##   Applying auto ARIMAX to case:  47  ... 46.1 % completed 
##   Applying auto ARIMAX to case:  48  ... 47.1 % completed 
##   Applying auto ARIMAX to case:  49  ... 48 % completed 
##   Applying auto ARIMAX to case:  50  ... 49 % completed 
##   Applying auto ARIMAX to case:  51  ... 50 % completed 
##   Applying auto ARIMAX to case:  52  ... 51 % completed 
##   Applying auto ARIMAX to case:  53  ... 52 % completed 
##   Applying auto ARIMAX to case:  54  ... 52.9 % completed 
##   Applying auto ARIMAX to case:  55  ... 53.9 % completed 
##   Applying auto ARIMAX to case:  56  ... 54.9 % completed 
##   Applying auto ARIMAX to case:  57  ... 55.9 % completed 
##   Applying auto ARIMAX to case:  58  ... 56.9 % completed 
##   Applying auto ARIMAX to case:  59  ... 57.8 % completed 
##   Applying auto ARIMAX to case:  60  ... 58.8 % completed 
##   Applying auto ARIMAX to case:  61  ... 59.8 % completed 
##   Applying auto ARIMAX to case:  62  ... 60.8 % completed 
##   Applying auto ARIMAX to case:  63  ... 61.8 % completed 
##   Applying auto ARIMAX to case:  64  ... 62.7 % completed 
##   Applying auto ARIMAX to case:  65  ... 63.7 % completed 
##   Applying auto ARIMAX to case:  66  ... 64.7 % completed 
##   Applying auto ARIMAX to case:  67  ... 65.7 % completed 
##   Applying auto ARIMAX to case:  68  ... 66.7 % completed 
##   Applying auto ARIMAX to case:  69  ... 67.6 % completed 
##   Applying auto ARIMAX to case:  70  ... 68.6 % completed 
##   Applying auto ARIMAX to case:  71  ... 69.6 % completed 
##   Applying auto ARIMAX to case:  72  ... 70.6 % completed 
##   Applying auto ARIMAX to case:  73  ... 71.6 % completed 
##   Applying auto ARIMAX to case:  74  ... 72.5 % completed 
##   Applying auto ARIMAX to case:  75  ... 73.5 % completed 
##   Applying auto ARIMAX to case:  76  ... 74.5 % completed 
##   Applying auto ARIMAX to case:  77  ... 75.5 % completed 
##   Applying auto ARIMAX to case:  78  ... 76.5 % completed 
##   Applying auto ARIMAX to case:  79  ... 77.5 % completed 
##   Applying auto ARIMAX to case:  80  ... 78.4 % completed 
##   Applying auto ARIMAX to case:  81  ... 79.4 % completed 
##   Applying auto ARIMAX to case:  82  ... 80.4 % completed 
##   Applying auto ARIMAX to case:  83  ... 81.4 % completed 
##   Applying auto ARIMAX to case:  84  ... 82.4 % completed 
##   Applying auto ARIMAX to case:  85  ... 83.3 % completed 
##   Applying auto ARIMAX to case:  86  ... 84.3 % completed 
##   Applying auto ARIMAX to case:  87  ... 85.3 % completed 
##   Applying auto ARIMAX to case:  88  ... 86.3 % completed 
##   Applying auto ARIMAX to case:  89  ... 87.3 % completed 
##   Applying auto ARIMAX to case:  90  ... 88.2 % completed 
##   Applying auto ARIMAX to case:  91  ... 89.2 % completed 
##   Applying auto ARIMAX to case:  92  ... 90.2 % completed 
##   Applying auto ARIMAX to case:  93  ... 91.2 % completed 
##   Applying auto ARIMAX to case:  94  ... 92.2 % completed 
##   Applying auto ARIMAX to case:  95  ... 93.1 % completed 
##   Applying auto ARIMAX to case:  96  ... 94.1 % completed 
##   Applying auto ARIMAX to case:  97  ... 95.1 % completed 
##   Applying auto ARIMAX to case:  98  ... 96.1 % completed 
##   Applying auto ARIMAX to case:  99  ... 97.1 % completed 
##   Applying auto ARIMAX to case:  100  ... 98 % completed 
##   Applying auto ARIMAX to case:  101  ... 99 % completed 
##   Applying auto ARIMAX to case:  102  ... 100 % completed 
##  
## 
##             1. SUMMARY OF ARIMA PARAMETERS
##  
##  The proportion of AR of order 1 or more is 0.29
##  The proportion of I of order 1 or more is 0.39
##  The proportion of MA of order 1 or more is 0.63
##  
##  
## Running random-effects meta analysis & HLM model for comparison 
##  
##  Random Effects Meta-Analysis Ran correctly without exogenous weights 
##  
##  
##             2. SUMMARY OF RANDOM EFFECTS META ANALYSIS
## 
## Random-Effects Model (k = 102; tau^2 estimator: REML)
## 
##   logLik  deviance       AIC       BIC      AICc   
##  25.1124  -50.2248  -46.2248  -40.9946  -46.1024   
## 
## tau^2 (estimated amount of total heterogeneity): 0.0269 (SE = 0.0050)
## tau (square root of estimated tau^2 value):      0.1640
## I^2 (total heterogeneity / total variability):   76.23%
## H^2 (total variability / sampling variability):  4.21
## 
## Test for Heterogeneity:
## Q(df = 101) = 437.4482, p-val < .0001
## 
## Model Results:
## 
## estimate      se     zval    pval   ci.lb   ci.ub      
##   0.4895  0.0188  26.1053  <.0001  0.4527  0.5263  *** 
## 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
##  
##  
##             3. I-ARIMAX V/S HLM COMPARISON 
##    
##    OMNIBUS - RMA ESTIMATES VS HLM
## 
##             I-ARIMAX                         HLM     
##    ----------------------------------------------------
##    IARIMAX est.   IARIMAX s.e.       HLM est.   HLM s.e.
##       0.49          0.019            0.501      0.018
## 
##    SUMMARY OF INDIVIDUAL EFFECTS
## 
##     AVERAGES:
##                             MEAN:
##      * IARIMAX mean effect:                       0.4828
##      * HLM mean effect:                           0.5011
##      * Raw corr mean effect:                      0.5455
##                           VARIANCE:
##      * IARIMAX variance of individual effects:    0.0354
##      * HLM variance of random effects:            0.0163
##      * Raw corr variance:                         0.0341
## 
##     OPPOSITES:
##      * IARIMAX N cases with opposite direction:   1
##      * HLM N cases with opposite direction:       0
##      * Corr N cases with opposite direction:      1 
## ... 
## I-ARIMAX algorithm finished. 
##  
## Filtering your data based on specified minimum non NA per subject and variance... 
##  
## Your data was filtered: 102 subjects will be used for the analyses 
##  
## Running I-ARIMAX algorithm... 
##  
##   Applying auto ARIMAX to case:  1  ... 1 % completed 
##   Applying auto ARIMAX to case:  2  ... 2 % completed 
##   Applying auto ARIMAX to case:  3  ... 2.9 % completed 
##   Applying auto ARIMAX to case:  4  ... 3.9 % completed 
##   Applying auto ARIMAX to case:  5  ... 4.9 % completed 
##   Applying auto ARIMAX to case:  6  ... 5.9 % completed 
##   Applying auto ARIMAX to case:  7  ... 6.9 % completed 
##   Applying auto ARIMAX to case:  8  ... 7.8 % completed 
##   Applying auto ARIMAX to case:  9  ... 8.8 % completed 
##   Applying auto ARIMAX to case:  10  ... 9.8 % completed 
##   Applying auto ARIMAX to case:  11  ... 10.8 % completed 
##   Applying auto ARIMAX to case:  12  ... 11.8 % completed 
##   Applying auto ARIMAX to case:  13  ... 12.7 % completed 
##   Applying auto ARIMAX to case:  14  ... 13.7 % completed 
##   Applying auto ARIMAX to case:  15  ... 14.7 % completed 
##   Applying auto ARIMAX to case:  16  ... 15.7 % completed 
##   Applying auto ARIMAX to case:  17  ... 16.7 % completed 
##   Applying auto ARIMAX to case:  18  ... 17.6 % completed 
##   Applying auto ARIMAX to case:  19  ... 18.6 % completed 
##   Applying auto ARIMAX to case:  20  ... 19.6 % completed 
##   Applying auto ARIMAX to case:  21  ... 20.6 % completed 
##   Applying auto ARIMAX to case:  22  ... 21.6 % completed 
##   Applying auto ARIMAX to case:  23  ... 22.5 % completed 
##   Applying auto ARIMAX to case:  24  ... 23.5 % completed 
##   Applying auto ARIMAX to case:  25  ... 24.5 % completed 
##   Applying auto ARIMAX to case:  26  ... 25.5 % completed 
##   Applying auto ARIMAX to case:  27  ... 26.5 % completed 
##   Applying auto ARIMAX to case:  28  ... 27.5 % completed 
##   Applying auto ARIMAX to case:  29  ... 28.4 % completed 
##   Applying auto ARIMAX to case:  30  ... 29.4 % completed 
##   Applying auto ARIMAX to case:  31  ... 30.4 % completed 
##   Applying auto ARIMAX to case:  32  ... 31.4 % completed 
##   Applying auto ARIMAX to case:  33  ... 32.4 % completed 
##   Applying auto ARIMAX to case:  34  ... 33.3 % completed 
##   Applying auto ARIMAX to case:  35  ... 34.3 % completed 
##   Applying auto ARIMAX to case:  36  ... 35.3 % completed 
##   Applying auto ARIMAX to case:  37  ... 36.3 % completed 
##   Applying auto ARIMAX to case:  38  ... 37.3 % completed 
##   Applying auto ARIMAX to case:  39  ... 38.2 % completed 
##   Applying auto ARIMAX to case:  40  ... 39.2 % completed 
##   Applying auto ARIMAX to case:  41  ... 40.2 % completed 
##   Applying auto ARIMAX to case:  42  ... 41.2 % completed 
##   Applying auto ARIMAX to case:  43  ... 42.2 % completed 
##   Applying auto ARIMAX to case:  44  ... 43.1 % completed 
##   Applying auto ARIMAX to case:  45  ... 44.1 % completed 
##   Applying auto ARIMAX to case:  46  ... 45.1 % completed 
##   Applying auto ARIMAX to case:  47  ... 46.1 % completed 
##   Applying auto ARIMAX to case:  48  ... 47.1 % completed 
##   Applying auto ARIMAX to case:  49  ... 48 % completed 
##   Applying auto ARIMAX to case:  50  ... 49 % completed 
##   Applying auto ARIMAX to case:  51  ... 50 % completed 
##   Applying auto ARIMAX to case:  52  ... 51 % completed 
##   Applying auto ARIMAX to case:  53  ... 52 % completed 
##   Applying auto ARIMAX to case:  54  ... 52.9 % completed 
##   Applying auto ARIMAX to case:  55  ... 53.9 % completed 
##   Applying auto ARIMAX to case:  56  ... 54.9 % completed 
##   Applying auto ARIMAX to case:  57  ... 55.9 % completed 
##   Applying auto ARIMAX to case:  58  ... 56.9 % completed 
##   Applying auto ARIMAX to case:  59  ... 57.8 % completed 
##   Applying auto ARIMAX to case:  60  ... 58.8 % completed 
##   Applying auto ARIMAX to case:  61  ... 59.8 % completed 
##   Applying auto ARIMAX to case:  62  ... 60.8 % completed 
##   Applying auto ARIMAX to case:  63  ... 61.8 % completed 
##   Applying auto ARIMAX to case:  64  ... 62.7 % completed 
##   Applying auto ARIMAX to case:  65  ... 63.7 % completed 
##   Applying auto ARIMAX to case:  66  ... 64.7 % completed 
##   Applying auto ARIMAX to case:  67  ... 65.7 % completed 
##   Applying auto ARIMAX to case:  68  ... 66.7 % completed 
##   Applying auto ARIMAX to case:  69  ... 67.6 % completed 
##   Applying auto ARIMAX to case:  70  ... 68.6 % completed 
##   Applying auto ARIMAX to case:  71  ... 69.6 % completed 
##   Applying auto ARIMAX to case:  72  ... 70.6 % completed 
##   Applying auto ARIMAX to case:  73  ... 71.6 % completed 
##   Applying auto ARIMAX to case:  74  ... 72.5 % completed 
##   Applying auto ARIMAX to case:  75  ... 73.5 % completed 
##   Applying auto ARIMAX to case:  76  ... 74.5 % completed 
##   Applying auto ARIMAX to case:  77  ... 75.5 % completed 
##   Applying auto ARIMAX to case:  78  ... 76.5 % completed 
##   Applying auto ARIMAX to case:  79  ... 77.5 % completed 
##   Applying auto ARIMAX to case:  80  ... 78.4 % completed 
##   Applying auto ARIMAX to case:  81  ... 79.4 % completed 
##   Applying auto ARIMAX to case:  82  ... 80.4 % completed 
##   Applying auto ARIMAX to case:  83  ... 81.4 % completed 
##   Applying auto ARIMAX to case:  84  ... 82.4 % completed 
##   Applying auto ARIMAX to case:  85  ... 83.3 % completed 
##   Applying auto ARIMAX to case:  86  ... 84.3 % completed 
##   Applying auto ARIMAX to case:  87  ... 85.3 % completed 
##   Applying auto ARIMAX to case:  88  ... 86.3 % completed 
##   Applying auto ARIMAX to case:  89  ... 87.3 % completed 
##   Applying auto ARIMAX to case:  90  ... 88.2 % completed 
##   Applying auto ARIMAX to case:  91  ... 89.2 % completed 
##   Applying auto ARIMAX to case:  92  ... 90.2 % completed 
##   Applying auto ARIMAX to case:  93  ... 91.2 % completed 
##   Applying auto ARIMAX to case:  94  ... 92.2 % completed 
##   Applying auto ARIMAX to case:  95  ... 93.1 % completed 
##   Applying auto ARIMAX to case:  96  ... 94.1 % completed 
##   Applying auto ARIMAX to case:  97  ... 95.1 % completed 
##   Applying auto ARIMAX to case:  98  ... 96.1 % completed 
##   Applying auto ARIMAX to case:  99  ... 97.1 % completed 
##   Applying auto ARIMAX to case:  100  ... 98 % completed 
##   Applying auto ARIMAX to case:  101  ... 99 % completed 
##   Applying auto ARIMAX to case:  102  ... 100 % completed 
##  
## 
##             1. SUMMARY OF ARIMA PARAMETERS
##  
##  The proportion of AR of order 1 or more is 0.28
##  The proportion of I of order 1 or more is 0.4
##  The proportion of MA of order 1 or more is 0.62
##  
##  
## Running random-effects meta analysis & HLM model for comparison 
##  
##  Random Effects Meta-Analysis Ran correctly without exogenous weights 
##  
##  
##             2. SUMMARY OF RANDOM EFFECTS META ANALYSIS
## 
## Random-Effects Model (k = 102; tau^2 estimator: REML)
## 
##   logLik  deviance       AIC       BIC      AICc   
##  11.7270  -23.4541  -19.4541  -14.2238  -19.3316   
## 
## tau^2 (estimated amount of total heterogeneity): 0.0369 (SE = 0.0068)
## tau (square root of estimated tau^2 value):      0.1922
## I^2 (total heterogeneity / total variability):   77.92%
## H^2 (total variability / sampling variability):  4.53
## 
## Test for Heterogeneity:
## Q(df = 101) = 553.9281, p-val < .0001
## 
## Model Results:
## 
## estimate      se      zval    pval    ci.lb    ci.ub      
##  -0.2969  0.0218  -13.6403  <.0001  -0.3396  -0.2543  *** 
## 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
##  
##  
##             3. I-ARIMAX V/S HLM COMPARISON 
##    
##    OMNIBUS - RMA ESTIMATES VS HLM
## 
##             I-ARIMAX                         HLM     
##    ----------------------------------------------------
##    IARIMAX est.   IARIMAX s.e.       HLM est.   HLM s.e.
##       -0.297          0.022            -0.313      0.02
## 
##    SUMMARY OF INDIVIDUAL EFFECTS
## 
##     AVERAGES:
##                             MEAN:
##      * IARIMAX mean effect:                       -0.2922
##      * HLM mean effect:                           -0.3126
##      * Raw corr mean effect:                      -0.3328
##                           VARIANCE:
##      * IARIMAX variance of individual effects:    0.0445
##      * HLM variance of random effects:            0.0179
##      * Raw corr variance:                         0.0491
## 
##     OPPOSITES:
##      * IARIMAX N cases with opposite direction:   8
##      * HLM N cases with opposite direction:       0
##      * Corr N cases with opposite direction:      9 
## ... 
## I-ARIMAX algorithm finished. 
##  
## Filtering your data based on specified minimum non NA per subject and variance... 
##  
## Your data was filtered: 102 subjects will be used for the analyses 
##  
## Running I-ARIMAX algorithm... 
##  
##   Applying auto ARIMAX to case:  1  ... 1 % completed 
##   Applying auto ARIMAX to case:  2  ... 2 % completed 
##   Applying auto ARIMAX to case:  3  ... 2.9 % completed 
##   Applying auto ARIMAX to case:  4  ... 3.9 % completed 
##   Applying auto ARIMAX to case:  5  ... 4.9 % completed 
##   Applying auto ARIMAX to case:  6  ... 5.9 % completed 
##   Applying auto ARIMAX to case:  7  ... 6.9 % completed 
##   Applying auto ARIMAX to case:  8  ... 7.8 % completed 
##   Applying auto ARIMAX to case:  9  ... 8.8 % completed 
##   Applying auto ARIMAX to case:  10  ... 9.8 % completed 
##   Applying auto ARIMAX to case:  11  ... 10.8 % completed 
##   Applying auto ARIMAX to case:  12  ... 11.8 % completed 
##   Applying auto ARIMAX to case:  13  ... 12.7 % completed 
##   Applying auto ARIMAX to case:  14  ... 13.7 % completed 
##   Applying auto ARIMAX to case:  15  ... 14.7 % completed 
##   Applying auto ARIMAX to case:  16  ... 15.7 % completed 
##   Applying auto ARIMAX to case:  17  ... 16.7 % completed 
##   Applying auto ARIMAX to case:  18  ... 17.6 % completed 
##   Applying auto ARIMAX to case:  19  ... 18.6 % completed 
##   Applying auto ARIMAX to case:  20  ... 19.6 % completed 
##   Applying auto ARIMAX to case:  21  ... 20.6 % completed 
##   Applying auto ARIMAX to case:  22  ... 21.6 % completed 
##   Applying auto ARIMAX to case:  23  ... 22.5 % completed 
##   Applying auto ARIMAX to case:  24  ... 23.5 % completed 
##   Applying auto ARIMAX to case:  25  ... 24.5 % completed 
##   Applying auto ARIMAX to case:  26  ... 25.5 % completed 
##   Applying auto ARIMAX to case:  27  ... 26.5 % completed 
##   Applying auto ARIMAX to case:  28  ... 27.5 % completed 
##   Applying auto ARIMAX to case:  29  ... 28.4 % completed 
##   Applying auto ARIMAX to case:  30  ... 29.4 % completed 
##   Applying auto ARIMAX to case:  31  ... 30.4 % completed 
##   Applying auto ARIMAX to case:  32  ... 31.4 % completed 
##   Applying auto ARIMAX to case:  33  ... 32.4 % completed 
##   Applying auto ARIMAX to case:  34  ... 33.3 % completed 
##   Applying auto ARIMAX to case:  35  ... 34.3 % completed 
##   Applying auto ARIMAX to case:  36  ... 35.3 % completed 
##   Applying auto ARIMAX to case:  37  ... 36.3 % completed 
##   Applying auto ARIMAX to case:  38  ... 37.3 % completed 
##   Applying auto ARIMAX to case:  39  ... 38.2 % completed 
##   Applying auto ARIMAX to case:  40  ... 39.2 % completed 
##   Applying auto ARIMAX to case:  41  ... 40.2 % completed 
##   Applying auto ARIMAX to case:  42  ... 41.2 % completed 
##   Applying auto ARIMAX to case:  43  ... 42.2 % completed 
##   Applying auto ARIMAX to case:  44  ... 43.1 % completed 
##   Applying auto ARIMAX to case:  45  ... 44.1 % completed 
##   Applying auto ARIMAX to case:  46  ... 45.1 % completed 
##   Applying auto ARIMAX to case:  47  ... 46.1 % completed 
##   Applying auto ARIMAX to case:  48  ... 47.1 % completed 
##   Applying auto ARIMAX to case:  49  ... 48 % completed 
##   Applying auto ARIMAX to case:  50  ... 49 % completed 
##   Applying auto ARIMAX to case:  51  ... 50 % completed 
##   Applying auto ARIMAX to case:  52  ... 51 % completed 
##   Applying auto ARIMAX to case:  53  ... 52 % completed 
##   Applying auto ARIMAX to case:  54  ... 52.9 % completed 
##   Applying auto ARIMAX to case:  55  ... 53.9 % completed 
##   Applying auto ARIMAX to case:  56  ... 54.9 % completed 
##   Applying auto ARIMAX to case:  57  ... 55.9 % completed 
##   Applying auto ARIMAX to case:  58  ... 56.9 % completed 
##   Applying auto ARIMAX to case:  59  ... 57.8 % completed 
##   Applying auto ARIMAX to case:  60  ... 58.8 % completed 
##   Applying auto ARIMAX to case:  61  ... 59.8 % completed 
##   Applying auto ARIMAX to case:  62  ... 60.8 % completed 
##   Applying auto ARIMAX to case:  63  ... 61.8 % completed 
##   Applying auto ARIMAX to case:  64  ... 62.7 % completed 
##   Applying auto ARIMAX to case:  65  ... 63.7 % completed 
##   Applying auto ARIMAX to case:  66  ... 64.7 % completed 
##   Applying auto ARIMAX to case:  67  ... 65.7 % completed 
##   Applying auto ARIMAX to case:  68  ... 66.7 % completed 
##   Applying auto ARIMAX to case:  69  ... 67.6 % completed 
##   Applying auto ARIMAX to case:  70  ... 68.6 % completed 
##   Applying auto ARIMAX to case:  71  ... 69.6 % completed 
##   Applying auto ARIMAX to case:  72  ... 70.6 % completed 
##   Applying auto ARIMAX to case:  73  ... 71.6 % completed 
##   Applying auto ARIMAX to case:  74  ... 72.5 % completed 
##   Applying auto ARIMAX to case:  75  ... 73.5 % completed 
##   Applying auto ARIMAX to case:  76  ... 74.5 % completed 
##   Applying auto ARIMAX to case:  77  ... 75.5 % completed 
##   Applying auto ARIMAX to case:  78  ... 76.5 % completed 
##   Applying auto ARIMAX to case:  79  ... 77.5 % completed 
##   Applying auto ARIMAX to case:  80  ... 78.4 % completed 
##   Applying auto ARIMAX to case:  81  ... 79.4 % completed 
##   Applying auto ARIMAX to case:  82  ... 80.4 % completed 
##   Applying auto ARIMAX to case:  83  ... 81.4 % completed 
##   Applying auto ARIMAX to case:  84  ... 82.4 % completed 
##   Applying auto ARIMAX to case:  85  ... 83.3 % completed 
##   Applying auto ARIMAX to case:  86  ... 84.3 % completed 
##   Applying auto ARIMAX to case:  87  ... 85.3 % completed 
##   Applying auto ARIMAX to case:  88  ... 86.3 % completed 
##   Applying auto ARIMAX to case:  89  ... 87.3 % completed 
##   Applying auto ARIMAX to case:  90  ... 88.2 % completed 
##   Applying auto ARIMAX to case:  91  ... 89.2 % completed 
##   Applying auto ARIMAX to case:  92  ... 90.2 % completed 
##   Applying auto ARIMAX to case:  93  ... 91.2 % completed 
##   Applying auto ARIMAX to case:  94  ... 92.2 % completed 
##   Applying auto ARIMAX to case:  95  ... 93.1 % completed 
##   Applying auto ARIMAX to case:  96  ... 94.1 % completed 
##   Applying auto ARIMAX to case:  97  ... 95.1 % completed 
##   Applying auto ARIMAX to case:  98  ... 96.1 % completed 
##   Applying auto ARIMAX to case:  99  ... 97.1 % completed 
##   Applying auto ARIMAX to case:  100  ... 98 % completed 
##   Applying auto ARIMAX to case:  101  ... 99 % completed 
##   Applying auto ARIMAX to case:  102  ... 100 % completed 
##  
## 
##             1. SUMMARY OF ARIMA PARAMETERS
##  
##  The proportion of AR of order 1 or more is 0.33
##  The proportion of I of order 1 or more is 0.43
##  The proportion of MA of order 1 or more is 0.65
##  
##  
## Running random-effects meta analysis & HLM model for comparison 
##  
##  Random Effects Meta-Analysis Ran correctly without exogenous weights 
##  
##  
##             2. SUMMARY OF RANDOM EFFECTS META ANALYSIS
## 
## Random-Effects Model (k = 102; tau^2 estimator: REML)
## 
##   logLik  deviance       AIC       BIC      AICc   
##  24.0538  -48.1077  -44.1077  -38.8774  -43.9852   
## 
## tau^2 (estimated amount of total heterogeneity): 0.0253 (SE = 0.0052)
## tau (square root of estimated tau^2 value):      0.1592
## I^2 (total heterogeneity / total variability):   69.97%
## H^2 (total variability / sampling variability):  3.33
## 
## Test for Heterogeneity:
## Q(df = 101) = 343.8824, p-val < .0001
## 
## Model Results:
## 
## estimate      se      zval    pval    ci.lb    ci.ub      
##  -0.2851  0.0190  -14.9764  <.0001  -0.3224  -0.2478  *** 
## 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
##  
##  
##             3. I-ARIMAX V/S HLM COMPARISON 
##    
##    OMNIBUS - RMA ESTIMATES VS HLM
## 
##             I-ARIMAX                         HLM     
##    ----------------------------------------------------
##    IARIMAX est.   IARIMAX s.e.       HLM est.   HLM s.e.
##       -0.285          0.019            -0.303      0.012
## 
##    SUMMARY OF INDIVIDUAL EFFECTS
## 
##     AVERAGES:
##                             MEAN:
##      * IARIMAX mean effect:                       -0.2791
##      * HLM mean effect:                           -0.303
##      * Raw corr mean effect:                      -0.3219
##                           VARIANCE:
##      * IARIMAX variance of individual effects:    0.0357
##      * HLM variance of random effects:            0
##      * Raw corr variance:                         0.0373
## 
##     OPPOSITES:
##      * IARIMAX N cases with opposite direction:   9
##      * HLM N cases with opposite direction:       0
##      * Corr N cases with opposite direction:      5 
## ... 
## I-ARIMAX algorithm finished. 
## 

Then we are going to do the same thing and run i-ARIMAX on the simulated data

# i-ARIMAX on simulated data set
# Rename columns to same as raw data set
combined_simulated_data_list5 <- combined_simulated_data_list5 %>%
  rename(
    depressedmood_state = V1,
    loneliness_state_pmc = V2,
    socintsatisfaction_state_pmc = V3,
    responsiveness_state_pmc = V4
  )

# Within-person standardization
zDatasim <- i_standarbot_300(combined_simulated_data_list5, imputeThese, "ID", explanation = TRUE)
## This function will create a dataframe with person-mean standardized variables 
## ... 
##    If all values for a feature within ID are NA, will return NA 
##    If there is less than two values, will return 0 (zero variance) 
##    If values are constant, will return 0 (zero variance) 
##    If there is enough variance, will return deviations from the mean 
## 
##    Standardization finished: Your original dataframe with standardized columns appended at the end was returned
# Initialize an empty list to store the results
hoard.iarimax1sim <- list()

# Loop through each independent variable (IV)
for (i in seq_along(IV)) {
  # Create a unique model name for each IV
  model_name <- paste0("IV_", i)
  
  # Run the IARIMAXoid_Pro function and store the result in the list
  hoard.iarimax1sim[[model_name]] <- IARIMAXoid_Pro(
    zDatasim,
    x_series = IV[[i]],  # Current independent variable
    y_series = "depressedmood_state_PSD",  # The single dependent variable
    id_var = "ID",
    hlm_compare = TRUE,
    timevar = "time",
    metaanalysis = TRUE
  )
}
## Filtering your data based on specified minimum non NA per subject and variance... 
##  
## Your data was filtered: 101 subjects will be used for the analyses 
##  
## Running I-ARIMAX algorithm... 
##  
##   Applying auto ARIMAX to case:  1  ... 1 % completed 
##   Applying auto ARIMAX to case:  2  ... 2 % completed 
##   Applying auto ARIMAX to case:  3  ... 3 % completed 
##   Applying auto ARIMAX to case:  4  ... 4 % completed 
##   Applying auto ARIMAX to case:  5  ... 5 % completed 
##   Applying auto ARIMAX to case:  6  ... 5.9 % completed 
##   Applying auto ARIMAX to case:  7  ... 6.9 % completed 
##   Applying auto ARIMAX to case:  8  ... 7.9 % completed 
##   Applying auto ARIMAX to case:  9  ... 8.9 % completed 
##   Applying auto ARIMAX to case:  10  ... 9.9 % completed 
##   Applying auto ARIMAX to case:  11  ... 10.9 % completed 
##   Applying auto ARIMAX to case:  12  ... 11.9 % completed 
##   Applying auto ARIMAX to case:  13  ... 12.9 % completed 
##   Applying auto ARIMAX to case:  14  ... 13.9 % completed 
##   Applying auto ARIMAX to case:  15  ... 14.9 % completed 
##   Applying auto ARIMAX to case:  16  ... 15.8 % completed 
##   Applying auto ARIMAX to case:  17  ... 16.8 % completed 
##   Applying auto ARIMAX to case:  18  ... 17.8 % completed 
##   Applying auto ARIMAX to case:  19  ... 18.8 % completed 
##   Applying auto ARIMAX to case:  20  ... 19.8 % completed 
##   Applying auto ARIMAX to case:  21  ... 20.8 % completed 
##   Applying auto ARIMAX to case:  22  ... 21.8 % completed 
##   Applying auto ARIMAX to case:  23  ... 22.8 % completed 
##   Applying auto ARIMAX to case:  24  ... 23.8 % completed 
##   Applying auto ARIMAX to case:  25  ... 24.8 % completed 
##   Applying auto ARIMAX to case:  26  ... 25.7 % completed 
##   Applying auto ARIMAX to case:  27  ... 26.7 % completed 
##   Applying auto ARIMAX to case:  28  ... 27.7 % completed 
##   Applying auto ARIMAX to case:  29  ... 28.7 % completed 
##   Applying auto ARIMAX to case:  30  ... 29.7 % completed 
##   Applying auto ARIMAX to case:  31  ... 30.7 % completed 
##   Applying auto ARIMAX to case:  32  ... 31.7 % completed 
##   Applying auto ARIMAX to case:  33  ... 32.7 % completed 
##   Applying auto ARIMAX to case:  34  ... 33.7 % completed 
##   Applying auto ARIMAX to case:  35  ... 34.7 % completed 
##   Applying auto ARIMAX to case:  36  ... 35.6 % completed 
##   Applying auto ARIMAX to case:  37  ... 36.6 % completed 
##   Applying auto ARIMAX to case:  38  ... 37.6 % completed 
##   Applying auto ARIMAX to case:  39  ... 38.6 % completed 
##   Applying auto ARIMAX to case:  40  ... 39.6 % completed 
##   Applying auto ARIMAX to case:  41  ... 40.6 % completed 
##   Applying auto ARIMAX to case:  42  ... 41.6 % completed 
##   Applying auto ARIMAX to case:  43  ... 42.6 % completed 
##   Applying auto ARIMAX to case:  44  ... 43.6 % completed 
##   Applying auto ARIMAX to case:  45  ... 44.6 % completed 
##   Applying auto ARIMAX to case:  46  ... 45.5 % completed 
##   Applying auto ARIMAX to case:  47  ... 46.5 % completed 
##   Applying auto ARIMAX to case:  48  ... 47.5 % completed 
##   Applying auto ARIMAX to case:  49  ... 48.5 % completed 
##   Applying auto ARIMAX to case:  50  ... 
##  
##    Error running ARIMAX model for case:  50 
##     Lapack routine dgesv: system is exactly singular: U[1,1] = 0 
## 
##     Skipping case due to error:         ...  49.5 % completed 
##  
##   Applying auto ARIMAX to case:  51  ... 50.5 % completed 
##   Applying auto ARIMAX to case:  52  ... 51.5 % completed 
##   Applying auto ARIMAX to case:  53  ... 52.5 % completed 
##   Applying auto ARIMAX to case:  54  ... 53.5 % completed 
##   Applying auto ARIMAX to case:  55  ... 54.5 % completed 
##   Applying auto ARIMAX to case:  56  ... 55.4 % completed 
##   Applying auto ARIMAX to case:  57  ... 56.4 % completed 
##   Applying auto ARIMAX to case:  58  ... 57.4 % completed 
##   Applying auto ARIMAX to case:  59  ... 58.4 % completed 
##   Applying auto ARIMAX to case:  60  ... 59.4 % completed 
##   Applying auto ARIMAX to case:  61  ... 60.4 % completed 
##   Applying auto ARIMAX to case:  62  ... 61.4 % completed 
##   Applying auto ARIMAX to case:  63  ... 62.4 % completed 
##   Applying auto ARIMAX to case:  64  ... 63.4 % completed 
##   Applying auto ARIMAX to case:  65  ... 64.4 % completed 
##   Applying auto ARIMAX to case:  66  ... 65.3 % completed 
##   Applying auto ARIMAX to case:  67  ... 66.3 % completed 
##   Applying auto ARIMAX to case:  68  ... 67.3 % completed 
##   Applying auto ARIMAX to case:  69  ... 68.3 % completed 
##   Applying auto ARIMAX to case:  70  ... 69.3 % completed 
##   Applying auto ARIMAX to case:  71  ... 70.3 % completed 
##   Applying auto ARIMAX to case:  72  ... 71.3 % completed 
##   Applying auto ARIMAX to case:  73  ... 72.3 % completed 
##   Applying auto ARIMAX to case:  74  ... 73.3 % completed 
##   Applying auto ARIMAX to case:  75  ... 74.3 % completed 
##   Applying auto ARIMAX to case:  76  ... 75.2 % completed 
##   Applying auto ARIMAX to case:  77  ... 76.2 % completed 
##   Applying auto ARIMAX to case:  79  ... 77.2 % completed 
##   Applying auto ARIMAX to case:  80  ... 78.2 % completed 
##   Applying auto ARIMAX to case:  81  ... 79.2 % completed 
##   Applying auto ARIMAX to case:  82  ... 80.2 % completed 
##   Applying auto ARIMAX to case:  83  ... 81.2 % completed 
##   Applying auto ARIMAX to case:  84  ... 82.2 % completed 
##   Applying auto ARIMAX to case:  85  ... 83.2 % completed 
##   Applying auto ARIMAX to case:  86  ... 84.2 % completed 
##   Applying auto ARIMAX to case:  87  ... 85.1 % completed 
##   Applying auto ARIMAX to case:  88  ... 86.1 % completed 
##   Applying auto ARIMAX to case:  89  ... 87.1 % completed 
##   Applying auto ARIMAX to case:  90  ... 88.1 % completed 
##   Applying auto ARIMAX to case:  91  ... 89.1 % completed 
##   Applying auto ARIMAX to case:  92  ... 90.1 % completed 
##   Applying auto ARIMAX to case:  93  ... 91.1 % completed 
##   Applying auto ARIMAX to case:  94  ... 92.1 % completed 
##   Applying auto ARIMAX to case:  95  ... 93.1 % completed 
##   Applying auto ARIMAX to case:  96  ... 94.1 % completed 
##   Applying auto ARIMAX to case:  97  ... 95 % completed 
##   Applying auto ARIMAX to case:  98  ... 96 % completed 
##   Applying auto ARIMAX to case:  99  ... 97 % completed 
##   Applying auto ARIMAX to case:  100  ... 98 % completed 
##   Applying auto ARIMAX to case:  101  ... 99 % completed 
##   Applying auto ARIMAX to case:  102  ... 100 % completed 
##  
## 
##             1. SUMMARY OF ARIMA PARAMETERS
##  
##  The proportion of AR of order 1 or more is 0.57
##  The proportion of I of order 1 or more is 0.09
##  The proportion of MA of order 1 or more is 0.86
##  
##  
## Running random-effects meta analysis & HLM model for comparison 
## 
## Warning: 1 study with NAs omitted from model fitting.
##  Random Effects Meta-Analysis Ran correctly without exogenous weights 
##  
##  
##             2. SUMMARY OF RANDOM EFFECTS META ANALYSIS
## 
## Random-Effects Model (k = 100; tau^2 estimator: REML)
## 
##   logLik  deviance       AIC       BIC      AICc   
##  11.2595  -22.5189  -18.5189  -13.3287  -18.3939   
## 
## tau^2 (estimated amount of total heterogeneity): 0.0443 (SE = 0.0068)
## tau (square root of estimated tau^2 value):      0.2104
## I^2 (total heterogeneity / total variability):   98.42%
## H^2 (total variability / sampling variability):  63.13
## 
## Test for Heterogeneity:
## Q(df = 99) = 45645.6257, p-val < .0001
## 
## Model Results:
## 
## estimate      se     zval    pval   ci.lb   ci.ub      
##   0.5068  0.0219  23.1917  <.0001  0.4640  0.5497  *** 
## 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
##  
##  
##             3. I-ARIMAX V/S HLM COMPARISON 
##    
##    OMNIBUS - RMA ESTIMATES VS HLM
## 
##             I-ARIMAX                         HLM     
##    ----------------------------------------------------
##    IARIMAX est.   IARIMAX s.e.       HLM est.   HLM s.e.
##       0.507          0.022            0.506      0.021
## 
##    SUMMARY OF INDIVIDUAL EFFECTS
## 
##     AVERAGES:
##                             MEAN:
##      * IARIMAX mean effect:                       0.5049
##      * HLM mean effect:                           0.5057
##      * Raw corr mean effect:                      0.519
##                           VARIANCE:
##      * IARIMAX variance of individual effects:    0.0456
##      * HLM variance of random effects:            0.0337
##      * Raw corr variance:                         0.0456
## 
##     OPPOSITES:
##      * IARIMAX N cases with opposite direction:   2
##      * HLM N cases with opposite direction:       1
##      * Corr N cases with opposite direction:      2 
## ... 
## I-ARIMAX algorithm finished. 
##  
## Filtering your data based on specified minimum non NA per subject and variance... 
##  
## Your data was filtered: 101 subjects will be used for the analyses 
##  
## Running I-ARIMAX algorithm... 
##  
##   Applying auto ARIMAX to case:  1  ... 1 % completed 
##   Applying auto ARIMAX to case:  2  ... 2 % completed 
##   Applying auto ARIMAX to case:  3  ... 3 % completed 
##   Applying auto ARIMAX to case:  4  ... 4 % completed 
##   Applying auto ARIMAX to case:  5  ... 5 % completed 
##   Applying auto ARIMAX to case:  6  ... 5.9 % completed 
##   Applying auto ARIMAX to case:  7  ... 6.9 % completed 
##   Applying auto ARIMAX to case:  8  ... 7.9 % completed 
##   Applying auto ARIMAX to case:  9  ... 8.9 % completed 
##   Applying auto ARIMAX to case:  10  ... 9.9 % completed 
##   Applying auto ARIMAX to case:  11  ... 10.9 % completed 
##   Applying auto ARIMAX to case:  12  ... 11.9 % completed 
##   Applying auto ARIMAX to case:  13  ... 12.9 % completed 
##   Applying auto ARIMAX to case:  14  ... 13.9 % completed 
##   Applying auto ARIMAX to case:  15  ... 14.9 % completed 
##   Applying auto ARIMAX to case:  16  ... 15.8 % completed 
##   Applying auto ARIMAX to case:  17  ... 16.8 % completed 
##   Applying auto ARIMAX to case:  18  ... 17.8 % completed 
##   Applying auto ARIMAX to case:  19  ... 18.8 % completed 
##   Applying auto ARIMAX to case:  20  ... 19.8 % completed 
##   Applying auto ARIMAX to case:  21  ... 20.8 % completed 
##   Applying auto ARIMAX to case:  22  ... 21.8 % completed 
##   Applying auto ARIMAX to case:  23  ... 22.8 % completed 
##   Applying auto ARIMAX to case:  24  ... 23.8 % completed 
##   Applying auto ARIMAX to case:  25  ... 24.8 % completed 
##   Applying auto ARIMAX to case:  26  ... 25.7 % completed 
##   Applying auto ARIMAX to case:  27  ... 26.7 % completed 
##   Applying auto ARIMAX to case:  28  ... 27.7 % completed 
##   Applying auto ARIMAX to case:  29  ... 28.7 % completed 
##   Applying auto ARIMAX to case:  30  ... 29.7 % completed 
##   Applying auto ARIMAX to case:  31  ... 30.7 % completed 
##   Applying auto ARIMAX to case:  32  ... 31.7 % completed 
##   Applying auto ARIMAX to case:  33  ... 32.7 % completed 
##   Applying auto ARIMAX to case:  34  ... 33.7 % completed 
##   Applying auto ARIMAX to case:  35  ... 34.7 % completed 
##   Applying auto ARIMAX to case:  36  ... 35.6 % completed 
##   Applying auto ARIMAX to case:  37  ... 36.6 % completed 
##   Applying auto ARIMAX to case:  38  ... 37.6 % completed 
##   Applying auto ARIMAX to case:  39  ... 38.6 % completed 
##   Applying auto ARIMAX to case:  40  ... 39.6 % completed 
##   Applying auto ARIMAX to case:  41  ... 40.6 % completed 
##   Applying auto ARIMAX to case:  42  ... 41.6 % completed 
##   Applying auto ARIMAX to case:  43  ... 42.6 % completed 
##   Applying auto ARIMAX to case:  44  ... 43.6 % completed 
##   Applying auto ARIMAX to case:  45  ... 44.6 % completed 
##   Applying auto ARIMAX to case:  46  ... 45.5 % completed 
##   Applying auto ARIMAX to case:  47  ... 46.5 % completed 
##   Applying auto ARIMAX to case:  48  ... 47.5 % completed 
##   Applying auto ARIMAX to case:  49  ... 48.5 % completed 
##   Applying auto ARIMAX to case:  50  ... 
##  
##    Error running ARIMAX model for case:  50 
##     Lapack routine dgesv: system is exactly singular: U[1,1] = 0 
## 
##     Skipping case due to error:         ...  49.5 % completed 
##  
##   Applying auto ARIMAX to case:  51  ... 50.5 % completed 
##   Applying auto ARIMAX to case:  52  ... 51.5 % completed 
##   Applying auto ARIMAX to case:  53  ... 52.5 % completed 
##   Applying auto ARIMAX to case:  54  ... 53.5 % completed 
##   Applying auto ARIMAX to case:  55  ... 54.5 % completed 
##   Applying auto ARIMAX to case:  56  ... 55.4 % completed 
##   Applying auto ARIMAX to case:  57  ... 56.4 % completed 
##   Applying auto ARIMAX to case:  58  ... 57.4 % completed 
##   Applying auto ARIMAX to case:  59  ... 58.4 % completed 
##   Applying auto ARIMAX to case:  60  ... 59.4 % completed 
##   Applying auto ARIMAX to case:  61  ... 60.4 % completed 
##   Applying auto ARIMAX to case:  62  ... 61.4 % completed 
##   Applying auto ARIMAX to case:  63  ... 62.4 % completed 
##   Applying auto ARIMAX to case:  64  ... 63.4 % completed 
##   Applying auto ARIMAX to case:  65  ... 64.4 % completed 
##   Applying auto ARIMAX to case:  66  ... 65.3 % completed 
##   Applying auto ARIMAX to case:  67  ... 66.3 % completed 
##   Applying auto ARIMAX to case:  68  ... 67.3 % completed 
##   Applying auto ARIMAX to case:  69  ... 68.3 % completed 
##   Applying auto ARIMAX to case:  70  ... 69.3 % completed 
##   Applying auto ARIMAX to case:  71  ... 70.3 % completed 
##   Applying auto ARIMAX to case:  72  ... 71.3 % completed 
##   Applying auto ARIMAX to case:  73  ... 72.3 % completed 
##   Applying auto ARIMAX to case:  74  ... 73.3 % completed 
##   Applying auto ARIMAX to case:  75  ... 74.3 % completed 
##   Applying auto ARIMAX to case:  76  ... 75.2 % completed 
##   Applying auto ARIMAX to case:  77  ... 76.2 % completed 
##   Applying auto ARIMAX to case:  79  ... 77.2 % completed 
##   Applying auto ARIMAX to case:  80  ... 78.2 % completed 
##   Applying auto ARIMAX to case:  81  ... 79.2 % completed 
##   Applying auto ARIMAX to case:  82  ... 80.2 % completed 
##   Applying auto ARIMAX to case:  83  ... 81.2 % completed 
##   Applying auto ARIMAX to case:  84  ... 82.2 % completed 
##   Applying auto ARIMAX to case:  85  ... 83.2 % completed 
##   Applying auto ARIMAX to case:  86  ... 84.2 % completed 
##   Applying auto ARIMAX to case:  87  ... 85.1 % completed 
##   Applying auto ARIMAX to case:  88  ... 86.1 % completed 
##   Applying auto ARIMAX to case:  89  ... 87.1 % completed 
##   Applying auto ARIMAX to case:  90  ... 88.1 % completed 
##   Applying auto ARIMAX to case:  91  ... 89.1 % completed 
##   Applying auto ARIMAX to case:  92  ... 90.1 % completed 
##   Applying auto ARIMAX to case:  93  ... 91.1 % completed 
##   Applying auto ARIMAX to case:  94  ... 92.1 % completed 
##   Applying auto ARIMAX to case:  95  ... 93.1 % completed 
##   Applying auto ARIMAX to case:  96  ... 94.1 % completed 
##   Applying auto ARIMAX to case:  97  ... 95 % completed 
##   Applying auto ARIMAX to case:  98  ... 96 % completed 
##   Applying auto ARIMAX to case:  99  ... 97 % completed 
##   Applying auto ARIMAX to case:  100  ... 98 % completed 
##   Applying auto ARIMAX to case:  101  ... 99 % completed 
##   Applying auto ARIMAX to case:  102  ... 100 % completed 
##  
## 
##             1. SUMMARY OF ARIMA PARAMETERS
##  
##  The proportion of AR of order 1 or more is 0.39
##  The proportion of I of order 1 or more is 0.12
##  The proportion of MA of order 1 or more is 0.63
##  
##  
## Running random-effects meta analysis & HLM model for comparison 
## 
## Warning: 1 study with NAs omitted from model fitting.
##  Random Effects Meta-Analysis Ran correctly without exogenous weights 
##  
##  
##             2. SUMMARY OF RANDOM EFFECTS META ANALYSIS
## 
## Random-Effects Model (k = 100; tau^2 estimator: REML)
## 
##   logLik  deviance       AIC       BIC      AICc   
## -29.7210   59.4420   63.4420   68.6322   63.5670   
## 
## tau^2 (estimated amount of total heterogeneity): 0.0971 (SE = 0.0146)
## tau (square root of estimated tau^2 value):      0.3116
## I^2 (total heterogeneity / total variability):   99.32%
## H^2 (total variability / sampling variability):  146.02
## 
## Test for Heterogeneity:
## Q(df = 99) = 151369.9745, p-val < .0001
## 
## Model Results:
## 
## estimate      se     zval    pval    ci.lb    ci.ub      
##  -0.2894  0.0321  -9.0291  <.0001  -0.3522  -0.2266  *** 
## 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
##  
##  
##             3. I-ARIMAX V/S HLM COMPARISON 
##    
##    OMNIBUS - RMA ESTIMATES VS HLM
## 
##             I-ARIMAX                         HLM     
##    ----------------------------------------------------
##    IARIMAX est.   IARIMAX s.e.       HLM est.   HLM s.e.
##       -0.289          0.032            -0.264      0.03
## 
##    SUMMARY OF INDIVIDUAL EFFECTS
## 
##     AVERAGES:
##                             MEAN:
##      * IARIMAX mean effect:                       -0.2918
##      * HLM mean effect:                           -0.2636
##      * Raw corr mean effect:                      -0.2759
##                           VARIANCE:
##      * IARIMAX variance of individual effects:    0.1114
##      * HLM variance of random effects:            0.0786
##      * Raw corr variance:                         0.0994
## 
##     OPPOSITES:
##      * IARIMAX N cases with opposite direction:   14
##      * HLM N cases with opposite direction:       11
##      * Corr N cases with opposite direction:      12 
## ... 
## I-ARIMAX algorithm finished. 
##  
## Filtering your data based on specified minimum non NA per subject and variance... 
##  
## Your data was filtered: 101 subjects will be used for the analyses 
##  
## Running I-ARIMAX algorithm... 
##  
##   Applying auto ARIMAX to case:  1  ... 1 % completed 
##   Applying auto ARIMAX to case:  2  ... 2 % completed 
##   Applying auto ARIMAX to case:  3  ... 3 % completed 
##   Applying auto ARIMAX to case:  4  ... 4 % completed 
##   Applying auto ARIMAX to case:  5  ... 5 % completed 
##   Applying auto ARIMAX to case:  6  ... 5.9 % completed 
##   Applying auto ARIMAX to case:  7  ... 6.9 % completed 
##   Applying auto ARIMAX to case:  8  ... 7.9 % completed 
##   Applying auto ARIMAX to case:  9  ... 8.9 % completed 
##   Applying auto ARIMAX to case:  10  ... 9.9 % completed 
##   Applying auto ARIMAX to case:  11  ... 10.9 % completed 
##   Applying auto ARIMAX to case:  12  ... 11.9 % completed 
##   Applying auto ARIMAX to case:  13  ... 12.9 % completed 
##   Applying auto ARIMAX to case:  14  ... 13.9 % completed 
##   Applying auto ARIMAX to case:  15  ... 14.9 % completed 
##   Applying auto ARIMAX to case:  16  ... 15.8 % completed 
##   Applying auto ARIMAX to case:  17  ... 16.8 % completed 
##   Applying auto ARIMAX to case:  18  ... 17.8 % completed 
##   Applying auto ARIMAX to case:  19  ... 18.8 % completed 
##   Applying auto ARIMAX to case:  20  ... 19.8 % completed 
##   Applying auto ARIMAX to case:  21  ... 20.8 % completed 
##   Applying auto ARIMAX to case:  22  ... 21.8 % completed 
##   Applying auto ARIMAX to case:  23  ... 22.8 % completed 
##   Applying auto ARIMAX to case:  24  ... 23.8 % completed 
##   Applying auto ARIMAX to case:  25  ... 24.8 % completed 
##   Applying auto ARIMAX to case:  26  ... 25.7 % completed 
##   Applying auto ARIMAX to case:  27  ... 26.7 % completed 
##   Applying auto ARIMAX to case:  28  ... 27.7 % completed 
##   Applying auto ARIMAX to case:  29  ... 28.7 % completed 
##   Applying auto ARIMAX to case:  30  ... 29.7 % completed 
##   Applying auto ARIMAX to case:  31  ... 30.7 % completed 
##   Applying auto ARIMAX to case:  32  ... 31.7 % completed 
##   Applying auto ARIMAX to case:  33  ... 32.7 % completed 
##   Applying auto ARIMAX to case:  34  ... 33.7 % completed 
##   Applying auto ARIMAX to case:  35  ... 34.7 % completed 
##   Applying auto ARIMAX to case:  36  ... 35.6 % completed 
##   Applying auto ARIMAX to case:  37  ... 36.6 % completed 
##   Applying auto ARIMAX to case:  38  ... 37.6 % completed 
##   Applying auto ARIMAX to case:  39  ... 38.6 % completed 
##   Applying auto ARIMAX to case:  40  ... 39.6 % completed 
##   Applying auto ARIMAX to case:  41  ... 40.6 % completed 
##   Applying auto ARIMAX to case:  42  ... 41.6 % completed 
##   Applying auto ARIMAX to case:  43  ... 42.6 % completed 
##   Applying auto ARIMAX to case:  44  ... 43.6 % completed 
##   Applying auto ARIMAX to case:  45  ... 44.6 % completed 
##   Applying auto ARIMAX to case:  46  ... 45.5 % completed 
##   Applying auto ARIMAX to case:  47  ... 46.5 % completed 
##   Applying auto ARIMAX to case:  48  ... 47.5 % completed 
##   Applying auto ARIMAX to case:  49  ... 48.5 % completed 
##   Applying auto ARIMAX to case:  50  ... 
##  
##    Error running ARIMAX model for case:  50 
##     Lapack routine dgesv: system is exactly singular: U[1,1] = 0 
## 
##     Skipping case due to error:         ...  49.5 % completed 
##  
##   Applying auto ARIMAX to case:  51  ... 50.5 % completed 
##   Applying auto ARIMAX to case:  52  ... 51.5 % completed 
##   Applying auto ARIMAX to case:  53  ... 52.5 % completed 
##   Applying auto ARIMAX to case:  54  ... 53.5 % completed 
##   Applying auto ARIMAX to case:  55  ... 54.5 % completed 
##   Applying auto ARIMAX to case:  56  ... 55.4 % completed 
##   Applying auto ARIMAX to case:  57  ... 56.4 % completed 
##   Applying auto ARIMAX to case:  58  ... 57.4 % completed 
##   Applying auto ARIMAX to case:  59  ... 58.4 % completed 
##   Applying auto ARIMAX to case:  60  ... 59.4 % completed 
##   Applying auto ARIMAX to case:  61  ... 60.4 % completed 
##   Applying auto ARIMAX to case:  62  ... 61.4 % completed 
##   Applying auto ARIMAX to case:  63  ... 62.4 % completed 
##   Applying auto ARIMAX to case:  64  ... 63.4 % completed 
##   Applying auto ARIMAX to case:  65  ... 64.4 % completed 
##   Applying auto ARIMAX to case:  66  ... 65.3 % completed 
##   Applying auto ARIMAX to case:  67  ... 66.3 % completed 
##   Applying auto ARIMAX to case:  68  ... 67.3 % completed 
##   Applying auto ARIMAX to case:  69  ... 68.3 % completed 
##   Applying auto ARIMAX to case:  70  ... 69.3 % completed 
##   Applying auto ARIMAX to case:  71  ... 70.3 % completed 
##   Applying auto ARIMAX to case:  72  ... 71.3 % completed 
##   Applying auto ARIMAX to case:  73  ... 72.3 % completed 
##   Applying auto ARIMAX to case:  74  ... 73.3 % completed 
##   Applying auto ARIMAX to case:  75  ... 74.3 % completed 
##   Applying auto ARIMAX to case:  76  ... 75.2 % completed 
##   Applying auto ARIMAX to case:  77  ... 76.2 % completed 
##   Applying auto ARIMAX to case:  79  ... 77.2 % completed 
##   Applying auto ARIMAX to case:  80  ... 78.2 % completed 
##   Applying auto ARIMAX to case:  81  ... 79.2 % completed 
##   Applying auto ARIMAX to case:  82  ... 80.2 % completed 
##   Applying auto ARIMAX to case:  83  ... 81.2 % completed 
##   Applying auto ARIMAX to case:  84  ... 82.2 % completed 
##   Applying auto ARIMAX to case:  85  ... 83.2 % completed 
##   Applying auto ARIMAX to case:  86  ... 84.2 % completed 
##   Applying auto ARIMAX to case:  87  ... 85.1 % completed 
##   Applying auto ARIMAX to case:  88  ... 86.1 % completed 
##   Applying auto ARIMAX to case:  89  ... 87.1 % completed 
##   Applying auto ARIMAX to case:  90  ... 88.1 % completed 
##   Applying auto ARIMAX to case:  91  ... 89.1 % completed 
##   Applying auto ARIMAX to case:  92  ... 90.1 % completed 
##   Applying auto ARIMAX to case:  93  ... 91.1 % completed 
##   Applying auto ARIMAX to case:  94  ... 92.1 % completed 
##   Applying auto ARIMAX to case:  95  ... 93.1 % completed 
##   Applying auto ARIMAX to case:  96  ... 94.1 % completed 
##   Applying auto ARIMAX to case:  97  ... 95 % completed 
##   Applying auto ARIMAX to case:  98  ... 96 % completed 
##   Applying auto ARIMAX to case:  99  ... 97 % completed 
##   Applying auto ARIMAX to case:  100  ... 98 % completed 
##   Applying auto ARIMAX to case:  101  ... 99 % completed 
##   Applying auto ARIMAX to case:  102  ... 100 % completed 
##  
## 
##             1. SUMMARY OF ARIMA PARAMETERS
##  
##  The proportion of AR of order 1 or more is 0.43
##  The proportion of I of order 1 or more is 0.21
##  The proportion of MA of order 1 or more is 0.64
##  
##  
## Running random-effects meta analysis & HLM model for comparison 
## 
## Warning: 1 study with NAs omitted from model fitting.
##  Random Effects Meta-Analysis Ran correctly without exogenous weights 
##  
##  
##             2. SUMMARY OF RANDOM EFFECTS META ANALYSIS
## 
## Random-Effects Model (k = 100; tau^2 estimator: REML)
## 
##   logLik  deviance       AIC       BIC      AICc   
##  -8.9028   17.8056   21.8056   26.9958   21.9306   
## 
## tau^2 (estimated amount of total heterogeneity): 0.0644 (SE = 0.0100)
## tau (square root of estimated tau^2 value):      0.2537
## I^2 (total heterogeneity / total variability):   99.80%
## H^2 (total variability / sampling variability):  502.30
## 
## Test for Heterogeneity:
## Q(df = 99) = 34198.7049, p-val < .0001
## 
## Model Results:
## 
## estimate      se      zval    pval    ci.lb    ci.ub      
##  -0.2902  0.0265  -10.9504  <.0001  -0.3421  -0.2382  *** 
## 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
##  
##  
##             3. I-ARIMAX V/S HLM COMPARISON 
##    
##    OMNIBUS - RMA ESTIMATES VS HLM
## 
##             I-ARIMAX                         HLM     
##    ----------------------------------------------------
##    IARIMAX est.   IARIMAX s.e.       HLM est.   HLM s.e.
##       -0.29          0.027            -0.28      0.027
## 
##    SUMMARY OF INDIVIDUAL EFFECTS
## 
##     AVERAGES:
##                             MEAN:
##      * IARIMAX mean effect:                       -0.2893
##      * HLM mean effect:                           -0.2803
##      * Raw corr mean effect:                      -0.2947
##                           VARIANCE:
##      * IARIMAX variance of individual effects:    0.0706
##      * HLM variance of random effects:            0.0594
##      * Raw corr variance:                         0.0807
## 
##     OPPOSITES:
##      * IARIMAX N cases with opposite direction:   13
##      * HLM N cases with opposite direction:       8
##      * Corr N cases with opposite direction:      13 
## ... 
## I-ARIMAX algorithm finished. 
## 

Comparing results raw vs simualted

Now we can compare the results between the raw data and simualted data for variable of loneliness using density and ecdf plots. First plots for loneliness and depressed mood

# Extracting raw i-ARIMAX scores
IARIMAXrawxreg <- hoard.iarimax1$IV_1$results_df$xreg
IARIMAXrawxreg <- data.frame(IARIMAXrawxreg)
IARIMAXrawxreg <- IARIMAXrawxreg %>%
  mutate(pid = row_number())

# Extracting sim i-ARIMAX scores
IARIMAXsimxreg<- hoard.iarimax1sim$IV_1$results_df$xreg
IARIMAXsimxreg <- data.frame(IARIMAXsimxreg)
IARIMAXsimxreg <- IARIMAXsimxreg %>%
  mutate(pid = row_number())

# Combine together
lonelinessplotdata <- left_join(IARIMAXsimxreg, IARIMAXrawxreg, by = "pid")

# Prepare data set
library(tidyr)
lonelinessplotdata <- lonelinessplotdata %>% 
  pivot_longer(cols = c("IARIMAXsimxreg", "IARIMAXrawxreg"), names_to = "Method", values_to = "estimate")

library(ggplot2)
## Warning: package 'ggplot2' was built under R version 4.3.3
library(viridis)
## Warning: package 'viridis' was built under R version 4.3.3
## Loading required package: viridisLite
lonelinessplotdata %>%
  ggplot(aes(x = estimate, fill = Method)) +
  geom_density(alpha = 0.5) +
  ylab("Density") +
  xlab("Effect Size of the Link Between loneliness and depressedmood") +
  scale_fill_viridis(discrete=TRUE) +
  theme_bw()
## Warning: Removed 1 row containing non-finite outside the scale range
## (`stat_density()`).

# Plot data (ecdf)
ggplot(lonelinessplotdata, aes(estimate, colour = Method)) +
  stat_ecdf(geom = "step", pad = FALSE, linewidth = 1) +
  ylab("Empirical Cumulative Distribution Function") +
  xlab("Effect Size of the Link Between loneliness and depressedmood") +
  scale_y_continuous(breaks = seq(0.00, 1.00, by = 0.10)) +
  scale_x_continuous(breaks = seq(-1.0, 1.0, by = 0.20)) +
  scale_color_viridis(discrete=TRUE) +
  theme_bw()
## Warning: Removed 1 row containing non-finite outside the scale range
## (`stat_ecdf()`).

Next, compare results for variable 2 - social interaction satisfaction

# Extracting raw i-ARIMAX scores
IARIMAXrawxreg <- hoard.iarimax1$IV_2$results_df$xreg
IARIMAXrawxreg <- data.frame(IARIMAXrawxreg)
IARIMAXrawxreg <- IARIMAXrawxreg %>%
  mutate(pid = row_number())

# Extracting sim i-ARIMAX scores
IARIMAXsimxreg<- hoard.iarimax1sim$IV_2$results_df$xreg
IARIMAXsimxreg <- data.frame(IARIMAXsimxreg)
IARIMAXsimxreg <- IARIMAXsimxreg %>%
  mutate(pid = row_number())

# Combine together
lonelinessplotdata <- left_join(IARIMAXsimxreg, IARIMAXrawxreg, by = "pid")

# Prepare data set

lonelinessplotdata <- lonelinessplotdata %>% 
  pivot_longer(cols = c("IARIMAXsimxreg", "IARIMAXrawxreg"), names_to = "Method", values_to = "estimate")

# Plot density
lonelinessplotdata %>%
  ggplot(aes(x = estimate, fill = Method)) +
  geom_density(alpha = 0.5) +
  ylab("Density") +
  xlab("Effect Size of the Link Between social interaction satisfaction and depressedmood") +
  scale_fill_viridis(discrete=TRUE) +
  theme_bw()
## Warning: Removed 1 row containing non-finite outside the scale range
## (`stat_density()`).

# Plot data (ecdf)
ggplot(lonelinessplotdata, aes(estimate, colour = Method)) +
  stat_ecdf(geom = "step", pad = FALSE, linewidth = 1) +
  ylab("Empirical Cumulative Distribution Function") +
  xlab("Effect Size of the Link Between social interaction satisfaction and depressedmood") +
  scale_y_continuous(breaks = seq(0.00, 1.00, by = 0.10)) +
  scale_x_continuous(breaks = seq(-1.0, 1.0, by = 0.20)) +
  scale_color_viridis(discrete=TRUE) +
  theme_bw()
## Warning: Removed 1 row containing non-finite outside the scale range
## (`stat_ecdf()`).

Last, compare results for responsiveness

# Extracting raw i-ARIMAX scores
IARIMAXrawxreg <- hoard.iarimax1$IV_3$results_df$xreg
IARIMAXrawxreg <- data.frame(IARIMAXrawxreg)
IARIMAXrawxreg <- IARIMAXrawxreg %>%
  mutate(pid = row_number())

# Extracting sim i-ARIMAX scores
IARIMAXsimxreg<- hoard.iarimax1sim$IV_3$results_df$xreg
IARIMAXsimxreg <- data.frame(IARIMAXsimxreg)
IARIMAXsimxreg <- IARIMAXsimxreg %>%
  mutate(pid = row_number())

# Combine together
lonelinessplotdata <- left_join(IARIMAXsimxreg, IARIMAXrawxreg, by = "pid")

# Prepare data set

lonelinessplotdata <- lonelinessplotdata %>% 
  pivot_longer(cols = c("IARIMAXsimxreg", "IARIMAXrawxreg"), names_to = "Method", values_to = "estimate")

# Plot density 
lonelinessplotdata %>%
  ggplot(aes(x = estimate, fill = Method)) +
  geom_density(alpha = 0.5) +
  ylab("Density") +
  xlab("Effect Size of the Link Between responsiveness and depressedmood") +
  scale_fill_viridis(discrete=TRUE) +
  theme_bw()
## Warning: Removed 1 row containing non-finite outside the scale range
## (`stat_density()`).

# Plot data (ecdf)
ggplot(lonelinessplotdata, aes(estimate, colour = Method)) +
  stat_ecdf(geom = "step", pad = FALSE, linewidth = 1) +
  ylab("Empirical Cumulative Distribution Function") +
  xlab("Effect Size of the Link Between responsiveness and depressedmood") +
  scale_y_continuous(breaks = seq(0.00, 1.00, by = 0.10)) +
  scale_x_continuous(breaks = seq(-1.0, 1.0, by = 0.20)) +
  scale_color_viridis(discrete=TRUE) +
  theme_bw()
## Warning: Removed 1 row containing non-finite outside the scale range
## (`stat_ecdf()`).

Then we can also compare raw correlations for each variable with depressed mood.

rawdata_correlations <- imputed_rawdata %>%
  group_by(pid) %>%
  summarise(correlation = cor(depressedmood_state, loneliness_state_pmc, use = "complete.obs"))

simdata_correlations <- combined_simulated_data_list5 %>%
  group_by(ID) %>%
  summarise(correlation = cor(depressedmood_state, loneliness_state_pmc, use = "complete.obs"))
simdata_correlations <- simdata_correlations %>% 
  rename(sim_cor = correlation)

rawdata_correlations<- rawdata_correlations %>%
  mutate(ID = row_number())
rawdata_correlations <- rawdata_correlations %>% 
  rename(raw_cor = correlation)

rawcorplotdata <- left_join(simdata_correlations, rawdata_correlations, by = "ID")


rawcorplotdata <- rawcorplotdata %>% 
  pivot_longer(cols = c("sim_cor", "raw_cor"), names_to = "Method", values_to = "estimate")

rawcorplotdata %>%
  ggplot(aes(x = estimate, fill = Method)) +
  geom_density(alpha = 0.5) +
  ylab("Density") +
  xlab("raw correlations Between loneliness and depressedmood") +
  scale_fill_viridis(discrete=TRUE) +
  theme_bw()
## Warning: Removed 1 row containing non-finite outside the scale range
## (`stat_density()`).

Raw correlations of real data vs sim data for social interaction satisfaction

rawdata_correlations <- imputed_rawdata %>%
  group_by(pid) %>%
  summarise(correlation = cor(depressedmood_state, socintsatisfaction_state_pmc, use = "complete.obs"))

simdata_correlations <- combined_simulated_data_list5 %>%
  group_by(ID) %>%
  summarise(correlation = cor(depressedmood_state, socintsatisfaction_state_pmc, use = "complete.obs"))
simdata_correlations <- simdata_correlations %>% 
  rename(sim_cor = correlation)

rawdata_correlations<- rawdata_correlations %>%
  mutate(ID = row_number())
rawdata_correlations <- rawdata_correlations %>% 
  rename(raw_cor = correlation)

rawcorplotdata <- left_join(simdata_correlations, rawdata_correlations, by = "ID")


rawcorplotdata <- rawcorplotdata %>% 
  pivot_longer(cols = c("sim_cor", "raw_cor"), names_to = "Method", values_to = "estimate")

rawcorplotdata %>%
  ggplot(aes(x = estimate, fill = Method)) +
  geom_density(alpha = 0.5) +
  ylab("Density") +
  xlab("raw correlations Between loneliness and depressedmood") +
  scale_fill_viridis(discrete=TRUE) +
  theme_bw()
## Warning: Removed 1 row containing non-finite outside the scale range
## (`stat_density()`).

Finally raw correlation comparion for real vs sim for responsiveness

rawdata_correlations <- imputed_rawdata %>%
  group_by(pid) %>%
  summarise(correlation = cor(depressedmood_state, responsiveness_state_pmc, use = "complete.obs"))

simdata_correlations <- combined_simulated_data_list5 %>%
  group_by(ID) %>%
  summarise(correlation = cor(depressedmood_state, responsiveness_state_pmc, use = "complete.obs"))
simdata_correlations <- simdata_correlations %>% 
  rename(sim_cor = correlation)

rawdata_correlations<- rawdata_correlations %>%
  mutate(ID = row_number())
rawdata_correlations <- rawdata_correlations %>% 
  rename(raw_cor = correlation)

rawcorplotdata <- left_join(simdata_correlations, rawdata_correlations, by = "ID")


rawcorplotdata <- rawcorplotdata %>% 
  pivot_longer(cols = c("sim_cor", "raw_cor"), names_to = "Method", values_to = "estimate")

rawcorplotdata %>%
  ggplot(aes(x = estimate, fill = Method)) +
  geom_density(alpha = 0.5) +
  ylab("Density") +
  xlab("raw correlations Between loneliness and depressedmood") +
  scale_fill_viridis(discrete=TRUE) +
  theme_bw()
## Warning: Removed 1 row containing non-finite outside the scale range
## (`stat_density()`).

We can also compare meta-analysis results for real vs simulated data. As can be seen estimates are very similar but heterogeneity is much larger in simulated as can also be seen from ecdf and density plots (more extreme values in simulated data) IV_1 = lonliness IV_2 = social interaction satisfaction IV_3 = responsiveness

# Initialize an empty list to store the results
meta_analysis_results_list <- list()

# Example: extracting estimates and I² from hoard.iarimax for real and simulated data
for (i in 1:length(hoard.iarimax1)) {
  
  # Extract variable names (optional if you need them)
  variable_name <- names(hoard.iarimax1)[i]
  
  # Extract estimates and I² from the real data
  real_estimate <- hoard.iarimax1[[i]]$meta_analysis$b  # Adjust based on your structure
  real_I2 <- hoard.iarimax1[[i]]$meta_analysis$I2  # Adjust based on your structure
  
  # Extract estimates and I² from the simulated data
  sim_estimate <- hoard.iarimax1sim[[i]]$meta_analysis$b  # Adjust based on your structure
  sim_I2 <- hoard.iarimax1sim[[i]]$meta_analysis$I2  # Adjust based on your structure
  
  # Store the results in a list
  meta_analysis_results_list[[i]] <- data.frame(
    Variable = variable_name,
    Estimate_Real = real_estimate,
    Estimate_Simulated = sim_estimate,
    I2_Real = ifelse(is.na(real_I2), "NA", paste0(round(real_I2, 2), "%")),
    I2_Simulated = ifelse(is.na(sim_I2), "NA", paste0(round(sim_I2, 2), "%"))
  )
}

# Combine the list into a single data frame
meta_analysis_results <- do.call(rbind, meta_analysis_results_list)

# Display the table
print(meta_analysis_results)
##          Variable Estimate_Real Estimate_Simulated I2_Real I2_Simulated
## intrcpt      IV_1     0.4895009          0.5068498  76.23%       98.42%
## intrcpt1     IV_2    -0.2969163         -0.2894128  77.92%       99.32%
## intrcpt2     IV_3    -0.2850702         -0.2901885  69.97%        99.8%

Next, we compare autocorrelations for each variable at the sample level.

# Extract autocorrelation values (without plotting) for each variable in the real dataset
acf_real <- lapply(7:ncol(zDataraw), function(i) acf(zDataraw[, i], plot = FALSE))

# Extract autocorrelation values (without plotting) for each variable in the simulated dataset
acf_simulated <- lapply(7:ncol(zDatasim), function(i) acf(zDatasim[, i], plot = FALSE))

# Get the variable names (assuming zDataraw and zDatasim have the same variable names)
variable_names <- colnames(zDataraw)[7:ncol(zDataraw)]  # Extract variable names starting from column 7

# Extract the autocorrelation values at lag 1
lag1_real <- sapply(acf_real, function(x) x$acf[2])  # ACF at lag 1 for real data
lag1_simulated <- sapply(acf_simulated, function(x) x$acf[2])  # ACF at lag 1 for simulated data

# Create a data frame to compare the lag 1 autocorrelations
comparison_lag1 <- data.frame(Variable = variable_names, Real = lag1_real, Simulated = lag1_simulated)
print(comparison_lag1)
##                           Variable      Real Simulated
## 1          depressedmood_state_PSD 0.3267736 0.3220256
## 2         loneliness_state_pmc_PSD 0.2312691 0.2099698
## 3 socintsatisfaction_state_pmc_PSD 0.3992218 0.3954121
## 4     responsiveness_state_pmc_PSD 0.4014451 0.3251152

Next, I calculated the correlation between variables for each individual based on their covariance in the Simga matrix (covariance of residuals matrix) and compared this to their raw correlations.

As can be seen in output, some individuals have very close correlations whilst others have some moderate to large differences.

I think that this might be because sigma is the covariance matrix of residuals (as opposed to a standard covariance matrix) so it accounts for the variability unexplained by the model and although it accounts for some of the contemptuous relationships between variables, the model itself may also have some contemptuous relationships?

# Initialize an empty list to store the comparison results
cor_comparison_results <- list()

# Loop through each individual's data in the rawdata_list and fit results list
for (i in 1:length(fit_results_list)) {
  
  # Step 1: Extract the Sigma matrix and convert it to the correlation matrix
  cor_matrix_sigma <- cov2cor(fit_results_list[[i]]$Sigma)
  
  # Step 2: Extract the raw data for the individual, removing ID and time columns
  ind_data <- simulated_data_list5[[i]]  # Assuming columns 1 and 2 are ID and time
  
  # Step 3: Calculate the raw correlation matrix for this individual
  raw_cor_matrix <- cor(ind_data, use = "complete.obs")
  
  # Step 4: Store the comparison results in a list
  cor_comparison_results[[i]] <- list(cor_matrix_sigma = cor_matrix_sigma, 
                                  raw_cor_matrix = raw_cor_matrix)
  
  # Optionally, print the comparison results for each individual
  cat("\nIndividual:", i, "\n")
  cat("Correlation Matrix of Residuals (Sigma):\n")
  print(cor_matrix_sigma)
  cat("Raw Correlation Matrix:\n")
  print(raw_cor_matrix)
}
## 
## Individual: 1 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4806677 -0.2063431 -0.2166522
## [2,]  0.4806677  1.0000000 -0.1139593 -0.2044184
## [3,] -0.2063431 -0.1139593  1.0000000  0.7618041
## [4,] -0.2166522 -0.2044184  0.7618041  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5395174 -0.2017648 -0.2114857
## [2,]  0.5395174  1.0000000 -0.1819331 -0.3336662
## [3,] -0.2017648 -0.1819331  1.0000000  0.7757568
## [4,] -0.2114857 -0.3336662  0.7757568  1.0000000
## 
## Individual: 2 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]        [,3]        [,4]
## [1,] 1.00000000  0.2229067  0.09081471  0.08874889
## [2,] 0.22290671  1.0000000 -0.16523309 -0.16980324
## [3,] 0.09081471 -0.1652331  1.00000000  0.29601722
## [4,] 0.08874889 -0.1698032  0.29601722  1.00000000
## Raw Correlation Matrix:
##            [,1]        [,2]        [,3]       [,4]
## [1,] 1.00000000  0.06492024  0.20248953  0.2480515
## [2,] 0.06492024  1.00000000 -0.09211366 -0.2233496
## [3,] 0.20248953 -0.09211366  1.00000000  0.4823391
## [4,] 0.24805154 -0.22334957  0.48233908  1.0000000
## 
## Individual: 3 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6579364 -0.4983082 -0.4752640
## [2,]  0.6579364  1.0000000 -0.4446084 -0.4609633
## [3,] -0.4983082 -0.4446084  1.0000000  0.6007448
## [4,] -0.4752640 -0.4609633  0.6007448  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6502972 -0.3534829 -0.4667834
## [2,]  0.6502972  1.0000000 -0.3984103 -0.4996224
## [3,] -0.3534829 -0.3984103  1.0000000  0.6204431
## [4,] -0.4667834 -0.4996224  0.6204431  1.0000000
## 
## Individual: 4 
## Correlation Matrix of Residuals (Sigma):
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.56791987 -0.03301724 -0.06352399
## [2,]  0.56791987  1.00000000  0.09720237 -0.05007965
## [3,] -0.03301724  0.09720237  1.00000000  0.62900310
## [4,] -0.06352399 -0.05007965  0.62900310  1.00000000
## Raw Correlation Matrix:
##            [,1]        [,2]      [,3]        [,4]
## [1,] 1.00000000  0.65105229 0.2202914  0.06986386
## [2,] 0.65105229  1.00000000 0.2422850 -0.08813976
## [3,] 0.22029142  0.24228498 1.0000000  0.71628413
## [4,] 0.06986386 -0.08813976 0.7162841  1.00000000
## 
## Individual: 5 
## Correlation Matrix of Residuals (Sigma):
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.7733437 -0.5582753 -0.03485793
## [2,]  0.77334366  1.0000000 -0.4510653 -0.14624135
## [3,] -0.55827535 -0.4510653  1.0000000  0.29904145
## [4,] -0.03485793 -0.1462414  0.2990415  1.00000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7990455 -0.6786787 -0.3120833
## [2,]  0.7990455  1.0000000 -0.6260625 -0.4736115
## [3,] -0.6786787 -0.6260625  1.0000000  0.5847172
## [4,] -0.3120833 -0.4736115  0.5847172  1.0000000
## 
## Individual: 6 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4774606 -0.4318316 -0.4798377
## [2,]  0.4774606  1.0000000 -0.4398391 -0.5438325
## [3,] -0.4318316 -0.4398391  1.0000000  0.6633994
## [4,] -0.4798377 -0.5438325  0.6633994  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4627404 -0.4136302 -0.4373499
## [2,]  0.4627404  1.0000000 -0.3385808 -0.5443438
## [3,] -0.4136302 -0.3385808  1.0000000  0.7207811
## [4,] -0.4373499 -0.5443438  0.7207811  1.0000000
## 
## Individual: 7 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000 0.12381460 0.15902927 -0.2208643
## [2,]  0.1238146 1.00000000 0.00151675  0.1317064
## [3,]  0.1590293 0.00151675 1.00000000  0.1601968
## [4,] -0.2208643 0.13170641 0.16019680  1.0000000
## Raw Correlation Matrix:
##            [,1]        [,2]        [,3]        [,4]
## [1,]  1.0000000  0.11421321  0.14789411 -0.10484899
## [2,]  0.1142132  1.00000000 -0.06065664  0.06078367
## [3,]  0.1478941 -0.06065664  1.00000000  0.22139984
## [4,] -0.1048490  0.06078367  0.22139984  1.00000000
## 
## Individual: 8 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6405233 -0.2294826 -0.2453930
## [2,]  0.6405233  1.0000000 -0.4920291 -0.3961667
## [3,] -0.2294826 -0.4920291  1.0000000  0.6306014
## [4,] -0.2453930 -0.3961667  0.6306014  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5600925 -0.1942148 -0.3906143
## [2,]  0.5600925  1.0000000 -0.4627897 -0.4996695
## [3,] -0.1942148 -0.4627897  1.0000000  0.6921603
## [4,] -0.3906143 -0.4996695  0.6921603  1.0000000
## 
## Individual: 9 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3765211 -0.1384618 -0.1340127
## [2,]  0.3765211  1.0000000 -0.3951624 -0.4118393
## [3,] -0.1384618 -0.3951624  1.0000000  0.5472830
## [4,] -0.1340127 -0.4118393  0.5472830  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.1727390 -0.1921587 -0.2493156
## [2,]  0.1727390  1.0000000 -0.2341707 -0.4354433
## [3,] -0.1921587 -0.2341707  1.0000000  0.6050916
## [4,] -0.2493156 -0.4354433  0.6050916  1.0000000
## 
## Individual: 10 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4562095 -0.3453574 -0.2030471
## [2,]  0.4562095  1.0000000 -0.3332408 -0.2065518
## [3,] -0.3453574 -0.3332408  1.0000000  0.5551665
## [4,] -0.2030471 -0.2065518  0.5551665  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5801222 -0.2541050 -0.3360171
## [2,]  0.5801222  1.0000000 -0.2313076 -0.4677152
## [3,] -0.2541050 -0.2313076  1.0000000  0.5190557
## [4,] -0.3360171 -0.4677152  0.5190557  1.0000000
## 
## Individual: 11 
## Correlation Matrix of Residuals (Sigma):
##            [,1]        [,2]       [,3]        [,4]
## [1,]  1.0000000  0.67111424 -0.2223123 -0.13473035
## [2,]  0.6711142  1.00000000 -0.1206598  0.02895729
## [3,] -0.2223123 -0.12065979  1.0000000  0.32696339
## [4,] -0.1347304  0.02895729  0.3269634  1.00000000
## Raw Correlation Matrix:
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.58088596 -0.10945219  0.00794945
## [2,]  0.58088596  1.00000000 -0.04989415 -0.07182778
## [3,] -0.10945219 -0.04989415  1.00000000  0.36143502
## [4,]  0.00794945 -0.07182778  0.36143502  1.00000000
## 
## Individual: 12 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5278951 -0.4982812 -0.1163159
## [2,]  0.5278951  1.0000000 -0.5343092 -0.4703143
## [3,] -0.4982812 -0.5343092  1.0000000  0.5538382
## [4,] -0.1163159 -0.4703143  0.5538382  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5542402 -0.3848256 -0.1019621
## [2,]  0.5542402  1.0000000 -0.4865519 -0.4846950
## [3,] -0.3848256 -0.4865519  1.0000000  0.5767204
## [4,] -0.1019621 -0.4846950  0.5767204  1.0000000
## 
## Individual: 13 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4029088 -0.3592717 -0.2923937
## [2,]  0.4029088  1.0000000 -0.3360180 -0.1632952
## [3,] -0.3592717 -0.3360180  1.0000000  0.4807404
## [4,] -0.2923937 -0.1632952  0.4807404  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4597983 -0.3680541 -0.2069951
## [2,]  0.4597983  1.0000000 -0.4672444 -0.2277734
## [3,] -0.3680541 -0.4672444  1.0000000  0.4978471
## [4,] -0.2069951 -0.2277734  0.4978471  1.0000000
## 
## Individual: 14 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]      [,3]        [,4]
## [1,]  1.0000000 0.44172342 0.1029984 -0.15066582
## [2,]  0.4417234 1.00000000 0.0547912  0.08555812
## [3,]  0.1029984 0.05479120 1.0000000  0.63060539
## [4,] -0.1506658 0.08555812 0.6306054  1.00000000
## Raw Correlation Matrix:
##           [,1]      [,2]      [,3]      [,4]
## [1,] 1.0000000 0.9943155 0.9604814 0.8622904
## [2,] 0.9943155 1.0000000 0.9561934 0.8687434
## [3,] 0.9604814 0.9561934 1.0000000 0.9078007
## [4,] 0.8622904 0.8687434 0.9078007 1.0000000
## 
## Individual: 15 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6680353 -0.2693402 -0.4588030
## [2,]  0.6680353  1.0000000 -0.3478900 -0.3655768
## [3,] -0.2693402 -0.3478900  1.0000000  0.4890764
## [4,] -0.4588030 -0.3655768  0.4890764  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6891618 -0.3492072 -0.5139480
## [2,]  0.6891618  1.0000000 -0.3532778 -0.5014586
## [3,] -0.3492072 -0.3532778  1.0000000  0.5750609
## [4,] -0.5139480 -0.5014586  0.5750609  1.0000000
## 
## Individual: 16 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2198169 -0.7841744 -0.5934979
## [2,]  0.2198169  1.0000000 -0.1335733 -0.1621855
## [3,] -0.7841744 -0.1335733  1.0000000  0.6772199
## [4,] -0.5934979 -0.1621855  0.6772199  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2835660 -0.7226588 -0.5794414
## [2,]  0.2835660  1.0000000 -0.2340883 -0.2345702
## [3,] -0.7226588 -0.2340883  1.0000000  0.6583759
## [4,] -0.5794414 -0.2345702  0.6583759  1.0000000
## 
## Individual: 17 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3487913 -0.2394880 -0.3330882
## [2,]  0.3487913  1.0000000 -0.1878655 -0.3333828
## [3,] -0.2394880 -0.1878655  1.0000000  0.5416668
## [4,] -0.3330882 -0.3333828  0.5416668  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5354880 -0.4096380 -0.4243364
## [2,]  0.5354880  1.0000000 -0.3403812 -0.4451100
## [3,] -0.4096380 -0.3403812  1.0000000  0.6694502
## [4,] -0.4243364 -0.4451100  0.6694502  1.0000000
## 
## Individual: 18 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4073146 -0.2579955 -0.4031654
## [2,]  0.4073146  1.0000000 -0.1740150 -0.2444416
## [3,] -0.2579955 -0.1740150  1.0000000  0.6814247
## [4,] -0.4031654 -0.2444416  0.6814247  1.0000000
## Raw Correlation Matrix:
##             [,1]       [,2]        [,3]       [,4]
## [1,]  1.00000000  0.4656177  0.04086335 -0.1141648
## [2,]  0.46561769  1.0000000 -0.11275284 -0.1696839
## [3,]  0.04086335 -0.1127528  1.00000000  0.5324708
## [4,] -0.11416477 -0.1696839  0.53247083  1.0000000
## 
## Individual: 19 
## Correlation Matrix of Residuals (Sigma):
##            [,1]         [,2]         [,3]        [,4]
## [1,]  1.0000000  0.599024719 -0.177717632 -0.29838306
## [2,]  0.5990247  1.000000000 -0.007921077 -0.38201200
## [3,] -0.1777176 -0.007921077  1.000000000 -0.08830013
## [4,] -0.2983831 -0.382012003 -0.088300134  1.00000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6510544 -0.3229701 -0.1886845
## [2,]  0.6510544  1.0000000 -0.2088623 -0.3909307
## [3,] -0.3229701 -0.2088623  1.0000000  0.1326762
## [4,] -0.1886845 -0.3909307  0.1326762  1.0000000
## 
## Individual: 20 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4663117 -0.4512796 -0.3419628
## [2,]  0.4663117  1.0000000 -0.5362868 -0.5249732
## [3,] -0.4512796 -0.5362868  1.0000000  0.5280584
## [4,] -0.3419628 -0.5249732  0.5280584  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5210594 -0.4426755 -0.3765095
## [2,]  0.5210594  1.0000000 -0.4476902 -0.5062515
## [3,] -0.4426755 -0.4476902  1.0000000  0.6474894
## [4,] -0.3765095 -0.5062515  0.6474894  1.0000000
## 
## Individual: 21 
## Correlation Matrix of Residuals (Sigma):
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.3938702 -0.2984844  0.03469054
## [2,]  0.39387017  1.0000000 -0.4383433 -0.18326820
## [3,] -0.29848437 -0.4383433  1.0000000  0.67738215
## [4,]  0.03469054 -0.1832682  0.6773822  1.00000000
## Raw Correlation Matrix:
##      [,1] [,2] [,3] [,4]
## [1,]    1    1    1   -1
## [2,]    1    1    1   -1
## [3,]    1    1    1   -1
## [4,]   -1   -1   -1    1
## 
## Individual: 22 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5442373 -0.1950853 -0.3511308
## [2,]  0.5442373  1.0000000 -0.3158613 -0.3509693
## [3,] -0.1950853 -0.3158613  1.0000000  0.4222232
## [4,] -0.3511308 -0.3509693  0.4222232  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4986492 -0.2209342 -0.2757895
## [2,]  0.4986492  1.0000000 -0.2903905 -0.3180181
## [3,] -0.2209342 -0.2903905  1.0000000  0.3726295
## [4,] -0.2757895 -0.3180181  0.3726295  1.0000000
## 
## Individual: 23 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]        [,3]        [,4]
## [1,]  1.0000000  0.4409914 -0.32534664 -0.16866499
## [2,]  0.4409914  1.0000000 -0.16367783 -0.18305946
## [3,] -0.3253466 -0.1636778  1.00000000  0.04414377
## [4,] -0.1686650 -0.1830595  0.04414377  1.00000000
## Raw Correlation Matrix:
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.12646508 -0.10943507  0.4073103
## [2,]  0.1264651  1.00000000 -0.04943633 -0.3483304
## [3,] -0.1094351 -0.04943633  1.00000000  0.2086221
## [4,]  0.4073103 -0.34833039  0.20862213  1.0000000
## 
## Individual: 24 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5660740 -0.4110413 -0.3982368
## [2,]  0.5660740  1.0000000 -0.3824101 -0.5398052
## [3,] -0.4110413 -0.3824101  1.0000000  0.4795195
## [4,] -0.3982368 -0.5398052  0.4795195  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5717236 -0.3597698 -0.3749846
## [2,]  0.5717236  1.0000000 -0.4290814 -0.5955753
## [3,] -0.3597698 -0.4290814  1.0000000  0.6852610
## [4,] -0.3749846 -0.5955753  0.6852610  1.0000000
## 
## Individual: 25 
## Correlation Matrix of Residuals (Sigma):
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.36475271 -0.44928583 -0.4572539
## [2,]  0.3647527  1.00000000 -0.08540988 -0.3420193
## [3,] -0.4492858 -0.08540988  1.00000000  0.4199216
## [4,] -0.4572539 -0.34201932  0.41992162  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3608882 -0.4914099 -0.3630390
## [2,]  0.3608882  1.0000000 -0.1034313 -0.3539639
## [3,] -0.4914099 -0.1034313  1.0000000  0.3618085
## [4,] -0.3630390 -0.3539639  0.3618085  1.0000000
## 
## Individual: 26 
## Correlation Matrix of Residuals (Sigma):
##            [,1]        [,2]       [,3]        [,4]
## [1,]  1.0000000  0.55959718 -0.4177132 -0.14640553
## [2,]  0.5595972  1.00000000 -0.4822383 -0.05550555
## [3,] -0.4177132 -0.48223831  1.0000000 -0.12014477
## [4,] -0.1464055 -0.05550555 -0.1201448  1.00000000
## Raw Correlation Matrix:
##              [,1]       [,2]         [,3]       [,4]
## [1,]  1.000000000  0.6961903 -0.004944624  0.0321719
## [2,]  0.696190345  1.0000000 -0.213800124 -0.1977892
## [3,] -0.004944624 -0.2138001  1.000000000  0.8411890
## [4,]  0.032171896 -0.1977892  0.841188971  1.0000000
## 
## Individual: 27 
## Correlation Matrix of Residuals (Sigma):
##             [,1]      [,2]        [,3]       [,4]
## [1,]  1.00000000 0.2368950 -0.06985394 0.01720272
## [2,]  0.23689500 1.0000000  0.26051306 0.12554660
## [3,] -0.06985394 0.2605131  1.00000000 0.47166334
## [4,]  0.01720272 0.1255466  0.47166334 1.00000000
## Raw Correlation Matrix:
##            [,1]        [,2]        [,3]        [,4]
## [1,] 1.00000000  0.13823548  0.11501613  0.06175092
## [2,] 0.13823548  1.00000000 -0.03263686 -0.06553266
## [3,] 0.11501613 -0.03263686  1.00000000  0.58528857
## [4,] 0.06175092 -0.06553266  0.58528857  1.00000000
## 
## Individual: 28 
## Correlation Matrix of Residuals (Sigma):
##              [,1]        [,2]         [,3]        [,4]
## [1,]  1.000000000  0.45844527 -0.003455601 -0.06155817
## [2,]  0.458445267  1.00000000  0.035134348 -0.30532411
## [3,] -0.003455601  0.03513435  1.000000000  0.29666008
## [4,] -0.061558172 -0.30532411  0.296660082  1.00000000
## Raw Correlation Matrix:
##             [,1]       [,2]        [,3]       [,4]
## [1,]  1.00000000  0.5033753 -0.02537893 -0.1697862
## [2,]  0.50337529  1.0000000 -0.24507360 -0.4547635
## [3,] -0.02537893 -0.2450736  1.00000000  0.4926576
## [4,] -0.16978616 -0.4547635  0.49265760  1.0000000
## 
## Individual: 29 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000 -0.4350644  0.1262932  0.1120217
## [2,] -0.4350644  1.0000000 -0.2905243 -0.3781318
## [3,]  0.1262932 -0.2905243  1.0000000  0.6517453
## [4,]  0.1120217 -0.3781318  0.6517453  1.0000000
## Raw Correlation Matrix:
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.04602215 -0.03557545 -0.03373289
## [2,]  0.04602215  1.00000000 -0.33540836 -0.57429950
## [3,] -0.03557545 -0.33540836  1.00000000  0.64013792
## [4,] -0.03373289 -0.57429950  0.64013792  1.00000000
## 
## Individual: 30 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5767792 -0.2634404 -0.2104022
## [2,]  0.5767792  1.0000000 -0.5309433 -0.5446374
## [3,] -0.2634404 -0.5309433  1.0000000  0.6965491
## [4,] -0.2104022 -0.5446374  0.6965491  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5344052 -0.1554245 -0.1438290
## [2,]  0.5344052  1.0000000 -0.5742919 -0.6190395
## [3,] -0.1554245 -0.5742919  1.0000000  0.7387692
## [4,] -0.1438290 -0.6190395  0.7387692  1.0000000
## 
## Individual: 31 
## Correlation Matrix of Residuals (Sigma):
##             [,1]       [,2]        [,3]       [,4]
## [1,]  1.00000000  0.3341896 -0.01460477 -0.1201202
## [2,]  0.33418958  1.0000000 -0.21977184 -0.1634685
## [3,] -0.01460477 -0.2197718  1.00000000  0.7281710
## [4,] -0.12012017 -0.1634685  0.72817099  1.0000000
## Raw Correlation Matrix:
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.41760629 -0.03070476  0.07646404
## [2,]  0.41760629  1.00000000 -0.17568441 -0.09140123
## [3,] -0.03070476 -0.17568441  1.00000000  0.59993432
## [4,]  0.07646404 -0.09140123  0.59993432  1.00000000
## 
## Individual: 32 
## Correlation Matrix of Residuals (Sigma):
##           [,1]      [,2]      [,3]      [,4]
## [1,] 1.0000000 0.2543634 0.1577347 0.1124576
## [2,] 0.2543634 1.0000000 0.5062933 0.3655889
## [3,] 0.1577347 0.5062933 1.0000000 0.7315755
## [4,] 0.1124576 0.3655889 0.7315755 1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3186872 -0.3854179 -0.4102460
## [2,]  0.3186872  1.0000000 -0.0291610 -0.0502448
## [3,] -0.3854179 -0.0291610  1.0000000  0.9803859
## [4,] -0.4102460 -0.0502448  0.9803859  1.0000000
## 
## Individual: 33 
## Correlation Matrix of Residuals (Sigma):
##      [,1] [,2] [,3] [,4]
## [1,]    1    1    1   -1
## [2,]    1    1    1   -1
## [3,]    1    1    1   -1
## [4,]   -1   -1   -1    1
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8113299  0.5026733 -0.9963832
## [2,]  0.8113299  1.0000000  0.7893732 -0.8133795
## [3,]  0.5026733  0.7893732  1.0000000 -0.4585062
## [4,] -0.9963832 -0.8133795 -0.4585062  1.0000000
## 
## Individual: 34 
## Correlation Matrix of Residuals (Sigma):
##            [,1]        [,2]       [,3]        [,4]
## [1,]  1.0000000  0.19495804 -0.3356730 -0.13943525
## [2,]  0.1949580  1.00000000 -0.1207455 -0.05260459
## [3,] -0.3356730 -0.12074545  1.0000000  0.56114155
## [4,] -0.1394352 -0.05260459  0.5611416  1.00000000
## Raw Correlation Matrix:
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.19117549 -0.18081835 -0.1652940
## [2,]  0.1911755  1.00000000 -0.04869996 -0.1052453
## [3,] -0.1808184 -0.04869996  1.00000000  0.7201626
## [4,] -0.1652940 -0.10524535  0.72016261  1.0000000
## 
## Individual: 35 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6585103 -0.3483307 -0.4753171
## [2,]  0.6585103  1.0000000 -0.3287172 -0.4877264
## [3,] -0.3483307 -0.3287172  1.0000000  0.7253588
## [4,] -0.4753171 -0.4877264  0.7253588  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5852849 -0.2865751 -0.4192906
## [2,]  0.5852849  1.0000000 -0.3042067 -0.5127668
## [3,] -0.2865751 -0.3042067  1.0000000  0.7152037
## [4,] -0.4192906 -0.5127668  0.7152037  1.0000000
## 
## Individual: 36 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7794920 -0.7773391 -0.6849401
## [2,]  0.7794920  1.0000000 -0.7381469 -0.7163745
## [3,] -0.7773391 -0.7381469  1.0000000  0.8012354
## [4,] -0.6849401 -0.7163745  0.8012354  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]      [,4]
## [1,]  1.0000000  0.7614875 -0.7815275 -0.708332
## [2,]  0.7614875  1.0000000 -0.7657622 -0.740477
## [3,] -0.7815275 -0.7657622  1.0000000  0.810526
## [4,] -0.7083320 -0.7404770  0.8105260  1.000000
## 
## Individual: 37 
## Correlation Matrix of Residuals (Sigma):
##             [,1]        [,2]       [,3]       [,4]
## [1,]  1.00000000  0.52131811 -0.1734890 0.02079563
## [2,]  0.52131811  1.00000000 -0.1659152 0.08159233
## [3,] -0.17348896 -0.16591523  1.0000000 0.20979142
## [4,]  0.02079563  0.08159233  0.2097914 1.00000000
## Raw Correlation Matrix:
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.45626763 -0.09389952 -0.03427493
## [2,]  0.45626763  1.00000000 -0.25281706 -0.03318932
## [3,] -0.09389952 -0.25281706  1.00000000  0.22665229
## [4,] -0.03427493 -0.03318932  0.22665229  1.00000000
## 
## Individual: 38 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7608324 -0.3456743 -0.3552277
## [2,]  0.7608324  1.0000000 -0.4195890 -0.4063475
## [3,] -0.3456743 -0.4195890  1.0000000  0.5387229
## [4,] -0.3552277 -0.4063475  0.5387229  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7473736 -0.3249185 -0.3434304
## [2,]  0.7473736  1.0000000 -0.4009405 -0.4875802
## [3,] -0.3249185 -0.4009405  1.0000000  0.6275356
## [4,] -0.3434304 -0.4875802  0.6275356  1.0000000
## 
## Individual: 39 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3845950 -0.2137378 -0.1731150
## [2,]  0.3845950  1.0000000 -0.5741106 -0.4989101
## [3,] -0.2137378 -0.5741106  1.0000000  0.5978136
## [4,] -0.1731150 -0.4989101  0.5978136  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4951413 -0.1249336 -0.1478588
## [2,]  0.4951413  1.0000000 -0.4815659 -0.4718838
## [3,] -0.1249336 -0.4815659  1.0000000  0.5257268
## [4,] -0.1478588 -0.4718838  0.5257268  1.0000000
## 
## Individual: 40 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6739744 -0.2560967 -0.2992307
## [2,]  0.6739744  1.0000000 -0.1281744 -0.1878042
## [3,] -0.2560967 -0.1281744  1.0000000  0.6994144
## [4,] -0.2992307 -0.1878042  0.6994144  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6745315 -0.3161316 -0.3225271
## [2,]  0.6745315  1.0000000 -0.3068780 -0.3846407
## [3,] -0.3161316 -0.3068780  1.0000000  0.7857223
## [4,] -0.3225271 -0.3846407  0.7857223  1.0000000
## 
## Individual: 41 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5600110 -0.4966121 -0.2459618
## [2,]  0.5600110  1.0000000 -0.5360072 -0.3121899
## [3,] -0.4966121 -0.5360072  1.0000000  0.5792604
## [4,] -0.2459618 -0.3121899  0.5792604  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4733807 -0.2847008 -0.1973646
## [2,]  0.4733807  1.0000000 -0.5472948 -0.4539480
## [3,] -0.2847008 -0.5472948  1.0000000  0.6587603
## [4,] -0.1973646 -0.4539480  0.6587603  1.0000000
## 
## Individual: 42 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2770667 -0.3247345 -0.3522350
## [2,]  0.2770667  1.0000000 -0.1901716 -0.2445578
## [3,] -0.3247345 -0.1901716  1.0000000  0.4857445
## [4,] -0.3522350 -0.2445578  0.4857445  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2572689 -0.2380078 -0.2515135
## [2,]  0.2572689  1.0000000 -0.1722926 -0.2478295
## [3,] -0.2380078 -0.1722926  1.0000000  0.4395768
## [4,] -0.2515135 -0.2478295  0.4395768  1.0000000
## 
## Individual: 43 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5763069 -0.4719776 -0.4805291
## [2,]  0.5763069  1.0000000 -0.6033678 -0.5848168
## [3,] -0.4719776 -0.6033678  1.0000000  0.7167320
## [4,] -0.4805291 -0.5848168  0.7167320  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5257711 -0.3425808 -0.3845367
## [2,]  0.5257711  1.0000000 -0.5647704 -0.6177400
## [3,] -0.3425808 -0.5647704  1.0000000  0.7111623
## [4,] -0.3845367 -0.6177400  0.7111623  1.0000000
## 
## Individual: 44 
## Correlation Matrix of Residuals (Sigma):
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.62476938 -0.22092052 -0.2974501
## [2,]  0.6247694  1.00000000  0.08664658 -0.0570210
## [3,] -0.2209205  0.08664658  1.00000000  0.3295665
## [4,] -0.2974501 -0.05702100  0.32956647  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4224004 -0.3966344  0.2701114
## [2,]  0.4224004  1.0000000  0.2332267 -0.3708985
## [3,] -0.3966344  0.2332267  1.0000000 -0.5287251
## [4,]  0.2701114 -0.3708985 -0.5287251  1.0000000
## 
## Individual: 45 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5434782 -0.3798646 -0.4902360
## [2,]  0.5434782  1.0000000 -0.2779582 -0.6143037
## [3,] -0.3798646 -0.2779582  1.0000000  0.2766831
## [4,] -0.4902360 -0.6143037  0.2766831  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4520377 -0.1925213 -0.3173735
## [2,]  0.4520377  1.0000000 -0.2240396 -0.6680801
## [3,] -0.1925213 -0.2240396  1.0000000  0.3832589
## [4,] -0.3173735 -0.6680801  0.3832589  1.0000000
## 
## Individual: 46 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5324597 -0.3417220 -0.2463662
## [2,]  0.5324597  1.0000000 -0.4324069 -0.1891569
## [3,] -0.3417220 -0.4324069  1.0000000  0.5842523
## [4,] -0.2463662 -0.1891569  0.5842523  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5443940 -0.2161316 -0.2010846
## [2,]  0.5443940  1.0000000 -0.3864946 -0.2526510
## [3,] -0.2161316 -0.3864946  1.0000000  0.5987756
## [4,] -0.2010846 -0.2526510  0.5987756  1.0000000
## 
## Individual: 47 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6723824 -0.2927025 -0.3236798
## [2,]  0.6723824  1.0000000 -0.3000375 -0.5567618
## [3,] -0.2927025 -0.3000375  1.0000000  0.4231000
## [4,] -0.3236798 -0.5567618  0.4231000  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5770658 -0.2242026 -0.3376926
## [2,]  0.5770658  1.0000000 -0.3736248 -0.5363055
## [3,] -0.2242026 -0.3736248  1.0000000  0.5037378
## [4,] -0.3376926 -0.5363055  0.5037378  1.0000000
## 
## Individual: 48 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7188816 -0.6679435 -0.6559549
## [2,]  0.7188816  1.0000000 -0.5752927 -0.5867486
## [3,] -0.6679435 -0.5752927  1.0000000  0.8737925
## [4,] -0.6559549 -0.5867486  0.8737925  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6366993 -0.6154646 -0.6582084
## [2,]  0.6366993  1.0000000 -0.6115141 -0.6106362
## [3,] -0.6154646 -0.6115141  1.0000000  0.8653853
## [4,] -0.6582084 -0.6106362  0.8653853  1.0000000
## 
## Individual: 49 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7306029 -0.4617894 -0.3356804
## [2,]  0.7306029  1.0000000 -0.3579848 -0.2144997
## [3,] -0.4617894 -0.3579848  1.0000000  0.6824478
## [4,] -0.3356804 -0.2144997  0.6824478  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7494091 -0.5418563 -0.5373436
## [2,]  0.7494091  1.0000000 -0.4009613 -0.3385191
## [3,] -0.5418563 -0.4009613  1.0000000  0.6606115
## [4,] -0.5373436 -0.3385191  0.6606115  1.0000000
## 
## Individual: 50 
## Correlation Matrix of Residuals (Sigma):
##      [,1] [,2] [,3] [,4]
## [1,]    1    1   -1   -1
## [2,]    1    1   -1   -1
## [3,]   -1   -1    1    1
## [4,]   -1   -1    1    1
## Raw Correlation Matrix:
##      [,1] [,2] [,3] [,4]
## [1,]    1    1   -1   -1
## [2,]    1    1   -1   -1
## [3,]   -1   -1    1    1
## [4,]   -1   -1    1    1
## 
## Individual: 51 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4399981 -0.1844556 -0.2665719
## [2,]  0.4399981  1.0000000 -0.3735598 -0.3926401
## [3,] -0.1844556 -0.3735598  1.0000000  0.8990355
## [4,] -0.2665719 -0.3926401  0.8990355  1.0000000
## Raw Correlation Matrix:
##              [,1]       [,2]         [,3]        [,4]
## [1,]  1.000000000  0.5417522 -0.004996123 -0.09844174
## [2,]  0.541752200  1.0000000 -0.222723311 -0.30914213
## [3,] -0.004996123 -0.2227233  1.000000000  0.92315292
## [4,] -0.098441742 -0.3091421  0.923152916  1.00000000
## 
## Individual: 52 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5623823 -0.2829090 -0.3189776
## [2,]  0.5623823  1.0000000 -0.2660430 -0.3342313
## [3,] -0.2829090 -0.2660430  1.0000000  0.6517342
## [4,] -0.3189776 -0.3342313  0.6517342  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5957668 -0.2486638 -0.3368833
## [2,]  0.5957668  1.0000000 -0.2814224 -0.4209557
## [3,] -0.2486638 -0.2814224  1.0000000  0.6632011
## [4,] -0.3368833 -0.4209557  0.6632011  1.0000000
## 
## Individual: 53 
## Correlation Matrix of Residuals (Sigma):
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.3472178 -0.1051572  0.07940424
## [2,]  0.34721778  1.0000000 -0.1121058 -0.16507041
## [3,] -0.10515724 -0.1121058  1.0000000  0.65173038
## [4,]  0.07940424 -0.1650704  0.6517304  1.00000000
## Raw Correlation Matrix:
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.4812647 -0.3392398 -0.08585726
## [2,]  0.48126470  1.0000000 -0.4606790 -0.33181317
## [3,] -0.33923982 -0.4606790  1.0000000  0.67529293
## [4,] -0.08585726 -0.3318132  0.6752929  1.00000000
## 
## Individual: 54 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.1110986 -0.2484443 -0.2831761
## [2,]  0.1110986  1.0000000 -0.1423409 -0.3028697
## [3,] -0.2484443 -0.1423409  1.0000000  0.5217115
## [4,] -0.2831761 -0.3028697  0.5217115  1.0000000
## Raw Correlation Matrix:
##             [,1]        [,2]        [,3]       [,4]
## [1,]  1.00000000 -0.01768809 -0.29861659 -0.1985524
## [2,] -0.01768809  1.00000000  0.01298615 -0.1929936
## [3,] -0.29861659  0.01298615  1.00000000  0.3118346
## [4,] -0.19855243 -0.19299362  0.31183459  1.0000000
## 
## Individual: 55 
## Correlation Matrix of Residuals (Sigma):
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.25100196 -0.10437211 -0.1965768
## [2,]  0.2510020  1.00000000 -0.06628925 -0.3459182
## [3,] -0.1043721 -0.06628925  1.00000000  0.2837280
## [4,] -0.1965768 -0.34591823  0.28372797  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3441527 -0.1759805 -0.2163114
## [2,]  0.3441527  1.0000000 -0.3507917 -0.5820528
## [3,] -0.1759805 -0.3507917  1.0000000  0.5638360
## [4,] -0.2163114 -0.5820528  0.5638360  1.0000000
## 
## Individual: 56 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3462977 -0.1181267 -0.2039538
## [2,]  0.3462977  1.0000000 -0.1819588 -0.1233699
## [3,] -0.1181267 -0.1819588  1.0000000  0.6337165
## [4,] -0.2039538 -0.1233699  0.6337165  1.0000000
## Raw Correlation Matrix:
##              [,1]        [,2]         [,3]       [,4]
## [1,]  1.000000000  0.39373022 -0.009354423 -0.1966133
## [2,]  0.393730216  1.00000000 -0.037484959 -0.1896954
## [3,] -0.009354423 -0.03748496  1.000000000  0.5629240
## [4,] -0.196613281 -0.18969537  0.562924005  1.0000000
## 
## Individual: 57 
## Correlation Matrix of Residuals (Sigma):
##             [,1]       [,2]        [,3]        [,4]
## [1,]  1.00000000  0.4339884  0.07009105 -0.03157351
## [2,]  0.43398841  1.0000000 -0.35227327 -0.39877456
## [3,]  0.07009105 -0.3522733  1.00000000  0.50351390
## [4,] -0.03157351 -0.3987746  0.50351390  1.00000000
## Raw Correlation Matrix:
##           [,1]       [,2]       [,3]       [,4]
## [1,] 1.0000000  0.4489024  0.2466720  0.1460675
## [2,] 0.4489024  1.0000000 -0.2121791 -0.2990738
## [3,] 0.2466720 -0.2121791  1.0000000  0.6528124
## [4,] 0.1460675 -0.2990738  0.6528124  1.0000000
## 
## Individual: 58 
## Correlation Matrix of Residuals (Sigma):
##              [,1]       [,2]        [,3]         [,4]
## [1,]  1.000000000  0.1247825 -0.04974741  0.006607303
## [2,]  0.124782476  1.0000000 -0.11625131 -0.145096773
## [3,] -0.049747411 -0.1162513  1.00000000  0.662682304
## [4,]  0.006607303 -0.1450968  0.66268230  1.000000000
## Raw Correlation Matrix:
##             [,1]       [,2]        [,3]        [,4]
## [1,]  1.00000000  0.2082623 -0.07798531  0.02113397
## [2,]  0.20826226  1.0000000 -0.25706718 -0.28329781
## [3,] -0.07798531 -0.2570672  1.00000000  0.68915343
## [4,]  0.02113397 -0.2832978  0.68915343  1.00000000
## 
## Individual: 59 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5428407 -0.1933795 -0.2362792
## [2,]  0.5428407  1.0000000 -0.4014372 -0.3277106
## [3,] -0.1933795 -0.4014372  1.0000000  0.6545209
## [4,] -0.2362792 -0.3277106  0.6545209  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5360426 -0.1720487 -0.1672002
## [2,]  0.5360426  1.0000000 -0.5030989 -0.4327811
## [3,] -0.1720487 -0.5030989  1.0000000  0.7243422
## [4,] -0.1672002 -0.4327811  0.7243422  1.0000000
## 
## Individual: 60 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7768960 -0.5264960 -0.5750437
## [2,]  0.7768960  1.0000000 -0.4895684 -0.5551317
## [3,] -0.5264960 -0.4895684  1.0000000  0.6295898
## [4,] -0.5750437 -0.5551317  0.6295898  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8901717 -0.6664296 -0.5209499
## [2,]  0.8901717  1.0000000 -0.6912345 -0.5538558
## [3,] -0.6664296 -0.6912345  1.0000000  0.6914538
## [4,] -0.5209499 -0.5538558  0.6914538  1.0000000
## 
## Individual: 61 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4040050 -0.3409738 -0.1551534
## [2,]  0.4040050  1.0000000 -0.3897837 -0.2029336
## [3,] -0.3409738 -0.3897837  1.0000000  0.3937754
## [4,] -0.1551534 -0.2029336  0.3937754  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3828099 -0.2028026 -0.1149093
## [2,]  0.3828099  1.0000000 -0.3124147 -0.3228167
## [3,] -0.2028026 -0.3124147  1.0000000  0.4562608
## [4,] -0.1149093 -0.3228167  0.4562608  1.0000000
## 
## Individual: 62 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7277634 -0.5494301 -0.4825685
## [2,]  0.7277634  1.0000000 -0.6651564 -0.6705387
## [3,] -0.5494301 -0.6651564  1.0000000  0.7043298
## [4,] -0.4825685 -0.6705387  0.7043298  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6221029 -0.5120191 -0.4325304
## [2,]  0.6221029  1.0000000 -0.5521885 -0.6142332
## [3,] -0.5120191 -0.5521885  1.0000000  0.7649933
## [4,] -0.4325304 -0.6142332  0.7649933  1.0000000
## 
## Individual: 63 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6609744 -0.7138767 -0.6148602
## [2,]  0.6609744  1.0000000 -0.7336979 -0.4933522
## [3,] -0.7138767 -0.7336979  1.0000000  0.7932446
## [4,] -0.6148602 -0.4933522  0.7932446  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6976637 -0.7173393 -0.6814636
## [2,]  0.6976637  1.0000000 -0.7109670 -0.6423116
## [3,] -0.7173393 -0.7109670  1.0000000  0.8356235
## [4,] -0.6814636 -0.6423116  0.8356235  1.0000000
## 
## Individual: 64 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5905861 -0.3892967 -0.4402419
## [2,]  0.5905861  1.0000000 -0.2727085 -0.2892334
## [3,] -0.3892967 -0.2727085  1.0000000  0.7646309
## [4,] -0.4402419 -0.2892334  0.7646309  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7500709 -0.4558674 -0.5587107
## [2,]  0.7500709  1.0000000 -0.3970510 -0.4830809
## [3,] -0.4558674 -0.3970510  1.0000000  0.7947317
## [4,] -0.5587107 -0.4830809  0.7947317  1.0000000
## 
## Individual: 65 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5044160  0.1601683 -0.2919347
## [2,]  0.5044160  1.0000000 -0.1629511 -0.3349134
## [3,]  0.1601683 -0.1629511  1.0000000  0.3545154
## [4,] -0.2919347 -0.3349134  0.3545154  1.0000000
## Raw Correlation Matrix:
##             [,1]       [,2]        [,3]       [,4]
## [1,]  1.00000000  0.5361158  0.02702784 -0.3218463
## [2,]  0.53611579  1.0000000 -0.24724000 -0.4730948
## [3,]  0.02702784 -0.2472400  1.00000000  0.5033271
## [4,] -0.32184630 -0.4730948  0.50332715  1.0000000
## 
## Individual: 66 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5358862 -0.5036086 -0.5301490
## [2,]  0.5358862  1.0000000 -0.5667177 -0.4060204
## [3,] -0.5036086 -0.5667177  1.0000000  0.6514965
## [4,] -0.5301490 -0.4060204  0.6514965  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6105496 -0.4747894 -0.5272899
## [2,]  0.6105496  1.0000000 -0.5241513 -0.4533208
## [3,] -0.4747894 -0.5241513  1.0000000  0.6566078
## [4,] -0.5272899 -0.4533208  0.6566078  1.0000000
## 
## Individual: 67 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6704469 -0.3936560 -0.4298318
## [2,]  0.6704469  1.0000000 -0.3639592 -0.5003839
## [3,] -0.3936560 -0.3639592  1.0000000  0.4835895
## [4,] -0.4298318 -0.5003839  0.4835895  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6511913 -0.2776901 -0.3985312
## [2,]  0.6511913  1.0000000 -0.4072592 -0.6035380
## [3,] -0.2776901 -0.4072592  1.0000000  0.6814951
## [4,] -0.3985312 -0.6035380  0.6814951  1.0000000
## 
## Individual: 68 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6242630 -0.4451908 -0.4669617
## [2,]  0.6242630  1.0000000 -0.5592488 -0.6328748
## [3,] -0.4451908 -0.5592488  1.0000000  0.7264533
## [4,] -0.4669617 -0.6328748  0.7264533  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6700666 -0.5243700 -0.4486355
## [2,]  0.6700666  1.0000000 -0.6423429 -0.6499433
## [3,] -0.5243700 -0.6423429  1.0000000  0.7480155
## [4,] -0.4486355 -0.6499433  0.7480155  1.0000000
## 
## Individual: 69 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4661364 -0.1188516 -0.3817373
## [2,]  0.4661364  1.0000000 -0.2939032 -0.4893788
## [3,] -0.1188516 -0.2939032  1.0000000  0.5818450
## [4,] -0.3817373 -0.4893788  0.5818450  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5184897 -0.1514744 -0.4141426
## [2,]  0.5184897  1.0000000 -0.2767324 -0.4200929
## [3,] -0.1514744 -0.2767324  1.0000000  0.6641517
## [4,] -0.4141426 -0.4200929  0.6641517  1.0000000
## 
## Individual: 70 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6209821 -0.3715699 -0.4607667
## [2,]  0.6209821  1.0000000 -0.2811250 -0.4180274
## [3,] -0.3715699 -0.2811250  1.0000000  0.6069407
## [4,] -0.4607667 -0.4180274  0.6069407  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5671472 -0.2931299 -0.3523749
## [2,]  0.5671472  1.0000000 -0.2837227 -0.3029262
## [3,] -0.2931299 -0.2837227  1.0000000  0.4867578
## [4,] -0.3523749 -0.3029262  0.4867578  1.0000000
## 
## Individual: 71 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.1092660 -0.1457012 -0.2928950
## [2,]  0.1092660  1.0000000 -0.3817529 -0.2886468
## [3,] -0.1457012 -0.3817529  1.0000000  0.7174527
## [4,] -0.2928950 -0.2886468  0.7174527  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3517427 -0.1469847 -0.1863495
## [2,]  0.3517427  1.0000000 -0.4182378 -0.3614057
## [3,] -0.1469847 -0.4182378  1.0000000  0.7820582
## [4,] -0.1863495 -0.3614057  0.7820582  1.0000000
## 
## Individual: 72 
## Correlation Matrix of Residuals (Sigma):
##            [,1]        [,2]        [,3]        [,4]
## [1,]  1.0000000  0.43740535 -0.32789582 -0.10539159
## [2,]  0.4374053  1.00000000 -0.08077412 -0.03852466
## [3,] -0.3278958 -0.08077412  1.00000000  0.51331621
## [4,] -0.1053916 -0.03852466  0.51331621  1.00000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5591462 -0.4623493 -0.2672575
## [2,]  0.5591462  1.0000000 -0.3016582 -0.3263581
## [3,] -0.4623493 -0.3016582  1.0000000  0.7001494
## [4,] -0.2672575 -0.3263581  0.7001494  1.0000000
## 
## Individual: 73 
## Correlation Matrix of Residuals (Sigma):
##      [,1] [,2] [,3] [,4]
## [1,]    1   -1   -1   -1
## [2,]   -1    1    1    1
## [3,]   -1    1    1    1
## [4,]   -1    1    1    1
## Raw Correlation Matrix:
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000 -0.18670139 -0.70396985 -0.6659434
## [2,] -0.1867014  1.00000000 -0.03927149 -0.1051504
## [3,] -0.7039698 -0.03927149  1.00000000  0.9912050
## [4,] -0.6659434 -0.10515035  0.99120501  1.0000000
## 
## Individual: 74 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8070887 -0.6230171 -0.5864334
## [2,]  0.8070887  1.0000000 -0.7437879 -0.6552856
## [3,] -0.6230171 -0.7437879  1.0000000  0.8193660
## [4,] -0.5864334 -0.6552856  0.8193660  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8093589 -0.6379068 -0.5682892
## [2,]  0.8093589  1.0000000 -0.7178682 -0.6398631
## [3,] -0.6379068 -0.7178682  1.0000000  0.7917224
## [4,] -0.5682892 -0.6398631  0.7917224  1.0000000
## 
## Individual: 75 
## Correlation Matrix of Residuals (Sigma):
##             [,1]       [,2]        [,3]        [,4]
## [1,]  1.00000000  0.5512737 -0.08059566  0.02988727
## [2,]  0.55127369  1.0000000 -0.30072477 -0.27551251
## [3,] -0.08059566 -0.3007248  1.00000000  0.08999796
## [4,]  0.02988727 -0.2755125  0.08999796  1.00000000
## Raw Correlation Matrix:
##            [,1]       [,2]        [,3]        [,4]
## [1,] 1.00000000  0.4510794  0.02537082  0.02758678
## [2,] 0.45107942  1.0000000 -0.24616267 -0.34099484
## [3,] 0.02537082 -0.2461627  1.00000000  0.40854610
## [4,] 0.02758678 -0.3409948  0.40854610  1.00000000
## 
## Individual: 76 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6419436 -0.1438086 -0.3289807
## [2,]  0.6419436  1.0000000 -0.0179086 -0.1558580
## [3,] -0.1438086 -0.0179086  1.0000000  0.5562280
## [4,] -0.3289807 -0.1558580  0.5562280  1.0000000
## Raw Correlation Matrix:
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.49722440 -0.23287946 -0.3732260
## [2,]  0.4972244  1.00000000  0.03389413 -0.1754930
## [3,] -0.2328795  0.03389413  1.00000000  0.6390618
## [4,] -0.3732260 -0.17549303  0.63906178  1.0000000
## 
## Individual: 77 
## Correlation Matrix of Residuals (Sigma):
##      [,1] [,2] [,3] [,4]
## [1,]    1   -1   -1   -1
## [2,]   -1    1    1    1
## [3,]   -1    1    1    1
## [4,]   -1    1    1    1
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4709391 -0.6110503 -0.9918445
## [2,]  0.4709391  1.0000000  0.3530502 -0.4949059
## [3,] -0.6110503  0.3530502  1.0000000  0.6044493
## [4,] -0.9918445 -0.4949059  0.6044493  1.0000000
## 
## Individual: 78 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000 -0.9400212 -0.9935119 -0.9304196
## [2,] -0.9400212  1.0000000  0.9727167  0.7495964
## [3,] -0.9935119  0.9727167  1.0000000  0.8827021
## [4,] -0.9304196  0.7495964  0.8827021  1.0000000
## Raw Correlation Matrix:
##      [,1] [,2] [,3] [,4]
## [1,]    1  NaN  NaN  NaN
## [2,]  NaN    1  NaN  NaN
## [3,]  NaN  NaN    1  NaN
## [4,]  NaN  NaN  NaN    1
## 
## Individual: 79 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5979282 -0.2388839 -0.4296152
## [2,]  0.5979282  1.0000000 -0.5571992 -0.6718683
## [3,] -0.2388839 -0.5571992  1.0000000  0.5723504
## [4,] -0.4296152 -0.6718683  0.5723504  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5510286 -0.1314834 -0.4089588
## [2,]  0.5510286  1.0000000 -0.4647199 -0.6231814
## [3,] -0.1314834 -0.4647199  1.0000000  0.5135616
## [4,] -0.4089588 -0.6231814  0.5135616  1.0000000
## 
## Individual: 80 
## Correlation Matrix of Residuals (Sigma):
##             [,1]       [,2]        [,3]        [,4]
## [1,]  1.00000000  0.3430411 -0.06662212 -0.07151909
## [2,]  0.34304111  1.0000000 -0.26601331 -0.21869966
## [3,] -0.06662212 -0.2660133  1.00000000  0.56334018
## [4,] -0.07151909 -0.2186997  0.56334018  1.00000000
## Raw Correlation Matrix:
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.3685608 -0.0117139 -0.03194761
## [2,]  0.36856079  1.0000000 -0.2870712 -0.25073143
## [3,] -0.01171390 -0.2870712  1.0000000  0.60350193
## [4,] -0.03194761 -0.2507314  0.6035019  1.00000000
## 
## Individual: 81 
## Correlation Matrix of Residuals (Sigma):
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.3496142 -0.1130801  0.05946497
## [2,]  0.34961419  1.0000000 -0.2409382 -0.32716795
## [3,] -0.11308012 -0.2409382  1.0000000  0.53788053
## [4,]  0.05946497 -0.3271680  0.5378805  1.00000000
## Raw Correlation Matrix:
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.4209752 -0.2114492  0.04845453
## [2,]  0.42097518  1.0000000 -0.3776711 -0.36925725
## [3,] -0.21144915 -0.3776711  1.0000000  0.54525799
## [4,]  0.04845453 -0.3692572  0.5452580  1.00000000
## 
## Individual: 82 
## Correlation Matrix of Residuals (Sigma):
##            [,1]        [,2]       [,3]        [,4]
## [1,]  1.0000000  0.19928706  0.0688559 -0.06827840
## [2,]  0.1992871  1.00000000 -0.1824748 -0.02114699
## [3,]  0.0688559 -0.18247483  1.0000000  0.60429937
## [4,] -0.0682784 -0.02114699  0.6042994  1.00000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2731495 -0.0589621 -0.1503454
## [2,]  0.2731495  1.0000000 -0.2866984 -0.1990865
## [3,] -0.0589621 -0.2866984  1.0000000  0.6890961
## [4,] -0.1503454 -0.1990865  0.6890961  1.0000000
## 
## Individual: 83 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7035807 -0.4902624 -0.4007595
## [2,]  0.7035807  1.0000000 -0.3981739 -0.4097123
## [3,] -0.4902624 -0.3981739  1.0000000  0.6553181
## [4,] -0.4007595 -0.4097123  0.6553181  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7736732 -0.3349437 -0.2109582
## [2,]  0.7736732  1.0000000 -0.3643883 -0.3629990
## [3,] -0.3349437 -0.3643883  1.0000000  0.7639680
## [4,] -0.2109582 -0.3629990  0.7639680  1.0000000
## 
## Individual: 84 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7443152 -0.7166392 -0.3630155
## [2,]  0.7443152  1.0000000 -0.6793519 -0.4639484
## [3,] -0.7166392 -0.6793519  1.0000000  0.5744756
## [4,] -0.3630155 -0.4639484  0.5744756  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7809716 -0.6878749 -0.2862433
## [2,]  0.7809716  1.0000000 -0.6222326 -0.2807568
## [3,] -0.6878749 -0.6222326  1.0000000  0.6006624
## [4,] -0.2862433 -0.2807568  0.6006624  1.0000000
## 
## Individual: 85 
## Correlation Matrix of Residuals (Sigma):
##      [,1] [,2] [,3] [,4]
## [1,]    1    1    1   -1
## [2,]    1    1    1   -1
## [3,]    1    1    1   -1
## [4,]   -1   -1   -1    1
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4478529 -0.9505576 -0.5999192
## [2,]  0.4478529  1.0000000 -0.1546122 -0.9832930
## [3,] -0.9505576 -0.1546122  1.0000000  0.3258295
## [4,] -0.5999192 -0.9832930  0.3258295  1.0000000
## 
## Individual: 86 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3596738 -0.1796938 -0.4791476
## [2,]  0.3596738  1.0000000 -0.5313720 -0.5379162
## [3,] -0.1796938 -0.5313720  1.0000000  0.4914397
## [4,] -0.4791476 -0.5379162  0.4914397  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5081200 -0.3186176 -0.5160669
## [2,]  0.5081200  1.0000000 -0.5844129 -0.6765932
## [3,] -0.3186176 -0.5844129  1.0000000  0.6372848
## [4,] -0.5160669 -0.6765932  0.6372848  1.0000000
## 
## Individual: 87 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6160574 -0.2618436 -0.2045990
## [2,]  0.6160574  1.0000000 -0.2442978 -0.3045072
## [3,] -0.2618436 -0.2442978  1.0000000  0.6076392
## [4,] -0.2045990 -0.3045072  0.6076392  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6331068 -0.3142490 -0.3052608
## [2,]  0.6331068  1.0000000 -0.2784671 -0.3305029
## [3,] -0.3142490 -0.2784671  1.0000000  0.6590361
## [4,] -0.3052608 -0.3305029  0.6590361  1.0000000
## 
## Individual: 88 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5660382 -0.5965338 -0.3770944
## [2,]  0.5660382  1.0000000 -0.3664481 -0.2643123
## [3,] -0.5965338 -0.3664481  1.0000000  0.4987613
## [4,] -0.3770944 -0.2643123  0.4987613  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5775353 -0.5475498 -0.2885931
## [2,]  0.5775353  1.0000000 -0.3530115 -0.2715456
## [3,] -0.5475498 -0.3530115  1.0000000  0.3936142
## [4,] -0.2885931 -0.2715456  0.3936142  1.0000000
## 
## Individual: 89 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6715287 -0.5666190 -0.5016522
## [2,]  0.6715287  1.0000000 -0.6501925 -0.5315975
## [3,] -0.5666190 -0.6501925  1.0000000  0.7226118
## [4,] -0.5016522 -0.5315975  0.7226118  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4650844 -0.5531960 -0.4427343
## [2,]  0.4650844  1.0000000 -0.5252367 -0.5450868
## [3,] -0.5531960 -0.5252367  1.0000000  0.7315424
## [4,] -0.4427343 -0.5450868  0.7315424  1.0000000
## 
## Individual: 90 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6618530 -0.3067630 -0.3249138
## [2,]  0.6618530  1.0000000 -0.4952197 -0.4937458
## [3,] -0.3067630 -0.4952197  1.0000000  0.4634001
## [4,] -0.3249138 -0.4937458  0.4634001  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5670682 -0.2599995 -0.1823333
## [2,]  0.5670682  1.0000000 -0.4632283 -0.4688438
## [3,] -0.2599995 -0.4632283  1.0000000  0.4566352
## [4,] -0.1823333 -0.4688438  0.4566352  1.0000000
## 
## Individual: 91 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5526225 -0.3827843 -0.3311092
## [2,]  0.5526225  1.0000000 -0.4269787 -0.3294929
## [3,] -0.3827843 -0.4269787  1.0000000  0.6148981
## [4,] -0.3311092 -0.3294929  0.6148981  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6322255 -0.4330156 -0.3518162
## [2,]  0.6322255  1.0000000 -0.5323962 -0.4098447
## [3,] -0.4330156 -0.5323962  1.0000000  0.6412040
## [4,] -0.3518162 -0.4098447  0.6412040  1.0000000
## 
## Individual: 92 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6705643 -0.4659167 -0.4796712
## [2,]  0.6705643  1.0000000 -0.6603085 -0.4697570
## [3,] -0.4659167 -0.6603085  1.0000000  0.6554426
## [4,] -0.4796712 -0.4697570  0.6554426  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6106213 -0.4940438 -0.4762111
## [2,]  0.6106213  1.0000000 -0.5699035 -0.5157154
## [3,] -0.4940438 -0.5699035  1.0000000  0.6781551
## [4,] -0.4762111 -0.5157154  0.6781551  1.0000000
## 
## Individual: 93 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7632637 -0.6823381 -0.7256430
## [2,]  0.7632637  1.0000000 -0.6756119 -0.6163868
## [3,] -0.6823381 -0.6756119  1.0000000  0.7666990
## [4,] -0.7256430 -0.6163868  0.7666990  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7744043 -0.6276312 -0.5927675
## [2,]  0.7744043  1.0000000 -0.6146677 -0.6423970
## [3,] -0.6276312 -0.6146677  1.0000000  0.7322206
## [4,] -0.5927675 -0.6423970  0.7322206  1.0000000
## 
## Individual: 94 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7430947 -0.6501453 -0.6124435
## [2,]  0.7430947  1.0000000 -0.6824460 -0.6300781
## [3,] -0.6501453 -0.6824460  1.0000000  0.7389693
## [4,] -0.6124435 -0.6300781  0.7389693  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7667717 -0.6402360 -0.5413437
## [2,]  0.7667717  1.0000000 -0.7055314 -0.6573750
## [3,] -0.6402360 -0.7055314  1.0000000  0.7800966
## [4,] -0.5413437 -0.6573750  0.7800966  1.0000000
## 
## Individual: 95 
## Correlation Matrix of Residuals (Sigma):
##             [,1]       [,2]        [,3]       [,4]
## [1,]  1.00000000  0.3974522 -0.06163251 -0.1497721
## [2,]  0.39745217  1.0000000 -0.33188870 -0.3915335
## [3,] -0.06163251 -0.3318887  1.00000000  0.4572874
## [4,] -0.14977210 -0.3915335  0.45728739  1.0000000
## Raw Correlation Matrix:
##             [,1]       [,2]        [,3]        [,4]
## [1,]  1.00000000  0.2635448  0.01318657 -0.01568026
## [2,]  0.26354483  1.0000000 -0.31000634 -0.50550203
## [3,]  0.01318657 -0.3100063  1.00000000  0.54777005
## [4,] -0.01568026 -0.5055020  0.54777005  1.00000000
## 
## Individual: 96 
## Correlation Matrix of Residuals (Sigma):
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.24086765 -0.08326881 -0.13636096
## [2,]  0.24086765  1.00000000  0.01039851 -0.09336301
## [3,] -0.08326881  0.01039851  1.00000000  0.70278354
## [4,] -0.13636096 -0.09336301  0.70278354  1.00000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2923475 -0.2021761 -0.1001515
## [2,]  0.2923475  1.0000000 -0.3926817 -0.4207566
## [3,] -0.2021761 -0.3926817  1.0000000  0.8124527
## [4,] -0.1001515 -0.4207566  0.8124527  1.0000000
## 
## Individual: 97 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4462314 -0.1633994 -0.3269438
## [2,]  0.4462314  1.0000000 -0.2151693 -0.1248553
## [3,] -0.1633994 -0.2151693  1.0000000  0.4884840
## [4,] -0.3269438 -0.1248553  0.4884840  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5899889 -0.5238145 -0.5920475
## [2,]  0.5899889  1.0000000 -0.7438838 -0.7916293
## [3,] -0.5238145 -0.7438838  1.0000000  0.8379343
## [4,] -0.5920475 -0.7916293  0.8379343  1.0000000
## 
## Individual: 98 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5728755 -0.5037362 -0.4811072
## [2,]  0.5728755  1.0000000 -0.6167785 -0.5200800
## [3,] -0.5037362 -0.6167785  1.0000000  0.6646299
## [4,] -0.4811072 -0.5200800  0.6646299  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5070929 -0.3428261 -0.4417026
## [2,]  0.5070929  1.0000000 -0.5804219 -0.5166472
## [3,] -0.3428261 -0.5804219  1.0000000  0.7529532
## [4,] -0.4417026 -0.5166472  0.7529532  1.0000000
## 
## Individual: 99 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2712460 -0.3188751 -0.3861378
## [2,]  0.2712460  1.0000000 -0.6468870 -0.4897809
## [3,] -0.3188751 -0.6468870  1.0000000  0.5356932
## [4,] -0.3861378 -0.4897809  0.5356932  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4234861 -0.3858643 -0.3945234
## [2,]  0.4234861  1.0000000 -0.7134916 -0.6803604
## [3,] -0.3858643 -0.7134916  1.0000000  0.6663624
## [4,] -0.3945234 -0.6803604  0.6663624  1.0000000
## 
## Individual: 100 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5384288 -0.6764061 -0.4762448
## [2,]  0.5384288  1.0000000 -0.4559665 -0.3660047
## [3,] -0.6764061 -0.4559665  1.0000000  0.6620837
## [4,] -0.4762448 -0.3660047  0.6620837  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5040411 -0.6493398 -0.4024719
## [2,]  0.5040411  1.0000000 -0.3877384 -0.3924359
## [3,] -0.6493398 -0.3877384  1.0000000  0.6500372
## [4,] -0.4024719 -0.3924359  0.6500372  1.0000000
## 
## Individual: 101 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6673984 -0.5832958 -0.4378833
## [2,]  0.6673984  1.0000000 -0.6518221 -0.6155941
## [3,] -0.5832958 -0.6518221  1.0000000  0.7140077
## [4,] -0.4378833 -0.6155941  0.7140077  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5324995 -0.4372053 -0.2867928
## [2,]  0.5324995  1.0000000 -0.4296999 -0.5873549
## [3,] -0.4372053 -0.4296999  1.0000000  0.6304760
## [4,] -0.2867928 -0.5873549  0.6304760  1.0000000
## 
## Individual: 102 
## Correlation Matrix of Residuals (Sigma):
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8586286 -0.5303976 -0.5017079
## [2,]  0.8586286  1.0000000 -0.5442527 -0.5174940
## [3,] -0.5303976 -0.5442527  1.0000000  0.8558711
## [4,] -0.5017079 -0.5174940  0.8558711  1.0000000
## Raw Correlation Matrix:
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8659700 -0.4778989 -0.4956829
## [2,]  0.8659700  1.0000000 -0.5298556 -0.5499715
## [3,] -0.4778989 -0.5298556  1.0000000  0.8689682
## [4,] -0.4956829 -0.5499715  0.8689682  1.0000000
# Optionally, you can return the list of results for further analysis or comparison
print(cor_comparison_results)
## [[1]]
## [[1]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4806677 -0.2063431 -0.2166522
## [2,]  0.4806677  1.0000000 -0.1139593 -0.2044184
## [3,] -0.2063431 -0.1139593  1.0000000  0.7618041
## [4,] -0.2166522 -0.2044184  0.7618041  1.0000000
## 
## [[1]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5395174 -0.2017648 -0.2114857
## [2,]  0.5395174  1.0000000 -0.1819331 -0.3336662
## [3,] -0.2017648 -0.1819331  1.0000000  0.7757568
## [4,] -0.2114857 -0.3336662  0.7757568  1.0000000
## 
## 
## [[2]]
## [[2]]$cor_matrix_sigma
##            [,1]       [,2]        [,3]        [,4]
## [1,] 1.00000000  0.2229067  0.09081471  0.08874889
## [2,] 0.22290671  1.0000000 -0.16523309 -0.16980324
## [3,] 0.09081471 -0.1652331  1.00000000  0.29601722
## [4,] 0.08874889 -0.1698032  0.29601722  1.00000000
## 
## [[2]]$raw_cor_matrix
##            [,1]        [,2]        [,3]       [,4]
## [1,] 1.00000000  0.06492024  0.20248953  0.2480515
## [2,] 0.06492024  1.00000000 -0.09211366 -0.2233496
## [3,] 0.20248953 -0.09211366  1.00000000  0.4823391
## [4,] 0.24805154 -0.22334957  0.48233908  1.0000000
## 
## 
## [[3]]
## [[3]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6579364 -0.4983082 -0.4752640
## [2,]  0.6579364  1.0000000 -0.4446084 -0.4609633
## [3,] -0.4983082 -0.4446084  1.0000000  0.6007448
## [4,] -0.4752640 -0.4609633  0.6007448  1.0000000
## 
## [[3]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6502972 -0.3534829 -0.4667834
## [2,]  0.6502972  1.0000000 -0.3984103 -0.4996224
## [3,] -0.3534829 -0.3984103  1.0000000  0.6204431
## [4,] -0.4667834 -0.4996224  0.6204431  1.0000000
## 
## 
## [[4]]
## [[4]]$cor_matrix_sigma
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.56791987 -0.03301724 -0.06352399
## [2,]  0.56791987  1.00000000  0.09720237 -0.05007965
## [3,] -0.03301724  0.09720237  1.00000000  0.62900310
## [4,] -0.06352399 -0.05007965  0.62900310  1.00000000
## 
## [[4]]$raw_cor_matrix
##            [,1]        [,2]      [,3]        [,4]
## [1,] 1.00000000  0.65105229 0.2202914  0.06986386
## [2,] 0.65105229  1.00000000 0.2422850 -0.08813976
## [3,] 0.22029142  0.24228498 1.0000000  0.71628413
## [4,] 0.06986386 -0.08813976 0.7162841  1.00000000
## 
## 
## [[5]]
## [[5]]$cor_matrix_sigma
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.7733437 -0.5582753 -0.03485793
## [2,]  0.77334366  1.0000000 -0.4510653 -0.14624135
## [3,] -0.55827535 -0.4510653  1.0000000  0.29904145
## [4,] -0.03485793 -0.1462414  0.2990415  1.00000000
## 
## [[5]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7990455 -0.6786787 -0.3120833
## [2,]  0.7990455  1.0000000 -0.6260625 -0.4736115
## [3,] -0.6786787 -0.6260625  1.0000000  0.5847172
## [4,] -0.3120833 -0.4736115  0.5847172  1.0000000
## 
## 
## [[6]]
## [[6]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4774606 -0.4318316 -0.4798377
## [2,]  0.4774606  1.0000000 -0.4398391 -0.5438325
## [3,] -0.4318316 -0.4398391  1.0000000  0.6633994
## [4,] -0.4798377 -0.5438325  0.6633994  1.0000000
## 
## [[6]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4627404 -0.4136302 -0.4373499
## [2,]  0.4627404  1.0000000 -0.3385808 -0.5443438
## [3,] -0.4136302 -0.3385808  1.0000000  0.7207811
## [4,] -0.4373499 -0.5443438  0.7207811  1.0000000
## 
## 
## [[7]]
## [[7]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000 0.12381460 0.15902927 -0.2208643
## [2,]  0.1238146 1.00000000 0.00151675  0.1317064
## [3,]  0.1590293 0.00151675 1.00000000  0.1601968
## [4,] -0.2208643 0.13170641 0.16019680  1.0000000
## 
## [[7]]$raw_cor_matrix
##            [,1]        [,2]        [,3]        [,4]
## [1,]  1.0000000  0.11421321  0.14789411 -0.10484899
## [2,]  0.1142132  1.00000000 -0.06065664  0.06078367
## [3,]  0.1478941 -0.06065664  1.00000000  0.22139984
## [4,] -0.1048490  0.06078367  0.22139984  1.00000000
## 
## 
## [[8]]
## [[8]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6405233 -0.2294826 -0.2453930
## [2,]  0.6405233  1.0000000 -0.4920291 -0.3961667
## [3,] -0.2294826 -0.4920291  1.0000000  0.6306014
## [4,] -0.2453930 -0.3961667  0.6306014  1.0000000
## 
## [[8]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5600925 -0.1942148 -0.3906143
## [2,]  0.5600925  1.0000000 -0.4627897 -0.4996695
## [3,] -0.1942148 -0.4627897  1.0000000  0.6921603
## [4,] -0.3906143 -0.4996695  0.6921603  1.0000000
## 
## 
## [[9]]
## [[9]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3765211 -0.1384618 -0.1340127
## [2,]  0.3765211  1.0000000 -0.3951624 -0.4118393
## [3,] -0.1384618 -0.3951624  1.0000000  0.5472830
## [4,] -0.1340127 -0.4118393  0.5472830  1.0000000
## 
## [[9]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.1727390 -0.1921587 -0.2493156
## [2,]  0.1727390  1.0000000 -0.2341707 -0.4354433
## [3,] -0.1921587 -0.2341707  1.0000000  0.6050916
## [4,] -0.2493156 -0.4354433  0.6050916  1.0000000
## 
## 
## [[10]]
## [[10]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4562095 -0.3453574 -0.2030471
## [2,]  0.4562095  1.0000000 -0.3332408 -0.2065518
## [3,] -0.3453574 -0.3332408  1.0000000  0.5551665
## [4,] -0.2030471 -0.2065518  0.5551665  1.0000000
## 
## [[10]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5801222 -0.2541050 -0.3360171
## [2,]  0.5801222  1.0000000 -0.2313076 -0.4677152
## [3,] -0.2541050 -0.2313076  1.0000000  0.5190557
## [4,] -0.3360171 -0.4677152  0.5190557  1.0000000
## 
## 
## [[11]]
## [[11]]$cor_matrix_sigma
##            [,1]        [,2]       [,3]        [,4]
## [1,]  1.0000000  0.67111424 -0.2223123 -0.13473035
## [2,]  0.6711142  1.00000000 -0.1206598  0.02895729
## [3,] -0.2223123 -0.12065979  1.0000000  0.32696339
## [4,] -0.1347304  0.02895729  0.3269634  1.00000000
## 
## [[11]]$raw_cor_matrix
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.58088596 -0.10945219  0.00794945
## [2,]  0.58088596  1.00000000 -0.04989415 -0.07182778
## [3,] -0.10945219 -0.04989415  1.00000000  0.36143502
## [4,]  0.00794945 -0.07182778  0.36143502  1.00000000
## 
## 
## [[12]]
## [[12]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5278951 -0.4982812 -0.1163159
## [2,]  0.5278951  1.0000000 -0.5343092 -0.4703143
## [3,] -0.4982812 -0.5343092  1.0000000  0.5538382
## [4,] -0.1163159 -0.4703143  0.5538382  1.0000000
## 
## [[12]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5542402 -0.3848256 -0.1019621
## [2,]  0.5542402  1.0000000 -0.4865519 -0.4846950
## [3,] -0.3848256 -0.4865519  1.0000000  0.5767204
## [4,] -0.1019621 -0.4846950  0.5767204  1.0000000
## 
## 
## [[13]]
## [[13]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4029088 -0.3592717 -0.2923937
## [2,]  0.4029088  1.0000000 -0.3360180 -0.1632952
## [3,] -0.3592717 -0.3360180  1.0000000  0.4807404
## [4,] -0.2923937 -0.1632952  0.4807404  1.0000000
## 
## [[13]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4597983 -0.3680541 -0.2069951
## [2,]  0.4597983  1.0000000 -0.4672444 -0.2277734
## [3,] -0.3680541 -0.4672444  1.0000000  0.4978471
## [4,] -0.2069951 -0.2277734  0.4978471  1.0000000
## 
## 
## [[14]]
## [[14]]$cor_matrix_sigma
##            [,1]       [,2]      [,3]        [,4]
## [1,]  1.0000000 0.44172342 0.1029984 -0.15066582
## [2,]  0.4417234 1.00000000 0.0547912  0.08555812
## [3,]  0.1029984 0.05479120 1.0000000  0.63060539
## [4,] -0.1506658 0.08555812 0.6306054  1.00000000
## 
## [[14]]$raw_cor_matrix
##           [,1]      [,2]      [,3]      [,4]
## [1,] 1.0000000 0.9943155 0.9604814 0.8622904
## [2,] 0.9943155 1.0000000 0.9561934 0.8687434
## [3,] 0.9604814 0.9561934 1.0000000 0.9078007
## [4,] 0.8622904 0.8687434 0.9078007 1.0000000
## 
## 
## [[15]]
## [[15]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6680353 -0.2693402 -0.4588030
## [2,]  0.6680353  1.0000000 -0.3478900 -0.3655768
## [3,] -0.2693402 -0.3478900  1.0000000  0.4890764
## [4,] -0.4588030 -0.3655768  0.4890764  1.0000000
## 
## [[15]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6891618 -0.3492072 -0.5139480
## [2,]  0.6891618  1.0000000 -0.3532778 -0.5014586
## [3,] -0.3492072 -0.3532778  1.0000000  0.5750609
## [4,] -0.5139480 -0.5014586  0.5750609  1.0000000
## 
## 
## [[16]]
## [[16]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2198169 -0.7841744 -0.5934979
## [2,]  0.2198169  1.0000000 -0.1335733 -0.1621855
## [3,] -0.7841744 -0.1335733  1.0000000  0.6772199
## [4,] -0.5934979 -0.1621855  0.6772199  1.0000000
## 
## [[16]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2835660 -0.7226588 -0.5794414
## [2,]  0.2835660  1.0000000 -0.2340883 -0.2345702
## [3,] -0.7226588 -0.2340883  1.0000000  0.6583759
## [4,] -0.5794414 -0.2345702  0.6583759  1.0000000
## 
## 
## [[17]]
## [[17]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3487913 -0.2394880 -0.3330882
## [2,]  0.3487913  1.0000000 -0.1878655 -0.3333828
## [3,] -0.2394880 -0.1878655  1.0000000  0.5416668
## [4,] -0.3330882 -0.3333828  0.5416668  1.0000000
## 
## [[17]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5354880 -0.4096380 -0.4243364
## [2,]  0.5354880  1.0000000 -0.3403812 -0.4451100
## [3,] -0.4096380 -0.3403812  1.0000000  0.6694502
## [4,] -0.4243364 -0.4451100  0.6694502  1.0000000
## 
## 
## [[18]]
## [[18]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4073146 -0.2579955 -0.4031654
## [2,]  0.4073146  1.0000000 -0.1740150 -0.2444416
## [3,] -0.2579955 -0.1740150  1.0000000  0.6814247
## [4,] -0.4031654 -0.2444416  0.6814247  1.0000000
## 
## [[18]]$raw_cor_matrix
##             [,1]       [,2]        [,3]       [,4]
## [1,]  1.00000000  0.4656177  0.04086335 -0.1141648
## [2,]  0.46561769  1.0000000 -0.11275284 -0.1696839
## [3,]  0.04086335 -0.1127528  1.00000000  0.5324708
## [4,] -0.11416477 -0.1696839  0.53247083  1.0000000
## 
## 
## [[19]]
## [[19]]$cor_matrix_sigma
##            [,1]         [,2]         [,3]        [,4]
## [1,]  1.0000000  0.599024719 -0.177717632 -0.29838306
## [2,]  0.5990247  1.000000000 -0.007921077 -0.38201200
## [3,] -0.1777176 -0.007921077  1.000000000 -0.08830013
## [4,] -0.2983831 -0.382012003 -0.088300134  1.00000000
## 
## [[19]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6510544 -0.3229701 -0.1886845
## [2,]  0.6510544  1.0000000 -0.2088623 -0.3909307
## [3,] -0.3229701 -0.2088623  1.0000000  0.1326762
## [4,] -0.1886845 -0.3909307  0.1326762  1.0000000
## 
## 
## [[20]]
## [[20]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4663117 -0.4512796 -0.3419628
## [2,]  0.4663117  1.0000000 -0.5362868 -0.5249732
## [3,] -0.4512796 -0.5362868  1.0000000  0.5280584
## [4,] -0.3419628 -0.5249732  0.5280584  1.0000000
## 
## [[20]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5210594 -0.4426755 -0.3765095
## [2,]  0.5210594  1.0000000 -0.4476902 -0.5062515
## [3,] -0.4426755 -0.4476902  1.0000000  0.6474894
## [4,] -0.3765095 -0.5062515  0.6474894  1.0000000
## 
## 
## [[21]]
## [[21]]$cor_matrix_sigma
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.3938702 -0.2984844  0.03469054
## [2,]  0.39387017  1.0000000 -0.4383433 -0.18326820
## [3,] -0.29848437 -0.4383433  1.0000000  0.67738215
## [4,]  0.03469054 -0.1832682  0.6773822  1.00000000
## 
## [[21]]$raw_cor_matrix
##      [,1] [,2] [,3] [,4]
## [1,]    1    1    1   -1
## [2,]    1    1    1   -1
## [3,]    1    1    1   -1
## [4,]   -1   -1   -1    1
## 
## 
## [[22]]
## [[22]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5442373 -0.1950853 -0.3511308
## [2,]  0.5442373  1.0000000 -0.3158613 -0.3509693
## [3,] -0.1950853 -0.3158613  1.0000000  0.4222232
## [4,] -0.3511308 -0.3509693  0.4222232  1.0000000
## 
## [[22]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4986492 -0.2209342 -0.2757895
## [2,]  0.4986492  1.0000000 -0.2903905 -0.3180181
## [3,] -0.2209342 -0.2903905  1.0000000  0.3726295
## [4,] -0.2757895 -0.3180181  0.3726295  1.0000000
## 
## 
## [[23]]
## [[23]]$cor_matrix_sigma
##            [,1]       [,2]        [,3]        [,4]
## [1,]  1.0000000  0.4409914 -0.32534664 -0.16866499
## [2,]  0.4409914  1.0000000 -0.16367783 -0.18305946
## [3,] -0.3253466 -0.1636778  1.00000000  0.04414377
## [4,] -0.1686650 -0.1830595  0.04414377  1.00000000
## 
## [[23]]$raw_cor_matrix
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.12646508 -0.10943507  0.4073103
## [2,]  0.1264651  1.00000000 -0.04943633 -0.3483304
## [3,] -0.1094351 -0.04943633  1.00000000  0.2086221
## [4,]  0.4073103 -0.34833039  0.20862213  1.0000000
## 
## 
## [[24]]
## [[24]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5660740 -0.4110413 -0.3982368
## [2,]  0.5660740  1.0000000 -0.3824101 -0.5398052
## [3,] -0.4110413 -0.3824101  1.0000000  0.4795195
## [4,] -0.3982368 -0.5398052  0.4795195  1.0000000
## 
## [[24]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5717236 -0.3597698 -0.3749846
## [2,]  0.5717236  1.0000000 -0.4290814 -0.5955753
## [3,] -0.3597698 -0.4290814  1.0000000  0.6852610
## [4,] -0.3749846 -0.5955753  0.6852610  1.0000000
## 
## 
## [[25]]
## [[25]]$cor_matrix_sigma
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.36475271 -0.44928583 -0.4572539
## [2,]  0.3647527  1.00000000 -0.08540988 -0.3420193
## [3,] -0.4492858 -0.08540988  1.00000000  0.4199216
## [4,] -0.4572539 -0.34201932  0.41992162  1.0000000
## 
## [[25]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3608882 -0.4914099 -0.3630390
## [2,]  0.3608882  1.0000000 -0.1034313 -0.3539639
## [3,] -0.4914099 -0.1034313  1.0000000  0.3618085
## [4,] -0.3630390 -0.3539639  0.3618085  1.0000000
## 
## 
## [[26]]
## [[26]]$cor_matrix_sigma
##            [,1]        [,2]       [,3]        [,4]
## [1,]  1.0000000  0.55959718 -0.4177132 -0.14640553
## [2,]  0.5595972  1.00000000 -0.4822383 -0.05550555
## [3,] -0.4177132 -0.48223831  1.0000000 -0.12014477
## [4,] -0.1464055 -0.05550555 -0.1201448  1.00000000
## 
## [[26]]$raw_cor_matrix
##              [,1]       [,2]         [,3]       [,4]
## [1,]  1.000000000  0.6961903 -0.004944624  0.0321719
## [2,]  0.696190345  1.0000000 -0.213800124 -0.1977892
## [3,] -0.004944624 -0.2138001  1.000000000  0.8411890
## [4,]  0.032171896 -0.1977892  0.841188971  1.0000000
## 
## 
## [[27]]
## [[27]]$cor_matrix_sigma
##             [,1]      [,2]        [,3]       [,4]
## [1,]  1.00000000 0.2368950 -0.06985394 0.01720272
## [2,]  0.23689500 1.0000000  0.26051306 0.12554660
## [3,] -0.06985394 0.2605131  1.00000000 0.47166334
## [4,]  0.01720272 0.1255466  0.47166334 1.00000000
## 
## [[27]]$raw_cor_matrix
##            [,1]        [,2]        [,3]        [,4]
## [1,] 1.00000000  0.13823548  0.11501613  0.06175092
## [2,] 0.13823548  1.00000000 -0.03263686 -0.06553266
## [3,] 0.11501613 -0.03263686  1.00000000  0.58528857
## [4,] 0.06175092 -0.06553266  0.58528857  1.00000000
## 
## 
## [[28]]
## [[28]]$cor_matrix_sigma
##              [,1]        [,2]         [,3]        [,4]
## [1,]  1.000000000  0.45844527 -0.003455601 -0.06155817
## [2,]  0.458445267  1.00000000  0.035134348 -0.30532411
## [3,] -0.003455601  0.03513435  1.000000000  0.29666008
## [4,] -0.061558172 -0.30532411  0.296660082  1.00000000
## 
## [[28]]$raw_cor_matrix
##             [,1]       [,2]        [,3]       [,4]
## [1,]  1.00000000  0.5033753 -0.02537893 -0.1697862
## [2,]  0.50337529  1.0000000 -0.24507360 -0.4547635
## [3,] -0.02537893 -0.2450736  1.00000000  0.4926576
## [4,] -0.16978616 -0.4547635  0.49265760  1.0000000
## 
## 
## [[29]]
## [[29]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000 -0.4350644  0.1262932  0.1120217
## [2,] -0.4350644  1.0000000 -0.2905243 -0.3781318
## [3,]  0.1262932 -0.2905243  1.0000000  0.6517453
## [4,]  0.1120217 -0.3781318  0.6517453  1.0000000
## 
## [[29]]$raw_cor_matrix
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.04602215 -0.03557545 -0.03373289
## [2,]  0.04602215  1.00000000 -0.33540836 -0.57429950
## [3,] -0.03557545 -0.33540836  1.00000000  0.64013792
## [4,] -0.03373289 -0.57429950  0.64013792  1.00000000
## 
## 
## [[30]]
## [[30]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5767792 -0.2634404 -0.2104022
## [2,]  0.5767792  1.0000000 -0.5309433 -0.5446374
## [3,] -0.2634404 -0.5309433  1.0000000  0.6965491
## [4,] -0.2104022 -0.5446374  0.6965491  1.0000000
## 
## [[30]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5344052 -0.1554245 -0.1438290
## [2,]  0.5344052  1.0000000 -0.5742919 -0.6190395
## [3,] -0.1554245 -0.5742919  1.0000000  0.7387692
## [4,] -0.1438290 -0.6190395  0.7387692  1.0000000
## 
## 
## [[31]]
## [[31]]$cor_matrix_sigma
##             [,1]       [,2]        [,3]       [,4]
## [1,]  1.00000000  0.3341896 -0.01460477 -0.1201202
## [2,]  0.33418958  1.0000000 -0.21977184 -0.1634685
## [3,] -0.01460477 -0.2197718  1.00000000  0.7281710
## [4,] -0.12012017 -0.1634685  0.72817099  1.0000000
## 
## [[31]]$raw_cor_matrix
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.41760629 -0.03070476  0.07646404
## [2,]  0.41760629  1.00000000 -0.17568441 -0.09140123
## [3,] -0.03070476 -0.17568441  1.00000000  0.59993432
## [4,]  0.07646404 -0.09140123  0.59993432  1.00000000
## 
## 
## [[32]]
## [[32]]$cor_matrix_sigma
##           [,1]      [,2]      [,3]      [,4]
## [1,] 1.0000000 0.2543634 0.1577347 0.1124576
## [2,] 0.2543634 1.0000000 0.5062933 0.3655889
## [3,] 0.1577347 0.5062933 1.0000000 0.7315755
## [4,] 0.1124576 0.3655889 0.7315755 1.0000000
## 
## [[32]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3186872 -0.3854179 -0.4102460
## [2,]  0.3186872  1.0000000 -0.0291610 -0.0502448
## [3,] -0.3854179 -0.0291610  1.0000000  0.9803859
## [4,] -0.4102460 -0.0502448  0.9803859  1.0000000
## 
## 
## [[33]]
## [[33]]$cor_matrix_sigma
##      [,1] [,2] [,3] [,4]
## [1,]    1    1    1   -1
## [2,]    1    1    1   -1
## [3,]    1    1    1   -1
## [4,]   -1   -1   -1    1
## 
## [[33]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8113299  0.5026733 -0.9963832
## [2,]  0.8113299  1.0000000  0.7893732 -0.8133795
## [3,]  0.5026733  0.7893732  1.0000000 -0.4585062
## [4,] -0.9963832 -0.8133795 -0.4585062  1.0000000
## 
## 
## [[34]]
## [[34]]$cor_matrix_sigma
##            [,1]        [,2]       [,3]        [,4]
## [1,]  1.0000000  0.19495804 -0.3356730 -0.13943525
## [2,]  0.1949580  1.00000000 -0.1207455 -0.05260459
## [3,] -0.3356730 -0.12074545  1.0000000  0.56114155
## [4,] -0.1394352 -0.05260459  0.5611416  1.00000000
## 
## [[34]]$raw_cor_matrix
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.19117549 -0.18081835 -0.1652940
## [2,]  0.1911755  1.00000000 -0.04869996 -0.1052453
## [3,] -0.1808184 -0.04869996  1.00000000  0.7201626
## [4,] -0.1652940 -0.10524535  0.72016261  1.0000000
## 
## 
## [[35]]
## [[35]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6585103 -0.3483307 -0.4753171
## [2,]  0.6585103  1.0000000 -0.3287172 -0.4877264
## [3,] -0.3483307 -0.3287172  1.0000000  0.7253588
## [4,] -0.4753171 -0.4877264  0.7253588  1.0000000
## 
## [[35]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5852849 -0.2865751 -0.4192906
## [2,]  0.5852849  1.0000000 -0.3042067 -0.5127668
## [3,] -0.2865751 -0.3042067  1.0000000  0.7152037
## [4,] -0.4192906 -0.5127668  0.7152037  1.0000000
## 
## 
## [[36]]
## [[36]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7794920 -0.7773391 -0.6849401
## [2,]  0.7794920  1.0000000 -0.7381469 -0.7163745
## [3,] -0.7773391 -0.7381469  1.0000000  0.8012354
## [4,] -0.6849401 -0.7163745  0.8012354  1.0000000
## 
## [[36]]$raw_cor_matrix
##            [,1]       [,2]       [,3]      [,4]
## [1,]  1.0000000  0.7614875 -0.7815275 -0.708332
## [2,]  0.7614875  1.0000000 -0.7657622 -0.740477
## [3,] -0.7815275 -0.7657622  1.0000000  0.810526
## [4,] -0.7083320 -0.7404770  0.8105260  1.000000
## 
## 
## [[37]]
## [[37]]$cor_matrix_sigma
##             [,1]        [,2]       [,3]       [,4]
## [1,]  1.00000000  0.52131811 -0.1734890 0.02079563
## [2,]  0.52131811  1.00000000 -0.1659152 0.08159233
## [3,] -0.17348896 -0.16591523  1.0000000 0.20979142
## [4,]  0.02079563  0.08159233  0.2097914 1.00000000
## 
## [[37]]$raw_cor_matrix
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.45626763 -0.09389952 -0.03427493
## [2,]  0.45626763  1.00000000 -0.25281706 -0.03318932
## [3,] -0.09389952 -0.25281706  1.00000000  0.22665229
## [4,] -0.03427493 -0.03318932  0.22665229  1.00000000
## 
## 
## [[38]]
## [[38]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7608324 -0.3456743 -0.3552277
## [2,]  0.7608324  1.0000000 -0.4195890 -0.4063475
## [3,] -0.3456743 -0.4195890  1.0000000  0.5387229
## [4,] -0.3552277 -0.4063475  0.5387229  1.0000000
## 
## [[38]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7473736 -0.3249185 -0.3434304
## [2,]  0.7473736  1.0000000 -0.4009405 -0.4875802
## [3,] -0.3249185 -0.4009405  1.0000000  0.6275356
## [4,] -0.3434304 -0.4875802  0.6275356  1.0000000
## 
## 
## [[39]]
## [[39]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3845950 -0.2137378 -0.1731150
## [2,]  0.3845950  1.0000000 -0.5741106 -0.4989101
## [3,] -0.2137378 -0.5741106  1.0000000  0.5978136
## [4,] -0.1731150 -0.4989101  0.5978136  1.0000000
## 
## [[39]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4951413 -0.1249336 -0.1478588
## [2,]  0.4951413  1.0000000 -0.4815659 -0.4718838
## [3,] -0.1249336 -0.4815659  1.0000000  0.5257268
## [4,] -0.1478588 -0.4718838  0.5257268  1.0000000
## 
## 
## [[40]]
## [[40]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6739744 -0.2560967 -0.2992307
## [2,]  0.6739744  1.0000000 -0.1281744 -0.1878042
## [3,] -0.2560967 -0.1281744  1.0000000  0.6994144
## [4,] -0.2992307 -0.1878042  0.6994144  1.0000000
## 
## [[40]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6745315 -0.3161316 -0.3225271
## [2,]  0.6745315  1.0000000 -0.3068780 -0.3846407
## [3,] -0.3161316 -0.3068780  1.0000000  0.7857223
## [4,] -0.3225271 -0.3846407  0.7857223  1.0000000
## 
## 
## [[41]]
## [[41]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5600110 -0.4966121 -0.2459618
## [2,]  0.5600110  1.0000000 -0.5360072 -0.3121899
## [3,] -0.4966121 -0.5360072  1.0000000  0.5792604
## [4,] -0.2459618 -0.3121899  0.5792604  1.0000000
## 
## [[41]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4733807 -0.2847008 -0.1973646
## [2,]  0.4733807  1.0000000 -0.5472948 -0.4539480
## [3,] -0.2847008 -0.5472948  1.0000000  0.6587603
## [4,] -0.1973646 -0.4539480  0.6587603  1.0000000
## 
## 
## [[42]]
## [[42]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2770667 -0.3247345 -0.3522350
## [2,]  0.2770667  1.0000000 -0.1901716 -0.2445578
## [3,] -0.3247345 -0.1901716  1.0000000  0.4857445
## [4,] -0.3522350 -0.2445578  0.4857445  1.0000000
## 
## [[42]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2572689 -0.2380078 -0.2515135
## [2,]  0.2572689  1.0000000 -0.1722926 -0.2478295
## [3,] -0.2380078 -0.1722926  1.0000000  0.4395768
## [4,] -0.2515135 -0.2478295  0.4395768  1.0000000
## 
## 
## [[43]]
## [[43]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5763069 -0.4719776 -0.4805291
## [2,]  0.5763069  1.0000000 -0.6033678 -0.5848168
## [3,] -0.4719776 -0.6033678  1.0000000  0.7167320
## [4,] -0.4805291 -0.5848168  0.7167320  1.0000000
## 
## [[43]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5257711 -0.3425808 -0.3845367
## [2,]  0.5257711  1.0000000 -0.5647704 -0.6177400
## [3,] -0.3425808 -0.5647704  1.0000000  0.7111623
## [4,] -0.3845367 -0.6177400  0.7111623  1.0000000
## 
## 
## [[44]]
## [[44]]$cor_matrix_sigma
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.62476938 -0.22092052 -0.2974501
## [2,]  0.6247694  1.00000000  0.08664658 -0.0570210
## [3,] -0.2209205  0.08664658  1.00000000  0.3295665
## [4,] -0.2974501 -0.05702100  0.32956647  1.0000000
## 
## [[44]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4224004 -0.3966344  0.2701114
## [2,]  0.4224004  1.0000000  0.2332267 -0.3708985
## [3,] -0.3966344  0.2332267  1.0000000 -0.5287251
## [4,]  0.2701114 -0.3708985 -0.5287251  1.0000000
## 
## 
## [[45]]
## [[45]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5434782 -0.3798646 -0.4902360
## [2,]  0.5434782  1.0000000 -0.2779582 -0.6143037
## [3,] -0.3798646 -0.2779582  1.0000000  0.2766831
## [4,] -0.4902360 -0.6143037  0.2766831  1.0000000
## 
## [[45]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4520377 -0.1925213 -0.3173735
## [2,]  0.4520377  1.0000000 -0.2240396 -0.6680801
## [3,] -0.1925213 -0.2240396  1.0000000  0.3832589
## [4,] -0.3173735 -0.6680801  0.3832589  1.0000000
## 
## 
## [[46]]
## [[46]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5324597 -0.3417220 -0.2463662
## [2,]  0.5324597  1.0000000 -0.4324069 -0.1891569
## [3,] -0.3417220 -0.4324069  1.0000000  0.5842523
## [4,] -0.2463662 -0.1891569  0.5842523  1.0000000
## 
## [[46]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5443940 -0.2161316 -0.2010846
## [2,]  0.5443940  1.0000000 -0.3864946 -0.2526510
## [3,] -0.2161316 -0.3864946  1.0000000  0.5987756
## [4,] -0.2010846 -0.2526510  0.5987756  1.0000000
## 
## 
## [[47]]
## [[47]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6723824 -0.2927025 -0.3236798
## [2,]  0.6723824  1.0000000 -0.3000375 -0.5567618
## [3,] -0.2927025 -0.3000375  1.0000000  0.4231000
## [4,] -0.3236798 -0.5567618  0.4231000  1.0000000
## 
## [[47]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5770658 -0.2242026 -0.3376926
## [2,]  0.5770658  1.0000000 -0.3736248 -0.5363055
## [3,] -0.2242026 -0.3736248  1.0000000  0.5037378
## [4,] -0.3376926 -0.5363055  0.5037378  1.0000000
## 
## 
## [[48]]
## [[48]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7188816 -0.6679435 -0.6559549
## [2,]  0.7188816  1.0000000 -0.5752927 -0.5867486
## [3,] -0.6679435 -0.5752927  1.0000000  0.8737925
## [4,] -0.6559549 -0.5867486  0.8737925  1.0000000
## 
## [[48]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6366993 -0.6154646 -0.6582084
## [2,]  0.6366993  1.0000000 -0.6115141 -0.6106362
## [3,] -0.6154646 -0.6115141  1.0000000  0.8653853
## [4,] -0.6582084 -0.6106362  0.8653853  1.0000000
## 
## 
## [[49]]
## [[49]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7306029 -0.4617894 -0.3356804
## [2,]  0.7306029  1.0000000 -0.3579848 -0.2144997
## [3,] -0.4617894 -0.3579848  1.0000000  0.6824478
## [4,] -0.3356804 -0.2144997  0.6824478  1.0000000
## 
## [[49]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7494091 -0.5418563 -0.5373436
## [2,]  0.7494091  1.0000000 -0.4009613 -0.3385191
## [3,] -0.5418563 -0.4009613  1.0000000  0.6606115
## [4,] -0.5373436 -0.3385191  0.6606115  1.0000000
## 
## 
## [[50]]
## [[50]]$cor_matrix_sigma
##      [,1] [,2] [,3] [,4]
## [1,]    1    1   -1   -1
## [2,]    1    1   -1   -1
## [3,]   -1   -1    1    1
## [4,]   -1   -1    1    1
## 
## [[50]]$raw_cor_matrix
##      [,1] [,2] [,3] [,4]
## [1,]    1    1   -1   -1
## [2,]    1    1   -1   -1
## [3,]   -1   -1    1    1
## [4,]   -1   -1    1    1
## 
## 
## [[51]]
## [[51]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4399981 -0.1844556 -0.2665719
## [2,]  0.4399981  1.0000000 -0.3735598 -0.3926401
## [3,] -0.1844556 -0.3735598  1.0000000  0.8990355
## [4,] -0.2665719 -0.3926401  0.8990355  1.0000000
## 
## [[51]]$raw_cor_matrix
##              [,1]       [,2]         [,3]        [,4]
## [1,]  1.000000000  0.5417522 -0.004996123 -0.09844174
## [2,]  0.541752200  1.0000000 -0.222723311 -0.30914213
## [3,] -0.004996123 -0.2227233  1.000000000  0.92315292
## [4,] -0.098441742 -0.3091421  0.923152916  1.00000000
## 
## 
## [[52]]
## [[52]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5623823 -0.2829090 -0.3189776
## [2,]  0.5623823  1.0000000 -0.2660430 -0.3342313
## [3,] -0.2829090 -0.2660430  1.0000000  0.6517342
## [4,] -0.3189776 -0.3342313  0.6517342  1.0000000
## 
## [[52]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5957668 -0.2486638 -0.3368833
## [2,]  0.5957668  1.0000000 -0.2814224 -0.4209557
## [3,] -0.2486638 -0.2814224  1.0000000  0.6632011
## [4,] -0.3368833 -0.4209557  0.6632011  1.0000000
## 
## 
## [[53]]
## [[53]]$cor_matrix_sigma
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.3472178 -0.1051572  0.07940424
## [2,]  0.34721778  1.0000000 -0.1121058 -0.16507041
## [3,] -0.10515724 -0.1121058  1.0000000  0.65173038
## [4,]  0.07940424 -0.1650704  0.6517304  1.00000000
## 
## [[53]]$raw_cor_matrix
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.4812647 -0.3392398 -0.08585726
## [2,]  0.48126470  1.0000000 -0.4606790 -0.33181317
## [3,] -0.33923982 -0.4606790  1.0000000  0.67529293
## [4,] -0.08585726 -0.3318132  0.6752929  1.00000000
## 
## 
## [[54]]
## [[54]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.1110986 -0.2484443 -0.2831761
## [2,]  0.1110986  1.0000000 -0.1423409 -0.3028697
## [3,] -0.2484443 -0.1423409  1.0000000  0.5217115
## [4,] -0.2831761 -0.3028697  0.5217115  1.0000000
## 
## [[54]]$raw_cor_matrix
##             [,1]        [,2]        [,3]       [,4]
## [1,]  1.00000000 -0.01768809 -0.29861659 -0.1985524
## [2,] -0.01768809  1.00000000  0.01298615 -0.1929936
## [3,] -0.29861659  0.01298615  1.00000000  0.3118346
## [4,] -0.19855243 -0.19299362  0.31183459  1.0000000
## 
## 
## [[55]]
## [[55]]$cor_matrix_sigma
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.25100196 -0.10437211 -0.1965768
## [2,]  0.2510020  1.00000000 -0.06628925 -0.3459182
## [3,] -0.1043721 -0.06628925  1.00000000  0.2837280
## [4,] -0.1965768 -0.34591823  0.28372797  1.0000000
## 
## [[55]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3441527 -0.1759805 -0.2163114
## [2,]  0.3441527  1.0000000 -0.3507917 -0.5820528
## [3,] -0.1759805 -0.3507917  1.0000000  0.5638360
## [4,] -0.2163114 -0.5820528  0.5638360  1.0000000
## 
## 
## [[56]]
## [[56]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3462977 -0.1181267 -0.2039538
## [2,]  0.3462977  1.0000000 -0.1819588 -0.1233699
## [3,] -0.1181267 -0.1819588  1.0000000  0.6337165
## [4,] -0.2039538 -0.1233699  0.6337165  1.0000000
## 
## [[56]]$raw_cor_matrix
##              [,1]        [,2]         [,3]       [,4]
## [1,]  1.000000000  0.39373022 -0.009354423 -0.1966133
## [2,]  0.393730216  1.00000000 -0.037484959 -0.1896954
## [3,] -0.009354423 -0.03748496  1.000000000  0.5629240
## [4,] -0.196613281 -0.18969537  0.562924005  1.0000000
## 
## 
## [[57]]
## [[57]]$cor_matrix_sigma
##             [,1]       [,2]        [,3]        [,4]
## [1,]  1.00000000  0.4339884  0.07009105 -0.03157351
## [2,]  0.43398841  1.0000000 -0.35227327 -0.39877456
## [3,]  0.07009105 -0.3522733  1.00000000  0.50351390
## [4,] -0.03157351 -0.3987746  0.50351390  1.00000000
## 
## [[57]]$raw_cor_matrix
##           [,1]       [,2]       [,3]       [,4]
## [1,] 1.0000000  0.4489024  0.2466720  0.1460675
## [2,] 0.4489024  1.0000000 -0.2121791 -0.2990738
## [3,] 0.2466720 -0.2121791  1.0000000  0.6528124
## [4,] 0.1460675 -0.2990738  0.6528124  1.0000000
## 
## 
## [[58]]
## [[58]]$cor_matrix_sigma
##              [,1]       [,2]        [,3]         [,4]
## [1,]  1.000000000  0.1247825 -0.04974741  0.006607303
## [2,]  0.124782476  1.0000000 -0.11625131 -0.145096773
## [3,] -0.049747411 -0.1162513  1.00000000  0.662682304
## [4,]  0.006607303 -0.1450968  0.66268230  1.000000000
## 
## [[58]]$raw_cor_matrix
##             [,1]       [,2]        [,3]        [,4]
## [1,]  1.00000000  0.2082623 -0.07798531  0.02113397
## [2,]  0.20826226  1.0000000 -0.25706718 -0.28329781
## [3,] -0.07798531 -0.2570672  1.00000000  0.68915343
## [4,]  0.02113397 -0.2832978  0.68915343  1.00000000
## 
## 
## [[59]]
## [[59]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5428407 -0.1933795 -0.2362792
## [2,]  0.5428407  1.0000000 -0.4014372 -0.3277106
## [3,] -0.1933795 -0.4014372  1.0000000  0.6545209
## [4,] -0.2362792 -0.3277106  0.6545209  1.0000000
## 
## [[59]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5360426 -0.1720487 -0.1672002
## [2,]  0.5360426  1.0000000 -0.5030989 -0.4327811
## [3,] -0.1720487 -0.5030989  1.0000000  0.7243422
## [4,] -0.1672002 -0.4327811  0.7243422  1.0000000
## 
## 
## [[60]]
## [[60]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7768960 -0.5264960 -0.5750437
## [2,]  0.7768960  1.0000000 -0.4895684 -0.5551317
## [3,] -0.5264960 -0.4895684  1.0000000  0.6295898
## [4,] -0.5750437 -0.5551317  0.6295898  1.0000000
## 
## [[60]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8901717 -0.6664296 -0.5209499
## [2,]  0.8901717  1.0000000 -0.6912345 -0.5538558
## [3,] -0.6664296 -0.6912345  1.0000000  0.6914538
## [4,] -0.5209499 -0.5538558  0.6914538  1.0000000
## 
## 
## [[61]]
## [[61]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4040050 -0.3409738 -0.1551534
## [2,]  0.4040050  1.0000000 -0.3897837 -0.2029336
## [3,] -0.3409738 -0.3897837  1.0000000  0.3937754
## [4,] -0.1551534 -0.2029336  0.3937754  1.0000000
## 
## [[61]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3828099 -0.2028026 -0.1149093
## [2,]  0.3828099  1.0000000 -0.3124147 -0.3228167
## [3,] -0.2028026 -0.3124147  1.0000000  0.4562608
## [4,] -0.1149093 -0.3228167  0.4562608  1.0000000
## 
## 
## [[62]]
## [[62]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7277634 -0.5494301 -0.4825685
## [2,]  0.7277634  1.0000000 -0.6651564 -0.6705387
## [3,] -0.5494301 -0.6651564  1.0000000  0.7043298
## [4,] -0.4825685 -0.6705387  0.7043298  1.0000000
## 
## [[62]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6221029 -0.5120191 -0.4325304
## [2,]  0.6221029  1.0000000 -0.5521885 -0.6142332
## [3,] -0.5120191 -0.5521885  1.0000000  0.7649933
## [4,] -0.4325304 -0.6142332  0.7649933  1.0000000
## 
## 
## [[63]]
## [[63]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6609744 -0.7138767 -0.6148602
## [2,]  0.6609744  1.0000000 -0.7336979 -0.4933522
## [3,] -0.7138767 -0.7336979  1.0000000  0.7932446
## [4,] -0.6148602 -0.4933522  0.7932446  1.0000000
## 
## [[63]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6976637 -0.7173393 -0.6814636
## [2,]  0.6976637  1.0000000 -0.7109670 -0.6423116
## [3,] -0.7173393 -0.7109670  1.0000000  0.8356235
## [4,] -0.6814636 -0.6423116  0.8356235  1.0000000
## 
## 
## [[64]]
## [[64]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5905861 -0.3892967 -0.4402419
## [2,]  0.5905861  1.0000000 -0.2727085 -0.2892334
## [3,] -0.3892967 -0.2727085  1.0000000  0.7646309
## [4,] -0.4402419 -0.2892334  0.7646309  1.0000000
## 
## [[64]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7500709 -0.4558674 -0.5587107
## [2,]  0.7500709  1.0000000 -0.3970510 -0.4830809
## [3,] -0.4558674 -0.3970510  1.0000000  0.7947317
## [4,] -0.5587107 -0.4830809  0.7947317  1.0000000
## 
## 
## [[65]]
## [[65]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5044160  0.1601683 -0.2919347
## [2,]  0.5044160  1.0000000 -0.1629511 -0.3349134
## [3,]  0.1601683 -0.1629511  1.0000000  0.3545154
## [4,] -0.2919347 -0.3349134  0.3545154  1.0000000
## 
## [[65]]$raw_cor_matrix
##             [,1]       [,2]        [,3]       [,4]
## [1,]  1.00000000  0.5361158  0.02702784 -0.3218463
## [2,]  0.53611579  1.0000000 -0.24724000 -0.4730948
## [3,]  0.02702784 -0.2472400  1.00000000  0.5033271
## [4,] -0.32184630 -0.4730948  0.50332715  1.0000000
## 
## 
## [[66]]
## [[66]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5358862 -0.5036086 -0.5301490
## [2,]  0.5358862  1.0000000 -0.5667177 -0.4060204
## [3,] -0.5036086 -0.5667177  1.0000000  0.6514965
## [4,] -0.5301490 -0.4060204  0.6514965  1.0000000
## 
## [[66]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6105496 -0.4747894 -0.5272899
## [2,]  0.6105496  1.0000000 -0.5241513 -0.4533208
## [3,] -0.4747894 -0.5241513  1.0000000  0.6566078
## [4,] -0.5272899 -0.4533208  0.6566078  1.0000000
## 
## 
## [[67]]
## [[67]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6704469 -0.3936560 -0.4298318
## [2,]  0.6704469  1.0000000 -0.3639592 -0.5003839
## [3,] -0.3936560 -0.3639592  1.0000000  0.4835895
## [4,] -0.4298318 -0.5003839  0.4835895  1.0000000
## 
## [[67]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6511913 -0.2776901 -0.3985312
## [2,]  0.6511913  1.0000000 -0.4072592 -0.6035380
## [3,] -0.2776901 -0.4072592  1.0000000  0.6814951
## [4,] -0.3985312 -0.6035380  0.6814951  1.0000000
## 
## 
## [[68]]
## [[68]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6242630 -0.4451908 -0.4669617
## [2,]  0.6242630  1.0000000 -0.5592488 -0.6328748
## [3,] -0.4451908 -0.5592488  1.0000000  0.7264533
## [4,] -0.4669617 -0.6328748  0.7264533  1.0000000
## 
## [[68]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6700666 -0.5243700 -0.4486355
## [2,]  0.6700666  1.0000000 -0.6423429 -0.6499433
## [3,] -0.5243700 -0.6423429  1.0000000  0.7480155
## [4,] -0.4486355 -0.6499433  0.7480155  1.0000000
## 
## 
## [[69]]
## [[69]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4661364 -0.1188516 -0.3817373
## [2,]  0.4661364  1.0000000 -0.2939032 -0.4893788
## [3,] -0.1188516 -0.2939032  1.0000000  0.5818450
## [4,] -0.3817373 -0.4893788  0.5818450  1.0000000
## 
## [[69]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5184897 -0.1514744 -0.4141426
## [2,]  0.5184897  1.0000000 -0.2767324 -0.4200929
## [3,] -0.1514744 -0.2767324  1.0000000  0.6641517
## [4,] -0.4141426 -0.4200929  0.6641517  1.0000000
## 
## 
## [[70]]
## [[70]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6209821 -0.3715699 -0.4607667
## [2,]  0.6209821  1.0000000 -0.2811250 -0.4180274
## [3,] -0.3715699 -0.2811250  1.0000000  0.6069407
## [4,] -0.4607667 -0.4180274  0.6069407  1.0000000
## 
## [[70]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5671472 -0.2931299 -0.3523749
## [2,]  0.5671472  1.0000000 -0.2837227 -0.3029262
## [3,] -0.2931299 -0.2837227  1.0000000  0.4867578
## [4,] -0.3523749 -0.3029262  0.4867578  1.0000000
## 
## 
## [[71]]
## [[71]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.1092660 -0.1457012 -0.2928950
## [2,]  0.1092660  1.0000000 -0.3817529 -0.2886468
## [3,] -0.1457012 -0.3817529  1.0000000  0.7174527
## [4,] -0.2928950 -0.2886468  0.7174527  1.0000000
## 
## [[71]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3517427 -0.1469847 -0.1863495
## [2,]  0.3517427  1.0000000 -0.4182378 -0.3614057
## [3,] -0.1469847 -0.4182378  1.0000000  0.7820582
## [4,] -0.1863495 -0.3614057  0.7820582  1.0000000
## 
## 
## [[72]]
## [[72]]$cor_matrix_sigma
##            [,1]        [,2]        [,3]        [,4]
## [1,]  1.0000000  0.43740535 -0.32789582 -0.10539159
## [2,]  0.4374053  1.00000000 -0.08077412 -0.03852466
## [3,] -0.3278958 -0.08077412  1.00000000  0.51331621
## [4,] -0.1053916 -0.03852466  0.51331621  1.00000000
## 
## [[72]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5591462 -0.4623493 -0.2672575
## [2,]  0.5591462  1.0000000 -0.3016582 -0.3263581
## [3,] -0.4623493 -0.3016582  1.0000000  0.7001494
## [4,] -0.2672575 -0.3263581  0.7001494  1.0000000
## 
## 
## [[73]]
## [[73]]$cor_matrix_sigma
##      [,1] [,2] [,3] [,4]
## [1,]    1   -1   -1   -1
## [2,]   -1    1    1    1
## [3,]   -1    1    1    1
## [4,]   -1    1    1    1
## 
## [[73]]$raw_cor_matrix
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000 -0.18670139 -0.70396985 -0.6659434
## [2,] -0.1867014  1.00000000 -0.03927149 -0.1051504
## [3,] -0.7039698 -0.03927149  1.00000000  0.9912050
## [4,] -0.6659434 -0.10515035  0.99120501  1.0000000
## 
## 
## [[74]]
## [[74]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8070887 -0.6230171 -0.5864334
## [2,]  0.8070887  1.0000000 -0.7437879 -0.6552856
## [3,] -0.6230171 -0.7437879  1.0000000  0.8193660
## [4,] -0.5864334 -0.6552856  0.8193660  1.0000000
## 
## [[74]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8093589 -0.6379068 -0.5682892
## [2,]  0.8093589  1.0000000 -0.7178682 -0.6398631
## [3,] -0.6379068 -0.7178682  1.0000000  0.7917224
## [4,] -0.5682892 -0.6398631  0.7917224  1.0000000
## 
## 
## [[75]]
## [[75]]$cor_matrix_sigma
##             [,1]       [,2]        [,3]        [,4]
## [1,]  1.00000000  0.5512737 -0.08059566  0.02988727
## [2,]  0.55127369  1.0000000 -0.30072477 -0.27551251
## [3,] -0.08059566 -0.3007248  1.00000000  0.08999796
## [4,]  0.02988727 -0.2755125  0.08999796  1.00000000
## 
## [[75]]$raw_cor_matrix
##            [,1]       [,2]        [,3]        [,4]
## [1,] 1.00000000  0.4510794  0.02537082  0.02758678
## [2,] 0.45107942  1.0000000 -0.24616267 -0.34099484
## [3,] 0.02537082 -0.2461627  1.00000000  0.40854610
## [4,] 0.02758678 -0.3409948  0.40854610  1.00000000
## 
## 
## [[76]]
## [[76]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6419436 -0.1438086 -0.3289807
## [2,]  0.6419436  1.0000000 -0.0179086 -0.1558580
## [3,] -0.1438086 -0.0179086  1.0000000  0.5562280
## [4,] -0.3289807 -0.1558580  0.5562280  1.0000000
## 
## [[76]]$raw_cor_matrix
##            [,1]        [,2]        [,3]       [,4]
## [1,]  1.0000000  0.49722440 -0.23287946 -0.3732260
## [2,]  0.4972244  1.00000000  0.03389413 -0.1754930
## [3,] -0.2328795  0.03389413  1.00000000  0.6390618
## [4,] -0.3732260 -0.17549303  0.63906178  1.0000000
## 
## 
## [[77]]
## [[77]]$cor_matrix_sigma
##      [,1] [,2] [,3] [,4]
## [1,]    1   -1   -1   -1
## [2,]   -1    1    1    1
## [3,]   -1    1    1    1
## [4,]   -1    1    1    1
## 
## [[77]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4709391 -0.6110503 -0.9918445
## [2,]  0.4709391  1.0000000  0.3530502 -0.4949059
## [3,] -0.6110503  0.3530502  1.0000000  0.6044493
## [4,] -0.9918445 -0.4949059  0.6044493  1.0000000
## 
## 
## [[78]]
## [[78]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000 -0.9400212 -0.9935119 -0.9304196
## [2,] -0.9400212  1.0000000  0.9727167  0.7495964
## [3,] -0.9935119  0.9727167  1.0000000  0.8827021
## [4,] -0.9304196  0.7495964  0.8827021  1.0000000
## 
## [[78]]$raw_cor_matrix
##      [,1] [,2] [,3] [,4]
## [1,]    1  NaN  NaN  NaN
## [2,]  NaN    1  NaN  NaN
## [3,]  NaN  NaN    1  NaN
## [4,]  NaN  NaN  NaN    1
## 
## 
## [[79]]
## [[79]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5979282 -0.2388839 -0.4296152
## [2,]  0.5979282  1.0000000 -0.5571992 -0.6718683
## [3,] -0.2388839 -0.5571992  1.0000000  0.5723504
## [4,] -0.4296152 -0.6718683  0.5723504  1.0000000
## 
## [[79]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5510286 -0.1314834 -0.4089588
## [2,]  0.5510286  1.0000000 -0.4647199 -0.6231814
## [3,] -0.1314834 -0.4647199  1.0000000  0.5135616
## [4,] -0.4089588 -0.6231814  0.5135616  1.0000000
## 
## 
## [[80]]
## [[80]]$cor_matrix_sigma
##             [,1]       [,2]        [,3]        [,4]
## [1,]  1.00000000  0.3430411 -0.06662212 -0.07151909
## [2,]  0.34304111  1.0000000 -0.26601331 -0.21869966
## [3,] -0.06662212 -0.2660133  1.00000000  0.56334018
## [4,] -0.07151909 -0.2186997  0.56334018  1.00000000
## 
## [[80]]$raw_cor_matrix
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.3685608 -0.0117139 -0.03194761
## [2,]  0.36856079  1.0000000 -0.2870712 -0.25073143
## [3,] -0.01171390 -0.2870712  1.0000000  0.60350193
## [4,] -0.03194761 -0.2507314  0.6035019  1.00000000
## 
## 
## [[81]]
## [[81]]$cor_matrix_sigma
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.3496142 -0.1130801  0.05946497
## [2,]  0.34961419  1.0000000 -0.2409382 -0.32716795
## [3,] -0.11308012 -0.2409382  1.0000000  0.53788053
## [4,]  0.05946497 -0.3271680  0.5378805  1.00000000
## 
## [[81]]$raw_cor_matrix
##             [,1]       [,2]       [,3]        [,4]
## [1,]  1.00000000  0.4209752 -0.2114492  0.04845453
## [2,]  0.42097518  1.0000000 -0.3776711 -0.36925725
## [3,] -0.21144915 -0.3776711  1.0000000  0.54525799
## [4,]  0.04845453 -0.3692572  0.5452580  1.00000000
## 
## 
## [[82]]
## [[82]]$cor_matrix_sigma
##            [,1]        [,2]       [,3]        [,4]
## [1,]  1.0000000  0.19928706  0.0688559 -0.06827840
## [2,]  0.1992871  1.00000000 -0.1824748 -0.02114699
## [3,]  0.0688559 -0.18247483  1.0000000  0.60429937
## [4,] -0.0682784 -0.02114699  0.6042994  1.00000000
## 
## [[82]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2731495 -0.0589621 -0.1503454
## [2,]  0.2731495  1.0000000 -0.2866984 -0.1990865
## [3,] -0.0589621 -0.2866984  1.0000000  0.6890961
## [4,] -0.1503454 -0.1990865  0.6890961  1.0000000
## 
## 
## [[83]]
## [[83]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7035807 -0.4902624 -0.4007595
## [2,]  0.7035807  1.0000000 -0.3981739 -0.4097123
## [3,] -0.4902624 -0.3981739  1.0000000  0.6553181
## [4,] -0.4007595 -0.4097123  0.6553181  1.0000000
## 
## [[83]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7736732 -0.3349437 -0.2109582
## [2,]  0.7736732  1.0000000 -0.3643883 -0.3629990
## [3,] -0.3349437 -0.3643883  1.0000000  0.7639680
## [4,] -0.2109582 -0.3629990  0.7639680  1.0000000
## 
## 
## [[84]]
## [[84]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7443152 -0.7166392 -0.3630155
## [2,]  0.7443152  1.0000000 -0.6793519 -0.4639484
## [3,] -0.7166392 -0.6793519  1.0000000  0.5744756
## [4,] -0.3630155 -0.4639484  0.5744756  1.0000000
## 
## [[84]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7809716 -0.6878749 -0.2862433
## [2,]  0.7809716  1.0000000 -0.6222326 -0.2807568
## [3,] -0.6878749 -0.6222326  1.0000000  0.6006624
## [4,] -0.2862433 -0.2807568  0.6006624  1.0000000
## 
## 
## [[85]]
## [[85]]$cor_matrix_sigma
##      [,1] [,2] [,3] [,4]
## [1,]    1    1    1   -1
## [2,]    1    1    1   -1
## [3,]    1    1    1   -1
## [4,]   -1   -1   -1    1
## 
## [[85]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4478529 -0.9505576 -0.5999192
## [2,]  0.4478529  1.0000000 -0.1546122 -0.9832930
## [3,] -0.9505576 -0.1546122  1.0000000  0.3258295
## [4,] -0.5999192 -0.9832930  0.3258295  1.0000000
## 
## 
## [[86]]
## [[86]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.3596738 -0.1796938 -0.4791476
## [2,]  0.3596738  1.0000000 -0.5313720 -0.5379162
## [3,] -0.1796938 -0.5313720  1.0000000  0.4914397
## [4,] -0.4791476 -0.5379162  0.4914397  1.0000000
## 
## [[86]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5081200 -0.3186176 -0.5160669
## [2,]  0.5081200  1.0000000 -0.5844129 -0.6765932
## [3,] -0.3186176 -0.5844129  1.0000000  0.6372848
## [4,] -0.5160669 -0.6765932  0.6372848  1.0000000
## 
## 
## [[87]]
## [[87]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6160574 -0.2618436 -0.2045990
## [2,]  0.6160574  1.0000000 -0.2442978 -0.3045072
## [3,] -0.2618436 -0.2442978  1.0000000  0.6076392
## [4,] -0.2045990 -0.3045072  0.6076392  1.0000000
## 
## [[87]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6331068 -0.3142490 -0.3052608
## [2,]  0.6331068  1.0000000 -0.2784671 -0.3305029
## [3,] -0.3142490 -0.2784671  1.0000000  0.6590361
## [4,] -0.3052608 -0.3305029  0.6590361  1.0000000
## 
## 
## [[88]]
## [[88]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5660382 -0.5965338 -0.3770944
## [2,]  0.5660382  1.0000000 -0.3664481 -0.2643123
## [3,] -0.5965338 -0.3664481  1.0000000  0.4987613
## [4,] -0.3770944 -0.2643123  0.4987613  1.0000000
## 
## [[88]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5775353 -0.5475498 -0.2885931
## [2,]  0.5775353  1.0000000 -0.3530115 -0.2715456
## [3,] -0.5475498 -0.3530115  1.0000000  0.3936142
## [4,] -0.2885931 -0.2715456  0.3936142  1.0000000
## 
## 
## [[89]]
## [[89]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6715287 -0.5666190 -0.5016522
## [2,]  0.6715287  1.0000000 -0.6501925 -0.5315975
## [3,] -0.5666190 -0.6501925  1.0000000  0.7226118
## [4,] -0.5016522 -0.5315975  0.7226118  1.0000000
## 
## [[89]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4650844 -0.5531960 -0.4427343
## [2,]  0.4650844  1.0000000 -0.5252367 -0.5450868
## [3,] -0.5531960 -0.5252367  1.0000000  0.7315424
## [4,] -0.4427343 -0.5450868  0.7315424  1.0000000
## 
## 
## [[90]]
## [[90]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6618530 -0.3067630 -0.3249138
## [2,]  0.6618530  1.0000000 -0.4952197 -0.4937458
## [3,] -0.3067630 -0.4952197  1.0000000  0.4634001
## [4,] -0.3249138 -0.4937458  0.4634001  1.0000000
## 
## [[90]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5670682 -0.2599995 -0.1823333
## [2,]  0.5670682  1.0000000 -0.4632283 -0.4688438
## [3,] -0.2599995 -0.4632283  1.0000000  0.4566352
## [4,] -0.1823333 -0.4688438  0.4566352  1.0000000
## 
## 
## [[91]]
## [[91]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5526225 -0.3827843 -0.3311092
## [2,]  0.5526225  1.0000000 -0.4269787 -0.3294929
## [3,] -0.3827843 -0.4269787  1.0000000  0.6148981
## [4,] -0.3311092 -0.3294929  0.6148981  1.0000000
## 
## [[91]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6322255 -0.4330156 -0.3518162
## [2,]  0.6322255  1.0000000 -0.5323962 -0.4098447
## [3,] -0.4330156 -0.5323962  1.0000000  0.6412040
## [4,] -0.3518162 -0.4098447  0.6412040  1.0000000
## 
## 
## [[92]]
## [[92]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6705643 -0.4659167 -0.4796712
## [2,]  0.6705643  1.0000000 -0.6603085 -0.4697570
## [3,] -0.4659167 -0.6603085  1.0000000  0.6554426
## [4,] -0.4796712 -0.4697570  0.6554426  1.0000000
## 
## [[92]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6106213 -0.4940438 -0.4762111
## [2,]  0.6106213  1.0000000 -0.5699035 -0.5157154
## [3,] -0.4940438 -0.5699035  1.0000000  0.6781551
## [4,] -0.4762111 -0.5157154  0.6781551  1.0000000
## 
## 
## [[93]]
## [[93]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7632637 -0.6823381 -0.7256430
## [2,]  0.7632637  1.0000000 -0.6756119 -0.6163868
## [3,] -0.6823381 -0.6756119  1.0000000  0.7666990
## [4,] -0.7256430 -0.6163868  0.7666990  1.0000000
## 
## [[93]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7744043 -0.6276312 -0.5927675
## [2,]  0.7744043  1.0000000 -0.6146677 -0.6423970
## [3,] -0.6276312 -0.6146677  1.0000000  0.7322206
## [4,] -0.5927675 -0.6423970  0.7322206  1.0000000
## 
## 
## [[94]]
## [[94]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7430947 -0.6501453 -0.6124435
## [2,]  0.7430947  1.0000000 -0.6824460 -0.6300781
## [3,] -0.6501453 -0.6824460  1.0000000  0.7389693
## [4,] -0.6124435 -0.6300781  0.7389693  1.0000000
## 
## [[94]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.7667717 -0.6402360 -0.5413437
## [2,]  0.7667717  1.0000000 -0.7055314 -0.6573750
## [3,] -0.6402360 -0.7055314  1.0000000  0.7800966
## [4,] -0.5413437 -0.6573750  0.7800966  1.0000000
## 
## 
## [[95]]
## [[95]]$cor_matrix_sigma
##             [,1]       [,2]        [,3]       [,4]
## [1,]  1.00000000  0.3974522 -0.06163251 -0.1497721
## [2,]  0.39745217  1.0000000 -0.33188870 -0.3915335
## [3,] -0.06163251 -0.3318887  1.00000000  0.4572874
## [4,] -0.14977210 -0.3915335  0.45728739  1.0000000
## 
## [[95]]$raw_cor_matrix
##             [,1]       [,2]        [,3]        [,4]
## [1,]  1.00000000  0.2635448  0.01318657 -0.01568026
## [2,]  0.26354483  1.0000000 -0.31000634 -0.50550203
## [3,]  0.01318657 -0.3100063  1.00000000  0.54777005
## [4,] -0.01568026 -0.5055020  0.54777005  1.00000000
## 
## 
## [[96]]
## [[96]]$cor_matrix_sigma
##             [,1]        [,2]        [,3]        [,4]
## [1,]  1.00000000  0.24086765 -0.08326881 -0.13636096
## [2,]  0.24086765  1.00000000  0.01039851 -0.09336301
## [3,] -0.08326881  0.01039851  1.00000000  0.70278354
## [4,] -0.13636096 -0.09336301  0.70278354  1.00000000
## 
## [[96]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2923475 -0.2021761 -0.1001515
## [2,]  0.2923475  1.0000000 -0.3926817 -0.4207566
## [3,] -0.2021761 -0.3926817  1.0000000  0.8124527
## [4,] -0.1001515 -0.4207566  0.8124527  1.0000000
## 
## 
## [[97]]
## [[97]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4462314 -0.1633994 -0.3269438
## [2,]  0.4462314  1.0000000 -0.2151693 -0.1248553
## [3,] -0.1633994 -0.2151693  1.0000000  0.4884840
## [4,] -0.3269438 -0.1248553  0.4884840  1.0000000
## 
## [[97]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5899889 -0.5238145 -0.5920475
## [2,]  0.5899889  1.0000000 -0.7438838 -0.7916293
## [3,] -0.5238145 -0.7438838  1.0000000  0.8379343
## [4,] -0.5920475 -0.7916293  0.8379343  1.0000000
## 
## 
## [[98]]
## [[98]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5728755 -0.5037362 -0.4811072
## [2,]  0.5728755  1.0000000 -0.6167785 -0.5200800
## [3,] -0.5037362 -0.6167785  1.0000000  0.6646299
## [4,] -0.4811072 -0.5200800  0.6646299  1.0000000
## 
## [[98]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5070929 -0.3428261 -0.4417026
## [2,]  0.5070929  1.0000000 -0.5804219 -0.5166472
## [3,] -0.3428261 -0.5804219  1.0000000  0.7529532
## [4,] -0.4417026 -0.5166472  0.7529532  1.0000000
## 
## 
## [[99]]
## [[99]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.2712460 -0.3188751 -0.3861378
## [2,]  0.2712460  1.0000000 -0.6468870 -0.4897809
## [3,] -0.3188751 -0.6468870  1.0000000  0.5356932
## [4,] -0.3861378 -0.4897809  0.5356932  1.0000000
## 
## [[99]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.4234861 -0.3858643 -0.3945234
## [2,]  0.4234861  1.0000000 -0.7134916 -0.6803604
## [3,] -0.3858643 -0.7134916  1.0000000  0.6663624
## [4,] -0.3945234 -0.6803604  0.6663624  1.0000000
## 
## 
## [[100]]
## [[100]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5384288 -0.6764061 -0.4762448
## [2,]  0.5384288  1.0000000 -0.4559665 -0.3660047
## [3,] -0.6764061 -0.4559665  1.0000000  0.6620837
## [4,] -0.4762448 -0.3660047  0.6620837  1.0000000
## 
## [[100]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5040411 -0.6493398 -0.4024719
## [2,]  0.5040411  1.0000000 -0.3877384 -0.3924359
## [3,] -0.6493398 -0.3877384  1.0000000  0.6500372
## [4,] -0.4024719 -0.3924359  0.6500372  1.0000000
## 
## 
## [[101]]
## [[101]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.6673984 -0.5832958 -0.4378833
## [2,]  0.6673984  1.0000000 -0.6518221 -0.6155941
## [3,] -0.5832958 -0.6518221  1.0000000  0.7140077
## [4,] -0.4378833 -0.6155941  0.7140077  1.0000000
## 
## [[101]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.5324995 -0.4372053 -0.2867928
## [2,]  0.5324995  1.0000000 -0.4296999 -0.5873549
## [3,] -0.4372053 -0.4296999  1.0000000  0.6304760
## [4,] -0.2867928 -0.5873549  0.6304760  1.0000000
## 
## 
## [[102]]
## [[102]]$cor_matrix_sigma
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8586286 -0.5303976 -0.5017079
## [2,]  0.8586286  1.0000000 -0.5442527 -0.5174940
## [3,] -0.5303976 -0.5442527  1.0000000  0.8558711
## [4,] -0.5017079 -0.5174940  0.8558711  1.0000000
## 
## [[102]]$raw_cor_matrix
##            [,1]       [,2]       [,3]       [,4]
## [1,]  1.0000000  0.8659700 -0.4778989 -0.4956829
## [2,]  0.8659700  1.0000000 -0.5298556 -0.5499715
## [3,] -0.4778989 -0.5298556  1.0000000  0.8689682
## [4,] -0.4956829 -0.5499715  0.8689682  1.0000000

Then I calculated the Frobenius norm as a way of seeing how different the matrices were from each other. Lower values indicate more similarity.

# Function to calculate Frobenius norm of the difference between two matrices
frobenius_norm <- function(mat1, mat2) {
  if (is.null(mat1) || is.null(mat2) || !all(dim(mat1) == dim(mat2))) {
    return(NA)  # Handle cases where the matrices are incompatible or NULL
  }
  return(sqrt(sum((mat1 - mat2)^2)))
}

# Initialize an empty list to store the comparison results and Frobenius norms
comparison_results <- list()
frobenius_norm_list <- list()

# Loop through each individual's data in the rawdata_list and fit results list
for (i in 1:length(fit_results_list)) {
  
  # Step 1: Extract the Sigma matrix and convert it to the correlation matrix
  cor_matrix_sigma <- cov2cor(fit_results_list[[i]]$Sigma)
  
  # Step 2: Extract the raw data for the individual, removing ID and time columns
  ind_data <- simulated_data_list5[[i]]  # Assuming columns 1 and 2 are ID and time
  
  # Step 3: Calculate the raw correlation matrix for this individual
  raw_cor_matrix <- cor(ind_data, use = "complete.obs")
  
  # Step 4: Store the comparison results in a list
  comparison_results[[i]] <- list(cor_matrix_sigma = cor_matrix_sigma, 
                                     raw_cor_matrix = raw_cor_matrix)
  
  # Step 5: Calculate the Frobenius norm between cor_matrix_sigma and raw_cor_matrix
  frobenius_value <- frobenius_norm(cor_matrix_sigma, raw_cor_matrix)
  
  # Store the Frobenius norm result
  frobenius_norm_list[[i]] <- frobenius_value
  
}

# Convert Frobenius norms to a data frame for better visualization
frobenius_comparison <- data.frame(
  Individual = 1:length(fit_results_list),
  Frobenius_Norm = unlist(frobenius_norm_list)
)

# Display the Frobenius norm results
print(frobenius_comparison)
##     Individual Frobenius_Norm
## 1            1   2.237457e-01
## 2            2   4.598648e-01
## 3            3   2.241494e-01
## 4            4   4.878199e-01
## 5            5   7.891988e-01
## 6            6   1.783219e-01
## 7            7   2.294214e-01
## 8            8   2.971849e-01
## 9            9   4.183839e-01
## 10          10   4.924694e-01
## 11          11   3.393811e-01
## 12          12   1.832125e-01
## 13          13   2.540745e-01
## 14          14   2.671875e+00
## 15          15   2.674034e-01
## 16          16   2.179157e-01
## 17          17   4.984085e-01
## 18          18   6.446182e-01
## 19          19   5.002531e-01
## 20          20   2.312075e-01
## 21          21   4.164981e+00
## 22          22   1.588510e-01
## 23          23   1.043754e+00
## 24          24   3.188085e-01
## 25          25   1.703550e-01
## 26          26   1.573144e+00
## 27          27   6.020864e-01
## 28          28   5.540330e-01
## 29          29   7.994012e-01
## 30          30   2.327758e-01
## 31          31   3.726794e-01
## 32          32   1.479126e+00
## 33          33   1.144858e+00
## 34          34   3.403299e-01
## 35          35   1.652005e-01
## 36          36   6.809899e-02
## 37          37   2.630964e-01
## 38          38   1.765522e-01
## 39          39   2.654656e-01
## 40          40   4.056497e-01
## 41          41   4.032763e-01
## 42          42   2.025840e-01
## 43          43   2.494660e-01
## 44          44   1.581533e+00
## 45          45   4.254359e-01
## 46          46   2.205273e-01
## 47          47   2.293899e-01
## 48          48   1.514354e-01
## 49          49   3.609350e-01
## 50          50   6.181460e-16
## 51          51   4.497389e-01
## 52          52   1.448931e-01
## 53          53   7.070165e-01
## 54          54   4.615452e-01
## 55          55   6.772828e-01
## 56          56   2.980552e-01
## 57          57   4.791999e-01
## 58          58   3.085665e-01
## 59          59   2.510897e-01
## 60          60   3.995921e-01
## 61          61   3.014049e-01
## 62          62   2.633615e-01
## 63          63   2.461532e-01
## 64          64   4.423707e-01
## 65          65   3.686993e-01
## 66          66   1.448357e-01
## 67          67   3.646393e-01
## 68          68   1.809091e-01
## 69          69   1.828932e-01
## 70          70   3.114442e-01
## 71          71   4.023615e-01
## 72          72   6.717792e-01
## 73          73   2.514837e+00
## 74          74   6.678215e-02
## 75          75   5.099234e-01
## 76          76   2.855360e-01
## 77          77   3.201487e+00
## 78          78            NaN
## 79          79   2.389145e-01
## 80          80   1.289535e-01
## 81          81   2.661275e-01
## 82          82   3.955846e-01
## 83          83   4.004742e-01
## 84          84   3.019025e-01
## 85          85   3.836884e+00
## 86          86   4.147639e-01
## 87          87   1.879083e-01
## 88          88   2.081002e-01
## 89          89   3.525519e-01
## 90          90   2.576413e-01
## 91          91   2.347333e-01
## 92          92   1.743409e-01
## 93          93   2.295750e-01
## 94          94   1.317838e-01
## 95          95   3.554278e-01
## 96          96   7.743226e-01
## 97          97   1.460881e+00
## 98          98   2.860305e-01
## 99          99   4.136812e-01
## 100        100   1.603518e-01
## 101        101   4.888390e-01
## 102        102   9.251926e-02

Last, I tried to refit a VARMA model on the simulated data to see if the model fit and matrices were similar to the model fit/ matrices of the real data. However, I noticed I kept getting errors regarding possible matrix singularity when inverting?

Error in solve.default(xpx, xpy) : 系统计算上是奇异的: 倒条件数=1.97018e-16 此外: Warning messages: 1: In sqrt(diag(solve(Hessian))) : 产生了NaNs 2: In sqrt(diag(solve(Hessian))) : 产生了NaNs 3: In sqrt(diag(solve(Hessian))) : 产生了NaNs 4: In sqrt(diag(solve(Hessian))) : 产生了NaNs 5: In sqrt(diag(solve(Hessian))) : 产生了NaNs 6: In sqrt(diag(solve(Hessian))) : 产生了NaNs 7: In sqrt(diag(solve(Hessian))) : 产生了NaNs 8: In sqrt(diag(solve(Hessian))) : 产生了NaNs 9: In sqrt(diag(solve(Hessian))) : 产生了NaNs