Adding Regression Line Equation and R2 on SEPARATE LINES graph

前端 未结 2 2006
臣服心动
臣服心动 2020-12-15 13:02

A few years ago, a poster asked how to add regression line equation and R2 on ggplot graphs at the link below.

Adding Regression Line Equation and R2 on graph

<
2条回答
  •  轻奢々
    轻奢々 (楼主)
    2020-12-15 13:33

    ggpmisc package has stat_poly_eq function which is built specifically for this task (but not limited to linear regression). Using the same data as @Sathish posted, we can add the equation and R2 separately but give label.y.npc different values. label.x.npc is adjustable if desired.

    library(ggplot2)
    library(ggpmisc)
    #> For news about 'ggpmisc', please, see https://www.r4photobiology.info/
    
    set.seed(21318)
    df <- data.frame(x = c(1:100))
    df$y <- 2 + 3*df$x + rnorm(100, sd = 40)
    
    formula1 <- y ~ x
    
    ggplot(data = df, aes(x = x, y = y)) +
      geom_point() +
      geom_smooth(method = "lm", se = FALSE, formula = formula1) +
      stat_poly_eq(aes(label = paste(..eq.label.., sep = "~~~")), 
                   label.x.npc = "right", label.y.npc = 0.15,
                   eq.with.lhs = "italic(hat(y))~`=`~",
                   eq.x.rhs = "~italic(x)",
                   formula = formula1, parse = TRUE, size = 5) +
      stat_poly_eq(aes(label = paste(..rr.label.., sep = "~~~")), 
                   label.x.npc = "right", label.y.npc = "bottom",
                   formula = formula1, parse = TRUE, size = 5) +
      theme_bw(base_size = 16)
    

    # using `atop`
    ggplot(data = df, aes(x = x, y = y)) +
      geom_point() +
      geom_smooth(method = "lm", se = FALSE, formula = formula1) +
      stat_poly_eq(aes(label = paste0("atop(", ..eq.label.., ",", ..rr.label.., ")")), 
                   formula = formula1, 
                   parse = TRUE) +
      theme_bw(base_size = 16)
    

    ### bonus: including result table
    ggplot(data = df, aes(x = x, y = y)) +
      geom_point() +
      geom_smooth(method = "lm", se = FALSE, formula = formula1) +
      stat_fit_tb(method = "lm",
                  method.args = list(formula = formula1),
                  tb.vars = c(Parameter = "term", 
                              Estimate = "estimate", 
                              "s.e." = "std.error", 
                              "italic(t)" = "statistic", 
                              "italic(P)" = "p.value"),
                  label.y = "bottom", label.x = "right",
                  parse = TRUE) +
      stat_poly_eq(aes(label = paste0("atop(", ..eq.label.., ",", ..rr.label.., ")")), 
                   formula = formula1, 
                   parse = TRUE) +
      theme_bw(base_size = 16)
    

    Created by the reprex package (v0.3.0)

提交回复
热议问题