#global options
options(
digits = 3,
contrasts = c("contr.treatment", "contr.treatment")
)
#packages
library(kirkegaard)
## Loading required package: tidyverse
## ── 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
## Loading required package: magrittr
##
##
## Attaching package: 'magrittr'
##
##
## The following object is masked from 'package:purrr':
##
## set_names
##
##
## The following object is masked from 'package:tidyr':
##
## extract
##
##
## Loading required package: weights
##
## Loading required package: Hmisc
##
##
## Attaching package: 'Hmisc'
##
##
## The following objects are masked from 'package:dplyr':
##
## src, summarize
##
##
## The following objects are masked from 'package:base':
##
## format.pval, units
##
##
## Loading required package: assertthat
##
##
## Attaching package: 'assertthat'
##
##
## The following object is masked from 'package:tibble':
##
## has_name
##
##
## Loading required package: psych
##
##
## Attaching package: 'psych'
##
##
## The following object is masked from 'package:Hmisc':
##
## describe
##
##
## The following objects are masked from 'package:ggplot2':
##
## %+%, alpha
##
##
##
## Attaching package: 'kirkegaard'
##
##
## The following object is masked from 'package:psych':
##
## rescale
##
##
## The following object is masked from 'package:assertthat':
##
## are_equal
##
##
## The following object is masked from 'package:purrr':
##
## is_logical
##
##
## The following object is masked from 'package:base':
##
## +
load_packages(
rms,
ggeffects,
readxl,
mirt,
mgcv
)
## Loading required package: stats4
## Loading required package: lattice
## Loading required package: nlme
##
## Attaching package: 'nlme'
##
## The following object is masked from 'package:mirt':
##
## fixef
##
## The following object is masked from 'package:dplyr':
##
## collapse
##
## This is mgcv 1.9-1. For overview type 'help("mgcv-package")'.
#ggplot2
theme_set(theme_bw())
#refresh all cached objects?
renew_all = F
#drop unused factor levels in ethnicity
drop_unused_ethnic_levels = function(x) {
x %>% mutate(
ethnic_combos_common = ethnic_combos_common %>% fct_drop()
)
}
#recode pol items to numeric
pol_recoder = function(x) {
mapvalues(
x,
from = c("Strongly Agree", "Agree", "Neutral", "Disagree", "Strongly Disagree"),
to = c(5:1),
warn_missing = F
) %>% as.numeric()
}
#test models in a list against each other
test_models = function(x) {
#add names if none
if (is.null(names(x))) {
names(x) = 1:length(x)
}
#test all models against each other
#note it may not be possible
#first get model combinations
model_combos = combn(names(x), 2, simplify = F)
model_tests = map_dfr(model_combos, function(i) {
#try comparing
lrtest_results = try_else({
lrtest(
x[[i[1]]],
x[[i[2]]]
)
}, else. = NULL)
#if it failed, return empty data frame
if (is.null(lrtest_results)) {
return(tibble(
model1 = i[1],
model2 = i[2],
p = NA,
p_log10 = NA
))
}
#collect results
tibble(
model1 = i[1],
model2 = i[2],
p = lrtest_results$stats[3],
p_log10 = -log10(lrtest_results$stats[3])
)
})
model_tests
}
#make a function to subset to a row in a data frame with the closest value to a target
closest_row = function(df, var, target, ties = "first") {
var_sym = sym(var)
closest = df %>%
mutate(.difference = abs(target - !!var_sym)) %>%
filter(.difference == min(.difference))
#ties?
if (nrow(closest) > 1) {
if (ties == "first") {
closest = closest[1, ]
} else if (ties == "all") {
closest = closest
} else {
stop("ties must be 'first' or 'all'")
}
}
closest
}
#score multiple select items
score_multiple_select = function(items, select, vars_per_item) {
#groups cannot be missing
if (missing(vars_per_item)) {
stop("`groups` must be provided", call. = F)
}
#select cannot be missing
if (missing(select)) {
stop("`select` must be provided", call. = F)
}
map_dfc(seq_along(items) %>% split_every_k(k = vars_per_item), function(idx) {
# browser()
#subset cols
i_cols = items[, unlist(idx)]
#conert to NA status
i_cols_NA = i_cols
i_cols_NA[] = !is.na(i_cols_NA)
#score as correct using first selected items
rowSums(i_cols_NA[, 1:select]) == select
}) %>%
map_df(as.numeric)
}
#plot factor solutions
plot_fa = function(fa_fit) {
# browser()
#first get the loadings, and make a proper data frame
d_fa = fa_loadings(fa_fit) %>%
rownames_to_column("item")
#long form
d_fa_long = d_fa %>%
pivot_longer(-item, names_to = "factor", values_to = "loading") %>%
mutate(
salient = abs(loading) > .3,
salience = if_else(salient, 1, 0.1),
)
#also sort items by total factor contribution
d_fa$sum_abs = rowSums(abs(d_fa[, -1, drop = F]))
#sort
d_fa2 = d_fa %>% arrange(sum_abs)
#plot it
d_fa_long %>%
mutate(
item = item %>% factor(levels = d_fa2$item)
) %>%
ggplot(aes(loading, item, color = factor)) +
geom_point() +
xlim(-1, 1)
}
#function to fit spline functions across variables
fit_pol_question_models_ols = function(y, d, spline_knots = 3) {
map_df(y, function(y) {
dd = d %>%
select(all_of(y), IQ, sex, age, ethnic_combos_common) %>%
df_standardize(messages = F)
#models
model0_str = str_glue("{y} ~ sex + age + ethnic_combos_common")
model1_str = str_glue("{y} ~ IQ + sex + age + ethnic_combos_common")
model2_str = str_replace(model1_str, "IQ", str_glue("rcs(IQ, {spline_knots})"))
#fit models
model0_fit = ols(as.formula(model0_str), data = dd)
model1_fit = ols(as.formula(model1_str), data = dd)
model2_fit = ols(as.formula(model2_str), data = dd)
#get spline predictions
preds_IQ = ggpredict(model2_fit, terms = "IQ") %>% tibble()
preds_80_IQ = preds_IQ %>%
closest_row("x", qnorm(pnorm(80, 100, 15)))
preds_100_IQ = preds_IQ %>%
closest_row("x", 0)
preds_120_IQ = preds_IQ %>%
closest_row("x", qnorm(pnorm(120, 100, 15)))
#summary
tibble(
model_number = which(y == pol_vars),
spline_knots = spline_knots,
y = y,
IQ_std_beta = coef(model1_fit)[2],
IQ_std_beta_se = model1_fit %>% summary.lm() %>% coef() %>% extract(2, 2),
demo_rsq = summary.lm(model0_fit)$adj.r.squared,
linear_rsq = summary.lm(model1_fit)$adj.r.squared,
spline_rsq = summary.lm(model2_fit)$adj.r.squared,
linear_model_p = lrtest(model0_fit, model1_fit)$stats[3],
linear_model_p_log10 = -log10(linear_model_p),
spline_model_p = lrtest(model1_fit, model2_fit)$stats[3],
spline_model_p_log10 = -log10(spline_model_p),
linear_rsq_delta = linear_rsq - demo_rsq,
spline_rsq_delta = spline_rsq - linear_rsq,
demo_model = list(model0_fit),
linear_model = list(model1_fit),
spline_model = list(model2_fit),
spline_model_natural = list(ols(as.formula(model2_str), data = d)),
preds = list(bind_rows(
preds_80_IQ,
preds_100_IQ,
preds_120_IQ
))
)
})
}
#function to fit spline functions across variables
fit_pol_question_models_gam = function(y, d) {
map_df(y, function(y) {
#z scores
dd = d %>%
select(all_of(y), IQ, sex, age, ethnic_combos_common) %>%
df_standardize(messages = F)
#models
model1_str = str_glue("{y} ~ IQ + sex + age + ethnic_combos_common")
model2_str = str_replace(model1_str, "IQ", str_glue("s(IQ)"))
#fit models
model1_fit = gam(as.formula(model1_str), data = dd)
model2_fit = gam(as.formula(model2_str), data = dd)
#get spline predictions
preds_IQ = ggpredict(model2_fit, terms = "IQ") %>% tibble()
preds_80_IQ = preds_IQ %>%
closest_row("x", qnorm(pnorm(80, 100, 15)))
preds_100_IQ = preds_IQ %>%
closest_row("x", 0)
preds_120_IQ = preds_IQ %>%
closest_row("x", qnorm(pnorm(120, 100, 15)))
#summary
tibble(
model_number = which(y == pol_vars),
y = y,
IQ_std_beta = coef(model1_fit)[2],
IQ_std_beta_se = model1_fit %>% summary() %>% .$se %>% .[2],
linear_rsq = summary(model1_fit)$r.sq,
spline_rsq = summary(model2_fit)$r.sq,
spline_model_p = anova(model1_fit, model2_fit, test = "Chisq")$`Pr(>Chi)`[2],
spline_model_p_log10 = -log10(spline_model_p),
spline_rsq_delta = spline_rsq - linear_rsq,
linear_model = list(model1_fit),
spline_model = list(model2_fit),
spline_model_natural = list(gam(as.formula(model2_str), data = d)),
preds = list(bind_rows(
preds_80_IQ,
preds_100_IQ,
preds_120_IQ
))
)
})
}
#read data from extension wave
if (F) {
d_ext = read_csv("data_sensitive/extension survey fixed.csv") %>% df_legalize_names()
d_ext_meta = read_csv("data_sensitive/extension survey meta.csv") %>% df_legalize_names()
#join
d_ext_full = inner_join(
d_ext %>% filter(Status == "Complete"),
d_ext_meta,
by = c("Please_enter_your_Prolific_ID" = "Participant_id")
)
#who failed attention checks?
d_ext_full$attention_check_1 = d_ext_full$pick_small == "small"
d_ext_full$attention_check_2 = d_ext_full %>% select(blue_Pick_3_colors:street_Pick_3_colors) %>%
rowwise() %>%
extract(, 1:3) %>%
miss_by_case() %>%
equals(0)
#which to reject
d_ext_full$reject = !d_ext_full$attention_check_1 | !d_ext_full$attention_check_2
#how many cases rejected?
d_ext_full$reject %>% table2()
#show IDs
d_ext_full %>%
filter(reject) %>%
select(Please_enter_your_Prolific_ID) %>%
pull()
#remove rejected cases
d_ext_full = d_ext_full %>% filter(!reject)
#cases
d_ext_full %>% nrow()
#remove sensitive data
d_ext_full %>%
select(
-Referer,
-SessionID,
-User_Agent,
-IP_Address
) %>%
#completed only
write_rds("data/extension_survey.rds")
}
#read data from 3rd wave
d3 = read_rds("data/extension_survey.rds")
d3_vars = d3 %>% df_var_table()
#recode covariates
d3$age = d3$How_old_are_you %>% str_match("\\d+") %>% as.numeric()
d3$sex = d3$What_is_your_sex %>% mapvalues(from = c("Male (Y chromosome)", "Female (no Y chromosome)"), to = c("Male", "Female")) %>% factor(levels = c("Male", "Female"))
#ethnicity dummies
d3$asian = d3$Asian_What_is_your_race_or_ethnicity_Select_all_that_apply %>% is.na() %>% `!`() %>% factor()
d3$amerindian = d3$American_Indian_Alaska_Native_What_is_your_race_or_ethnicity_Select_all_that_apply %>% is.na() %>% `!`() %>% factor()
d3$white = d3$White_What_is_your_race_or_ethnicity_Select_all_that_apply %>% is.na() %>% `!`() %>% factor()
d3$jewish = d3$Jewish_What_is_your_race_or_ethnicity_Select_all_that_apply %>% is.na() %>% `!`() %>% factor()
d3$black = d3$Black_What_is_your_race_or_ethnicity_Select_all_that_apply %>% is.na() %>% `!`() %>% factor()
d3$hispanic = d3$Hispanic_Latino_What_is_your_race_or_ethnicity_Select_all_that_apply %>% is.na() %>% `!`() %>% factor()
d3$mixed = d3$Mixed_What_is_your_race_or_ethnicity_Select_all_that_apply %>% is.na() %>% `!`() %>% factor()
d3$pacific_islander = d3$Native_Hawaiian_or_Other_Pacific_Islander_What_is_your_race_or_ethnicity_Select_all_that_apply %>% is.na() %>% `!`() %>% factor()
d3$other_race = d3$Other_What_is_your_race_or_ethnicity_Select_all_that_apply %>% is.na() %>% `!`() %>% factor()
#combinations
d3$ethnic_combos = encode_combinations(d3 %>% select(asian:other_race))
d3$ethnic_combos %>% table2()
d3$white_only = d3$ethnic_combos == "white"
#vocab items
d3_vocab_select1 = d3 %>%
select(
quickly:cheat
)
d3_vocab_select2 = d3 %>%
select(
literalism_Pick_the_2_synonyms:covenantal_Pick_the_2_synonyms
)
d3_vocab_select3 = d3 %>%
select(
pertinacity_Pick_3_words_that_belong_together:jaunty_Pick_3_words_that_belong_together
)
#score select 1 items
select1_key = read_excel("data/answer keys for 155 items.xlsx", col_names = c("word", "correct", "notes"))
select1_key = bind_rows(
tibble(
word = c("silly", "avoid", "remove", "construct"),
correct = c("childish", "evade", "abolish", "create"),
notes = NA
),
select1_key
) %>%
mutate(
#we need to match variable names, so get the legal colnames
word_var = str_legalize(word),
#one is duplicated, and we need to pick the right one
word_var = if_else(word_var == "a_type_of_fabric_2", "a_type_of_fabric", word_var)
) %>%
arrange(word_var)
#subset to overlapping items
select1_key_overlap = select1_key %>%
filter(word_var %in% colnames(d3_vocab_select1))
#sort data colnames alphabetically
d3_vocab_select1_sorted = d3_vocab_select1[, select1_key_overlap$word_var]
#score
d3_vocab_select1_scored = score_items(
d3_vocab_select1_sorted,
key = select1_key_overlap$correct
)
#score select 2
d3_vocab_select2_scored = score_multiple_select(
d3_vocab_select2,
select = 2,
vars_per_item = 5
) %>%
set_colnames(
"2of5_" + c(2, 3, 4, 6, 8, 9, 16, 17, 18, 22, 26, 27, 29, 31)
)
#score select 3
d3_vocab_select3_scored = score_multiple_select(
d3_vocab_select3,
select = 3,
vars_per_item = 5
) %>%
set_colnames(
"3of5_" + c(4, 11, 20, 25, 26)
)
#all items scored
d3_scored_items = bind_cols(
d3_vocab_select1_scored,
d3_vocab_select2_scored,
d3_vocab_select3_scored
)
dim(d3_scored_items)
## [1] 471 50
#load 50 item model
model_50_items = read_rds("data/vocab_abbrev_rc50.rds")
#score items again
model_50_items = model_50_items$best_sets$fit %>% tail(1) %>% extract2(1) %>% extract2("fit")
model_50_items_scores = fscores(
model_50_items,
response.pattern = d3_scored_items,
full.scores = T,
full.scores.SE = T
)
#also refit to make sure it's right
model_50_items_refit = mirt(
d3_scored_items,
model = 1,
itemtype = "2PL"
)
## Iteration: 1, Log-Lik: -12289.982, Max-Change: 0.88973Iteration: 2, Log-Lik: -12073.680, Max-Change: 0.30058Iteration: 3, Log-Lik: -12042.202, Max-Change: 0.15367Iteration: 4, Log-Lik: -12023.887, Max-Change: 0.11668Iteration: 5, Log-Lik: -12012.573, Max-Change: 0.09926Iteration: 6, Log-Lik: -12005.308, Max-Change: 0.08511Iteration: 7, Log-Lik: -12000.511, Max-Change: 0.06679Iteration: 8, Log-Lik: -11997.255, Max-Change: 0.06325Iteration: 9, Log-Lik: -11995.036, Max-Change: 0.05395Iteration: 10, Log-Lik: -11990.004, Max-Change: 0.01094Iteration: 11, Log-Lik: -11989.930, Max-Change: 0.00730Iteration: 12, Log-Lik: -11989.878, Max-Change: 0.00806Iteration: 13, Log-Lik: -11989.737, Max-Change: 0.00442Iteration: 14, Log-Lik: -11989.728, Max-Change: 0.00305Iteration: 15, Log-Lik: -11989.719, Max-Change: 0.00290Iteration: 16, Log-Lik: -11989.703, Max-Change: 0.00157Iteration: 17, Log-Lik: -11989.698, Max-Change: 0.00127Iteration: 18, Log-Lik: -11989.695, Max-Change: 0.00134Iteration: 19, Log-Lik: -11989.677, Max-Change: 0.00121Iteration: 20, Log-Lik: -11989.675, Max-Change: 0.00099Iteration: 21, Log-Lik: -11989.674, Max-Change: 0.00093Iteration: 22, Log-Lik: -11989.667, Max-Change: 0.00128Iteration: 23, Log-Lik: -11989.667, Max-Change: 0.00053Iteration: 24, Log-Lik: -11989.666, Max-Change: 0.00062Iteration: 25, Log-Lik: -11989.664, Max-Change: 0.00119Iteration: 26, Log-Lik: -11989.664, Max-Change: 0.00044Iteration: 27, Log-Lik: -11989.663, Max-Change: 0.00050Iteration: 28, Log-Lik: -11989.662, Max-Change: 0.00028Iteration: 29, Log-Lik: -11989.662, Max-Change: 0.00030Iteration: 30, Log-Lik: -11989.662, Max-Change: 0.00030Iteration: 31, Log-Lik: -11989.661, Max-Change: 0.00029Iteration: 32, Log-Lik: -11989.661, Max-Change: 0.00027Iteration: 33, Log-Lik: -11989.661, Max-Change: 0.00026Iteration: 34, Log-Lik: -11989.660, Max-Change: 0.00019Iteration: 35, Log-Lik: -11989.660, Max-Change: 0.00019Iteration: 36, Log-Lik: -11989.660, Max-Change: 0.00019Iteration: 37, Log-Lik: -11989.659, Max-Change: 0.00017Iteration: 38, Log-Lik: -11989.659, Max-Change: 0.00016Iteration: 39, Log-Lik: -11989.659, Max-Change: 0.00016Iteration: 40, Log-Lik: -11989.659, Max-Change: 0.00013Iteration: 41, Log-Lik: -11989.659, Max-Change: 0.00013Iteration: 42, Log-Lik: -11989.659, Max-Change: 0.00012Iteration: 43, Log-Lik: -11989.659, Max-Change: 0.00011Iteration: 44, Log-Lik: -11989.659, Max-Change: 0.00010Iteration: 45, Log-Lik: -11989.659, Max-Change: 0.00010Iteration: 46, Log-Lik: -11989.659, Max-Change: 0.00008
model_50_items_refit %>% summary()
## F1 h2
## a_type_of_fabric 0.743 0.5514
## a_type_of_wavy_form 0.623 0.3886
## advocate 0.666 0.4434
## auspices 0.672 0.4520
## bow 0.713 0.5088
## celebration 0.744 0.5541
## cheat 0.789 0.6232
## couch 0.644 0.4141
## diatribes 0.592 0.3507
## divergence 0.761 0.5788
## entanglement 0.660 0.4350
## environment 0.654 0.4274
## excite 0.770 0.5925
## greed 0.752 0.5660
## meal 0.746 0.5560
## pamper 0.614 0.3767
## quickly 0.711 0.5057
## referendum 0.605 0.3663
## relevant 0.693 0.4798
## sag 0.582 0.3388
## sensitivity 0.646 0.4169
## shadows 0.622 0.3872
## sketch 0.572 0.3276
## sluggish 0.677 0.4585
## somber 0.671 0.4502
## sporadic 0.750 0.5622
## stagger 0.485 0.2348
## stroll 0.814 0.6626
## stylish 0.669 0.4470
## tyrant 0.425 0.1807
## vulgar 0.740 0.5471
## 2of5_2 0.614 0.3774
## 2of5_3 0.670 0.4495
## 2of5_4 0.511 0.2611
## 2of5_6 0.825 0.6805
## 2of5_8 0.515 0.2651
## 2of5_9 0.633 0.4002
## 2of5_16 0.706 0.4987
## 2of5_17 0.661 0.4366
## 2of5_18 0.781 0.6103
## 2of5_22 0.869 0.7557
## 2of5_26 0.268 0.0719
## 2of5_27 0.628 0.3949
## 2of5_29 0.601 0.3608
## 2of5_31 0.608 0.3692
## 3of5_4 0.728 0.5305
## 3of5_11 0.700 0.4895
## 3of5_20 0.613 0.3754
## 3of5_25 0.603 0.3636
## 3of5_26 0.751 0.5637
##
## SS loadings: 22.4
## Proportion Var: 0.449
##
## Factor correlations:
##
## F1
## F1 1
#scores
model_50_items_refit_scores = fscores(model_50_items_refit, full.scores = T, full.scores.SE = T)
#correlation between scores
bind_cols(
model_50_items_refit_scores[, 1],
model_50_items_scores[, 1]
) %>%
wtd.cors()
## New names:
## • `` -> `...1`
## • `` -> `...2`
## ...1 ...2
## ...1 1.000 0.995
## ...2 0.995 1.000
#norm the scores to IQs
vocab_abbrev_norms = read_rds("data/abbrev_scales_norms.rds")
#apply norms to these data
d3$IQ = apply_norms(
model_50_items_refit_scores[, 1],
d3$age,
vocab_abbrev_norms$scale_50
)
#look OK?
GG_denhist(d3, "IQ")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
GG_denhist(d3, "IQ", group = "white_only")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
describe2(d3$IQ, d3$ethnic_combos)
## New names:
## • `` -> `...1`
#compare reliability original and replication
model_50_items_refit_scores %>% empirical_rxx()
## F1
## 0.942
model_50_items %>% fscores(full.scores.SE = T) %>% empirical_rxx()
## F1
## 0.941
#compare reliability function
bind_rows(
model_50_items %>% get_reliabilities() %>% mutate(model = "original"),
model_50_items_refit %>% get_reliabilities() %>% mutate(model = "replication")
) %>%
ggplot(aes(z, rel, color = model)) +
geom_line()
GG_save("figs/50item_models_reliability_comparison.png")
#load data from first 2 waves
d_1_2 = read_rds("data/vocab study data.rds")
#variables
d_1_2_vars = df_var_table(d_1_2)
#attention checks
d_1_2$attention_check_1 = d_1_2$avoid == "evade"
d_1_2$attention_check_2 = d_1_2$remove == "abolish"
d_1_2$attention_check_3 = d_1_2$construct == "create"
d_1_2$attention_check_4 = d_1_2$silly == "childish"
#attention scores
d_1_2$attention_score = rowSums(d_1_2 %>% select(attention_check_1:attention_check_4))
d_1_2$attention_score %>% table2()
#drop those cases
d_1_2 = d_1_2 %>% filter(attention_score == 4)
#survey completion time
d_1_2$completion_time = d_1_2$Completed_at - d_1_2$Started_at
d_1_2$completion_time_mins = d_1_2$completion_time %>% as.numeric()
#versus IQ score
d_1_2 %>%
GG_scatter("completion_time_mins", "IQ") +
scale_x_log10()
## `geom_smooth()` using formula = 'y ~ x'
#remove below 10 minutes, is this even humanly possible?
#they passed attention checks
d_1_2 %<>%
filter(completion_time_mins >= 10)
#join
d = bind_rows(
#bad type combination, but we don't need this because we have age variable
d_1_2 %>% select(-How_old_are_you) %>% mutate(wave = "original"),
d3 %>% select(-How_old_are_you) %>% mutate(wave = "replication")
)
#var table
d_vars = df_var_table(d)
#all the ethnic dummies
ethnic_vars = d %>% select(white:other_race, asian:pacific_islander) %>% names()
#ethic vars overlap
ethnic_vars_overlap = d %>% select(white:hispanic, other_race) %>% names()
#ethnic combos merge
d$ethnic_combos = miss_fill(
d$race_combos,
d$ethnic_combos
)
d$ethnic_combos %>% table2()
#common
d$ethnic_combos_common = d$ethnic_combos %>% fct_lump_min(min = 15) %>% fct_relevel("white")
d$ethnic_combos_common %>% table2()
#politics variables
pol_vars = d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women) %>% names()
#recode variables
for (v in pol_vars) {
d[[v]] %<>% pol_recoder()
}
d %>%
select(IQ, age) %>%
describe2()
table2(d$sex)
table2(d$ethnic_combos_common)
mean(d$hispanic %>% as.logical())
## [1] 0.0678
#predict IQ from demogaphics only
#to see how well differences can be explained by different numbers of predictors or combinations
list(
ols(IQ ~ sex + white_only, data = d),
ols(IQ ~ sex + white + jewish + black + hispanic + other_race, data = d),
ols(IQ ~ sex + ethnic_combos, data = d),
ols(IQ ~ sex + ethnic_combos_common, data = d)
) %>%
summarize_models(add_ref_level = F) %>%
tail(2)
#50-item test
#original fit
model_50_items_scores %>% empirical_rxx()
## F1
## 0.939
#refit
model_50_items_refit_scores %>% empirical_rxx()
## F1
## 0.942
#plot
get_reliabilities(model_50_items_refit) %>%
ggplot(aes(z, rel)) +
geom_line() +
geom_hline(yintercept = 0.9, linetype = 2) +
scale_y_continuous(breaks = seq(0, 1, .1))
#226 items
full226_items_fit = read_rds("good_items_fit.rds")
#calculate reliability
full226_items_fit %>% fscores(full.scores.SE = T) %>% empirical_rxx()
## F1
## 0.977
#reliability distributions by wave
bind_rows(
model_50_items %>% get_reliabilities() %>% mutate(model = "wave 2\n50 items"),
full226_items_fit %>% get_reliabilities() %>% mutate(model = "wave 1\n226 items")
) %>%
ggplot(aes(z, rel, color = model)) +
geom_line() +
geom_hline(yintercept = 0.9, linetype = 2) +
scale_y_continuous("Reliability", breaks = seq(0, 1, .1)) +
scale_x_continuous("z-score of ability", breaks = seq(-6, 6, by = 1))
GG_save("figs/reliability_by_wave.png")
#IQ distributions by wage
d %>%
GG_denhist("IQ", "wave")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
GG_save("figs/iq_dist_wave.png")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
#political dimensions
pol_fa_1 = fa(
d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women)
)
pol_fa_1
## Factor Analysis using method = minres
## Call: fa(r = d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women))
## Standardized loadings (pattern matrix) based upon correlation matrix
## MR1
## The_government_should_keep_regulations_on_business_to_a_minimum -0.64
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.80
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.52
## The_government_should_mandate_a_higher_minimum_wage 0.75
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.78
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.27
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.69
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.34
## I_think_that_the_United_Nations_should_have_more_political_power 0.57
## I_would_support_an_increase_in_immigration_to_my_country 0.62
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.61
## Military_spending_should_be_increased -0.57
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.27
## I_love_my_country -0.58
## It_is_important_to_honor_our_national_history_and_heritage -0.57
## My_country_should_try_to_influence_the_values_of_other_nations -0.20
## Race_is_a_social_construct 0.25
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.25
## Billionaires_should_pay_very_high_taxes 0.69
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.12
## Abortion_should_be_illegal -0.64
## Christianity_should_be_the_state_religion -0.43
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.23
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.35
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.00
## Feminism_is_good_for_women 0.61
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum 4.1e-01
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 6.4e-01
## Large_companies_should_be_controlled_by_the_state_not_private_actors 2.7e-01
## The_government_should_mandate_a_higher_minimum_wage 5.7e-01
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 6.0e-01
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 7.1e-02
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 4.8e-01
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 1.2e-01
## I_think_that_the_United_Nations_should_have_more_political_power 3.3e-01
## I_would_support_an_increase_in_immigration_to_my_country 3.9e-01
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 3.7e-01
## Military_spending_should_be_increased 3.2e-01
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 7.1e-02
## I_love_my_country 3.4e-01
## It_is_important_to_honor_our_national_history_and_heritage 3.2e-01
## My_country_should_try_to_influence_the_values_of_other_nations 4.1e-02
## Race_is_a_social_construct 6.5e-02
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 6.0e-02
## Billionaires_should_pay_very_high_taxes 4.8e-01
## We_should_use_nuclear_power_for_electricity_and_heat_generation 1.5e-02
## Abortion_should_be_illegal 4.1e-01
## Christianity_should_be_the_state_religion 1.8e-01
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 5.5e-02
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 1.2e-01
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 2.1e-06
## Feminism_is_good_for_women 3.7e-01
## u2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.59
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.36
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.73
## The_government_should_mandate_a_higher_minimum_wage 0.43
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.40
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.93
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.52
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.88
## I_think_that_the_United_Nations_should_have_more_political_power 0.67
## I_would_support_an_increase_in_immigration_to_my_country 0.61
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.63
## Military_spending_should_be_increased 0.68
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.93
## I_love_my_country 0.66
## It_is_important_to_honor_our_national_history_and_heritage 0.68
## My_country_should_try_to_influence_the_values_of_other_nations 0.96
## Race_is_a_social_construct 0.94
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.94
## Billionaires_should_pay_very_high_taxes 0.52
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.98
## Abortion_should_be_illegal 0.59
## Christianity_should_be_the_state_religion 0.82
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.95
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.88
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 1.00
## Feminism_is_good_for_women 0.63
## com
## The_government_should_keep_regulations_on_business_to_a_minimum 1
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 1
## Large_companies_should_be_controlled_by_the_state_not_private_actors 1
## The_government_should_mandate_a_higher_minimum_wage 1
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 1
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 1
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 1
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 1
## I_think_that_the_United_Nations_should_have_more_political_power 1
## I_would_support_an_increase_in_immigration_to_my_country 1
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 1
## Military_spending_should_be_increased 1
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 1
## I_love_my_country 1
## It_is_important_to_honor_our_national_history_and_heritage 1
## My_country_should_try_to_influence_the_values_of_other_nations 1
## Race_is_a_social_construct 1
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 1
## Billionaires_should_pay_very_high_taxes 1
## We_should_use_nuclear_power_for_electricity_and_heat_generation 1
## Abortion_should_be_illegal 1
## Christianity_should_be_the_state_religion 1
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 1
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 1
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 1
## Feminism_is_good_for_women 1
##
## MR1
## SS loadings 7.10
## Proportion Var 0.27
##
## Mean item complexity = 1
## Test of the hypothesis that 1 factor is sufficient.
##
## df null model = 325 with the objective function = 9.21 with Chi Square = 8724
## df of the model are 299 and the objective function was 2.51
##
## The root mean square of the residuals (RMSR) is 0.07
## The df corrected root mean square of the residuals is 0.07
##
## The harmonic n.obs is 958 with the empirical chi square 3066 with prob < 0
## The total n.obs was 958 with Likelihood Chi Square = 2374 with prob < 4e-319
##
## Tucker Lewis Index of factoring reliability = 0.731
## RMSEA index = 0.085 and the 90 % confidence intervals are 0.082 0.088
## BIC = 321
## Fit based upon off diagonal values = 0.94
## Measures of factor score adequacy
## MR1
## Correlation of (regression) scores with factors 0.96
## Multiple R square of scores with factors 0.93
## Minimum correlation of possible factor scores 0.85
#omega h
omega(
d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women)
)
## Omega
## Call: omegah(m = m, nfactors = nfactors, fm = fm, key = key, flip = flip,
## digits = digits, title = title, sl = sl, labels = labels,
## plot = plot, n.obs = n.obs, rotate = rotate, Phi = Phi, option = option,
## covar = covar)
## Alpha: 0.88
## G.6: 0.9
## Omega Hierarchical: 0.62
## Omega H asymptotic: 0.68
## Omega Total 0.9
##
## Schmid Leiman Factor loadings greater than 0.2
## g
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.52
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.63
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.40
## The_government_should_mandate_a_higher_minimum_wage 0.58
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.60
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.21
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.54
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.26
## I_think_that_the_United_Nations_should_have_more_political_power 0.42
## I_would_support_an_increase_in_immigration_to_my_country 0.50
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.48
## Military_spending_should_be_increased- 0.53
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.23
## I_love_my_country- 0.60
## It_is_important_to_honor_our_national_history_and_heritage- 0.57
## My_country_should_try_to_influence_the_values_of_other_nations- 0.25
## Race_is_a_social_construct
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal
## Billionaires_should_pay_very_high_taxes 0.55
## We_should_use_nuclear_power_for_electricity_and_heat_generation-
## Abortion_should_be_illegal- 0.55
## Christianity_should_be_the_state_religion- 0.42
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people-
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.31
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old-
## Feminism_is_good_for_women 0.49
## F1*
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.34
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.51
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.38
## The_government_should_mandate_a_higher_minimum_wage 0.54
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.53
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old-
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.46
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.23
## I_think_that_the_United_Nations_should_have_more_political_power 0.47
## I_would_support_an_increase_in_immigration_to_my_country 0.35
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.40
## Military_spending_should_be_increased-
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country-
## I_love_my_country-
## It_is_important_to_honor_our_national_history_and_heritage-
## My_country_should_try_to_influence_the_values_of_other_nations-
## Race_is_a_social_construct 0.24
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal
## Billionaires_should_pay_very_high_taxes 0.42
## We_should_use_nuclear_power_for_electricity_and_heat_generation-
## Abortion_should_be_illegal- 0.26
## Christianity_should_be_the_state_religion-
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.21
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old-
## Feminism_is_good_for_women 0.35
## F2*
## The_government_should_keep_regulations_on_business_to_a_minimum-
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor
## Large_companies_should_be_controlled_by_the_state_not_private_actors -0.20
## The_government_should_mandate_a_higher_minimum_wage
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old-
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it-
## I_think_that_the_United_Nations_should_have_more_political_power
## I_would_support_an_increase_in_immigration_to_my_country 0.22
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country
## Military_spending_should_be_increased-
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country-
## I_love_my_country-
## It_is_important_to_honor_our_national_history_and_heritage-
## My_country_should_try_to_influence_the_values_of_other_nations-
## Race_is_a_social_construct
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.26
## Billionaires_should_pay_very_high_taxes
## We_should_use_nuclear_power_for_electricity_and_heat_generation- -0.35
## Abortion_should_be_illegal- 0.42
## Christianity_should_be_the_state_religion- 0.51
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- -0.26
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.29
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old-
## Feminism_is_good_for_women 0.24
## F3*
## The_government_should_keep_regulations_on_business_to_a_minimum-
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor
## Large_companies_should_be_controlled_by_the_state_not_private_actors
## The_government_should_mandate_a_higher_minimum_wage
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old-
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it-
## I_think_that_the_United_Nations_should_have_more_political_power
## I_would_support_an_increase_in_immigration_to_my_country
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country
## Military_spending_should_be_increased- -0.37
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country-
## I_love_my_country- -0.58
## It_is_important_to_honor_our_national_history_and_heritage- -0.50
## My_country_should_try_to_influence_the_values_of_other_nations- -0.42
## Race_is_a_social_construct
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal
## Billionaires_should_pay_very_high_taxes
## We_should_use_nuclear_power_for_electricity_and_heat_generation-
## Abortion_should_be_illegal-
## Christianity_should_be_the_state_religion- -0.20
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people-
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old-
## Feminism_is_good_for_women
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.40
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.66
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.35
## The_government_should_mandate_a_higher_minimum_wage 0.65
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.64
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old-
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.50
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it-
## I_think_that_the_United_Nations_should_have_more_political_power 0.41
## I_would_support_an_increase_in_immigration_to_my_country 0.42
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.39
## Military_spending_should_be_increased- 0.45
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country-
## I_love_my_country- 0.69
## It_is_important_to_honor_our_national_history_and_heritage- 0.58
## My_country_should_try_to_influence_the_values_of_other_nations- 0.26
## Race_is_a_social_construct
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal
## Billionaires_should_pay_very_high_taxes 0.48
## We_should_use_nuclear_power_for_electricity_and_heat_generation-
## Abortion_should_be_illegal- 0.55
## Christianity_should_be_the_state_religion- 0.47
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people-
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.20
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old-
## Feminism_is_good_for_women 0.42
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.40
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.66
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.35
## The_government_should_mandate_a_higher_minimum_wage 0.65
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.64
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.08
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.50
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.12
## I_think_that_the_United_Nations_should_have_more_political_power 0.41
## I_would_support_an_increase_in_immigration_to_my_country 0.42
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.39
## Military_spending_should_be_increased- 0.45
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.13
## I_love_my_country- 0.69
## It_is_important_to_honor_our_national_history_and_heritage- 0.58
## My_country_should_try_to_influence_the_values_of_other_nations- 0.26
## Race_is_a_social_construct 0.10
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.13
## Billionaires_should_pay_very_high_taxes 0.48
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.16
## Abortion_should_be_illegal- 0.55
## Christianity_should_be_the_state_religion- 0.47
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.15
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.20
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.00
## Feminism_is_good_for_women 0.42
## u2
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.60
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.34
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.65
## The_government_should_mandate_a_higher_minimum_wage 0.35
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.36
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.92
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.50
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.88
## I_think_that_the_United_Nations_should_have_more_political_power 0.59
## I_would_support_an_increase_in_immigration_to_my_country 0.58
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.61
## Military_spending_should_be_increased- 0.55
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.87
## I_love_my_country- 0.31
## It_is_important_to_honor_our_national_history_and_heritage- 0.42
## My_country_should_try_to_influence_the_values_of_other_nations- 0.74
## Race_is_a_social_construct 0.90
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.87
## Billionaires_should_pay_very_high_taxes 0.52
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.84
## Abortion_should_be_illegal- 0.45
## Christianity_should_be_the_state_religion- 0.53
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.85
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.80
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 1.00
## Feminism_is_good_for_women 0.58
## p2
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.67
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.59
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.47
## The_government_should_mandate_a_higher_minimum_wage 0.52
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.56
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.59
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.57
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.57
## I_think_that_the_United_Nations_should_have_more_political_power 0.43
## I_would_support_an_increase_in_immigration_to_my_country 0.59
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.59
## Military_spending_should_be_increased- 0.63
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.43
## I_love_my_country- 0.52
## It_is_important_to_honor_our_national_history_and_heritage- 0.55
## My_country_should_try_to_influence_the_values_of_other_nations- 0.24
## Race_is_a_social_construct 0.29
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.30
## Billionaires_should_pay_very_high_taxes 0.63
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.05
## Abortion_should_be_illegal- 0.55
## Christianity_should_be_the_state_religion- 0.38
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.21
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.49
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.03
## Feminism_is_good_for_women 0.57
## com
## The_government_should_keep_regulations_on_business_to_a_minimum- 1.87
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 1.95
## Large_companies_should_be_controlled_by_the_state_not_private_actors 2.52
## The_government_should_mandate_a_higher_minimum_wage 2.07
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 1.97
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 2.06
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 1.98
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 1.97
## I_think_that_the_United_Nations_should_have_more_political_power 2.08
## I_would_support_an_increase_in_immigration_to_my_country 2.22
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 1.96
## Military_spending_should_be_increased- 2.01
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 3.32
## I_love_my_country- 2.00
## It_is_important_to_honor_our_national_history_and_heritage- 2.00
## My_country_should_try_to_influence_the_values_of_other_nations- 1.87
## Race_is_a_social_construct 2.39
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 2.55
## Billionaires_should_pay_very_high_taxes 1.91
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 1.60
## Abortion_should_be_illegal- 2.40
## Christianity_should_be_the_state_religion- 2.27
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 2.82
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 2.33
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 2.32
## Feminism_is_good_for_women 2.33
##
## With Sums of squares of:
## g F1* F2* F3* h2
## 4.88 2.45 0.99 1.05 4.46
##
## general/max 1.09 max/min = 4.49
## mean percent general = 0.46 with sd = 0.18 and cv of 0.38
## Explained Common Variance of the general factor = 0.52
##
## The degrees of freedom are 250 and the fit is 1.15
## The number of observations was 958 with Chi Square = 1091 with prob < 2.2e-105
## The root mean square of the residuals is 0.04
## The df corrected root mean square of the residuals is 0.05
## RMSEA index = 0.059 and the 10 % confidence intervals are 0.056 0.063
## BIC = -625
##
## Compare this with the adequacy of just a general factor and no group factors
## The degrees of freedom for just the general factor are 299 and the fit is 3.09
## The number of observations was 958 with Chi Square = 2923 with prob < 0
## The root mean square of the residuals is 0.11
## The df corrected root mean square of the residuals is 0.12
##
## RMSEA index = 0.096 and the 10 % confidence intervals are 0.093 0.099
## BIC = 870
##
## Measures of factor score adequacy
## g F1* F2* F3*
## Correlation of scores with factors 0.81 0.72 0.76 0.72
## Multiple R square of scores with factors 0.66 0.52 0.58 0.52
## Minimum correlation of factor score estimates 0.32 0.04 0.16 0.05
##
## Total, General and Subset omega for each subset
## g F1* F2* F3*
## Omega total for total scores and subscales 0.90 0.89 0.41 0.69
## Omega general for total scores and subscales 0.62 0.52 0.33 0.37
## Omega group for total scores and subscales 0.20 0.37 0.08 0.33
d$conservatism = pol_fa_1$scores[, 1] %>% standardize() %>% multiply_by(-1)
fa_plot_loadings(pol_fa_1, reverse_vector = -1) +
geom_hline(yintercept = 0, linetype = 2, alpha = .2)
GG_save("figs/pol_fa_loadings.png")
#conservatism by wave
d %>%
GG_denhist("conservatism", "wave")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
GG_save("figs/conservatism_dist_wave.png")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
SMD_matrix(d$conservatism, group = d$wave)
## original replication
## original NA -0.342
## replication -0.342 NA
#age effect on politics
GG_scatter(d, "age", "conservatism") +
geom_smooth()
## `geom_smooth()` using formula = 'y ~ x'
## `geom_smooth()` using method = 'loess' and formula = 'y ~ x'
#ethic variables only
#to see how well differences can be explained by different numbers of predictors or combinations
list(
ols(conservatism ~ sex + white_only, data = d),
ols(conservatism ~ sex + white + jewish + black + hispanic + other_race, data = d),
ols(conservatism ~ sex + ethnic_combos, data = d),
ols(conservatism ~ sex + ethnic_combos_common, data = d)
) %>%
summarize_models(add_ref_level = F) %>%
tail(2)
#the combos are best
#test for multiple dimensions, how many factors to extract?
#psych package
nfactors(d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women))
##
## Number of factors
## Call: vss(x = x, n = n, rotate = rotate, diagonal = diagonal, fm = fm,
## n.obs = n.obs, plot = FALSE, title = title, use = use, cor = cor)
## VSS complexity 1 achieves a maximimum of 0.77 with 1 factors
## VSS complexity 2 achieves a maximimum of 0.8 with 2 factors
## The Velicer MAP achieves a minimum of 0.01 with 2 factors
## Empirical BIC achieves a minimum of -1050 with 5 factors
## Sample Size adjusted BIC achieves a minimum of -277 with 7 factors
##
## Statistics by number of factors
## vss1 vss2 map dof chisq prob sqresid fit RMSEA BIC SABIC complex
## 1 0.77 0.00 0.012 299 2.4e+03 4.0e-319 17.9 0.77 0.085 321 1271.1 1.0
## 2 0.61 0.80 0.011 274 1.6e+03 1.3e-182 15.0 0.80 0.071 -299 571.5 1.3
## 3 0.55 0.77 0.011 250 1.1e+03 2.2e-105 12.8 0.83 0.059 -625 169.0 1.6
## 4 0.55 0.80 0.012 227 7.7e+02 1.4e-60 11.3 0.85 0.050 -786 -65.1 1.6
## 5 0.52 0.76 0.014 205 5.4e+02 8.6e-32 10.1 0.87 0.041 -869 -217.6 1.8
## 6 0.50 0.79 0.017 184 4.3e+02 3.9e-21 9.4 0.88 0.037 -838 -253.6 1.9
## 7 0.53 0.76 0.020 164 3.3e+02 5.5e-13 8.9 0.88 0.032 -798 -277.3 2.1
## 8 0.48 0.76 0.025 145 2.8e+02 1.2e-10 8.4 0.89 0.031 -715 -254.6 2.1
## 9 0.49 0.77 0.031 127 2.4e+02 9.7e-09 7.8 0.90 0.030 -634 -230.7 2.2
## 10 0.40 0.75 0.038 110 1.8e+02 3.8e-05 7.4 0.90 0.026 -576 -227.1 2.4
## 11 0.41 0.73 0.043 94 1.3e+02 1.4e-02 7.2 0.91 0.019 -518 -219.9 2.4
## 12 0.45 0.75 0.050 79 9.3e+01 1.3e-01 6.6 0.91 0.014 -449 -198.3 2.3
## 13 0.49 0.75 0.064 65 7.2e+01 2.4e-01 6.4 0.92 0.011 -374 -167.3 2.3
## 14 0.50 0.77 0.064 52 4.5e+01 7.3e-01 5.8 0.92 0.000 -312 -146.4 2.2
## 15 0.40 0.70 0.074 40 2.9e+01 9.0e-01 6.0 0.92 0.000 -245 -118.4 2.3
## 16 0.41 0.70 0.087 29 2.2e+01 8.3e-01 5.5 0.93 0.000 -177 -85.3 2.3
## 17 0.47 0.75 0.098 19 1.1e+01 9.1e-01 4.6 0.94 0.000 -119 -58.6 2.1
## 18 0.39 0.67 0.123 10 8.5e+00 5.8e-01 4.8 0.94 0.000 -60 -28.4 2.4
## 19 0.33 0.62 0.155 2 1.2e+00 5.5e-01 4.4 0.94 0.000 -13 -6.2 2.3
## 20 0.39 0.72 0.184 -5 2.1e-02 NA 4.2 0.95 NA NA NA 2.1
## eChisq SRMR eCRMS eBIC
## 1 3.1e+03 7.0e-02 0.0732 1013
## 2 1.8e+03 5.4e-02 0.0587 -71
## 3 1.1e+03 4.2e-02 0.0474 -642
## 4 6.5e+02 3.2e-02 0.0388 -903
## 5 3.6e+02 2.4e-02 0.0302 -1050
## 6 2.6e+02 2.1e-02 0.0273 -1000
## 7 2.0e+02 1.8e-02 0.0250 -929
## 8 1.5e+02 1.6e-02 0.0235 -842
## 9 1.2e+02 1.4e-02 0.0222 -752
## 10 8.8e+01 1.2e-02 0.0205 -667
## 11 6.4e+01 1.0e-02 0.0188 -582
## 12 3.9e+01 8.0e-03 0.0161 -503
## 13 3.0e+01 6.9e-03 0.0155 -416
## 14 2.1e+01 5.8e-03 0.0144 -336
## 15 1.3e+01 4.5e-03 0.0129 -262
## 16 8.1e+00 3.6e-03 0.0121 -191
## 17 4.4e+00 2.7e-03 0.0110 -126
## 18 2.8e+00 2.1e-03 0.0121 -66
## 19 3.4e-01 7.4e-04 0.0094 -13
## 20 5.8e-03 9.6e-05 NA NA
#another package
EFA.dimensions::DIMTESTS(
d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
display = 1
)
##
##
## DIMTESTS results:
## # of Factors:
## EMPKC 5
## HULL 1
## RAWPAR 5
psych::fa.parallel(
d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women)
)
## Parallel analysis suggests that the number of factors = 5 and the number of components = 5
#multiple factor solutions
fa_pol_multi = map(1:7, \(x) {
fa(
d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
nfactors = x,
rotate = "oblimin"
)
})
fa_pol_multi
## [[1]]
## Factor Analysis using method = minres
## Call: fa(r = d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
## nfactors = x, rotate = "oblimin")
## Standardized loadings (pattern matrix) based upon correlation matrix
## MR1
## The_government_should_keep_regulations_on_business_to_a_minimum -0.64
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.80
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.52
## The_government_should_mandate_a_higher_minimum_wage 0.75
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.78
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.27
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.69
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.34
## I_think_that_the_United_Nations_should_have_more_political_power 0.57
## I_would_support_an_increase_in_immigration_to_my_country 0.62
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.61
## Military_spending_should_be_increased -0.57
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.27
## I_love_my_country -0.58
## It_is_important_to_honor_our_national_history_and_heritage -0.57
## My_country_should_try_to_influence_the_values_of_other_nations -0.20
## Race_is_a_social_construct 0.25
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.25
## Billionaires_should_pay_very_high_taxes 0.69
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.12
## Abortion_should_be_illegal -0.64
## Christianity_should_be_the_state_religion -0.43
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.23
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.35
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.00
## Feminism_is_good_for_women 0.61
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum 4.1e-01
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 6.4e-01
## Large_companies_should_be_controlled_by_the_state_not_private_actors 2.7e-01
## The_government_should_mandate_a_higher_minimum_wage 5.7e-01
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 6.0e-01
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 7.1e-02
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 4.8e-01
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 1.2e-01
## I_think_that_the_United_Nations_should_have_more_political_power 3.3e-01
## I_would_support_an_increase_in_immigration_to_my_country 3.9e-01
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 3.7e-01
## Military_spending_should_be_increased 3.2e-01
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 7.1e-02
## I_love_my_country 3.4e-01
## It_is_important_to_honor_our_national_history_and_heritage 3.2e-01
## My_country_should_try_to_influence_the_values_of_other_nations 4.1e-02
## Race_is_a_social_construct 6.5e-02
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 6.0e-02
## Billionaires_should_pay_very_high_taxes 4.8e-01
## We_should_use_nuclear_power_for_electricity_and_heat_generation 1.5e-02
## Abortion_should_be_illegal 4.1e-01
## Christianity_should_be_the_state_religion 1.8e-01
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 5.5e-02
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 1.2e-01
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 2.1e-06
## Feminism_is_good_for_women 3.7e-01
## u2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.59
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.36
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.73
## The_government_should_mandate_a_higher_minimum_wage 0.43
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.40
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.93
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.52
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.88
## I_think_that_the_United_Nations_should_have_more_political_power 0.67
## I_would_support_an_increase_in_immigration_to_my_country 0.61
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.63
## Military_spending_should_be_increased 0.68
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.93
## I_love_my_country 0.66
## It_is_important_to_honor_our_national_history_and_heritage 0.68
## My_country_should_try_to_influence_the_values_of_other_nations 0.96
## Race_is_a_social_construct 0.94
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.94
## Billionaires_should_pay_very_high_taxes 0.52
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.98
## Abortion_should_be_illegal 0.59
## Christianity_should_be_the_state_religion 0.82
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.95
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.88
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 1.00
## Feminism_is_good_for_women 0.63
## com
## The_government_should_keep_regulations_on_business_to_a_minimum 1
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 1
## Large_companies_should_be_controlled_by_the_state_not_private_actors 1
## The_government_should_mandate_a_higher_minimum_wage 1
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 1
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 1
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 1
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 1
## I_think_that_the_United_Nations_should_have_more_political_power 1
## I_would_support_an_increase_in_immigration_to_my_country 1
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 1
## Military_spending_should_be_increased 1
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 1
## I_love_my_country 1
## It_is_important_to_honor_our_national_history_and_heritage 1
## My_country_should_try_to_influence_the_values_of_other_nations 1
## Race_is_a_social_construct 1
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 1
## Billionaires_should_pay_very_high_taxes 1
## We_should_use_nuclear_power_for_electricity_and_heat_generation 1
## Abortion_should_be_illegal 1
## Christianity_should_be_the_state_religion 1
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 1
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 1
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 1
## Feminism_is_good_for_women 1
##
## MR1
## SS loadings 7.10
## Proportion Var 0.27
##
## Mean item complexity = 1
## Test of the hypothesis that 1 factor is sufficient.
##
## df null model = 325 with the objective function = 9.21 with Chi Square = 8724
## df of the model are 299 and the objective function was 2.51
##
## The root mean square of the residuals (RMSR) is 0.07
## The df corrected root mean square of the residuals is 0.07
##
## The harmonic n.obs is 958 with the empirical chi square 3066 with prob < 0
## The total n.obs was 958 with Likelihood Chi Square = 2374 with prob < 4e-319
##
## Tucker Lewis Index of factoring reliability = 0.731
## RMSEA index = 0.085 and the 90 % confidence intervals are 0.082 0.088
## BIC = 321
## Fit based upon off diagonal values = 0.94
## Measures of factor score adequacy
## MR1
## Correlation of (regression) scores with factors 0.96
## Multiple R square of scores with factors 0.93
## Minimum correlation of possible factor scores 0.85
##
## [[2]]
## Factor Analysis using method = minres
## Call: fa(r = d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
## nfactors = x, rotate = "oblimin")
## Standardized loadings (pattern matrix) based upon correlation matrix
## MR1
## The_government_should_keep_regulations_on_business_to_a_minimum -0.51
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.77
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.55
## The_government_should_mandate_a_higher_minimum_wage 0.82
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.80
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.25
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.70
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.34
## I_think_that_the_United_Nations_should_have_more_political_power 0.72
## I_would_support_an_increase_in_immigration_to_my_country 0.54
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.60
## Military_spending_should_be_increased -0.13
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.17
## I_love_my_country -0.03
## It_is_important_to_honor_our_national_history_and_heritage -0.05
## My_country_should_try_to_influence_the_values_of_other_nations 0.21
## Race_is_a_social_construct 0.38
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.21
## Billionaires_should_pay_very_high_taxes 0.63
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.20
## Abortion_should_be_illegal -0.42
## Christianity_should_be_the_state_religion -0.05
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.30
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.17
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.01
## Feminism_is_good_for_women 0.54
## MR2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.19
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor -0.06
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.02
## The_government_should_mandate_a_higher_minimum_wage 0.05
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.00
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.03
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed -0.02
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.00
## I_think_that_the_United_Nations_should_have_more_political_power 0.17
## I_would_support_an_increase_in_immigration_to_my_country -0.13
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country -0.03
## Military_spending_should_be_increased 0.59
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.14
## I_love_my_country 0.76
## It_is_important_to_honor_our_national_history_and_heritage 0.72
## My_country_should_try_to_influence_the_values_of_other_nations 0.55
## Race_is_a_social_construct 0.15
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal -0.06
## Billionaires_should_pay_very_high_taxes -0.10
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.09
## Abortion_should_be_illegal 0.31
## Christianity_should_be_the_state_religion 0.51
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.07
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.25
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.02
## Feminism_is_good_for_women -0.11
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.40410
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.65580
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.29088
## The_government_should_mandate_a_higher_minimum_wage 0.62437
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.64213
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.07234
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.50092
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.12070
## I_think_that_the_United_Nations_should_have_more_political_power 0.41061
## I_would_support_an_increase_in_immigration_to_my_country 0.38860
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.38809
## Military_spending_should_be_increased 0.46045
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.07293
## I_love_my_country 0.61068
## It_is_important_to_honor_our_national_history_and_heritage 0.55717
## My_country_should_try_to_influence_the_values_of_other_nations 0.21233
## Race_is_a_social_construct 0.09956
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.05993
## Billionaires_should_pay_very_high_taxes 0.48534
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.02682
## Abortion_should_be_illegal 0.41967
## Christianity_should_be_the_state_religion 0.29032
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.06884
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.14038
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.00021
## Feminism_is_good_for_women 0.37263
## u2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.60
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.34
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.71
## The_government_should_mandate_a_higher_minimum_wage 0.38
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.36
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.93
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.50
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.88
## I_think_that_the_United_Nations_should_have_more_political_power 0.59
## I_would_support_an_increase_in_immigration_to_my_country 0.61
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.61
## Military_spending_should_be_increased 0.54
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.93
## I_love_my_country 0.39
## It_is_important_to_honor_our_national_history_and_heritage 0.44
## My_country_should_try_to_influence_the_values_of_other_nations 0.79
## Race_is_a_social_construct 0.90
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.94
## Billionaires_should_pay_very_high_taxes 0.51
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.97
## Abortion_should_be_illegal 0.58
## Christianity_should_be_the_state_religion 0.71
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.93
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.86
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 1.00
## Feminism_is_good_for_women 0.63
## com
## The_government_should_keep_regulations_on_business_to_a_minimum 1.3
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 1.0
## Large_companies_should_be_controlled_by_the_state_not_private_actors 1.0
## The_government_should_mandate_a_higher_minimum_wage 1.0
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 1.0
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 1.0
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 1.0
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 1.0
## I_think_that_the_United_Nations_should_have_more_political_power 1.1
## I_would_support_an_increase_in_immigration_to_my_country 1.1
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 1.0
## Military_spending_should_be_increased 1.1
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 1.9
## I_love_my_country 1.0
## It_is_important_to_honor_our_national_history_and_heritage 1.0
## My_country_should_try_to_influence_the_values_of_other_nations 1.3
## Race_is_a_social_construct 1.3
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 1.1
## Billionaires_should_pay_very_high_taxes 1.1
## We_should_use_nuclear_power_for_electricity_and_heat_generation 1.4
## Abortion_should_be_illegal 1.9
## Christianity_should_be_the_state_religion 1.0
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 1.1
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 1.7
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 1.8
## Feminism_is_good_for_women 1.1
##
## MR1 MR2
## SS loadings 5.83 2.55
## Proportion Var 0.22 0.10
## Cumulative Var 0.22 0.32
## Proportion Explained 0.70 0.30
## Cumulative Proportion 0.70 1.00
##
## With factor correlations of
## MR1 MR2
## MR1 1.00 -0.57
## MR2 -0.57 1.00
##
## Mean item complexity = 1.2
## Test of the hypothesis that 2 factors are sufficient.
##
## df null model = 325 with the objective function = 9.21 with Chi Square = 8724
## df of the model are 274 and the objective function was 1.67
##
## The root mean square of the residuals (RMSR) is 0.05
## The df corrected root mean square of the residuals is 0.06
##
## The harmonic n.obs is 958 with the empirical chi square 1810 with prob < 4.2e-224
## The total n.obs was 958 with Likelihood Chi Square = 1582 with prob < 1.3e-182
##
## Tucker Lewis Index of factoring reliability = 0.815
## RMSEA index = 0.071 and the 90 % confidence intervals are 0.067 0.074
## BIC = -299
## Fit based upon off diagonal values = 0.96
## Measures of factor score adequacy
## MR1 MR2
## Correlation of (regression) scores with factors 0.96 0.91
## Multiple R square of scores with factors 0.92 0.83
## Minimum correlation of possible factor scores 0.84 0.67
##
## [[3]]
## Factor Analysis using method = minres
## Call: fa(r = d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
## nfactors = x, rotate = "oblimin")
## Standardized loadings (pattern matrix) based upon correlation matrix
## MR1
## The_government_should_keep_regulations_on_business_to_a_minimum -0.51
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.77
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.57
## The_government_should_mandate_a_higher_minimum_wage 0.82
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.79
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.25
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.69
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.34
## I_think_that_the_United_Nations_should_have_more_political_power 0.71
## I_would_support_an_increase_in_immigration_to_my_country 0.53
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.60
## Military_spending_should_be_increased -0.15
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.18
## I_love_my_country -0.04
## It_is_important_to_honor_our_national_history_and_heritage -0.07
## My_country_should_try_to_influence_the_values_of_other_nations 0.19
## Race_is_a_social_construct 0.36
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.19
## Billionaires_should_pay_very_high_taxes 0.63
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.22
## Abortion_should_be_illegal -0.39
## Christianity_should_be_the_state_religion -0.01
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.31
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.15
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.01
## Feminism_is_good_for_women 0.53
## MR2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.17
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor -0.08
## Large_companies_should_be_controlled_by_the_state_not_private_actors -0.10
## The_government_should_mandate_a_higher_minimum_wage -0.03
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.00
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.06
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.00
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.02
## I_think_that_the_United_Nations_should_have_more_political_power 0.14
## I_would_support_an_increase_in_immigration_to_my_country -0.01
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country -0.02
## Military_spending_should_be_increased 0.52
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.24
## I_love_my_country 0.81
## It_is_important_to_honor_our_national_history_and_heritage 0.71
## My_country_should_try_to_influence_the_values_of_other_nations 0.59
## Race_is_a_social_construct 0.16
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.09
## Billionaires_should_pay_very_high_taxes -0.10
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.11
## Abortion_should_be_illegal 0.10
## Christianity_should_be_the_state_religion 0.28
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.08
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.10
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.03
## Feminism_is_good_for_women 0.01
## MR3
## The_government_should_keep_regulations_on_business_to_a_minimum -0.06
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor -0.02
## Large_companies_should_be_controlled_by_the_state_not_private_actors -0.22
## The_government_should_mandate_a_higher_minimum_wage -0.12
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.04
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.04
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.07
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.01
## I_think_that_the_United_Nations_should_have_more_political_power -0.02
## I_would_support_an_increase_in_immigration_to_my_country 0.24
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.05
## Military_spending_should_be_increased -0.14
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.18
## I_love_my_country 0.01
## It_is_important_to_honor_our_national_history_and_heritage -0.05
## My_country_should_try_to_influence_the_values_of_other_nations 0.05
## Race_is_a_social_construct 0.05
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.28
## Billionaires_should_pay_very_high_taxes 0.04
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.39
## Abortion_should_be_illegal -0.45
## Christianity_should_be_the_state_religion -0.55
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.29
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.32
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.02
## Feminism_is_good_for_women 0.26
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.40288
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.65961
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.34977
## The_government_should_mandate_a_higher_minimum_wage 0.64763
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.63940
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.07569
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.50058
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.12098
## I_think_that_the_United_Nations_should_have_more_political_power 0.40806
## I_would_support_an_increase_in_immigration_to_my_country 0.42143
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.38730
## Military_spending_should_be_increased 0.44976
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.12549
## I_love_my_country 0.69499
## It_is_important_to_honor_our_national_history_and_heritage 0.58012
## My_country_should_try_to_influence_the_values_of_other_nations 0.26066
## Race_is_a_social_construct 0.10386
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.12515
## Billionaires_should_pay_very_high_taxes 0.48414
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.16085
## Abortion_should_be_illegal 0.54771
## Christianity_should_be_the_state_religion 0.47268
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.14814
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.19563
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.00063
## Feminism_is_good_for_women 0.41638
## u2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.60
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.34
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.65
## The_government_should_mandate_a_higher_minimum_wage 0.35
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.36
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.92
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.50
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.88
## I_think_that_the_United_Nations_should_have_more_political_power 0.59
## I_would_support_an_increase_in_immigration_to_my_country 0.58
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.61
## Military_spending_should_be_increased 0.55
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.87
## I_love_my_country 0.31
## It_is_important_to_honor_our_national_history_and_heritage 0.42
## My_country_should_try_to_influence_the_values_of_other_nations 0.74
## Race_is_a_social_construct 0.90
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.87
## Billionaires_should_pay_very_high_taxes 0.52
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.84
## Abortion_should_be_illegal 0.45
## Christianity_should_be_the_state_religion 0.53
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.85
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.80
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 1.00
## Feminism_is_good_for_women 0.58
## com
## The_government_should_keep_regulations_on_business_to_a_minimum 1.3
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 1.0
## Large_companies_should_be_controlled_by_the_state_not_private_actors 1.3
## The_government_should_mandate_a_higher_minimum_wage 1.0
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 1.0
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 1.2
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 1.0
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 1.0
## I_think_that_the_United_Nations_should_have_more_political_power 1.1
## I_would_support_an_increase_in_immigration_to_my_country 1.4
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 1.0
## Military_spending_should_be_increased 1.3
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 2.8
## I_love_my_country 1.0
## It_is_important_to_honor_our_national_history_and_heritage 1.0
## My_country_should_try_to_influence_the_values_of_other_nations 1.2
## Race_is_a_social_construct 1.4
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 2.0
## Billionaires_should_pay_very_high_taxes 1.1
## We_should_use_nuclear_power_for_electricity_and_heat_generation 1.8
## Abortion_should_be_illegal 2.1
## Christianity_should_be_the_state_religion 1.5
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 2.1
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 1.7
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 2.0
## Feminism_is_good_for_women 1.5
##
## MR1 MR2 MR3
## SS loadings 5.78 2.29 1.31
## Proportion Var 0.22 0.09 0.05
## Cumulative Var 0.22 0.31 0.36
## Proportion Explained 0.62 0.24 0.14
## Cumulative Proportion 0.62 0.86 1.00
##
## With factor correlations of
## MR1 MR2 MR3
## MR1 1.00 -0.52 0.30
## MR2 -0.52 1.00 -0.28
## MR3 0.30 -0.28 1.00
##
## Mean item complexity = 1.4
## Test of the hypothesis that 3 factors are sufficient.
##
## df null model = 325 with the objective function = 9.21 with Chi Square = 8724
## df of the model are 250 and the objective function was 1.15
##
## The root mean square of the residuals (RMSR) is 0.04
## The df corrected root mean square of the residuals is 0.05
##
## The harmonic n.obs is 958 with the empirical chi square 1074 with prob < 1.8e-102
## The total n.obs was 958 with Likelihood Chi Square = 1091 with prob < 2.2e-105
##
## Tucker Lewis Index of factoring reliability = 0.87
## RMSEA index = 0.059 and the 90 % confidence intervals are 0.056 0.063
## BIC = -625
## Fit based upon off diagonal values = 0.98
## Measures of factor score adequacy
## MR1 MR2 MR3
## Correlation of (regression) scores with factors 0.96 0.91 0.82
## Multiple R square of scores with factors 0.92 0.84 0.67
## Minimum correlation of possible factor scores 0.84 0.67 0.34
##
## [[4]]
## Factor Analysis using method = minres
## Call: fa(r = d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
## nfactors = x, rotate = "oblimin")
## Standardized loadings (pattern matrix) based upon correlation matrix
## MR1
## The_government_should_keep_regulations_on_business_to_a_minimum -0.46
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.77
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.60
## The_government_should_mandate_a_higher_minimum_wage 0.78
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.76
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.25
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.68
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.34
## I_think_that_the_United_Nations_should_have_more_political_power 0.68
## I_would_support_an_increase_in_immigration_to_my_country 0.50
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.60
## Military_spending_should_be_increased -0.13
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.18
## I_love_my_country -0.06
## It_is_important_to_honor_our_national_history_and_heritage -0.08
## My_country_should_try_to_influence_the_values_of_other_nations 0.21
## Race_is_a_social_construct 0.35
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.22
## Billionaires_should_pay_very_high_taxes 0.61
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.20
## Abortion_should_be_illegal -0.31
## Christianity_should_be_the_state_religion 0.09
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.27
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.20
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.06
## Feminism_is_good_for_women 0.45
## MR2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.15
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor -0.11
## Large_companies_should_be_controlled_by_the_state_not_private_actors -0.15
## The_government_should_mandate_a_higher_minimum_wage -0.04
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick -0.01
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.07
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed -0.02
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.03
## I_think_that_the_United_Nations_should_have_more_political_power 0.13
## I_would_support_an_increase_in_immigration_to_my_country -0.01
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country -0.04
## Military_spending_should_be_increased 0.49
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.25
## I_love_my_country 0.83
## It_is_important_to_honor_our_national_history_and_heritage 0.70
## My_country_should_try_to_influence_the_values_of_other_nations 0.56
## Race_is_a_social_construct 0.15
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.07
## Billionaires_should_pay_very_high_taxes -0.10
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.10
## Abortion_should_be_illegal 0.05
## Christianity_should_be_the_state_religion 0.21
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.06
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.14
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old -0.01
## Feminism_is_good_for_women 0.07
## MR3
## The_government_should_keep_regulations_on_business_to_a_minimum 0.20
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.03
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.28
## The_government_should_mandate_a_higher_minimum_wage 0.01
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick -0.07
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.04
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed -0.04
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.01
## I_think_that_the_United_Nations_should_have_more_political_power -0.04
## I_would_support_an_increase_in_immigration_to_my_country -0.23
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.00
## Military_spending_should_be_increased 0.20
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.11
## I_love_my_country -0.02
## It_is_important_to_honor_our_national_history_and_heritage 0.05
## My_country_should_try_to_influence_the_values_of_other_nations 0.07
## Race_is_a_social_construct -0.02
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal -0.09
## Billionaires_should_pay_very_high_taxes -0.07
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.14
## Abortion_should_be_illegal 0.57
## Christianity_should_be_the_state_religion 0.68
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.01
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.02
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.17
## Feminism_is_good_for_women -0.45
## MR4
## The_government_should_keep_regulations_on_business_to_a_minimum 0.12
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.05
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.02
## The_government_should_mandate_a_higher_minimum_wage -0.11
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.02
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.01
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.09
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.02
## I_think_that_the_United_Nations_should_have_more_political_power -0.04
## I_would_support_an_increase_in_immigration_to_my_country 0.09
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.09
## Military_spending_should_be_increased -0.01
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.10
## I_love_my_country -0.03
## It_is_important_to_honor_our_national_history_and_heritage -0.04
## My_country_should_try_to_influence_the_values_of_other_nations 0.14
## Race_is_a_social_construct 0.06
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.32
## Billionaires_should_pay_very_high_taxes 0.01
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.39
## Abortion_should_be_illegal -0.05
## Christianity_should_be_the_state_religion -0.08
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.42
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.50
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.22
## Feminism_is_good_for_women -0.10
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.426
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.670
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.397
## The_government_should_mandate_a_higher_minimum_wage 0.644
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.637
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.078
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.508
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.122
## I_think_that_the_United_Nations_should_have_more_political_power 0.408
## I_would_support_an_increase_in_immigration_to_my_country 0.417
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.399
## Military_spending_should_be_increased 0.445
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.122
## I_love_my_country 0.730
## It_is_important_to_honor_our_national_history_and_heritage 0.590
## My_country_should_try_to_influence_the_values_of_other_nations 0.266
## Race_is_a_social_construct 0.104
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.165
## Billionaires_should_pay_very_high_taxes 0.483
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.208
## Abortion_should_be_illegal 0.605
## Christianity_should_be_the_state_religion 0.569
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.250
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.378
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.066
## Feminism_is_good_for_women 0.509
## u2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.57
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.33
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.60
## The_government_should_mandate_a_higher_minimum_wage 0.36
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.36
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.92
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.49
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.88
## I_think_that_the_United_Nations_should_have_more_political_power 0.59
## I_would_support_an_increase_in_immigration_to_my_country 0.58
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.60
## Military_spending_should_be_increased 0.55
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.88
## I_love_my_country 0.27
## It_is_important_to_honor_our_national_history_and_heritage 0.41
## My_country_should_try_to_influence_the_values_of_other_nations 0.73
## Race_is_a_social_construct 0.90
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.83
## Billionaires_should_pay_very_high_taxes 0.52
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.79
## Abortion_should_be_illegal 0.40
## Christianity_should_be_the_state_religion 0.43
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.75
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.62
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.93
## Feminism_is_good_for_women 0.49
## com
## The_government_should_keep_regulations_on_business_to_a_minimum 1.8
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 1.1
## Large_companies_should_be_controlled_by_the_state_not_private_actors 1.5
## The_government_should_mandate_a_higher_minimum_wage 1.0
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 1.0
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 1.2
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 1.0
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 1.0
## I_think_that_the_United_Nations_should_have_more_political_power 1.1
## I_would_support_an_increase_in_immigration_to_my_country 1.5
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 1.1
## Military_spending_should_be_increased 1.5
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 2.7
## I_love_my_country 1.0
## It_is_important_to_honor_our_national_history_and_heritage 1.0
## My_country_should_try_to_influence_the_values_of_other_nations 1.5
## Race_is_a_social_construct 1.4
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 2.1
## Billionaires_should_pay_very_high_taxes 1.1
## We_should_use_nuclear_power_for_electricity_and_heat_generation 1.9
## Abortion_should_be_illegal 1.6
## Christianity_should_be_the_state_religion 1.3
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 1.8
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 1.5
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 2.1
## Feminism_is_good_for_women 2.1
##
## MR1 MR2 MR3 MR4
## SS loadings 5.52 2.25 1.56 0.86
## Proportion Var 0.21 0.09 0.06 0.03
## Cumulative Var 0.21 0.30 0.36 0.39
## Proportion Explained 0.54 0.22 0.15 0.08
## Cumulative Proportion 0.54 0.76 0.92 1.00
##
## With factor correlations of
## MR1 MR2 MR3 MR4
## MR1 1.00 -0.48 -0.38 0.06
## MR2 -0.48 1.00 0.32 -0.12
## MR3 -0.38 0.32 1.00 -0.14
## MR4 0.06 -0.12 -0.14 1.00
##
## Mean item complexity = 1.5
## Test of the hypothesis that 4 factors are sufficient.
##
## df null model = 325 with the objective function = 9.21 with Chi Square = 8724
## df of the model are 227 and the objective function was 0.82
##
## The root mean square of the residuals (RMSR) is 0.03
## The df corrected root mean square of the residuals is 0.04
##
## The harmonic n.obs is 958 with the empirical chi square 655 with prob < 4e-43
## The total n.obs was 958 with Likelihood Chi Square = 772 with prob < 1.4e-60
##
## Tucker Lewis Index of factoring reliability = 0.907
## RMSEA index = 0.05 and the 90 % confidence intervals are 0.046 0.054
## BIC = -786
## Fit based upon off diagonal values = 0.99
## Measures of factor score adequacy
## MR1 MR2 MR3 MR4
## Correlation of (regression) scores with factors 0.96 0.92 0.86 0.74
## Multiple R square of scores with factors 0.92 0.84 0.75 0.55
## Minimum correlation of possible factor scores 0.84 0.68 0.49 0.11
##
## [[5]]
## Factor Analysis using method = minres
## Call: fa(r = d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
## nfactors = x, rotate = "oblimin")
## Standardized loadings (pattern matrix) based upon correlation matrix
## MR1
## The_government_should_keep_regulations_on_business_to_a_minimum -0.44
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.75
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.59
## The_government_should_mandate_a_higher_minimum_wage 0.77
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.76
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.34
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.65
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.41
## I_think_that_the_United_Nations_should_have_more_political_power 0.63
## I_would_support_an_increase_in_immigration_to_my_country 0.44
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.55
## Military_spending_should_be_increased -0.13
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.18
## I_love_my_country -0.04
## It_is_important_to_honor_our_national_history_and_heritage -0.05
## My_country_should_try_to_influence_the_values_of_other_nations 0.19
## Race_is_a_social_construct 0.34
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.19
## Billionaires_should_pay_very_high_taxes 0.60
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.20
## Abortion_should_be_illegal -0.28
## Christianity_should_be_the_state_religion 0.11
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.25
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.19
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.05
## Feminism_is_good_for_women 0.40
## MR2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.14
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor -0.12
## Large_companies_should_be_controlled_by_the_state_not_private_actors -0.18
## The_government_should_mandate_a_higher_minimum_wage -0.05
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.00
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.02
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed -0.04
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.05
## I_think_that_the_United_Nations_should_have_more_political_power 0.06
## I_would_support_an_increase_in_immigration_to_my_country -0.06
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country -0.11
## Military_spending_should_be_increased 0.47
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.27
## I_love_my_country 0.84
## It_is_important_to_honor_our_national_history_and_heritage 0.74
## My_country_should_try_to_influence_the_values_of_other_nations 0.52
## Race_is_a_social_construct 0.13
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.04
## Billionaires_should_pay_very_high_taxes -0.09
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.10
## Abortion_should_be_illegal 0.04
## Christianity_should_be_the_state_religion 0.18
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.08
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.15
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old -0.04
## Feminism_is_good_for_women 0.05
## MR3
## The_government_should_keep_regulations_on_business_to_a_minimum 0.23
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor -0.01
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.26
## The_government_should_mandate_a_higher_minimum_wage -0.02
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick -0.11
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.02
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed -0.06
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.02
## I_think_that_the_United_Nations_should_have_more_political_power -0.03
## I_would_support_an_increase_in_immigration_to_my_country -0.25
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.01
## Military_spending_should_be_increased 0.22
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.12
## I_love_my_country -0.02
## It_is_important_to_honor_our_national_history_and_heritage 0.05
## My_country_should_try_to_influence_the_values_of_other_nations 0.08
## Race_is_a_social_construct -0.03
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal -0.09
## Billionaires_should_pay_very_high_taxes -0.11
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.14
## Abortion_should_be_illegal 0.59
## Christianity_should_be_the_state_religion 0.70
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.01
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.03
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.19
## Feminism_is_good_for_women -0.47
## MR4
## The_government_should_keep_regulations_on_business_to_a_minimum 0.12
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.05
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.02
## The_government_should_mandate_a_higher_minimum_wage -0.11
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.02
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.04
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.09
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.04
## I_think_that_the_United_Nations_should_have_more_political_power -0.05
## I_would_support_an_increase_in_immigration_to_my_country 0.09
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.09
## Military_spending_should_be_increased 0.00
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.11
## I_love_my_country -0.02
## It_is_important_to_honor_our_national_history_and_heritage -0.04
## My_country_should_try_to_influence_the_values_of_other_nations 0.14
## Race_is_a_social_construct 0.06
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.31
## Billionaires_should_pay_very_high_taxes 0.01
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.39
## Abortion_should_be_illegal -0.05
## Christianity_should_be_the_state_religion -0.08
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.44
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.50
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.22
## Feminism_is_good_for_women -0.10
## MR5
## The_government_should_keep_regulations_on_business_to_a_minimum 0.06
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor -0.05
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.02
## The_government_should_mandate_a_higher_minimum_wage -0.03
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick -0.11
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.45
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.00
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.36
## I_think_that_the_United_Nations_should_have_more_political_power 0.29
## I_would_support_an_increase_in_immigration_to_my_country 0.24
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.25
## Military_spending_should_be_increased 0.09
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.05
## I_love_my_country -0.01
## It_is_important_to_honor_our_national_history_and_heritage -0.07
## My_country_should_try_to_influence_the_values_of_other_nations 0.14
## Race_is_a_social_construct 0.04
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.10
## Billionaires_should_pay_very_high_taxes -0.10
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.01
## Abortion_should_be_illegal -0.01
## Christianity_should_be_the_state_religion 0.02
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.10
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.00
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.07
## Feminism_is_good_for_women 0.10
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.430
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.670
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.396
## The_government_should_mandate_a_higher_minimum_wage 0.643
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.659
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.294
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.505
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.269
## I_think_that_the_United_Nations_should_have_more_political_power 0.488
## I_would_support_an_increase_in_immigration_to_my_country 0.468
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.461
## Military_spending_should_be_increased 0.449
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.128
## I_love_my_country 0.740
## It_is_important_to_honor_our_national_history_and_heritage 0.616
## My_country_should_try_to_influence_the_values_of_other_nations 0.273
## Race_is_a_social_construct 0.104
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.171
## Billionaires_should_pay_very_high_taxes 0.496
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.207
## Abortion_should_be_illegal 0.603
## Christianity_should_be_the_state_religion 0.568
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.271
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.374
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.073
## Feminism_is_good_for_women 0.511
## u2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.57
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.33
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.60
## The_government_should_mandate_a_higher_minimum_wage 0.36
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.34
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.71
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.49
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.73
## I_think_that_the_United_Nations_should_have_more_political_power 0.51
## I_would_support_an_increase_in_immigration_to_my_country 0.53
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.54
## Military_spending_should_be_increased 0.55
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.87
## I_love_my_country 0.26
## It_is_important_to_honor_our_national_history_and_heritage 0.38
## My_country_should_try_to_influence_the_values_of_other_nations 0.73
## Race_is_a_social_construct 0.90
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.83
## Billionaires_should_pay_very_high_taxes 0.50
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.79
## Abortion_should_be_illegal 0.40
## Christianity_should_be_the_state_religion 0.43
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.73
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.63
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.93
## Feminism_is_good_for_women 0.49
## com
## The_government_should_keep_regulations_on_business_to_a_minimum 1.9
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 1.1
## Large_companies_should_be_controlled_by_the_state_not_private_actors 1.6
## The_government_should_mandate_a_higher_minimum_wage 1.1
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 1.1
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 1.9
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 1.1
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 2.0
## I_think_that_the_United_Nations_should_have_more_political_power 1.4
## I_would_support_an_increase_in_immigration_to_my_country 2.4
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 1.6
## Military_spending_should_be_increased 1.7
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 2.6
## I_love_my_country 1.0
## It_is_important_to_honor_our_national_history_and_heritage 1.0
## My_country_should_try_to_influence_the_values_of_other_nations 1.6
## Race_is_a_social_construct 1.4
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 2.1
## Billionaires_should_pay_very_high_taxes 1.2
## We_should_use_nuclear_power_for_electricity_and_heat_generation 1.9
## Abortion_should_be_illegal 1.4
## Christianity_should_be_the_state_religion 1.2
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 1.8
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 1.5
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 2.4
## Feminism_is_good_for_women 2.2
##
## MR1 MR2 MR3 MR4 MR5
## SS loadings 5.30 2.33 1.73 0.86 0.64
## Proportion Var 0.20 0.09 0.07 0.03 0.02
## Cumulative Var 0.20 0.29 0.36 0.39 0.42
## Proportion Explained 0.49 0.21 0.16 0.08 0.06
## Cumulative Proportion 0.49 0.70 0.86 0.94 1.00
##
## With factor correlations of
## MR1 MR2 MR3 MR4 MR5
## MR1 1.00 -0.46 -0.40 0.05 0.07
## MR2 -0.46 1.00 0.36 -0.11 0.03
## MR3 -0.40 0.36 1.00 -0.14 -0.02
## MR4 0.05 -0.11 -0.14 1.00 0.00
## MR5 0.07 0.03 -0.02 0.00 1.00
##
## Mean item complexity = 1.6
## Test of the hypothesis that 5 factors are sufficient.
##
## df null model = 325 with the objective function = 9.21 with Chi Square = 8724
## df of the model are 205 and the objective function was 0.57
##
## The root mean square of the residuals (RMSR) is 0.02
## The df corrected root mean square of the residuals is 0.03
##
## The harmonic n.obs is 958 with the empirical chi square 358 with prob < 2.2e-10
## The total n.obs was 958 with Likelihood Chi Square = 539 with prob < 8.6e-32
##
## Tucker Lewis Index of factoring reliability = 0.937
## RMSEA index = 0.041 and the 90 % confidence intervals are 0.037 0.046
## BIC = -869
## Fit based upon off diagonal values = 0.99
## Measures of factor score adequacy
## MR1 MR2 MR3 MR4 MR5
## Correlation of (regression) scores with factors 0.96 0.92 0.87 0.75 0.71
## Multiple R square of scores with factors 0.91 0.85 0.76 0.56 0.51
## Minimum correlation of possible factor scores 0.83 0.70 0.53 0.11 0.02
##
## [[6]]
## Factor Analysis using method = minres
## Call: fa(r = d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
## nfactors = x, rotate = "oblimin")
## Standardized loadings (pattern matrix) based upon correlation matrix
## MR1
## The_government_should_keep_regulations_on_business_to_a_minimum -0.46
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.78
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.51
## The_government_should_mandate_a_higher_minimum_wage 0.75
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.76
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.33
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.58
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.01
## I_think_that_the_United_Nations_should_have_more_political_power 0.14
## I_would_support_an_increase_in_immigration_to_my_country 0.09
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.13
## Military_spending_should_be_increased -0.29
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.03
## I_love_my_country -0.06
## It_is_important_to_honor_our_national_history_and_heritage 0.05
## My_country_should_try_to_influence_the_values_of_other_nations 0.01
## Race_is_a_social_construct 0.22
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.07
## Billionaires_should_pay_very_high_taxes 0.71
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.14
## Abortion_should_be_illegal -0.20
## Christianity_should_be_the_state_religion 0.07
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.05
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.15
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old -0.07
## Feminism_is_good_for_women 0.22
## MR2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.10
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor -0.07
## Large_companies_should_be_controlled_by_the_state_not_private_actors -0.17
## The_government_should_mandate_a_higher_minimum_wage -0.01
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.05
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.01
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed -0.01
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.00
## I_think_that_the_United_Nations_should_have_more_political_power 0.00
## I_would_support_an_increase_in_immigration_to_my_country -0.10
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country -0.17
## Military_spending_should_be_increased 0.42
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.31
## I_love_my_country 0.83
## It_is_important_to_honor_our_national_history_and_heritage 0.75
## My_country_should_try_to_influence_the_values_of_other_nations 0.49
## Race_is_a_social_construct 0.12
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.03
## Billionaires_should_pay_very_high_taxes -0.03
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.10
## Abortion_should_be_illegal 0.02
## Christianity_should_be_the_state_religion 0.16
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.11
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.15
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old -0.07
## Feminism_is_good_for_women 0.06
## MR5
## The_government_should_keep_regulations_on_business_to_a_minimum 0.22
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.03
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.28
## The_government_should_mandate_a_higher_minimum_wage 0.00
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick -0.08
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.04
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed -0.05
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.00
## I_think_that_the_United_Nations_should_have_more_political_power -0.05
## I_would_support_an_increase_in_immigration_to_my_country -0.26
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country -0.01
## Military_spending_should_be_increased 0.21
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.11
## I_love_my_country -0.01
## It_is_important_to_honor_our_national_history_and_heritage 0.06
## My_country_should_try_to_influence_the_values_of_other_nations 0.08
## Race_is_a_social_construct -0.02
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal -0.09
## Billionaires_should_pay_very_high_taxes -0.08
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.14
## Abortion_should_be_illegal 0.59
## Christianity_should_be_the_state_religion 0.70
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.00
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.03
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.18
## Feminism_is_good_for_women -0.48
## MR6
## The_government_should_keep_regulations_on_business_to_a_minimum -0.01
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.04
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.14
## The_government_should_mandate_a_higher_minimum_wage 0.07
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.03
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.19
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.13
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.00
## I_think_that_the_United_Nations_should_have_more_political_power 0.61
## I_would_support_an_increase_in_immigration_to_my_country 0.45
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.51
## Military_spending_should_be_increased 0.15
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.19
## I_love_my_country 0.00
## It_is_important_to_honor_our_national_history_and_heritage -0.12
## My_country_should_try_to_influence_the_values_of_other_nations 0.24
## Race_is_a_social_construct 0.15
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.18
## Billionaires_should_pay_very_high_taxes -0.06
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.04
## Abortion_should_be_illegal -0.12
## Christianity_should_be_the_state_religion 0.03
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.20
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.08
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.14
## Feminism_is_good_for_women 0.24
## MR4
## The_government_should_keep_regulations_on_business_to_a_minimum 0.02
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.00
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.00
## The_government_should_mandate_a_higher_minimum_wage -0.01
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick -0.07
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.30
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed -0.04
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 1.00
## I_think_that_the_United_Nations_should_have_more_political_power -0.03
## I_would_support_an_increase_in_immigration_to_my_country -0.02
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country -0.05
## Military_spending_should_be_increased -0.01
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.08
## I_love_my_country 0.00
## It_is_important_to_honor_our_national_history_and_heritage 0.02
## My_country_should_try_to_influence_the_values_of_other_nations 0.02
## Race_is_a_social_construct -0.03
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.00
## Billionaires_should_pay_very_high_taxes 0.00
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.00
## Abortion_should_be_illegal 0.04
## Christianity_should_be_the_state_religion 0.02
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.03
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.03
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old -0.02
## Feminism_is_good_for_women -0.02
## MR3
## The_government_should_keep_regulations_on_business_to_a_minimum 0.12
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.05
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.02
## The_government_should_mandate_a_higher_minimum_wage -0.11
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.02
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.02
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.08
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.00
## I_think_that_the_United_Nations_should_have_more_political_power -0.08
## I_would_support_an_increase_in_immigration_to_my_country 0.07
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.07
## Military_spending_should_be_increased -0.01
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.13
## I_love_my_country -0.02
## It_is_important_to_honor_our_national_history_and_heritage -0.02
## My_country_should_try_to_influence_the_values_of_other_nations 0.14
## Race_is_a_social_construct 0.05
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.30
## Billionaires_should_pay_very_high_taxes 0.02
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.39
## Abortion_should_be_illegal -0.04
## Christianity_should_be_the_state_religion -0.08
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.45
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.49
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.21
## Feminism_is_good_for_women -0.12
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.434
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.699
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.399
## The_government_should_mandate_a_higher_minimum_wage 0.661
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.666
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.197
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.508
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.995
## I_think_that_the_United_Nations_should_have_more_political_power 0.532
## I_would_support_an_increase_in_immigration_to_my_country 0.482
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.484
## Military_spending_should_be_increased 0.459
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.147
## I_love_my_country 0.735
## It_is_important_to_honor_our_national_history_and_heritage 0.629
## My_country_should_try_to_influence_the_values_of_other_nations 0.272
## Race_is_a_social_construct 0.103
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.169
## Billionaires_should_pay_very_high_taxes 0.526
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.206
## Abortion_should_be_illegal 0.602
## Christianity_should_be_the_state_religion 0.566
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.281
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.370
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.077
## Feminism_is_good_for_women 0.514
## u2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.5663
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.3012
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.6005
## The_government_should_mandate_a_higher_minimum_wage 0.3386
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.3341
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.8028
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.4924
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.0049
## I_think_that_the_United_Nations_should_have_more_political_power 0.4678
## I_would_support_an_increase_in_immigration_to_my_country 0.5183
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.5157
## Military_spending_should_be_increased 0.5405
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.8526
## I_love_my_country 0.2654
## It_is_important_to_honor_our_national_history_and_heritage 0.3713
## My_country_should_try_to_influence_the_values_of_other_nations 0.7277
## Race_is_a_social_construct 0.8972
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.8312
## Billionaires_should_pay_very_high_taxes 0.4744
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.7937
## Abortion_should_be_illegal 0.3977
## Christianity_should_be_the_state_religion 0.4339
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.7189
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.6296
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.9232
## Feminism_is_good_for_women 0.4859
## com
## The_government_should_keep_regulations_on_business_to_a_minimum 1.7
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 1.0
## Large_companies_should_be_controlled_by_the_state_not_private_actors 2.0
## The_government_should_mandate_a_higher_minimum_wage 1.1
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 1.0
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 2.7
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 1.2
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 1.0
## I_think_that_the_United_Nations_should_have_more_political_power 1.2
## I_would_support_an_increase_in_immigration_to_my_country 1.9
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 1.4
## Military_spending_should_be_increased 2.6
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 2.5
## I_love_my_country 1.0
## It_is_important_to_honor_our_national_history_and_heritage 1.1
## My_country_should_try_to_influence_the_values_of_other_nations 1.7
## Race_is_a_social_construct 2.6
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 2.0
## Billionaires_should_pay_very_high_taxes 1.0
## We_should_use_nuclear_power_for_electricity_and_heat_generation 1.7
## Abortion_should_be_illegal 1.3
## Christianity_should_be_the_state_religion 1.2
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 1.5
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 1.5
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 3.3
## Feminism_is_good_for_women 2.1
##
## MR1 MR2 MR5 MR6 MR4 MR3
## SS loadings 4.15 2.21 1.68 1.62 1.21 0.85
## Proportion Var 0.16 0.09 0.06 0.06 0.05 0.03
## Cumulative Var 0.16 0.24 0.31 0.37 0.42 0.45
## Proportion Explained 0.35 0.19 0.14 0.14 0.10 0.07
## Cumulative Proportion 0.35 0.54 0.69 0.82 0.93 1.00
##
## With factor correlations of
## MR1 MR2 MR5 MR6 MR4 MR3
## MR1 1.00 -0.50 -0.41 0.62 -0.35 0.00
## MR2 -0.50 1.00 0.38 -0.24 0.16 -0.09
## MR5 -0.41 0.38 1.00 -0.24 0.15 -0.12
## MR6 0.62 -0.24 -0.24 1.00 -0.14 0.00
## MR4 -0.35 0.16 0.15 -0.14 1.00 -0.03
## MR3 0.00 -0.09 -0.12 0.00 -0.03 1.00
##
## Mean item complexity = 1.7
## Test of the hypothesis that 6 factors are sufficient.
##
## df null model = 325 with the objective function = 9.21 with Chi Square = 8724
## df of the model are 184 and the objective function was 0.45
##
## The root mean square of the residuals (RMSR) is 0.02
## The df corrected root mean square of the residuals is 0.03
##
## The harmonic n.obs is 958 with the empirical chi square 263 with prob < 0.00012
## The total n.obs was 958 with Likelihood Chi Square = 425 with prob < 3.9e-21
##
## Tucker Lewis Index of factoring reliability = 0.949
## RMSEA index = 0.037 and the 90 % confidence intervals are 0.032 0.042
## BIC = -838
## Fit based upon off diagonal values = 0.99
## Measures of factor score adequacy
## MR1 MR2 MR5 MR6 MR4 MR3
## Correlation of (regression) scores with factors 0.95 0.92 0.87 0.86 1.00 0.75
## Multiple R square of scores with factors 0.91 0.85 0.76 0.75 1.00 0.56
## Minimum correlation of possible factor scores 0.82 0.69 0.53 0.49 0.99 0.11
##
## [[7]]
## Factor Analysis using method = minres
## Call: fa(r = d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
## nfactors = x, rotate = "oblimin")
## Standardized loadings (pattern matrix) based upon correlation matrix
## MR1
## The_government_should_keep_regulations_on_business_to_a_minimum -0.37
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.76
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.46
## The_government_should_mandate_a_higher_minimum_wage 0.77
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.77
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.01
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.61
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.27
## I_think_that_the_United_Nations_should_have_more_political_power 0.08
## I_would_support_an_increase_in_immigration_to_my_country 0.05
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.16
## Military_spending_should_be_increased -0.29
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.00
## I_love_my_country -0.05
## It_is_important_to_honor_our_national_history_and_heritage 0.05
## My_country_should_try_to_influence_the_values_of_other_nations -0.02
## Race_is_a_social_construct 0.21
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.09
## Billionaires_should_pay_very_high_taxes 0.64
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.13
## Abortion_should_be_illegal -0.14
## Christianity_should_be_the_state_religion 0.13
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.08
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.17
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old -0.05
## Feminism_is_good_for_women 0.12
## MR2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.12
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor -0.08
## Large_companies_should_be_controlled_by_the_state_not_private_actors -0.18
## The_government_should_mandate_a_higher_minimum_wage -0.01
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.05
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.00
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed -0.01
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.02
## I_think_that_the_United_Nations_should_have_more_political_power 0.00
## I_would_support_an_increase_in_immigration_to_my_country -0.10
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country -0.16
## Military_spending_should_be_increased 0.44
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.29
## I_love_my_country 0.83
## It_is_important_to_honor_our_national_history_and_heritage 0.75
## My_country_should_try_to_influence_the_values_of_other_nations 0.48
## Race_is_a_social_construct 0.12
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.03
## Billionaires_should_pay_very_high_taxes -0.05
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.10
## Abortion_should_be_illegal 0.00
## Christianity_should_be_the_state_religion 0.16
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.09
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.15
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old -0.07
## Feminism_is_good_for_women 0.05
## MR6
## The_government_should_keep_regulations_on_business_to_a_minimum -0.12
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.07
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.12
## The_government_should_mandate_a_higher_minimum_wage 0.04
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick -0.02
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.00
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.16
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.04
## I_think_that_the_United_Nations_should_have_more_political_power 0.66
## I_would_support_an_increase_in_immigration_to_my_country 0.55
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.50
## Military_spending_should_be_increased 0.07
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.13
## I_love_my_country -0.01
## It_is_important_to_honor_our_national_history_and_heritage -0.11
## My_country_should_try_to_influence_the_values_of_other_nations 0.26
## Race_is_a_social_construct 0.20
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.13
## Billionaires_should_pay_very_high_taxes 0.00
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.00
## Abortion_should_be_illegal -0.05
## Christianity_should_be_the_state_religion -0.01
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.14
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.04
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.02
## Feminism_is_good_for_women 0.39
## MR7
## The_government_should_keep_regulations_on_business_to_a_minimum 0.13
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.04
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.16
## The_government_should_mandate_a_higher_minimum_wage -0.02
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick -0.16
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old -0.01
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.03
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.07
## I_think_that_the_United_Nations_should_have_more_political_power -0.03
## I_would_support_an_increase_in_immigration_to_my_country -0.12
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.02
## Military_spending_should_be_increased 0.04
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.03
## I_love_my_country 0.00
## It_is_important_to_honor_our_national_history_and_heritage 0.07
## My_country_should_try_to_influence_the_values_of_other_nations 0.08
## Race_is_a_social_construct 0.06
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal -0.17
## Billionaires_should_pay_very_high_taxes -0.06
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.06
## Abortion_should_be_illegal 0.78
## Christianity_should_be_the_state_religion 0.64
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.06
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.11
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old -0.04
## Feminism_is_good_for_women -0.31
## MR3
## The_government_should_keep_regulations_on_business_to_a_minimum 0.06
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor -0.02
## Large_companies_should_be_controlled_by_the_state_not_private_actors -0.05
## The_government_should_mandate_a_higher_minimum_wage 0.01
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick -0.04
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 1.00
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.00
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.30
## I_think_that_the_United_Nations_should_have_more_political_power -0.03
## I_would_support_an_increase_in_immigration_to_my_country 0.00
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.01
## Military_spending_should_be_increased 0.00
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.03
## I_love_my_country 0.01
## It_is_important_to_honor_our_national_history_and_heritage 0.01
## My_country_should_try_to_influence_the_values_of_other_nations 0.01
## Race_is_a_social_construct -0.02
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.04
## Billionaires_should_pay_very_high_taxes -0.04
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.01
## Abortion_should_be_illegal 0.00
## Christianity_should_be_the_state_religion 0.02
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.03
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults -0.02
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.01
## Feminism_is_good_for_women -0.04
## MR4
## The_government_should_keep_regulations_on_business_to_a_minimum 0.09
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.05
## Large_companies_should_be_controlled_by_the_state_not_private_actors -0.03
## The_government_should_mandate_a_higher_minimum_wage -0.12
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.00
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.00
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.11
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.00
## I_think_that_the_United_Nations_should_have_more_political_power -0.11
## I_would_support_an_increase_in_immigration_to_my_country 0.10
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.05
## Military_spending_should_be_increased -0.08
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.16
## I_love_my_country -0.01
## It_is_important_to_honor_our_national_history_and_heritage -0.01
## My_country_should_try_to_influence_the_values_of_other_nations 0.13
## Race_is_a_social_construct 0.07
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.27
## Billionaires_should_pay_very_high_taxes 0.02
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.43
## Abortion_should_be_illegal 0.01
## Christianity_should_be_the_state_religion -0.09
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.48
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.45
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.14
## Feminism_is_good_for_women -0.07
## MR5
## The_government_should_keep_regulations_on_business_to_a_minimum 0.16
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor -0.02
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.18
## The_government_should_mandate_a_higher_minimum_wage 0.00
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.06
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.00
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed -0.08
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.04
## I_think_that_the_United_Nations_should_have_more_political_power 0.07
## I_would_support_an_increase_in_immigration_to_my_country -0.11
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.07
## Military_spending_should_be_increased 0.27
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country -0.12
## I_love_my_country -0.01
## It_is_important_to_honor_our_national_history_and_heritage -0.03
## My_country_should_try_to_influence_the_values_of_other_nations 0.07
## Race_is_a_social_construct -0.07
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.15
## Billionaires_should_pay_very_high_taxes -0.06
## We_should_use_nuclear_power_for_electricity_and_heat_generation -0.06
## Abortion_should_be_illegal -0.07
## Christianity_should_be_the_state_religion 0.14
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people -0.04
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.15
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.36
## Feminism_is_good_for_women -0.24
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.43
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.70
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.40
## The_government_should_mandate_a_higher_minimum_wage 0.67
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.69
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 1.00
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.53
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.21
## I_think_that_the_United_Nations_should_have_more_political_power 0.55
## I_would_support_an_increase_in_immigration_to_my_country 0.51
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.48
## Military_spending_should_be_increased 0.51
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.15
## I_love_my_country 0.73
## It_is_important_to_honor_our_national_history_and_heritage 0.63
## My_country_should_try_to_influence_the_values_of_other_nations 0.27
## Race_is_a_social_construct 0.11
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.18
## Billionaires_should_pay_very_high_taxes 0.51
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.22
## Abortion_should_be_illegal 0.75
## Christianity_should_be_the_state_religion 0.55
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.30
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.37
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.14
## Feminism_is_good_for_women 0.53
## u2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.5692
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.3043
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.6043
## The_government_should_mandate_a_higher_minimum_wage 0.3258
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.3086
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.0034
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.4727
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.7890
## I_think_that_the_United_Nations_should_have_more_political_power 0.4549
## I_would_support_an_increase_in_immigration_to_my_country 0.4937
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.5238
## Military_spending_should_be_increased 0.4905
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.8531
## I_love_my_country 0.2682
## It_is_important_to_honor_our_national_history_and_heritage 0.3724
## My_country_should_try_to_influence_the_values_of_other_nations 0.7263
## Race_is_a_social_construct 0.8864
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.8225
## Billionaires_should_pay_very_high_taxes 0.4888
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.7787
## Abortion_should_be_illegal 0.2542
## Christianity_should_be_the_state_religion 0.4526
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.7035
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.6326
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.8569
## Feminism_is_good_for_women 0.4702
## com
## The_government_should_keep_regulations_on_business_to_a_minimum 2.4
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 1.1
## Large_companies_should_be_controlled_by_the_state_not_private_actors 2.1
## The_government_should_mandate_a_higher_minimum_wage 1.1
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 1.1
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 1.0
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 1.2
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 2.2
## I_think_that_the_United_Nations_should_have_more_political_power 1.1
## I_would_support_an_increase_in_immigration_to_my_country 1.3
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 1.5
## Military_spending_should_be_increased 2.6
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 2.4
## I_love_my_country 1.0
## It_is_important_to_honor_our_national_history_and_heritage 1.1
## My_country_should_try_to_influence_the_values_of_other_nations 1.8
## Race_is_a_social_construct 3.2
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 3.2
## Billionaires_should_pay_very_high_taxes 1.1
## We_should_use_nuclear_power_for_electricity_and_heat_generation 1.4
## Abortion_should_be_illegal 1.1
## Christianity_should_be_the_state_religion 1.4
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 1.4
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 1.9
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 1.5
## Feminism_is_good_for_women 3.1
##
## MR1 MR2 MR6 MR7 MR3 MR4 MR5
## SS loadings 3.91 2.21 1.86 1.60 1.18 0.85 0.49
## Proportion Var 0.15 0.09 0.07 0.06 0.05 0.03 0.02
## Cumulative Var 0.15 0.24 0.31 0.37 0.41 0.45 0.47
## Proportion Explained 0.32 0.18 0.15 0.13 0.10 0.07 0.04
## Cumulative Proportion 0.32 0.51 0.66 0.79 0.89 0.96 1.00
##
## With factor correlations of
## MR1 MR2 MR6 MR7 MR3 MR4 MR5
## MR1 1.00 -0.48 0.67 -0.47 -0.29 -0.03 -0.03
## MR2 -0.48 1.00 -0.30 0.39 0.15 -0.09 0.15
## MR6 0.67 -0.30 1.00 -0.39 -0.10 0.00 0.02
## MR7 -0.47 0.39 -0.39 1.00 0.13 -0.15 0.29
## MR3 -0.29 0.15 -0.10 0.13 1.00 -0.02 0.02
## MR4 -0.03 -0.09 0.00 -0.15 -0.02 1.00 -0.03
## MR5 -0.03 0.15 0.02 0.29 0.02 -0.03 1.00
##
## Mean item complexity = 1.7
## Test of the hypothesis that 7 factors are sufficient.
##
## df null model = 325 with the objective function = 9.21 with Chi Square = 8724
## df of the model are 164 and the objective function was 0.35
##
## The root mean square of the residuals (RMSR) is 0.02
## The df corrected root mean square of the residuals is 0.03
##
## The harmonic n.obs is 958 with the empirical chi square 197 with prob < 0.041
## The total n.obs was 958 with Likelihood Chi Square = 328 with prob < 5.5e-13
##
## Tucker Lewis Index of factoring reliability = 0.961
## RMSEA index = 0.032 and the 90 % confidence intervals are 0.027 0.037
## BIC = -798
## Fit based upon off diagonal values = 1
## Measures of factor score adequacy
## MR1 MR2 MR6 MR7 MR3 MR4
## Correlation of (regression) scores with factors 0.95 0.92 0.88 0.90 1.00 0.75
## Multiple R square of scores with factors 0.91 0.85 0.78 0.81 1.00 0.56
## Minimum correlation of possible factor scores 0.82 0.69 0.57 0.62 0.99 0.12
## MR5
## Correlation of (regression) scores with factors 0.68
## Multiple R square of scores with factors 0.46
## Minimum correlation of possible factor scores -0.08
#plot loadings
plot_fa(fa_pol_multi[[1]])
plot_fa(fa_pol_multi[[2]])
plot_fa(fa_pol_multi[[3]])
plot_fa(fa_pol_multi[[4]])
plot_fa(fa_pol_multi[[5]])
plot_fa(fa_pol_multi[[6]])
## Warning: Removed 1 row containing missing values or values outside the scale range
## (`geom_point()`).
plot_fa(fa_pol_multi[[7]])
## Warning: Removed 1 row containing missing values or values outside the scale range
## (`geom_point()`).
#try to name factors and save to main
d %<>% mutate(
fa1_globalist_socialism = fa_pol_multi[[1]]$scores[, 1],
fa2_globalist_socialism = fa_pol_multi[[2]]$scores[, 1],
fa2_christian_nationalism = fa_pol_multi[[2]]$scores[, 2],
fa3_globalist_socialism = fa_pol_multi[[3]]$scores[, 1],
fa3_america_first_nationalism = fa_pol_multi[[3]]$scores[, 2],
fa3_techno_progressivism = fa_pol_multi[[3]]$scores[, 3],
fa4_globalist_socialism = fa_pol_multi[[4]]$scores[, 1],
fa4_america_first_nationalism = fa_pol_multi[[4]]$scores[, 2],
fa4_christianity = fa_pol_multi[[4]]$scores[, 3],
fa4_techno_libertarianism = fa_pol_multi[[4]]$scores[, 4],
fa5_globalist_socialism = fa_pol_multi[[5]]$scores[, 1],
fa5_america_first_nationalism = fa_pol_multi[[5]]$scores[, 2],
fa5_techno_libertarianism = fa_pol_multi[[5]]$scores[, 4], #BEWARE THEY CHANGED POSITIONS!!
fa5_christianity = fa_pol_multi[[5]]$scores[, 3], #BEWARE THEY CHANGED POSITIONS!!
fa5_not_govt_responsibility = fa_pol_multi[[5]]$scores[, 5]
)
#correlations
d %>%
select(sex, age, IQ, fa1_globalist_socialism, fa2_globalist_socialism:fa5_not_govt_responsibility) %>%
mutate(male = sex == "Male") %>%
select(-sex) %>%
select(IQ, age, male, everything()) %>%
mixedCor() %>%
.$rho %>%
GG_heatmap(reorder_vars = T, font_size = 2.5)
GG_save("figs/political_dimensions_correlations.png")
#reliability
alpha(
d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
check.keys=TRUE
)
## Warning in alpha(d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women), : Some items were negatively correlated with the first principal component and were automatically reversed.
## This is indicated by a negative sign for the variable name.
##
## Reliability analysis
## Call: alpha(x = d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
## check.keys = TRUE)
##
## raw_alpha std.alpha G6(smc) average_r S/N ase mean sd median_r
## 0.88 0.88 0.9 0.22 7.5 0.0052 3.3 0.59 0.19
##
## 95% confidence boundaries
## lower alpha upper
## Feldt 0.87 0.88 0.89
## Duhachek 0.87 0.88 0.89
##
## Reliability if an item is dropped:
## raw_alpha
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.88
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.87
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.88
## The_government_should_mandate_a_higher_minimum_wage 0.87
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.87
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.89
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.87
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.88
## I_think_that_the_United_Nations_should_have_more_political_power 0.88
## I_would_support_an_increase_in_immigration_to_my_country 0.88
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.88
## Military_spending_should_be_increased- 0.88
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.88
## I_love_my_country- 0.88
## It_is_important_to_honor_our_national_history_and_heritage- 0.88
## My_country_should_try_to_influence_the_values_of_other_nations- 0.89
## Race_is_a_social_construct 0.89
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.89
## Billionaires_should_pay_very_high_taxes 0.88
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.89
## Abortion_should_be_illegal- 0.88
## Christianity_should_be_the_state_religion- 0.88
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.89
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.88
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.89
## Feminism_is_good_for_women 0.88
## std.alpha
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.87
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.87
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.88
## The_government_should_mandate_a_higher_minimum_wage 0.87
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.87
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.88
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.87
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.88
## I_think_that_the_United_Nations_should_have_more_political_power 0.88
## I_would_support_an_increase_in_immigration_to_my_country 0.87
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.88
## Military_spending_should_be_increased- 0.88
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.88
## I_love_my_country- 0.88
## It_is_important_to_honor_our_national_history_and_heritage- 0.88
## My_country_should_try_to_influence_the_values_of_other_nations- 0.88
## Race_is_a_social_construct 0.88
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.88
## Billionaires_should_pay_very_high_taxes 0.87
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.89
## Abortion_should_be_illegal- 0.87
## Christianity_should_be_the_state_religion- 0.88
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.88
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.88
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.89
## Feminism_is_good_for_women 0.87
## G6(smc)
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.90
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.89
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.90
## The_government_should_mandate_a_higher_minimum_wage 0.89
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.89
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.90
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.90
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.90
## I_think_that_the_United_Nations_should_have_more_political_power 0.90
## I_would_support_an_increase_in_immigration_to_my_country 0.90
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.90
## Military_spending_should_be_increased- 0.90
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.90
## I_love_my_country- 0.90
## It_is_important_to_honor_our_national_history_and_heritage- 0.90
## My_country_should_try_to_influence_the_values_of_other_nations- 0.91
## Race_is_a_social_construct 0.91
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.91
## Billionaires_should_pay_very_high_taxes 0.90
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.91
## Abortion_should_be_illegal- 0.90
## Christianity_should_be_the_state_religion- 0.90
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.90
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.90
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.91
## Feminism_is_good_for_women 0.90
## average_r
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.22
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.21
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.22
## The_government_should_mandate_a_higher_minimum_wage 0.21
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.21
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.23
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.22
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.23
## I_think_that_the_United_Nations_should_have_more_political_power 0.22
## I_would_support_an_increase_in_immigration_to_my_country 0.22
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.22
## Military_spending_should_be_increased- 0.22
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.23
## I_love_my_country- 0.22
## It_is_important_to_honor_our_national_history_and_heritage- 0.22
## My_country_should_try_to_influence_the_values_of_other_nations- 0.23
## Race_is_a_social_construct 0.23
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.23
## Billionaires_should_pay_very_high_taxes 0.22
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.24
## Abortion_should_be_illegal- 0.22
## Christianity_should_be_the_state_religion- 0.23
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.23
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.23
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.24
## Feminism_is_good_for_women 0.22
## S/N
## The_government_should_keep_regulations_on_business_to_a_minimum- 6.9
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 6.7
## Large_companies_should_be_controlled_by_the_state_not_private_actors 7.1
## The_government_should_mandate_a_higher_minimum_wage 6.8
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 6.8
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 7.5
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 6.9
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 7.4
## I_think_that_the_United_Nations_should_have_more_political_power 7.1
## I_would_support_an_increase_in_immigration_to_my_country 7.0
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 7.0
## Military_spending_should_be_increased- 7.0
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 7.5
## I_love_my_country- 7.0
## It_is_important_to_honor_our_national_history_and_heritage- 7.0
## My_country_should_try_to_influence_the_values_of_other_nations- 7.6
## Race_is_a_social_construct 7.6
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 7.6
## Billionaires_should_pay_very_high_taxes 6.9
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 7.8
## Abortion_should_be_illegal- 6.9
## Christianity_should_be_the_state_religion- 7.3
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 7.6
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 7.4
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 8.0
## Feminism_is_good_for_women 7.0
## alpha se
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.0055
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.0057
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.0054
## The_government_should_mandate_a_higher_minimum_wage 0.0057
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.0057
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.0051
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.0056
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.0052
## I_think_that_the_United_Nations_should_have_more_political_power 0.0054
## I_would_support_an_increase_in_immigration_to_my_country 0.0055
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.0055
## Military_spending_should_be_increased- 0.0054
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.0052
## I_love_my_country- 0.0055
## It_is_important_to_honor_our_national_history_and_heritage- 0.0054
## My_country_should_try_to_influence_the_values_of_other_nations- 0.0051
## Race_is_a_social_construct 0.0051
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.0051
## Billionaires_should_pay_very_high_taxes 0.0056
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.0050
## Abortion_should_be_illegal- 0.0056
## Christianity_should_be_the_state_religion- 0.0053
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.0051
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.0052
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.0050
## Feminism_is_good_for_women 0.0055
## var.r
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.028
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.026
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.029
## The_government_should_mandate_a_higher_minimum_wage 0.026
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.026
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.029
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.027
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.029
## I_think_that_the_United_Nations_should_have_more_political_power 0.028
## I_would_support_an_increase_in_immigration_to_my_country 0.028
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.028
## Military_spending_should_be_increased- 0.028
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.029
## I_love_my_country- 0.028
## It_is_important_to_honor_our_national_history_and_heritage- 0.028
## My_country_should_try_to_influence_the_values_of_other_nations- 0.028
## Race_is_a_social_construct 0.029
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.028
## Billionaires_should_pay_very_high_taxes 0.027
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.027
## Abortion_should_be_illegal- 0.028
## Christianity_should_be_the_state_religion- 0.029
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.029
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.029
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.026
## Feminism_is_good_for_women 0.028
## med.r
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.19
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.19
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.19
## The_government_should_mandate_a_higher_minimum_wage 0.19
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.19
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.21
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.19
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.20
## I_think_that_the_United_Nations_should_have_more_political_power 0.19
## I_would_support_an_increase_in_immigration_to_my_country 0.19
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.19
## Military_spending_should_be_increased- 0.19
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.21
## I_love_my_country- 0.19
## It_is_important_to_honor_our_national_history_and_heritage- 0.19
## My_country_should_try_to_influence_the_values_of_other_nations- 0.21
## Race_is_a_social_construct 0.21
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.21
## Billionaires_should_pay_very_high_taxes 0.19
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.21
## Abortion_should_be_illegal- 0.19
## Christianity_should_be_the_state_religion- 0.20
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.21
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.19
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.21
## Feminism_is_good_for_women 0.19
##
## Item statistics
## n
## The_government_should_keep_regulations_on_business_to_a_minimum- 958
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 958
## Large_companies_should_be_controlled_by_the_state_not_private_actors 958
## The_government_should_mandate_a_higher_minimum_wage 958
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 958
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 958
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 958
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 958
## I_think_that_the_United_Nations_should_have_more_political_power 958
## I_would_support_an_increase_in_immigration_to_my_country 958
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 958
## Military_spending_should_be_increased- 958
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 958
## I_love_my_country- 958
## It_is_important_to_honor_our_national_history_and_heritage- 958
## My_country_should_try_to_influence_the_values_of_other_nations- 958
## Race_is_a_social_construct 958
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 958
## Billionaires_should_pay_very_high_taxes 958
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 958
## Abortion_should_be_illegal- 958
## Christianity_should_be_the_state_religion- 958
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 958
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 958
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 958
## Feminism_is_good_for_women 958
## raw.r
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.65
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.78
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.54
## The_government_should_mandate_a_higher_minimum_wage 0.75
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.76
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.34
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.69
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.41
## I_think_that_the_United_Nations_should_have_more_political_power 0.59
## I_would_support_an_increase_in_immigration_to_my_country 0.63
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.62
## Military_spending_should_be_increased- 0.59
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.33
## I_love_my_country- 0.61
## It_is_important_to_honor_our_national_history_and_heritage- 0.60
## My_country_should_try_to_influence_the_values_of_other_nations- 0.26
## Race_is_a_social_construct 0.31
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.28
## Billionaires_should_pay_very_high_taxes 0.69
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.19
## Abortion_should_be_illegal- 0.66
## Christianity_should_be_the_state_religion- 0.46
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.29
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.39
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.05
## Feminism_is_good_for_women 0.63
## std.r
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.652
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.775
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.541
## The_government_should_mandate_a_higher_minimum_wage 0.745
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.761
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.327
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.684
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.397
## I_think_that_the_United_Nations_should_have_more_political_power 0.587
## I_would_support_an_increase_in_immigration_to_my_country 0.625
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.618
## Military_spending_should_be_increased- 0.600
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.336
## I_love_my_country- 0.619
## It_is_important_to_honor_our_national_history_and_heritage- 0.606
## My_country_should_try_to_influence_the_values_of_other_nations- 0.270
## Race_is_a_social_construct 0.303
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.278
## Billionaires_should_pay_very_high_taxes 0.691
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.188
## Abortion_should_be_illegal- 0.651
## Christianity_should_be_the_state_religion- 0.466
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.298
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.377
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.075
## Feminism_is_good_for_women 0.628
## r.cor
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.6388
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.7859
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.5168
## The_government_should_mandate_a_higher_minimum_wage 0.7517
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.7706
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.2797
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.6798
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.3548
## I_think_that_the_United_Nations_should_have_more_political_power 0.5704
## I_would_support_an_increase_in_immigration_to_my_country 0.6116
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.6038
## Military_spending_should_be_increased- 0.5847
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.2848
## I_love_my_country- 0.6178
## It_is_important_to_honor_our_national_history_and_heritage- 0.6002
## My_country_should_try_to_influence_the_values_of_other_nations- 0.2217
## Race_is_a_social_construct 0.2466
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.2236
## Billionaires_should_pay_very_high_taxes 0.6858
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.1296
## Abortion_should_be_illegal- 0.6482
## Christianity_should_be_the_state_religion- 0.4444
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.2482
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.3358
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.0043
## Feminism_is_good_for_women 0.6153
## r.drop
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.6037
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.7433
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.4857
## The_government_should_mandate_a_higher_minimum_wage 0.7095
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.7311
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.2583
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.6437
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.3356
## I_think_that_the_United_Nations_should_have_more_political_power 0.5362
## I_would_support_an_increase_in_immigration_to_my_country 0.5769
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.5700
## Military_spending_should_be_increased- 0.5412
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.2635
## I_love_my_country- 0.5624
## It_is_important_to_honor_our_national_history_and_heritage- 0.5501
## My_country_should_try_to_influence_the_values_of_other_nations- 0.1925
## Race_is_a_social_construct 0.2333
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.2102
## Billionaires_should_pay_very_high_taxes 0.6495
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.1103
## Abortion_should_be_illegal- 0.6039
## Christianity_should_be_the_state_religion- 0.4046
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.2197
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.3122
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- -0.0029
## Feminism_is_good_for_women 0.5794
## mean
## The_government_should_keep_regulations_on_business_to_a_minimum- 3.2
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 3.6
## Large_companies_should_be_controlled_by_the_state_not_private_actors 2.6
## The_government_should_mandate_a_higher_minimum_wage 3.9
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 4.1
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 3.6
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 3.4
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 3.3
## I_think_that_the_United_Nations_should_have_more_political_power 2.7
## I_would_support_an_increase_in_immigration_to_my_country 2.9
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 3.2
## Military_spending_should_be_increased- 3.5
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 2.6
## I_love_my_country- 2.2
## It_is_important_to_honor_our_national_history_and_heritage- 2.3
## My_country_should_try_to_influence_the_values_of_other_nations- 3.4
## Race_is_a_social_construct 3.3
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 2.8
## Billionaires_should_pay_very_high_taxes 4.1
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 2.6
## Abortion_should_be_illegal- 3.9
## Christianity_should_be_the_state_religion- 4.2
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 2.4
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 3.1
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 4.6
## Feminism_is_good_for_women 3.6
## sd
## The_government_should_keep_regulations_on_business_to_a_minimum- 1.17
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 1.21
## Large_companies_should_be_controlled_by_the_state_not_private_actors 1.16
## The_government_should_mandate_a_higher_minimum_wage 1.19
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 1.10
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 1.38
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 1.16
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 1.28
## I_think_that_the_United_Nations_should_have_more_political_power 1.09
## I_would_support_an_increase_in_immigration_to_my_country 1.24
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 1.25
## Military_spending_should_be_increased- 1.16
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 1.02
## I_love_my_country- 1.08
## It_is_important_to_honor_our_national_history_and_heritage- 1.01
## My_country_should_try_to_influence_the_values_of_other_nations- 1.01
## Race_is_a_social_construct 1.18
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 1.12
## Billionaires_should_pay_very_high_taxes 1.05
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 1.16
## Abortion_should_be_illegal- 1.35
## Christianity_should_be_the_state_religion- 1.11
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 1.17
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 1.32
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.81
## Feminism_is_good_for_women 1.15
##
## Non missing response frequency for each item
## 1
## The_government_should_keep_regulations_on_business_to_a_minimum 0.12
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.06
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.19
## The_government_should_mandate_a_higher_minimum_wage 0.06
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.04
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.33
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.05
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.20
## I_think_that_the_United_Nations_should_have_more_political_power 0.16
## I_would_support_an_increase_in_immigration_to_my_country 0.17
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.12
## Military_spending_should_be_increased 0.23
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.04
## I_love_my_country 0.04
## It_is_important_to_honor_our_national_history_and_heritage 0.03
## My_country_should_try_to_influence_the_values_of_other_nations 0.13
## Race_is_a_social_construct 0.08
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.12
## Billionaires_should_pay_very_high_taxes 0.02
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.07
## Abortion_should_be_illegal 0.51
## Christianity_should_be_the_state_religion 0.59
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.05
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.15
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.72
## Feminism_is_good_for_women 0.05
## 2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.33
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.14
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.31
## The_government_should_mandate_a_higher_minimum_wage 0.09
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.08
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.30
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.18
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.27
## I_think_that_the_United_Nations_should_have_more_political_power 0.21
## I_would_support_an_increase_in_immigration_to_my_country 0.18
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.20
## Military_spending_should_be_increased 0.31
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.14
## I_love_my_country 0.08
## It_is_important_to_honor_our_national_history_and_heritage 0.08
## My_country_should_try_to_influence_the_values_of_other_nations 0.38
## Race_is_a_social_construct 0.18
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.26
## Billionaires_should_pay_very_high_taxes 0.07
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.14
## Abortion_should_be_illegal 0.19
## Christianity_should_be_the_state_religion 0.19
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.17
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.23
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.21
## Feminism_is_good_for_women 0.12
## 3
## The_government_should_keep_regulations_on_business_to_a_minimum 0.22
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.18
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.27
## The_government_should_mandate_a_higher_minimum_wage 0.13
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.13
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.11
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.26
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.22
## I_think_that_the_United_Nations_should_have_more_political_power 0.41
## I_would_support_an_increase_in_immigration_to_my_country 0.27
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.26
## Military_spending_should_be_increased 0.25
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.33
## I_love_my_country 0.22
## It_is_important_to_honor_our_national_history_and_heritage 0.24
## My_country_should_try_to_influence_the_values_of_other_nations 0.30
## Race_is_a_social_construct 0.27
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.35
## Billionaires_should_pay_very_high_taxes 0.12
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.30
## Abortion_should_be_illegal 0.11
## Christianity_should_be_the_state_religion 0.13
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.19
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.20
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.03
## Feminism_is_good_for_women 0.23
## 4
## The_government_should_keep_regulations_on_business_to_a_minimum 0.25
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.34
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.16
## The_government_should_mandate_a_higher_minimum_wage 0.31
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.30
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.14
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.30
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.20
## I_think_that_the_United_Nations_should_have_more_political_power 0.17
## I_would_support_an_increase_in_immigration_to_my_country 0.27
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.26
## Military_spending_should_be_increased 0.15
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.35
## I_love_my_country 0.37
## It_is_important_to_honor_our_national_history_and_heritage 0.42
## My_country_should_try_to_influence_the_values_of_other_nations 0.16
## Race_is_a_social_construct 0.30
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.18
## Billionaires_should_pay_very_high_taxes 0.30
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.28
## Abortion_should_be_illegal 0.11
## Christianity_should_be_the_state_religion 0.04
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.34
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.25
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.02
## Feminism_is_good_for_women 0.34
## 5
## The_government_should_keep_regulations_on_business_to_a_minimum 0.08
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.28
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.07
## The_government_should_mandate_a_higher_minimum_wage 0.42
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.46
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.12
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.21
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.11
## I_think_that_the_United_Nations_should_have_more_political_power 0.05
## I_would_support_an_increase_in_immigration_to_my_country 0.10
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.17
## Military_spending_should_be_increased 0.05
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.13
## I_love_my_country 0.28
## It_is_important_to_honor_our_national_history_and_heritage 0.24
## My_country_should_try_to_influence_the_values_of_other_nations 0.03
## Race_is_a_social_construct 0.16
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.09
## Billionaires_should_pay_very_high_taxes 0.48
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.21
## Abortion_should_be_illegal 0.09
## Christianity_should_be_the_state_religion 0.04
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.26
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.17
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.02
## Feminism_is_good_for_women 0.26
## miss
## The_government_should_keep_regulations_on_business_to_a_minimum 0
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0
## The_government_should_mandate_a_higher_minimum_wage 0
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0
## I_think_that_the_United_Nations_should_have_more_political_power 0
## I_would_support_an_increase_in_immigration_to_my_country 0
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0
## Military_spending_should_be_increased 0
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0
## I_love_my_country 0
## It_is_important_to_honor_our_national_history_and_heritage 0
## My_country_should_try_to_influence_the_values_of_other_nations 0
## Race_is_a_social_construct 0
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0
## Billionaires_should_pay_very_high_taxes 0
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0
## Abortion_should_be_illegal 0
## Christianity_should_be_the_state_religion 0
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0
## Feminism_is_good_for_women 0
omega(
d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
nfactors = 3
)
## Omega
## Call: omegah(m = m, nfactors = nfactors, fm = fm, key = key, flip = flip,
## digits = digits, title = title, sl = sl, labels = labels,
## plot = plot, n.obs = n.obs, rotate = rotate, Phi = Phi, option = option,
## covar = covar)
## Alpha: 0.88
## G.6: 0.9
## Omega Hierarchical: 0.62
## Omega H asymptotic: 0.68
## Omega Total 0.9
##
## Schmid Leiman Factor loadings greater than 0.2
## g
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.52
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.63
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.40
## The_government_should_mandate_a_higher_minimum_wage 0.58
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.60
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.21
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.54
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.26
## I_think_that_the_United_Nations_should_have_more_political_power 0.42
## I_would_support_an_increase_in_immigration_to_my_country 0.50
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.48
## Military_spending_should_be_increased- 0.53
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.23
## I_love_my_country- 0.60
## It_is_important_to_honor_our_national_history_and_heritage- 0.57
## My_country_should_try_to_influence_the_values_of_other_nations- 0.25
## Race_is_a_social_construct
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal
## Billionaires_should_pay_very_high_taxes 0.55
## We_should_use_nuclear_power_for_electricity_and_heat_generation-
## Abortion_should_be_illegal- 0.55
## Christianity_should_be_the_state_religion- 0.42
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people-
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.31
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old-
## Feminism_is_good_for_women 0.49
## F1*
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.34
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.51
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.38
## The_government_should_mandate_a_higher_minimum_wage 0.54
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.53
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old-
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.46
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.23
## I_think_that_the_United_Nations_should_have_more_political_power 0.47
## I_would_support_an_increase_in_immigration_to_my_country 0.35
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.40
## Military_spending_should_be_increased-
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country-
## I_love_my_country-
## It_is_important_to_honor_our_national_history_and_heritage-
## My_country_should_try_to_influence_the_values_of_other_nations-
## Race_is_a_social_construct 0.24
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal
## Billionaires_should_pay_very_high_taxes 0.42
## We_should_use_nuclear_power_for_electricity_and_heat_generation-
## Abortion_should_be_illegal- 0.26
## Christianity_should_be_the_state_religion-
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.21
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old-
## Feminism_is_good_for_women 0.35
## F2*
## The_government_should_keep_regulations_on_business_to_a_minimum-
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor
## Large_companies_should_be_controlled_by_the_state_not_private_actors -0.20
## The_government_should_mandate_a_higher_minimum_wage
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old-
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it-
## I_think_that_the_United_Nations_should_have_more_political_power
## I_would_support_an_increase_in_immigration_to_my_country 0.22
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country
## Military_spending_should_be_increased-
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country-
## I_love_my_country-
## It_is_important_to_honor_our_national_history_and_heritage-
## My_country_should_try_to_influence_the_values_of_other_nations-
## Race_is_a_social_construct
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.26
## Billionaires_should_pay_very_high_taxes
## We_should_use_nuclear_power_for_electricity_and_heat_generation- -0.35
## Abortion_should_be_illegal- 0.42
## Christianity_should_be_the_state_religion- 0.51
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- -0.26
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.29
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old-
## Feminism_is_good_for_women 0.24
## F3*
## The_government_should_keep_regulations_on_business_to_a_minimum-
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor
## Large_companies_should_be_controlled_by_the_state_not_private_actors
## The_government_should_mandate_a_higher_minimum_wage
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old-
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it-
## I_think_that_the_United_Nations_should_have_more_political_power
## I_would_support_an_increase_in_immigration_to_my_country
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country
## Military_spending_should_be_increased- -0.37
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country-
## I_love_my_country- -0.58
## It_is_important_to_honor_our_national_history_and_heritage- -0.50
## My_country_should_try_to_influence_the_values_of_other_nations- -0.42
## Race_is_a_social_construct
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal
## Billionaires_should_pay_very_high_taxes
## We_should_use_nuclear_power_for_electricity_and_heat_generation-
## Abortion_should_be_illegal-
## Christianity_should_be_the_state_religion- -0.20
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people-
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old-
## Feminism_is_good_for_women
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.40
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.66
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.35
## The_government_should_mandate_a_higher_minimum_wage 0.65
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.64
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old-
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.50
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it-
## I_think_that_the_United_Nations_should_have_more_political_power 0.41
## I_would_support_an_increase_in_immigration_to_my_country 0.42
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.39
## Military_spending_should_be_increased- 0.45
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country-
## I_love_my_country- 0.69
## It_is_important_to_honor_our_national_history_and_heritage- 0.58
## My_country_should_try_to_influence_the_values_of_other_nations- 0.26
## Race_is_a_social_construct
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal
## Billionaires_should_pay_very_high_taxes 0.48
## We_should_use_nuclear_power_for_electricity_and_heat_generation-
## Abortion_should_be_illegal- 0.55
## Christianity_should_be_the_state_religion- 0.47
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people-
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.20
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old-
## Feminism_is_good_for_women 0.42
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.40
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.66
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.35
## The_government_should_mandate_a_higher_minimum_wage 0.65
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.64
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.08
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.50
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.12
## I_think_that_the_United_Nations_should_have_more_political_power 0.41
## I_would_support_an_increase_in_immigration_to_my_country 0.42
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.39
## Military_spending_should_be_increased- 0.45
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.13
## I_love_my_country- 0.69
## It_is_important_to_honor_our_national_history_and_heritage- 0.58
## My_country_should_try_to_influence_the_values_of_other_nations- 0.26
## Race_is_a_social_construct 0.10
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.13
## Billionaires_should_pay_very_high_taxes 0.48
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.16
## Abortion_should_be_illegal- 0.55
## Christianity_should_be_the_state_religion- 0.47
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.15
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.20
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.00
## Feminism_is_good_for_women 0.42
## u2
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.60
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.34
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.65
## The_government_should_mandate_a_higher_minimum_wage 0.35
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.36
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.92
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.50
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.88
## I_think_that_the_United_Nations_should_have_more_political_power 0.59
## I_would_support_an_increase_in_immigration_to_my_country 0.58
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.61
## Military_spending_should_be_increased- 0.55
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.87
## I_love_my_country- 0.31
## It_is_important_to_honor_our_national_history_and_heritage- 0.42
## My_country_should_try_to_influence_the_values_of_other_nations- 0.74
## Race_is_a_social_construct 0.90
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.87
## Billionaires_should_pay_very_high_taxes 0.52
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.84
## Abortion_should_be_illegal- 0.45
## Christianity_should_be_the_state_religion- 0.53
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.85
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.80
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 1.00
## Feminism_is_good_for_women 0.58
## p2
## The_government_should_keep_regulations_on_business_to_a_minimum- 0.67
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 0.59
## Large_companies_should_be_controlled_by_the_state_not_private_actors 0.47
## The_government_should_mandate_a_higher_minimum_wage 0.52
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 0.56
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 0.59
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 0.57
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 0.57
## I_think_that_the_United_Nations_should_have_more_political_power 0.43
## I_would_support_an_increase_in_immigration_to_my_country 0.59
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 0.59
## Military_spending_should_be_increased- 0.63
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 0.43
## I_love_my_country- 0.52
## It_is_important_to_honor_our_national_history_and_heritage- 0.55
## My_country_should_try_to_influence_the_values_of_other_nations- 0.24
## Race_is_a_social_construct 0.29
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 0.30
## Billionaires_should_pay_very_high_taxes 0.63
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 0.05
## Abortion_should_be_illegal- 0.55
## Christianity_should_be_the_state_religion- 0.38
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 0.21
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 0.49
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 0.03
## Feminism_is_good_for_women 0.57
## com
## The_government_should_keep_regulations_on_business_to_a_minimum- 1.87
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor 1.95
## Large_companies_should_be_controlled_by_the_state_not_private_actors 2.52
## The_government_should_mandate_a_higher_minimum_wage 2.07
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick 1.97
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old- 2.06
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed 1.98
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it- 1.97
## I_think_that_the_United_Nations_should_have_more_political_power 2.08
## I_would_support_an_increase_in_immigration_to_my_country 2.22
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country 1.96
## Military_spending_should_be_increased- 2.01
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country- 3.32
## I_love_my_country- 2.00
## It_is_important_to_honor_our_national_history_and_heritage- 2.00
## My_country_should_try_to_influence_the_values_of_other_nations- 1.87
## Race_is_a_social_construct 2.39
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal 2.55
## Billionaires_should_pay_very_high_taxes 1.91
## We_should_use_nuclear_power_for_electricity_and_heat_generation- 1.60
## Abortion_should_be_illegal- 2.40
## Christianity_should_be_the_state_religion- 2.27
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people- 2.82
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults 2.33
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old- 2.32
## Feminism_is_good_for_women 2.33
##
## With Sums of squares of:
## g F1* F2* F3* h2
## 4.88 2.45 0.99 1.05 4.46
##
## general/max 1.09 max/min = 4.49
## mean percent general = 0.46 with sd = 0.18 and cv of 0.38
## Explained Common Variance of the general factor = 0.52
##
## The degrees of freedom are 250 and the fit is 1.15
## The number of observations was 958 with Chi Square = 1091 with prob < 2.2e-105
## The root mean square of the residuals is 0.04
## The df corrected root mean square of the residuals is 0.05
## RMSEA index = 0.059 and the 10 % confidence intervals are 0.056 0.063
## BIC = -625
##
## Compare this with the adequacy of just a general factor and no group factors
## The degrees of freedom for just the general factor are 299 and the fit is 3.09
## The number of observations was 958 with Chi Square = 2923 with prob < 0
## The root mean square of the residuals is 0.11
## The df corrected root mean square of the residuals is 0.12
##
## RMSEA index = 0.096 and the 10 % confidence intervals are 0.093 0.099
## BIC = 870
##
## Measures of factor score adequacy
## g F1* F2* F3*
## Correlation of scores with factors 0.81 0.72 0.76 0.72
## Multiple R square of scores with factors 0.66 0.52 0.58 0.52
## Minimum correlation of factor score estimates 0.32 0.04 0.16 0.05
##
## Total, General and Subset omega for each subset
## g F1* F2* F3*
## Omega total for total scores and subscales 0.90 0.89 0.41 0.69
## Omega general for total scores and subscales 0.62 0.52 0.33 0.37
## Omega group for total scores and subscales 0.20 0.37 0.08 0.33
omega(
d %>% select(The_government_should_keep_regulations_on_business_to_a_minimum:Feminism_is_good_for_women),
nfactors = 4
)
## Omega
## Call: omegah(m = m, nfactors = nfactors, fm = fm, key = key, flip = flip,
## digits = digits, title = title, sl = sl, labels = labels,
## plot = plot, n.obs = n.obs, rotate = rotate, Phi = Phi, option = option,
## covar = covar)
## Alpha: 0.88
## G.6: 0.9
## Omega Hierarchical: 0.6
## Omega H asymptotic: 0.67
## Omega Total 0.91
##
## Schmid Leiman Factor loadings greater than 0.2
## g
## The_government_should_keep_regulations_on_business_to_a_minimum 0.52
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor- 0.62
## Large_companies_should_be_controlled_by_the_state_not_private_actors- 0.39
## The_government_should_mandate_a_higher_minimum_wage- 0.57
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick- 0.60
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.21
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed- 0.53
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.26
## I_think_that_the_United_Nations_should_have_more_political_power- 0.42
## I_would_support_an_increase_in_immigration_to_my_country- 0.50
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country- 0.47
## Military_spending_should_be_increased 0.52
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.22
## I_love_my_country 0.58
## It_is_important_to_honor_our_national_history_and_heritage 0.55
## My_country_should_try_to_influence_the_values_of_other_nations 0.23
## Race_is_a_social_construct-
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal- 0.21
## Billionaires_should_pay_very_high_taxes- 0.54
## We_should_use_nuclear_power_for_electricity_and_heat_generation
## Abortion_should_be_illegal 0.56
## Christianity_should_be_the_state_religion 0.44
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults- 0.33
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old
## Feminism_is_good_for_women- 0.50
## F1*
## The_government_should_keep_regulations_on_business_to_a_minimum -0.32
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor- -0.53
## Large_companies_should_be_controlled_by_the_state_not_private_actors- -0.42
## The_government_should_mandate_a_higher_minimum_wage- -0.54
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick- -0.53
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed- -0.47
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it -0.23
## I_think_that_the_United_Nations_should_have_more_political_power- -0.47
## I_would_support_an_increase_in_immigration_to_my_country- -0.34
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country- -0.41
## Military_spending_should_be_increased
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country
## I_love_my_country
## It_is_important_to_honor_our_national_history_and_heritage
## My_country_should_try_to_influence_the_values_of_other_nations
## Race_is_a_social_construct- -0.25
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal-
## Billionaires_should_pay_very_high_taxes- -0.42
## We_should_use_nuclear_power_for_electricity_and_heat_generation
## Abortion_should_be_illegal -0.22
## Christianity_should_be_the_state_religion
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults-
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old
## Feminism_is_good_for_women- -0.31
## F2*
## The_government_should_keep_regulations_on_business_to_a_minimum
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor-
## Large_companies_should_be_controlled_by_the_state_not_private_actors-
## The_government_should_mandate_a_higher_minimum_wage-
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick-
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed-
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it
## I_think_that_the_United_Nations_should_have_more_political_power-
## I_would_support_an_increase_in_immigration_to_my_country-
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country-
## Military_spending_should_be_increased 0.37
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country
## I_love_my_country 0.63
## It_is_important_to_honor_our_national_history_and_heritage 0.53
## My_country_should_try_to_influence_the_values_of_other_nations 0.42
## Race_is_a_social_construct-
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal-
## Billionaires_should_pay_very_high_taxes-
## We_should_use_nuclear_power_for_electricity_and_heat_generation
## Abortion_should_be_illegal
## Christianity_should_be_the_state_religion
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults-
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old
## Feminism_is_good_for_women-
## F3*
## The_government_should_keep_regulations_on_business_to_a_minimum
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor-
## Large_companies_should_be_controlled_by_the_state_not_private_actors- -0.24
## The_government_should_mandate_a_higher_minimum_wage-
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick-
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed-
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it
## I_think_that_the_United_Nations_should_have_more_political_power-
## I_would_support_an_increase_in_immigration_to_my_country- 0.20
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country-
## Military_spending_should_be_increased
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country
## I_love_my_country
## It_is_important_to_honor_our_national_history_and_heritage
## My_country_should_try_to_influence_the_values_of_other_nations
## Race_is_a_social_construct-
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal-
## Billionaires_should_pay_very_high_taxes-
## We_should_use_nuclear_power_for_electricity_and_heat_generation
## Abortion_should_be_illegal 0.49
## Christianity_should_be_the_state_religion 0.58
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults-
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old
## Feminism_is_good_for_women- 0.39
## F4*
## The_government_should_keep_regulations_on_business_to_a_minimum
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor-
## Large_companies_should_be_controlled_by_the_state_not_private_actors-
## The_government_should_mandate_a_higher_minimum_wage-
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick-
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed-
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it
## I_think_that_the_United_Nations_should_have_more_political_power-
## I_would_support_an_increase_in_immigration_to_my_country-
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country-
## Military_spending_should_be_increased
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country
## I_love_my_country
## It_is_important_to_honor_our_national_history_and_heritage
## My_country_should_try_to_influence_the_values_of_other_nations
## Race_is_a_social_construct-
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal- -0.31
## Billionaires_should_pay_very_high_taxes-
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.39
## Abortion_should_be_illegal
## Christianity_should_be_the_state_religion
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.42
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults- -0.50
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.22
## Feminism_is_good_for_women-
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.43
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor- 0.67
## Large_companies_should_be_controlled_by_the_state_not_private_actors- 0.40
## The_government_should_mandate_a_higher_minimum_wage- 0.64
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick- 0.64
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed- 0.51
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it
## I_think_that_the_United_Nations_should_have_more_political_power- 0.41
## I_would_support_an_increase_in_immigration_to_my_country- 0.42
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country- 0.40
## Military_spending_should_be_increased 0.45
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country
## I_love_my_country 0.73
## It_is_important_to_honor_our_national_history_and_heritage 0.59
## My_country_should_try_to_influence_the_values_of_other_nations 0.27
## Race_is_a_social_construct-
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal-
## Billionaires_should_pay_very_high_taxes- 0.48
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.21
## Abortion_should_be_illegal 0.60
## Christianity_should_be_the_state_religion 0.57
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.25
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults- 0.38
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old
## Feminism_is_good_for_women- 0.51
## h2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.43
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor- 0.67
## Large_companies_should_be_controlled_by_the_state_not_private_actors- 0.40
## The_government_should_mandate_a_higher_minimum_wage- 0.64
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick- 0.64
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.08
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed- 0.51
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.12
## I_think_that_the_United_Nations_should_have_more_political_power- 0.41
## I_would_support_an_increase_in_immigration_to_my_country- 0.42
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country- 0.40
## Military_spending_should_be_increased 0.45
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.12
## I_love_my_country 0.73
## It_is_important_to_honor_our_national_history_and_heritage 0.59
## My_country_should_try_to_influence_the_values_of_other_nations 0.27
## Race_is_a_social_construct- 0.10
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal- 0.17
## Billionaires_should_pay_very_high_taxes- 0.48
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.21
## Abortion_should_be_illegal 0.60
## Christianity_should_be_the_state_religion 0.57
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.25
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults- 0.38
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.07
## Feminism_is_good_for_women- 0.51
## u2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.57
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor- 0.33
## Large_companies_should_be_controlled_by_the_state_not_private_actors- 0.60
## The_government_should_mandate_a_higher_minimum_wage- 0.36
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick- 0.36
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.92
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed- 0.49
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.88
## I_think_that_the_United_Nations_should_have_more_political_power- 0.59
## I_would_support_an_increase_in_immigration_to_my_country- 0.58
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country- 0.60
## Military_spending_should_be_increased 0.55
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.88
## I_love_my_country 0.27
## It_is_important_to_honor_our_national_history_and_heritage 0.41
## My_country_should_try_to_influence_the_values_of_other_nations 0.73
## Race_is_a_social_construct- 0.90
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal- 0.83
## Billionaires_should_pay_very_high_taxes- 0.52
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.79
## Abortion_should_be_illegal 0.40
## Christianity_should_be_the_state_religion 0.43
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.75
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults- 0.62
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.93
## Feminism_is_good_for_women- 0.49
## p2
## The_government_should_keep_regulations_on_business_to_a_minimum 0.62
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor- 0.57
## Large_companies_should_be_controlled_by_the_state_not_private_actors- 0.39
## The_government_should_mandate_a_higher_minimum_wage- 0.51
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick- 0.56
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 0.55
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed- 0.56
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 0.55
## I_think_that_the_United_Nations_should_have_more_political_power- 0.43
## I_would_support_an_increase_in_immigration_to_my_country- 0.60
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country- 0.56
## Military_spending_should_be_increased 0.61
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 0.39
## I_love_my_country 0.46
## It_is_important_to_honor_our_national_history_and_heritage 0.51
## My_country_should_try_to_influence_the_values_of_other_nations 0.20
## Race_is_a_social_construct- 0.30
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal- 0.26
## Billionaires_should_pay_very_high_taxes- 0.61
## We_should_use_nuclear_power_for_electricity_and_heat_generation 0.02
## Abortion_should_be_illegal 0.52
## Christianity_should_be_the_state_religion 0.34
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 0.11
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults- 0.28
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 0.00
## Feminism_is_good_for_women- 0.49
## com
## The_government_should_keep_regulations_on_business_to_a_minimum 2.17
## The_government_should_reduce_income_differences_between_the_rich_and_the_poor- 2.01
## Large_companies_should_be_controlled_by_the_state_not_private_actors- 2.75
## The_government_should_mandate_a_higher_minimum_wage- 2.07
## It_should_be_the_government_s_responsibility_to_provide_health_care_to_the_sick- 1.99
## It_should_not_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_for_the_old 2.17
## It_should_be_the_government_s_responsibility_to_provide_a_decent_standard_of_living_to_the_unemployed- 2.03
## It_not_should_be_the_government_s_responsibility_to_provide_decent_housing_to_those_who_can_t_afford_it 2.01
## I_think_that_the_United_Nations_should_have_more_political_power- 2.09
## I_would_support_an_increase_in_immigration_to_my_country- 2.21
## Humans_should_be_citizens_of_the_world_not_citizens_of_their_country- 2.05
## Military_spending_should_be_increased 2.13
## Immigrants_should_integrate_into_the_broad_national_culture_of_my_country 3.57
## I_love_my_country 2.00
## It_is_important_to_honor_our_national_history_and_heritage 2.04
## My_country_should_try_to_influence_the_values_of_other_nations 2.15
## Race_is_a_social_construct- 2.42
## Biotechnology_such_as_genetic_editing_of_embryos_should_be_legal- 2.45
## Billionaires_should_pay_very_high_taxes- 1.95
## We_should_use_nuclear_power_for_electricity_and_heat_generation 1.61
## Abortion_should_be_illegal 2.31
## Christianity_should_be_the_state_religion 2.11
## Free_speech_should_be_nearly_absolute_it_should_be_legal_to_say_things_that_offend_some_or_most_people 1.75
## Most_psychoactive_drugs_such_as_cannabis_cocaine_or_LSD_should_be_legal_to_purchase_for_adults- 2.03
## It_should_be_legal_for_an_adult_person_to_have_sex_with_a_consenting_15_year_old 1.86
## Feminism_is_good_for_women- 2.75
##
## With Sums of squares of:
## g F1* F2* F3* F4* h2
## 4.81 2.46 1.14 0.95 0.83 5.02
##
## general/max 0.96 max/min = 6.08
## mean percent general = 0.42 with sd = 0.18 and cv of 0.43
## Explained Common Variance of the general factor = 0.47
##
## The degrees of freedom are 227 and the fit is 0.82
## The number of observations was 958 with Chi Square = 772 with prob < 1.4e-60
## The root mean square of the residuals is 0.03
## The df corrected root mean square of the residuals is 0.04
## RMSEA index = 0.05 and the 10 % confidence intervals are 0.046 0.054
## BIC = -786
##
## Compare this with the adequacy of just a general factor and no group factors
## The degrees of freedom for just the general factor are 299 and the fit is 3.1
## The number of observations was 958 with Chi Square = 2937 with prob < 0
## The root mean square of the residuals is 0.12
## The df corrected root mean square of the residuals is 0.12
##
## RMSEA index = 0.096 and the 10 % confidence intervals are 0.093 0.099
## BIC = 885
##
## Measures of factor score adequacy
## g F1* F2* F3* F4*
## Correlation of scores with factors 0.80 0.74 0.76 0.76 0.73
## Multiple R square of scores with factors 0.65 0.55 0.58 0.58 0.54
## Minimum correlation of factor score estimates 0.29 0.09 0.15 0.17 0.07
##
## Total, General and Subset omega for each subset
## g F1* F2* F3* F4*
## Omega total for total scores and subscales 0.91 0.88 0.75 0.73 0.14
## Omega general for total scores and subscales 0.60 0.50 0.37 0.38 0.13
## Omega group for total scores and subscales 0.19 0.38 0.38 0.36 0.01
#models for each pol outcome
#fit for different numbers of splines, start with 3
pol_question_models_k3 = fit_pol_question_models_ols(pol_vars, d, spline_knots = 3)
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
#4
pol_question_models_k4 = fit_pol_question_models_ols(pol_vars, d, spline_knots = 4)
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
#5
pol_question_models_k5 = fit_pol_question_models_ols(pol_vars, d, spline_knots = 5)
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
#bind together
pol_question_models_all = bind_rows(
pol_question_models_k3,
pol_question_models_k4,
pol_question_models_k5
)
#linear effect of IQ across models
pol_question_models_k3 %>%
mutate(
nice_y = str_clean(y),
nice_y = nice_y %>% fct_reorder(IQ_std_beta)
) %>%
ggplot(aes(nice_y, IQ_std_beta)) +
geom_point() +
geom_errorbar(aes(ymin = IQ_std_beta - conf_interval_width(IQ_std_beta_se, n = nrow(d)), ymax = IQ_std_beta + conf_interval_width(IQ_std_beta_se, n = nrow(d)))) +
scale_x_discrete("Political opinion") +
scale_y_continuous("IQ beta") +
coord_flip() +
geom_hline(yintercept = 0, linetype = 2)
GG_save("figs/linear_iq_effect.png")
#which proportion shows a linear effect of IQ?
mean(pol_question_models_k3$linear_model_p < .05)
## [1] 0.885
sum(pol_question_models_k3$linear_model_p < .05)
## [1] 23
#multiple testing
pol_question_models_k3$linear_model_p_bonferroni = p.adjust(pol_question_models_k3$linear_model_p, method = "bonferroni")
mean(pol_question_models_k3$linear_model_p_bonferroni < .05)
## [1] 0.5
sum(pol_question_models_k3$linear_model_p_bonferroni < .05)
## [1] 13
#summary of linear effects
pol_question_models_k3 %>%
select(
model_number, y, IQ_std_beta, IQ_std_beta_se, demo_rsq, linear_rsq, linear_model_p, linear_model_p_log10
) %>%
print(n = Inf)
## # A tibble: 26 × 8
## model_number y IQ_std_beta IQ_std_beta_se demo_rsq linear_rsq
## <int> <chr> <dbl> <dbl> <dbl> <dbl>
## 1 1 The_government_s… -0.235 0.0320 0.00438 0.0572
## 2 2 The_government_s… 0.121 0.0319 0.0497 0.0631
## 3 3 Large_companies_… -0.0493 0.0311 0.107 0.109
## 4 4 The_government_s… 0.0805 0.0319 0.0570 0.0623
## 5 5 It_should_be_the… 0.0977 0.0321 0.0419 0.0502
## 6 6 It_should_not_be… -0.116 0.0326 0.00522 0.0173
## 7 7 It_should_be_the… 0.169 0.0321 0.0230 0.0499
## 8 8 It_not_should_be… -0.0669 0.0328 0.00244 0.00576
## 9 9 I_think_that_the… 0.0670 0.0326 0.0141 0.0174
## 10 10 I_would_support_… 0.252 0.0317 0.0136 0.0742
## 11 11 Humans_should_be… 0.0848 0.0324 0.0249 0.0309
## 12 12 Military_spendin… -0.285 0.0304 0.0659 0.144
## 13 13 Immigrants_shoul… 0.0563 0.0318 0.0617 0.0638
## 14 14 I_love_my_country -0.183 0.0303 0.120 0.151
## 15 15 It_is_important_… -0.199 0.0313 0.0560 0.0938
## 16 16 My_country_shoul… -0.0970 0.0324 0.0216 0.0297
## 17 17 Race_is_a_social… 0.0865 0.0326 0.0143 0.0206
## 18 18 Biotechnology_su… 0.0237 0.0319 0.0590 0.0586
## 19 19 Billionaires_sho… 0.143 0.0321 0.0293 0.0481
## 20 20 We_should_use_nu… 0.154 0.0301 0.140 0.162
## 21 21 Abortion_should_… -0.222 0.0318 0.0200 0.0670
## 22 22 Christianity_sho… -0.370 0.0303 0.0173 0.150
## 23 23 Free_speech_shou… 0.0865 0.0317 0.0644 0.0707
## 24 24 Most_psychoactiv… 0.0882 0.0323 0.0315 0.0380
## 25 25 It_should_be_leg… -0.0739 0.0325 0.0188 0.0231
## 26 26 Feminism_is_good… 0.242 0.0315 0.0288 0.0850
## # ℹ 2 more variables: linear_model_p <dbl>, linear_model_p_log10 <dbl>
#which shows nonlinear effect of IQ?
pol_question_models_all %>%
mutate(
nice_y = str_clean(y),
nice_y = nice_y %>% fct_reorder(spline_model_p_log10),
spline_knots = spline_knots %>% as.factor()
) %>%
ggplot(aes(nice_y, spline_model_p_log10, color = spline_knots)) +
geom_point() +
scale_x_discrete("Political opinion") +
scale_y_continuous("-log10(p) for spline model") +
coord_flip() +
geom_hline(yintercept = -log10(0.05), linetype = 2)
GG_save("figs/spline_iq_effect_k3-5.png")
#average level of evidence for spline model over linear model as a function of splint knot count
describe2(
pol_question_models_all$spline_model_p_log10,
group = pol_question_models_all$spline_knots
)
## New names:
## • `` -> `...1`
pol_question_models_all %>%
mutate(
spline_model_p_bonferroni = p.adjust(spline_model_p, method = "bonferroni")
) %>%
group_by(spline_knots) %>%
summarise(
mean_spline_model_p_log10 = mean(spline_model_p_log10),
sum_of_significant = sum(spline_model_p < 0.05),
proportion_significant = mean(spline_model_p < 0.05),
sum_of_significant_bonferroni = sum(spline_model_p_bonferroni < 0.05),
proportion_significant_bonferroni = mean(spline_model_p_bonferroni < 0.05),
)
#opinion of people with IQs of 80, 100, 120
pol_question_models_k4 %>%
unnest(preds) %>%
mutate(
nice_y = str_clean(y),
nice_y = nice_y %>% fct_reorder(IQ_std_beta),
IQ = (x * 15 + 100) %>% round() %>% factor()
) %>%
ggplot(aes(nice_y, predicted, color = IQ)) +
geom_point() +
geom_errorbar(aes(ymin = conf.low, ymax = conf.high)) +
coord_flip()
#which splines are better than linear models?
pol_question_models_all_chosen = pol_question_models_all %>%
filter(spline_knots == 4) %>%
arrange(-spline_model_p_log10)
pol_question_models_all_chosen$spline_model_p %>%
head(9) %>%
describe2()
#plot them
spline_plots = map(1:9, function(row) {
pol_question_models_all_chosen[row, ]$spline_model_natural[[1]] %>%
ggpredict(terms = "IQ") %>%
plot(add.data = T) +
ggtitle(pol_question_models_all_chosen[row, "y"] %>% str_clean() %>% str_wrap(40)) +
scale_y_continuous("Predicted value") +
scale_x_continuous("IQ") +
#make font smaller in title
theme(plot.title = element_text(size = 10))
})
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning: Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning: Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
patchwork::wrap_plots(spline_plots)
GG_save("figs/spline_plots_top9.png")
#next 9 plots
spline_plots = map(10:18, function(row) {
pol_question_models_all_chosen[row, ]$spline_model_natural[[1]] %>%
ggpredict(terms = "IQ") %>%
plot(add.data = T) +
ggtitle(pol_question_models_all_chosen[row, "y"] %>% str_clean() %>% str_wrap(40)) +
scale_y_continuous("Predicted value") +
scale_x_continuous("IQ") +
#make font smaller in title
theme(plot.title = element_text(size = 10))
})
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning: Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning: Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
patchwork::wrap_plots(spline_plots)
GG_save("figs/spline_plots_next9.png")
#last 8 plots
spline_plots = map(19:26, function(row) {
pol_question_models_all_chosen[row, ]$spline_model_natural[[1]] %>%
ggpredict(terms = "IQ") %>%
plot(add.data = T) +
ggtitle(pol_question_models_all_chosen[row, "y"] %>% str_clean() %>% str_wrap(40)) +
scale_y_continuous("Predicted value") +
scale_x_continuous("IQ") +
#make font smaller in title
theme(plot.title = element_text(size = 10))
})
## Warning: Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
## Warning in formula.character(object, env = baseenv()): Using formula(x) is deprecated when x is a character vector of length > 1.
## Consider formula(paste(x, collapse = " ")) instead.
## Warning in formula.character(object, env = baseenv()): Argument `add.data` is deprecated and will be removed in the future.
## Please use `show_data` instead.
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
## Scale for y is already present.
## Adding another scale for y, which will replace the existing scale.
patchwork::wrap_plots(spline_plots)
GG_save("figs/spline_plots_last8.png")
#plot bivariate model
GG_scatter(d, "IQ", "conservatism") +
geom_smooth()
## `geom_smooth()` using formula = 'y ~ x'
## `geom_smooth()` using method = 'loess' and formula = 'y ~ x'
GG_save("figs/IQ_cons.png")
## `geom_smooth()` using formula = 'y ~ x'
## `geom_smooth()` using method = 'loess' and formula = 'y ~ x'
#data with z scores
d_z = d %>%
select(conservatism, IQ, sex, age, ethnic_combos_common, wave) %>%
df_standardize()
## Skipped sex because it is class factor
## Skipped ethnic_combos_common because it is class factor
## Skipped wave because it is a character (string)
#but IQ standardize to white norms
d_z$IQ = d_z$IQ %>% standardize(focal_group = d$white_only)
#model leftism
pol_models = list(
linear = ols(conservatism ~ IQ + sex + age + ethnic_combos_common, data = d_z),
IQ_spline3 = ols(conservatism ~ rcs(IQ, 3) + sex + age + ethnic_combos_common, data = d_z),
IQ_spline4 = ols(conservatism ~ rcs(IQ, 4) + sex + age + ethnic_combos_common, data = d_z),
IQ_spline5 = ols(conservatism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d_z),
sex_interact = ols(conservatism ~ IQ * sex + age + ethnic_combos_common, data = d_z),
age_interact = ols(conservatism ~ IQ + sex + IQ*age + ethnic_combos_common, data = d_z)
)
#test models
test_models(pol_models)
pol_models[c(1, 4)] %>%
summarize_models(add_ref_level = F, asterisks_only = F)
#plot IQ spline model
#have to fit the model to an object otherwise ggeffects fails
(cons_IQ_spline5 = ols(conservatism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d))
## Linear Regression Model
##
## ols(formula = conservatism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common,
## data = d)
##
## Model Likelihood Discrimination
## Ratio Test Indexes
## Obs 958 LR chi2 151.55 R2 0.146
## sigma0.9298 d.f. 12 R2 adj 0.135
## d.f. 945 Pr(> chi2) 0.0000 g 0.435
##
## Residuals
##
## Min 1Q Median 3Q Max
## -2.1268 -0.6429 -0.1321 0.5473 2.9815
##
##
## Coef S.E. t Pr(>|t|)
## Intercept 0.1512 1.1370 0.13 0.8943
## IQ -0.0055 0.0138 -0.40 0.6914
## IQ' 0.0446 0.1177 0.38 0.7049
## IQ'' -0.4135 0.3893 -1.06 0.2885
## IQ''' 0.8054 0.4319 1.86 0.0625
## sex=Female -0.2528 0.0609 -4.15 <0.0001
## age 0.0149 0.0020 7.45 <0.0001
## ethnic_combos_common=asian -0.1722 0.2006 -0.86 0.3908
## ethnic_combos_common=black -0.3632 0.1061 -3.42 0.0006
## ethnic_combos_common=east_asian 0.1839 0.2223 0.83 0.4083
## ethnic_combos_common=hispanic 0.1395 0.1693 0.82 0.4101
## ethnic_combos_common=white, hispanic -0.1851 0.2196 -0.84 0.3996
## ethnic_combos_common=Other 0.0247 0.1087 0.23 0.8203
ggpredict(cons_IQ_spline5, terms = "IQ") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
GG_save("figs/pol_iq_spline5.png")
#plot linear model with covariates
(cons_linear = lm(conservatism ~ IQ + sex + age + ethnic_combos_common, data = d))
##
## Call:
## lm(formula = conservatism ~ IQ + sex + age + ethnic_combos_common,
## data = d)
##
## Coefficients:
## (Intercept) IQ
## 0.9757 -0.0147
## sexFemale age
## -0.2516 0.0139
## ethnic_combos_commonasian ethnic_combos_commonblack
## -0.1750 -0.3660
## ethnic_combos_commoneast_asian ethnic_combos_commonhispanic
## 0.1587 0.1437
## ethnic_combos_commonwhite, hispanic ethnic_combos_commonOther
## -0.1880 0.0227
ggpredict(cons_linear, terms = "IQ [61:153]") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
GG_save("figs/IQ_cons_linear.png")
#without ethnicity
pol_models_noethnic = list(
linear = ols(conservatism ~ IQ + sex + age, data = d_z),
IQ_spline = ols(conservatism ~ rcs(IQ, 5) + sex + age, data = d_z)
)
pol_models_noethnic %>% test_models()
#plot it
cons_IQ_spline5_noethnic = ols(conservatism ~ rcs(IQ, 5) + sex + age, data = d)
ggpredict(cons_IQ_spline5_noethnic, terms = "IQ") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
GG_save("figs/IQ_cons_spline5_noethnic.png")
#model comparison p values by wave
#wave 1
lrtest(
ols(conservatism ~ IQ + sex + age + race_combos, data = d %>% filter(wave == "original")),
ols(conservatism ~ rcs(IQ, 5) + sex + age + race_combos, data = d %>% filter(wave == "original"))
)
##
## Model 1: conservatism ~ IQ + sex + age + race_combos
## Model 2: conservatism ~ rcs(IQ, 5) + sex + age + race_combos
##
## L.R. Chisq d.f. P
## 12.00631 3.00000 0.00736
#wave 2
lrtest(
ols(conservatism ~ IQ + sex + age + ethnic_combos, data = d %>% filter(wave == "replication") %>% drop_unused_ethnic_levels()),
ols(conservatism ~ rcs(IQ, 5) + sex + age + ethnic_combos, data = d %>% filter(wave == "replication") %>% drop_unused_ethnic_levels())
)
##
## Model 1: conservatism ~ IQ + sex + age + ethnic_combos
## Model 2: conservatism ~ rcs(IQ, 5) + sex + age + ethnic_combos
##
## L.R. Chisq d.f. P
## 5.766 3.000 0.124
#note the different ethnicity variables because the datasets don't have exactly the same encoding due to a mistake
#to maximize power and prevent the code from giving an error due to empty factor levels, I used the variables with the most data for each dataset
#item loadings
cons_loadings = tibble(
item = pol_fa_1$loadings %>% rownames(),
loading = pol_fa_1$loadings[, 1],
beta_IQ = pol_question_models_k3 %>%
pull(IQ_std_beta) %>% unname()
)
#plot without reversing
GG_scatter(cons_loadings, "loading", "beta_IQ", case_names = "item")
## `geom_smooth()` using formula = 'y ~ x'
#reverse loadings when needed
cons_loadings_rev = plyr::adply(cons_loadings, 1, function(row) {
row$reversed = F
if (row$loading < 0) {
row$loading = -row$loading
row$beta_IQ = -row$beta_IQ
row$reversed = T
}
row
})
GG_scatter(cons_loadings_rev, "loading", "beta_IQ", case_names = "item", color = "reversed")
## `geom_smooth()` using formula = 'y ~ x'
Reviewer requested to know if there’s any segment of the data where the IQ effect is positive and significant.
#strategy: we try many thresholds for IQ and see if there is ever a positive beta in a regression with the usual controls
#can also be done without controls (correlation)
IQ_thresholds = seq(80, 130, by = 1)
#fit linear models in subsets
ols_IQ_threshold_search_results = map_dfr(IQ_thresholds, function(threshold) {
#data subset, but standardize
d_subset_z = d_z %>%
mutate(
IQ_nat = d$IQ
) %>%
filter(IQ_nat >= threshold)
#fit model
fit = lm(conservatism ~ IQ + sex + age + ethnic_combos_common, data = d_subset_z)
fit_coef_tidy = broom::tidy(fit)
#summarize
broom::glance(fit) %>% mutate(
threshold = threshold,
IQ_beta = fit_coef_tidy[[2, "estimate"]],
IQ_p = fit_coef_tidy[[2, "p.value"]]
) %>%
#reorder
select(threshold, everything())
})
#plot
ols_IQ_threshold_search_results %>%
ggplot(aes(threshold, IQ_beta, color = IQ_p < .05)) +
geom_point() +
geom_hline(yintercept = 0, linetype = 2) +
geom_text(aes(label = kirkegaard::str_round(IQ_p, 3, less_than = .001)), vjust = -1, show_guide = FALSE, size = 3) +
scale_color_manual(values = c("grey", "red")) +
scale_x_continuous("IQ threshold") +
scale_y_continuous("IQ beta", breaks = seq(-1, 1, .05)) +
theme_bw()
## Warning: The `show_guide` argument of `layer()` is deprecated as of ggplot2 2.0.0.
## ℹ Please use the `show.legend` argument instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
GG_save("figs/IQ_ols_threshold_search.png")
#same results for the 5-factor model first dimension?
#model leftism
pol_models_fa5 = list(
linear = ols(fa5_globalist_socialism ~ IQ + sex + age + ethnic_combos_common, data = d),
IQ_spline3 = ols(fa5_globalist_socialism ~ rcs(IQ, 3) + sex + age + ethnic_combos_common, data = d),
IQ_spline4 = ols(fa5_globalist_socialism ~ rcs(IQ, 4) + sex + age + ethnic_combos_common, data = d),
IQ_spline5 = ols(fa5_globalist_socialism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d)
)
#test models
test_models(pol_models_fa5)
#plot
ggpredict(pol_models_fa5$IQ_spline5, terms = "IQ") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
GG_save("figs/fa5_globalist_socialism.png")
#visual functions for the other political dimensions
pol_models_fa5_all = list(
fa5_globalist_socialism = ols(fa5_globalist_socialism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d),
fa5_america_first_nationalism = ols(fa5_america_first_nationalism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d),
fa5_techno_libertarianism = ols(fa5_techno_libertarianism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d),
fa5_christianity = ols(fa5_christianity ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d),
fa5_not_govt_responsibility = ols(fa5_not_govt_responsibility ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d)
)
#plots
ggpredict(pol_models_fa5_all$fa5_america_first_nationalism, terms = "IQ") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
GG_save("figs/fa5_america_first_nationalism.png")
ggpredict(pol_models_fa5_all$fa5_techno_libertarianism, terms = "IQ") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
GG_save("figs/fa5_techno_libertarianism.png")
ggpredict(pol_models_fa5_all$fa5_christianity, terms = "IQ") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
GG_save("figs/fa5_christianity.png")
ggpredict(pol_models_fa5_all$fa5_not_govt_responsibility, terms = "IQ") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
GG_save("figs/fa5_not_govt_responsibility.png")
#nonlinear effects for these other dimensions?
lrtest(
ols(fa5_globalist_socialism ~ IQ + sex + age + ethnic_combos_common, data = d),
ols(fa5_globalist_socialism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d)
)
##
## Model 1: fa5_globalist_socialism ~ IQ + sex + age + ethnic_combos_common
## Model 2: fa5_globalist_socialism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common
##
## L.R. Chisq d.f. P
## 14.12344 3.00000 0.00274
lrtest(
ols(fa5_america_first_nationalism ~ IQ + sex + age + ethnic_combos_common, data = d),
ols(fa5_america_first_nationalism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d)
)
##
## Model 1: fa5_america_first_nationalism ~ IQ + sex + age + ethnic_combos_common
## Model 2: fa5_america_first_nationalism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common
##
## L.R. Chisq d.f. P
## 15.13228 3.00000 0.00171
lrtest(
ols(fa5_techno_libertarianism ~ IQ + sex + age + ethnic_combos_common, data = d),
ols(fa5_techno_libertarianism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d)
)
##
## Model 1: fa5_techno_libertarianism ~ IQ + sex + age + ethnic_combos_common
## Model 2: fa5_techno_libertarianism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common
##
## L.R. Chisq d.f. P
## 4.956 3.000 0.175
lrtest(
ols(fa5_christianity ~ IQ + sex + age + ethnic_combos_common, data = d),
ols(fa5_christianity ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d)
)
##
## Model 1: fa5_christianity ~ IQ + sex + age + ethnic_combos_common
## Model 2: fa5_christianity ~ rcs(IQ, 5) + sex + age + ethnic_combos_common
##
## L.R. Chisq d.f. P
## 3.49e+01 3.00e+00 1.28e-07
lrtest(
ols(fa5_not_govt_responsibility ~ IQ + sex + age + ethnic_combos_common, data = d),
ols(fa5_not_govt_responsibility ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d)
)
##
## Model 1: fa5_not_govt_responsibility ~ IQ + sex + age + ethnic_combos_common
## Model 2: fa5_not_govt_responsibility ~ rcs(IQ, 5) + sex + age + ethnic_combos_common
##
## L.R. Chisq d.f. P
## 6.5020 3.0000 0.0896
#for the remaining general factors
lrtest(
ols(fa2_globalist_socialism ~ IQ + sex + age + ethnic_combos_common, data = d),
ols(fa2_globalist_socialism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d)
)
##
## Model 1: fa2_globalist_socialism ~ IQ + sex + age + ethnic_combos_common
## Model 2: fa2_globalist_socialism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common
##
## L.R. Chisq d.f. P
## 14.02789 3.00000 0.00287
lrtest(
ols(fa3_globalist_socialism ~ IQ + sex + age + ethnic_combos_common, data = d),
ols(fa3_globalist_socialism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d)
)
##
## Model 1: fa3_globalist_socialism ~ IQ + sex + age + ethnic_combos_common
## Model 2: fa3_globalist_socialism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common
##
## L.R. Chisq d.f. P
## 13.7924 3.0000 0.0032
lrtest(
ols(fa4_globalist_socialism ~ IQ + sex + age + ethnic_combos_common, data = d),
ols(fa4_globalist_socialism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common, data = d)
)
##
## Model 1: fa4_globalist_socialism ~ IQ + sex + age + ethnic_combos_common
## Model 2: fa4_globalist_socialism ~ rcs(IQ, 5) + sex + age + ethnic_combos_common
##
## L.R. Chisq d.f. P
## 14.11920 3.00000 0.00275
#fit models across all items
#then compare model fit using anova
pol_questions_models_gam = fit_pol_question_models_gam(pol_vars, d)
#which shows nonlinear effect of IQ?
pol_questions_models_gam %>%
mutate(
nice_y = str_clean(y),
nice_y = nice_y %>% fct_reorder(spline_model_p_log10)
) %>%
ggplot(aes(nice_y, spline_model_p_log10)) +
geom_point() +
scale_x_discrete("Political opinion") +
scale_y_continuous("-log10(p) for spline model") +
coord_flip() +
geom_hline(yintercept = -log10(0.05), linetype = 2)
GG_save("figs/spline_iq_effect.png")
#how many of them find nominal evidence for nonlinear?
nrow(pol_questions_models_gam)
## [1] 26
sum(pol_questions_models_gam$spline_model_p < .05)
## [1] 17
mean(pol_questions_models_gam$spline_model_p < .05)
## [1] 0.654
pol_questions_models_gam %>% select(-linear_model, -spline_model, -spline_model_natural, -preds) %>% print(n = Inf)
## # A tibble: 26 × 9
## model_number y IQ_std_beta IQ_std_beta_se linear_rsq spline_rsq
## <int> <chr> <dbl> <dbl> <dbl> <dbl>
## 1 1 The_government… -0.235 0.0320 0.0572 0.0727
## 2 2 The_government… 0.121 0.0319 0.0631 0.0737
## 3 3 Large_companie… -0.0493 0.0311 0.109 0.136
## 4 4 The_government… 0.0805 0.0319 0.0623 0.0647
## 5 5 It_should_be_t… 0.0977 0.0321 0.0502 0.0556
## 6 6 It_should_not_… -0.116 0.0326 0.0173 0.0196
## 7 7 It_should_be_t… 0.169 0.0321 0.0499 0.0637
## 8 8 It_not_should_… -0.0669 0.0328 0.00576 0.0112
## 9 9 I_think_that_t… 0.0670 0.0326 0.0174 0.0237
## 10 10 I_would_suppor… 0.252 0.0317 0.0742 0.0833
## 11 11 Humans_should_… 0.0848 0.0324 0.0309 0.0356
## 12 12 Military_spend… -0.285 0.0304 0.144 0.152
## 13 13 Immigrants_sho… 0.0563 0.0318 0.0638 0.0643
## 14 14 I_love_my_coun… -0.183 0.0303 0.151 0.160
## 15 15 It_is_importan… -0.199 0.0313 0.0938 0.107
## 16 16 My_country_sho… -0.0970 0.0324 0.0297 0.0418
## 17 17 Race_is_a_soci… 0.0865 0.0326 0.0206 0.0206
## 18 18 Biotechnology_… 0.0237 0.0319 0.0586 0.0586
## 19 19 Billionaires_s… 0.143 0.0321 0.0481 0.0481
## 20 20 We_should_use_… 0.154 0.0301 0.162 0.163
## 21 21 Abortion_shoul… -0.222 0.0318 0.0670 0.0724
## 22 22 Christianity_s… -0.370 0.0303 0.150 0.170
## 23 23 Free_speech_sh… 0.0865 0.0317 0.0707 0.0738
## 24 24 Most_psychoact… 0.0882 0.0323 0.0380 0.0393
## 25 25 It_should_be_l… -0.0739 0.0325 0.0231 0.0231
## 26 26 Feminism_is_go… 0.242 0.0315 0.0850 0.100
## # ℹ 3 more variables: spline_model_p <dbl>, spline_model_p_log10 <dbl>,
## # spline_rsq_delta <dbl>
#are these the same ones? correlate the evidence value
tibble(
y = pol_question_models_k4$y,
rms_natural = pol_question_models_k4$spline_model_p_log10,
mgcv_tp = pol_questions_models_gam$spline_model_p_log10
) %>%
GG_scatter("rms_natural", "mgcv_tp", case_names = "y") +
xlim(-3, 10)
## `geom_smooth()` using formula = 'y ~ x'
#plot the outlier
pol_questions_models_gam %>%
filter(y == "Billionaires_should_pay_very_high_taxes") %>%
pull(spline_model_natural) %>%
extract2(1) %>%
ggpredict(terms = "IQ") %>%
plot()
#without the outlier
tibble(
y = pol_question_models_k4$y,
rms_natural = pol_question_models_k4$spline_model_p_log10,
mgcv_tp = pol_questions_models_gam$spline_model_p_log10
) %>%
filter(y != "Billionaires_should_pay_very_high_taxes") %>%
GG_scatter("rms_natural", "mgcv_tp", case_names = "y") +
xlim(-3, 10)
## `geom_smooth()` using formula = 'y ~ x'
#fit model
pol_models_gam = list(
linear = gam(conservatism ~ IQ + sex + age + ethnic_combos_common, data = d),
IQ_spline = gam(conservatism ~ s(IQ) + sex + age + ethnic_combos_common, data = d),
wave1 = gam(conservatism ~ s(IQ) + sex + age + ethnic_combos_common, data = d %>% filter(wave == "original")),
wave2 = gam(conservatism ~ s(IQ) + sex + age + ethnic_combos_common, data = d %>% filter(wave == "replication"))
)
#examine
summary(pol_models_gam$linear)
##
## Family: gaussian
## Link function: identity
##
## Formula:
## conservatism ~ IQ + sex + age + ethnic_combos_common
##
## Parametric coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 0.97567 0.22622 4.31 1.8e-05 ***
## IQ -0.01469 0.00197 -7.45 2.0e-13 ***
## sexFemale -0.25157 0.06108 -4.12 4.1e-05 ***
## age 0.01389 0.00198 7.01 4.7e-12 ***
## ethnic_combos_commonasian -0.17497 0.20172 -0.87 0.38594
## ethnic_combos_commonblack -0.36604 0.10555 -3.47 0.00055 ***
## ethnic_combos_commoneast_asian 0.15869 0.22344 0.71 0.47776
## ethnic_combos_commonhispanic 0.14368 0.16965 0.85 0.39725
## ethnic_combos_commonwhite, hispanic -0.18802 0.22055 -0.85 0.39413
## ethnic_combos_commonOther 0.02275 0.10922 0.21 0.83506
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
##
## R-sq.(adj) = 0.125 Deviance explained = 13.3%
## GCV = 0.8844 Scale est. = 0.87517 n = 958
summary(pol_models_gam$IQ_spline)
##
## Family: gaussian
## Link function: identity
##
## Formula:
## conservatism ~ s(IQ) + sex + age + ethnic_combos_common
##
## Parametric coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) -0.5266 0.1068 -4.93 9.6e-07 ***
## sexFemale -0.2485 0.0608 -4.09 4.8e-05 ***
## age 0.0150 0.0020 7.50 1.5e-13 ***
## ethnic_combos_commonasian -0.1395 0.2011 -0.69 0.48801
## ethnic_combos_commonblack -0.3550 0.1061 -3.34 0.00086 ***
## ethnic_combos_commoneast_asian 0.1720 0.2218 0.78 0.43839
## ethnic_combos_commonhispanic 0.1353 0.1691 0.80 0.42409
## ethnic_combos_commonwhite, hispanic -0.1807 0.2193 -0.82 0.41010
## ethnic_combos_commonOther 0.0311 0.1085 0.29 0.77478
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## Approximate significance of smooth terms:
## edf Ref.df F p-value
## s(IQ) 7.51 8.46 9.07 <2e-16 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## R-sq.(adj) = 0.14 Deviance explained = 15.4%
## GCV = 0.87482 Scale est. = 0.85974 n = 958
#test
anova(pol_models_gam$linear, pol_models_gam$IQ_spline, test = "Chisq")
#visuals
ggeffects::ggpredict(pol_models_gam$IQ_spline, terms = "IQ") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
GG_save("figs/conservatism_iq_spline_gam.png")
ggeffects::ggpredict(pol_models_gam$wave1, terms = "IQ") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
ggeffects::ggpredict(pol_models_gam$wave2, terms = "IQ") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
#p values for nonlinearity by wave
#wave 1
anova(
gam(conservatism ~ IQ + sex + age + ethnic_combos_common, data = d %>% filter(wave == "original")),
gam(conservatism ~ s(IQ) + sex + age + ethnic_combos_common, data = d %>% filter(wave == "original")),
test = "Chisq"
)
#wave 2
anova(
gam(conservatism ~ IQ + sex + age + ethnic_combos_common, data = d %>% filter(wave == "replication")),
gam(conservatism ~ s(IQ) + sex + age + ethnic_combos_common, data = d %>% filter(wave == "replication")),
test = "Chisq"
)
#by survey
bind_rows(
ggpredict(pol_models_gam$wave1, terms = "IQ") %>% as.data.frame() %>% mutate(survey = "original"),
ggpredict(pol_models_gam$wave2, terms = "IQ") %>% as.data.frame() %>% mutate(survey = "replication")
) %>%
ggplot(aes(x = x, y = predicted, color = survey)) +
geom_line() +
geom_ribbon(aes(ymin = conf.low, ymax = conf.high), alpha = .1, linewidth = 0) +
scale_color_discrete("Survey")
#the gam function seems to automatically deal with the dropping of unused levels for ethnicity, so these were not changed
#there's also obvious overfitting in the 2nd wave gam model, but in the spirit of consistency, i left the default settings
#2 factor solution
anova(
gam(fa2_globalist_socialism ~ IQ + sex + age + ethnic_combos_common, data = d),
gam(fa2_globalist_socialism ~ s(IQ) + sex + age + ethnic_combos_common, data = d),
test = "Chisq"
)
#3
anova(
gam(fa3_globalist_socialism ~ IQ + sex + age + ethnic_combos_common, data = d),
gam(fa3_globalist_socialism ~ s(IQ) + sex + age + ethnic_combos_common, data = d),
test = "Chisq"
)
#4
anova(
gam(fa4_globalist_socialism ~ IQ + sex + age + ethnic_combos_common, data = d),
gam(fa4_globalist_socialism ~ s(IQ) + sex + age + ethnic_combos_common, data = d),
test = "Chisq"
)
#5
anova(
gam(fa5_globalist_socialism ~ IQ + sex + age + ethnic_combos_common, data = d),
gam(fa5_globalist_socialism ~ s(IQ) + sex + age + ethnic_combos_common, data = d),
test = "Chisq"
)
#plot results
pol_models_fa5_gam = gam(fa5_globalist_socialism ~ s(IQ) + sex + age + ethnic_combos_common, data = d)
ggeffects::ggpredict(pol_models_fa5_gam, terms = "IQ") %>%
plot(show_residuals = T) +
ggtitle(NULL) +
theme_bw()
## Data points may overlap. Use the `jitter` argument to add some amount of
## random variation to the location of data points and avoid overplotting.
GG_save("figs/fa5_globalist_socialism_gam.png")
write_sessioninfo()
## R version 4.4.2 (2024-10-31)
## Platform: x86_64-pc-linux-gnu
## Running under: Linux Mint 21.1
##
## Matrix products: default
## BLAS: /usr/lib/x86_64-linux-gnu/blas/libblas.so.3.10.0
## LAPACK: /usr/lib/x86_64-linux-gnu/lapack/liblapack.so.3.10.0
##
## locale:
## [1] LC_CTYPE=en_US.UTF-8 LC_NUMERIC=C
## [3] LC_TIME=en_US.UTF-8 LC_COLLATE=en_US.UTF-8
## [5] LC_MONETARY=en_DK.UTF-8 LC_MESSAGES=en_US.UTF-8
## [7] LC_PAPER=en_DK.UTF-8 LC_NAME=C
## [9] LC_ADDRESS=C LC_TELEPHONE=C
## [11] LC_MEASUREMENT=en_DK.UTF-8 LC_IDENTIFICATION=C
##
## time zone: Europe/Brussels
## tzcode source: system (glibc)
##
## attached base packages:
## [1] stats4 stats graphics grDevices utils datasets methods
## [8] base
##
## other attached packages:
## [1] mgcv_1.9-1 nlme_3.1-166 mirt_1.42
## [4] lattice_0.22-5 readxl_1.4.3 ggeffects_1.7.0
## [7] rms_6.8-2 kirkegaard_2025-01-08 psych_2.4.6.26
## [10] assertthat_0.2.1 weights_1.0.4 Hmisc_5.1-3
## [13] magrittr_2.0.3 lubridate_1.9.3 forcats_1.0.0
## [16] stringr_1.5.1 dplyr_1.1.4 purrr_1.0.2
## [19] readr_2.1.5 tidyr_1.3.1 tibble_3.2.1
## [22] ggplot2_3.5.1 tidyverse_2.0.0
##
## loaded via a namespace (and not attached):
## [1] rstudioapi_0.16.0 audio_0.1-11 jsonlite_1.8.8
## [4] shape_1.4.6.1 datawizard_0.12.2 TH.data_1.1-2
## [7] jomo_2.7-6 farver_2.1.2 nloptr_2.1.1
## [10] rmarkdown_2.28 ragg_1.3.2 vctrs_0.6.5
## [13] minqa_1.2.8 base64enc_0.1-3 htmltools_0.5.8.1
## [16] polspline_1.1.25 haven_2.5.4 curl_5.2.2
## [19] broom_1.0.6 cellranger_1.1.0 Formula_1.2-5
## [22] mitml_0.4-5 dcurver_0.9.2 sass_0.4.9
## [25] parallelly_1.38.0 bslib_0.8.0 htmlwidgets_1.6.4
## [28] plyr_1.8.9 sandwich_3.1-0 testthat_3.2.1.1
## [31] zoo_1.8-12 cachem_1.1.0 admisc_0.35
## [34] lifecycle_1.0.4 iterators_1.0.14 pkgconfig_2.0.3
## [37] Matrix_1.7-1 R6_2.5.1 fastmap_1.2.0
## [40] future_1.34.0 digest_0.6.37 colorspace_2.1-1
## [43] patchwork_1.2.0 textshaping_0.4.0 vegan_2.6-6.1
## [46] labeling_0.4.3 progressr_0.14.0 fansi_1.0.6
## [49] timechange_0.3.0 gdata_3.0.0 compiler_4.4.2
## [52] withr_3.0.1 htmlTable_2.4.3 backports_1.5.0
## [55] highr_0.11 R.utils_2.12.3 pan_1.9
## [58] MASS_7.3-61 quantreg_5.98 sessioninfo_1.2.2
## [61] GPArotation_2024.3-1 gtools_3.9.5 permute_0.9-7
## [64] tools_4.4.2 foreign_0.8-87 future.apply_1.11.2
## [67] nnet_7.3-19 R.oo_1.26.0 glue_1.7.0
## [70] grid_4.4.2 checkmate_2.3.2 cluster_2.1.8
## [73] generics_0.1.3 snow_0.4-4 gtable_0.3.5
## [76] RPushbullet_0.3.4 tzdb_0.4.0 R.methodsS3_1.8.2
## [79] data.table_1.16.0 hms_1.1.3 Deriv_4.1.3
## [82] utf8_1.2.4 foreach_1.5.2 pillar_1.9.0
## [85] splines_4.4.2 survival_3.7-0 SparseM_1.84-2
## [88] tidyselect_1.2.1 pbapply_1.7-2 knitr_1.48
## [91] gridExtra_2.3 EFA.dimensions_0.1.8.4 xfun_0.47
## [94] brio_1.1.5 stringi_1.8.4 yaml_2.3.10
## [97] boot_1.3-31 evaluate_0.24.0 codetools_0.2-19
## [100] beepr_2.0 cli_3.6.3 rpart_4.1.23
## [103] systemfonts_1.1.0 munsell_0.5.1 jquerylib_0.1.4
## [106] Rcpp_1.0.13 EFAtools_0.4.4 globals_0.16.3
## [109] polycor_0.8-1 parallel_4.4.2 MatrixModels_0.5-3
## [112] lme4_1.1-35.5 listenv_0.9.1 glmnet_4.1-8
## [115] mvtnorm_1.2-6 SimDesign_2.17.1 scales_1.3.0
## [118] crayon_1.5.3 insight_0.20.3 rlang_1.1.4
## [121] multcomp_1.4-26 mnormt_2.1.1 mice_3.16.0
#final dataset for reuse
d %>% write_rds("data/politics and IQ for reuse.rds")
#upload to OSF
#avoid uploading the data in case they freak out again
if (F) {
library(osfr)
#auth
osf_auth(readr::read_lines("~/.config/osf_token"))
#the project we will use
osf_proj = osf_retrieve_node("https://osf.io/tbqzw/")
#upload files
#overwrite existing (versioning)
osf_upload(osf_proj, conflicts = "overwrite",
path = c(
"figs",
"data",
"politics.html",
"politics.Rmd"
))
}