Closed
Description
This leads to trouble when trying to pass n
to stat_density2d
in geom_density2d
.
set.seed(42)
df <- data.frame(x=runif(100),y=runif(100))
library(ggplot2)
ggplot(df,aes(x,y)) + geom_density2d(stat='density2d', n = 100)
#Error: is.logical(na.rm) is not TRUE
ggplot(df,aes(x,y)) + geom_density2d(stat='density2d', na.rm = TRUE, n = 100)
#works
Reported here: http://stackoverflow.com/q/34749125/1412059
Metadata
Metadata
Assignees
Labels
No labels