library(dplyr)
library(plotly)
library(RColorBrewer)
plot_ly(pie, labels = ~names, values = ~saratov, type = 'pie',
textposition = 'outside',textinfo = 'label+percent', textfont = list(size = 16),
height = 700, width = 750,
marker = list(
colors = brewer.pal(6,"Set2"))) %>%
layout(title = 'Saratov Province (1897 Census)\n',
xaxis = list(showgrid = FALSE, zeroline = FALSE, showticklabels = FALSE),
yaxis = list(showgrid = FALSE, zeroline = FALSE, showticklabels = FALSE),
margin = list(l = 100, r = 50, b = 50, t = 50, pad = 4))