Skip to content
Merged
Show file tree
Hide file tree
Changes from 2 commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
Jump to file
Failed to load files.
Loading
Diff view
Diff view
14 changes: 7 additions & 7 deletions R/tm_a_pca.R
Original file line number Diff line number Diff line change
Expand Up @@ -435,7 +435,7 @@ srv_a_pca <- function(id, data, dat, plot_height, plot_width, ggplot2_args, deco
c(
teal.reporter::teal_card("# Principal Component Analysis"),
teal.reporter::teal_card(obj),
teal.reporter::teal_card("## Module's code")
teal.reporter::teal_card("## Module's output(s)")
)
teal.code::eval_code(obj, 'library("ggplot2");library("dplyr");library("tidyr")') # nolint: quotes
})
Expand Down Expand Up @@ -514,7 +514,7 @@ srv_a_pca <- function(id, data, dat, plot_height, plot_width, ggplot2_args, deco
)
)

teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Principal Components Table")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Principal Components Table")

qenv <- teal.code::eval_code(
qenv,
Expand All @@ -524,7 +524,7 @@ srv_a_pca <- function(id, data, dat, plot_height, plot_width, ggplot2_args, deco
})
)

teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Eigenvectors Table")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Eigenvectors Table")

teal.code::eval_code(
qenv,
Expand Down Expand Up @@ -606,7 +606,7 @@ srv_a_pca <- function(id, data, dat, plot_height, plot_width, ggplot2_args, deco
),
ggtheme = ggtheme
)
teal.reporter::teal_card(base_q) <- c(teal.reporter::teal_card(base_q), "## Elbow plot")
teal.reporter::teal_card(base_q) <- c(teal.reporter::teal_card(base_q), "### Elbow plot")
teal.code::eval_code(
base_q,
substitute(
Expand Down Expand Up @@ -683,7 +683,7 @@ srv_a_pca <- function(id, data, dat, plot_height, plot_width, ggplot2_args, deco
ggtheme = ggtheme
)

teal.reporter::teal_card(base_q) <- c(teal.reporter::teal_card(base_q), "## Circle plot")
teal.reporter::teal_card(base_q) <- c(teal.reporter::teal_card(base_q), "### Circle plot")
teal.code::eval_code(
base_q,
substitute(
Expand Down Expand Up @@ -742,7 +742,7 @@ srv_a_pca <- function(id, data, dat, plot_height, plot_width, ggplot2_args, deco
size <- input$size
font_size <- input$font_size

teal.reporter::teal_card(base_q) <- c(teal.reporter::teal_card(base_q), "## Biplot")
teal.reporter::teal_card(base_q) <- c(teal.reporter::teal_card(base_q), "### Biplot")
qenv <- teal.code::eval_code(
qenv,
substitute(
Expand Down Expand Up @@ -1003,7 +1003,7 @@ srv_a_pca <- function(id, data, dat, plot_height, plot_width, ggplot2_args, deco
parsed_ggplot2_args$theme
)

teal.reporter::teal_card(base_q) <- c(teal.reporter::teal_card(base_q), "## Eigenvector plot")
teal.reporter::teal_card(base_q) <- c(teal.reporter::teal_card(base_q), "### Eigenvector plot")
teal.code::eval_code(
base_q,
substitute(
Expand Down
4 changes: 2 additions & 2 deletions R/tm_a_regression.R
Original file line number Diff line number Diff line change
Expand Up @@ -460,7 +460,7 @@ srv_a_regression <- function(id,
c(
teal.reporter::teal_card("# Linear Regression Plot"),
teal.reporter::teal_card(obj),
teal.reporter::teal_card("## Module's code")
teal.reporter::teal_card("## Module's output(s)")
)
teal.code::eval_code(obj, 'library("ggplot2");library("dplyr")') # nolint: quotes
})
Expand Down Expand Up @@ -539,7 +539,7 @@ srv_a_regression <- function(id,
fit_summary <- summary(fit)
fit_summary
}))
teal.reporter::teal_card(anl_fit) <- c(teal.reporter::teal_card(anl_fit), "## Plot")
teal.reporter::teal_card(anl_fit) <- c(teal.reporter::teal_card(anl_fit), "### Plot")
anl_fit
})

Expand Down
4 changes: 2 additions & 2 deletions R/tm_g_association.R
Original file line number Diff line number Diff line change
Expand Up @@ -344,7 +344,7 @@ srv_tm_g_association <- function(id,
c(
teal.reporter::teal_card("# Association Plot"),
teal.reporter::teal_card(obj),
teal.reporter::teal_card("## Module's code")
teal.reporter::teal_card("## Module's output(s)")
)
teal.code::eval_code(obj, 'library("ggplot2");library("dplyr");library("ggmosaic")') # nolint: quotes
})
Expand Down Expand Up @@ -495,7 +495,7 @@ srv_tm_g_association <- function(id,
)
}
obj <- merged$anl_q_r()
teal.reporter::teal_card(obj) <- c(teal.reporter::teal_card(obj), "## Plot")
teal.reporter::teal_card(obj) <- c(teal.reporter::teal_card(obj), "### Plot")
teal.code::eval_code(
obj,
substitute(
Expand Down
4 changes: 2 additions & 2 deletions R/tm_g_bivariate.R
Original file line number Diff line number Diff line change
Expand Up @@ -557,7 +557,7 @@ srv_g_bivariate <- function(id,
c(
teal.reporter::teal_card("# Bivariate Plot"),
teal.reporter::teal_card(obj),
teal.reporter::teal_card("## Module's code")
teal.reporter::teal_card("## Module's output(s)")
)
obj %>%
teal.code::eval_code(
Expand Down Expand Up @@ -692,7 +692,7 @@ srv_g_bivariate <- function(id,
}

obj <- merged$anl_q_r()
teal.reporter::teal_card(obj) <- c(teal.reporter::teal_card(obj), "## Plot")
teal.reporter::teal_card(obj) <- c(teal.reporter::teal_card(obj), "### Plot")
teal.code::eval_code(obj, substitute(expr = plot <- cl, env = list(cl = cl)))
})

Expand Down
6 changes: 3 additions & 3 deletions R/tm_g_distribution.R
Original file line number Diff line number Diff line change
Expand Up @@ -635,7 +635,7 @@ srv_distribution <- function(id,
c(
teal.reporter::teal_card("# Distribution Plot"),
teal.reporter::teal_card(obj),
teal.reporter::teal_card("## Module's code")
teal.reporter::teal_card("## Module's output(s)")
)

ANL <- obj[["ANL"]]
Expand Down Expand Up @@ -952,7 +952,7 @@ srv_distribution <- function(id,
ggtheme = ggtheme
)

teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Histogram Plot")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Histogram Plot")
teal.code::eval_code(
qenv,
substitute(
Expand Down Expand Up @@ -1083,7 +1083,7 @@ srv_distribution <- function(id,
ggtheme = ggtheme
)

teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## QQ Plot")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### QQ Plot")
teal.code::eval_code(
qenv,
substitute(
Expand Down
4 changes: 2 additions & 2 deletions R/tm_g_response.R
Original file line number Diff line number Diff line change
Expand Up @@ -409,7 +409,7 @@ srv_g_response <- function(id,
c(
teal.reporter::teal_card("# Response Plot"),
teal.reporter::teal_card(qenv),
teal.reporter::teal_card("## Module's code")
teal.reporter::teal_card("## Module's output(s)")
)
ANL <- qenv[["ANL"]]
resp_var <- as.vector(merged$anl_input_r()$columns_source$response)
Expand Down Expand Up @@ -570,7 +570,7 @@ srv_g_response <- function(id,
ggthemes = parsed_ggplot2_args$ggtheme
))

teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Plot")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Plot")
teal.code::eval_code(qenv, plot_call)
})

Expand Down
4 changes: 2 additions & 2 deletions R/tm_g_scatterplot.R
Original file line number Diff line number Diff line change
Expand Up @@ -586,7 +586,7 @@ srv_g_scatterplot <- function(id,
teal.reporter::teal_card(obj) <- c(
teal.reporter::teal_card("# Scatter Plot"),
teal.reporter::teal_card(obj),
teal.reporter::teal_card("## Module's code")
teal.reporter::teal_card("## Module's output(s)")
)
teal.code::eval_code(data(), 'library("ggplot2");library("dplyr")') # nolint quotes
})
Expand Down Expand Up @@ -1012,7 +1012,7 @@ srv_g_scatterplot <- function(id,

plot_call <- substitute(expr = plot <- plot_call, env = list(plot_call = plot_call))

teal.reporter::teal_card(plot_q) <- c(teal.reporter::teal_card(plot_q), "## Plot")
teal.reporter::teal_card(plot_q) <- c(teal.reporter::teal_card(plot_q), "### Plot")
teal.code::eval_code(plot_q, plot_call)
})

Expand Down
4 changes: 2 additions & 2 deletions R/tm_g_scatterplotmatrix.R
Original file line number Diff line number Diff line change
Expand Up @@ -329,7 +329,7 @@ srv_g_scatterplotmatrix <- function(id,
teal.reporter::teal_card(obj) <- c(
teal.reporter::teal_card("# Scatter Plot Matrix"),
teal.reporter::teal_card(obj),
teal.reporter::teal_card("## Module's code")
teal.reporter::teal_card("## Module's output(s)")
)
qenv <- teal.code::eval_code(obj, 'library("dplyr");library("lattice")') # nolint quotes
teal.code::eval_code(qenv, as.expression(anl_merged_input()$expr))
Expand Down Expand Up @@ -391,7 +391,7 @@ srv_g_scatterplotmatrix <- function(id,


# create plot
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Plot")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Plot")

if (add_cor) {
shinyjs::show("cor_method")
Expand Down
10 changes: 5 additions & 5 deletions R/tm_missing_data.R
Original file line number Diff line number Diff line change
Expand Up @@ -507,7 +507,7 @@ srv_missing_data <- function(id,
teal.reporter::teal_card(obj) <- c(
teal.reporter::teal_card("# Missing Data"),
teal.reporter::teal_card(obj),
teal.reporter::teal_card("## Module's code")
teal.reporter::teal_card("## Module's output(s)")
)

qenv <- teal.code::eval_code(obj, {
Expand Down Expand Up @@ -677,7 +677,7 @@ srv_missing_data <- function(id,
combination_cutoff_q <- reactive({
req(common_code_q())
qenv <- common_code_q()
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Combination Plot")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Combination Plot")
teal.code::eval_code(
qenv,
quote(
Expand Down Expand Up @@ -736,7 +736,7 @@ srv_missing_data <- function(id,
)
)

teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Summary Plot")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Summary Plot")

qenv <- teal.code::eval_code(
qenv,
Expand Down Expand Up @@ -1092,7 +1092,7 @@ srv_missing_data <- function(id,
}

qenv <- common_code_q()
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Summary Table")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Summary Table")

qenv <- if (!is.null(group_var)) {
common_code_libraries_q <- teal.code::eval_code(
Expand Down Expand Up @@ -1173,7 +1173,7 @@ srv_missing_data <- function(id,
}

qenv <- common_code_q()
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## By Subject Plot")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### By Subject Plot")

qenv <- teal.code::eval_code(
qenv,
Expand Down
10 changes: 5 additions & 5 deletions R/tm_outliers.R
Original file line number Diff line number Diff line change
Expand Up @@ -479,7 +479,7 @@ srv_outliers <- function(id, data, outlier_var,
c(
teal.reporter::teal_card("# Outliers Analysis"),
teal.reporter::teal_card(qenv),
teal.reporter::teal_card("## Module's code")
teal.reporter::teal_card("## Module's output(s)")
)

outlier_var <- as.vector(merged$anl_input_r()$columns_source$outlier_var)
Expand Down Expand Up @@ -650,7 +650,7 @@ srv_outliers <- function(id, data, outlier_var,
}

qenv <- if (length(categorical_var) > 0) {
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Summary Table")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Summary Table")
qenv <- teal.code::eval_code(
qenv,
substitute(
Expand Down Expand Up @@ -764,7 +764,7 @@ srv_outliers <- function(id, data, outlier_var,
box_plot_q <- reactive({
req(common_code_q())
qenv <- common_code_q()
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Box Plot")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Box Plot")

ANL <- qenv[["ANL"]]
ANL_OUTLIER <- qenv[["ANL_OUTLIER"]]
Expand Down Expand Up @@ -858,7 +858,7 @@ srv_outliers <- function(id, data, outlier_var,
# density plot
density_plot_q <- reactive({
qenv <- common_code_q()
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Density Plot")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Density Plot")

ANL <- qenv[["ANL"]]
ANL_OUTLIER <- qenv[["ANL_OUTLIER"]]
Expand Down Expand Up @@ -920,7 +920,7 @@ srv_outliers <- function(id, data, outlier_var,
# Cumulative distribution plot
cumulative_plot_q <- reactive({
qenv <- common_code_q()
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "## Cumulative Distribution Plot")
teal.reporter::teal_card(qenv) <- c(teal.reporter::teal_card(qenv), "### Cumulative Distribution Plot")

ANL <- qenv[["ANL"]]
ANL_OUTLIER <- qenv[["ANL_OUTLIER"]]
Expand Down
2 changes: 1 addition & 1 deletion R/tm_t_crosstable.R
Original file line number Diff line number Diff line change
Expand Up @@ -330,7 +330,7 @@ srv_t_crosstable <- function(id, data, label, x, y, remove_zero_columns, basic_t
c(
teal.reporter::teal_card("# Cross Table"),
teal.reporter::teal_card(obj),
teal.reporter::teal_card("## Module's code")
teal.reporter::teal_card("## Module's output(s)")
)
teal.code::eval_code(obj, 'library("rtables");library("tern");library("dplyr")') # nolint quotes
})
Expand Down
Loading