Alignment Percentage
library(ggplot2)
setwd("~/Documents/LabPaper/")
STAR <- read.table("star_stats.txt", header = T, sep=",")
STAR$Run <- rep("STAR", nrow(STAR))
hisat <- read.table("hisat_stats.txt", header = T, sep=",")
hisat <- hisat[match(STAR$Sample.Name, hisat$Sample.Name),]
hisat$Run <- rep("HISAT", nrow(hisat))
ALL <- rbind(STAR, hisat)
ALL$Sample.Name <- gsub("Tropicalis_RNA-Seq_Regeneration_", "", ALL$Sample.Name)
ggplot(ALL, aes(x = Sample.Name, y = Alignment.Percentage, fill = Run, label = Alignment.Percentage)) +
geom_bar(position="dodge", stat = "identity") +
coord_cartesian(ylim=c(80,90)) +
theme(axis.text.x = element_text(angle = 90, hjust = 1)) +
geom_text(aes(y = Alignment.Percentage + 0.05), position = position_dodge(0.9), vjust = 0, size = 3.2)
