1 Dataset

# Load dataset from IL project file
df <- as.data.frame(readRDS("Israel Survey/data/il_pe.RDS"))

# Calculate the Political Extremism Gauge Indices
wave_var <- "Wave"
community_var <- "pe_left_center_right"

indices_result <- af_gauge_indices(df, pop_var1 = wave_var, comm_var1 = community_var)
df <- indices_result$df

1.1 Survey Waves

af_create_y_plot(df,y_var = wave_var, plot_types = c("bar"),
                 title = "Survey Waves")


af_create_y_plot(df,y_var = wave_var, plot_types = c("bar"), group_var = community_var,
                 title = "Survey Waves by Political Orientation")


af_create_y_plot(df,y_var = wave_var, plot_types = c("bar"), group_var = "gender",
                 title = "Survey Waves by Gender")


af_create_y_plot(df,y_var = wave_var, plot_types = c("bar"), group_var = "age_group",
                 title = "Survey Waves by Age roup")

2 Survey Measures & Dimensions

2.1 Cognitive (Ideology) Dimension

xlabel <- "pe_ideology"
title = "Cognitive (Ideology) Dimension"
df %>% explore(pe_ideology) + ggtitle(title) + xlab(xlabel)

df %>% af_create_y_plot(y_var = "pe_ideology", group_var = community_var, title = title, 
                        plot_types = c("density"), use_facet = TRUE, facet_cols = 3)

דרג/י בין 1-7 את מידת הסכמתך למשפטים הבאים, כאשר: 7 = מסכים מאוד ו-1 = כלל לא מסכים

Rate your agreement with the following statements on a scale of 1-7, where: 7 = strongly agree and 1 = strongly disagree.

(1 = Right political orientation 7 = Left political orientation)

2.2 Behavioral (Violence) Dimension

xlabel <- "pe_violence"
title <- "Behavioral (Violence) Dimension"
df %>% explore(pe_violence) + ggtitle(title) + xlab(xlabel)

df %>% af_create_y_plot(y_var = "pe_violence", group_var = community_var, title = title, 
                        plot_types = c("density"), use_facet = TRUE, facet_cols = 3)

2.2.1 Violence against the Government

דרג/י בין 1-7 את מידת הסכמתך למשפטים הבאים, כאשר: 7 = מסכים מאוד ו-1 = כלל לא מסכים

Rate your agreement with the following statements on a scale of 1-7, where: 7 = strongly agree and 1 = strongly disagree.

2.2.2 Violence against the Institutions

דרג/י בין 1-7 את מידת הסכמתך לצעדים בהם את/ה היית מוכן/ה לנקוט באופן אישי על מנת להביא להפסקת מדיניות מסוכנת של השלטון (7 = מסכים מאוד ו-1 = כלל לא מסכים)

Rate between 1-7 the extent to which you agree with the steps you would be willing to take personally to bring about an end to a dangerous government policy (7 = strongly agree and 1 = strongly disagree)

2.2.3 Violence against the Outgroup

דרג/י בין 1-7 את מידת הסכמתך למשפטים הבאים, כאשר: 7 = מסכים מאוד ו-1 = כלל לא מסכים

Rate your agreement with the following statements on a scale of 1-7, where: 7 = strongly agree and 1 = strongly disagree.

2.3 Social (Intolerance) Dimension

xlabel <- "pe_intolerance"
title <- "Social (Intolerance) Dimension"
df %>% explore(pe_intolerance) + ggtitle(title) + xlab(xlabel)

df %>% af_create_y_plot(y_var = "pe_intolerance", group_var = community_var, title = title, 
                        plot_types = c("density"), use_facet = TRUE, facet_cols = 3)

2.3.1 Social Distancing Vars

דרג/י בין 1-7 את מידת הסכמתך למשפטים הבאים, כאשר: 7 = מסכים מאוד ו-1 = כלל לא מסכים

Rate your agreement with the following statements on a scale of 1-7, where: 7 = strongly agree and 1 = strongly disagree.

2.3.2 Political Exclusion Vars

דרג/י בין 1-7 את מידת הסכמתך למשפטים הבאים, כאשר: 7 = מסכים מאוד ו-1 = כלל לא מסכים

Rate your agreement with the following statements on a scale of 1-7, where: 7 = strongly agree and 1 = strongly disagree.

3 Political Extremism Indices

3.1 Individual Extremism Levels

af_create_y_plot(df, y_var = wave_var, group_var = "i_cel", plot_types = c("bar"),
                 title = "Cogntive Extremists")


af_create_y_plot(df, y_var = wave_var, group_var = "i_bel", plot_types = c("bar"),
                 title = "Behavioral Extremists")


af_create_y_plot(df, y_var = wave_var, group_var = "i_sel", plot_types = c("bar"),
                 title = "Social Extremists")

3.2 Individual Extremism Relative Intensity

af_create_y_plot(df, y_var = "i_cri", group_var = wave_var, 
                 plot_types = c("density"), use_facet = TRUE, facet_cols = 3, 
                 title = "Cogntive Relative Intensity")


af_create_y_plot(df, y_var = "i_bri", group_var = wave_var,  
                 plot_types = c("density"), use_facet = TRUE, facet_cols = 3, 
                 title = "Behavioral Relative Intensity")


af_create_y_plot(df, y_var = "i_sri", group_var = wave_var, 
                 plot_types = c("density"),use_facet = TRUE, facet_cols = 3, 
                 title = "Social Relative Intensity")

3.3 Individual Extremism Ranks

af_create_y_plot(df, y_var = wave_var, group_var = "i_er1", plot_types = c("bar"),
                 title = "Cogntive Extremists Rank 1")


af_create_y_plot(df, y_var = wave_var, group_var = "i_er2", plot_types = c("bar"),
                 title = "Behavioral Extremists Rank 2")


af_create_y_plot(df, y_var = wave_var, group_var = "i_er3", plot_types = c("bar"),
                 title = "Social Extremists Rank 3")

4 Control Variables

af_create_y_plot(df, y_var = "age", group_var = wave_var, plot_types = c("density"), 
                 title = "Age", use_facet = TRUE, facet_cols = 3)


af_create_y_plot(df,y_var = wave_var,  group_var = "age_group",plot_types = c("bar"),
                 title = "Age Group")


af_create_y_plot(df,y_var = wave_var, group_var = "gender",plot_types = c("bar"), 
                 title = "Gender")