Skip to content

Commit c57bc17

Browse files
authored
642 unused functions (#659)
Closes #642. Removed `substitute_q` and `extract_input`. Added `@keywords internal` to `is_num_var_short`.
1 parent 3bd9b71 commit c57bc17

File tree

4 files changed

+1
-48
lines changed

4 files changed

+1
-48
lines changed

R/tm_g_bivariate.R

Lines changed: 0 additions & 6 deletions
Original file line numberDiff line numberDiff line change
@@ -703,12 +703,6 @@ bivariate_plot_call <- function(data_name,
703703
)
704704
}
705705

706-
substitute_q <- function(x, env) {
707-
stopifnot(is.language(x))
708-
call <- substitute(substitute(x, env), list(x = x))
709-
eval(call)
710-
}
711-
712706

713707
#' Create ggplot part of plot call
714708
#'

R/tm_variable_browser.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -533,7 +533,6 @@ var_missings_info <- function(x) {
533533
#'
534534
#' @return character variable containing the HTML code of the \code{sparkline} HTML widget
535535
#' @keywords internal
536-
#'
537536
create_sparklines <- function(arr, width = 150, ...) {
538537
if (all(is.null(arr))) {
539538
return("")
@@ -1025,6 +1024,7 @@ plot_var_summary <- function(var,
10251024
plot_main
10261025
}
10271026

1027+
#' @keywords internal
10281028
is_num_var_short <- function(.unique_records_for_factor, input, data_for_analysis) {
10291029
length(unique(data_for_analysis()$data)) < .unique_records_for_factor && !is.null(input$numeric_as_factor)
10301030
}

R/utils.R

Lines changed: 0 additions & 18 deletions
Original file line numberDiff line numberDiff line change
@@ -190,24 +190,6 @@ varname_w_label <- function(var_names,
190190
}
191191
}
192192

193-
#' Extract html id for `data_extract_ui`
194-
#' @description The `data_extract_ui` is located under extended html id.
195-
#' We could not use \code{ns("original id")} for reference, as it is extended with specific suffixes.
196-
#' @param varname character original html id.
197-
#' This will be mostly retrieved with \code{ns("original id")} in `ui` or
198-
#' \code{session$ns("original id")} in server function.
199-
#' @param dataname character \code{dataname} from data_extract input.
200-
#' This might be retrieved like \code{teal.transform::data_extract_spec(...)[[1]]$dataname}.
201-
#' @param filter logical if the connected \code{extract_data_spec} is used with \code{filter} option.
202-
#' @keywords internal
203-
extract_input <- function(varname, dataname, filter = FALSE) {
204-
if (filter) {
205-
paste0(varname, "-dataset_", dataname, "_singleextract-filter1-vals")
206-
} else {
207-
paste0(varname, "-dataset_", dataname, "_singleextract-select")
208-
}
209-
}
210-
211193
# see vignette("ggplot2-specs", package="ggplot2")
212194
shape_names <- c(
213195
"circle", paste("circle", c("open", "filled", "cross", "plus", "small")), "bullet",

man/extract_input.Rd

Lines changed: 0 additions & 23 deletions
This file was deleted.

0 commit comments

Comments
 (0)