library(ggplot2)
setwd("~/documents/scripts/intron_expression")
data <- read.table("output", header=F, as.is=T)
names(data) <- c("gene", "exon", "intron")
data$exon <- as.numeric(data$exon)
data$intron <- as.numeric(data$intron)
sapply(data,class)
## gene exon intron
## "character" "numeric" "numeric"
data$exon <-data$exon + 0.01
data$intron <-data$intron + 0.01
ggplot(data, aes(x=log(exon), y=log(intron))) +
coord_fixed(ratio = 1, xlim=c(0,10), ylim=c(0,10)) +
geom_point(size=1)
ggplot(data, aes(log(exon/intron))) +
geom_histogram()
## stat_bin: binwidth defaulted to range/30. Use 'binwidth = x' to adjust this.