How do I plot multiple lines in one graph?

How do I plot one graph with lines that is ecdf_Q2<- 50,40,30,20, and 10 instead of just 50?? thank you!

ecdf_Q2 <- 50 %>%
ecdf.shift(ratio_threshold, .) %>%
filter(nobs > 20) %>%
ggplot(aes( x = OUR_ratio_cutoff, y = prob)) +
geom_rect(aes(xmin = 1.05, xmax = Inf, ymin = -Inf, ymax = Inf), fill = "red", alpha = 0.01) +
geom_line() +
geom_point() +
theme_bw(base_size = 12) +
theme(panel.grid = element_blank()) +
scale_y_continuous(limits = c(0,100),
breaks = seq(0,300, by = 10),
expand = c(0,0)) +
scale_x_continuous(limits = c(0,2),
breaks = seq(0,3, by = 0.1),
expand = c(0,0)) +
labs(x = "OUR ratio (-)",
y = "Probability of PE sCOD > 50")

top <- plot_grid(TSS_con_boxplot, TSS_con_hi, ecdf_Q2, ncol = 3, rel_widths = c(0.33, 1,1), align = "hv")

###########################################################################

ggplot works best when you put your data in a dataframe first.

Hi!

To help us help you, could you please turn this into a self-contained reproducible example (reprex) illustrating your issue? Please have a look at this guide, to see how to create one:

Thanks for your reply! will that allow me to have multiple lines in one graph with different target points? Ive been only using R for a week so everything's pretty confusing for me sorry!

Yes having your data in a dataframe will allow you to do all kinds of clever things with ggplot.

I recommend this free online book as the perfect way to learn R:

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.