inst/app-visualize/helper/ggline.R

# gdp <- readr::read_csv('J:/R/ggplot_xplorerr/gdp.csv')
# p <- ggplot(gdp) +
#   geom_line(aes(x = year, y = india), col = 'blue') +
#   geom_line(aes(x = year, y = china), col = 'red')
# p


ggline <- function(data, x, columns, cols = 'black', theme = "Default",
                   alphas = 1, ltypes = 1, sizes = 1,
                   yaxlimit = FALSE, y1 = NA, y2 = NA, 
                   title = NULL, xlab = NULL, ylab = NULL, sub = NULL,
                   title_col = 'black', title_vjust = 0.5,
                   title_fam = 'serif', title_face = 'plain', 
                   title_size = 10, title_hjust = 0.5, 
                   sub_col = 'black', sub_fam = 'serif', sub_face = 'plain', 
                   sub_size = 10, sub_hjust = 0.5, sub_vjust = 0.5,
                   xax_col = 'black', xax_fam = 'serif', 
                   xax_face = 'plain', xax_size = 10, 
                   xax_hjust = 0.5, xax_vjust = 0.5,
                   yax_col = 'black', yax_fam = 'serif', 
                   yax_face = 'plain', yax_size = 10, 
                   yax_hjust = 0.5, yax_vjust = 0.5,
                   remove_xax = FALSE, remove_yax = FALSE,
                   add_text = FALSE, xloc = NA, yloc = NA, 
                   label = NA, tex_color = NA, tex_size = NA) {
  
  x <- data %>%
  select(x) %>%
  pull(1)

  column <- data %>%
    select(columns)

  j <- column %>% ncol()

  n <- j %>% seq_len()

  nam <- column %>% names()

  if (length(cols) == 1) {
    cols <- rep(cols, j)
  }

  if (length(alphas) == 1) {
    alphas <- rep(alphas, j)
  }

  if (length(ltypes) == 1) {
    ltypes <- rep(ltypes, j)
  }

  if (length(sizes) == 1) {
    sizes <- rep(sizes, j)
  }

  p <- ggplot(data)

  for (i in n) {
    p <- p +
      geom_line(aes_string(x = x, y = column[[i]]),
                           color = cols[[i]], alpha = alphas[[i]],
                           linetype = ltypes[[i]], size = sizes[[i]])
  }
  
  if (yaxlimit) {
    p <- p + ylim(y1, y2)
    p
  }
  
  p <- p + ggtitle(title) + xlab(xlab) + ylab(ylab) +
    theme(
      plot.title = element_text(color = title_col, family = title_fam,
                                face = title_face, size = title_size, hjust = title_hjust,
                                vjust = title_vjust),
      plot.subtitle = element_text(color = sub_col, family = sub_fam,
                                face = sub_face, size = sub_size, hjust = sub_hjust,
                                vjust = sub_vjust),
      axis.title.x = element_text(color = xax_col, family = xax_fam,
                                  face = xax_face, size = xax_size, hjust = xax_hjust,
                                  vjust = xax_vjust),
      axis.title.y = element_text(color = yax_col, family = yax_fam,
                                  face = yax_face, size = yax_size, hjust = yax_hjust,
                                  vjust = yax_vjust)
    )
  
  if(remove_xax) {
    p <- p + theme(
      axis.title.x = element_blank()
    )
    p
  }
  
  if(remove_yax) {
    p <- p + theme(
      axis.title.y = element_blank()
    )
    p
  }
  
  if(add_text) {
    p <- p + annotate("text", x = xloc, y = yloc, label = label, 
                      color = tex_color, size = tex_size)
    p
  }

  if (theme == "Classic Dark") {
    p <- p + theme_bw()
  } else if (theme == "Light") {
    p <- p + theme_light()
  } else if (theme == "Minimal") {
    p <- p + theme_minimal()
  } else if (theme == "Dark") {
    p <- p + theme_dark()
  } else if (theme == "Classic") {
    p <- p + theme_classic()
  } else if (theme == "Empty") {
    p <- p + theme_void()
  }
  
  p
  
}

# ggline(gdp, 'year', c('india', 'china'))
rsquaredacademy/xplorerr documentation built on May 25, 2021, 6:57 a.m.