Skip to content

Commit 00b5cf8

Browse files
[skip style] [skip vbump] Restyle files
1 parent 4d41676 commit 00b5cf8

File tree

5 files changed

+40
-40
lines changed

5 files changed

+40
-40
lines changed

R/plotly_with_settings.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1,10 +1,10 @@
11
plotly_with_settings_ui <- function(id, height) {
22
ns <- NS(id)
33
plotly::plotlyOutput(ns("plot"), height = height)
4-
}
4+
}
55

66
plotly_with_settings_srv <- function(id, plot) {
77
moduleServer(id, function(input, output, session) {
88
output$plot <- plotly::renderPlotly(plot())
99
})
10-
}
10+
}

R/roxygen2_templates.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -55,14 +55,14 @@ roxygen_ggplot2_args_param <- function(...) {
5555
#' decorator for tables or plots included in the module output reported.
5656
#' The decorators are applied to the respective output objects.
5757
#'
58-
#' @param table_datanames (`character`) names of the datasets which should be listed below the plot
58+
#' @param table_datanames (`character`) names of the datasets which should be listed below the plot
5959
#' when some data points are selected. Objects named after `table_datanames` will be pulled from
6060
#' `data` so it is important that data actually contains these datasets. Please be aware that
61-
#' table datasets must be linked with `plot_dataname` by the relevant [join_keys()].
61+
#' table datasets must be linked with `plot_dataname` by the relevant [join_keys()].
6262
#' See section "Decorating Module" below for more details.
6363
#'
6464
#' @return Object of class `teal_module` to be used in `teal` applications.
6565
#'
6666
#' @name shared_params
6767
#' @keywords internal
68-
NULL
68+
NULL

R/tm_data_table.R

Lines changed: 23 additions & 23 deletions
Original file line numberDiff line numberDiff line change
@@ -170,18 +170,18 @@ ui_data_table <- function(id, pre_output = NULL, post_output = NULL) {
170170

171171
# Server page module
172172
srv_data_table <- function(id,
173-
data,
174-
datanames,
175-
variables_selected = list(),
176-
dt_args = list(),
177-
dt_options = list(
178-
searching = FALSE,
179-
pageLength = 30,
180-
lengthMenu = c(5, 15, 30, 100),
181-
scrollX = TRUE
182-
),
183-
server_rendering = FALSE,
184-
filter_panel_api) {
173+
data,
174+
datanames,
175+
variables_selected = list(),
176+
dt_args = list(),
177+
dt_options = list(
178+
searching = FALSE,
179+
pageLength = 30,
180+
lengthMenu = c(5, 15, 30, 100),
181+
scrollX = TRUE
182+
),
183+
server_rendering = FALSE,
184+
filter_panel_api) {
185185
checkmate::assert_class(data, "reactive")
186186
checkmate::assert_class(isolate(data()), "teal_data")
187187
moduleServer(id, function(input, output, session) {
@@ -192,7 +192,7 @@ srv_data_table <- function(id,
192192

193193
datanames_r <- reactive({
194194
Filter(
195-
function(name) is.data.frame(data()[[name]]),
195+
function(name) is.data.frame(data()[[name]]),
196196
if (identical(datanames, "all")) names(data()) else datanames
197197
)
198198
})
@@ -241,8 +241,8 @@ srv_data_table <- function(id,
241241
}) |>
242242
bindCache(datanames_r()) |>
243243
bindEvent(datanames_r())
244-
245-
244+
245+
246246
# server should be run only once
247247
modules_run <- reactiveVal()
248248
modules_to_run <- reactive(setdiff(datanames_r(), isolate(modules_run())))
@@ -297,14 +297,14 @@ ui_dataset_table <- function(id, choices, selected) {
297297

298298
# Server function for the data_table module
299299
srv_dataset_table <- function(id,
300-
data,
301-
dataname,
302-
if_filtered,
303-
if_distinct,
304-
dt_args,
305-
dt_options,
306-
server_rendering,
307-
filter_panel_api) {
300+
data,
301+
dataname,
302+
if_filtered,
303+
if_distinct,
304+
dt_args,
305+
dt_options,
306+
server_rendering,
307+
filter_panel_api) {
308308
moduleServer(id, function(input, output, session) {
309309
iv <- shinyvalidate::InputValidator$new()
310310
iv$add_rule("variables", shinyvalidate::sv_required("Please select valid variable names"))

R/tm_markdown.R

Lines changed: 11 additions & 11 deletions
Original file line numberDiff line numberDiff line change
@@ -20,22 +20,22 @@
2020
#' iris <- iris
2121
#' mtcars <- mtcars
2222
#' })
23-
#
23+
#' #
2424
#'
2525
#' @export
2626
#'
2727
tm_rmarkdown <- function(label = "App Info",
28-
text = character(0),
29-
params = list(title = "Document"),
30-
datanames = "all") {
28+
text = character(0),
29+
params = list(title = "Document"),
30+
datanames = "all") {
3131
message("Initializing tm_rmarkdown")
32-
32+
3333
# Start of assertions
3434
checkmate::assert_string(label)
3535
checkmate::assert_character(text, min.len = 0, any.missing = FALSE)
3636
checkmate::assert_list(params)
3737

38-
38+
3939
ans <- module(
4040
label = label,
4141
server = srv_rmarkdown,
@@ -65,15 +65,15 @@ srv_rmarkdown <- function(id, data, text, params) {
6565
cat(text, file = file)
6666
}
6767
rmarkdown::render(
68-
file,
69-
envir = data(),
68+
file,
69+
envir = data(),
7070
params = utils::modifyList(
71-
params,
72-
list(output = list(github_document = list(html_preview = FALSE))) # html_document always as we renderUI below
71+
params,
72+
list(output = list(github_document = list(html_preview = FALSE))) # html_document always as we renderUI below
7373
)
7474
)
7575
})
76-
76+
7777
output$output <- renderUI({
7878
on.exit(unlink(rmd_out()))
7979
# todo: includeMarkdown breaks css of the app

inst/poc_crf2.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -159,7 +159,7 @@ tm_swimlane <- function(label = "Swimlane", plot_height = 700) {
159159
extreme_grade
160160
)
161161
)
162-
162+
163163
p <- plotly::plot_ly(
164164
source = "swimlane",
165165
colors = c(

0 commit comments

Comments
 (0)