library(tidyverse)Warning: package 'tidyr' was built under R version 4.4.1
── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
✔ dplyr 1.1.4 ✔ readr 2.1.5
✔ forcats 1.0.0 ✔ stringr 1.5.1
✔ ggplot2 3.5.1 ✔ tibble 3.2.1
✔ lubridate 1.9.3 ✔ tidyr 1.3.1
✔ purrr 1.0.2
── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
✖ dplyr::filter() masks stats::filter()
✖ dplyr::lag() masks stats::lag()
ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(broom.mixed)Warning: package 'broom.mixed' was built under R version 4.4.1
library(devtools)Loading required package: usethis
library(brms)Loading required package: Rcpp
Loading 'brms' package (version 2.21.0). Useful instructions
can be found by typing help('brms'). A more detailed introduction
to the package is available through vignette('brms_overview').
Attaching package: 'brms'
The following object is masked from 'package:stats':
ar
library(mascutils)
Attaching package: 'mascutils'
The following object is masked from 'package:tidyr':
expand_grid
The following object is masked from 'package:base':
mode
library(bayr)Registered S3 methods overwritten by 'bayr':
method from
coef.brmsfit brms
knit_print.tbl_obs mascutils
predict.brmsfit brms
print.tbl_obs mascutils
Attaching package: 'bayr'
The following objects are masked from 'package:mascutils':
as_tbl_obs, discard_all_na, discard_redundant, expand_grid,
go_arrange, go_first, left_union, reorder_levels, rescale_centered,
rescale_unit, rescale_zero_one, update_by, z_score, z_trans
The following objects are masked from 'package:brms':
fixef, ranef
The following object is masked from 'package:tidyr':
expand_grid
library(readxl)Warning: package 'readxl' was built under R version 4.4.1
library(ggplot2)
library(effects)Loading required package: carData
Warning: package 'carData' was built under R version 4.4.1
lattice theme set by effectsTheme()
See ?effectsTheme for details.
library(lme4)Warning: package 'lme4' was built under R version 4.4.1
Loading required package: Matrix
Warning: package 'Matrix' was built under R version 4.4.1
Attaching package: 'Matrix'
The following objects are masked from 'package:tidyr':
expand, pack, unpack
Attaching package: 'lme4'
The following objects are masked from 'package:bayr':
fixef, ranef
The following object is masked from 'package:brms':
ngrps
library(haven)
library(lattice)Warning: package 'lattice' was built under R version 4.4.1
library(car)Warning: package 'car' was built under R version 4.4.1
Attaching package: 'car'
The following object is masked from 'package:mascutils':
logit
The following object is masked from 'package:dplyr':
recode
The following object is masked from 'package:purrr':
some
library(knitr)Warning: package 'knitr' was built under R version 4.4.1
library(reshape2)
Attaching package: 'reshape2'
The following object is masked from 'package:tidyr':
smiths
library(dplyr)
library(forcats)
library(DHARMa)Warning: package 'DHARMa' was built under R version 4.4.1
This is DHARMa 0.4.7. For overview type '?DHARMa'. For recent changes, type news(package = 'DHARMa')
library(Hmisc)Warning: package 'Hmisc' was built under R version 4.4.1
Attaching package: 'Hmisc'
The following objects are masked from 'package:dplyr':
src, summarize
The following objects are masked from 'package:base':
format.pval, units
library(phia)
library(lsmeans)Loading required package: emmeans
Warning: package 'emmeans' was built under R version 4.4.1
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:devtools':
test
The 'lsmeans' package is now basically a front end for 'emmeans'.
Users are encouraged to switch the rest of the way.
See help('transition') for more information, including how to
convert old 'lsmeans' objects and scripts to work with 'emmeans'.
library(emmeans)
library(multcomp)Warning: package 'multcomp' was built under R version 4.4.1
Loading required package: mvtnorm
Loading required package: survival
Attaching package: 'survival'
The following object is masked from 'package:brms':
kidney
Loading required package: TH.data
Warning: package 'TH.data' was built under R version 4.4.1
Loading required package: MASS
Warning: package 'MASS' was built under R version 4.4.1
Attaching package: 'MASS'
The following object is masked from 'package:dplyr':
select
Attaching package: 'TH.data'
The following object is masked from 'package:MASS':
geyser
library(plotly)
Attaching package: 'plotly'
The following object is masked from 'package:MASS':
select
The following object is masked from 'package:Hmisc':
subplot
The following object is masked from 'package:ggplot2':
last_plot
The following object is masked from 'package:stats':
filter
The following object is masked from 'package:graphics':
layout
library(lmerTest)
Attaching package: 'lmerTest'
The following object is masked from 'package:lme4':
lmer
The following object is masked from 'package:stats':
step
library(tinytex)
library(tidyverse)
library(devtools)
library(ggthemes)
library(janitor)
Attaching package: 'janitor'
The following objects are masked from 'package:stats':
chisq.test, fisher.test
library(magrittr)
Attaching package: 'magrittr'
The following object is masked from 'package:purrr':
set_names
The following object is masked from 'package:tidyr':
extract
library(tidyverse)
library(mascutils)
library(ggthemes)
library(afex)Warning: package 'afex' was built under R version 4.4.1
************
Welcome to afex. For support visit: http://afex.singmann.science/
- Functions for ANOVAs: aov_car(), aov_ez(), and aov_4()
- Methods for calculating p-values with mixed(): 'S', 'KR', 'LRT', and 'PB'
- 'afex_aov' and 'mixed' objects can be passed to emmeans() for follow-up tests
- Get and set global package options with: afex_options()
- Set sum-to-zero contrasts globally: set_sum_contrasts()
- For example analyses see: browseVignettes("afex")
************
Attaching package: 'afex'
The following object is masked from 'package:lme4':
lmer
library(purrr)
library(stringr)