r
if ("tidyverse" %in% rownames(installed.packages()) == 'FALSE') install.packages('tidyverse')
if ("ggplot2" %in% rownames(installed.packages()) == 'FALSE') install.packages('ggplot2')Using the table of annotated differentially expressed genes (generated in step 5), make some insightful data visualizations to understand the differing key biological processes between coral embryos and coral recruits
r
if ("tidyverse" %in% rownames(installed.packages()) == 'FALSE') install.packages('tidyverse')
if ("ggplot2" %in% rownames(installed.packages()) == 'FALSE') install.packages('ggplot2')r
library(tidyverse)
library(ggplot2)r
annote_DEG <- read.delim(file = "../output/annote_DEGlist.tab", sep = " ", header = TRUE)
head(annote_DEG)r
# Select top 20 differentially expressed genes
deseq2.res <- results(deseq2.dds)
res_ordered <- deseq2.res[order(deseq2.res$padj), ]
#create object that we will reference later
top_genes <- row.names(res_ordered)[1:20] knitr::kable(
mtcars[1:3, 1:3]
)knitr::kable(
top_genes
)