por_partido %>%
top_n(5, bancada) %>%
ggplot(aes(y = "", x = governismo)) +
geom_point(size = 6.5, alpha = .5, shape = 21, fill = "lightseagreen") +
scale_y_discrete(NULL, breaks = NULL) +
scale_x_percent(limits = c(0, 1.1)) +
labs(
title = "Governismo entre os maiores partidos da Câmara",
subtitle = "Votações de jan/2019 a maio/2020")

por_partido %>%
ggplot(aes(y = "", x = governismo)) +
geom_point(size = 6.5, alpha = .5, shape = 21, fill = "lightseagreen") +
scale_y_discrete(NULL, breaks = NULL) +
scale_x_percent(limits = c(0, 1.1)) +
labs(
title = "Governismo para mais partidos na Câmara",
subtitle = "Partidos com pelo menos 5 deputados. Votações de jan/2019 a maio/2020")

por_partido %>%
ggplot(aes(x = governismo)) +
geom_dotplot(binwidth = .025,shape = 21, fill = "lightseagreen") +
scale_y_continuous(NULL, breaks = NULL) +
scale_x_percent(limits = c(0, 1.1)) +
labs(
title = "Governismo para mais partidos na Câmara",
subtitle = "Partidos com pelo menos 5 deputados. Votações de jan/2019 a maio/2020")

presencas %>%
ggplot(aes(x = presenca)) +
geom_dotplot(binwidth = .015,shape = 21, fill = "#f9d6ab", stackdir = 'center') +
scale_y_continuous(NULL, breaks = NULL) +
scale_x_percent(limits = c(0, 1.1)) +
labs(
title = "Presença nas votações nominais",
x = "Presença nas votações",
subtitle = "Deputado/as . Votações de jan/2019 a maio/2020")

presencas %>%
filter(deputado_siglaPartido %in% c("PSB", "PT", "PSL")) %>%
ggplot(aes(x = reorder(deputado_siglaPartido, presenca), y = presenca)) +
geom_dotplot(binwidth = .015, fill = "#f9d6ab", stackdir = 'center', binaxis = "y") +
scale_y_percent(limits = c(0, 1.1)) +
coord_flip() +
labs(
title = "Presença nas votações nominais",
y = "Presença nas votações",
x = "",
subtitle = "Deputado/as . Votações de jan/2019 a maio/2020")

presencas %>%
filter(deputado_siglaPartido %in% c("PSB", "PT", "PSL")) %>%
group_by(deputado_siglaPartido) %>%
summarise(presenca = mean(presenca)) %>%
ggplot(aes(x = reorder(deputado_siglaPartido, presenca), y = presenca)) +
geom_col(fill = "#f9d6ab", color = "black", width = .6) +
scale_y_percent(limits = c(0, 1.1)) +
coord_flip() +
labs(
title = "Presença nas votações nominais",
y = "Presença nas votações",
x = "",
subtitle = "Média por partido. Votações de jan/2019 a maio/2020")

presencas %>%
ggplot(aes(x = presenca)) +
geom_density(fill = "#f9d6ab", color = "black") +
scale_x_percent(limits = c(0, 1.1)) +
labs(
title = "Presença nas votações nominais",
x = "Presença nas votações",
y = "Deputado/as",
subtitle = "Deputado/as . Votações de jan/2019 a maio/2020")

por_partido %>%
ggplot(aes(x = governismo)) +
geom_histogram(binwidth = .05, fill = "lightseagreen", colour = "black", boundary = 0) +
scale_x_percent(limits = c(0, 1.1)) +
labs(
title = "Governismo para mais partidos na Câmara",
subtitle = "Partidos com pelo menos 5 deputados. Votações de jan/2019 a maio/2020",
y = "Número de partidos")
