On the last April 23rd, 2019, Saudi Arabia executed 37 people, most of them Shia Muslims (minority religion). Dr. Tenzin Dorjee, Chair of the Comission (United States) said “The Saudi government’s execution of minority Shia Muslims on the basis of their religious identity and peaceful activism is not only shocking, but also directly contradicts the government’s official narrative of working towards greater modernisation and improving religious freedom conditions”.
Read more about the executions on Aljazeera.
Saudi Arabia owns a position among the countries in the world with higher religious persecution. The visualizations bellow compare Saudi Arabia with other countries with high religous persecution from each continent.
Data collected from: Pew-Templeton | Global Religous Futures Project. You will see two measurements:
The measures range from 0-10. See the next tab (Data) for more details about the data.
saudi %>%
filter(Country == "Saudi Arabia") %>%
ggplot(aes(Year, Value)) +
geom_line(stat = "identity", aes(linetype = Issue), color = "darkgreen", size = 1.2) +
geom_line(data = saudi %>% filter(Country == "World Average"),
stat = "identity", aes(linetype = Issue), color = "black", size = 1) +
geom_line(data = saudi %>% filter(!Country %in% c("Saudi Arabia", "World Average")),
stat = "identity", aes(group = Country), color = "black", alpha = .15) +
geom_text(label = "Saudi Arabia", x = 2015, y = 6.5, color = "darkgreen", size = 3) +
geom_text(label = "World Average", x = 2015, y = 2.3, color = "black", size = 3) +
labs(y = "Level of Persecution") +
theme(legend.position = c(0.8,0.95),
legend.direction = "vertical",
legend.title = element_blank(),
legend.box.background = element_blank(),
legend.background = element_blank(),
panel.background = element_blank(),
panel.grid = element_blank(),
axis.title.x = element_blank(),
axis.ticks = element_blank())
gif.saudi.gov <- saudi %>%
filter(Issue == "Government Restrictions") %>%
group_by(Year) %>%
mutate(rank = rank(Value, ties.method="first")) %>%
ungroup() %>%
mutate(saudi = ifelse(Country == "Saudi Arabia", 1, 0)) %>%
ggplot(aes(rank, group = Country, fill = Continent)) +
geom_bar(stat = 'identity', aes(y = Value, alpha = saudi)) +
geom_text(aes(label = Country, y = Value, alpha = saudi), position = position_dodge(0.1), size = 3) +
scale_alpha(range = c(0.5,1), guide = F) +
scale_fill_manual(values = colors) +
labs(subtitle = '{closest_state}',
y = "Government RestrictionsSocial Hostilities") +
coord_flip(expand = T) + #clip = "off", expand = FALSE) +
theme(axis.line.y = element_blank(),
axis.ticks.y = element_blank(),
axis.text.y = element_blank(),
axis.title.y = element_blank(),
panel.background = element_blank(),
panel.grid = element_blank(),
legend.position = "top",
legend.key.size = unit(0.4, "cm"),
legend.text = element_text(size = 8),
legend.title = element_text(size = 10, color = "black"),
title = element_text(size = 15, face = "bold", colour = "blue")) +
transition_states(Year, transition_length = 5, state_length = 1) +
ease_aes('cubic-in-out') +
#ease_aes('linear') +
#ease_aes('quadratic-in-out') +
enter_fade() +
exit_shrink()
animate(gif.saudi.gov, fps = 25, duration = 45, width = 800, height = 600, renderer = gifski_renderer("saudi_gov.gif"))
gif.saudi <- saudi %>%
filter(Issue == "Social Hostilities") %>%
group_by(Year) %>%
mutate(rank = rank(Value, ties.method="first")) %>%
ungroup() %>%
mutate(saudi = ifelse(Country == "Saudi Arabia", 1, 0)) %>%
ggplot(aes(rank, group = Country, fill = Continent)) +
geom_bar(stat = 'identity', aes(y = Value, alpha = saudi)) +
geom_text(aes(label = Country, y = Value, alpha = saudi), position = position_dodge(0.1), size = 3) +
scale_alpha(range = c(0.5,1), guide = F) +
scale_fill_manual(values = colors) +
labs(subtitle = '{closest_state}',
y = "Social Hostilities") +
coord_flip(expand = T) + #clip = "off", expand = FALSE) +
theme(axis.line.y = element_blank(),
axis.ticks.y = element_blank(),
axis.text.y = element_blank(),
axis.title.y = element_blank(),
panel.background = element_blank(),
panel.grid = element_blank(),
legend.position = "top",
legend.key.size = unit(0.4, "cm"),
legend.text = element_text(size = 8),
legend.title = element_text(size = 10, color = "black"),
title = element_text(size = 15, face = "bold", colour = "firebrick")) +
transition_states(Year, transition_length = 5, state_length = 1) +
ease_aes('cubic-in-out') +
#ease_aes('linear') +
#ease_aes('quadratic-in-out') +
enter_fade() +
exit_shrink()
animate(gif.saudi, fps = 25, duration = 45, width = 800, height = 600, renderer = gifski_renderer("saudi.gif"))
# Scatterplot
p <- saudi.raw %>%
plot_ly(
x = ~`Social Hostilities`,
y = ~`Government Restrictions`,
size = ~ifelse(Country == "Saudi Arabia" | Country == "World Average", 4, 1),
color = ~Continent,
colors = ~colors,
frame = ~Year,
type = "scatter",
mode = "markers",
text = ~Country,
hoverinfo = "text",
showlegend = T
)
p %>%
animation_opts(frame = 2000, transition = 2000) %>%
# animation_button(x = 1, xanchor = "right", y = 0, yanchor = "bottom") %>%
animation_slider(currentvalue = list(prefix = "Year ", font = list(color = "darkgreen"))
)
This page presents comparisons of governamental and social religious persecution between Saudi Arabia and other countries with high level of religious restrictions from each continent.
The Government Restrictions Index (GRI) measures – on a 10-point scale – government laws, policies and actions that restrict religious beliefs or practices. The GRI is comprised of 20 measures of restrictions, including:
The Social Hostilities Index (SHI) measures – on a 10-point scale – acts of religious hostility by private individuals, organizations and social groups. The SHI includes 13 measures of social hostilities, some of those are:
For more on the methodology for the Global Restrictions on Religion studies, see About the Data.
DT::datatable(saudi.raw)