geom_bar {ggbio} | R Documentation |
Show interval data as vertical bar, width equals to interval width and use 'score' or specified 'y' as y scale.
## S4 method for signature 'ANY' geom_bar(data, ...) ## S4 method for signature 'GRanges' geom_bar(data,..., xlab, ylab, main)
data |
Typically a |
... |
Extra parameters such as aes() or |
xlab |
Label for x |
ylab |
Label for y |
main |
Title for plot. |
Useful for showing bed like files, when imported as GRanges, have a extra 'score' column, use it as default y, you could also specify y by using aes(y = ).
A 'Layer'.
## load library(GenomicRanges) ## simul set.seed(123) gr.b <- GRanges(seqnames = "chr1", IRanges(start = seq(1, 100, by = 10), width = sample(4:9, size = 10, replace = TRUE)), score = rnorm(10, 10, 3), value = runif(10, 1, 100)) gr.b2 <- GRanges(seqnames = "chr2", IRanges(start = seq(1, 100, by = 10), width = sample(4:9, size = 10, replace = TRUE)), score = rnorm(10, 10, 3), value = runif(10, 1, 100)) gr.b <- c(gr.b, gr.b2) ## default use score as y ## bar ggplot(gr.b) + geom_bar(aes(fill = value)) ## or ggplot() + geom_bar(gr.b, aes(fill = value)) ggplot(gr.b) + geom_bar(aes(y = value)) ## equal to autoplot(gr.b, geom = "bar")