Set the default theme & font for plots and tables

font_size = 12

af_theme <- theme_bw(base_size = font_size) +
  theme(
    plot.title = element_text(size = font_size),        # Plot title
    axis.title = element_text(size = font_size),        # Axis titles
    axis.text = element_text(size = font_size),         # Axis tick labels
    legend.title = element_text(size = font_size),      # Legend title
    legend.text = element_text(size = font_size),       # Legend text
    strip.text = element_text(size = font_size)         # Facet variable's name
    )

ggplot2::theme_set(af_theme)

load survey dataset

df <- as.data.frame(readRDS("Israel Survey/data/il_pe.RDS"))

1 Descriptive

df %>% 
  dplyr::select(all_of(c("pe_left_center_right", "religiosity", "pe_religiosity", "leastliked"))) %>%
  explore::explore_all(ncol = 1, color = viridis(2, begin = 0.95))

2 Political Orientation x Outgroup

af_plot_combinations_chart(df, c("pe_left_center_right", "leastliked"), threshold = 1)

af_plot_combinations_chart(df, c("pe_left_center_right", "leastliked"), threshold = 2)

3 Religiosity x Outgroup

af_plot_combinations_chart(df, c("pe_religiosity", "leastliked"), threshold = 1)

af_plot_combinations_chart(df, c("pe_religiosity", "leastliked"), threshold = 2)

Political Orientation x Religiosity x Outgroup

af_plot_combinations_chart(df, c("pe_left_center_right", "pe_religiosity", "leastliked"), threshold = 1)

af_plot_combinations_chart(df, c("pe_left_center_right", "pe_religiosity", "leastliked"), threshold = 2)