Top Cited

📄 Top Cited Articles

top_articles <- df %>%
  arrange(desc(TC)) %>%
  select(PY, TI, AU, J9, TC) %>%
  slice_head(n = 10)

ggplot(top_articles, aes(x = reorder(TI, TC), y = TC)) +
  geom_col(fill = "darkblue") +
  coord_flip() +
  labs(title = "Top Cited Articles", x = "Title", y = "Citations")

datatable(top_articles, 
          colnames = c("Year", "Title", "Authors", "Journal", "Citations"),
          options = list(pageLength = 10))

👤 Top Cited Authors

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))

🏛️ Top Cited Institutions

top_institutions <- df %>%
  select(AU_UN, TC) %>%
  separate_rows(AU_UN, sep = ";") %>%
  group_by(AU_UN) %>%
  summarise(total_citations = sum(TC, na.rm = TRUE), .groups = "drop") %>%
  arrange(desc(total_citations)) %>%
  slice_head(n = 10)

ggplot(top_institutions, aes(x = reorder(AU_UN, total_citations), y = total_citations)) +
  geom_col(fill = "orange") +
  coord_flip() +
  labs(title = "Top Cited Institutions", x = "Institution", y = "Total Citations")

datatable(top_institutions, 
          colnames = c("Institution", "Total Citations"),
          options = list(pageLength = 10))