Logo Questions Linux Laravel Mysql Ubuntu Git Menu
 

Overlaying geom_points on a geom_histogram or stat_bin

Tags:

r

ggplot2

I wan to use ggplot to plot a histogram (or a step plot using stat_bin) and overlay a few points on it using geom_point.

Here's a base implementation:

library(plotrix)
set.seed(10)
df <- data.frame(id=LETTERS,val=rnorm(length(LETTERS)))
selected.ids <- sample(LETTERS,3,replace=F)
h <- hist(df$val,plot=F,breaks=10)
cols <- sapply(rainbow(length(selected.ids)),function(x) color.id(x)[1])
selected.df <- data.frame(id=selected.ids,col=cols,stringsAsFactors=F)
selected.df$x <- df$val[which(df$id %in% selected.ids)]
selected.df <- selected.df[order(selected.df$x),]
selected.df$y <- h$counts[findInterval(selected.df$x,h$breaks)]
selected.df$col <- factor(selected.df$col,levels=cols)
plot(h)
segments(x0=selected.df$x,x1=selected.df$x,y0=selected.df$y,y1=selected.df$y,cex=18,lwd=8,col=selected.df$col)

which gives:

enter image description here

However when I try ggplot:

ggplot(df,aes(x=val))+geom_histogram(bins=10,colour="black",alpha=0,fill="#FF6666")+geom_point(data=selected.df,aes(x=x,y=y,colour=factor(col)),size=2)+scale_fill_manual(values=levels(selected.df$col),labels=selected.df$id,name="id")+scale_colour_manual(values=levels(selected.df$col),labels=selected.df$id,name="id")

The points and histogram are misaligned: enter image description here

Ideally I would like to plot it using a step plot:

ggplot(df,aes(x=val))+stat_bin(geom="step",bins=10)+geom_point(data=selected.df,aes(x=x,y=y,colour=factor(col)),size=2)+scale_fill_manual(values=levels(selected.df$col),labels=selected.df$id,name="id")+scale_colour_manual(values=levels(selected.df$col),labels=selected.df$id,name="id")

Which looks pretty much like the geom_histogram

enter image description here

but also I'd also like to have the ends of the line touch the y=0 line.

So I do I get the correctly in a step plot using the stat_bin?

like image 972
dan Avatar asked Oct 29 '22 19:10

dan


1 Answers

Your selected.df's y.values is made with breaks hist() uses, but geom_histogram() uses another breaks. (geom_histogram(bins) isn't equivalent to hist(breaks) just to be sure). Additionally, in the step plot, up-down happens on middle values of its breaks. ggplot_build(gg.obj)$data (or plot(gg.obj)$data) gives you some information, breaks, counts, and so on.

geom_histgram
The way is basically the same as base.plot. If you want the same output as base.plot, please use breaks = h$breaks instead of bars = 10.

# a common part to base and ggplot2
library(plotrix)
set.seed(10)
df <- data.frame(id = LETTERS, val = rnorm(length(LETTERS)))
selected.ids <- sample(LETTERS, 3, replace = F)
cols <- sapply(rainbow(length(selected.ids)), function(x) color.id(x)[1])
selected.df <- data.frame(id=selected.ids, col=cols, stringsAsFactors = F)
selected.df$x <- df$val[which(df$id %in% selected.ids)]
selected.df <- selected.df[order(selected.df$x),]
selected.df$col <- factor(selected.df$col, levels=cols)

# (1) make a histogram
g <- ggplot(df, aes(x = val)) + geom_histogram(bins = 10, colour = "black", alpha = 0, fill = "#FF6666")
  # base; h <- hist(df$val, plot = F, breaks = 10)

# (2) get its breaks
g.data <- ggplot_build(g)$data[[1]]
g.breaks <- c(g.data$xmin, tail(g.data$xmax, n=1))
  # base; h$breaks

# (3) get counts of specific x values
selected.df$y <- g.data$count[findInterval(selected.df$x, g.breaks)]
  # base; selected.df$y <- h$counts[findInterval(selected.df$x,h$breaks)]

# (4) draw
g + geom_point(data = selected.df, aes(x = x, y = y, colour = factor(col)), size = 2) + 
  scale_fill_manual(values = levels(selected.df$col), labels = selected.df$id,name = "id") + 
  scale_colour_manual(values = levels(selected.df$col), labels = selected.df$id, name = "id")

enter image description here

stat_bin
You can draw it in the same way as geom_histgram. The important point is up-down happens not on breaks but middle values.

selected.df2 <- selected.df

# (1) make a step plot
s <- ggplot(df, aes(x = val)) + stat_bin(geom = "step", bins = 10)

# (2) get breaks and its middle values
s.data <- ggplot_build(s)$data[[1]]
s.breaks <- c(s.data$xmin, tail(s.data$xmax, n=1))
s.mid.breaks <- s.data$x

# (3) get counts of specific x values using middle values of breaks.
selected.df2$y <- s.data$count[findInterval(selected.df2$x, s.mid.breaks)]

# (4) add a new levels into breaks to start and end at y=0
s.add.breaks <- c(s.breaks[1] - 1.0E-6,    # making lower levels is easy
                  s.breaks, 
                  tail(s.breaks, n=1) + diff(s.breaks[1:2])) # upper need the same range

# (5) draw
ggplot(df, aes(x = val)) + stat_bin(geom = "step", breaks = s.add.breaks) +
  geom_point(data = selected.df2, aes(x = x, y = y, colour = factor(col)), size = 2) +
  scale_fill_manual(values = levels(selected.df2$col), labels = selected.df2$id, name = "id") + 
  scale_colour_manual(values = levels(selected.df2$col), labels = selected.df2$id, name="id")

enter image description here

like image 185
cuttlefish44 Avatar answered Nov 15 '22 06:11

cuttlefish44