Molly Gordon
07/17/2020
For more details on the Gene Locus Map Generator, visit the README.md at https://github.com/mgordo34/Gene_Locus_Map/blob/gh-pages/README.md.
An R package, gggenes, has been developed to make accurate gene loci maps that I have found particularly helpful for my own research. https://cran.r-project.org/web/packages/gggenes/vignettes/introduction-to-gggenes.html.
library(gggenes)
library(ggplot2)
library(dplyr)
test <- read.csv("https://raw.githubusercontent.com/mgordo34/Gene_Locus_Map/gh-pages/test.csv")
a <- test %>%
ggplot(aes(xmin = Start, xmax = End, y = molecule, fill = Gene, forward=strand, label=Gene)) +
geom_gene_arrow() +
geom_gene_label() +
facet_wrap(~ molecule, scales = "free", ncol = 1) +
scale_fill_brewer(palette = "Set3") +
theme_genes() + theme(legend.position="top", text = element_text(size=20), legend.title = element_blank(), axis.title = element_blank())
The following table is some hypothetical data that can be used to generate a successful gene locus map for a convergent gene pair in budding yeast. Below the table is how the resulting gene locus map will look for this gene pair.
molecule Gene Start End strand
1 Genome 1 CTF13 1 100 1
2 Genome 1 SNO1 120 190 -1
Currently, the “Gene Locus Map Generator” is limited to displaying only a pair of genes. We would like to expand the “Gene Locus Map Generator” with the following improvements following this initial prototype: