A visualization of some of the data presented in the following article by Dr. Janao at UP: http://halalan.up.edu.ph/viewpoints/by-experts/222-what-kinds-of-laws-do-our-congress-legislate?highlight=WyJwYW5hbyJd
Top 10 types of laws passed in Congress in sessions 8 - 14
library(dplyr)
library(ggvis)
bills <- read.csv("types-of-bills.csv")
bills %>%
ggvis(x= ~as.factor(session), y= ~topic, size := ~number.of.bills*3,
fill = ~topic) %>%
layer_points() %>%
add_axis("x", title = "Session of Congress", title_offset = 50) %>%
add_axis("y", title = "Topic", title_offset = 190) %>%
set_options(height = 500, width = 900)