R Markdown

library(haven)
library(ggplot2)
library(ggrepel)

dat <- read_sav("dat_longer.sav")
str(dat)
## tibble [32 × 3] (S3: tbl_df/tbl/data.frame)
##  $ Syndrome: chr [1:32] "Yêu thống" "Yêu thống" "Yêu thống" "Yêu thống" ...
##   ..- attr(*, "format.spss")= chr "A17"
##  $ Nam     : chr [1:32] "year.2019" "year.2020" "year.2021" "year.2022" ...
##   ..- attr(*, "format.spss")= chr "A9"
##  $ So.luong: num [1:32] 145 130 66 107 90 120 30 58 60 51 ...
##   ..- attr(*, "format.spss")= chr "F8.2"
ggplot(data=dat, aes(x=Nam, y=So.luong, group=Syndrome))+
  geom_point()+
  geom_line(aes(col=Syndrome))+
  theme(legend.position="right")

ggsave("chung8.svg")
## Saving 7 x 5 in image