tests/test-modules/107_scatterplot/R/scatterplot.R

alpha_val <- 0.2

scatterPlot <- function(data, cols) {
  ggplot(data, aes_string(x = cols[1], y = cols[2])) +
    geom_point(aes(color = selected_), alpha = alpha_val) +
    scale_color_manual(values = c("black", "#66D65C"), guide = FALSE)
}

Try the shiny package in your browser

Any scripts or data that you put into this service are public.

shiny documentation built on Nov. 18, 2023, 1:08 a.m.