Simple line graph

library(ggplot2)
## Warning: package 'ggplot2' was built under R version 3.4.4
par(mar=c(5, 4, 4, 8) + 0.1)

Time <- c(0,3,6,9,12,24,48,72,96)

Titer <- c(5,3.5,4,3.75,4,3.5,3.5,3.75,3.5)

#convert to the data frame

data=data.frame(Time,Titer)

p=ggplot(data,aes(x=Time,y=Titer))+geom_line(stat='identity',
                                             size=1.5,
                                             color="red")+geom_point(size=4,color="blue")+ylim(2.5,5)

#adjust x-axis scale according to our data
b=p + scale_x_continuous(breaks = c(0,3,6,9,12,24,48,72,96))
b+theme_classic()