Skip to content

Commit

Permalink
T -> TRUE; F -> FALSE
Browse files Browse the repository at this point in the history
  • Loading branch information
HendrikSchultheis committed Jun 28, 2018
1 parent 63f5ed9 commit 117e0c4
Show file tree
Hide file tree
Showing 6 changed files with 13 additions and 12 deletions.
2 changes: 1 addition & 1 deletion R/columnSelector.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,7 +7,7 @@
#' @return A list from \code{\link[shiny]{tag}} with the UI elements.
#'
#' @export
columnSelectorUI <- function(id, label = F, title = NULL) {
columnSelectorUI <- function(id, label = FALSE, title = NULL) {
# create namespace
ns <- shiny::NS(id)

Expand Down
2 changes: 1 addition & 1 deletion R/function.R
Original file line number Diff line number Diff line change
Expand Up @@ -33,7 +33,7 @@
#' @import data.table
#'
#' @return Returns list(plot = ggplotly/ ggplot, width, height, ppi, exceed_size).
create_scatterplot <- function(data, data.labels = NULL, data.hovertext = NULL, transparency = 1, pointsize = 1, labelsize = 3, color = NULL, x_label = "", y_label = "", z_label = "", density = T, line = T, categorized = F, highlight.data = NULL, highlight.labels = NULL, highlight.hovertext = NULL, highlight.color = "#FF0000", xlim = NULL, ylim = NULL, colorbar.limits = NULL, width = "auto", height = "auto", ppi = 72, plot.method = "static", scale = 1){
create_scatterplot <- function(data, data.labels = NULL, data.hovertext = NULL, transparency = 1, pointsize = 1, labelsize = 3, color = NULL, x_label = "", y_label = "", z_label = "", density = TRUE, line = TRUE, categorized = FALSE, highlight.data = NULL, highlight.labels = NULL, highlight.hovertext = NULL, highlight.color = "#FF0000", xlim = NULL, ylim = NULL, colorbar.limits = NULL, width = "auto", height = "auto", ppi = 72, plot.method = "static", scale = 1){
# force evaluation of all arguments
# no promises in plot object
forceArgs()
Expand Down
6 changes: 3 additions & 3 deletions R/scatterPlot.R
Original file line number Diff line number Diff line change
Expand Up @@ -28,7 +28,7 @@ scatterPlotUI <- function(id) {
columnSelectorUI(
id = ns("xaxis"),
title = "Data on x-axis",
label = T
label = TRUE
)
),
shiny::div(id = ns("guide_xaxis_transformation"),
Expand All @@ -43,7 +43,7 @@ scatterPlotUI <- function(id) {
columnSelectorUI(
id = ns("yaxis"),
title = "Data on y-axis",
label = T
label = TRUE
)
),
shiny::div(id = ns("guide_yaxis_transformation"),
Expand All @@ -59,7 +59,7 @@ scatterPlotUI <- function(id) {
columnSelectorUI(
id = ns("zaxis"),
title = "Data on z-axis",
label = T
label = TRUE
),
shiny::checkboxInput(
inputId = ns("force_cat"),
Expand Down
2 changes: 1 addition & 1 deletion R/transformation.R
Original file line number Diff line number Diff line change
Expand Up @@ -21,7 +21,7 @@ transformationUI <- function(id, label = "Transformation", selected = "raw", cho
label = NULL,
choices = choices,
selected = selected,
multiple = F))
multiple = FALSE))
if (transposeOptions) {
ret <- list(ret, shinyjs::useShinyjs(), shiny::radioButtons(ns("transpose"), label = NULL, choices = c(`row-wise` = "row", `column-wise` = "column")))
}
Expand Down
2 changes: 1 addition & 1 deletion man/columnSelectorUI.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

11 changes: 6 additions & 5 deletions man/create_scatterplot.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 117e0c4

Please sign in to comment.