Collection Data from site Central Statistic Agency Indonesia

https://www.bps.go.id/id/statistics-table?subject=528

Create Data Frame & Read Data

library(readxl)
idi2009_2023 <-read_xlsx("/Users/mymac/Desktop/Data Github/idi2009_2023.xlsx")

library(knitr)
kable(idi2009_2023)
Years Index
2009 67.30
2010 63.17
2011 65.48
2012 62.63
2013 63.72
2014 73.04
2015 72.82
2016 70.09
2017 72.11
2018 72.39
2019 74.92
2020 73.66
2021 78.12
2022 80.41
2023 79.51

Create Visualization Indonesian Index Democracy (IDI) 2009-2023

library(ggplot2)
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
idi2009_2023 <- idi2009_2023 %>%
  mutate(Index = as.numeric(Index))

idi2009_2023 %>%
  tail(15) %>%
  ggplot(aes(x = Years, y = Index, group = 1)) +
  geom_line(aes(x = Years, y = Index), color = "black", size = 0.1) +
  geom_point(shape = 20, color = "black", size = 3) +
  geom_text(aes(label = round(Index, 2)),
            vjust = -1, hjust = 0.5, size = 3)+
  theme_test() +
  labs(title = "Indonesia Democracy Index 2009 - 2023",
       subtitle = "Source: Central Statistica Agency & IDI", 
       y = "Index",
       x = "Years") +
  scale_x_continuous(breaks = seq(2000, 2023, by = 1))
## Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.

Critical Indonesian Democracy Index 2009-2023

Indonesia’s democracy index has increased drastically and remained stable from 2017 to 2020, reaching its highest peak of 80.41. After the highest peak, there was a decline in 2023, although it was still above 79, which indicates a problem in Indonesian democracy. The decline in the period from 2022 to 2023 is a signal that Indonesian democracy is not yet fully stable and is still vulnerable to political and social challenges.