Publications by Jay Lasker
Additional FAs for a Friend
Setup library(pacman); p_load(psych, VIM, lavaan, semPlot) CONGO <- function(F1, F2) { PHI = sum(F1*F2) / sqrt(sum(F1^2)*sum(F2^2)) return(PHI)} CRITR <- function(n, alpha = .05) { df <- n - 2; CRITT <- qt(alpha/2, df, lower.tail = F) CRITR <- sqrt((CRITT^2)/((CRITT^2) + df )) return(CRITR)} FITM <- c("chisq", "df", "nPar", "...
6585 sym R (327230 sym/95 pcs) 3 img
Factor Analysis for a Friend
Setup library(pacman); p_load(VIM, psych, lavaan) CONGO <- function(F1, F2) { PHI = sum(F1*F2) / sqrt(sum(F1^2)*sum(F2^2)) return(PHI)} FITM <- c("chisq", "df", "nPar", "cfi", "rmsea", "rmsea.ci.lower", "rmsea.ci.upper", "aic", "bic") dataw <- subset(data, white == 1) I do not own this data. To obtain it, contact Zach Goldberg. descri...
2431 sym R (129978 sym/69 pcs) 1 img
Another Dunning-Kruger Analysis
Setup library(pacman); p_load(psych, dplyr, umx, lavaan, ggplot2, plyr, stringr, reshape, ggthemes, skedastic, magrittr, janitor, feather, MASS) describe(logic); describe(grammar) ## Warning in FUN(newX[, i], ...): no non-missing arguments to min; returning Inf ## Warning in FUN(newX[, i], ...): no non-missing arguments to min; returning Inf ...
532 sym R (10116 sym/24 pcs) 10 img
Quiroga et al. (2019)
library(pacman); p_load(lavaan, semPlot, qpcR, egg) QEAMat = ' 1 0.19 1 0.05 0.23 1 0.29 0.43 0.45 1 0.33 0....
1399 sym R (22387 sym/10 pcs) 3 img
Test Preparation?
Analysis Group differences in standardized test scores are a product of several factors. Without invariance, bias is among them; with it, it is not. For the sake of this exercise, invariance will be taken for granted and, as such, differences between groups primarily reflect differences in ability. To the extent that groups differ in the extent t...
10688 sym R (1186 sym/8 pcs)
Odenstad et al. (2008)
AAO$AgeAA <- factor(AAO$AgeAA, levels = c("06m", "712m", "1318m", "1924m", "23y", "45y", "79y"), ordered = T) levels(AAO$AgeAA) <- c("0-6 Months", "7-12 Months", "13-18 Months", "19-24 Months", "2-3 Years", "4-5 Years", "7-9 Years") YOE$LoE <- factor(YOE$LoE, levels = c("012y", "1315y", "16y"), ordered = T) levels(YOE$LoE) <- c("0-12 Years", ...
18743 sym R (19874 sym/61 pcs) 13 img
Are there sex differences in sex ratio relationships with wellbeing?
Setup Functions for Reanalysis stdCoef.merMod <- function(object) { sdy <- sd(getME(object,"y")) sdx <- apply(getME(object,"X"), 2, sd) sc <- fixef(object)*sdx/sdy se.fixef <- coef(summary(object))[,"Std. Error"] se <- se.fixef*sdx/sdy return(data.frame(stdcoef=sc, stdse=se))} ZREG <- function(B1, B2, SEB1, SEB2) { Z = (B1...
2129 sym R (1030 sym/14 pcs)
Piagetian and Psychometric Intelligence
Setup library(pacman); p_load(lavaan, psych, semPlot, dynamic) CONGO <- function(F1, F2) { PHI = sum(F1*F2) / sqrt(sum(F1^2)*sum(F2^2)) return(PHI)} CRITR <- function(n, alpha = .05) { df <- n - 2; CRITT <- qt(alpha/2, df, lower.tail = T) CRITR <- sqrt((CRITT^2)/((CRITT^2) + df )) return(CRITR)} NP <- function(N, S = 2) { ...
13144 sym R (273300 sym/745 pcs) 44 img 1 tbl
How Many g Factors?
Setup Packages library(pacman) p_load(psych, lavaan, semPlot) Functions CONGO <- function(F1, F2) { PHI = sum(F1*F2) / sqrt(sum(F1^2)*sum(F2^2)) return(PHI)} CRITR <- function(n, alpha = .05) { df <- n - 2; CRITT <- qt(alpha/2, df, lower.tail = F) CRITR <- sqrt((CRITT^2)/((CRITT^2) + df )) return(CRITR)} NP <- function(N, S ...
37215 sym R (493568 sym/662 pcs) 53 img
Reanalysis of Wong et al. (1995)
library(pacman); p_load(lavaan, psych) NP <- function(N, S = 2) { NP = 1-pnorm(qnorm(1-(N^(-6/5))/S)) return(NP)} CONGO <- function(F1, F2) { PHI = sum(F1*F2) / sqrt(sum(F1^2)*sum(F2^2)) return(PHI)} CRITR <- function(n, alpha = .05) { df <- n - 2; CRITT <- qt(alpha/2, df, lower.tail = F) CRITR <- sqrt((CRITT^2)/((CRITT^2)...
1688 sym R (145094 sym/127 pcs) 2 img