library(here)
here() starts at /Users/mcfrank/Projects/peekbank/peekbank-development
source(here("helper","common.R"))
Registered S3 method overwritten by 'GGally':
method from
+.gg ggplot2
library(lavaan)
Warning: package 'lavaan' was built under R version 4.3.3
This is lavaan 0.6-18
lavaan is FREE software! Please report any bugs.
library(tidySEM)
Warning: package 'tidySEM' was built under R version 4.3.3
Loading required package: OpenMx
OpenMx may run faster if it is compiled to take advantage of multiple cores.
Registered S3 method overwritten by 'tidySEM':
method from
predict.MxModel OpenMx
library(nlme)
Warning: package 'nlme' was built under R version 4.3.3
Attaching package: 'nlme'
The following object is masked from 'package:dplyr':
collapse
library(emmeans)
Warning: package 'emmeans' was built under R version 4.3.3
Welcome to emmeans.
Caution: You lose important information if you filter this package's results.
See '? untidy'
Attaching package: 'emmeans'
The following object is masked from 'package:GGally':
pigs
library(lme4)
Loading required package: Matrix
Attaching package: 'Matrix'
The following objects are masked from 'package:OpenMx':
%&%, expm
The following objects are masked from 'package:tidyr':
expand, pack, unpack
Attaching package: 'lme4'
The following object is masked from 'package:nlme':
lmList
library(lmerTest)
Attaching package: 'lmerTest'
The following object is masked from 'package:lme4':
lmer
The following object is masked from 'package:stats':
step
<- readRDS(here("cached_intermediates","1_d_sub.Rds")) |>
d_sub group_by(subject_id) |>
arrange(age) |>
mutate(admin_num = 1:n(),
time_since_t0 = age - age[1],
delta_t = c(0, diff(age)))