plot1 <- jumlahTentara_Tidy %>%
filter(`Country Name` == c("Indonesia", "Malaysia", "Singapore", "Brunei", "Thailand", "Philippines", "Cambodia", "Myanmar", "Laos", "Vietnam")) %>%
ggplot(aes(x=Year, y=Amount, group=`Country Name`, color=`Country Name`)) +
geom_point() +
geom_line(lwd=1, alpha=0.6) +
theme_minimal() +
theme(axis.text.x = element_text(angle = 45)) +
ggtitle("Number of Armed Forces Personnel of Indonesia and the Nearby ASEAN Countries") +
scale_y_continuous(labels = comma)
ggplotly(plot1)