top_authors <- df %>%
select(AU, TC) %>%
separate_rows(AU, sep = ";") %>%
group_by(AU) %>%
summarise(total_citations = sum(TC, na.rm = TRUE), .groups = "drop") %>%
arrange(desc(total_citations)) %>%
slice_head(n = 10)
ggplot(top_authors, aes(x = reorder(AU, total_citations), y = total_citations)) +
geom_col(fill = "darkgreen") +
coord_flip() +
labs(title = "Top Cited Authors", x = "Author", y = "Total Citations")
datatable(top_authors,
colnames = c("Author", "Total Citations"),
options = list(pageLength = 10))