diff --git a/DESCRIPTION b/DESCRIPTION
index 68546b1..2739987 100644
--- a/DESCRIPTION
+++ b/DESCRIPTION
@@ -63,7 +63,8 @@ Imports:
gvlma,
psych,
jtools,
- Hmisc
+ Hmisc,
+ ggstats
Suggests:
styler,
devtools,
diff --git a/R/app_version.R b/R/app_version.R
index 65bc193..e753e43 100644
--- a/R/app_version.R
+++ b/R/app_version.R
@@ -1 +1 @@
-app_version <- function()'250130_1152'
+app_version <- function()'250207_1622'
diff --git a/R/correlations-module.R b/R/correlations-module.R
new file mode 100644
index 0000000..0063c78
--- /dev/null
+++ b/R/correlations-module.R
@@ -0,0 +1,136 @@
+#' Data correlations evaluation module
+#'
+#' @param id Module id. (Use 'ns("id")')
+#'
+#' @name data-correlations
+#' @returns Shiny ui module
+#' @export
+data_correlations_ui <- function(id, ...) {
+ ns <- NS(id)
+
+ shiny::tagList(
+ shiny::textOutput(outputId = ns("suggest")),
+ shiny::plotOutput(outputId = ns("correlation_plot"), ...)
+ )
+}
+
+
+#'
+#' @param data data
+#' @param color.main main color
+#' @param color.sec secondary color
+#' @param ... arguments passed to toastui::datagrid
+#'
+#' @name data-correlations
+#' @returns shiny server module
+#' @export
+data_correlations_server <- function(id,
+ data,
+ include.class = NULL,
+ cutoff = .7,
+ ...) {
+ shiny::moduleServer(
+ id = id,
+ module = function(input, output, session) {
+ # ns <- session$ns
+
+ rv <- shiny::reactiveValues(
+ data = NULL
+ )
+
+ rv$data <- shiny::reactive({
+ shiny::req(data)
+ if (!is.null(include.class)) {
+ filter <- sapply(data(), class) %in% include.class
+ out <- data()[filter]
+ } else {
+ out <- data()
+ }
+ out
+ })
+
+ # rv <- list()
+ # rv$data <- mtcars
+
+ output$suggest <- shiny::renderPrint({
+ shiny::req(rv$data)
+ shiny::req(cutoff)
+ pairs <- correlation_pairs(rv$data(), threshold = cutoff())
+
+ more <- ifelse(nrow(pairs) > 1, "from each pair ", "")
+
+ if (nrow(pairs) == 0) {
+ out <- glue::glue("No variables have a correlation measure above the threshold.")
+ } else {
+ out <- pairs |>
+ apply(1, \(.x){
+ glue::glue("'{.x[1]}'x'{.x[2]}'({round(as.numeric(.x[3]),2)})")
+ }) |>
+ (\(.x){
+ glue::glue("The following variable pairs are highly correlated: {sentence_paste(.x)}.\nConsider excluding one {more}from the dataset to ensure variables are independent.")
+ })()
+ }
+ out
+ })
+
+ output$correlation_plot <- shiny::renderPlot({
+ psych::pairs.panels(rv$data())
+ })
+ }
+ )
+}
+
+correlation_pairs <- function(data, threshold = .8) {
+ data <- data[!sapply(data, is.character)]
+ data <- data |> dplyr::mutate(dplyr::across(dplyr::where(is.factor), as.numeric))
+ cor <- Hmisc::rcorr(as.matrix(data))
+ r <- cor$r %>% as.table()
+ d <- r |>
+ as.data.frame() |>
+ dplyr::filter(abs(Freq) > threshold, Freq != 1)
+
+ d[1:2] |>
+ apply(1, \(.x){
+ sort(unname(.x))
+ },
+ simplify = logical(1)
+ ) |>
+ duplicated() |>
+ (\(.x){
+ d[!.x, ]
+ })() |>
+ setNames(c("var1", "var2", "cor"))
+}
+
+sentence_paste <- function(data, and.str = "and") {
+ and.str <- gsub(" ", "", and.str)
+ if (length(data) < 2) {
+ data
+ } else if (length(data) == 2) {
+ paste(data, collapse = glue::glue(" {and.str} "))
+ } else if (length(data) > 2) {
+ paste(paste(data[-length(data)], collapse = ", "), data[length(data)], collapse = glue::glue(" {and.str} "))
+ }
+}
+
+
+cor_app <- function() {
+ ui <- shiny::fluidPage(
+ shiny::sliderInput(
+ inputId = "cor_cutoff",
+ label = "Correlation cut-off",
+ min = 0,
+ max = 1,
+ step = .1,
+ value = .7,
+ ticks = FALSE
+ ),
+ data_correlations_ui("data", height = 600)
+ )
+ server <- function(input, output, session) {
+ data_correlations_server("data", data = shiny::reactive(mtcars), cutoff = shiny::reactive(input$cor_cutoff))
+ }
+ shiny::shinyApp(ui, server)
+}
+
+cor_app()
diff --git a/R/helpers.R b/R/helpers.R
index aecfce7..5051bfd 100644
--- a/R/helpers.R
+++ b/R/helpers.R
@@ -249,3 +249,20 @@ remove_na_attr <- function(data,attr="label"){
dplyr::bind_cols(out)
}
+
+#' Removes columns with completenes below cutoff
+#'
+#' @param data data frame
+#' @param cutoff numeric
+#'
+#' @returns data frame
+#' @export
+#'
+#' @examples
+#'data.frame(a=1:10,b=NA, c=c(2,NA)) |> remove_empty_cols(cutoff=.5)
+remove_empty_cols <- function(data,cutoff=.7){
+ filter <- apply(X = data,MARGIN = 2,FUN = \(.x){
+ sum(as.numeric(!is.na(.x)))/length(.x)
+ }) >= cutoff
+ data[filter]
+}
diff --git a/R/report.R b/R/report.R
index 1061bce..0b2b62f 100644
--- a/R/report.R
+++ b/R/report.R
@@ -79,3 +79,4 @@ modify_qmd <- function(file, format) {
specify_qmd_format(fileformat = "all") |>
writeLines(paste0(tools::file_path_sans_ext(file), "_format.", tools::file_ext(file)))
}
+
diff --git a/R/theme.R b/R/theme.R
index 43d32db..ea0b3f9 100644
--- a/R/theme.R
+++ b/R/theme.R
@@ -25,6 +25,7 @@ custom_theme <- function(...,
){
bslib::bs_theme(
...,
+ "navbar-bg" = primary,
version = version,
primary = primary,
secondary = secondary,
diff --git a/R/update-variables-ext.R b/R/update-variables-ext.R
index 6d78b97..b319d36 100644
--- a/R/update-variables-ext.R
+++ b/R/update-variables-ext.R
@@ -461,6 +461,15 @@ update_variables_datagrid <- function(data, height = NULL, selectionId = NULL, b
fontStyle = "italic"
)
+ grid <- toastui::grid_filters(
+ grid = grid,
+ column = "name",
+ # columns = unname(std_names[std_names!="vals"]),
+ showApplyBtn = FALSE,
+ showClearBtn = TRUE,
+ type = "text"
+ )
+
# grid <- toastui::grid_columns(
# grid = grid,
# columns = "name_toset",
@@ -571,6 +580,7 @@ convert_to <- function(data,
new_class <- match.arg(new_class, several.ok = TRUE)
stopifnot(length(new_class) == length(variable))
args <- list(...)
+ args$format <- clean_sep(args$format)
if (length(variable) > 1) {
for (i in seq_along(variable)) {
data <- convert_to(data, variable[i], new_class[i], ...)
@@ -602,10 +612,10 @@ convert_to <- function(data,
setNames(list(expr(as.integer(!!sym(variable)))), variable)
)
} else if (identical(new_class, "date")) {
- data[[variable]] <- as.Date(x = data[[variable]], ...)
+ data[[variable]] <- as.Date(x = clean_date(data[[variable]]), ...)
attr(data, "code_03_convert") <- c(
attr(data, "code_03_convert"),
- setNames(list(expr(as.Date(!!sym(variable), origin = !!args$origin))), variable)
+ setNames(list(expr(as.Date(clean_date(!!sym(variable)), origin = !!args$origin, format=clean_sep(!!args$format)))), variable)
)
} else if (identical(new_class, "datetime")) {
data[[variable]] <- as.POSIXct(x = data[[variable]], ...)
@@ -710,3 +720,39 @@ get_vars_to_convert <- function(vars, classes_input) {
}
+#' gsub wrapper for piping with default values for separator substituting
+#'
+#' @param data character vector
+#' @param old.sep old separator
+#' @param new.sep new separator
+#'
+#' @returns character vector
+#' @export
+#'
+clean_sep <- function(data,old.sep="[-.,/]",new.sep="-"){
+ gsub(old.sep,new.sep,data)
+}
+
+#' Attempts at applying uniform date format
+#'
+#' @param data character string vector of possible dates
+#'
+#' @returns character string
+#' @export
+#'
+clean_date <- function(data){
+ data |>
+ clean_sep() |>
+ sapply(\(.x){
+ if (is.na(.x)){
+ .x
+ } else {
+ strsplit(.x,"-") |>
+ unlist()|>
+ lapply(\(.y){
+ if (nchar(.y)==1) paste0("0",.y) else .y
+ }) |> paste(collapse="-")
+ }
+ }) |>
+ unname()
+}
diff --git a/inst/apps/data_analysis_modules/app.R b/inst/apps/data_analysis_modules/app.R
index 0d2e8fb..938bd0a 100644
--- a/inst/apps/data_analysis_modules/app.R
+++ b/inst/apps/data_analysis_modules/app.R
@@ -10,7 +10,7 @@
#### Current file: R//app_version.R
########
-app_version <- function()'250130_1152'
+app_version <- function()'250207_1622'
########
@@ -41,6 +41,148 @@ baseline_table <- function(data, fun.args = NULL, fun = gtsummary::tbl_summary,
+########
+#### Current file: R//correlations-module.R
+########
+
+#' Data correlations evaluation module
+#'
+#' @param id Module id. (Use 'ns("id")')
+#'
+#' @name data-correlations
+#' @returns Shiny ui module
+#' @export
+data_correlations_ui <- function(id, ...) {
+ ns <- NS(id)
+
+ shiny::tagList(
+ shiny::textOutput(outputId = ns("suggest")),
+ shiny::plotOutput(outputId = ns("correlation_plot"), ...)
+ )
+}
+
+
+#'
+#' @param data data
+#' @param color.main main color
+#' @param color.sec secondary color
+#' @param ... arguments passed to toastui::datagrid
+#'
+#' @name data-correlations
+#' @returns shiny server module
+#' @export
+data_correlations_server <- function(id,
+ data,
+ include.class = NULL,
+ cutoff = .7,
+ ...) {
+ shiny::moduleServer(
+ id = id,
+ module = function(input, output, session) {
+ # ns <- session$ns
+
+ rv <- shiny::reactiveValues(
+ data = NULL
+ )
+
+ rv$data <- shiny::reactive({
+ shiny::req(data)
+ if (!is.null(include.class)) {
+ filter <- sapply(data(), class) %in% include.class
+ out <- data()[filter]
+ } else {
+ out <- data()
+ }
+ out
+ })
+
+ # rv <- list()
+ # rv$data <- mtcars
+
+ output$suggest <- shiny::renderPrint({
+ shiny::req(rv$data)
+ shiny::req(cutoff)
+ pairs <- correlation_pairs(rv$data(), threshold = cutoff())
+
+ more <- ifelse(nrow(pairs) > 1, "from each pair ", "")
+
+ if (nrow(pairs) == 0) {
+ out <- glue::glue("No variables have a correlation measure above the threshold.")
+ } else {
+ out <- pairs |>
+ apply(1, \(.x){
+ glue::glue("'{.x[1]}'x'{.x[2]}'({round(as.numeric(.x[3]),2)})")
+ }) |>
+ (\(.x){
+ glue::glue("The following variable pairs are highly correlated: {sentence_paste(.x)}.\nConsider excluding one {more}from the dataset to ensure variables are independent.")
+ })()
+ }
+ out
+ })
+
+ output$correlation_plot <- shiny::renderPlot({
+ psych::pairs.panels(rv$data())
+ })
+ }
+ )
+}
+
+correlation_pairs <- function(data, threshold = .8) {
+ data <- data[!sapply(data, is.character)]
+ data <- data |> dplyr::mutate(dplyr::across(dplyr::where(is.factor), as.numeric))
+ cor <- Hmisc::rcorr(as.matrix(data))
+ r <- cor$r %>% as.table()
+ d <- r |>
+ as.data.frame() |>
+ dplyr::filter(abs(Freq) > threshold, Freq != 1)
+
+ d[1:2] |>
+ apply(1, \(.x){
+ sort(unname(.x))
+ },
+ simplify = logical(1)
+ ) |>
+ duplicated() |>
+ (\(.x){
+ d[!.x, ]
+ })() |>
+ setNames(c("var1", "var2", "cor"))
+}
+
+sentence_paste <- function(data, and.str = "and") {
+ and.str <- gsub(" ", "", and.str)
+ if (length(data) < 2) {
+ data
+ } else if (length(data) == 2) {
+ paste(data, collapse = glue::glue(" {and.str} "))
+ } else if (length(data) > 2) {
+ paste(paste(data[-length(data)], collapse = ", "), data[length(data)], collapse = glue::glue(" {and.str} "))
+ }
+}
+
+
+cor_app <- function() {
+ ui <- shiny::fluidPage(
+ shiny::sliderInput(
+ inputId = "cor_cutoff",
+ label = "Correlation cut-off",
+ min = 0,
+ max = 1,
+ step = .1,
+ value = .7,
+ ticks = FALSE
+ ),
+ data_correlations_ui("data", height = 600)
+ )
+ server <- function(input, output, session) {
+ data_correlations_server("data", data = shiny::reactive(mtcars), cutoff = shiny::reactive(input$cor_cutoff))
+ }
+ shiny::shinyApp(ui, server)
+}
+
+cor_app()
+
+
########
#### Current file: R//cut-variable-dates.R
########
@@ -1367,6 +1509,23 @@ remove_na_attr <- function(data,attr="label"){
dplyr::bind_cols(out)
}
+#' Removes columns with completenes below cutoff
+#'
+#' @param data data frame
+#' @param cutoff numeric
+#'
+#' @returns data frame
+#' @export
+#'
+#' @examples
+#'data.frame(a=1:10,b=NA, c=c(2,NA)) |> remove_empty_cols(cutoff=.5)
+remove_empty_cols <- function(data,cutoff=.7){
+ filter <- apply(X = data,MARGIN = 2,FUN = \(.x){
+ sum(as.numeric(!is.na(.x)))/length(.x)
+ }) >= cutoff
+ data[filter]
+}
+
########
#### Current file: R//redcap_read_shiny_module.R
@@ -2743,6 +2902,7 @@ modify_qmd <- function(file, format) {
}
+
########
#### Current file: R//shiny_freesearcheR.R
########
@@ -2805,6 +2965,7 @@ custom_theme <- function(...,
){
bslib::bs_theme(
...,
+ "navbar-bg" = primary,
version = version,
primary = primary,
secondary = secondary,
@@ -3322,6 +3483,15 @@ update_variables_datagrid <- function(data, height = NULL, selectionId = NULL, b
fontStyle = "italic"
)
+ grid <- toastui::grid_filters(
+ grid = grid,
+ column = "name",
+ # columns = unname(std_names[std_names!="vals"]),
+ showApplyBtn = FALSE,
+ showClearBtn = TRUE,
+ type = "text"
+ )
+
# grid <- toastui::grid_columns(
# grid = grid,
# columns = "name_toset",
@@ -3432,6 +3602,7 @@ convert_to <- function(data,
new_class <- match.arg(new_class, several.ok = TRUE)
stopifnot(length(new_class) == length(variable))
args <- list(...)
+ args$format <- clean_sep(args$format)
if (length(variable) > 1) {
for (i in seq_along(variable)) {
data <- convert_to(data, variable[i], new_class[i], ...)
@@ -3463,10 +3634,10 @@ convert_to <- function(data,
setNames(list(expr(as.integer(!!sym(variable)))), variable)
)
} else if (identical(new_class, "date")) {
- data[[variable]] <- as.Date(x = data[[variable]], ...)
+ data[[variable]] <- as.Date(x = clean_date(data[[variable]]), ...)
attr(data, "code_03_convert") <- c(
attr(data, "code_03_convert"),
- setNames(list(expr(as.Date(!!sym(variable), origin = !!args$origin))), variable)
+ setNames(list(expr(as.Date(clean_date(!!sym(variable)), origin = !!args$origin, format=clean_sep(!!args$format)))), variable)
)
} else if (identical(new_class, "datetime")) {
data[[variable]] <- as.POSIXct(x = data[[variable]], ...)
@@ -3571,6 +3742,42 @@ get_vars_to_convert <- function(vars, classes_input) {
}
+#' gsub wrapper for piping with default values for separator substituting
+#'
+#' @param data character vector
+#' @param old.sep old separator
+#' @param new.sep new separator
+#'
+#' @returns character vector
+#' @export
+#'
+clean_sep <- function(data,old.sep="[-.,/]",new.sep="-"){
+ gsub(old.sep,new.sep,data)
+}
+
+#' Attempts at applying uniform date format
+#'
+#' @param data character string vector of possible dates
+#'
+#' @returns character string
+#' @export
+#'
+clean_date <- function(data){
+ data |>
+ clean_sep() |>
+ sapply(\(.x){
+ if (is.na(.x)){
+ .x
+ } else {
+ strsplit(.x,"-") |>
+ unlist()|>
+ lapply(\(.y){
+ if (nchar(.y)==1) paste0("0",.y) else .y
+ }) |> paste(collapse="-")
+ }
+ }) |>
+ unname()
+}
########
@@ -3597,61 +3804,69 @@ ui_elements <- list(
##############################################################################
"import" = bslib::nav_panel(
title = "Import",
- shiny::tagList(
- shiny::h4("Choose your data source"),
- # shiny::conditionalPanel(
- # condition = "output.has_input=='yes'",
- # # Input: Select a file ----
- # shiny::helpText("Analyses are performed on provided data")
+ shiny::h4("Choose your data source"),
+ shiny::br(),
+ shinyWidgets::radioGroupButtons(
+ inputId = "source",
+ selected = "env",
+ # label = "Choice: ",
+ choices = c(
+ "File upload" = "file",
+ "REDCap server" = "redcap",
+ "Local data" = "env"
+ ),
+ # checkIcon = list(
+ # yes = icon("square-check"),
+ # no = icon("square")
# ),
- # shiny::conditionalPanel(
- # condition = "output.has_input=='no'",
- # Input: Select a file ----
- shinyWidgets::radioGroupButtons(
- inputId = "source",
- selected = "env",
- # label = "Choice: ",
- choices = c(
- "File upload" = "file",
- "REDCap server" = "redcap",
- "Local data" = "env"
- ),
- # checkIcon = list(
- # yes = icon("square-check"),
- # no = icon("square")
- # ),
- width = "100%"
- ),
- shiny::conditionalPanel(
- condition = "input.source=='file'",
- datamods::import_file_ui("file_import",
- title = "Choose a datafile to upload",
- file_extensions = c(".csv", ".txt", ".xls", ".xlsx", ".rds", ".fst", ".sas7bdat", ".sav", ".ods", ".dta")
- )
- ),
- shiny::conditionalPanel(
- condition = "input.source=='redcap'",
- m_redcap_readUI("redcap_import")
- ),
- shiny::conditionalPanel(
- condition = "input.source=='env'",
- import_globalenv_ui(id = "env", title = NULL)
- ),
- shiny::conditionalPanel(
- condition = "input.source=='redcap'",
- DT::DTOutput(outputId = "redcap_prev")
- ),
- shiny::br(),
- shiny::actionButton(
- inputId = "act_start",
- label = "Start",
- width = "100%",
- icon = shiny::icon("play")
- ),
- shiny::helpText('After importing, hit "Start" or navigate to the desired tab.'),
- shiny::br(),
- shiny::br()
- )
+ width = "100%"
+ ),
+ shiny::helpText("Upload a file from your device, get data directly from REDCap or select a sample data set for testing from the app."),
+ shiny::conditionalPanel(
+ condition = "input.source=='file'",
+ datamods::import_file_ui("file_import",
+ title = "Choose a datafile to upload",
+ file_extensions = c(".csv", ".txt", ".xls", ".xlsx", ".rds", ".fst", ".sas7bdat", ".sav", ".ods", ".dta")
+ )
+ ),
+ shiny::conditionalPanel(
+ condition = "input.source=='redcap'",
+ m_redcap_readUI("redcap_import")
+ ),
+ shiny::conditionalPanel(
+ condition = "input.source=='env'",
+ import_globalenv_ui(id = "env", title = NULL)
+ ),
+ shiny::conditionalPanel(
+ condition = "input.source=='redcap'",
+ DT::DTOutput(outputId = "redcap_prev")
+ ),
+ shiny::br(),
+ shiny::br(),
+ shiny::h5("Exclude in-complete variables"),
+ shiny::p("Before going further, you can exclude variables with a low degree of completeness."),
+ shiny::br(),
+ shiny::sliderInput(
+ inputId = "complete_cutoff",
+ label = "Choose completeness threshold (%)",
+ min = 0,
+ max = 100,
+ step = 10,
+ value = 70,
+ ticks = FALSE
+ ),
+ shiny::helpText("Only include variables with completeness above a specified percentage."),
+ shiny::br(),
+ shiny::br(),
+ shiny::actionButton(
+ inputId = "act_start",
+ label = "Start",
+ width = "100%",
+ icon = shiny::icon("play")
+ ),
+ shiny::helpText('After importing, hit "Start" or navigate to the desired tab.'),
+ shiny::br(),
+ shiny::br()
),
##############################################################################
#########
@@ -3731,7 +3946,7 @@ ui_elements <- list(
fluidRow(
shiny::column(
width = 9,
- shiny::tags$p("Below, you can subset the data (by not selecting the variables to exclude on applying changes), rename variables, set new labels (for nicer tables in the analysis report) and change variable classes.
+ shiny::tags$p("Below, you can subset the data (select variables to include on clicking 'Apply changes'), rename variables, set new labels (for nicer tables in the report) and change variable classes (numeric, factor/categorical etc.).
Italic text can be edited/changed.
On the right, you can create and modify factor/categorical variables as well as resetting the data to the originally imported data.")
)
@@ -3851,15 +4066,13 @@ ui_elements <- list(
),
##############################################################################
#########
- ######### Data analyses panel
+ ######### Descriptive analyses panel
#########
##############################################################################
- "analyze" =
- # bslib::nav_panel_hidden(
+ "describe" =
bslib::nav_panel(
- # value = "analyze",
- title = "Analyses",
- id = "navanalyses",
+ title = "Evaluate",
+ id = "navdescribe",
bslib::navset_bar(
title = "",
# bslib::layout_sidebar(
@@ -3889,6 +4102,47 @@ ui_elements <- list(
shiny::helpText("Option to perform statistical comparisons between strata in baseline table.")
)
),
+ bslib::accordion_panel(
+ title = "Correlations",
+ shiny::sliderInput(
+ inputId = "cor_cutoff",
+ label = "Correlation cut-off",
+ min = 0,
+ max = 1,
+ step = .02,
+ value = .7,
+ ticks = FALSE
+ )
+ )
+ )
+ ),
+ bslib::nav_panel(
+ title = "Baseline characteristics",
+ gt::gt_output(outputId = "table1")
+ ),
+ bslib::nav_panel(
+ title = "Variable correlations",
+ data_correlations_ui(id = "correlations", height = 600)
+ )
+ )
+ ),
+ ##############################################################################
+ #########
+ ######### Regression analyses panel
+ #########
+ ##############################################################################
+ "analyze" =
+ bslib::nav_panel(
+ title = "Regression",
+ id = "navanalyses",
+ bslib::navset_bar(
+ title = "",
+ # bslib::layout_sidebar(
+ # fillable = TRUE,
+ sidebar = bslib::sidebar(
+ bslib::accordion(
+ open = "acc_reg",
+ multiple = FALSE,
bslib::accordion_panel(
value = "acc_reg",
title = "Regression",
@@ -3927,23 +4181,14 @@ ui_elements <- list(
type = "secondary",
auto_reset = TRUE
),
- shiny::helpText("If you change the parameters, press 'Analyse' again to update the regression analysis"),
+ shiny::helpText("Press 'Analyse' again after changing parameters."),
+ shiny::tags$br(),
shiny::uiOutput("plot_model")
),
bslib::accordion_panel(
value = "acc_advanced",
title = "Advanced",
icon = bsicons::bs_icon("gear"),
- shiny::sliderInput(
- inputId = "complete_cutoff",
- label = "Cut-off for column completeness (%)",
- min = 0,
- max = 100,
- step = 10,
- value = 70,
- ticks = FALSE
- ),
- shiny::helpText("To improve speed, columns are removed before analysing data, if copleteness is below above value."),
shiny::radioButtons(
inputId = "all",
label = "Specify covariables",
@@ -3958,52 +4203,6 @@ ui_elements <- list(
condition = "input.all==1",
shiny::uiOutput("include_vars")
)
- ),
- bslib::accordion_panel(
- value = "acc_down",
- title = "Download",
- icon = bsicons::bs_icon("download"),
- shiny::h4("Report"),
- shiny::helpText("Choose your favourite output file format for further work, and download, when the analyses are done."),
- shiny::selectInput(
- inputId = "output_type",
- label = "Output format",
- selected = NULL,
- choices = list(
- "MS Word" = "docx",
- "LibreOffice" = "odt"
- # ,
- # "PDF" = "pdf",
- # "All the above" = "all"
- )
- ),
- shiny::br(),
- # Button
- shiny::downloadButton(
- outputId = "report",
- label = "Download report",
- icon = shiny::icon("download")
- ),
- # shiny::helpText("If choosing to output to MS Word, please note, that when opening the document, two errors will pop-up. Choose to repair and choose not to update references. The issue is being worked on. You can always choose LibreOffice instead."),
- shiny::tags$hr(),
- shiny::h4("Data"),
- shiny::helpText("Choose your favourite output data format to download the modified data."),
- shiny::selectInput(
- inputId = "data_type",
- label = "Data format",
- selected = NULL,
- choices = list(
- "R" = "rds",
- "stata" = "dta"
- )
- ),
- shiny::br(),
- # Button
- shiny::downloadButton(
- outputId = "data_modified",
- label = "Download data",
- icon = shiny::icon("download")
- )
)
),
# shiny::helpText(em("Please specify relevant settings for your data, and press 'Analyse'")),
@@ -4025,10 +4224,6 @@ ui_elements <- list(
# condition = "output.ready=='yes'",
# shiny::tags$hr(),
),
- bslib::nav_panel(
- title = "Baseline characteristics",
- gt::gt_output(outputId = "table1")
- ),
bslib::nav_panel(
title = "Regression table",
gt::gt_output(outputId = "table2")
@@ -4046,6 +4241,66 @@ ui_elements <- list(
),
##############################################################################
#########
+ ######### Download panel
+ #########
+ ##############################################################################
+ "download" =
+ bslib::nav_panel(
+ title = "Download",
+ id = "navdownload",
+ shiny::fluidRow(
+ shiny::column(
+ width = 6,
+ shiny::h4("Report"),
+ shiny::helpText("Choose your favourite output file format for further work, and download, when the analyses are done."),
+ shiny::selectInput(
+ inputId = "output_type",
+ label = "Output format",
+ selected = NULL,
+ choices = list(
+ "MS Word" = "docx",
+ "LibreOffice" = "odt"
+ # ,
+ # "PDF" = "pdf",
+ # "All the above" = "all"
+ )
+ ),
+ shiny::br(),
+ # Button
+ shiny::downloadButton(
+ outputId = "report",
+ label = "Download report",
+ icon = shiny::icon("download")
+ )
+ # shiny::helpText("If choosing to output to MS Word, please note, that when opening the document, two errors will pop-up. Choose to repair and choose not to update references. The issue is being worked on. You can always choose LibreOffice instead."),
+ ),
+ shiny::column(
+ width = 6,
+ shiny::h4("Data"),
+ shiny::helpText("Choose your favourite output data format to download the modified data."),
+ shiny::selectInput(
+ inputId = "data_type",
+ label = "Data format",
+ selected = NULL,
+ choices = list(
+ "R" = "rds",
+ "stata" = "dta",
+ "CSV" = "csv"
+ )
+ ),
+ shiny::br(),
+ # Button
+ shiny::downloadButton(
+ outputId = "data_modified",
+ label = "Download data",
+ icon = shiny::icon("download")
+ )
+ )
+ ),
+ shiny::br()
+ ),
+ ##############################################################################
+ #########
######### Documentation panel
#########
##############################################################################
@@ -4065,7 +4320,6 @@ ui_elements <- list(
# shiny::br()
# )
)
-
# Initial attempt at creating light and dark versions
light <- custom_theme()
dark <- custom_theme(
@@ -4090,17 +4344,15 @@ ui <- bslib::page_fixed(
theme = light,
shiny::useBusyIndicators(),
bslib::page_navbar(
- # title = "freesearcheR",
id = "main_panel",
- # header = shiny::tags$header(shiny::p("Data is only stored temporarily for analysis and deleted immediately afterwards.")),
ui_elements$home,
ui_elements$import,
ui_elements$overview,
+ ui_elements$describe,
ui_elements$analyze,
+ ui_elements$download,
bslib::nav_spacer(),
ui_elements$docs,
- # bslib::nav_spacer(),
- # bslib::nav_item(shinyWidgets::circleButton(inputId = "mode", icon = icon("moon"),status = "primary")),
fillable = FALSE,
footer = shiny::tags$footer(
style = "background-color: #14131326; padding: 4px; text-align: center; bottom: 0; width: 100%;",
@@ -4213,7 +4465,7 @@ server <- function(input, output, session) {
#########
##############################################################################
- consider.na <- c("NA", "\"\"", "")
+ consider.na <- c("NA", "\"\"", "", "\'\'", "na")
data_file <- datamods::import_file_server(
id = "file_import",
@@ -4228,7 +4480,8 @@ server <- function(input, output, session) {
haven::read_dta(file = file, .name_repair = "unique_quiet")
},
csv = function(file) {
- readr::read_csv(file = file, na = consider.na)
+ readr::read_csv(file = file, na = consider.na, name_repair = "unique_quiet") #|>
+ # janitor::remove_empty(which = "cols", cutoff = 1, quiet = TRUE)
},
# xls = function(file){
# openxlsx2::read_xlsx(file = file, na.strings = consider.na,)
@@ -4237,7 +4490,7 @@ server <- function(input, output, session) {
# openxlsx2::read_xlsx(file = file, na.strings = consider.na,)
# },
rds = function(file) {
- readr::read_rds(file = file)
+ readr::read_rds(file = file, name_repair = "unique_quiet")
}
)
)
@@ -4284,11 +4537,22 @@ server <- function(input, output, session) {
#########
##############################################################################
- shiny::observeEvent(rv$data_original, {
- rv$data <- rv$data_original |>
- default_parsing() |>
- janitor::clean_names()
- })
+ shiny::observeEvent(
+ eventExpr = list(
+ rv$data_original,
+ input$reset_confirm,
+ input$complete_cutoff
+ ),
+ handlerExpr = {
+ shiny::req(rv$data_original)
+ rv$data <- rv$data_original |>
+ # janitor::clean_names() |>
+ default_parsing() |>
+ remove_empty_cols(
+ cutoff = input$complete_cutoff / 100
+ )
+ }
+ )
shiny::observeEvent(input$data_reset, {
shinyWidgets::ask_confirmation(
@@ -4297,9 +4561,9 @@ server <- function(input, output, session) {
)
})
- shiny::observeEvent(input$reset_confirm, {
- rv$data <- rv$data_original |> default_parsing()
- })
+ # shiny::observeEvent(input$reset_confirm, {
+ # rv$data <- rv$data_original |> default_parsing()
+ # })
######### Overview
@@ -4366,7 +4630,8 @@ server <- function(input, output, session) {
)
######### Show result
-
+ tryCatch(
+ {
output$table_mod <- toastui::renderDatagrid({
shiny::req(rv$data)
# data <- rv$data
@@ -4379,6 +4644,13 @@ server <- function(input, output, session) {
# striped = TRUE
)
})
+ },
+ warning = function(warn) {
+ showNotification(paste0(warn), type = "warning")
+ },
+ error = function(err) {
+ showNotification(paste0(err), type = "err")
+ })
output$code <- renderPrint({
attr(rv$data, "code")
@@ -4422,14 +4694,14 @@ server <- function(input, output, session) {
rv$data_filtered <- data_filter()
rv$list$data <- data_filter() |>
- REDCapCAST::fct_drop.data.frame() |>
+ REDCapCAST::fct_drop() |>
(\(.x){
.x[base_vars()]
- })() |>
- janitor::remove_empty(
- which = "cols",
- cutoff = input$complete_cutoff / 100
- )
+ })() #|>
+ # janitor::remove_empty(
+ # which = "cols",
+ # cutoff = input$complete_cutoff / 100
+ # )
}
)
@@ -4488,13 +4760,17 @@ server <- function(input, output, session) {
shiny::req(input$outcome_var)
shiny::selectizeInput(
inputId = "regression_type",
- # selected = colnames(rv$data_filtered)[sapply(rv$data_filtered, is.factor)],
label = "Choose regression analysis",
- choices = possible_functions(data = dplyr::select(rv$data_filtered,
- ifelse(input$outcome_var %in% names(rv$data_filtered),
- input$outcome_var,
- names(rv$data_filtered)[1])
- ), design = "cross-sectional"),
+ ## The below ifelse statement handles the case of loading a new dataset
+ choices = possible_functions(
+ data = dplyr::select(
+ rv$data_filtered,
+ ifelse(input$outcome_var %in% names(rv$data_filtered),
+ input$outcome_var,
+ names(rv$data_filtered)[1]
+ )
+ ), design = "cross-sectional"
+ ),
multiple = FALSE
)
})
@@ -4553,90 +4829,9 @@ server <- function(input, output, session) {
})
-
-
- ## Have a look at column filters at some point
- ## There should be a way to use the filtering the filter data for further analyses
- ## Disabled for now, as the JS is apparently not isolated
- # output$data_table <-
- # DT::renderDT(
- # {
- # DT::datatable(ds()[base_vars()])
- # },
- # server = FALSE
- # )
- #
- # output$data.classes <- gt::render_gt({
- # shiny::req(input$file)
- # data.frame(matrix(sapply(ds(), \(.x){
- # class(.x)[1]
- # }), nrow = 1)) |>
- # stats::setNames(names(ds())) |>
- # gt::gt()
- # })
-
-
- ### Outputs
-
- # shiny::observeEvent(data_filter(), {
- # rv$data_filtered <- data_filter()
- # })
-
- # shiny::observeEvent(
- # shiny::reactive(rv$data_filtered),
- # {
- # rv$list$data <- rv$data_filtered |>
- # # dplyr::mutate(dplyr::across(dplyr::where(is.character), as.factor)) |>
- # REDCapCAST::fct_drop.data.frame() |>
- # # factorize(vars = input$factor_vars) |>
- # remove_na_attr()
- #
- # # rv$list$data <- data
- # # rv$list$data <- data[base_vars()]
- # }
- # )
-
- # shiny::observe({
- # if (input$strat_var == "none") {
- # by.var <- NULL
- # } else {
- # by.var <- input$strat_var
- # }
- #
- # rv$list$table1 <- rv$list$data |>
- # baseline_table(
- # fun.args =
- # list(
- # by = by.var
- # )
- # ) |>
- # (\(.x){
- # if (!is.null(by.var)) {
- # .x |> gtsummary::add_overall()
- # } else {
- # .x
- # }
- # })() |>
- # (\(.x){
- # if (input$add_p == "yes") {
- # .x |>
- # gtsummary::add_p() |>
- # gtsummary::bold_p()
- # } else {
- # .x
- # }
- # })()
- # })
- #
- # output$table1 <- gt::render_gt(
- # rv$list$table1 |>
- # gtsummary::as_gt() |>
- # gt::tab_header(shiny::md("**Table 1. Patient Characteristics**"))
- # )
-
##############################################################################
#########
- ######### Data analyses results
+ ######### Descriptive evaluations
#########
##############################################################################
@@ -4701,6 +4896,18 @@ server <- function(input, output, session) {
gt::tab_header(gt::md("**Table 1: Baseline Characteristics**"))
})
+
+ data_correlations_server(id = "correlations",
+ data = shiny::reactive(rv$list$data),
+ cutoff = shiny::reactive(input$cor_cutoff))
+
+
+ ##############################################################################
+ #########
+ ######### Regression model analyses
+ #########
+ ##############################################################################
+
shiny::observeEvent(
input$load,
{
@@ -4779,37 +4986,6 @@ server <- function(input, output, session) {
}
)
- # plot_check_r <- shiny::reactive({plot(rv$check)})
- #
- # output$check_1 <- shiny::renderUI({
- # shiny::req(rv$check)
- # list <- lapply(seq_len(length(plot_check_r())),
- # function(i) {
- # plotname <- paste0("check_plot_", i)
- # shiny::htmlOutput(plotname)
- # })
- #
- # do.call(shiny::tagList,list)
- # })
- #
- # # Call renderPlot for each one. Plots are only actually generated when they
- # # are visible on the web page.
- #
- # shiny::observe({
- # shiny::req(rv$check)
- # # browser()
- # for (i in seq_len(length(plot_check_r()))) {
- # local({
- # my_i <- i
- # plotname <- paste0("check_plot_", my_i)
- #
- # output[[plotname]] <- shiny::renderPlot({
- # plot_check_r()[[my_i]] + gg_theme_shiny()
- # })
- # })
- # }
- # })
-
output$check <- shiny::renderPlot(
{
shiny::req(rv$check)
@@ -4932,7 +5108,7 @@ server <- function(input, output, session) {
)
out +
- ggplot2::scale_y_discrete(labels = scales::label_wrap(15))+
+ ggplot2::scale_y_discrete(labels = scales::label_wrap(15)) +
gg_theme_shiny()
# rv$list$regression$tables$Multivariable |>
@@ -5044,8 +5220,10 @@ server <- function(input, output, session) {
content = function(file, type = input$data_type) {
if (type == "rds") {
readr::write_rds(rv$list$data, file = file)
- } else {
+ } else if (type == "dta") {
haven::write_dta(as.data.frame(rv$list$data), path = file)
+ } else if (type == "csv"){
+ readr::write_csv(rv$list$data, file = file)
}
}
)
diff --git a/inst/apps/data_analysis_modules/rsconnect/shinyapps.io/agdamsbo/freesearcheR.dcf b/inst/apps/data_analysis_modules/rsconnect/shinyapps.io/agdamsbo/freesearcheR.dcf
index f0c07b2..8d0b399 100644
--- a/inst/apps/data_analysis_modules/rsconnect/shinyapps.io/agdamsbo/freesearcheR.dcf
+++ b/inst/apps/data_analysis_modules/rsconnect/shinyapps.io/agdamsbo/freesearcheR.dcf
@@ -5,6 +5,6 @@ account: agdamsbo
server: shinyapps.io
hostUrl: https://api.shinyapps.io/v1
appId: 13611288
-bundleId: 9693816
+bundleId:
url: https://agdamsbo.shinyapps.io/freesearcheR/
version: 1
diff --git a/inst/apps/data_analysis_modules/server.R b/inst/apps/data_analysis_modules/server.R
index 8abaae1..3822782 100644
--- a/inst/apps/data_analysis_modules/server.R
+++ b/inst/apps/data_analysis_modules/server.R
@@ -90,7 +90,7 @@ server <- function(input, output, session) {
#########
##############################################################################
- consider.na <- c("NA", "\"\"", "")
+ consider.na <- c("NA", "\"\"", "", "\'\'", "na")
data_file <- datamods::import_file_server(
id = "file_import",
@@ -105,7 +105,8 @@ server <- function(input, output, session) {
haven::read_dta(file = file, .name_repair = "unique_quiet")
},
csv = function(file) {
- readr::read_csv(file = file, na = consider.na)
+ readr::read_csv(file = file, na = consider.na, name_repair = "unique_quiet") #|>
+ # janitor::remove_empty(which = "cols", cutoff = 1, quiet = TRUE)
},
# xls = function(file){
# openxlsx2::read_xlsx(file = file, na.strings = consider.na,)
@@ -114,7 +115,7 @@ server <- function(input, output, session) {
# openxlsx2::read_xlsx(file = file, na.strings = consider.na,)
# },
rds = function(file) {
- readr::read_rds(file = file)
+ readr::read_rds(file = file, name_repair = "unique_quiet")
}
)
)
@@ -161,11 +162,22 @@ server <- function(input, output, session) {
#########
##############################################################################
- shiny::observeEvent(rv$data_original, {
- rv$data <- rv$data_original |>
- default_parsing() |>
- janitor::clean_names()
- })
+ shiny::observeEvent(
+ eventExpr = list(
+ rv$data_original,
+ input$reset_confirm,
+ input$complete_cutoff
+ ),
+ handlerExpr = {
+ shiny::req(rv$data_original)
+ rv$data <- rv$data_original |>
+ # janitor::clean_names() |>
+ default_parsing() |>
+ remove_empty_cols(
+ cutoff = input$complete_cutoff / 100
+ )
+ }
+ )
shiny::observeEvent(input$data_reset, {
shinyWidgets::ask_confirmation(
@@ -174,9 +186,9 @@ server <- function(input, output, session) {
)
})
- shiny::observeEvent(input$reset_confirm, {
- rv$data <- rv$data_original |> default_parsing()
- })
+ # shiny::observeEvent(input$reset_confirm, {
+ # rv$data <- rv$data_original |> default_parsing()
+ # })
######### Overview
@@ -243,7 +255,8 @@ server <- function(input, output, session) {
)
######### Show result
-
+ tryCatch(
+ {
output$table_mod <- toastui::renderDatagrid({
shiny::req(rv$data)
# data <- rv$data
@@ -256,6 +269,13 @@ server <- function(input, output, session) {
# striped = TRUE
)
})
+ },
+ warning = function(warn) {
+ showNotification(paste0(warn), type = "warning")
+ },
+ error = function(err) {
+ showNotification(paste0(err), type = "err")
+ })
output$code <- renderPrint({
attr(rv$data, "code")
@@ -299,14 +319,14 @@ server <- function(input, output, session) {
rv$data_filtered <- data_filter()
rv$list$data <- data_filter() |>
- REDCapCAST::fct_drop.data.frame() |>
+ REDCapCAST::fct_drop() |>
(\(.x){
.x[base_vars()]
- })() |>
- janitor::remove_empty(
- which = "cols",
- cutoff = input$complete_cutoff / 100
- )
+ })() #|>
+ # janitor::remove_empty(
+ # which = "cols",
+ # cutoff = input$complete_cutoff / 100
+ # )
}
)
@@ -434,90 +454,9 @@ server <- function(input, output, session) {
})
-
-
- ## Have a look at column filters at some point
- ## There should be a way to use the filtering the filter data for further analyses
- ## Disabled for now, as the JS is apparently not isolated
- # output$data_table <-
- # DT::renderDT(
- # {
- # DT::datatable(ds()[base_vars()])
- # },
- # server = FALSE
- # )
- #
- # output$data.classes <- gt::render_gt({
- # shiny::req(input$file)
- # data.frame(matrix(sapply(ds(), \(.x){
- # class(.x)[1]
- # }), nrow = 1)) |>
- # stats::setNames(names(ds())) |>
- # gt::gt()
- # })
-
-
- ### Outputs
-
- # shiny::observeEvent(data_filter(), {
- # rv$data_filtered <- data_filter()
- # })
-
- # shiny::observeEvent(
- # shiny::reactive(rv$data_filtered),
- # {
- # rv$list$data <- rv$data_filtered |>
- # # dplyr::mutate(dplyr::across(dplyr::where(is.character), as.factor)) |>
- # REDCapCAST::fct_drop.data.frame() |>
- # # factorize(vars = input$factor_vars) |>
- # remove_na_attr()
- #
- # # rv$list$data <- data
- # # rv$list$data <- data[base_vars()]
- # }
- # )
-
- # shiny::observe({
- # if (input$strat_var == "none") {
- # by.var <- NULL
- # } else {
- # by.var <- input$strat_var
- # }
- #
- # rv$list$table1 <- rv$list$data |>
- # baseline_table(
- # fun.args =
- # list(
- # by = by.var
- # )
- # ) |>
- # (\(.x){
- # if (!is.null(by.var)) {
- # .x |> gtsummary::add_overall()
- # } else {
- # .x
- # }
- # })() |>
- # (\(.x){
- # if (input$add_p == "yes") {
- # .x |>
- # gtsummary::add_p() |>
- # gtsummary::bold_p()
- # } else {
- # .x
- # }
- # })()
- # })
- #
- # output$table1 <- gt::render_gt(
- # rv$list$table1 |>
- # gtsummary::as_gt() |>
- # gt::tab_header(shiny::md("**Table 1. Patient Characteristics**"))
- # )
-
##############################################################################
#########
- ######### Data analyses results
+ ######### Descriptive evaluations
#########
##############################################################################
@@ -582,6 +521,18 @@ server <- function(input, output, session) {
gt::tab_header(gt::md("**Table 1: Baseline Characteristics**"))
})
+
+ data_correlations_server(id = "correlations",
+ data = shiny::reactive(rv$list$data),
+ cutoff = shiny::reactive(input$cor_cutoff))
+
+
+ ##############################################################################
+ #########
+ ######### Regression model analyses
+ #########
+ ##############################################################################
+
shiny::observeEvent(
input$load,
{
@@ -660,37 +611,6 @@ server <- function(input, output, session) {
}
)
- # plot_check_r <- shiny::reactive({plot(rv$check)})
- #
- # output$check_1 <- shiny::renderUI({
- # shiny::req(rv$check)
- # list <- lapply(seq_len(length(plot_check_r())),
- # function(i) {
- # plotname <- paste0("check_plot_", i)
- # shiny::htmlOutput(plotname)
- # })
- #
- # do.call(shiny::tagList,list)
- # })
- #
- # # Call renderPlot for each one. Plots are only actually generated when they
- # # are visible on the web page.
- #
- # shiny::observe({
- # shiny::req(rv$check)
- # # browser()
- # for (i in seq_len(length(plot_check_r()))) {
- # local({
- # my_i <- i
- # plotname <- paste0("check_plot_", my_i)
- #
- # output[[plotname]] <- shiny::renderPlot({
- # plot_check_r()[[my_i]] + gg_theme_shiny()
- # })
- # })
- # }
- # })
-
output$check <- shiny::renderPlot(
{
shiny::req(rv$check)
@@ -925,8 +845,10 @@ server <- function(input, output, session) {
content = function(file, type = input$data_type) {
if (type == "rds") {
readr::write_rds(rv$list$data, file = file)
- } else {
+ } else if (type == "dta") {
haven::write_dta(as.data.frame(rv$list$data), path = file)
+ } else if (type == "csv"){
+ readr::write_csv(rv$list$data, file = file)
}
}
)
diff --git a/inst/apps/data_analysis_modules/ui.R b/inst/apps/data_analysis_modules/ui.R
index c182f9e..2e2ac4f 100644
--- a/inst/apps/data_analysis_modules/ui.R
+++ b/inst/apps/data_analysis_modules/ui.R
@@ -18,61 +18,69 @@ ui_elements <- list(
##############################################################################
"import" = bslib::nav_panel(
title = "Import",
- shiny::tagList(
- shiny::h4("Choose your data source"),
- # shiny::conditionalPanel(
- # condition = "output.has_input=='yes'",
- # # Input: Select a file ----
- # shiny::helpText("Analyses are performed on provided data")
+ shiny::h4("Choose your data source"),
+ shiny::br(),
+ shinyWidgets::radioGroupButtons(
+ inputId = "source",
+ selected = "env",
+ # label = "Choice: ",
+ choices = c(
+ "File upload" = "file",
+ "REDCap server" = "redcap",
+ "Local data" = "env"
+ ),
+ # checkIcon = list(
+ # yes = icon("square-check"),
+ # no = icon("square")
# ),
- # shiny::conditionalPanel(
- # condition = "output.has_input=='no'",
- # Input: Select a file ----
- shinyWidgets::radioGroupButtons(
- inputId = "source",
- selected = "env",
- # label = "Choice: ",
- choices = c(
- "File upload" = "file",
- "REDCap server" = "redcap",
- "Local data" = "env"
- ),
- # checkIcon = list(
- # yes = icon("square-check"),
- # no = icon("square")
- # ),
- width = "100%"
- ),
- shiny::conditionalPanel(
- condition = "input.source=='file'",
- datamods::import_file_ui("file_import",
- title = "Choose a datafile to upload",
- file_extensions = c(".csv", ".txt", ".xls", ".xlsx", ".rds", ".fst", ".sas7bdat", ".sav", ".ods", ".dta")
- )
- ),
- shiny::conditionalPanel(
- condition = "input.source=='redcap'",
- m_redcap_readUI("redcap_import")
- ),
- shiny::conditionalPanel(
- condition = "input.source=='env'",
- import_globalenv_ui(id = "env", title = NULL)
- ),
- shiny::conditionalPanel(
- condition = "input.source=='redcap'",
- DT::DTOutput(outputId = "redcap_prev")
- ),
- shiny::br(),
- shiny::actionButton(
- inputId = "act_start",
- label = "Start",
- width = "100%",
- icon = shiny::icon("play")
- ),
- shiny::helpText('After importing, hit "Start" or navigate to the desired tab.'),
- shiny::br(),
- shiny::br()
- )
+ width = "100%"
+ ),
+ shiny::helpText("Upload a file from your device, get data directly from REDCap or select a sample data set for testing from the app."),
+ shiny::conditionalPanel(
+ condition = "input.source=='file'",
+ datamods::import_file_ui("file_import",
+ title = "Choose a datafile to upload",
+ file_extensions = c(".csv", ".txt", ".xls", ".xlsx", ".rds", ".fst", ".sas7bdat", ".sav", ".ods", ".dta")
+ )
+ ),
+ shiny::conditionalPanel(
+ condition = "input.source=='redcap'",
+ m_redcap_readUI("redcap_import")
+ ),
+ shiny::conditionalPanel(
+ condition = "input.source=='env'",
+ import_globalenv_ui(id = "env", title = NULL)
+ ),
+ shiny::conditionalPanel(
+ condition = "input.source=='redcap'",
+ DT::DTOutput(outputId = "redcap_prev")
+ ),
+ shiny::br(),
+ shiny::br(),
+ shiny::h5("Exclude in-complete variables"),
+ shiny::p("Before going further, you can exclude variables with a low degree of completeness."),
+ shiny::br(),
+ shiny::sliderInput(
+ inputId = "complete_cutoff",
+ label = "Choose completeness threshold (%)",
+ min = 0,
+ max = 100,
+ step = 10,
+ value = 70,
+ ticks = FALSE
+ ),
+ shiny::helpText("Only include variables with completeness above a specified percentage."),
+ shiny::br(),
+ shiny::br(),
+ shiny::actionButton(
+ inputId = "act_start",
+ label = "Start",
+ width = "100%",
+ icon = shiny::icon("play")
+ ),
+ shiny::helpText('After importing, hit "Start" or navigate to the desired tab.'),
+ shiny::br(),
+ shiny::br()
),
##############################################################################
#########
@@ -152,7 +160,7 @@ ui_elements <- list(
fluidRow(
shiny::column(
width = 9,
- shiny::tags$p("Below, you can subset the data (by not selecting the variables to exclude on applying changes), rename variables, set new labels (for nicer tables in the analysis report) and change variable classes.
+ shiny::tags$p("Below, you can subset the data (select variables to include on clicking 'Apply changes'), rename variables, set new labels (for nicer tables in the report) and change variable classes (numeric, factor/categorical etc.).
Italic text can be edited/changed.
On the right, you can create and modify factor/categorical variables as well as resetting the data to the originally imported data.")
)
@@ -272,15 +280,13 @@ ui_elements <- list(
),
##############################################################################
#########
- ######### Data analyses panel
+ ######### Descriptive analyses panel
#########
##############################################################################
- "analyze" =
- # bslib::nav_panel_hidden(
+ "describe" =
bslib::nav_panel(
- # value = "analyze",
- title = "Analyses",
- id = "navanalyses",
+ title = "Evaluate",
+ id = "navdescribe",
bslib::navset_bar(
title = "",
# bslib::layout_sidebar(
@@ -310,6 +316,47 @@ ui_elements <- list(
shiny::helpText("Option to perform statistical comparisons between strata in baseline table.")
)
),
+ bslib::accordion_panel(
+ title = "Correlations",
+ shiny::sliderInput(
+ inputId = "cor_cutoff",
+ label = "Correlation cut-off",
+ min = 0,
+ max = 1,
+ step = .02,
+ value = .7,
+ ticks = FALSE
+ )
+ )
+ )
+ ),
+ bslib::nav_panel(
+ title = "Baseline characteristics",
+ gt::gt_output(outputId = "table1")
+ ),
+ bslib::nav_panel(
+ title = "Variable correlations",
+ data_correlations_ui(id = "correlations", height = 600)
+ )
+ )
+ ),
+ ##############################################################################
+ #########
+ ######### Regression analyses panel
+ #########
+ ##############################################################################
+ "analyze" =
+ bslib::nav_panel(
+ title = "Regression",
+ id = "navanalyses",
+ bslib::navset_bar(
+ title = "",
+ # bslib::layout_sidebar(
+ # fillable = TRUE,
+ sidebar = bslib::sidebar(
+ bslib::accordion(
+ open = "acc_reg",
+ multiple = FALSE,
bslib::accordion_panel(
value = "acc_reg",
title = "Regression",
@@ -348,23 +395,14 @@ ui_elements <- list(
type = "secondary",
auto_reset = TRUE
),
- shiny::helpText("If you change the parameters, press 'Analyse' again to update the regression analysis"),
+ shiny::helpText("Press 'Analyse' again after changing parameters."),
+ shiny::tags$br(),
shiny::uiOutput("plot_model")
),
bslib::accordion_panel(
value = "acc_advanced",
title = "Advanced",
icon = bsicons::bs_icon("gear"),
- shiny::sliderInput(
- inputId = "complete_cutoff",
- label = "Cut-off for column completeness (%)",
- min = 0,
- max = 100,
- step = 10,
- value = 70,
- ticks = FALSE
- ),
- shiny::helpText("To improve speed, columns are removed before analysing data, if copleteness is below above value."),
shiny::radioButtons(
inputId = "all",
label = "Specify covariables",
@@ -379,52 +417,6 @@ ui_elements <- list(
condition = "input.all==1",
shiny::uiOutput("include_vars")
)
- ),
- bslib::accordion_panel(
- value = "acc_down",
- title = "Download",
- icon = bsicons::bs_icon("download"),
- shiny::h4("Report"),
- shiny::helpText("Choose your favourite output file format for further work, and download, when the analyses are done."),
- shiny::selectInput(
- inputId = "output_type",
- label = "Output format",
- selected = NULL,
- choices = list(
- "MS Word" = "docx",
- "LibreOffice" = "odt"
- # ,
- # "PDF" = "pdf",
- # "All the above" = "all"
- )
- ),
- shiny::br(),
- # Button
- shiny::downloadButton(
- outputId = "report",
- label = "Download report",
- icon = shiny::icon("download")
- ),
- # shiny::helpText("If choosing to output to MS Word, please note, that when opening the document, two errors will pop-up. Choose to repair and choose not to update references. The issue is being worked on. You can always choose LibreOffice instead."),
- shiny::tags$hr(),
- shiny::h4("Data"),
- shiny::helpText("Choose your favourite output data format to download the modified data."),
- shiny::selectInput(
- inputId = "data_type",
- label = "Data format",
- selected = NULL,
- choices = list(
- "R" = "rds",
- "stata" = "dta"
- )
- ),
- shiny::br(),
- # Button
- shiny::downloadButton(
- outputId = "data_modified",
- label = "Download data",
- icon = shiny::icon("download")
- )
)
),
# shiny::helpText(em("Please specify relevant settings for your data, and press 'Analyse'")),
@@ -446,10 +438,6 @@ ui_elements <- list(
# condition = "output.ready=='yes'",
# shiny::tags$hr(),
),
- bslib::nav_panel(
- title = "Baseline characteristics",
- gt::gt_output(outputId = "table1")
- ),
bslib::nav_panel(
title = "Regression table",
gt::gt_output(outputId = "table2")
@@ -467,6 +455,66 @@ ui_elements <- list(
),
##############################################################################
#########
+ ######### Download panel
+ #########
+ ##############################################################################
+ "download" =
+ bslib::nav_panel(
+ title = "Download",
+ id = "navdownload",
+ shiny::fluidRow(
+ shiny::column(
+ width = 6,
+ shiny::h4("Report"),
+ shiny::helpText("Choose your favourite output file format for further work, and download, when the analyses are done."),
+ shiny::selectInput(
+ inputId = "output_type",
+ label = "Output format",
+ selected = NULL,
+ choices = list(
+ "MS Word" = "docx",
+ "LibreOffice" = "odt"
+ # ,
+ # "PDF" = "pdf",
+ # "All the above" = "all"
+ )
+ ),
+ shiny::br(),
+ # Button
+ shiny::downloadButton(
+ outputId = "report",
+ label = "Download report",
+ icon = shiny::icon("download")
+ )
+ # shiny::helpText("If choosing to output to MS Word, please note, that when opening the document, two errors will pop-up. Choose to repair and choose not to update references. The issue is being worked on. You can always choose LibreOffice instead."),
+ ),
+ shiny::column(
+ width = 6,
+ shiny::h4("Data"),
+ shiny::helpText("Choose your favourite output data format to download the modified data."),
+ shiny::selectInput(
+ inputId = "data_type",
+ label = "Data format",
+ selected = NULL,
+ choices = list(
+ "R" = "rds",
+ "stata" = "dta",
+ "CSV" = "csv"
+ )
+ ),
+ shiny::br(),
+ # Button
+ shiny::downloadButton(
+ outputId = "data_modified",
+ label = "Download data",
+ icon = shiny::icon("download")
+ )
+ )
+ ),
+ shiny::br()
+ ),
+ ##############################################################################
+ #########
######### Documentation panel
#########
##############################################################################
@@ -486,7 +534,6 @@ ui_elements <- list(
# shiny::br()
# )
)
-
# Initial attempt at creating light and dark versions
light <- custom_theme()
dark <- custom_theme(
@@ -511,17 +558,15 @@ ui <- bslib::page_fixed(
theme = light,
shiny::useBusyIndicators(),
bslib::page_navbar(
- # title = "freesearcheR",
id = "main_panel",
- # header = shiny::tags$header(shiny::p("Data is only stored temporarily for analysis and deleted immediately afterwards.")),
ui_elements$home,
ui_elements$import,
ui_elements$overview,
+ ui_elements$describe,
ui_elements$analyze,
+ ui_elements$download,
bslib::nav_spacer(),
ui_elements$docs,
- # bslib::nav_spacer(),
- # bslib::nav_item(shinyWidgets::circleButton(inputId = "mode", icon = icon("moon"),status = "primary")),
fillable = FALSE,
footer = shiny::tags$footer(
style = "background-color: #14131326; padding: 4px; text-align: center; bottom: 0; width: 100%;",
diff --git a/inst/apps/data_analysis_modules/www/intro.html b/inst/apps/data_analysis_modules/www/intro.html
index 3a1299b..f61794b 100644
--- a/inst/apps/data_analysis_modules/www/intro.html
+++ b/inst/apps/data_analysis_modules/www/intro.html
@@ -354,22 +354,21 @@ display: none;
Welcome
-
This is the freesearcheR web data analysis
+
This is the freesearcheR data analysis
tool. We intend the freesearcheR to be a
powerful and free tool for easy data evaluation and analysis at the
hands of the clinician.
By intention, this tool has been designed to be simple to use with a
minimum of mandatory options to keep the workflow streamlined, while
also including a few options to go even further.
-
There are four simple steps to go through (see corresponding tabs in
+
There are some simple steps to go through (see corresponding tabs in
the top):
Import data (a spreadsheet/file on your machine, direct export
from a REDCap server, or a local file provided with a package) to get
started.
-An optional step of data modification (change variable
-classes and creating categorical variables (factors) from numeric or
-time data)
+Inspec of data modification (change variable classes and creating
+categorical variables (factors) from numeric or time data)
Data analysis of cross-sectionally designed studies (more study
designs are planned to be included)
@@ -382,10 +381,9 @@ depending on specified outcome variable
Export the the analyses results for MS Word or LibreOffice as well as the data
with preserved metadata.
-
Have a look at the documentations page for further
-project description. If you’re interested in the source code, then go
-on, have a
-look!
+
Have a look at the documentations page
+for further project description. If you’re interested in the source
+code, then go on, have a look!
If you encounter anything strange or the app doesn’t act as expected.
Please report
on Github.
diff --git a/inst/apps/data_analysis_modules/www/intro.md b/inst/apps/data_analysis_modules/www/intro.md
index 4b5e9f6..56cc8e3 100644
--- a/inst/apps/data_analysis_modules/www/intro.md
+++ b/inst/apps/data_analysis_modules/www/intro.md
@@ -1,24 +1,26 @@
# Welcome
-This is the ***freesearcheR*** web data analysis tool. We intend the ***freesearcheR*** to be a powerful and free tool for easy data evaluation and analysis at the hands of the clinician.
+This is the ***freesearcheR*** data analysis tool. We intend the ***freesearcheR*** to be a powerful and free tool for easy data evaluation and analysis at the hands of the clinician.
By intention, this tool has been designed to be simple to use with a minimum of mandatory options to keep the workflow streamlined, while also including a few options to go even further.
-There are four simple steps to go through (see corresponding tabs in the top):
+There are some simple steps to go through (see corresponding tabs in the top):
1. Import data (a spreadsheet/file on your machine, direct export from a REDCap server, or a local file provided with a package) to get started.
-2. An *optional* step of data modification (change variable classes and creating categorical variables (factors) from numeric or time data)
+1. Data inspection and modification (change variable classes, create new variables (categorical from numeric or time data, or completely new variables from the data)
-3. Data analysis of cross-sectionally designed studies (more study designs are planned to be included)
+1. Evaluate data using descriptive analyses methods and inspect cross-correlations
- - Classic baseline charactieristics (options to stratify and compare variables)
+1. Create regression models for even more advanced data analyses
- Linear, dichotomous or ordinal logistic regression will be used depending on specified outcome variable
+
+ - Plot regression analysis coefficients
- Evaluation of model assumptions
-4. Export the the analyses results for MS Word or [LibreOffice](https://www.libreoffice.org/) as well as the data with preserved metadata.
+1. Export the the analyses results for MS Word or [LibreOffice](https://www.libreoffice.org/) as well as the data with preserved metadata.
Have a look at the [documentations page](https://agdamsbo.github.io/freesearcheR/) for further project description. If you're interested in the source code, then go on, [have a look](https://github.com/agdamsbo/freesearcheR)!
diff --git a/inst/apps/data_analysis_modules/www/report.qmd b/inst/apps/data_analysis_modules/www/report.qmd
deleted file mode 100644
index 7715c24..0000000
--- a/inst/apps/data_analysis_modules/www/report.qmd
+++ /dev/null
@@ -1,55 +0,0 @@
----
-title: "freesearcheR analysis results"
-date: today
-format: docx
-author: freesearcheR Tool
-toc: false
-execute:
- echo: false
-params:
- data.file: NA
----
-
-```{r}
-#| message: false
-#| warning: false
-web_data <- readr::read_rds(file = params$data.file)
-library(gtsummary)
-library(gt)
-
-tbl_merge <- function(data) {
- if (is.null(names(data))) {
- data |> gtsummary::tbl_merge()
- } else {
- data |> gtsummary::tbl_merge(tab_spanner = names(data))
- }
-}
-```
-
-## Introduction
-
-Research should be free and open with easy access for all. The freesearcheR tool attempts to help lower the bar to participate in contributing to science by making guided data analysis easily accessible in the web-browser.
-
-## Methods
-
-Analyses were conducted in the *freesearcheR* data analysis web-tool based on R version 4.4.1.
-
-## Results
-
-Below are the baseline characteristics.
-
-```{r, results = 'asis'}
-tbl <- gtsummary::as_gt(web_data$table1)
-knitr::knit_print(tbl)
-```
-
-Below are the results from the
-
-```{r, results = 'asis'}
-reg_tbl <- web_data$regression$tables
-knitr::knit_print(tbl_merge(reg_tbl))
-```
-
-## Discussion
-
-Good luck on your further work!
diff --git a/inst/apps/data_analysis_modules/www/report.rmd b/inst/apps/data_analysis_modules/www/report.rmd
index f314587..aacd48c 100644
--- a/inst/apps/data_analysis_modules/www/report.rmd
+++ b/inst/apps/data_analysis_modules/www/report.rmd
@@ -1,8 +1,8 @@
---
-title: "freesearcheR analysis results"
-date: today
+title: "freesearcheR data report"
+date: "Report generated `r gsub('(\\D)0', '\\1', format(Sys.time(), '%A, %d.%m.%Y'))`"
format: docx
-author: freesearcheR Tool
+author: freesearcheR data analysis tool
toc: false
params:
data.file: NA
@@ -10,6 +10,7 @@ params:
```{r setup, echo = FALSE}
knitr::opts_chunk$set(echo = FALSE, message = FALSE, warning = FALSE)
+# glue::glue("{format(lubridate::today(),'%A')}, {lubridate::day(lubridate::today())}.{lubridate::month(lubridate::today())}.{lubridate::year(lubridate::today())}")
```
@@ -52,15 +53,18 @@ Analyses were conducted in the *freesearcheR* data analysis web-tool based on R
Below are the baseline characteristics.
```{r, results = 'asis'}
+if ("table1" %in% names(web_data)){
tbl <- gtsummary::as_gt(web_data$table1)
-knitr::knit_print(tbl)
+knitr::knit_print(tbl)}
```
-Below are the results from the `r tolower(vec2sentence(names(web_data$regression$tables)))` `r web_data$regression$params$descr`.
+`r if ("regression" %in% names(web_data)) glue::glue("Below are the results from the { tolower(vec2sentence(names(web_data$regression$tables)))} {web_data$regression$params$descr}.")`
```{r, results = 'asis'}
+if ("regression" %in% names(web_data)){
reg_tbl <- web_data$regression$tables
knitr::knit_print(tbl_merge(reg_tbl))
+}
```
## Discussion
diff --git a/renv.lock b/renv.lock
index 309f851..135b316 100644
--- a/renv.lock
+++ b/renv.lock
@@ -13,883 +13,2586 @@
"Package": "DEoptimR",
"Version": "1.1-3-1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
+ "Date": "2024-11-23",
+ "Title": "Differential Evolution Optimization in Pure R",
+ "Authors@R": "c( person(c(\"Eduardo\", \"L. T.\"), \"Conceicao\", role = c(\"aut\", \"cre\"), email = \"mail@eduardoconceicao.org\"), person(\"Martin\", \"Maechler\", role = \"ctb\", email = \"maechler@stat.math.ethz.ch\", comment = c(ORCID = \"0000-0002-8685-9910\")) )",
+ "URL": "svn://svn.r-forge.r-project.org/svnroot/robustbase/pkg/DEoptimR",
+ "Description": "Differential Evolution (DE) stochastic heuristic algorithms for global optimization of problems with and without general constraints. The aim is to curate a collection of its variants that (1) do not sacrifice simplicity of design, (2) are essentially tuning-free, and (3) can be efficiently implemented directly in the R language. Currently, it provides implementations of the algorithms 'jDE' by Brest et al. (2006)
for single-objective optimization and 'NCDE' by Qu et al. (2012) for multimodal optimization (single-objective problems with multiple solutions).",
+ "Imports": [
"stats"
],
- "Hash": "53a0299b56b4cbe418b12e3b65587211"
+ "Enhances": [
+ "robustbase"
+ ],
+ "License": "GPL (>= 2)",
+ "Author": "Eduardo L. T. Conceicao [aut, cre], Martin Maechler [ctb] ()",
+ "Maintainer": "Eduardo L. T. Conceicao ",
+ "Repository": "CRAN",
+ "Repository/R-Forge/Project": "robustbase",
+ "Repository/R-Forge/Revision": "1008",
+ "Repository/R-Forge/DateTimeStamp": "2024-11-23 19:13:45",
+ "NeedsCompilation": "no"
},
"DHARMa": {
"Package": "DHARMa",
"Version": "0.4.7",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "Matrix",
- "R",
- "ape",
- "gap",
- "grDevices",
- "graphics",
- "lme4",
- "lmtest",
- "parallel",
- "qgam",
- "stats",
- "utils"
+ "Title": "Residual Diagnostics for Hierarchical (Multi-Level / Mixed) Regression Models",
+ "Date": "2024-10-16",
+ "Authors@R": "c(person(\"Florian\", \"Hartig\", email = \"florian.hartig@biologie.uni-regensburg.de\", role = c(\"aut\", \"cre\"), comment=c(ORCID=\"0000-0002-6255-9059\")), person(\"Lukas\", \"Lohse\", role = \"ctb\"), person(\"Melina\", \"de Souza leite\", role = \"ctb\"))",
+ "Description": "The 'DHARMa' package uses a simulation-based approach to create readily interpretable scaled (quantile) residuals for fitted (generalized) linear mixed models. Currently supported are linear and generalized linear (mixed) models from 'lme4' (classes 'lmerMod', 'glmerMod'), 'glmmTMB', 'GLMMadaptive', and 'spaMM'; phylogenetic linear models from 'phylolm' (classes 'phylolm' and 'phyloglm'); generalized additive models ('gam' from 'mgcv'); 'glm' (including 'negbin' from 'MASS', but excluding quasi-distributions) and 'lm' model classes. Moreover, externally created simulations, e.g. posterior predictive simulations from Bayesian software such as 'JAGS', 'STAN', or 'BUGS' can be processed as well. The resulting residuals are standardized to values between 0 and 1 and can be interpreted as intuitively as residuals from a linear regression. The package also provides a number of plot and test functions for typical model misspecification problems, such as over/underdispersion, zero-inflation, and residual spatial, phylogenetic and temporal autocorrelation.",
+ "Depends": [
+ "R (>= 3.0.2)"
],
- "Hash": "1ce015f138dd74b3695fc60a86fcce98"
+ "Imports": [
+ "stats",
+ "graphics",
+ "utils",
+ "grDevices",
+ "Matrix",
+ "parallel",
+ "gap",
+ "lmtest",
+ "ape",
+ "qgam (>= 1.3.2)",
+ "lme4"
+ ],
+ "Suggests": [
+ "knitr",
+ "testthat (>= 3.0.0)",
+ "rmarkdown",
+ "KernSmooth",
+ "sfsmisc",
+ "MASS",
+ "mgcv",
+ "mgcViz (>= 0.1.9)",
+ "spaMM (>= 3.2.0)",
+ "GLMMadaptive",
+ "glmmTMB (>= 1.1.2.3)",
+ "phylolm (>= 2.6.5)"
+ ],
+ "Enhances": [
+ "phyr",
+ "rstan",
+ "rjags",
+ "BayesianTools"
+ ],
+ "License": "GPL (>= 3)",
+ "URL": "http://florianhartig.github.io/DHARMa/",
+ "LazyData": "TRUE",
+ "BugReports": "https://github.com/florianhartig/DHARMa/issues",
+ "RoxygenNote": "7.3.2",
+ "VignetteBuilder": "knitr",
+ "Encoding": "UTF-8",
+ "Config/testthat/edition": "3",
+ "NeedsCompilation": "no",
+ "Author": "Florian Hartig [aut, cre] (), Lukas Lohse [ctb], Melina de Souza leite [ctb]",
+ "Maintainer": "Florian Hartig ",
+ "Repository": "CRAN"
},
"DT": {
"Package": "DT",
"Version": "0.33",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "crosstalk",
- "htmltools",
- "htmlwidgets",
+ "Type": "Package",
+ "Title": "A Wrapper of the JavaScript Library 'DataTables'",
+ "Authors@R": "c( person(\"Yihui\", \"Xie\", role = \"aut\"), person(\"Joe\", \"Cheng\", email = \"joe@posit.co\", role = c(\"aut\", \"cre\")), person(\"Xianying\", \"Tan\", role = \"aut\"), person(\"JJ\", \"Allaire\", role = \"ctb\"), person(\"Maximilian\", \"Girlich\", role = \"ctb\"), person(\"Greg\", \"Freedman Ellis\", role = \"ctb\"), person(\"Johannes\", \"Rauh\", role = \"ctb\"), person(\"SpryMedia Limited\", role = c(\"ctb\", \"cph\"), comment = \"DataTables in htmlwidgets/lib\"), person(\"Brian\", \"Reavis\", role = c(\"ctb\", \"cph\"), comment = \"selectize.js in htmlwidgets/lib\"), person(\"Leon\", \"Gersen\", role = c(\"ctb\", \"cph\"), comment = \"noUiSlider in htmlwidgets/lib\"), person(\"Bartek\", \"Szopka\", role = c(\"ctb\", \"cph\"), comment = \"jquery.highlight.js in htmlwidgets/lib\"), person(\"Alex\", \"Pickering\", role = c(\"ctb\")), person(\"William\", \"Holmes\", role = c(\"ctb\")), person(\"Mikko\", \"Marttila\", role = c(\"ctb\")), person(\"Andres\", \"Quintero\", role = c(\"ctb\")), person(\"Stéphane\", \"Laurent\", role = c(\"ctb\")), person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )",
+ "Description": "Data objects in R can be rendered as HTML tables using the JavaScript library 'DataTables' (typically via R Markdown or Shiny). The 'DataTables' library has been included in this R package. The package name 'DT' is an abbreviation of 'DataTables'.",
+ "URL": "https://github.com/rstudio/DT",
+ "BugReports": "https://github.com/rstudio/DT/issues",
+ "License": "GPL-3 | file LICENSE",
+ "Imports": [
+ "htmltools (>= 0.3.6)",
+ "htmlwidgets (>= 1.3)",
"httpuv",
- "jquerylib",
- "jsonlite",
+ "jsonlite (>= 0.9.16)",
"magrittr",
+ "crosstalk",
+ "jquerylib",
"promises"
],
- "Hash": "64ff3427f559ce3f2597a4fe13255cb6"
+ "Suggests": [
+ "knitr (>= 1.8)",
+ "rmarkdown",
+ "shiny (>= 1.6)",
+ "bslib",
+ "future",
+ "testit",
+ "tibble"
+ ],
+ "VignetteBuilder": "knitr",
+ "RoxygenNote": "7.3.1",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "no",
+ "Author": "Yihui Xie [aut], Joe Cheng [aut, cre], Xianying Tan [aut], JJ Allaire [ctb], Maximilian Girlich [ctb], Greg Freedman Ellis [ctb], Johannes Rauh [ctb], SpryMedia Limited [ctb, cph] (DataTables in htmlwidgets/lib), Brian Reavis [ctb, cph] (selectize.js in htmlwidgets/lib), Leon Gersen [ctb, cph] (noUiSlider in htmlwidgets/lib), Bartek Szopka [ctb, cph] (jquery.highlight.js in htmlwidgets/lib), Alex Pickering [ctb], William Holmes [ctb], Mikko Marttila [ctb], Andres Quintero [ctb], Stéphane Laurent [ctb], Posit Software, PBC [cph, fnd]",
+ "Maintainer": "Joe Cheng ",
+ "Repository": "CRAN"
},
"Deriv": {
"Package": "Deriv",
"Version": "4.1.6",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
+ "Type": "Package",
+ "Title": "Symbolic Differentiation",
+ "Date": "2024-09-12",
+ "Authors@R": "c(person(given=\"Andrew\", family=\"Clausen\", role=\"aut\"), person(given=\"Serguei\", family=\"Sokol\", role=c(\"aut\", \"cre\"), email=\"sokol@insa-toulouse.fr\", comment = c(ORCID = \"0000-0002-5674-3327\")), person(given=\"Andreas\", family=\"Rappold\", role=\"ctb\", email=\"arappold@gmx.at\"))",
+ "Description": "R-based solution for symbolic differentiation. It admits user-defined function as well as function substitution in arguments of functions to be differentiated. Some symbolic simplification is part of the work.",
+ "License": "GPL (>= 3)",
+ "Suggests": [
+ "testthat (>= 0.11.0)"
+ ],
+ "BugReports": "https://github.com/sgsokol/Deriv/issues",
+ "RoxygenNote": "7.3.1",
+ "Imports": [
"methods"
],
- "Hash": "cd52c065c9e687c60c56b51f10f7bcd3"
+ "NeedsCompilation": "no",
+ "Author": "Andrew Clausen [aut], Serguei Sokol [aut, cre] (), Andreas Rappold [ctb]",
+ "Maintainer": "Serguei Sokol ",
+ "Repository": "CRAN"
},
"Formula": {
"Package": "Formula",
"Version": "1.2-5",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Date": "2023-02-23",
+ "Title": "Extended Model Formulas",
+ "Description": "Infrastructure for extended formulas with multiple parts on the right-hand side and/or multiple responses on the left-hand side (see ).",
+ "Authors@R": "c(person(given = \"Achim\", family = \"Zeileis\", role = c(\"aut\", \"cre\"), email = \"Achim.Zeileis@R-project.org\", comment = c(ORCID = \"0000-0003-0918-3766\")), person(given = \"Yves\", family = \"Croissant\", role = \"aut\", email = \"Yves.Croissant@univ-reunion.fr\"))",
+ "Depends": [
+ "R (>= 2.0.0)",
"stats"
],
- "Hash": "7a29697b75e027767a53fde6c903eca7"
+ "License": "GPL-2 | GPL-3",
+ "NeedsCompilation": "no",
+ "Author": "Achim Zeileis [aut, cre] (), Yves Croissant [aut]",
+ "Maintainer": "Achim Zeileis ",
+ "Repository": "CRAN"
+ },
+ "GPArotation": {
+ "Package": "GPArotation",
+ "Version": "2024.3-1",
+ "Source": "Repository",
+ "Title": "Gradient Projection Factor Rotation",
+ "Authors@R": "c( person(\"Coen\", \"Bernaards\", email = \"cab.gparotation@gmail.com\", role = c(\"aut\",\"cre\")), person(\"Paul\", \"Gilbert\", email = \"pgilbert.ttv9z@ncf.ca\", role = \"aut\"), person(\"Robert\", \"Jennrich\", role = \"aut\") )",
+ "Depends": [
+ "R (>= 2.0.0)"
+ ],
+ "Description": "Gradient Projection Algorithms for Factor Rotation. For details see ?GPArotation. When using this package, please cite: Bernaards and Jennrich (2005) . \"Gradient Projection Algorithms and Software for Arbitrary Rotation Criteria in Factor Analysis\".",
+ "LazyData": "yes",
+ "Imports": [
+ "stats"
+ ],
+ "License": "GPL (>= 2)",
+ "URL": "https://optimizer.r-forge.r-project.org/GPArotation_www/",
+ "NeedsCompilation": "no",
+ "Author": "Coen Bernaards [aut, cre], Paul Gilbert [aut], Robert Jennrich [aut]",
+ "Maintainer": "Coen Bernaards ",
+ "Repository": "CRAN"
+ },
+ "Hmisc": {
+ "Package": "Hmisc",
+ "Version": "5.2-2",
+ "Source": "Repository",
+ "Date": "2025-01-10",
+ "Title": "Harrell Miscellaneous",
+ "Authors@R": "c(person(given = \"Frank E\", family = \"Harrell Jr\", role = c(\"aut\", \"cre\"), email = \"fh@fharrell.com\", comment = c(ORCID = \"0000-0002-8271-5493\")), person(given = \"Charles\", family = \"Dupont\", role = \"ctb\", email = \"charles.dupont@vumc.org\", comment = \"contributed several functions and maintains latex functions\"))",
+ "Maintainer": "Frank E Harrell Jr ",
+ "Depends": [
+ "R (>= 4.2.0)"
+ ],
+ "Imports": [
+ "methods",
+ "ggplot2",
+ "cluster",
+ "rpart",
+ "nnet",
+ "foreign",
+ "gtable",
+ "grid",
+ "gridExtra",
+ "data.table",
+ "htmlTable (>= 1.11.0)",
+ "viridis",
+ "htmltools",
+ "base64enc",
+ "colorspace",
+ "rmarkdown",
+ "knitr",
+ "Formula"
+ ],
+ "Suggests": [
+ "survival",
+ "qreport",
+ "acepack",
+ "chron",
+ "rms",
+ "mice",
+ "rstudioapi",
+ "tables",
+ "plotly (>= 4.5.6)",
+ "rlang",
+ "plyr",
+ "VGAM",
+ "leaps",
+ "pcaPP",
+ "digest",
+ "parallel",
+ "polspline",
+ "abind",
+ "kableExtra",
+ "rio",
+ "lattice",
+ "latticeExtra",
+ "gt",
+ "sparkline",
+ "jsonlite",
+ "htmlwidgets",
+ "qs",
+ "getPass",
+ "keyring",
+ "safer",
+ "htm2txt"
+ ],
+ "Description": "Contains many functions useful for data analysis, high-level graphics, utility operations, functions for computing sample size and power, simulation, importing and annotating datasets, imputing missing values, advanced table making, variable clustering, character string manipulation, conversion of R objects to LaTeX and html code, recoding variables, caching, simplified parallel computing, encrypting and decrypting data using a safe workflow, general moving window statistical estimation, and assistance in interpreting principal component analysis.",
+ "License": "GPL (>= 2)",
+ "LazyLoad": "Yes",
+ "URL": "https://hbiostat.org/R/Hmisc/",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.2",
+ "NeedsCompilation": "yes",
+ "Author": "Frank E Harrell Jr [aut, cre] (), Charles Dupont [ctb] (contributed several functions and maintains latex functions)",
+ "Repository": "CRAN"
},
"IDEAFilter": {
"Package": "IDEAFilter",
"Version": "0.2.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "RColorBrewer",
+ "Type": "Package",
+ "Title": "Agnostic, Idiomatic Data Filter Module for Shiny",
+ "Description": "When added to an existing shiny app, users may subset any developer-chosen R data.frame on the fly. That is, users are empowered to slice & dice data by applying multiple (order specific) filters using the AND (&) operator between each, and getting real-time updates on the number of rows effected/available along the way. Thus, any downstream processes that leverage this data source (like tables, plots, or statistical procedures) will re-render after new filters are applied. The shiny module’s user interface has a 'minimalist' aesthetic so that the focus can be on the data & other visuals. In addition to returning a reactive (filtered) data.frame, 'IDEAFilter' as also returns 'dplyr' filter statements used to actually slice the data.",
+ "Authors@R": "c( person( given = \"Aaron\", family = \"Clark\", email = \"clark.aaronchris@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-0123-0970\")), person( given = \"Jeff\", family = \"Thompson\", email = \"jeff.thompson51317@gmail.com\", role = \"aut\"), person( given = \"Doug\", family = \"Kelkhoff\", email = \"doug.kelkhoff@gmail.com\", role = c(\"ctb\", \"cph\"), comment = \"Author of shinyDataFilter\"), person( given = \"Maya\", family = \"Gans\", email = \"maya.gans@biogen.com\", role = \"ctb\"), person(family = \"SortableJS contributors\", role = \"ctb\", comment = \"SortableJS library\"), person(given = \"Biogen\", role = \"cph\"))",
+ "License": "MIT + file LICENSE",
+ "URL": "https://biogen-inc.github.io/IDEAFilter/, https://github.com/Biogen-Inc/IDEAFilter",
+ "BugReports": "https://github.com/Biogen-Inc/IDEAFilter/issues",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.1",
+ "Imports": [
"crayon",
"ggplot2",
- "pillar",
+ "pillar (>= 1.5.0)",
"purrr",
+ "RColorBrewer",
"shiny",
"shinyTime"
],
- "Hash": "515977d035ab72c1e6334a732fc58923"
+ "Suggests": [
+ "dplyr",
+ "knitr",
+ "rmarkdown",
+ "shinytest",
+ "shinytest2",
+ "spelling",
+ "testthat"
+ ],
+ "Language": "en-US",
+ "VignetteBuilder": "knitr",
+ "Depends": [
+ "R (>= 2.10)"
+ ],
+ "NeedsCompilation": "no",
+ "Author": "Aaron Clark [aut, cre] (), Jeff Thompson [aut], Doug Kelkhoff [ctb, cph] (Author of shinyDataFilter), Maya Gans [ctb], SortableJS contributors [ctb] (SortableJS library), Biogen [cph]",
+ "Maintainer": "Aaron Clark ",
+ "Repository": "CRAN"
},
"KernSmooth": {
"Package": "KernSmooth",
- "Version": "2.23-24",
+ "Version": "2.23-26",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Priority": "recommended",
+ "Date": "2024-12-10",
+ "Title": "Functions for Kernel Smoothing Supporting Wand & Jones (1995)",
+ "Authors@R": "c(person(\"Matt\", \"Wand\", role = \"aut\", email = \"Matt.Wand@uts.edu.au\"), person(\"Cleve\", \"Moler\", role = \"ctb\", comment = \"LINPACK routines in src/d*\"), person(\"Brian\", \"Ripley\", role = c(\"trl\", \"cre\", \"ctb\"), email = \"Brian.Ripley@R-project.org\", comment = \"R port and updates\"))",
+ "Note": "Maintainers are not available to give advice on using a package they did not author.",
+ "Depends": [
+ "R (>= 2.5.0)",
"stats"
],
- "Hash": "9f33a1ee37bbe8919eb2ec4b9f2473a5"
+ "Suggests": [
+ "MASS",
+ "carData"
+ ],
+ "Description": "Functions for kernel smoothing (and density estimation) corresponding to the book: Wand, M.P. and Jones, M.C. (1995) \"Kernel Smoothing\".",
+ "License": "Unlimited",
+ "ByteCompile": "yes",
+ "NeedsCompilation": "yes",
+ "Author": "Matt Wand [aut], Cleve Moler [ctb] (LINPACK routines in src/d*), Brian Ripley [trl, cre, ctb] (R port and updates)",
+ "Maintainer": "Brian Ripley ",
+ "Repository": "CRAN"
},
"MASS": {
"Package": "MASS",
- "Version": "7.3-61",
+ "Version": "7.3-64",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Priority": "recommended",
+ "Date": "2025-01-06",
+ "Revision": "$Rev: 3680 $",
+ "Depends": [
+ "R (>= 4.4.0)",
"grDevices",
"graphics",
- "methods",
"stats",
"utils"
],
- "Hash": "0cafd6f0500e5deba33be22c46bf6055"
+ "Imports": [
+ "methods"
+ ],
+ "Suggests": [
+ "lattice",
+ "nlme",
+ "nnet",
+ "survival"
+ ],
+ "Authors@R": "c(person(\"Brian\", \"Ripley\", role = c(\"aut\", \"cre\", \"cph\"), email = \"Brian.Ripley@R-project.org\"), person(\"Bill\", \"Venables\", role = c(\"aut\", \"cph\")), person(c(\"Douglas\", \"M.\"), \"Bates\", role = \"ctb\"), person(\"Kurt\", \"Hornik\", role = \"trl\", comment = \"partial port ca 1998\"), person(\"Albrecht\", \"Gebhardt\", role = \"trl\", comment = \"partial port ca 1998\"), person(\"David\", \"Firth\", role = \"ctb\", comment = \"support functions for polr\"))",
+ "Description": "Functions and datasets to support Venables and Ripley, \"Modern Applied Statistics with S\" (4th edition, 2002).",
+ "Title": "Support Functions and Datasets for Venables and Ripley's MASS",
+ "LazyData": "yes",
+ "ByteCompile": "yes",
+ "License": "GPL-2 | GPL-3",
+ "URL": "http://www.stats.ox.ac.uk/pub/MASS4/",
+ "Contact": "",
+ "NeedsCompilation": "yes",
+ "Author": "Brian Ripley [aut, cre, cph], Bill Venables [aut, cph], Douglas M. Bates [ctb], Kurt Hornik [trl] (partial port ca 1998), Albrecht Gebhardt [trl] (partial port ca 1998), David Firth [ctb] (support functions for polr)",
+ "Maintainer": "Brian Ripley ",
+ "Repository": "CRAN"
},
"Matrix": {
"Package": "Matrix",
- "Version": "1.7-1",
+ "Version": "1.7-2",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "VersionNote": "do also bump src/version.h, inst/include/Matrix/version.h",
+ "Date": "2025-01-20",
+ "Priority": "recommended",
+ "Title": "Sparse and Dense Matrix Classes and Methods",
+ "Description": "A rich hierarchy of sparse and dense matrix classes, including general, symmetric, triangular, and diagonal matrices with numeric, logical, or pattern entries. Efficient methods for operating on such matrices, often wrapping the 'BLAS', 'LAPACK', and 'SuiteSparse' libraries.",
+ "License": "GPL (>= 2) | file LICENCE",
+ "URL": "https://Matrix.R-forge.R-project.org",
+ "BugReports": "https://R-forge.R-project.org/tracker/?atid=294&group_id=61",
+ "Contact": "Matrix-authors@R-project.org",
+ "Authors@R": "c(person(\"Douglas\", \"Bates\", role = \"aut\", comment = c(ORCID = \"0000-0001-8316-9503\")), person(\"Martin\", \"Maechler\", role = c(\"aut\", \"cre\"), email = \"mmaechler+Matrix@gmail.com\", comment = c(ORCID = \"0000-0002-8685-9910\")), person(\"Mikael\", \"Jagan\", role = \"aut\", comment = c(ORCID = \"0000-0002-3542-2938\")), person(\"Timothy A.\", \"Davis\", role = \"ctb\", comment = c(ORCID = \"0000-0001-7614-6899\", \"SuiteSparse libraries\", \"collaborators listed in dir(system.file(\\\"doc\\\", \\\"SuiteSparse\\\", package=\\\"Matrix\\\"), pattern=\\\"License\\\", full.names=TRUE, recursive=TRUE)\")), person(\"George\", \"Karypis\", role = \"ctb\", comment = c(ORCID = \"0000-0003-2753-1437\", \"METIS library\", \"Copyright: Regents of the University of Minnesota\")), person(\"Jason\", \"Riedy\", role = \"ctb\", comment = c(ORCID = \"0000-0002-4345-4200\", \"GNU Octave's condest() and onenormest()\", \"Copyright: Regents of the University of California\")), person(\"Jens\", \"Oehlschlägel\", role = \"ctb\", comment = \"initial nearPD()\"), person(\"R Core Team\", role = \"ctb\", comment = c(ROR = \"02zz1nj61\", \"base R's matrix implementation\")))",
+ "Depends": [
+ "R (>= 4.4)",
+ "methods"
+ ],
+ "Imports": [
"grDevices",
"graphics",
"grid",
"lattice",
- "methods",
"stats",
"utils"
],
- "Hash": "5122bb14d8736372411f955e1b16bc8a"
+ "Suggests": [
+ "MASS",
+ "datasets",
+ "sfsmisc",
+ "tools"
+ ],
+ "Enhances": [
+ "SparseM",
+ "graph"
+ ],
+ "LazyData": "no",
+ "LazyDataNote": "not possible, since we use data/*.R and our S4 classes",
+ "BuildResaveData": "no",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "yes",
+ "Author": "Douglas Bates [aut] (), Martin Maechler [aut, cre] (), Mikael Jagan [aut] (), Timothy A. Davis [ctb] (, SuiteSparse libraries, collaborators listed in dir(system.file(\"doc\", \"SuiteSparse\", package=\"Matrix\"), pattern=\"License\", full.names=TRUE, recursive=TRUE)), George Karypis [ctb] (, METIS library, Copyright: Regents of the University of Minnesota), Jason Riedy [ctb] (, GNU Octave's condest() and onenormest(), Copyright: Regents of the University of California), Jens Oehlschlägel [ctb] (initial nearPD()), R Core Team [ctb] (02zz1nj61, base R's matrix implementation)",
+ "Maintainer": "Martin Maechler ",
+ "Repository": "CRAN"
},
"MatrixModels": {
"Package": "MatrixModels",
"Version": "0.5-3",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "Matrix",
- "R",
- "methods",
- "stats"
+ "Date": "2023-11-06",
+ "Title": "Modelling with Sparse and Dense Matrices",
+ "Author": "Douglas Bates and Martin Maechler ",
+ "Maintainer": "Martin Maechler ",
+ "Contact": "Matrix-authors@R-project.org",
+ "Description": "Modelling with sparse and dense 'Matrix' matrices, using modular prediction and response module classes.",
+ "Depends": [
+ "R (>= 3.6.0)"
],
- "Hash": "0776bf7526869e0286b0463cb72fb211"
+ "Imports": [
+ "stats",
+ "methods",
+ "Matrix (>= 1.6-0)"
+ ],
+ "ImportsNote": "_not_yet_stats4",
+ "Encoding": "UTF-8",
+ "LazyLoad": "yes",
+ "License": "GPL (>= 2)",
+ "URL": "https://Matrix.R-forge.R-project.org/, https://r-forge.r-project.org/R/?group_id=61",
+ "BugReports": "https://R-forge.R-project.org/tracker/?func=add&atid=294&group_id=61",
+ "NeedsCompilation": "no",
+ "Repository": "CRAN"
},
"R.cache": {
"Package": "R.cache",
"Version": "0.16.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "R.methodsS3",
- "R.oo",
- "R.utils",
- "digest",
- "utils"
+ "Depends": [
+ "R (>= 2.14.0)"
],
- "Hash": "fe539ca3f8efb7410c3ae2cf5fe6c0f8"
+ "Imports": [
+ "utils",
+ "R.methodsS3 (>= 1.8.1)",
+ "R.oo (>= 1.24.0)",
+ "R.utils (>= 2.10.1)",
+ "digest (>= 0.6.13)"
+ ],
+ "Title": "Fast and Light-Weight Caching (Memoization) of Objects and Results to Speed Up Computations",
+ "Authors@R": "c(person(\"Henrik\", \"Bengtsson\", role=c(\"aut\", \"cre\", \"cph\"), email = \"henrikb@braju.com\"))",
+ "Author": "Henrik Bengtsson [aut, cre, cph]",
+ "Maintainer": "Henrik Bengtsson ",
+ "Description": "Memoization can be used to speed up repetitive and computational expensive function calls. The first time a function that implements memoization is called the results are stored in a cache memory. The next time the function is called with the same set of parameters, the results are momentarily retrieved from the cache avoiding repeating the calculations. With this package, any R object can be cached in a key-value storage where the key can be an arbitrary set of R objects. The cache memory is persistent (on the file system).",
+ "License": "LGPL (>= 2.1)",
+ "LazyLoad": "TRUE",
+ "URL": "https://github.com/HenrikBengtsson/R.cache",
+ "BugReports": "https://github.com/HenrikBengtsson/R.cache/issues",
+ "RoxygenNote": "7.2.1",
+ "NeedsCompilation": "no",
+ "Repository": "CRAN"
},
"R.methodsS3": {
"Package": "R.methodsS3",
"Version": "1.8.2",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Depends": [
+ "R (>= 2.13.0)"
+ ],
+ "Imports": [
"utils"
],
- "Hash": "278c286fd6e9e75d0c2e8f731ea445c8"
+ "Suggests": [
+ "codetools"
+ ],
+ "Title": "S3 Methods Simplified",
+ "Authors@R": "c(person(\"Henrik\", \"Bengtsson\", role=c(\"aut\", \"cre\", \"cph\"), email = \"henrikb@braju.com\"))",
+ "Author": "Henrik Bengtsson [aut, cre, cph]",
+ "Maintainer": "Henrik Bengtsson ",
+ "Description": "Methods that simplify the setup of S3 generic functions and S3 methods. Major effort has been made in making definition of methods as simple as possible with a minimum of maintenance for package developers. For example, generic functions are created automatically, if missing, and naming conflict are automatically solved, if possible. The method setMethodS3() is a good start for those who in the future may want to migrate to S4. This is a cross-platform package implemented in pure R that generates standard S3 methods.",
+ "License": "LGPL (>= 2.1)",
+ "LazyLoad": "TRUE",
+ "URL": "https://github.com/HenrikBengtsson/R.methodsS3",
+ "BugReports": "https://github.com/HenrikBengtsson/R.methodsS3/issues",
+ "NeedsCompilation": "no",
+ "Repository": "CRAN"
},
"R.oo": {
"Package": "R.oo",
"Version": "1.27.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "R.methodsS3",
+ "Depends": [
+ "R (>= 2.13.0)",
+ "R.methodsS3 (>= 1.8.2)"
+ ],
+ "Imports": [
"methods",
"utils"
],
- "Hash": "6ac79ff194202248cf946fe3a5d6d498"
+ "Suggests": [
+ "tools"
+ ],
+ "Title": "R Object-Oriented Programming with or without References",
+ "Authors@R": "c(person(\"Henrik\", \"Bengtsson\", role=c(\"aut\", \"cre\", \"cph\"), email = \"henrikb@braju.com\"))",
+ "Author": "Henrik Bengtsson [aut, cre, cph]",
+ "Maintainer": "Henrik Bengtsson ",
+ "Description": "Methods and classes for object-oriented programming in R with or without references. Large effort has been made on making definition of methods as simple as possible with a minimum of maintenance for package developers. The package has been developed since 2001 and is now considered very stable. This is a cross-platform package implemented in pure R that defines standard S3 classes without any tricks.",
+ "License": "LGPL (>= 2.1)",
+ "LazyLoad": "TRUE",
+ "URL": "https://github.com/HenrikBengtsson/R.oo",
+ "BugReports": "https://github.com/HenrikBengtsson/R.oo/issues",
+ "NeedsCompilation": "no",
+ "Repository": "CRAN"
},
"R.utils": {
"Package": "R.utils",
"Version": "2.12.3",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "R.methodsS3",
- "R.oo",
- "methods",
- "tools",
- "utils"
+ "Depends": [
+ "R (>= 2.14.0)",
+ "R.oo"
],
- "Hash": "3dc2829b790254bfba21e60965787651"
+ "Imports": [
+ "methods",
+ "utils",
+ "tools",
+ "R.methodsS3"
+ ],
+ "Suggests": [
+ "datasets",
+ "digest (>= 0.6.10)"
+ ],
+ "Title": "Various Programming Utilities",
+ "Authors@R": "c(person(\"Henrik\", \"Bengtsson\", role=c(\"aut\", \"cre\", \"cph\"), email = \"henrikb@braju.com\"))",
+ "Author": "Henrik Bengtsson [aut, cre, cph]",
+ "Maintainer": "Henrik Bengtsson ",
+ "Description": "Utility functions useful when programming and developing R packages.",
+ "License": "LGPL (>= 2.1)",
+ "LazyLoad": "TRUE",
+ "URL": "https://henrikbengtsson.github.io/R.utils/, https://github.com/HenrikBengtsson/R.utils",
+ "BugReports": "https://github.com/HenrikBengtsson/R.utils/issues",
+ "NeedsCompilation": "no",
+ "Repository": "CRAN"
},
"R6": {
"Package": "R6",
"Version": "2.5.1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R"
+ "Title": "Encapsulated Classes with Reference Semantics",
+ "Authors@R": "person(\"Winston\", \"Chang\", role = c(\"aut\", \"cre\"), email = \"winston@stdout.org\")",
+ "Description": "Creates classes with reference semantics, similar to R's built-in reference classes. Compared to reference classes, R6 classes are simpler and lighter-weight, and they are not built on S4 classes so they do not require the methods package. These classes allow public and private members, and they support inheritance, even when the classes are defined in different packages.",
+ "Depends": [
+ "R (>= 3.0)"
],
- "Hash": "470851b6d5d0ac559e9d01bb352b4021"
+ "Suggests": [
+ "testthat",
+ "pryr"
+ ],
+ "License": "MIT + file LICENSE",
+ "URL": "https://r6.r-lib.org, https://github.com/r-lib/R6/",
+ "BugReports": "https://github.com/r-lib/R6/issues",
+ "RoxygenNote": "7.1.1",
+ "NeedsCompilation": "no",
+ "Author": "Winston Chang [aut, cre]",
+ "Maintainer": "Winston Chang ",
+ "Repository": "CRAN"
},
"RColorBrewer": {
"Package": "RColorBrewer",
"Version": "1.1-3",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R"
+ "Date": "2022-04-03",
+ "Title": "ColorBrewer Palettes",
+ "Authors@R": "c(person(given = \"Erich\", family = \"Neuwirth\", role = c(\"aut\", \"cre\"), email = \"erich.neuwirth@univie.ac.at\"))",
+ "Author": "Erich Neuwirth [aut, cre]",
+ "Maintainer": "Erich Neuwirth ",
+ "Depends": [
+ "R (>= 2.0.0)"
],
- "Hash": "45f0398006e83a5b10b72a90663d8d8c"
+ "Description": "Provides color schemes for maps (and other graphics) designed by Cynthia Brewer as described at http://colorbrewer2.org.",
+ "License": "Apache License 2.0",
+ "NeedsCompilation": "no",
+ "Repository": "CRAN"
},
"REDCapCAST": {
"Package": "REDCapCAST",
- "Version": "24.12.1",
+ "Version": "25.1.1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "REDCapR",
- "assertthat",
- "bslib",
+ "Title": "REDCap Metadata Casting and Castellated Data Handling",
+ "Authors@R": "c( person(\"Andreas Gammelgaard\", \"Damsbo\", email = \"agdamsbo@clin.au.dk\", role = c(\"aut\", \"cre\"),comment = c(ORCID = \"0000-0002-7559-1154\")), person(\"Paul\", \"Egeler\", email = \"paulegeler@gmail.com\", role = c(\"aut\"), comment = c(ORCID = \"0000-0001-6948-9498\")))",
+ "Description": "Casting metadata for REDCap database creation and handling of castellated data using repeated instruments and longitudinal projects in 'REDCap'. Keeps a focused data export approach, by allowing to only export required data from the database. Also for casting new REDCap databases based on datasets from other sources. Originally forked from the R part of 'REDCapRITS' by Paul Egeler. See . 'REDCap' (Research Electronic Data Capture) is a secure, web-based software platform designed to support data capture for research studies, providing 1) an intuitive interface for validated data capture; 2) audit trails for tracking data manipulation and export procedures; 3) automated export procedures for seamless data downloads to common statistical packages; and 4) procedures for data integration and interoperability with external sources (Harris et al (2009) ; Harris et al (2019) ).",
+ "Depends": [
+ "R (>= 4.1.0)"
+ ],
+ "Suggests": [
+ "httr",
+ "jsonlite",
+ "testthat",
+ "Hmisc",
+ "knitr",
+ "rmarkdown",
+ "styler",
+ "devtools",
+ "roxygen2",
+ "spelling",
+ "rhub",
+ "rsconnect",
+ "pkgconfig"
+ ],
+ "License": "GPL (>= 3)",
+ "Encoding": "UTF-8",
+ "LazyData": "true",
+ "RoxygenNote": "7.3.2",
+ "URL": "https://github.com/agdamsbo/REDCapCAST, https://agdamsbo.github.io/REDCapCAST/",
+ "BugReports": "https://github.com/agdamsbo/REDCapCAST/issues",
+ "Imports": [
"dplyr",
- "forcats",
- "glue",
- "gt",
- "gtsummary",
- "haven",
- "here",
- "keyring",
- "openxlsx2",
- "purrr",
- "readODS",
- "readr",
- "shiny",
- "stats",
+ "REDCapR",
"tidyr",
"tidyselect",
+ "keyring",
+ "purrr",
+ "readr",
+ "stats",
+ "zip",
+ "assertthat",
+ "forcats",
"vctrs",
- "zip"
+ "gt",
+ "bslib",
+ "here",
+ "glue",
+ "gtsummary",
+ "shiny",
+ "haven",
+ "openxlsx2",
+ "readODS"
],
- "Hash": "d0925e579ddfbedeb536c5cbf65fc42f"
+ "Language": "en-US",
+ "VignetteBuilder": "knitr",
+ "Collate": "'REDCapCAST-package.R' 'utils.r' 'process_user_input.r' 'REDCap_split.r' 'as_factor.R' 'doc2dd.R' 'ds2dd_detailed.R' 'easy_redcap.R' 'export_redcap_instrument.R' 'fct_drop.R' 'html_styling.R' 'mtcars_redcap.R' 'read_redcap_instrument.R' 'read_redcap_tables.R' 'redcap_wider.R' 'redcapcast_data.R' 'redcapcast_meta.R' 'shiny_cast.R'",
+ "NeedsCompilation": "no",
+ "Author": "Andreas Gammelgaard Damsbo [aut, cre] (), Paul Egeler [aut] ()",
+ "Maintainer": "Andreas Gammelgaard Damsbo ",
+ "Repository": "CRAN"
},
"REDCapR": {
"Package": "REDCapR",
- "Version": "1.3.0",
+ "Version": "1.4.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "checkmate",
- "dplyr",
- "httr",
- "jsonlite",
- "magrittr",
- "methods",
- "readr",
- "rlang",
- "tibble",
- "tidyr"
+ "Title": "Interaction Between R and REDCap",
+ "Description": "Encapsulates functions to streamline calls from R to the REDCap API. REDCap (Research Electronic Data CAPture) is a web application for building and managing online surveys and databases developed at Vanderbilt University. The Application Programming Interface (API) offers an avenue to access and modify data programmatically, improving the capacity for literate and reproducible programming.",
+ "Authors@R": "c(person(\"Will\", \"Beasley\", role = c(\"aut\", \"cre\"), email = \"wibeasley@hotmail.com\", comment = c(ORCID = \"0000-0002-5613-5006\")), person(\"David\", \"Bard\", role = \"ctb\", comment = c(ORCID = \"0000-0002-3922-8489\")), person(\"Thomas\", \"Wilson\", role = \"ctb\"), person(given=\"John J\", family=\"Aponte\", role = \"ctb\", email=\"john.aponte@isglobal.org\"), person(\"Rollie\", \"Parrish\", role = \"ctb\", email = \"rparrish@flightweb.com\", comment = c(ORCID = \"0000-0001-8858-6381\")), person(\"Benjamin\", \"Nutter\", role = \"ctb\"), person(\"Andrew\", \"Peters\", role = \"ctb\", comment = c(ORCID = \"0000-0003-2487-1268\")), person(\"Hao\", \"Zhu\", role = \"ctb\", comment = c(ORCID = \"0000-0002-3386-6076\")), person(\"Janosch\", \"Linkersdörfer\", role = \"ctb\", comment = c(ORCID = \"0000-0002-1577-1233\")), person(\"Jonathan\", \"Mang\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0518-4710\")), person(\"Felix\", \"Torres\", role = \"ctb\", email = \"fetorres@ucsd.edu\"), person(\"Philip\", \"Chase\", role = \"ctb\", email = \"pbc@ufl.edu\", comment = c(ORCID = \"0000-0002-5318-9420\")), person(\"Victor\", \"Castro\", role = \"ctb\", email = \"vcastro@mgh.harvard.edu\", comment = c(ORCID = \"0000-0001-7390-6354\")), person(\"Greg\", \"Botwin\", role = \"ctb\"), person(\"Stephan\", \"Kadauke\", role = \"ctb\", comment = c(ORCID = \"0000-0003-2996-8034\")), person(\"Ezra\", \"Porter\", role = \"ctb\", comment = c(ORCID = \"0000-0002-4690-8343\")), person(\"Matthew\", \"Schuelke\", role = \"ctb\", email=\"matt@themadstatter.com\", comment = c(ORCID = \"0000-0001-5755-1725\")))",
+ "URL": "https://ouhscbbmc.github.io/REDCapR/, https://github.com/OuhscBbmc/REDCapR, https://www.ouhsc.edu/bbmc/, https://projectredcap.org",
+ "BugReports": "https://github.com/OuhscBbmc/REDCapR/issues",
+ "Depends": [
+ "R(>= 3.5.0)"
],
- "Hash": "de630e9e6168aae0a178eaa3198dbe54"
+ "Imports": [
+ "checkmate (>= 2.0)",
+ "dplyr (>= 1.0)",
+ "httr (>= 1.4.0)",
+ "jsonlite",
+ "magrittr (>= 1.5)",
+ "methods",
+ "readr (>= 2.0)",
+ "rlang (>= 0.4)",
+ "tibble (>= 2.0)",
+ "tidyr (>= 1.0)"
+ ],
+ "Suggests": [
+ "spelling",
+ "covr (>= 3.4)",
+ "DBI (>= 1.1)",
+ "kableExtra (>= 1.0)",
+ "knitr",
+ "odbc (>= 1.1.1)",
+ "purrr (>= 0.3.4)",
+ "rmarkdown",
+ "sessioninfo (>= 1.1.1)",
+ "testthat (>= 3.0)",
+ "tidyselect",
+ "yaml"
+ ],
+ "License": "MIT + file LICENSE",
+ "VignetteBuilder": "knitr",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.2",
+ "Config/testthat/edition": "3",
+ "Language": "en-US",
+ "NeedsCompilation": "no",
+ "Author": "Will Beasley [aut, cre] (), David Bard [ctb] (), Thomas Wilson [ctb], John J Aponte [ctb], Rollie Parrish [ctb] (), Benjamin Nutter [ctb], Andrew Peters [ctb] (), Hao Zhu [ctb] (), Janosch Linkersdörfer [ctb] (), Jonathan Mang [ctb] (), Felix Torres [ctb], Philip Chase [ctb] (), Victor Castro [ctb] (), Greg Botwin [ctb], Stephan Kadauke [ctb] (), Ezra Porter [ctb] (), Matthew Schuelke [ctb] ()",
+ "Maintainer": "Will Beasley ",
+ "Repository": "CRAN"
},
"Rcpp": {
"Package": "Rcpp",
- "Version": "1.0.13-1",
+ "Version": "1.0.14",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
+ "Title": "Seamless R and C++ Integration",
+ "Date": "2025-01-11",
+ "Authors@R": "c(person(\"Dirk\", \"Eddelbuettel\", role = c(\"aut\", \"cre\"), email = \"edd@debian.org\", comment = c(ORCID = \"0000-0001-6419-907X\")), person(\"Romain\", \"Francois\", role = \"aut\", comment = c(ORCID = \"0000-0002-2444-4226\")), person(\"JJ\", \"Allaire\", role = \"aut\", comment = c(ORCID = \"0000-0003-0174-9868\")), person(\"Kevin\", \"Ushey\", role = \"aut\", comment = c(ORCID = \"0000-0003-2880-7407\")), person(\"Qiang\", \"Kou\", role = \"aut\", comment = c(ORCID = \"0000-0001-6786-5453\")), person(\"Nathan\", \"Russell\", role = \"aut\"), person(\"Iñaki\", \"Ucar\", role = \"aut\", comment = c(ORCID = \"0000-0001-6403-5550\")), person(\"Doug\", \"Bates\", role = \"aut\", comment = c(ORCID = \"0000-0001-8316-9503\")), person(\"John\", \"Chambers\", role = \"aut\"))",
+ "Description": "The 'Rcpp' package provides R functions as well as C++ classes which offer a seamless integration of R and C++. Many R data types and objects can be mapped back and forth to C++ equivalents which facilitates both writing of new code as well as easier integration of third-party libraries. Documentation about 'Rcpp' is provided by several vignettes included in this package, via the 'Rcpp Gallery' site at , the paper by Eddelbuettel and Francois (2011, ), the book by Eddelbuettel (2013, ) and the paper by Eddelbuettel and Balamuta (2018, ); see 'citation(\"Rcpp\")' for details.",
+ "Imports": [
"methods",
"utils"
],
- "Hash": "6b868847b365672d6c1677b1608da9ed"
+ "Suggests": [
+ "tinytest",
+ "inline",
+ "rbenchmark",
+ "pkgKitten (>= 0.1.2)"
+ ],
+ "URL": "https://www.rcpp.org, https://dirk.eddelbuettel.com/code/rcpp.html, https://github.com/RcppCore/Rcpp",
+ "License": "GPL (>= 2)",
+ "BugReports": "https://github.com/RcppCore/Rcpp/issues",
+ "MailingList": "rcpp-devel@lists.r-forge.r-project.org",
+ "RoxygenNote": "6.1.1",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "yes",
+ "Author": "Dirk Eddelbuettel [aut, cre] (), Romain Francois [aut] (), JJ Allaire [aut] (), Kevin Ushey [aut] (), Qiang Kou [aut] (), Nathan Russell [aut], Iñaki Ucar [aut] (), Doug Bates [aut] (), John Chambers [aut]",
+ "Maintainer": "Dirk Eddelbuettel ",
+ "Repository": "CRAN"
},
"RcppEigen": {
"Package": "RcppEigen",
"Version": "0.3.4.0.2",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "Rcpp",
+ "Type": "Package",
+ "Title": "'Rcpp' Integration for the 'Eigen' Templated Linear Algebra Library",
+ "Date": "2024-08-23",
+ "Authors@R": "c(person(\"Doug\", \"Bates\", role = \"aut\", comment = c(ORCID = \"0000-0001-8316-9503\")), person(\"Dirk\", \"Eddelbuettel\", role = c(\"aut\", \"cre\"), email = \"edd@debian.org\", comment = c(ORCID = \"0000-0001-6419-907X\")), person(\"Romain\", \"Francois\", role = \"aut\", comment = c(ORCID = \"0000-0002-2444-4226\")), person(\"Yixuan\", \"Qiu\", role = \"aut\", comment = c(ORCID = \"0000-0003-0109-6692\")), person(\"Authors of\", \"Eigen\", role = \"cph\", comment = \"Authorship and copyright in included Eigen library as detailed in inst/COPYRIGHTS\"))",
+ "Copyright": "See the file COPYRIGHTS for various Eigen copyright details",
+ "Description": "R and 'Eigen' integration using 'Rcpp'. 'Eigen' is a C++ template library for linear algebra: matrices, vectors, numerical solvers and related algorithms. It supports dense and sparse matrices on integer, floating point and complex numbers, decompositions of such matrices, and solutions of linear systems. Its performance on many algorithms is comparable with some of the best implementations based on 'Lapack' and level-3 'BLAS'. The 'RcppEigen' package includes the header files from the 'Eigen' C++ template library. Thus users do not need to install 'Eigen' itself in order to use 'RcppEigen'. Since version 3.1.1, 'Eigen' is licensed under the Mozilla Public License (version 2); earlier version were licensed under the GNU LGPL version 3 or later. 'RcppEigen' (the 'Rcpp' bindings/bridge to 'Eigen') is licensed under the GNU GPL version 2 or later, as is the rest of 'Rcpp'.",
+ "License": "GPL (>= 2) | file LICENSE",
+ "LazyLoad": "yes",
+ "Depends": [
+ "R (>= 3.6.0)"
+ ],
+ "LinkingTo": [
+ "Rcpp"
+ ],
+ "Imports": [
+ "Rcpp (>= 0.11.0)",
"stats",
"utils"
],
- "Hash": "4ac8e423216b8b70cb9653d1b3f71eb9"
+ "Suggests": [
+ "Matrix",
+ "inline",
+ "tinytest",
+ "pkgKitten",
+ "microbenchmark"
+ ],
+ "URL": "https://github.com/RcppCore/RcppEigen, https://dirk.eddelbuettel.com/code/rcpp.eigen.html",
+ "BugReports": "https://github.com/RcppCore/RcppEigen/issues",
+ "NeedsCompilation": "yes",
+ "Author": "Doug Bates [aut] (), Dirk Eddelbuettel [aut, cre] (), Romain Francois [aut] (), Yixuan Qiu [aut] (), Authors of Eigen [cph] (Authorship and copyright in included Eigen library as detailed in inst/COPYRIGHTS)",
+ "Maintainer": "Dirk Eddelbuettel ",
+ "Repository": "CRAN"
},
"Rdpack": {
"Package": "Rdpack",
"Version": "2.6.2",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "methods",
- "rbibutils",
- "tools",
- "utils"
+ "Type": "Package",
+ "Title": "Update and Manipulate Rd Documentation Objects",
+ "Authors@R": "c( person(given = c(\"Georgi\", \"N.\"), family = \"Boshnakov\", role = c(\"aut\", \"cre\"), email = \"georgi.boshnakov@manchester.ac.uk\"), person(given = \"Duncan\", family = \"Murdoch\", role = \"ctb\", email = \"murdoch.duncan@gmail.com\") )",
+ "Description": "Functions for manipulation of R documentation objects, including functions reprompt() and ereprompt() for updating 'Rd' documentation for functions, methods and classes; 'Rd' macros for citations and import of references from 'bibtex' files for use in 'Rd' files and 'roxygen2' comments; 'Rd' macros for evaluating and inserting snippets of 'R' code and the results of its evaluation or creating graphics on the fly; and many functions for manipulation of references and Rd files.",
+ "URL": "https://geobosh.github.io/Rdpack/ (doc), https://github.com/GeoBosh/Rdpack (devel)",
+ "BugReports": "https://github.com/GeoBosh/Rdpack/issues",
+ "Depends": [
+ "R (>= 2.15.0)",
+ "methods"
],
- "Hash": "a9e2118c664c2cd694f03de074e8d4b3"
+ "Imports": [
+ "tools",
+ "utils",
+ "rbibutils (>= 1.3)"
+ ],
+ "Suggests": [
+ "grDevices",
+ "testthat",
+ "rstudioapi",
+ "rprojroot",
+ "gbRd"
+ ],
+ "License": "GPL (>= 2)",
+ "LazyLoad": "yes",
+ "RoxygenNote": "7.1.1",
+ "NeedsCompilation": "no",
+ "Author": "Georgi N. Boshnakov [aut, cre], Duncan Murdoch [ctb]",
+ "Maintainer": "Georgi N. Boshnakov ",
+ "Repository": "CRAN"
},
"SparseM": {
"Package": "SparseM",
"Version": "1.84-2",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Authors@R": "c( person(\"Roger\", \"Koenker\", role = c(\"cre\",\"aut\"), email = \"rkoenker@uiuc.edu\"), person(c(\"Pin\", \"Tian\"), \"Ng\", role = c(\"ctb\"), comment = \"Contributions to Sparse QR code\", email = \"pin.ng@nau.edu\") , person(\"Yousef\", \"Saad\", role = c(\"ctb\"), comment = \"author of sparskit2\") , person(\"Ben\", \"Shaby\", role = c(\"ctb\"), comment = \"author of chol2csr\") , person(\"Martin\", \"Maechler\", role = \"ctb\", comment = c(\"chol() tweaks; S4\", ORCID = \"0000-0002-8685-9910\")) )",
+ "Maintainer": "Roger Koenker ",
+ "Depends": [
+ "R (>= 2.15)",
+ "methods"
+ ],
+ "Imports": [
"graphics",
- "methods",
"stats",
"utils"
],
- "Hash": "e78499cbcbbca98200254bd171379165"
+ "VignetteBuilder": "knitr",
+ "Suggests": [
+ "knitr"
+ ],
+ "Description": "Some basic linear algebra functionality for sparse matrices is provided: including Cholesky decomposition and backsolving as well as standard R subsetting and Kronecker products.",
+ "License": "GPL (>= 2)",
+ "Title": "Sparse Linear Algebra",
+ "URL": "http://www.econ.uiuc.edu/~roger/research/sparse/sparse.html",
+ "NeedsCompilation": "yes",
+ "Author": "Roger Koenker [cre, aut], Pin Tian Ng [ctb] (Contributions to Sparse QR code), Yousef Saad [ctb] (author of sparskit2), Ben Shaby [ctb] (author of chol2csr), Martin Maechler [ctb] (chol() tweaks; S4, )",
+ "Repository": "CRAN"
},
"V8": {
"Package": "V8",
- "Version": "6.0.0",
+ "Version": "6.0.1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "Rcpp",
- "curl",
- "jsonlite",
+ "Type": "Package",
+ "Title": "Embedded JavaScript and WebAssembly Engine for R",
+ "Authors@R": "c( person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\", comment = c(ORCID = \"0000-0002-4035-0289\")), person(\"Jan Marvin\", \"Garbuszus\", role = \"ctb\"))",
+ "Description": "An R interface to V8 : Google's open source JavaScript and WebAssembly engine. This package can be compiled either with V8 version 6 and up or NodeJS when built as a shared library.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://jeroen.r-universe.dev/V8",
+ "BugReports": "https://github.com/jeroen/v8/issues",
+ "SystemRequirements": "V8 engine version 6+ is needed for ES6 and WASM support. On Linux you can build against libv8-dev (Debian) or v8-devel (Fedora). We also provide static libv8 binaries for most platforms, see the README for details.",
+ "NeedsCompilation": "yes",
+ "VignetteBuilder": "knitr",
+ "Imports": [
+ "Rcpp (>= 0.12.12)",
+ "jsonlite (>= 1.0)",
+ "curl (>= 1.0)",
"utils"
],
- "Hash": "6603bfcbc7883a5fed41fb13042a3899"
+ "LinkingTo": [
+ "Rcpp"
+ ],
+ "Suggests": [
+ "testthat",
+ "knitr",
+ "rmarkdown"
+ ],
+ "RoxygenNote": "7.3.1",
+ "Language": "en-US",
+ "Encoding": "UTF-8",
+ "Biarch": "true",
+ "Author": "Jeroen Ooms [aut, cre] (), Jan Marvin Garbuszus [ctb]",
+ "Maintainer": "Jeroen Ooms ",
+ "Repository": "CRAN"
},
"abind": {
"Package": "abind",
"Version": "1.4-8",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Date": "2024-09-08",
+ "Title": "Combine Multidimensional Arrays",
+ "Authors@R": "c(person(\"Tony\", \"Plate\", email = \"tplate@acm.org\", role = c(\"aut\", \"cre\")), person(\"Richard\", \"Heiberger\", role = c(\"aut\")))",
+ "Maintainer": "Tony Plate ",
+ "Description": "Combine multidimensional arrays into a single array. This is a generalization of 'cbind' and 'rbind'. Works with vectors, matrices, and higher-dimensional arrays (aka tensors). Also provides functions 'adrop', 'asub', and 'afill' for manipulating, extracting and replacing data in arrays.",
+ "Depends": [
+ "R (>= 1.5.0)"
+ ],
+ "Imports": [
"methods",
"utils"
],
- "Hash": "2288423bb0f20a457800d7fc47f6aa54"
+ "License": "MIT + file LICENSE",
+ "NeedsCompilation": "no",
+ "Author": "Tony Plate [aut, cre], Richard Heiberger [aut]",
+ "Repository": "CRAN"
},
"ape": {
"Package": "ape",
"Version": "5.8-1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "Rcpp",
- "digest",
- "graphics",
- "lattice",
- "methods",
- "nlme",
- "parallel",
- "stats",
- "utils"
+ "Date": "2024-12-10",
+ "Title": "Analyses of Phylogenetics and Evolution",
+ "Authors@R": "c(person(\"Emmanuel\", \"Paradis\", role = c(\"aut\", \"cre\", \"cph\"), email = \"Emmanuel.Paradis@ird.fr\", comment = c(ORCID = \"0000-0003-3092-2199\")), person(\"Simon\", \"Blomberg\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0003-1062-0839\")), person(\"Ben\", \"Bolker\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0002-2127-0443\")), person(\"Joseph\", \"Brown\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0002-3835-8062\")), person(\"Santiago\", \"Claramunt\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0002-8926-5974\")), person(\"Julien\", \"Claude\", role = c(\"aut\", \"cph\"), , comment = c(ORCID = \"0000-0002-9267-1228\")), person(\"Hoa Sien\", \"Cuong\", role = c(\"aut\", \"cph\")), person(\"Richard\", \"Desper\", role = c(\"aut\", \"cph\")), person(\"Gilles\", \"Didier\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0003-0596-9112\")), person(\"Benoit\", \"Durand\", role = c(\"aut\", \"cph\")), person(\"Julien\", \"Dutheil\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0001-7753-4121\")), person(\"RJ\", \"Ewing\", role = c(\"aut\", \"cph\")), person(\"Olivier\", \"Gascuel\", role = c(\"aut\", \"cph\")), person(\"Thomas\", \"Guillerme\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0003-4325-1275\")), person(\"Christoph\", \"Heibl\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0002-7655-3299\")), person(\"Anthony\", \"Ives\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0001-9375-9523\")), person(\"Bradley\", \"Jones\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0003-4498-1069\")), person(\"Franz\", \"Krah\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0001-7866-7508\")), person(\"Daniel\", \"Lawson\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0002-5311-6213\")), person(\"Vincent\", \"Lefort\", role = c(\"aut\", \"cph\")), person(\"Pierre\", \"Legendre\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0002-3838-3305\")), person(\"Jim\", \"Lemon\", role = c(\"aut\", \"cph\")), person(\"Guillaume\", \"Louvel\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0002-7745-0785\")), person(\"Federico\", \"Marotta\", role = c(\"aut\", \"cph\")), person(\"Eric\", \"Marcon\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0002-5249-321X\")), person(\"Rosemary\", \"McCloskey\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0002-9772-8553\")), person(\"Johan\", \"Nylander\", role = c(\"aut\", \"cph\")), person(\"Rainer\", \"Opgen-Rhein\", role = c(\"aut\", \"cph\")), person(\"Andrei-Alin\", \"Popescu\", role = c(\"aut\", \"cph\")), person(\"Manuela\", \"Royer-Carenzi\", role = c(\"aut\", \"cph\")), person(\"Klaus\", \"Schliep\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0003-2941-0161\")), person(\"Korbinian\", \"Strimmer\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0001-7917-2056\")), person(\"Damien\", \"de Vienne\", role = c(\"aut\", \"cph\"), comment = c(ORCID = \"0000-0001-9532-5251\")))",
+ "Depends": [
+ "R (>= 3.2.0)"
],
- "Hash": "54e5b03e928da23e75dc5bb633648d27"
+ "Suggests": [
+ "gee",
+ "expm",
+ "igraph",
+ "phangorn",
+ "xml2"
+ ],
+ "Imports": [
+ "nlme",
+ "lattice",
+ "graphics",
+ "methods",
+ "stats",
+ "utils",
+ "parallel",
+ "Rcpp (>= 0.12.0)",
+ "digest"
+ ],
+ "LinkingTo": [
+ "Rcpp"
+ ],
+ "ZipData": "no",
+ "Description": "Functions for reading, writing, plotting, and manipulating phylogenetic trees, analyses of comparative data in a phylogenetic framework, ancestral character analyses, analyses of diversification and macroevolution, computing distances from DNA sequences, reading and writing nucleotide sequences as well as importing from BioConductor, and several tools such as Mantel's test, generalized skyline plots, graphical exploration of phylogenetic data (alex, trex, kronoviz), estimation of absolute evolutionary rates and clock-like trees using mean path lengths and penalized likelihood, dating trees with non-contemporaneous sequences, translating DNA into AA sequences, and assessing sequence alignments. Phylogeny estimation can be done with the NJ, BIONJ, ME, MVR, SDM, and triangle methods, and several methods handling incomplete distance matrices (NJ*, BIONJ*, MVR*, and the corresponding triangle method). Some functions call external applications (PhyML, Clustal, T-Coffee, Muscle) whose results are returned into R.",
+ "License": "GPL-2 | GPL-3",
+ "URL": "https://github.com/emmanuelparadis/ape",
+ "BugReports": "https://github.com/emmanuelparadis/ape/issues",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "yes",
+ "Author": "Emmanuel Paradis [aut, cre, cph] (), Simon Blomberg [aut, cph] (), Ben Bolker [aut, cph] (), Joseph Brown [aut, cph] (), Santiago Claramunt [aut, cph] (), Julien Claude [aut, cph] (), Hoa Sien Cuong [aut, cph], Richard Desper [aut, cph], Gilles Didier [aut, cph] (), Benoit Durand [aut, cph], Julien Dutheil [aut, cph] (), RJ Ewing [aut, cph], Olivier Gascuel [aut, cph], Thomas Guillerme [aut, cph] (), Christoph Heibl [aut, cph] (), Anthony Ives [aut, cph] (), Bradley Jones [aut, cph] (), Franz Krah [aut, cph] (), Daniel Lawson [aut, cph] (), Vincent Lefort [aut, cph], Pierre Legendre [aut, cph] (), Jim Lemon [aut, cph], Guillaume Louvel [aut, cph] (), Federico Marotta [aut, cph], Eric Marcon [aut, cph] (), Rosemary McCloskey [aut, cph] (), Johan Nylander [aut, cph], Rainer Opgen-Rhein [aut, cph], Andrei-Alin Popescu [aut, cph], Manuela Royer-Carenzi [aut, cph], Klaus Schliep [aut, cph] (), Korbinian Strimmer [aut, cph] (), Damien de Vienne [aut, cph] ()",
+ "Maintainer": "Emmanuel Paradis ",
+ "Repository": "CRAN"
},
"apexcharter": {
"Package": "apexcharter",
"Version": "0.4.4",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "ggplot2",
+ "Title": "Create Interactive Chart with the JavaScript 'ApexCharts' Library",
+ "Description": "Provides an 'htmlwidgets' interface to 'apexcharts.js'. 'Apexcharts' is a modern JavaScript charting library to build interactive charts and visualizations with simple API. 'Apexcharts' examples and documentation are available here: .",
+ "Authors@R": "c( person(\"Victor\", \"Perrier\", email = \"victor.perrier@dreamrs.fr\", role = c(\"aut\", \"cre\")), person(\"Fanny\", \"Meyer\", role = \"aut\"), person(\"Juned\", \"Chhipa\", role = \"cph\", comment = \"apexcharts.js library\"), person(\"Mike\", \"Bostock\", role = \"cph\", comment = \"d3.format library\"))",
+ "License": "MIT + file LICENSE",
+ "Encoding": "UTF-8",
+ "LazyData": "true",
+ "ByteCompile": "true",
+ "Depends": [
+ "R (>= 2.10)"
+ ],
+ "Imports": [
"htmltools",
- "htmlwidgets",
- "jsonlite",
+ "htmlwidgets (>= 1.5.3)",
"magrittr",
"rlang",
- "shiny"
+ "ggplot2",
+ "jsonlite",
+ "shiny (>= 1.1.0)"
],
- "Hash": "4bad120b4c71a078d8637f9cbe1eb1df"
+ "Suggests": [
+ "testthat",
+ "knitr",
+ "scales",
+ "rmarkdown",
+ "covr"
+ ],
+ "RoxygenNote": "7.3.2",
+ "URL": "https://github.com/dreamRs/apexcharter, https://dreamrs.github.io/apexcharter/",
+ "BugReports": "https://github.com/dreamRs/apexcharter/issues",
+ "VignetteBuilder": "knitr",
+ "NeedsCompilation": "no",
+ "Author": "Victor Perrier [aut, cre], Fanny Meyer [aut], Juned Chhipa [cph] (apexcharts.js library), Mike Bostock [cph] (d3.format library)",
+ "Maintainer": "Victor Perrier ",
+ "Repository": "CRAN"
},
"askpass": {
"Package": "askpass",
"Version": "1.2.1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "sys"
+ "Type": "Package",
+ "Title": "Password Entry Utilities for R, Git, and SSH",
+ "Authors@R": "person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\", comment = c(ORCID = \"0000-0002-4035-0289\"))",
+ "Description": "Cross-platform utilities for prompting the user for credentials or a passphrase, for example to authenticate with a server or read a protected key. Includes native programs for MacOS and Windows, hence no 'tcltk' is required. Password entry can be invoked in two different ways: directly from R via the askpass() function, or indirectly as password-entry back-end for 'ssh-agent' or 'git-credential' via the SSH_ASKPASS and GIT_ASKPASS environment variables. Thereby the user can be prompted for credentials or a passphrase if needed when R calls out to git or ssh.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://r-lib.r-universe.dev/askpass",
+ "BugReports": "https://github.com/r-lib/askpass/issues",
+ "Encoding": "UTF-8",
+ "Imports": [
+ "sys (>= 2.1)"
],
- "Hash": "c39f4155b3ceb1a9a2799d700fbd4b6a"
+ "RoxygenNote": "7.2.3",
+ "Suggests": [
+ "testthat"
+ ],
+ "Language": "en-US",
+ "NeedsCompilation": "yes",
+ "Author": "Jeroen Ooms [aut, cre] ()",
+ "Maintainer": "Jeroen Ooms ",
+ "Repository": "CRAN"
},
"assertthat": {
"Package": "assertthat",
"Version": "0.2.1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
+ "Title": "Easy Pre and Post Assertions",
+ "Authors@R": "person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", c(\"aut\", \"cre\"))",
+ "Description": "An extension to stopifnot() that makes it easy to declare the pre and post conditions that you code should satisfy, while also producing friendly error messages so that your users know what's gone wrong.",
+ "License": "GPL-3",
+ "Imports": [
"tools"
],
- "Hash": "50c838a310445e954bc13f26f26a6ecf"
+ "Suggests": [
+ "testthat",
+ "covr"
+ ],
+ "RoxygenNote": "6.0.1",
+ "Collate": "'assert-that.r' 'on-failure.r' 'assertions-file.r' 'assertions-scalar.R' 'assertions.r' 'base.r' 'base-comparison.r' 'base-is.r' 'base-logical.r' 'base-misc.r' 'utils.r' 'validate-that.R'",
+ "NeedsCompilation": "no",
+ "Author": "Hadley Wickham [aut, cre]",
+ "Maintainer": "Hadley Wickham ",
+ "Repository": "CRAN"
},
"backports": {
"Package": "backports",
"Version": "1.5.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R"
+ "Type": "Package",
+ "Title": "Reimplementations of Functions Introduced Since R-3.0.0",
+ "Authors@R": "c( person(\"Michel\", \"Lang\", NULL, \"michellang@gmail.com\", role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0001-9754-0393\")), person(\"Duncan\", \"Murdoch\", NULL, \"murdoch.duncan@gmail.com\", role = c(\"aut\")), person(\"R Core Team\", role = \"aut\"))",
+ "Maintainer": "Michel Lang ",
+ "Description": "Functions introduced or changed since R v3.0.0 are re-implemented in this package. The backports are conditionally exported in order to let R resolve the function name to either the implemented backport, or the respective base version, if available. Package developers can make use of new functions or arguments by selectively importing specific backports to support older installations.",
+ "URL": "https://github.com/r-lib/backports",
+ "BugReports": "https://github.com/r-lib/backports/issues",
+ "License": "GPL-2 | GPL-3",
+ "NeedsCompilation": "yes",
+ "ByteCompile": "yes",
+ "Depends": [
+ "R (>= 3.0.0)"
],
- "Hash": "e1e1b9d75c37401117b636b7ae50827a"
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.1",
+ "Author": "Michel Lang [cre, aut] (), Duncan Murdoch [aut], R Core Team [aut]",
+ "Repository": "CRAN"
},
"base64enc": {
"Package": "base64enc",
"Version": "0.1-3",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R"
+ "Title": "Tools for base64 encoding",
+ "Author": "Simon Urbanek ",
+ "Maintainer": "Simon Urbanek ",
+ "Depends": [
+ "R (>= 2.9.0)"
],
- "Hash": "543776ae6848fde2f48ff3816d0628bc"
+ "Enhances": [
+ "png"
+ ],
+ "Description": "This package provides tools for handling base64 encoding. It is more flexible than the orphaned base64 package.",
+ "License": "GPL-2 | GPL-3",
+ "URL": "http://www.rforge.net/base64enc",
+ "NeedsCompilation": "yes",
+ "Repository": "CRAN"
},
"bayestestR": {
"Package": "bayestestR",
- "Version": "0.15.0",
+ "Version": "0.15.2",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "datawizard",
+ "Type": "Package",
+ "Title": "Understand and Describe Bayesian Models and Posterior Distributions",
+ "Authors@R": "c(person(given = \"Dominique\", family = \"Makowski\", role = c(\"aut\", \"cre\"), email = \"dom.makowski@gmail.com\", comment = c(ORCID = \"0000-0001-5375-9967\")), person(given = \"Daniel\", family = \"Lüdecke\", role = \"aut\", email = \"d.luedecke@uke.de\", comment = c(ORCID = \"0000-0002-8895-3206\")), person(given = \"Mattan S.\", family = \"Ben-Shachar\", role = \"aut\", email = \"matanshm@post.bgu.ac.il\", comment = c(ORCID = \"0000-0002-4287-4801\")), person(given = \"Indrajeet\", family = \"Patil\", role = \"aut\", email = \"patilindrajeet.science@gmail.com\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(given = \"Micah K.\", family = \"Wilson\", role = \"aut\", email = \"micah.k.wilson@curtin.edu.au\", comment = c(ORCID = \"0000-0003-4143-7308\")), person(given = \"Brenton M.\", family = \"Wiernik\", role = \"aut\", email = \"brenton@wiernik.org\", comment = c(ORCID = \"0000-0001-9560-6336\")), person(given = \"Paul-Christian\", family = \"Bürkner\", role = \"rev\", email = \"paul.buerkner@gmail.com\"), person(given = \"Tristan\", family = \"Mahr\", role = \"rev\", email = \"tristan.mahr@wisc.edu\", comment = c(ORCID = \"0000-0002-8890-5116\")), person(given = \"Henrik\", family = \"Singmann\", role = \"ctb\", email = \"singmann@gmail.com\", comment = c(ORCID = \"0000-0002-4842-3657\")), person(given = \"Quentin F.\", family = \"Gronau\", role = \"ctb\", comment = c(ORCID = \"0000-0001-5510-6943\")), person(given = \"Sam\", family = \"Crawley\", role = \"ctb\", email = \"sam@crawley.nz\", comment = c(ORCID = \"0000-0002-7847-0411\")))",
+ "Maintainer": "Dominique Makowski ",
+ "Description": "Provides utilities to describe posterior distributions and Bayesian models. It includes point-estimates such as Maximum A Posteriori (MAP), measures of dispersion (Highest Density Interval - HDI; Kruschke, 2015 ) and indices used for null-hypothesis testing (such as ROPE percentage, pd and Bayes factors). References: Makowski et al. (2021) .",
+ "Depends": [
+ "R (>= 3.6)"
+ ],
+ "Imports": [
+ "insight (>= 1.0.1)",
+ "datawizard (>= 1.0.0)",
"graphics",
- "insight",
"methods",
"stats",
"utils"
],
- "Hash": "d7c05ccb9d60d87dbbe8b4042c385f01"
+ "Suggests": [
+ "BayesFactor (>= 0.9.12-4.4)",
+ "bayesQR",
+ "bayesplot",
+ "betareg",
+ "BH",
+ "blavaan",
+ "bridgesampling",
+ "brms",
+ "collapse",
+ "curl",
+ "effectsize",
+ "emmeans",
+ "gamm4",
+ "ggdist",
+ "ggplot2",
+ "glmmTMB",
+ "httr2",
+ "KernSmooth",
+ "knitr",
+ "lavaan",
+ "lme4",
+ "logspline (>= 2.1.21)",
+ "marginaleffects (>= 0.24.0)",
+ "MASS",
+ "mclust",
+ "mediation",
+ "modelbased",
+ "ordbetareg",
+ "parameters",
+ "patchwork",
+ "performance",
+ "quadprog",
+ "posterior",
+ "RcppEigen",
+ "rmarkdown",
+ "rstan",
+ "rstanarm",
+ "see (>= 0.8.5)",
+ "testthat",
+ "tweedie",
+ "withr"
+ ],
+ "License": "GPL-3",
+ "URL": "https://easystats.github.io/bayestestR/",
+ "BugReports": "https://github.com/easystats/bayestestR/issues",
+ "VignetteBuilder": "knitr",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.3.2",
+ "Config/testthat/edition": "3",
+ "Config/testthat/parallel": "true",
+ "Config/rcmdcheck/ignore-inconsequential-notes": "true",
+ "Config/Needs/website": "easystats/easystatstemplate",
+ "Config/Needs/check": "stan-dev/cmdstanr",
+ "NeedsCompilation": "no",
+ "Author": "Dominique Makowski [aut, cre] (), Daniel Lüdecke [aut] (), Mattan S. Ben-Shachar [aut] (), Indrajeet Patil [aut] (), Micah K. Wilson [aut] (), Brenton M. Wiernik [aut] (), Paul-Christian Bürkner [rev], Tristan Mahr [rev] (), Henrik Singmann [ctb] (), Quentin F. Gronau [ctb] (), Sam Crawley [ctb] ()",
+ "Repository": "CRAN"
},
"bigD": {
"Package": "bigD",
"Version": "0.3.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R"
+ "Type": "Package",
+ "Title": "Flexibly Format Dates and Times to a Given Locale",
+ "Description": "Format dates and times flexibly and to whichever locales make sense. Parses dates, times, and date-times in various formats (including string-based ISO 8601 constructions). The formatting syntax gives the user many options for formatting the date and time output in a precise manner. Time zones in the input can be expressed in multiple ways and there are many options for formatting time zones in the output as well. Several of the provided helper functions allow for automatic generation of locale-aware formatting patterns based on date/time skeleton formats and standardized date/time formats with varying specificity.",
+ "Authors@R": "c( person(\"Richard\", \"Iannone\", , \"rich@posit.co\", c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-3925-190X\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )",
+ "License": "MIT + file LICENSE",
+ "URL": "https://rstudio.github.io/bigD/, https://github.com/rstudio/bigD",
+ "BugReports": "https://github.com/rstudio/bigD/issues",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.2",
+ "Depends": [
+ "R (>= 3.3.0)"
],
- "Hash": "78dfe2b21e523358871eea1601b04b56"
+ "Suggests": [
+ "covr",
+ "testthat (>= 3.0.0)",
+ "tibble (>= 3.2.1)"
+ ],
+ "Config/testthat/edition": "3",
+ "Config/testthat/parallel": "true",
+ "NeedsCompilation": "no",
+ "Author": "Richard Iannone [aut, cre] (), Posit Software, PBC [cph, fnd]",
+ "Maintainer": "Richard Iannone ",
+ "Repository": "CRAN"
},
"bit": {
"Package": "bit",
"Version": "4.5.0.1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R"
+ "Type": "Package",
+ "Title": "Classes and Methods for Fast Memory-Efficient Boolean Selections",
+ "Date": "2024-09-17",
+ "Authors@R": "c(person(given = \"Jens\", family = \"Oehlschlägel\", role = c(\"aut\", \"cre\"), email = \"Jens.Oehlschlaegel@truecluster.com\"), person(given = \"Brian\", family = \"Ripley\", role = \"ctb\"))",
+ "Author": "Jens Oehlschlägel [aut, cre], Brian Ripley [ctb]",
+ "Maintainer": "Jens Oehlschlägel ",
+ "Depends": [
+ "R (>= 3.4.0)"
],
- "Hash": "f89f074e0e49bf1dbe3eba0a15a91476"
+ "Suggests": [
+ "testthat (>= 0.11.0)",
+ "roxygen2",
+ "knitr",
+ "markdown",
+ "rmarkdown",
+ "microbenchmark",
+ "bit64 (>= 4.0.0)",
+ "ff (>= 4.0.0)"
+ ],
+ "Description": "Provided are classes for boolean and skewed boolean vectors, fast boolean methods, fast unique and non-unique integer sorting, fast set operations on sorted and unsorted sets of integers, and foundations for ff (range index, compression, chunked processing).",
+ "License": "GPL-2 | GPL-3",
+ "LazyLoad": "yes",
+ "ByteCompile": "yes",
+ "Encoding": "UTF-8",
+ "URL": "https://github.com/truecluster/bit",
+ "VignetteBuilder": "knitr, rmarkdown",
+ "RoxygenNote": "7.3.2",
+ "NeedsCompilation": "yes",
+ "Repository": "CRAN"
},
"bit64": {
"Package": "bit64",
- "Version": "4.5.2",
+ "Version": "4.6.0-1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "bit",
+ "Title": "A S3 Class for Vectors of 64bit Integers",
+ "Authors@R": "c( person(\"Michael\", \"Chirico\", email = \"michaelchirico4@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Jens\", \"Oehlschlägel\", role = \"aut\"), person(\"Leonardo\", \"Silvestri\", role = \"ctb\"), person(\"Ofek\", \"Shilon\", role = \"ctb\") )",
+ "Depends": [
+ "R (>= 3.4.0)",
+ "bit (>= 4.0.0)"
+ ],
+ "Description": "Package 'bit64' provides serializable S3 atomic 64bit (signed) integers. These are useful for handling database keys and exact counting in +-2^63. WARNING: do not use them as replacement for 32bit integers, integer64 are not supported for subscripting by R-core and they have different semantics when combined with double, e.g. integer64 + double => integer64. Class integer64 can be used in vectors, matrices, arrays and data.frames. Methods are available for coercion from and to logicals, integers, doubles, characters and factors as well as many elementwise and summary functions. Many fast algorithmic operations such as 'match' and 'order' support inter- active data exploration and manipulation and optionally leverage caching.",
+ "License": "GPL-2 | GPL-3",
+ "LazyLoad": "yes",
+ "ByteCompile": "yes",
+ "URL": "https://github.com/r-lib/bit64",
+ "Encoding": "UTF-8",
+ "Imports": [
+ "graphics",
"methods",
"stats",
"utils"
],
- "Hash": "e84984bf5f12a18628d9a02322128dfd"
+ "Suggests": [
+ "testthat (>= 3.0.3)",
+ "withr"
+ ],
+ "Config/testthat/edition": "3",
+ "Config/needs/development": "testthat",
+ "RoxygenNote": "7.3.2",
+ "NeedsCompilation": "yes",
+ "Author": "Michael Chirico [aut, cre], Jens Oehlschlägel [aut], Leonardo Silvestri [ctb], Ofek Shilon [ctb]",
+ "Maintainer": "Michael Chirico ",
+ "Repository": "CRAN"
},
"bitops": {
"Package": "bitops",
"Version": "1.0-9",
"Source": "Repository",
- "Repository": "CRAN",
- "Hash": "d972ef991d58c19e6efa71b21f5e144b"
+ "Date": "2024-10-03",
+ "Authors@R": "c( person(\"Steve\", \"Dutky\", role = \"aut\", email = \"sdutky@terpalum.umd.edu\", comment = \"S original; then (after MM's port) revised and modified\"), person(\"Martin\", \"Maechler\", role = c(\"cre\", \"aut\"), email = \"maechler@stat.math.ethz.ch\", comment = c(\"Initial R port; tweaks\", ORCID = \"0000-0002-8685-9910\")))",
+ "Title": "Bitwise Operations",
+ "Description": "Functions for bitwise operations on integer vectors.",
+ "License": "GPL (>= 2)",
+ "URL": "https://github.com/mmaechler/R-bitops",
+ "BugReports": "https://github.com/mmaechler/R-bitops/issues",
+ "NeedsCompilation": "yes",
+ "Author": "Steve Dutky [aut] (S original; then (after MM's port) revised and modified), Martin Maechler [cre, aut] (Initial R port; tweaks, )",
+ "Maintainer": "Martin Maechler ",
+ "Repository": "CRAN"
},
"boot": {
"Package": "boot",
"Version": "1.3-31",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Priority": "recommended",
+ "Date": "2024-08-28",
+ "Authors@R": "c(person(\"Angelo\", \"Canty\", role = \"aut\", email = \"cantya@mcmaster.ca\", comment = \"author of original code for S\"), person(\"Brian\", \"Ripley\", role = c(\"aut\", \"trl\"), email = \"ripley@stats.ox.ac.uk\", comment = \"conversion to R, maintainer 1999--2022, author of parallel support\"), person(\"Alessandra R.\", \"Brazzale\", role = c(\"ctb\", \"cre\"), email = \"brazzale@stat.unipd.it\", comment = \"minor bug fixes\"))",
+ "Maintainer": "Alessandra R. Brazzale ",
+ "Note": "Maintainers are not available to give advice on using a package they did not author.",
+ "Description": "Functions and datasets for bootstrapping from the book \"Bootstrap Methods and Their Application\" by A. C. Davison and D. V. Hinkley (1997, CUP), originally written by Angelo Canty for S.",
+ "Title": "Bootstrap Functions (Originally by Angelo Canty for S)",
+ "Depends": [
+ "R (>= 3.0.0)",
"graphics",
"stats"
],
- "Hash": "de2a4646c18661d6a0a08ec67f40b7ed"
+ "Suggests": [
+ "MASS",
+ "survival"
+ ],
+ "LazyData": "yes",
+ "ByteCompile": "yes",
+ "License": "Unlimited",
+ "NeedsCompilation": "no",
+ "Author": "Angelo Canty [aut] (author of original code for S), Brian Ripley [aut, trl] (conversion to R, maintainer 1999--2022, author of parallel support), Alessandra R. Brazzale [ctb, cre] (minor bug fixes)",
+ "Repository": "CRAN"
},
"brio": {
"Package": "brio",
"Version": "1.1.5",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R"
+ "Title": "Basic R Input Output",
+ "Authors@R": "c( person(\"Jim\", \"Hester\", role = \"aut\", comment = c(ORCID = \"0000-0002-2739-7082\")), person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")), person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )",
+ "Description": "Functions to handle basic input output, these functions always read and write UTF-8 (8-bit Unicode Transformation Format) files and provide more explicit control over line endings.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://brio.r-lib.org, https://github.com/r-lib/brio",
+ "BugReports": "https://github.com/r-lib/brio/issues",
+ "Depends": [
+ "R (>= 3.6)"
],
- "Hash": "c1ee497a6d999947c2c224ae46799b1a"
+ "Suggests": [
+ "covr",
+ "testthat (>= 3.0.0)"
+ ],
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.3",
+ "NeedsCompilation": "yes",
+ "Author": "Jim Hester [aut] (), Gábor Csárdi [aut, cre], Posit Software, PBC [cph, fnd]",
+ "Maintainer": "Gábor Csárdi ",
+ "Repository": "CRAN"
},
"broom": {
"Package": "broom",
"Version": "1.0.7",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Type": "Package",
+ "Title": "Convert Statistical Objects into Tidy Tibbles",
+ "Authors@R": "c(person(given = \"David\", family = \"Robinson\", role = \"aut\", email = \"admiral.david@gmail.com\"), person(given = \"Alex\", family = \"Hayes\", role = \"aut\", email = \"alexpghayes@gmail.com\", comment = c(ORCID = \"0000-0002-4985-5160\")), person(given = \"Simon\", family = \"Couch\", role = c(\"aut\", \"cre\"), email = \"simon.couch@posit.co\", comment = c(ORCID = \"0000-0001-5676-5107\")), person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(given = \"Indrajeet\", family = \"Patil\", role = \"ctb\", email = \"patilindrajeet.science@gmail.com\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(given = \"Derek\", family = \"Chiu\", role = \"ctb\", email = \"dchiu@bccrc.ca\"), person(given = \"Matthieu\", family = \"Gomez\", role = \"ctb\", email = \"mattg@princeton.edu\"), person(given = \"Boris\", family = \"Demeshev\", role = \"ctb\", email = \"boris.demeshev@gmail.com\"), person(given = \"Dieter\", family = \"Menne\", role = \"ctb\", email = \"dieter.menne@menne-biomed.de\"), person(given = \"Benjamin\", family = \"Nutter\", role = \"ctb\", email = \"nutter@battelle.org\"), person(given = \"Luke\", family = \"Johnston\", role = \"ctb\", email = \"luke.johnston@mail.utoronto.ca\"), person(given = \"Ben\", family = \"Bolker\", role = \"ctb\", email = \"bolker@mcmaster.ca\"), person(given = \"Francois\", family = \"Briatte\", role = \"ctb\", email = \"f.briatte@gmail.com\"), person(given = \"Jeffrey\", family = \"Arnold\", role = \"ctb\", email = \"jeffrey.arnold@gmail.com\"), person(given = \"Jonah\", family = \"Gabry\", role = \"ctb\", email = \"jsg2201@columbia.edu\"), person(given = \"Luciano\", family = \"Selzer\", role = \"ctb\", email = \"luciano.selzer@gmail.com\"), person(given = \"Gavin\", family = \"Simpson\", role = \"ctb\", email = \"ucfagls@gmail.com\"), person(given = \"Jens\", family = \"Preussner\", role = \"ctb\", email = \" jens.preussner@mpi-bn.mpg.de\"), person(given = \"Jay\", family = \"Hesselberth\", role = \"ctb\", email = \"jay.hesselberth@gmail.com\"), person(given = \"Hadley\", family = \"Wickham\", role = \"ctb\", email = \"hadley@posit.co\"), person(given = \"Matthew\", family = \"Lincoln\", role = \"ctb\", email = \"matthew.d.lincoln@gmail.com\"), person(given = \"Alessandro\", family = \"Gasparini\", role = \"ctb\", email = \"ag475@leicester.ac.uk\"), person(given = \"Lukasz\", family = \"Komsta\", role = \"ctb\", email = \"lukasz.komsta@umlub.pl\"), person(given = \"Frederick\", family = \"Novometsky\", role = \"ctb\"), person(given = \"Wilson\", family = \"Freitas\", role = \"ctb\"), person(given = \"Michelle\", family = \"Evans\", role = \"ctb\"), person(given = \"Jason Cory\", family = \"Brunson\", role = \"ctb\", email = \"cornelioid@gmail.com\"), person(given = \"Simon\", family = \"Jackson\", role = \"ctb\", email = \"drsimonjackson@gmail.com\"), person(given = \"Ben\", family = \"Whalley\", role = \"ctb\", email = \"ben.whalley@plymouth.ac.uk\"), person(given = \"Karissa\", family = \"Whiting\", role = \"ctb\", email = \"karissa.whiting@gmail.com\"), person(given = \"Yves\", family = \"Rosseel\", role = \"ctb\", email = \"yrosseel@gmail.com\"), person(given = \"Michael\", family = \"Kuehn\", role = \"ctb\", email = \"mkuehn10@gmail.com\"), person(given = \"Jorge\", family = \"Cimentada\", role = \"ctb\", email = \"cimentadaj@gmail.com\"), person(given = \"Erle\", family = \"Holgersen\", role = \"ctb\", email = \"erle.holgersen@gmail.com\"), person(given = \"Karl\", family = \"Dunkle Werner\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0523-7309\")), person(given = \"Ethan\", family = \"Christensen\", role = \"ctb\", email = \"christensen.ej@gmail.com\"), person(given = \"Steven\", family = \"Pav\", role = \"ctb\", email = \"shabbychef@gmail.com\"), person(given = \"Paul\", family = \"PJ\", role = \"ctb\", email = \"pjpaul.stephens@gmail.com\"), person(given = \"Ben\", family = \"Schneider\", role = \"ctb\", email = \"benjamin.julius.schneider@gmail.com\"), person(given = \"Patrick\", family = \"Kennedy\", role = \"ctb\", email = \"pkqstr@protonmail.com\"), person(given = \"Lily\", family = \"Medina\", role = \"ctb\", email = \"lilymiru@gmail.com\"), person(given = \"Brian\", family = \"Fannin\", role = \"ctb\", email = \"captain@pirategrunt.com\"), person(given = \"Jason\", family = \"Muhlenkamp\", role = \"ctb\", email = \"jason.muhlenkamp@gmail.com\"), person(given = \"Matt\", family = \"Lehman\", role = \"ctb\"), person(given = \"Bill\", family = \"Denney\", role = \"ctb\", email = \"wdenney@humanpredictions.com\", comment = c(ORCID = \"0000-0002-5759-428X\")), person(given = \"Nic\", family = \"Crane\", role = \"ctb\"), person(given = \"Andrew\", family = \"Bates\", role = \"ctb\"), person(given = \"Vincent\", family = \"Arel-Bundock\", role = \"ctb\", email = \"vincent.arel-bundock@umontreal.ca\", comment = c(ORCID = \"0000-0003-2042-7063\")), person(given = \"Hideaki\", family = \"Hayashi\", role = \"ctb\"), person(given = \"Luis\", family = \"Tobalina\", role = \"ctb\"), person(given = \"Annie\", family = \"Wang\", role = \"ctb\", email = \"anniewang.uc@gmail.com\"), person(given = \"Wei Yang\", family = \"Tham\", role = \"ctb\", email = \"weiyang.tham@gmail.com\"), person(given = \"Clara\", family = \"Wang\", role = \"ctb\", email = \"clara.wang.94@gmail.com\"), person(given = \"Abby\", family = \"Smith\", role = \"ctb\", email = \"als1@u.northwestern.edu\", comment = c(ORCID = \"0000-0002-3207-0375\")), person(given = \"Jasper\", family = \"Cooper\", role = \"ctb\", email = \"jaspercooper@gmail.com\", comment = c(ORCID = \"0000-0002-8639-3188\")), person(given = \"E Auden\", family = \"Krauska\", role = \"ctb\", email = \"krauskae@gmail.com\", comment = c(ORCID = \"0000-0002-1466-5850\")), person(given = \"Alex\", family = \"Wang\", role = \"ctb\", email = \"x249wang@uwaterloo.ca\"), person(given = \"Malcolm\", family = \"Barrett\", role = \"ctb\", email = \"malcolmbarrett@gmail.com\", comment = c(ORCID = \"0000-0003-0299-5825\")), person(given = \"Charles\", family = \"Gray\", role = \"ctb\", email = \"charlestigray@gmail.com\", comment = c(ORCID = \"0000-0002-9978-011X\")), person(given = \"Jared\", family = \"Wilber\", role = \"ctb\"), person(given = \"Vilmantas\", family = \"Gegzna\", role = \"ctb\", email = \"GegznaV@gmail.com\", comment = c(ORCID = \"0000-0002-9500-5167\")), person(given = \"Eduard\", family = \"Szoecs\", role = \"ctb\", email = \"eduardszoecs@gmail.com\"), person(given = \"Frederik\", family = \"Aust\", role = \"ctb\", email = \"frederik.aust@uni-koeln.de\", comment = c(ORCID = \"0000-0003-4900-788X\")), person(given = \"Angus\", family = \"Moore\", role = \"ctb\", email = \"angusmoore9@gmail.com\"), person(given = \"Nick\", family = \"Williams\", role = \"ctb\", email = \"ntwilliams.personal@gmail.com\"), person(given = \"Marius\", family = \"Barth\", role = \"ctb\", email = \"marius.barth.uni.koeln@gmail.com\", comment = c(ORCID = \"0000-0002-3421-6665\")), person(given = \"Bruna\", family = \"Wundervald\", role = \"ctb\", email = \"brunadaviesw@gmail.com\", comment = c(ORCID = \"0000-0001-8163-220X\")), person(given = \"Joyce\", family = \"Cahoon\", role = \"ctb\", email = \"joyceyu48@gmail.com\", comment = c(ORCID = \"0000-0001-7217-4702\")), person(given = \"Grant\", family = \"McDermott\", role = \"ctb\", email = \"grantmcd@uoregon.edu\", comment = c(ORCID = \"0000-0001-7883-8573\")), person(given = \"Kevin\", family = \"Zarca\", role = \"ctb\", email = \"kevin.zarca@gmail.com\"), person(given = \"Shiro\", family = \"Kuriwaki\", role = \"ctb\", email = \"shirokuriwaki@gmail.com\", comment = c(ORCID = \"0000-0002-5687-2647\")), person(given = \"Lukas\", family = \"Wallrich\", role = \"ctb\", email = \"lukas.wallrich@gmail.com\", comment = c(ORCID = \"0000-0003-2121-5177\")), person(given = \"James\", family = \"Martherus\", role = \"ctb\", email = \"james@martherus.com\", comment = c(ORCID = \"0000-0002-8285-3300\")), person(given = \"Chuliang\", family = \"Xiao\", role = \"ctb\", email = \"cxiao@umich.edu\", comment = c(ORCID = \"0000-0002-8466-9398\")), person(given = \"Joseph\", family = \"Larmarange\", role = \"ctb\", email = \"joseph@larmarange.net\"), person(given = \"Max\", family = \"Kuhn\", role = \"ctb\", email = \"max@posit.co\"), person(given = \"Michal\", family = \"Bojanowski\", role = \"ctb\", email = \"michal2992@gmail.com\"), person(given = \"Hakon\", family = \"Malmedal\", role = \"ctb\", email = \"hmalmedal@gmail.com\"), person(given = \"Clara\", family = \"Wang\", role = \"ctb\"), person(given = \"Sergio\", family = \"Oller\", role = \"ctb\", email = \"sergioller@gmail.com\"), person(given = \"Luke\", family = \"Sonnet\", role = \"ctb\", email = \"luke.sonnet@gmail.com\"), person(given = \"Jim\", family = \"Hester\", role = \"ctb\", email = \"jim.hester@posit.co\"), person(given = \"Ben\", family = \"Schneider\", role = \"ctb\", email = \"benjamin.julius.schneider@gmail.com\"), person(given = \"Bernie\", family = \"Gray\", role = \"ctb\", email = \"bfgray3@gmail.com\", comment = c(ORCID = \"0000-0001-9190-6032\")), person(given = \"Mara\", family = \"Averick\", role = \"ctb\", email = \"mara@posit.co\"), person(given = \"Aaron\", family = \"Jacobs\", role = \"ctb\", email = \"atheriel@gmail.com\"), person(given = \"Andreas\", family = \"Bender\", role = \"ctb\", email = \"bender.at.R@gmail.com\"), person(given = \"Sven\", family = \"Templer\", role = \"ctb\", email = \"sven.templer@gmail.com\"), person(given = \"Paul-Christian\", family = \"Buerkner\", role = \"ctb\", email = \"paul.buerkner@gmail.com\"), person(given = \"Matthew\", family = \"Kay\", role = \"ctb\", email = \"mjskay@umich.edu\"), person(given = \"Erwan\", family = \"Le Pennec\", role = \"ctb\", email = \"lepennec@gmail.com\"), person(given = \"Johan\", family = \"Junkka\", role = \"ctb\", email = \"johan.junkka@umu.se\"), person(given = \"Hao\", family = \"Zhu\", role = \"ctb\", email = \"haozhu233@gmail.com\"), person(given = \"Benjamin\", family = \"Soltoff\", role = \"ctb\", email = \"soltoffbc@uchicago.edu\"), person(given = \"Zoe\", family = \"Wilkinson Saldana\", role = \"ctb\", email = \"zoewsaldana@gmail.com\"), person(given = \"Tyler\", family = \"Littlefield\", role = \"ctb\", email = \"tylurp1@gmail.com\"), person(given = \"Charles T.\", family = \"Gray\", role = \"ctb\", email = \"charlestigray@gmail.com\"), person(given = \"Shabbh E.\", family = \"Banks\", role = \"ctb\"), person(given = \"Serina\", family = \"Robinson\", role = \"ctb\", email = \"robi0916@umn.edu\"), person(given = \"Roger\", family = \"Bivand\", role = \"ctb\", email = \"Roger.Bivand@nhh.no\"), person(given = \"Riinu\", family = \"Ots\", role = \"ctb\", email = \"riinuots@gmail.com\"), person(given = \"Nicholas\", family = \"Williams\", role = \"ctb\", email = \"ntwilliams.personal@gmail.com\"), person(given = \"Nina\", family = \"Jakobsen\", role = \"ctb\"), person(given = \"Michael\", family = \"Weylandt\", role = \"ctb\", email = \"michael.weylandt@gmail.com\"), person(given = \"Lisa\", family = \"Lendway\", role = \"ctb\", email = \"llendway@macalester.edu\"), person(given = \"Karl\", family = \"Hailperin\", role = \"ctb\", email = \"khailper@gmail.com\"), person(given = \"Josue\", family = \"Rodriguez\", role = \"ctb\", email = \"jerrodriguez@ucdavis.edu\"), person(given = \"Jenny\", family = \"Bryan\", role = \"ctb\", email = \"jenny@posit.co\"), person(given = \"Chris\", family = \"Jarvis\", role = \"ctb\", email = \"Christopher1.jarvis@gmail.com\"), person(given = \"Greg\", family = \"Macfarlane\", role = \"ctb\", email = \"gregmacfarlane@gmail.com\"), person(given = \"Brian\", family = \"Mannakee\", role = \"ctb\", email = \"bmannakee@gmail.com\"), person(given = \"Drew\", family = \"Tyre\", role = \"ctb\", email = \"atyre2@unl.edu\"), person(given = \"Shreyas\", family = \"Singh\", role = \"ctb\", email = \"shreyas.singh.298@gmail.com\"), person(given = \"Laurens\", family = \"Geffert\", role = \"ctb\", email = \"laurensgeffert@gmail.com\"), person(given = \"Hong\", family = \"Ooi\", role = \"ctb\", email = \"hongooi@microsoft.com\"), person(given = \"Henrik\", family = \"Bengtsson\", role = \"ctb\", email = \"henrikb@braju.com\"), person(given = \"Eduard\", family = \"Szocs\", role = \"ctb\", email = \"eduardszoecs@gmail.com\"), person(given = \"David\", family = \"Hugh-Jones\", role = \"ctb\", email = \"davidhughjones@gmail.com\"), person(given = \"Matthieu\", family = \"Stigler\", role = \"ctb\", email = \"Matthieu.Stigler@gmail.com\"), person(given = \"Hugo\", family = \"Tavares\", role = \"ctb\", email = \"hm533@cam.ac.uk\", comment = c(ORCID = \"0000-0001-9373-2726\")), person(given = \"R. Willem\", family = \"Vervoort\", role = \"ctb\", email = \"Willemvervoort@gmail.com\"), person(given = \"Brenton M.\", family = \"Wiernik\", role = \"ctb\", email = \"brenton@wiernik.org\"), person(given = \"Josh\", family = \"Yamamoto\", role = \"ctb\", email = \"joshuayamamoto5@gmail.com\"), person(given = \"Jasme\", family = \"Lee\", role = \"ctb\"), person(given = \"Taren\", family = \"Sanders\", role = \"ctb\", email = \"taren.sanders@acu.edu.au\", comment = c(ORCID = \"0000-0002-4504-6008\")), person(given = \"Ilaria\", family = \"Prosdocimi\", role = \"ctb\", email = \"prosdocimi.ilaria@gmail.com\", comment = c(ORCID = \"0000-0001-8565-094X\")), person(given = \"Daniel D.\", family = \"Sjoberg\", role = \"ctb\", email = \"danield.sjoberg@gmail.com\", comment = c(ORCID = \"0000-0003-0862-2018\")), person(given = \"Alex\", family = \"Reinhart\", role = \"ctb\", email = \"areinhar@stat.cmu.edu\", comment = c(ORCID = \"0000-0002-6658-514X\")))",
+ "Description": "Summarizes key information about statistical objects in tidy tibbles. This makes it easy to report results, create plots and consistently work with large numbers of models at once. Broom provides three verbs that each provide different types of information about a model. tidy() summarizes information about model components such as coefficients of a regression. glance() reports information about an entire model, such as goodness of fit measures like AIC and BIC. augment() adds information about individual observations to a dataset, such as fitted values or influence measures.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://broom.tidymodels.org/, https://github.com/tidymodels/broom",
+ "BugReports": "https://github.com/tidymodels/broom/issues",
+ "Depends": [
+ "R (>= 3.5)"
+ ],
+ "Imports": [
"backports",
- "dplyr",
- "generics",
+ "dplyr (>= 1.0.0)",
+ "generics (>= 0.0.2)",
"glue",
"lifecycle",
"purrr",
"rlang",
"stringr",
- "tibble",
- "tidyr"
+ "tibble (>= 3.0.0)",
+ "tidyr (>= 1.0.0)"
],
- "Hash": "8fcc818f3b9887aebaf206f141437cc9"
+ "Suggests": [
+ "AER",
+ "AUC",
+ "bbmle",
+ "betareg (>= 3.2-1)",
+ "biglm",
+ "binGroup",
+ "boot",
+ "btergm (>= 1.10.6)",
+ "car (>= 3.1-2)",
+ "carData",
+ "caret",
+ "cluster",
+ "cmprsk",
+ "coda",
+ "covr",
+ "drc",
+ "e1071",
+ "emmeans",
+ "epiR",
+ "ergm (>= 3.10.4)",
+ "fixest (>= 0.9.0)",
+ "gam (>= 1.15)",
+ "gee",
+ "geepack",
+ "ggplot2",
+ "glmnet",
+ "glmnetUtils",
+ "gmm",
+ "Hmisc",
+ "irlba",
+ "interp",
+ "joineRML",
+ "Kendall",
+ "knitr",
+ "ks",
+ "Lahman",
+ "lavaan (>= 0.6.18)",
+ "leaps",
+ "lfe",
+ "lm.beta",
+ "lme4",
+ "lmodel2",
+ "lmtest (>= 0.9.38)",
+ "lsmeans",
+ "maps",
+ "margins",
+ "MASS",
+ "mclust",
+ "mediation",
+ "metafor",
+ "mfx",
+ "mgcv",
+ "mlogit",
+ "modeldata",
+ "modeltests (>= 0.1.6)",
+ "muhaz",
+ "multcomp",
+ "network",
+ "nnet",
+ "orcutt (>= 2.2)",
+ "ordinal",
+ "plm",
+ "poLCA",
+ "psych",
+ "quantreg",
+ "rmarkdown",
+ "robust",
+ "robustbase",
+ "rsample",
+ "sandwich",
+ "spdep (>= 1.1)",
+ "spatialreg",
+ "speedglm",
+ "spelling",
+ "survey",
+ "survival (>= 3.6-4)",
+ "systemfit",
+ "testthat (>= 2.1.0)",
+ "tseries",
+ "vars",
+ "zoo"
+ ],
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.2",
+ "Language": "en-US",
+ "Collate": "'aaa-documentation-helper.R' 'null-and-default-tidiers.R' 'aer-tidiers.R' 'auc-tidiers.R' 'base-tidiers.R' 'bbmle-tidiers.R' 'betareg-tidiers.R' 'biglm-tidiers.R' 'bingroup-tidiers.R' 'boot-tidiers.R' 'broom-package.R' 'broom.R' 'btergm-tidiers.R' 'car-tidiers.R' 'caret-tidiers.R' 'cluster-tidiers.R' 'cmprsk-tidiers.R' 'data-frame-tidiers.R' 'deprecated-0-7-0.R' 'drc-tidiers.R' 'emmeans-tidiers.R' 'epiR-tidiers.R' 'ergm-tidiers.R' 'fixest-tidiers.R' 'gam-tidiers.R' 'geepack-tidiers.R' 'glmnet-cv-glmnet-tidiers.R' 'glmnet-glmnet-tidiers.R' 'gmm-tidiers.R' 'hmisc-tidiers.R' 'joinerml-tidiers.R' 'kendall-tidiers.R' 'ks-tidiers.R' 'lavaan-tidiers.R' 'leaps-tidiers.R' 'lfe-tidiers.R' 'list-irlba.R' 'list-optim-tidiers.R' 'list-svd-tidiers.R' 'list-tidiers.R' 'list-xyz-tidiers.R' 'lm-beta-tidiers.R' 'lmodel2-tidiers.R' 'lmtest-tidiers.R' 'maps-tidiers.R' 'margins-tidiers.R' 'mass-fitdistr-tidiers.R' 'mass-negbin-tidiers.R' 'mass-polr-tidiers.R' 'mass-ridgelm-tidiers.R' 'stats-lm-tidiers.R' 'mass-rlm-tidiers.R' 'mclust-tidiers.R' 'mediation-tidiers.R' 'metafor-tidiers.R' 'mfx-tidiers.R' 'mgcv-tidiers.R' 'mlogit-tidiers.R' 'muhaz-tidiers.R' 'multcomp-tidiers.R' 'nnet-tidiers.R' 'nobs.R' 'orcutt-tidiers.R' 'ordinal-clm-tidiers.R' 'ordinal-clmm-tidiers.R' 'plm-tidiers.R' 'polca-tidiers.R' 'psych-tidiers.R' 'stats-nls-tidiers.R' 'quantreg-nlrq-tidiers.R' 'quantreg-rq-tidiers.R' 'quantreg-rqs-tidiers.R' 'robust-glmrob-tidiers.R' 'robust-lmrob-tidiers.R' 'robustbase-glmrob-tidiers.R' 'robustbase-lmrob-tidiers.R' 'sp-tidiers.R' 'spdep-tidiers.R' 'speedglm-speedglm-tidiers.R' 'speedglm-speedlm-tidiers.R' 'stats-anova-tidiers.R' 'stats-arima-tidiers.R' 'stats-decompose-tidiers.R' 'stats-factanal-tidiers.R' 'stats-glm-tidiers.R' 'stats-htest-tidiers.R' 'stats-kmeans-tidiers.R' 'stats-loess-tidiers.R' 'stats-mlm-tidiers.R' 'stats-prcomp-tidiers.R' 'stats-smooth.spline-tidiers.R' 'stats-summary-lm-tidiers.R' 'stats-time-series-tidiers.R' 'survey-tidiers.R' 'survival-aareg-tidiers.R' 'survival-cch-tidiers.R' 'survival-coxph-tidiers.R' 'survival-pyears-tidiers.R' 'survival-survdiff-tidiers.R' 'survival-survexp-tidiers.R' 'survival-survfit-tidiers.R' 'survival-survreg-tidiers.R' 'systemfit-tidiers.R' 'tseries-tidiers.R' 'utilities.R' 'vars-tidiers.R' 'zoo-tidiers.R' 'zzz.R'",
+ "NeedsCompilation": "no",
+ "Author": "David Robinson [aut], Alex Hayes [aut] (), Simon Couch [aut, cre] (), Posit Software, PBC [cph, fnd], Indrajeet Patil [ctb] (), Derek Chiu [ctb], Matthieu Gomez [ctb], Boris Demeshev [ctb], Dieter Menne [ctb], Benjamin Nutter [ctb], Luke Johnston [ctb], Ben Bolker [ctb], Francois Briatte [ctb], Jeffrey Arnold [ctb], Jonah Gabry [ctb], Luciano Selzer [ctb], Gavin Simpson [ctb], Jens Preussner [ctb], Jay Hesselberth [ctb], Hadley Wickham [ctb], Matthew Lincoln [ctb], Alessandro Gasparini [ctb], Lukasz Komsta [ctb], Frederick Novometsky [ctb], Wilson Freitas [ctb], Michelle Evans [ctb], Jason Cory Brunson [ctb], Simon Jackson [ctb], Ben Whalley [ctb], Karissa Whiting [ctb], Yves Rosseel [ctb], Michael Kuehn [ctb], Jorge Cimentada [ctb], Erle Holgersen [ctb], Karl Dunkle Werner [ctb] (), Ethan Christensen [ctb], Steven Pav [ctb], Paul PJ [ctb], Ben Schneider [ctb], Patrick Kennedy [ctb], Lily Medina [ctb], Brian Fannin [ctb], Jason Muhlenkamp [ctb], Matt Lehman [ctb], Bill Denney [ctb] (), Nic Crane [ctb], Andrew Bates [ctb], Vincent Arel-Bundock [ctb] (), Hideaki Hayashi [ctb], Luis Tobalina [ctb], Annie Wang [ctb], Wei Yang Tham [ctb], Clara Wang [ctb], Abby Smith [ctb] (), Jasper Cooper [ctb] (), E Auden Krauska [ctb] (), Alex Wang [ctb], Malcolm Barrett [ctb] (), Charles Gray [ctb] (), Jared Wilber [ctb], Vilmantas Gegzna [ctb] (), Eduard Szoecs [ctb], Frederik Aust [ctb] (), Angus Moore [ctb], Nick Williams [ctb], Marius Barth [ctb] (), Bruna Wundervald [ctb] (), Joyce Cahoon [ctb] (), Grant McDermott [ctb] (), Kevin Zarca [ctb], Shiro Kuriwaki [ctb] (), Lukas Wallrich [ctb] (), James Martherus [ctb] (), Chuliang Xiao [ctb] (), Joseph Larmarange [ctb], Max Kuhn [ctb], Michal Bojanowski [ctb], Hakon Malmedal [ctb], Clara Wang [ctb], Sergio Oller [ctb], Luke Sonnet [ctb], Jim Hester [ctb], Ben Schneider [ctb], Bernie Gray [ctb] (), Mara Averick [ctb], Aaron Jacobs [ctb], Andreas Bender [ctb], Sven Templer [ctb], Paul-Christian Buerkner [ctb], Matthew Kay [ctb], Erwan Le Pennec [ctb], Johan Junkka [ctb], Hao Zhu [ctb], Benjamin Soltoff [ctb], Zoe Wilkinson Saldana [ctb], Tyler Littlefield [ctb], Charles T. Gray [ctb], Shabbh E. Banks [ctb], Serina Robinson [ctb], Roger Bivand [ctb], Riinu Ots [ctb], Nicholas Williams [ctb], Nina Jakobsen [ctb], Michael Weylandt [ctb], Lisa Lendway [ctb], Karl Hailperin [ctb], Josue Rodriguez [ctb], Jenny Bryan [ctb], Chris Jarvis [ctb], Greg Macfarlane [ctb], Brian Mannakee [ctb], Drew Tyre [ctb], Shreyas Singh [ctb], Laurens Geffert [ctb], Hong Ooi [ctb], Henrik Bengtsson [ctb], Eduard Szocs [ctb], David Hugh-Jones [ctb], Matthieu Stigler [ctb], Hugo Tavares [ctb] (), R. Willem Vervoort [ctb], Brenton M. Wiernik [ctb], Josh Yamamoto [ctb], Jasme Lee [ctb], Taren Sanders [ctb] (), Ilaria Prosdocimi [ctb] (), Daniel D. Sjoberg [ctb] (), Alex Reinhart [ctb] ()",
+ "Maintainer": "Simon Couch ",
+ "Repository": "CRAN"
},
"broom.helpers": {
"Package": "broom.helpers",
- "Version": "1.17.0",
+ "Version": "1.19.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "broom",
+ "Title": "Helpers for Model Coefficients Tibbles",
+ "Authors@R": "c( person(\"Joseph\", \"Larmarange\", , \"joseph@larmarange.net\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0001-7097-700X\")), person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = \"aut\", comment = c(ORCID = \"0000-0003-0862-2018\")) )",
+ "Description": "Provides suite of functions to work with regression model 'broom::tidy()' tibbles. The suite includes functions to group regression model terms by variable, insert reference and header rows for categorical variables, add variable labels, and more.",
+ "License": "GPL (>= 3)",
+ "URL": "https://larmarange.github.io/broom.helpers/, https://github.com/larmarange/broom.helpers",
+ "BugReports": "https://github.com/larmarange/broom.helpers/issues",
+ "Depends": [
+ "R (>= 4.1)"
+ ],
+ "Imports": [
+ "broom (>= 0.8)",
"cards",
"cli",
- "dplyr",
+ "dplyr (>= 1.1.0)",
"labelled",
"lifecycle",
"purrr",
- "rlang",
+ "rlang (>= 1.0.1)",
"stats",
"stringr",
"tibble",
"tidyr"
],
- "Hash": "53142c51f78663c89ff79091874319e4"
+ "Suggests": [
+ "betareg",
+ "biglm",
+ "brms (>= 2.13.0)",
+ "broom.mixed",
+ "cmprsk",
+ "covr",
+ "datasets",
+ "effects",
+ "emmeans",
+ "fixest (>= 0.10.0)",
+ "forcats",
+ "gam",
+ "gee",
+ "geepack",
+ "ggplot2",
+ "ggeffects (>= 1.3.2)",
+ "ggstats (>= 0.2.1)",
+ "glmmTMB",
+ "glmtoolbox",
+ "glue",
+ "gt",
+ "gtsummary (>= 2.0.0)",
+ "knitr",
+ "lavaan",
+ "lfe",
+ "lme4 (>= 1.1.28)",
+ "logitr (>= 0.8.0)",
+ "marginaleffects (>= 0.21.0)",
+ "margins",
+ "MASS",
+ "mgcv",
+ "mice",
+ "mmrm (>= 0.3.6)",
+ "multgee",
+ "nnet",
+ "ordinal",
+ "parameters",
+ "parsnip",
+ "patchwork",
+ "plm",
+ "pscl",
+ "rmarkdown",
+ "rstanarm",
+ "scales",
+ "spelling",
+ "survey",
+ "survival",
+ "testthat (>= 3.0.0)",
+ "tidycmprsk",
+ "VGAM"
+ ],
+ "VignetteBuilder": "knitr",
+ "RdMacros": "lifecycle",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "LazyData": "true",
+ "RoxygenNote": "7.3.2",
+ "Config/testthat/edition": "3",
+ "NeedsCompilation": "no",
+ "Author": "Joseph Larmarange [aut, cre] (), Daniel D. Sjoberg [aut] ()",
+ "Maintainer": "Joseph Larmarange ",
+ "Repository": "CRAN"
+ },
+ "broom.mixed": {
+ "Package": "broom.mixed",
+ "Version": "0.2.9.6",
+ "Source": "Repository",
+ "Type": "Package",
+ "Title": "Tidying Methods for Mixed Models",
+ "Authors@R": "c( person(\"Ben\", \"Bolker\", email = \"bolker@mcmaster.ca\", role = c(\"aut\", \"cre\"), comment=c(ORCID=\"0000-0002-2127-0443\")), person(\"David\", \"Robinson\", email = \"admiral.david@gmail.com\", role = \"aut\"), person(\"Dieter\", \"Menne\", role = \"ctb\"), person(\"Jonah\", \"Gabry\", role = \"ctb\"), person(\"Paul\", \"Buerkner\", role = \"ctb\"), person(\"Christopher\", \"Hua\", role = \"ctb\"), person(\"William\", \"Petry\", role = \"ctb\", comment=c(ORCID=\"0000-0002-5230-5987\")), person(\"Joshua\", \"Wiley\", role = \"ctb\", comment=c(ORCID=\"0000-0002-0271-6702\")), person(\"Patrick\", \"Kennedy\", role = \"ctb\"), person(\"Eduard\", \"Szöcs\", role = \"ctb\", comment=c(ORCID = \"0000-0001-5376-1194\", sponsor = \"BASF SE\")), person(\"Indrajeet\", \"Patil\", role=\"ctb\"), person(\"Vincent\", \"Arel-Bundock\", email = \"vincent.arel-bundock@umontreal.ca\", role = \"ctb\", comment = c(ORCID = \"0000-0003-2042-7063\")), person(\"Bill\", \"Denney\", role = \"ctb\"), person(\"Cory\", \"Brunson\", role = \"ctb\"), person(\"Joe\", \"Wasserman\", role = \"ctb\", comment = c(ORCID = \"0000-0002-9705-1853\")), person(\"Alexey\", \"Stukalov\", role = \"ctb\"), person(\"Matthieu\", \"Bruneaux\", role = \"ctb\") )",
+ "Maintainer": "Ben Bolker ",
+ "Description": "Convert fitted objects from various R mixed-model packages into tidy data frames along the lines of the 'broom' package. The package provides three S3 generics for each model: tidy(), which summarizes a model's statistical findings such as coefficients of a regression; augment(), which adds columns to the original data such as predictions, residuals and cluster assignments; and glance(), which provides a one-row summary of model-level statistics.",
+ "Imports": [
+ "broom",
+ "coda",
+ "dplyr",
+ "forcats",
+ "methods",
+ "nlme",
+ "purrr",
+ "stringr",
+ "tibble",
+ "tidyr",
+ "furrr"
+ ],
+ "Suggests": [
+ "brms",
+ "dotwhisker",
+ "knitr",
+ "testthat",
+ "gamlss",
+ "gamlss.data",
+ "ggplot2",
+ "GLMMadaptive",
+ "glmmADMB",
+ "glmmTMB",
+ "lmerTest",
+ "lme4",
+ "Matrix",
+ "MCMCglmm",
+ "mediation",
+ "mgcv",
+ "ordinal",
+ "pander",
+ "pbkrtest",
+ "posterior",
+ "rstan",
+ "rstanarm",
+ "rstantools",
+ "R2jags",
+ "TMB",
+ "rmarkdown"
+ ],
+ "URL": "https://github.com/bbolker/broom.mixed",
+ "BugReports": "https://github.com/bbolker/broom.mixed/issues",
+ "License": "GPL-3",
+ "Encoding": "UTF-8",
+ "Additional_repositories": "http://bbolker.github.io/drat",
+ "VignetteBuilder": "knitr",
+ "RoxygenNote": "7.3.2",
+ "NeedsCompilation": "no",
+ "Author": "Ben Bolker [aut, cre] (), David Robinson [aut], Dieter Menne [ctb], Jonah Gabry [ctb], Paul Buerkner [ctb], Christopher Hua [ctb], William Petry [ctb] (), Joshua Wiley [ctb] (), Patrick Kennedy [ctb], Eduard Szöcs [ctb] (, BASF SE), Indrajeet Patil [ctb], Vincent Arel-Bundock [ctb] (), Bill Denney [ctb], Cory Brunson [ctb], Joe Wasserman [ctb] (), Alexey Stukalov [ctb], Matthieu Bruneaux [ctb]",
+ "Repository": "CRAN"
},
"bsicons": {
"Package": "bsicons",
"Version": "0.1.2",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Title": "Easily Work with 'Bootstrap' Icons",
+ "Authors@R": "c( person(\"Carson\", \"Sievert\", , \"carson@posit.co\", role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(\"Mark\", \"Otto\", role = \"cph\", comment = \"Bootstrap icons maintainer\") )",
+ "Description": "Easily use 'Bootstrap' icons inside 'Shiny' apps and 'R Markdown' documents. More generally, icons can be inserted in any 'htmltools' document through inline 'SVG'.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://github.com/rstudio/bsicons",
+ "BugReports": "https://github.com/rstudio/bsicons/issues",
+ "Depends": [
+ "R (>= 2.10)"
+ ],
+ "Imports": [
"cli",
"htmltools",
"rlang",
"utils"
],
- "Hash": "d8f892fbd94d0b9b1f6d688b05b8633c"
+ "Suggests": [
+ "bslib",
+ "processx",
+ "testthat",
+ "webshot2",
+ "withr"
+ ],
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.3",
+ "NeedsCompilation": "no",
+ "Author": "Carson Sievert [cre, aut] (), Posit Software, PBC [cph, fnd], Mark Otto [cph] (Bootstrap icons maintainer)",
+ "Maintainer": "Carson Sievert ",
+ "Repository": "CRAN"
},
"bslib": {
"Package": "bslib",
- "Version": "0.8.0",
+ "Version": "0.9.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Title": "Custom 'Bootstrap' 'Sass' Themes for 'shiny' and 'rmarkdown'",
+ "Authors@R": "c( person(\"Carson\", \"Sievert\", , \"carson@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"), person(\"Garrick\", \"Aden-Buie\", , \"garrick@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0002-7111-0077\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(, \"Bootstrap contributors\", role = \"ctb\", comment = \"Bootstrap library\"), person(, \"Twitter, Inc\", role = \"cph\", comment = \"Bootstrap library\"), person(\"Javi\", \"Aguilar\", role = c(\"ctb\", \"cph\"), comment = \"Bootstrap colorpicker library\"), person(\"Thomas\", \"Park\", role = c(\"ctb\", \"cph\"), comment = \"Bootswatch library\"), person(, \"PayPal\", role = c(\"ctb\", \"cph\"), comment = \"Bootstrap accessibility plugin\") )",
+ "Description": "Simplifies custom 'CSS' styling of both 'shiny' and 'rmarkdown' via 'Bootstrap' 'Sass'. Supports 'Bootstrap' 3, 4 and 5 as well as their various 'Bootswatch' themes. An interactive widget is also provided for previewing themes in real time.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://rstudio.github.io/bslib/, https://github.com/rstudio/bslib",
+ "BugReports": "https://github.com/rstudio/bslib/issues",
+ "Depends": [
+ "R (>= 2.10)"
+ ],
+ "Imports": [
"base64enc",
"cachem",
- "fastmap",
+ "fastmap (>= 1.1.1)",
"grDevices",
- "htmltools",
- "jquerylib",
+ "htmltools (>= 0.5.8)",
+ "jquerylib (>= 0.1.3)",
"jsonlite",
"lifecycle",
- "memoise",
+ "memoise (>= 2.0.1)",
"mime",
"rlang",
- "sass"
+ "sass (>= 0.4.9)"
],
- "Hash": "b299c6741ca9746fb227debcb0f9fb6c"
+ "Suggests": [
+ "bsicons",
+ "curl",
+ "fontawesome",
+ "future",
+ "ggplot2",
+ "knitr",
+ "magrittr",
+ "rappdirs",
+ "rmarkdown (>= 2.7)",
+ "shiny (> 1.8.1)",
+ "testthat",
+ "thematic",
+ "tools",
+ "utils",
+ "withr",
+ "yaml"
+ ],
+ "Config/Needs/deploy": "BH, chiflights22, colourpicker, commonmark, cpp11, cpsievert/chiflights22, cpsievert/histoslider, dplyr, DT, ggplot2, ggridges, gt, hexbin, histoslider, htmlwidgets, lattice, leaflet, lubridate, markdown, modelr, plotly, reactable, reshape2, rprojroot, rsconnect, rstudio/shiny, scales, styler, tibble",
+ "Config/Needs/routine": "chromote, desc, renv",
+ "Config/Needs/website": "brio, crosstalk, dplyr, DT, ggplot2, glue, htmlwidgets, leaflet, lorem, palmerpenguins, plotly, purrr, rprojroot, rstudio/htmltools, scales, stringr, tidyr, webshot2",
+ "Config/testthat/edition": "3",
+ "Config/testthat/parallel": "true",
+ "Config/testthat/start-first": "zzzz-bs-sass, fonts, zzz-precompile, theme-*, rmd-*",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.2",
+ "Collate": "'accordion.R' 'breakpoints.R' 'bs-current-theme.R' 'bs-dependencies.R' 'bs-global.R' 'bs-remove.R' 'bs-theme-layers.R' 'bs-theme-preset-bootswatch.R' 'bs-theme-preset-brand.R' 'bs-theme-preset-builtin.R' 'bs-theme-preset.R' 'utils.R' 'bs-theme-preview.R' 'bs-theme-update.R' 'bs-theme.R' 'bslib-package.R' 'buttons.R' 'card.R' 'deprecated.R' 'files.R' 'fill.R' 'imports.R' 'input-dark-mode.R' 'input-switch.R' 'layout.R' 'nav-items.R' 'nav-update.R' 'navbar_options.R' 'navs-legacy.R' 'navs.R' 'onLoad.R' 'page.R' 'popover.R' 'precompiled.R' 'print.R' 'shiny-devmode.R' 'sidebar.R' 'staticimports.R' 'tooltip.R' 'utils-deps.R' 'utils-shiny.R' 'utils-tags.R' 'value-box.R' 'version-default.R' 'versions.R'",
+ "NeedsCompilation": "no",
+ "Author": "Carson Sievert [aut, cre] (), Joe Cheng [aut], Garrick Aden-Buie [aut] (), Posit Software, PBC [cph, fnd], Bootstrap contributors [ctb] (Bootstrap library), Twitter, Inc [cph] (Bootstrap library), Javi Aguilar [ctb, cph] (Bootstrap colorpicker library), Thomas Park [ctb, cph] (Bootswatch library), PayPal [ctb, cph] (Bootstrap accessibility plugin)",
+ "Maintainer": "Carson Sievert ",
+ "Repository": "CRAN"
},
"caTools": {
"Package": "caTools",
"Version": "1.18.3",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Type": "Package",
+ "Title": "Tools: Moving Window Statistics, GIF, Base64, ROC AUC, etc",
+ "Date": "2024-09-04",
+ "Authors@R": "c(person(given = \"Jarek\", family = \"Tuszynski\", role = \"aut\", email = \"jaroslaw.w.tuszynski@saic.com\"), person(given = \"Michael\", family = \"Dietze\", role = \"cre\", email = \"michael.dietze@uni-goettingen.de\"))",
+ "Maintainer": "Michael Dietze ",
+ "Depends": [
+ "R (>= 3.6.0)"
+ ],
+ "Imports": [
"bitops"
],
- "Hash": "ab79c733080d83b4ad8a2cc33c1ef393"
+ "Suggests": [
+ "MASS",
+ "rpart"
+ ],
+ "Description": "Contains several basic utility functions including: moving (rolling, running) window statistic functions, read/write for GIF and ENVI binary files, fast calculation of AUC, LogitBoost classifier, base64 encoder/decoder, round-off-error-free sum and cumsum, etc.",
+ "License": "GPL-3",
+ "NeedsCompilation": "yes",
+ "Repository": "CRAN",
+ "Author": "Jarek Tuszynski [aut], Michael Dietze [cre]"
},
"cachem": {
"Package": "cachem",
"Version": "1.1.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "fastmap",
- "rlang"
+ "Title": "Cache R Objects with Automatic Pruning",
+ "Description": "Key-value stores with automatic pruning. Caches can limit either their total size or the age of the oldest object (or both), automatically pruning objects to maintain the constraints.",
+ "Authors@R": "c( person(\"Winston\", \"Chang\", , \"winston@posit.co\", c(\"aut\", \"cre\")), person(family = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")))",
+ "License": "MIT + file LICENSE",
+ "Encoding": "UTF-8",
+ "ByteCompile": "true",
+ "URL": "https://cachem.r-lib.org/, https://github.com/r-lib/cachem",
+ "Imports": [
+ "rlang",
+ "fastmap (>= 1.2.0)"
],
- "Hash": "cd9a672193789068eb5a2aad65a0dedf"
+ "Suggests": [
+ "testthat"
+ ],
+ "RoxygenNote": "7.2.3",
+ "Config/Needs/routine": "lobstr",
+ "Config/Needs/website": "pkgdown",
+ "NeedsCompilation": "yes",
+ "Author": "Winston Chang [aut, cre], Posit Software, PBC [cph, fnd]",
+ "Maintainer": "Winston Chang ",
+ "Repository": "CRAN"
},
"callr": {
"Package": "callr",
"Version": "3.7.6",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Title": "Call R from R",
+ "Authors@R": "c( person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\", \"cph\"), comment = c(ORCID = \"0000-0001-7098-9676\")), person(\"Winston\", \"Chang\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(\"Ascent Digital Services\", role = c(\"cph\", \"fnd\")) )",
+ "Description": "It is sometimes useful to perform a computation in a separate R process, without affecting the current R process at all. This packages does exactly that.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://callr.r-lib.org, https://github.com/r-lib/callr",
+ "BugReports": "https://github.com/r-lib/callr/issues",
+ "Depends": [
+ "R (>= 3.4)"
+ ],
+ "Imports": [
+ "processx (>= 3.6.1)",
"R6",
- "processx",
"utils"
],
- "Hash": "d7e13f49c19103ece9e58ad2d83a7354"
+ "Suggests": [
+ "asciicast (>= 2.3.1)",
+ "cli (>= 1.1.0)",
+ "mockery",
+ "ps",
+ "rprojroot",
+ "spelling",
+ "testthat (>= 3.2.0)",
+ "withr (>= 2.3.0)"
+ ],
+ "Config/Needs/website": "r-lib/asciicast, glue, htmlwidgets, igraph, tibble, tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.3.1.9000",
+ "NeedsCompilation": "no",
+ "Author": "Gábor Csárdi [aut, cre, cph] (), Winston Chang [aut], Posit Software, PBC [cph, fnd], Ascent Digital Services [cph, fnd]",
+ "Maintainer": "Gábor Csárdi ",
+ "Repository": "CRAN"
},
"car": {
"Package": "car",
"Version": "3.1-3",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
+ "Date": "2024-09-23",
+ "Title": "Companion to Applied Regression",
+ "Authors@R": "c(person(\"John\", \"Fox\", role = c(\"aut\", \"cre\"), email = \"jfox@mcmaster.ca\"), person(\"Sanford\", \"Weisberg\", role = \"aut\", email = \"sandy@umn.edu\"), person(\"Brad\", \"Price\", role = \"aut\", email = \"brad.price@mail.wvu.edu\"), person(\"Daniel\", \"Adler\", role=\"ctb\"), person(\"Douglas\", \"Bates\", role = \"ctb\"), person(\"Gabriel\", \"Baud-Bovy\", role = \"ctb\"), person(\"Ben\", \"Bolker\", role=\"ctb\"), person(\"Steve\", \"Ellison\", role=\"ctb\"), person(\"David\", \"Firth\", role = \"ctb\"), person(\"Michael\", \"Friendly\", role = \"ctb\"), person(\"Gregor\", \"Gorjanc\", role = \"ctb\"), person(\"Spencer\", \"Graves\", role = \"ctb\"), person(\"Richard\", \"Heiberger\", role = \"ctb\"), person(\"Pavel\", \"Krivitsky\", role = \"ctb\"), person(\"Rafael\", \"Laboissiere\", role = \"ctb\"), person(\"Martin\", \"Maechler\", role=\"ctb\"), person(\"Georges\", \"Monette\", role = \"ctb\"), person(\"Duncan\", \"Murdoch\", role=\"ctb\"), person(\"Henric\", \"Nilsson\", role = \"ctb\"), person(\"Derek\", \"Ogle\", role = \"ctb\"), person(\"Brian\", \"Ripley\", role = \"ctb\"), person(\"Tom\", \"Short\", role=\"ctb\"), person(\"William\", \"Venables\", role = \"ctb\"), person(\"Steve\", \"Walker\", role=\"ctb\"), person(\"David\", \"Winsemius\", role=\"ctb\"), person(\"Achim\", \"Zeileis\", role = \"ctb\"), person(\"R-Core\", role=\"ctb\"))",
+ "Depends": [
+ "R (>= 3.5.0)",
+ "carData (>= 3.0-0)"
+ ],
+ "Imports": [
+ "abind",
"Formula",
"MASS",
- "R",
- "abind",
- "carData",
- "grDevices",
- "graphics",
- "lme4",
"mgcv",
- "nlme",
"nnet",
- "pbkrtest",
+ "pbkrtest (>= 0.4-4)",
"quantreg",
- "scales",
+ "grDevices",
+ "utils",
"stats",
- "utils"
+ "graphics",
+ "lme4 (>= 1.1-27.1)",
+ "nlme",
+ "scales"
],
- "Hash": "82067bf302d1440b730437693a86406a"
+ "Suggests": [
+ "alr4",
+ "boot",
+ "coxme",
+ "effects",
+ "knitr",
+ "leaps",
+ "lmtest",
+ "Matrix",
+ "MatrixModels",
+ "ordinal",
+ "plotrix",
+ "mvtnorm",
+ "rgl (>= 0.111.3)",
+ "rio",
+ "sandwich",
+ "SparseM",
+ "survival",
+ "survey"
+ ],
+ "ByteCompile": "yes",
+ "LazyLoad": "yes",
+ "Description": "Functions to Accompany J. Fox and S. Weisberg, An R Companion to Applied Regression, Third Edition, Sage, 2019.",
+ "License": "GPL (>= 2)",
+ "URL": "https://r-forge.r-project.org/projects/car/, https://CRAN.R-project.org/package=car, https://www.john-fox.ca/Companion/index.html",
+ "VignetteBuilder": "knitr",
+ "NeedsCompilation": "no",
+ "Author": "John Fox [aut, cre], Sanford Weisberg [aut], Brad Price [aut], Daniel Adler [ctb], Douglas Bates [ctb], Gabriel Baud-Bovy [ctb], Ben Bolker [ctb], Steve Ellison [ctb], David Firth [ctb], Michael Friendly [ctb], Gregor Gorjanc [ctb], Spencer Graves [ctb], Richard Heiberger [ctb], Pavel Krivitsky [ctb], Rafael Laboissiere [ctb], Martin Maechler [ctb], Georges Monette [ctb], Duncan Murdoch [ctb], Henric Nilsson [ctb], Derek Ogle [ctb], Brian Ripley [ctb], Tom Short [ctb], William Venables [ctb], Steve Walker [ctb], David Winsemius [ctb], Achim Zeileis [ctb], R-Core [ctb]",
+ "Maintainer": "John Fox ",
+ "Repository": "CRAN"
},
"carData": {
"Package": "carData",
"Version": "3.0-5",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R"
+ "Date": "2022-01-05",
+ "Title": "Companion to Applied Regression Data Sets",
+ "Authors@R": "c(person(\"John\", \"Fox\", role = c(\"aut\", \"cre\"), email = \"jfox@mcmaster.ca\"), person(\"Sanford\", \"Weisberg\", role = \"aut\", email = \"sandy@umn.edu\"), person(\"Brad\", \"Price\", role = \"aut\", email = \"brad.price@mail.wvu.edu\"))",
+ "Depends": [
+ "R (>= 3.5.0)"
],
- "Hash": "ac6cdb8552c61bd36b0e54d07cf2aab7"
+ "Suggests": [
+ "car (>= 3.0-0)"
+ ],
+ "LazyLoad": "yes",
+ "LazyData": "yes",
+ "Description": "Datasets to Accompany J. Fox and S. Weisberg, An R Companion to Applied Regression, Third Edition, Sage (2019).",
+ "License": "GPL (>= 2)",
+ "URL": "https://r-forge.r-project.org/projects/car/, https://CRAN.R-project.org/package=carData, https://socialsciences.mcmaster.ca/jfox/Books/Companion/index.html",
+ "Author": "John Fox [aut, cre], Sanford Weisberg [aut], Brad Price [aut]",
+ "Maintainer": "John Fox ",
+ "Repository": "CRAN",
+ "Repository/R-Forge/Project": "car",
+ "Repository/R-Forge/Revision": "694",
+ "Repository/R-Forge/DateTimeStamp": "2022-01-05 19:40:37",
+ "NeedsCompilation": "no"
},
"cards": {
"Package": "cards",
"Version": "0.4.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "cli",
- "dplyr",
- "glue",
- "rlang",
- "tidyr",
- "tidyselect"
+ "Title": "Analysis Results Data",
+ "Authors@R": "c( person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-0862-2018\")), person(\"Becca\", \"Krouse\", , \"becca.z.krouse@gsk.com\", role = \"aut\"), person(\"Emily\", \"de la Rua\", , \"emily.de_la_rua@contractors.roche.com\", role = \"aut\"), person(\"F. Hoffmann-La Roche AG\", role = c(\"cph\", \"fnd\")), person(\"GlaxoSmithKline Research & Development Limited\", role = \"cph\") )",
+ "Description": "Construct CDISC (Clinical Data Interchange Standards Consortium) compliant Analysis Results Data objects. These objects are used and re-used to construct summary tables, visualizations, and written reports. The package also exports utilities for working with these objects and creating new Analysis Results Data objects.",
+ "License": "Apache License 2.0",
+ "URL": "https://github.com/insightsengineering/cards, https://insightsengineering.github.io/cards/",
+ "BugReports": "https://github.com/insightsengineering/cards/issues",
+ "Depends": [
+ "R (>= 4.1)"
],
- "Hash": "2cd0d1966092de416f9b7fa1e88b6132"
+ "Imports": [
+ "cli (>= 3.6.1)",
+ "dplyr (>= 1.1.2)",
+ "glue (>= 1.6.2)",
+ "rlang (>= 1.1.1)",
+ "tidyr (>= 1.3.0)",
+ "tidyselect (>= 1.2.0)"
+ ],
+ "Suggests": [
+ "spelling (>= 2.2.0)",
+ "testthat (>= 3.2.0)",
+ "withr (>= 3.0.0)"
+ ],
+ "Config/Needs/check": "hms",
+ "Config/Needs/website": "rmarkdown, jsonlite, yaml, gtsummary, tfrmt, insightsengineering/nesttemplate",
+ "Config/testthat/edition": "3",
+ "Config/testthat/parallel": "true",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "LazyData": "true",
+ "RoxygenNote": "7.3.2",
+ "NeedsCompilation": "no",
+ "Author": "Daniel D. Sjoberg [aut, cre] (), Becca Krouse [aut], Emily de la Rua [aut], F. Hoffmann-La Roche AG [cph, fnd], GlaxoSmithKline Research & Development Limited [cph]",
+ "Maintainer": "Daniel D. Sjoberg ",
+ "Repository": "CRAN"
},
"cardx": {
"Package": "cardx",
"Version": "0.2.2",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "cards",
- "cli",
- "dplyr",
- "glue",
- "lifecycle",
- "rlang",
- "tidyr"
+ "Title": "Extra Analysis Results Data Utilities",
+ "Authors@R": "c( person(\"Daniel\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Abinaya\", \"Yogasekaram\", , \"abinaya.yogasekaram@contractors.roche.com\", role = \"aut\"), person(\"Emily\", \"de la Rua\", , \"emily.de_la_rua@contractors.roche.com\", role = \"aut\"), person(\"F. Hoffmann-La Roche AG\", role = c(\"cph\", \"fnd\")) )",
+ "Description": "Create extra Analysis Results Data (ARD) summary objects. The package supplements the simple ARD functions from the 'cards' package, exporting functions to put statistical results in the ARD format. These objects are used and re-used to construct summary tables, visualizations, and written reports.",
+ "License": "Apache License 2.0",
+ "URL": "https://insightsengineering.github.io/cardx/, https://github.com/insightsengineering/cardx/",
+ "BugReports": "https://github.com/insightsengineering/cardx/issues",
+ "Depends": [
+ "R (>= 4.1)"
],
- "Hash": "21f5ce5381d529b08783dca434af3003"
+ "Imports": [
+ "cards (>= 0.4.0)",
+ "cli (>= 3.6.1)",
+ "dplyr (>= 1.1.2)",
+ "glue (>= 1.6.2)",
+ "lifecycle (>= 1.0.3)",
+ "rlang (>= 1.1.1)",
+ "tidyr (>= 1.3.0)"
+ ],
+ "Suggests": [
+ "aod (>= 1.3.3)",
+ "broom (>= 1.0.5)",
+ "broom.helpers (>= 1.17.0)",
+ "broom.mixed (>= 0.2.9)",
+ "car (>= 3.1-2)",
+ "effectsize (>= 0.8.8)",
+ "emmeans (>= 1.7.3)",
+ "geepack (>= 1.3.2)",
+ "ggsurvfit (>= 1.1.0)",
+ "lme4 (>= 1.1-35.3)",
+ "parameters (>= 0.20.2)",
+ "smd (>= 0.6.6)",
+ "spelling (>= 2.3.0)",
+ "survey (>= 4.2)",
+ "survival (>= 3.6-4)",
+ "testthat (>= 3.2.0)",
+ "withr (>= 2.5.0)"
+ ],
+ "Config/Needs/website": "insightsengineering/nesttemplate",
+ "Config/testthat/edition": "3",
+ "Config/testthat/parallel": "true",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.3.2",
+ "NeedsCompilation": "no",
+ "Author": "Daniel Sjoberg [aut, cre], Abinaya Yogasekaram [aut], Emily de la Rua [aut], F. Hoffmann-La Roche AG [cph, fnd]",
+ "Maintainer": "Daniel Sjoberg ",
+ "Repository": "CRAN"
},
"cellranger": {
"Package": "cellranger",
"Version": "1.1.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Title": "Translate Spreadsheet Cell Ranges to Rows and Columns",
+ "Authors@R": "c( person(\"Jennifer\", \"Bryan\", , \"jenny@stat.ubc.ca\", c(\"cre\", \"aut\")), person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", \"ctb\") )",
+ "Description": "Helper functions to work with spreadsheets and the \"A1:D10\" style of cell range specification.",
+ "Depends": [
+ "R (>= 3.0.0)"
+ ],
+ "License": "MIT + file LICENSE",
+ "LazyData": "true",
+ "URL": "https://github.com/rsheets/cellranger",
+ "BugReports": "https://github.com/rsheets/cellranger/issues",
+ "Suggests": [
+ "covr",
+ "testthat (>= 1.0.0)",
+ "knitr",
+ "rmarkdown"
+ ],
+ "RoxygenNote": "5.0.1.9000",
+ "VignetteBuilder": "knitr",
+ "Imports": [
"rematch",
"tibble"
],
- "Hash": "f61dbaec772ccd2e17705c1e872e9e7c"
+ "NeedsCompilation": "no",
+ "Author": "Jennifer Bryan [cre, aut], Hadley Wickham [ctb]",
+ "Maintainer": "Jennifer Bryan ",
+ "Repository": "CRAN"
},
"checkmate": {
"Package": "checkmate",
"Version": "2.3.2",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "backports",
+ "Type": "Package",
+ "Title": "Fast and Versatile Argument Checks",
+ "Description": "Tests and assertions to perform frequent argument checks. A substantial part of the package was written in C to minimize any worries about execution time overhead.",
+ "Authors@R": "c( person(\"Michel\", \"Lang\", NULL, \"michellang@gmail.com\", role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0001-9754-0393\")), person(\"Bernd\", \"Bischl\", NULL, \"bernd_bischl@gmx.net\", role = \"ctb\"), person(\"Dénes\", \"Tóth\", NULL, \"toth.denes@kogentum.hu\", role = \"ctb\", comment = c(ORCID = \"0000-0003-4262-3217\")) )",
+ "URL": "https://mllg.github.io/checkmate/, https://github.com/mllg/checkmate",
+ "URLNote": "https://github.com/mllg/checkmate",
+ "BugReports": "https://github.com/mllg/checkmate/issues",
+ "NeedsCompilation": "yes",
+ "ByteCompile": "yes",
+ "Encoding": "UTF-8",
+ "Depends": [
+ "R (>= 3.0.0)"
+ ],
+ "Imports": [
+ "backports (>= 1.1.0)",
"utils"
],
- "Hash": "0e14e01ce07e7c88fd25de6d4260d26b"
+ "Suggests": [
+ "R6",
+ "fastmatch",
+ "data.table (>= 1.9.8)",
+ "devtools",
+ "ggplot2",
+ "knitr",
+ "magrittr",
+ "microbenchmark",
+ "rmarkdown",
+ "testthat (>= 3.0.4)",
+ "tinytest (>= 1.1.0)",
+ "tibble"
+ ],
+ "License": "BSD_3_clause + file LICENSE",
+ "VignetteBuilder": "knitr",
+ "RoxygenNote": "7.3.2",
+ "Collate": "'AssertCollection.R' 'allMissing.R' 'anyInfinite.R' 'anyMissing.R' 'anyNaN.R' 'asInteger.R' 'assert.R' 'helper.R' 'makeExpectation.R' 'makeTest.R' 'makeAssertion.R' 'checkAccess.R' 'checkArray.R' 'checkAtomic.R' 'checkAtomicVector.R' 'checkCharacter.R' 'checkChoice.R' 'checkClass.R' 'checkComplex.R' 'checkCount.R' 'checkDataFrame.R' 'checkDataTable.R' 'checkDate.R' 'checkDirectoryExists.R' 'checkDisjunct.R' 'checkDouble.R' 'checkEnvironment.R' 'checkFALSE.R' 'checkFactor.R' 'checkFileExists.R' 'checkFlag.R' 'checkFormula.R' 'checkFunction.R' 'checkInt.R' 'checkInteger.R' 'checkIntegerish.R' 'checkList.R' 'checkLogical.R' 'checkMatrix.R' 'checkMultiClass.R' 'checkNamed.R' 'checkNames.R' 'checkNull.R' 'checkNumber.R' 'checkNumeric.R' 'checkOS.R' 'checkPOSIXct.R' 'checkPathForOutput.R' 'checkPermutation.R' 'checkR6.R' 'checkRaw.R' 'checkScalar.R' 'checkScalarNA.R' 'checkSetEqual.R' 'checkString.R' 'checkSubset.R' 'checkTRUE.R' 'checkTibble.R' 'checkVector.R' 'coalesce.R' 'isIntegerish.R' 'matchArg.R' 'qassert.R' 'qassertr.R' 'vname.R' 'wfwl.R' 'zzz.R'",
+ "Author": "Michel Lang [cre, aut] (), Bernd Bischl [ctb], Dénes Tóth [ctb] ()",
+ "Maintainer": "Michel Lang ",
+ "Repository": "CRAN"
},
"class": {
"Package": "class",
- "Version": "7.3-22",
+ "Version": "7.3-23",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "MASS",
- "R",
+ "Priority": "recommended",
+ "Date": "2025-01-01",
+ "Depends": [
+ "R (>= 3.0.0)",
"stats",
"utils"
],
- "Hash": "f91f6b29f38b8c280f2b9477787d4bb2"
+ "Imports": [
+ "MASS"
+ ],
+ "Authors@R": "c(person(\"Brian\", \"Ripley\", role = c(\"aut\", \"cre\", \"cph\"), email = \"Brian.Ripley@R-project.org\"), person(\"William\", \"Venables\", role = \"cph\"))",
+ "Description": "Various functions for classification, including k-nearest neighbour, Learning Vector Quantization and Self-Organizing Maps.",
+ "Title": "Functions for Classification",
+ "ByteCompile": "yes",
+ "License": "GPL-2 | GPL-3",
+ "URL": "http://www.stats.ox.ac.uk/pub/MASS4/",
+ "NeedsCompilation": "yes",
+ "Author": "Brian Ripley [aut, cre, cph], William Venables [cph]",
+ "Maintainer": "Brian Ripley ",
+ "Repository": "CRAN"
},
"classInt": {
"Package": "classInt",
- "Version": "0.4-10",
+ "Version": "0.4-11",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "KernSmooth",
- "R",
- "class",
- "e1071",
- "grDevices",
- "graphics",
- "stats"
+ "Date": "2025-01-06",
+ "Title": "Choose Univariate Class Intervals",
+ "Authors@R": "c( person(\"Roger\", \"Bivand\", role=c(\"aut\", \"cre\"), email=\"Roger.Bivand@nhh.no\", comment=c(ORCID=\"0000-0003-2392-6140\")), person(\"Bill\", \"Denney\", role=\"ctb\", comment=c(ORCID=\"0000-0002-5759-428X\")), person(\"Richard\", \"Dunlap\", role=\"ctb\"), person(\"Diego\", \"Hernangómez\", role=\"ctb\", comment=c(ORCID=\"0000-0001-8457-4658\")), person(\"Hisaji\", \"Ono\", role=\"ctb\"), person(\"Josiah\", \"Parry\", role = \"ctb\", comment = c(ORCID = \"0000-0001-9910-865X\")), person(\"Matthieu\", \"Stigler\", role=\"ctb\", comment =c(ORCID=\"0000-0002-6802-4290\")))",
+ "Depends": [
+ "R (>= 2.2)"
],
- "Hash": "f5a40793b1ae463a7ffb3902a95bf864"
+ "Imports": [
+ "grDevices",
+ "stats",
+ "graphics",
+ "e1071",
+ "class",
+ "KernSmooth"
+ ],
+ "Suggests": [
+ "spData (>= 0.2.6.2)",
+ "units",
+ "knitr",
+ "rmarkdown",
+ "tinytest"
+ ],
+ "NeedsCompilation": "yes",
+ "Description": "Selected commonly used methods for choosing univariate class intervals for mapping or other graphics purposes.",
+ "License": "GPL (>= 2)",
+ "URL": "https://r-spatial.github.io/classInt/, https://github.com/r-spatial/classInt/",
+ "BugReports": "https://github.com/r-spatial/classInt/issues/",
+ "RoxygenNote": "6.1.1",
+ "Encoding": "UTF-8",
+ "VignetteBuilder": "knitr",
+ "Author": "Roger Bivand [aut, cre] (), Bill Denney [ctb] (), Richard Dunlap [ctb], Diego Hernangómez [ctb] (), Hisaji Ono [ctb], Josiah Parry [ctb] (), Matthieu Stigler [ctb] ()",
+ "Maintainer": "Roger Bivand ",
+ "Repository": "CRAN"
},
"cli": {
"Package": "cli",
"Version": "3.6.3",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Title": "Helpers for Developing Command Line Interfaces",
+ "Authors@R": "c( person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Hadley\", \"Wickham\", role = \"ctb\"), person(\"Kirill\", \"Müller\", role = \"ctb\"), person(\"Salim\", \"Brüggemann\", , \"salim-b@pm.me\", role = \"ctb\", comment = c(ORCID = \"0000-0002-5329-5987\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )",
+ "Description": "A suite of tools to build attractive command line interfaces ('CLIs'), from semantic elements: headings, lists, alerts, paragraphs, etc. Supports custom themes via a 'CSS'-like language. It also contains a number of lower level 'CLI' elements: rules, boxes, trees, and 'Unicode' symbols with 'ASCII' alternatives. It support ANSI colors and text styles as well.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://cli.r-lib.org, https://github.com/r-lib/cli",
+ "BugReports": "https://github.com/r-lib/cli/issues",
+ "Depends": [
+ "R (>= 3.4)"
+ ],
+ "Imports": [
"utils"
],
- "Hash": "b21916dd77a27642b447374a5d30ecf3"
+ "Suggests": [
+ "callr",
+ "covr",
+ "crayon",
+ "digest",
+ "glue (>= 1.6.0)",
+ "grDevices",
+ "htmltools",
+ "htmlwidgets",
+ "knitr",
+ "methods",
+ "mockery",
+ "processx",
+ "ps (>= 1.3.4.9000)",
+ "rlang (>= 1.0.2.9003)",
+ "rmarkdown",
+ "rprojroot",
+ "rstudioapi",
+ "testthat",
+ "tibble",
+ "whoami",
+ "withr"
+ ],
+ "Config/Needs/website": "r-lib/asciicast, bench, brio, cpp11, decor, desc, fansi, prettyunits, sessioninfo, tidyverse/tidytemplate, usethis, vctrs",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.3",
+ "NeedsCompilation": "yes",
+ "Author": "Gábor Csárdi [aut, cre], Hadley Wickham [ctb], Kirill Müller [ctb], Salim Brüggemann [ctb] (), Posit Software, PBC [cph, fnd]",
+ "Maintainer": "Gábor Csárdi ",
+ "Repository": "CRAN"
},
"clipr": {
"Package": "clipr",
"Version": "0.8.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
+ "Type": "Package",
+ "Title": "Read and Write from the System Clipboard",
+ "Authors@R": "c( person(\"Matthew\", \"Lincoln\", , \"matthew.d.lincoln@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-4387-3384\")), person(\"Louis\", \"Maddox\", role = \"ctb\"), person(\"Steve\", \"Simpson\", role = \"ctb\"), person(\"Jennifer\", \"Bryan\", role = \"ctb\") )",
+ "Description": "Simple utility functions to read from and write to the Windows, OS X, and X11 clipboards.",
+ "License": "GPL-3",
+ "URL": "https://github.com/mdlincoln/clipr, http://matthewlincoln.net/clipr/",
+ "BugReports": "https://github.com/mdlincoln/clipr/issues",
+ "Imports": [
"utils"
],
- "Hash": "3f038e5ac7f41d4ac41ce658c85e3042"
+ "Suggests": [
+ "covr",
+ "knitr",
+ "rmarkdown",
+ "rstudioapi (>= 0.5)",
+ "testthat (>= 2.0.0)"
+ ],
+ "VignetteBuilder": "knitr",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.1.2",
+ "SystemRequirements": "xclip (https://github.com/astrand/xclip) or xsel (http://www.vergenet.net/~conrad/software/xsel/) for accessing the X11 clipboard, or wl-clipboard (https://github.com/bugaevc/wl-clipboard) for systems using Wayland.",
+ "NeedsCompilation": "no",
+ "Author": "Matthew Lincoln [aut, cre] (), Louis Maddox [ctb], Steve Simpson [ctb], Jennifer Bryan [ctb]",
+ "Maintainer": "Matthew Lincoln ",
+ "Repository": "CRAN"
+ },
+ "cluster": {
+ "Package": "cluster",
+ "Version": "2.1.8",
+ "Source": "Repository",
+ "VersionNote": "Last CRAN: 2.1.7 on 2024-12-06; 2.1.6 on 2023-11-30; 2.1.5 on 2023-11-27",
+ "Date": "2024-12-10",
+ "Priority": "recommended",
+ "Title": "\"Finding Groups in Data\": Cluster Analysis Extended Rousseeuw et al.",
+ "Description": "Methods for Cluster analysis. Much extended the original from Peter Rousseeuw, Anja Struyf and Mia Hubert, based on Kaufman and Rousseeuw (1990) \"Finding Groups in Data\".",
+ "Maintainer": "Martin Maechler ",
+ "Authors@R": "c(person(\"Martin\",\"Maechler\", role = c(\"aut\",\"cre\"), email=\"maechler@stat.math.ethz.ch\", comment = c(ORCID = \"0000-0002-8685-9910\")) ,person(\"Peter\", \"Rousseeuw\", role=\"aut\", email=\"peter.rousseeuw@kuleuven.be\", comment = c(\"Fortran original\", ORCID = \"0000-0002-3807-5353\")) ,person(\"Anja\", \"Struyf\", role=\"aut\", comment= \"S original\") ,person(\"Mia\", \"Hubert\", role=\"aut\", email= \"Mia.Hubert@uia.ua.ac.be\", comment = c(\"S original\", ORCID = \"0000-0001-6398-4850\")) ,person(\"Kurt\", \"Hornik\", role=c(\"trl\", \"ctb\"), email=\"Kurt.Hornik@R-project.org\", comment=c(\"port to R; maintenance(1999-2000)\", ORCID=\"0000-0003-4198-9911\")) ,person(\"Matthias\", \"Studer\", role=\"ctb\") ,person(\"Pierre\", \"Roudier\", role=\"ctb\") ,person(\"Juan\", \"Gonzalez\", role=\"ctb\") ,person(\"Kamil\", \"Kozlowski\", role=\"ctb\") ,person(\"Erich\", \"Schubert\", role=\"ctb\", comment = c(\"fastpam options for pam()\", ORCID = \"0000-0001-9143-4880\")) ,person(\"Keefe\", \"Murphy\", role=\"ctb\", comment = \"volume.ellipsoid({d >= 3})\") #not yet ,person(\"Fischer-Rasmussen\", \"Kasper\", role = \"ctb\", comment = \"Gower distance for CLARA\") )",
+ "Depends": [
+ "R (>= 3.5.0)"
+ ],
+ "Imports": [
+ "graphics",
+ "grDevices",
+ "stats",
+ "utils"
+ ],
+ "Suggests": [
+ "MASS",
+ "Matrix"
+ ],
+ "SuggestsNote": "MASS: two examples using cov.rob() and mvrnorm(); Matrix tools for testing",
+ "Enhances": [
+ "mvoutlier",
+ "fpc",
+ "ellipse",
+ "sfsmisc"
+ ],
+ "EnhancesNote": "xref-ed in man/*.Rd",
+ "LazyLoad": "yes",
+ "LazyData": "yes",
+ "ByteCompile": "yes",
+ "BuildResaveData": "no",
+ "License": "GPL (>= 2)",
+ "URL": "https://svn.r-project.org/R-packages/trunk/cluster/",
+ "NeedsCompilation": "yes",
+ "Author": "Martin Maechler [aut, cre] (), Peter Rousseeuw [aut] (Fortran original, ), Anja Struyf [aut] (S original), Mia Hubert [aut] (S original, ), Kurt Hornik [trl, ctb] (port to R; maintenance(1999-2000), ), Matthias Studer [ctb], Pierre Roudier [ctb], Juan Gonzalez [ctb], Kamil Kozlowski [ctb], Erich Schubert [ctb] (fastpam options for pam(), ), Keefe Murphy [ctb] (volume.ellipsoid({d >= 3}))",
+ "Repository": "CRAN"
+ },
+ "coda": {
+ "Package": "coda",
+ "Version": "0.19-4.1",
+ "Source": "Repository",
+ "Date": "2020-09-30",
+ "Title": "Output Analysis and Diagnostics for MCMC",
+ "Authors@R": "c(person(\"Martyn\", \"Plummer\", role=c(\"aut\",\"cre\",\"trl\"), email=\"martyn.plummer@gmail.com\"), person(\"Nicky\", \"Best\", role=\"aut\"), person(\"Kate\", \"Cowles\", role=\"aut\"), person(\"Karen\", \"Vines\", role=\"aut\"), person(\"Deepayan\", \"Sarkar\", role=\"aut\"), person(\"Douglas\", \"Bates\", role=\"aut\"), person(\"Russell\", \"Almond\", role=\"aut\"), person(\"Arni\", \"Magnusson\", role=\"aut\"))",
+ "Depends": [
+ "R (>= 2.14.0)"
+ ],
+ "Imports": [
+ "lattice"
+ ],
+ "Description": "Provides functions for summarizing and plotting the output from Markov Chain Monte Carlo (MCMC) simulations, as well as diagnostic tests of convergence to the equilibrium distribution of the Markov chain.",
+ "License": "GPL (>= 2)",
+ "NeedsCompilation": "no",
+ "Author": "Martyn Plummer [aut, cre, trl], Nicky Best [aut], Kate Cowles [aut], Karen Vines [aut], Deepayan Sarkar [aut], Douglas Bates [aut], Russell Almond [aut], Arni Magnusson [aut]",
+ "Maintainer": "Martyn Plummer ",
+ "Repository": "CRAN"
},
"codetools": {
"Package": "codetools",
"Version": "0.2-20",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R"
+ "Priority": "recommended",
+ "Author": "Luke Tierney ",
+ "Description": "Code analysis tools for R.",
+ "Title": "Code Analysis Tools for R",
+ "Depends": [
+ "R (>= 2.1)"
],
- "Hash": "61e097f35917d342622f21cdc79c256e"
+ "Maintainer": "Luke Tierney ",
+ "URL": "https://gitlab.com/luke-tierney/codetools",
+ "License": "GPL",
+ "NeedsCompilation": "no",
+ "Repository": "CRAN"
},
"colorspace": {
"Package": "colorspace",
"Version": "2.1-1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "grDevices",
+ "Date": "2024-07-26",
+ "Title": "A Toolbox for Manipulating and Assessing Colors and Palettes",
+ "Authors@R": "c(person(given = \"Ross\", family = \"Ihaka\", role = \"aut\", email = \"ihaka@stat.auckland.ac.nz\"), person(given = \"Paul\", family = \"Murrell\", role = \"aut\", email = \"paul@stat.auckland.ac.nz\", comment = c(ORCID = \"0000-0002-3224-8858\")), person(given = \"Kurt\", family = \"Hornik\", role = \"aut\", email = \"Kurt.Hornik@R-project.org\", comment = c(ORCID = \"0000-0003-4198-9911\")), person(given = c(\"Jason\", \"C.\"), family = \"Fisher\", role = \"aut\", email = \"jfisher@usgs.gov\", comment = c(ORCID = \"0000-0001-9032-8912\")), person(given = \"Reto\", family = \"Stauffer\", role = \"aut\", email = \"Reto.Stauffer@uibk.ac.at\", comment = c(ORCID = \"0000-0002-3798-5507\")), person(given = c(\"Claus\", \"O.\"), family = \"Wilke\", role = \"aut\", email = \"wilke@austin.utexas.edu\", comment = c(ORCID = \"0000-0002-7470-9261\")), person(given = c(\"Claire\", \"D.\"), family = \"McWhite\", role = \"aut\", email = \"claire.mcwhite@utmail.utexas.edu\", comment = c(ORCID = \"0000-0001-7346-3047\")), person(given = \"Achim\", family = \"Zeileis\", role = c(\"aut\", \"cre\"), email = \"Achim.Zeileis@R-project.org\", comment = c(ORCID = \"0000-0003-0918-3766\")))",
+ "Description": "Carries out mapping between assorted color spaces including RGB, HSV, HLS, CIEXYZ, CIELUV, HCL (polar CIELUV), CIELAB, and polar CIELAB. Qualitative, sequential, and diverging color palettes based on HCL colors are provided along with corresponding ggplot2 color scales. Color palette choice is aided by an interactive app (with either a Tcl/Tk or a shiny graphical user interface) and shiny apps with an HCL color picker and a color vision deficiency emulator. Plotting functions for displaying and assessing palettes include color swatches, visualizations of the HCL space, and trajectories in HCL and/or RGB spectrum. Color manipulation functions include: desaturation, lightening/darkening, mixing, and simulation of color vision deficiencies (deutanomaly, protanomaly, tritanomaly). Details can be found on the project web page at and in the accompanying scientific paper: Zeileis et al. (2020, Journal of Statistical Software, ).",
+ "Depends": [
+ "R (>= 3.0.0)",
+ "methods"
+ ],
+ "Imports": [
"graphics",
- "methods",
+ "grDevices",
"stats"
],
- "Hash": "d954cb1c57e8d8b756165d7ba18aa55a"
+ "Suggests": [
+ "datasets",
+ "utils",
+ "KernSmooth",
+ "MASS",
+ "kernlab",
+ "mvtnorm",
+ "vcd",
+ "tcltk",
+ "shiny",
+ "shinyjs",
+ "ggplot2",
+ "dplyr",
+ "scales",
+ "grid",
+ "png",
+ "jpeg",
+ "knitr",
+ "rmarkdown",
+ "RColorBrewer",
+ "rcartocolor",
+ "scico",
+ "viridis",
+ "wesanderson"
+ ],
+ "VignetteBuilder": "knitr",
+ "License": "BSD_3_clause + file LICENSE",
+ "URL": "https://colorspace.R-Forge.R-project.org/, https://hclwizard.org/",
+ "BugReports": "https://colorspace.R-Forge.R-project.org/contact.html",
+ "LazyData": "yes",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.1",
+ "NeedsCompilation": "yes",
+ "Author": "Ross Ihaka [aut], Paul Murrell [aut] (), Kurt Hornik [aut] (), Jason C. Fisher [aut] (), Reto Stauffer [aut] (), Claus O. Wilke [aut] (), Claire D. McWhite [aut] (), Achim Zeileis [aut, cre] ()",
+ "Maintainer": "Achim Zeileis ",
+ "Repository": "CRAN"
},
"commonmark": {
"Package": "commonmark",
"Version": "1.9.2",
"Source": "Repository",
- "Repository": "CRAN",
- "Hash": "14eb0596f987c71535d07c3aff814742"
+ "Type": "Package",
+ "Title": "High Performance CommonMark and Github Markdown Rendering in R",
+ "Authors@R": "c( person(\"Jeroen\", \"Ooms\", ,\"jeroenooms@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-4035-0289\")), person(\"John MacFarlane\", role = \"cph\", comment = \"Author of cmark\"))",
+ "Description": "The CommonMark specification defines a rationalized version of markdown syntax. This package uses the 'cmark' reference implementation for converting markdown text into various formats including html, latex and groff man. In addition it exposes the markdown parse tree in xml format. Also includes opt-in support for GFM extensions including tables, autolinks, and strikethrough text.",
+ "License": "BSD_2_clause + file LICENSE",
+ "URL": "https://docs.ropensci.org/commonmark/ https://ropensci.r-universe.dev/commonmark",
+ "BugReports": "https://github.com/r-lib/commonmark/issues",
+ "Suggests": [
+ "curl",
+ "testthat",
+ "xml2"
+ ],
+ "RoxygenNote": "7.2.3",
+ "Language": "en-US",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "yes",
+ "Author": "Jeroen Ooms [aut, cre] (), John MacFarlane [cph] (Author of cmark)",
+ "Maintainer": "Jeroen Ooms ",
+ "Repository": "CRAN"
},
"correlation": {
"Package": "correlation",
"Version": "0.8.6",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "bayestestR",
+ "Type": "Package",
+ "Title": "Methods for Correlation Analysis",
+ "Authors@R": "c(person(given = \"Dominique\", family = \"Makowski\", role = c(\"aut\", \"inv\"), email = \"dom.makowski@gmail.com\", comment = c(ORCID = \"0000-0001-5375-9967\")), person(given = \"Brenton M.\", family = \"Wiernik\", role = c(\"aut\", \"cre\"), email = \"brenton@wiernik.org\", comment = c(ORCID = \"0000-0001-9560-6336\")), person(given = \"Indrajeet\", family = \"Patil\", role = \"aut\", email = \"patilindrajeet.science@gmail.com\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(given = \"Daniel\", family = \"Lüdecke\", role = \"aut\", email = \"d.luedecke@uke.de\", comment = c(ORCID = \"0000-0002-8895-3206\")), person(given = \"Mattan S.\", family = \"Ben-Shachar\", role = \"aut\", email = \"matanshm@post.bgu.ac.il\", comment = c(ORCID = \"0000-0002-4287-4801\")), person(given = \"Rémi\", family = \"Thériault\", role = c(\"aut\"), email = \"remi.theriault@mail.mcgill.ca\", comment = c(ORCID = \"0000-0003-4315-6788\")), person(given = \"Mark\", family = \"White\", email = \"markhwhiteii@gmail.com\", role = \"rev\"), person(given = \"Maximilian M.\", family = \"Rabe\", email = \"maximilian.rabe@uni-potsdam.de\", role = \"rev\", comment = c(ORCID = \"0000-0002-2556-5644\")))",
+ "Maintainer": "Brenton M. Wiernik ",
+ "Description": "Lightweight package for computing different kinds of correlations, such as partial correlations, Bayesian correlations, multilevel correlations, polychoric correlations, biweight correlations, distance correlations and more. Part of the 'easystats' ecosystem. References: Makowski et al. (2020) .",
+ "License": "MIT + file LICENSE",
+ "URL": "https://easystats.github.io/correlation/",
+ "BugReports": "https://github.com/easystats/correlation/issues",
+ "Depends": [
+ "R (>= 3.6)"
+ ],
+ "Imports": [
+ "bayestestR (>= 0.15.0)",
"datasets",
- "datawizard",
- "insight",
- "parameters",
+ "datawizard (>= 0.13.0)",
+ "insight (>= 0.20.5)",
+ "parameters (>= 0.22.2)",
"stats"
],
- "Hash": "8b6512d8f60685736ee3bafdc292190d"
+ "Suggests": [
+ "BayesFactor",
+ "energy",
+ "ggplot2",
+ "ggraph",
+ "gt",
+ "Hmisc",
+ "knitr",
+ "lme4",
+ "MASS",
+ "mbend",
+ "polycor",
+ "poorman",
+ "ppcor",
+ "psych",
+ "rmarkdown",
+ "rmcorr",
+ "rstanarm",
+ "see (>= 0.8.1)",
+ "testthat (>= 3.2.1)",
+ "tidygraph",
+ "wdm",
+ "WRS2",
+ "openxlsx2 (>= 1.0)"
+ ],
+ "VignetteBuilder": "knitr",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.3.2",
+ "Config/testthat/edition": "3",
+ "Config/Needs/website": "rstudio/bslib, r-lib/pkgdown, easystats/easystatstemplate",
+ "NeedsCompilation": "no",
+ "Author": "Dominique Makowski [aut, inv] (), Brenton M. Wiernik [aut, cre] (), Indrajeet Patil [aut] (), Daniel Lüdecke [aut] (), Mattan S. Ben-Shachar [aut] (), Rémi Thériault [aut] (), Mark White [rev], Maximilian M. Rabe [rev] ()",
+ "Repository": "CRAN"
},
"cowplot": {
"Package": "cowplot",
"Version": "1.1.3",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "ggplot2",
- "grDevices",
+ "Title": "Streamlined Plot Theme and Plot Annotations for 'ggplot2'",
+ "Authors@R": "person( given = \"Claus O.\", family = \"Wilke\", role = c(\"aut\", \"cre\"), email = \"wilke@austin.utexas.edu\", comment = c(ORCID = \"0000-0002-7470-9261\") )",
+ "Description": "Provides various features that help with creating publication-quality figures with 'ggplot2', such as a set of themes, functions to align plots and arrange them into complex compound figures, and functions that make it easy to annotate plots and or mix plots with images. The package was originally written for internal use in the Wilke lab, hence the name (Claus O. Wilke's plot package). It has also been used extensively in the book Fundamentals of Data Visualization.",
+ "URL": "https://wilkelab.org/cowplot/",
+ "BugReports": "https://github.com/wilkelab/cowplot/issues",
+ "Depends": [
+ "R (>= 3.5.0)"
+ ],
+ "Imports": [
+ "ggplot2 (>= 3.4.0)",
"grid",
"gtable",
+ "grDevices",
"methods",
"rlang",
"scales"
],
- "Hash": "8ef2084dd7d28847b374e55440e4f8cb"
+ "License": "GPL-2",
+ "Suggests": [
+ "Cairo",
+ "covr",
+ "dplyr",
+ "forcats",
+ "gridGraphics (>= 0.4-0)",
+ "knitr",
+ "lattice",
+ "magick",
+ "maps",
+ "PASWR",
+ "patchwork",
+ "rmarkdown",
+ "ragg",
+ "testthat (>= 1.0.0)",
+ "tidyr",
+ "vdiffr (>= 0.3.0)",
+ "VennDiagram"
+ ],
+ "VignetteBuilder": "knitr",
+ "Collate": "'add_sub.R' 'align_plots.R' 'as_grob.R' 'as_gtable.R' 'axis_canvas.R' 'cowplot.R' 'draw.R' 'get_plot_component.R' 'get_axes.R' 'get_titles.R' 'get_legend.R' 'get_panel.R' 'gtable.R' 'key_glyph.R' 'plot_grid.R' 'save.R' 'set_null_device.R' 'setup.R' 'stamp.R' 'themes.R' 'utils_ggplot2.R'",
+ "RoxygenNote": "7.2.3",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "no",
+ "Author": "Claus O. Wilke [aut, cre] ()",
+ "Maintainer": "Claus O. Wilke ",
+ "Repository": "CRAN"
},
"cpp11": {
"Package": "cpp11",
"Version": "0.5.1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R"
+ "Title": "A C++11 Interface for R's C Interface",
+ "Authors@R": "c( person(\"Davis\", \"Vaughan\", email = \"davis@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-4777-038X\")), person(\"Jim\",\"Hester\", role = \"aut\", comment = c(ORCID = \"0000-0002-2739-7082\")), person(\"Romain\", \"François\", role = \"aut\", comment = c(ORCID = \"0000-0002-2444-4226\")), person(\"Benjamin\", \"Kietzman\", role = \"ctb\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )",
+ "Description": "Provides a header only, C++11 interface to R's C interface. Compared to other approaches 'cpp11' strives to be safe against long jumps from the C API as well as C++ exceptions, conform to normal R function semantics and supports interaction with 'ALTREP' vectors.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://cpp11.r-lib.org, https://github.com/r-lib/cpp11",
+ "BugReports": "https://github.com/r-lib/cpp11/issues",
+ "Depends": [
+ "R (>= 4.0.0)"
],
- "Hash": "9df43854f1c84685d095ed6270b52387"
+ "Suggests": [
+ "bench",
+ "brio",
+ "callr",
+ "cli",
+ "covr",
+ "decor",
+ "desc",
+ "ggplot2",
+ "glue",
+ "knitr",
+ "lobstr",
+ "mockery",
+ "progress",
+ "rmarkdown",
+ "scales",
+ "Rcpp",
+ "testthat (>= 3.2.0)",
+ "tibble",
+ "utils",
+ "vctrs",
+ "withr"
+ ],
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Config/Needs/cpp11/cpp_register": "brio, cli, decor, desc, glue, tibble, vctrs",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.2",
+ "NeedsCompilation": "no",
+ "Author": "Davis Vaughan [aut, cre] (), Jim Hester [aut] (), Romain François [aut] (), Benjamin Kietzman [ctb], Posit Software, PBC [cph, fnd]",
+ "Maintainer": "Davis Vaughan ",
+ "Repository": "CRAN"
},
"crayon": {
"Package": "crayon",
"Version": "1.5.3",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
+ "Title": "Colored Terminal Output",
+ "Authors@R": "c( person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Brodie\", \"Gaslam\", , \"brodie.gaslam@yahoo.com\", role = \"ctb\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )",
+ "Description": "The crayon package is now superseded. Please use the 'cli' package for new projects. Colored terminal output on terminals that support 'ANSI' color and highlight codes. It also works in 'Emacs' 'ESS'. 'ANSI' color support is automatically detected. Colors and highlighting can be combined and nested. New styles can also be created easily. This package was inspired by the 'chalk' 'JavaScript' project.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://r-lib.github.io/crayon/, https://github.com/r-lib/crayon",
+ "BugReports": "https://github.com/r-lib/crayon/issues",
+ "Imports": [
"grDevices",
"methods",
"utils"
],
- "Hash": "859d96e65ef198fd43e82b9628d593ef"
+ "Suggests": [
+ "mockery",
+ "rstudioapi",
+ "testthat",
+ "withr"
+ ],
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.1",
+ "Collate": "'aaa-rstudio-detect.R' 'aaaa-rematch2.R' 'aab-num-ansi-colors.R' 'aac-num-ansi-colors.R' 'ansi-256.R' 'ansi-palette.R' 'combine.R' 'string.R' 'utils.R' 'crayon-package.R' 'disposable.R' 'enc-utils.R' 'has_ansi.R' 'has_color.R' 'link.R' 'styles.R' 'machinery.R' 'parts.R' 'print.R' 'style-var.R' 'show.R' 'string_operations.R'",
+ "NeedsCompilation": "no",
+ "Author": "Gábor Csárdi [aut, cre], Brodie Gaslam [ctb], Posit Software, PBC [cph, fnd]",
+ "Maintainer": "Gábor Csárdi ",
+ "Repository": "CRAN"
},
"crosstalk": {
"Package": "crosstalk",
"Version": "1.2.1",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R6",
- "htmltools",
+ "Type": "Package",
+ "Title": "Inter-Widget Interactivity for HTML Widgets",
+ "Authors@R": "c( person(\"Joe\", \"Cheng\", role = \"aut\", email = \"joe@posit.co\"), person(\"Carson\", \"Sievert\", role = c(\"aut\", \"cre\"), email = \"carson@posit.co\", comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(family = \"jQuery Foundation\", role = \"cph\", comment = \"jQuery library and jQuery UI library\"), person(family = \"jQuery contributors\", role = c(\"ctb\", \"cph\"), comment = \"jQuery library; authors listed in inst/www/shared/jquery-AUTHORS.txt\"), person(\"Mark\", \"Otto\", role = \"ctb\", comment = \"Bootstrap library\"), person(\"Jacob\", \"Thornton\", role = \"ctb\", comment = \"Bootstrap library\"), person(family = \"Bootstrap contributors\", role = \"ctb\", comment = \"Bootstrap library\"), person(family = \"Twitter, Inc\", role = \"cph\", comment = \"Bootstrap library\"), person(\"Brian\", \"Reavis\", role = c(\"ctb\", \"cph\"), comment = \"selectize.js library\"), person(\"Kristopher Michael\", \"Kowal\", role = c(\"ctb\", \"cph\"), comment = \"es5-shim library\"), person(family = \"es5-shim contributors\", role = c(\"ctb\", \"cph\"), comment = \"es5-shim library\"), person(\"Denis\", \"Ineshin\", role = c(\"ctb\", \"cph\"), comment = \"ion.rangeSlider library\"), person(\"Sami\", \"Samhuri\", role = c(\"ctb\", \"cph\"), comment = \"Javascript strftime library\") )",
+ "Description": "Provides building blocks for allowing HTML widgets to communicate with each other, with Shiny or without (i.e. static .html files). Currently supports linked brushing and filtering.",
+ "License": "MIT + file LICENSE",
+ "Imports": [
+ "htmltools (>= 0.3.6)",
"jsonlite",
- "lazyeval"
+ "lazyeval",
+ "R6"
],
- "Hash": "ab12c7b080a57475248a30f4db6298c0"
+ "Suggests": [
+ "shiny",
+ "ggplot2",
+ "testthat (>= 2.1.0)",
+ "sass",
+ "bslib"
+ ],
+ "URL": "https://rstudio.github.io/crosstalk/, https://github.com/rstudio/crosstalk",
+ "BugReports": "https://github.com/rstudio/crosstalk/issues",
+ "RoxygenNote": "7.2.3",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "no",
+ "Author": "Joe Cheng [aut], Carson Sievert [aut, cre] (), Posit Software, PBC [cph, fnd], jQuery Foundation [cph] (jQuery library and jQuery UI library), jQuery contributors [ctb, cph] (jQuery library; authors listed in inst/www/shared/jquery-AUTHORS.txt), Mark Otto [ctb] (Bootstrap library), Jacob Thornton [ctb] (Bootstrap library), Bootstrap contributors [ctb] (Bootstrap library), Twitter, Inc [cph] (Bootstrap library), Brian Reavis [ctb, cph] (selectize.js library), Kristopher Michael Kowal [ctb, cph] (es5-shim library), es5-shim contributors [ctb, cph] (es5-shim library), Denis Ineshin [ctb, cph] (ion.rangeSlider library), Sami Samhuri [ctb, cph] (Javascript strftime library)",
+ "Maintainer": "Carson Sievert ",
+ "Repository": "CRAN"
},
"curl": {
"Package": "curl",
- "Version": "6.0.1",
+ "Version": "6.2.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R"
+ "Type": "Package",
+ "Title": "A Modern and Flexible Web Client for R",
+ "Authors@R": "c( person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\", comment = c(ORCID = \"0000-0002-4035-0289\")), person(\"Hadley\", \"Wickham\", role = \"ctb\"), person(\"Posit Software, PBC\", role = \"cph\"))",
+ "Description": "Bindings to 'libcurl' for performing fully configurable HTTP/FTP requests where responses can be processed in memory, on disk, or streaming via the callback or connection interfaces. Some knowledge of 'libcurl' is recommended; for a more-user-friendly web client see the 'httr2' package which builds on this package with http specific tools and logic.",
+ "License": "MIT + file LICENSE",
+ "SystemRequirements": "libcurl (>= 7.62): libcurl-devel (rpm) or libcurl4-openssl-dev (deb)",
+ "URL": "https://jeroen.r-universe.dev/curl",
+ "BugReports": "https://github.com/jeroen/curl/issues",
+ "Suggests": [
+ "spelling",
+ "testthat (>= 1.0.0)",
+ "knitr",
+ "jsonlite",
+ "later",
+ "rmarkdown",
+ "httpuv (>= 1.4.4)",
+ "webutils"
],
- "Hash": "e8ba62486230951fcd2b881c5be23f96"
+ "VignetteBuilder": "knitr",
+ "Depends": [
+ "R (>= 3.0.0)"
+ ],
+ "RoxygenNote": "7.3.2.9000",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "NeedsCompilation": "yes",
+ "Author": "Jeroen Ooms [aut, cre] (), Hadley Wickham [ctb], Posit Software, PBC [cph]",
+ "Maintainer": "Jeroen Ooms ",
+ "Repository": "CRAN"
},
"data.table": {
"Package": "data.table",
"Version": "1.16.4",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Title": "Extension of `data.frame`",
+ "Depends": [
+ "R (>= 3.3.0)"
+ ],
+ "Imports": [
"methods"
],
- "Hash": "38bbf05fc2503143db4c734a7e5cab66"
+ "Suggests": [
+ "bit64 (>= 4.0.0)",
+ "bit (>= 4.0.4)",
+ "R.utils",
+ "xts",
+ "zoo (>= 1.8-1)",
+ "yaml",
+ "knitr",
+ "markdown"
+ ],
+ "Description": "Fast aggregation of large data (e.g. 100GB in RAM), fast ordered joins, fast add/modify/delete of columns by group using no copies at all, list columns, friendly and fast character-separated-value read/write. Offers a natural and flexible syntax, for faster development.",
+ "License": "MPL-2.0 | file LICENSE",
+ "URL": "https://r-datatable.com, https://Rdatatable.gitlab.io/data.table, https://github.com/Rdatatable/data.table",
+ "BugReports": "https://github.com/Rdatatable/data.table/issues",
+ "VignetteBuilder": "knitr",
+ "Encoding": "UTF-8",
+ "ByteCompile": "TRUE",
+ "Authors@R": "c( person(\"Tyson\",\"Barrett\", role=c(\"aut\",\"cre\"), email=\"t.barrett88@gmail.com\", comment = c(ORCID=\"0000-0002-2137-1391\")), person(\"Matt\",\"Dowle\", role=\"aut\", email=\"mattjdowle@gmail.com\"), person(\"Arun\",\"Srinivasan\", role=\"aut\", email=\"asrini@pm.me\"), person(\"Jan\",\"Gorecki\", role=\"aut\"), person(\"Michael\",\"Chirico\", role=\"aut\", comment = c(ORCID=\"0000-0003-0787-087X\")), person(\"Toby\",\"Hocking\", role=\"aut\", comment = c(ORCID=\"0000-0002-3146-0865\")), person(\"Benjamin\",\"Schwendinger\",role=\"aut\", comment = c(ORCID=\"0000-0003-3315-8114\")), person(\"Pasha\",\"Stetsenko\", role=\"ctb\"), person(\"Tom\",\"Short\", role=\"ctb\"), person(\"Steve\",\"Lianoglou\", role=\"ctb\"), person(\"Eduard\",\"Antonyan\", role=\"ctb\"), person(\"Markus\",\"Bonsch\", role=\"ctb\"), person(\"Hugh\",\"Parsonage\", role=\"ctb\"), person(\"Scott\",\"Ritchie\", role=\"ctb\"), person(\"Kun\",\"Ren\", role=\"ctb\"), person(\"Xianying\",\"Tan\", role=\"ctb\"), person(\"Rick\",\"Saporta\", role=\"ctb\"), person(\"Otto\",\"Seiskari\", role=\"ctb\"), person(\"Xianghui\",\"Dong\", role=\"ctb\"), person(\"Michel\",\"Lang\", role=\"ctb\"), person(\"Watal\",\"Iwasaki\", role=\"ctb\"), person(\"Seth\",\"Wenchel\", role=\"ctb\"), person(\"Karl\",\"Broman\", role=\"ctb\"), person(\"Tobias\",\"Schmidt\", role=\"ctb\"), person(\"David\",\"Arenburg\", role=\"ctb\"), person(\"Ethan\",\"Smith\", role=\"ctb\"), person(\"Francois\",\"Cocquemas\", role=\"ctb\"), person(\"Matthieu\",\"Gomez\", role=\"ctb\"), person(\"Philippe\",\"Chataignon\", role=\"ctb\"), person(\"Nello\",\"Blaser\", role=\"ctb\"), person(\"Dmitry\",\"Selivanov\", role=\"ctb\"), person(\"Andrey\",\"Riabushenko\", role=\"ctb\"), person(\"Cheng\",\"Lee\", role=\"ctb\"), person(\"Declan\",\"Groves\", role=\"ctb\"), person(\"Daniel\",\"Possenriede\", role=\"ctb\"), person(\"Felipe\",\"Parages\", role=\"ctb\"), person(\"Denes\",\"Toth\", role=\"ctb\"), person(\"Mus\",\"Yaramaz-David\", role=\"ctb\"), person(\"Ayappan\",\"Perumal\", role=\"ctb\"), person(\"James\",\"Sams\", role=\"ctb\"), person(\"Martin\",\"Morgan\", role=\"ctb\"), person(\"Michael\",\"Quinn\", role=\"ctb\"), person(\"@javrucebo\",\"\", role=\"ctb\"), person(\"@marc-outins\",\"\", role=\"ctb\"), person(\"Roy\",\"Storey\", role=\"ctb\"), person(\"Manish\",\"Saraswat\", role=\"ctb\"), person(\"Morgan\",\"Jacob\", role=\"ctb\"), person(\"Michael\",\"Schubmehl\", role=\"ctb\"), person(\"Davis\",\"Vaughan\", role=\"ctb\"), person(\"Leonardo\",\"Silvestri\", role=\"ctb\"), person(\"Jim\",\"Hester\", role=\"ctb\"), person(\"Anthony\",\"Damico\", role=\"ctb\"), person(\"Sebastian\",\"Freundt\", role=\"ctb\"), person(\"David\",\"Simons\", role=\"ctb\"), person(\"Elliott\",\"Sales de Andrade\", role=\"ctb\"), person(\"Cole\",\"Miller\", role=\"ctb\"), person(\"Jens Peder\",\"Meldgaard\", role=\"ctb\"), person(\"Vaclav\",\"Tlapak\", role=\"ctb\"), person(\"Kevin\",\"Ushey\", role=\"ctb\"), person(\"Dirk\",\"Eddelbuettel\", role=\"ctb\"), person(\"Tony\",\"Fischetti\", role=\"ctb\"), person(\"Ofek\",\"Shilon\", role=\"ctb\"), person(\"Vadim\",\"Khotilovich\", role=\"ctb\"), person(\"Hadley\",\"Wickham\", role=\"ctb\"), person(\"Bennet\",\"Becker\", role=\"ctb\"), person(\"Kyle\",\"Haynes\", role=\"ctb\"), person(\"Boniface Christian\",\"Kamgang\", role=\"ctb\"), person(\"Olivier\",\"Delmarcell\", role=\"ctb\"), person(\"Josh\",\"O'Brien\", role=\"ctb\"), person(\"Dereck\",\"de Mezquita\", role=\"ctb\"), person(\"Michael\",\"Czekanski\", role=\"ctb\"), person(\"Dmitry\", \"Shemetov\", role=\"ctb\"), person(\"Nitish\", \"Jha\", role=\"ctb\"), person(\"Joshua\", \"Wu\", role=\"ctb\"), person(\"Iago\", \"Giné-Vázquez\", role=\"ctb\"), person(\"Anirban\", \"Chetia\", role=\"ctb\"), person(\"Doris\", \"Amoakohene\", role=\"ctb\"), person(\"Ivan\", \"Krylov\", role=\"ctb\") )",
+ "NeedsCompilation": "yes",
+ "Author": "Tyson Barrett [aut, cre] (), Matt Dowle [aut], Arun Srinivasan [aut], Jan Gorecki [aut], Michael Chirico [aut] (), Toby Hocking [aut] (), Benjamin Schwendinger [aut] (), Pasha Stetsenko [ctb], Tom Short [ctb], Steve Lianoglou [ctb], Eduard Antonyan [ctb], Markus Bonsch [ctb], Hugh Parsonage [ctb], Scott Ritchie [ctb], Kun Ren [ctb], Xianying Tan [ctb], Rick Saporta [ctb], Otto Seiskari [ctb], Xianghui Dong [ctb], Michel Lang [ctb], Watal Iwasaki [ctb], Seth Wenchel [ctb], Karl Broman [ctb], Tobias Schmidt [ctb], David Arenburg [ctb], Ethan Smith [ctb], Francois Cocquemas [ctb], Matthieu Gomez [ctb], Philippe Chataignon [ctb], Nello Blaser [ctb], Dmitry Selivanov [ctb], Andrey Riabushenko [ctb], Cheng Lee [ctb], Declan Groves [ctb], Daniel Possenriede [ctb], Felipe Parages [ctb], Denes Toth [ctb], Mus Yaramaz-David [ctb], Ayappan Perumal [ctb], James Sams [ctb], Martin Morgan [ctb], Michael Quinn [ctb], @javrucebo [ctb], @marc-outins [ctb], Roy Storey [ctb], Manish Saraswat [ctb], Morgan Jacob [ctb], Michael Schubmehl [ctb], Davis Vaughan [ctb], Leonardo Silvestri [ctb], Jim Hester [ctb], Anthony Damico [ctb], Sebastian Freundt [ctb], David Simons [ctb], Elliott Sales de Andrade [ctb], Cole Miller [ctb], Jens Peder Meldgaard [ctb], Vaclav Tlapak [ctb], Kevin Ushey [ctb], Dirk Eddelbuettel [ctb], Tony Fischetti [ctb], Ofek Shilon [ctb], Vadim Khotilovich [ctb], Hadley Wickham [ctb], Bennet Becker [ctb], Kyle Haynes [ctb], Boniface Christian Kamgang [ctb], Olivier Delmarcell [ctb], Josh O'Brien [ctb], Dereck de Mezquita [ctb], Michael Czekanski [ctb], Dmitry Shemetov [ctb], Nitish Jha [ctb], Joshua Wu [ctb], Iago Giné-Vázquez [ctb], Anirban Chetia [ctb], Doris Amoakohene [ctb], Ivan Krylov [ctb]",
+ "Maintainer": "Tyson Barrett ",
+ "Repository": "CRAN"
},
"datamods": {
"Package": "datamods",
"Version": "1.5.3",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
+ "Title": "Modules to Import and Manipulate Data in 'Shiny'",
+ "Authors@R": "c(person(given = \"Victor\", family = \"Perrier\", role = c(\"aut\", \"cre\", \"cph\"), email = \"victor.perrier@dreamrs.fr\"), person(given = \"Fanny\", family = \"Meyer\", role = \"aut\"), person(given = \"Samra\", family = \"Goumri\", role = \"aut\"), person(given = \"Zauad Shahreer\", family = \"Abeer\", role = \"aut\", email = \"shahreyar.abeer@gmail.com\"), person(given = \"Eduard\", family = \"Szöcs\", role = \"ctb\", email = \"eduardszoecs@gmail.com\") )",
+ "Description": "'Shiny' modules to import data into an application or 'addin' from various sources, and to manipulate them after that.",
+ "License": "GPL-3",
+ "URL": "https://github.com/dreamRs/datamods, https://dreamrs.github.io/datamods/",
+ "BugReports": "https://github.com/dreamRs/datamods/issues",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.2",
+ "Imports": [
"bslib",
"classInt",
"data.table",
@@ -899,98 +2602,256 @@
"readxl",
"rio",
"rlang",
- "shiny",
- "shinyWidgets",
- "shinybusy",
+ "shiny (>= 1.5.0)",
+ "shinyWidgets (>= 0.8.4)",
"tibble",
- "toastui",
+ "toastui (>= 0.3.3)",
"tools",
+ "shinybusy",
"writexl"
],
- "Hash": "d60f340d79847514abe3e79ac919b74b"
+ "Suggests": [
+ "ggplot2",
+ "jsonlite",
+ "knitr",
+ "MASS",
+ "rmarkdown",
+ "testthat",
+ "validate"
+ ],
+ "VignetteBuilder": "knitr",
+ "Depends": [
+ "R (>= 2.10)"
+ ],
+ "LazyData": "true",
+ "NeedsCompilation": "no",
+ "Author": "Victor Perrier [aut, cre, cph], Fanny Meyer [aut], Samra Goumri [aut], Zauad Shahreer Abeer [aut], Eduard Szöcs [ctb]",
+ "Maintainer": "Victor Perrier ",
+ "Repository": "CRAN"
},
"datawizard": {
"Package": "datawizard",
- "Version": "0.13.0",
+ "Version": "1.0.0",
"Source": "Repository",
- "Repository": "CRAN",
- "Requirements": [
- "R",
- "insight",
+ "Type": "Package",
+ "Title": "Easy Data Wrangling and Statistical Transformations",
+ "Authors@R": "c( person(\"Indrajeet\", \"Patil\", , \"patilindrajeet.science@gmail.com\", role = \"aut\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(\"Etienne\", \"Bacher\", , \"etienne.bacher@protonmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-9271-5075\")), person(\"Dominique\", \"Makowski\", , \"dom.makowski@gmail.com\", role = \"aut\", comment = c(ORCID = \"0000-0001-5375-9967\")), person(\"Daniel\", \"Lüdecke\", , \"d.luedecke@uke.de\", role = \"aut\", comment = c(ORCID = \"0000-0002-8895-3206\")), person(\"Mattan S.\", \"Ben-Shachar\", , \"matanshm@post.bgu.ac.il\", role = \"aut\", comment = c(ORCID = \"0000-0002-4287-4801\")), person(\"Brenton M.\", \"Wiernik\", , \"brenton@wiernik.org\", role = \"aut\", comment = c(ORCID = \"0000-0001-9560-6336\")), person(\"Rémi\", \"Thériault\", , \"remi.theriault@mail.mcgill.ca\", role = \"ctb\", comment = c(ORCID = \"0000-0003-4315-6788\")), person(\"Thomas J.\", \"Faulkenberry\", , \"faulkenberry@tarleton.edu\", role = \"rev\"), person(\"Robert\", \"Garrett\", , \"rcg4@illinois.edu\", role = \"rev\") )",
+ "Maintainer": "Etienne Bacher ",
+ "Description": "A lightweight package to assist in key steps involved in any data analysis workflow: (1) wrangling the raw data to get it in the needed form, (2) applying preprocessing steps and statistical transformations, and (3) compute statistical summaries of data properties and distributions. It is also the data wrangling backend for packages in 'easystats' ecosystem. References: Patil et al. (2022) .",
+ "License": "MIT + file LICENSE",
+ "URL": "https://easystats.github.io/datawizard/",
+ "BugReports": "https://github.com/easystats/datawizard/issues",
+ "Depends": [
+ "R (>= 4.0)"
+ ],
+ "Imports": [
+ "insight (>= 1.0.0)",
"stats",
"utils"
],
- "Hash": "303aeace6f3554ce2d62e5d1df6fcd6e"
+ "Suggests": [
+ "bayestestR",
+ "boot",
+ "brms",
+ "curl",
+ "data.table",
+ "dplyr (>= 1.1)",
+ "effectsize",
+ "emmeans",
+ "gamm4",
+ "ggplot2 (>= 3.5.0)",
+ "gt",
+ "haven",
+ "httr",
+ "knitr",
+ "lme4",
+ "mediation",
+ "modelbased",
+ "parameters (>= 0.21.7)",
+ "poorman (>= 0.2.7)",
+ "psych",
+ "readxl",
+ "readr",
+ "rio",
+ "rmarkdown",
+ "rstanarm",
+ "see",
+ "testthat (>= 3.2.1)",
+ "tibble",
+ "tidyr",
+ "withr"
+ ],
+ "VignetteBuilder": "knitr",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.3.2",
+ "Config/testthat/edition": "3",
+ "Config/testthat/parallel": "true",
+ "Config/Needs/website": "easystats/easystatstemplate",
+ "NeedsCompilation": "no",
+ "Author": "Indrajeet Patil [aut] (), Etienne Bacher [aut, cre] (), Dominique Makowski [aut] (), Daniel Lüdecke [aut] (), Mattan S. Ben-Shachar [aut] (), Brenton M. Wiernik [aut] (