Hi,
Here is my script to obtain a Boxplot with my data from excel. However, the "geom_line" option is not working. Do I need to pair my PRE and POS samples together first? If yes how?
library(tidyverse)
library(readxl)
library(writexl)
data<-read_excel("PREvsPOS_Tregs .xls")
Samples<-data$samples
Samples=as.factor(data$samples)
Samples<-factor(c("PRE","POS"))
Samples
Tregs<-data$Tregs
dfdata<-data.frame(Samples,Tregs)
library(ggplot2)
library(gapminder)
p<-ggplot(dfdata, aes(x=Samples,y=Tregs, fill=Samples)) +
geom_boxplot(notch = FALSE)+
geom_point()+
geom_line(aes(Samples))
p