library(tidyverse)
set.seed(2018-01-30)
n <- 10000
d <- tibble(x=1:n, y=rnbinom(n, mu = 5, size = 3))
d
d <- d %>%
mutate(y2=ifelse(y==0, 0, log10(y))) %>%
mutate(y2scale=scales::rescale(y2, to=c(0,1)))
d
ggplot(d, aes(x, y)) + geom_point()
last_plot() + coord_polar()
ggplot(d, aes(x, y2)) + geom_point()
last_plot() + coord_polar()
ggplot(d, aes(x, y2scale)) + geom_point()
last_plot() + coord_polar()