library(ggplot2)
library(Rmisc)
## Loading required package: lattice
## Loading required package: plyr
d1<-read.csv("sbp_long.csv")

ggplot(data=d1, aes(x=variable, y=value))+
  geom_smooth(aes(colour=group))+
  
  coord_cartesian(xlim = c(1,6), ylim = c(80,150))+  
  labs(y=expression(paste("SBP")),x =expression(paste("Time point"))) +
  
  scale_x_continuous(breaks=seq(1,6,1))+

  theme_classic() + 
  theme(legend.position = c(0.8,0.9)) +
  theme(legend.title = element_blank()) 
## `geom_smooth()` using method = 'loess' and formula 'y ~ x'
## Warning: Removed 82 rows containing non-finite values (stat_smooth).