diff --git a/CITATION.cff b/CITATION.cff index f5c69c78..0e848537 100644 --- a/CITATION.cff +++ b/CITATION.cff @@ -1116,6 +1116,18 @@ references: orcid: https://orcid.org/0000-0002-0172-3812 year: '2025' doi: 10.32614/CRAN.package.data.table +- type: software + title: viridis + abstract: 'viridis: Colorblind-Friendly Color Maps for R' + notes: Imports + url: https://sjmgarnier.github.io/viridis/ + repository: https://CRAN.R-project.org/package=viridis + authors: + - family-names: Garnier + given-names: Simon + email: garnier@njit.edu + year: '2025' + doi: 10.32614/CRAN.package.viridis - type: software title: styler abstract: 'styler: Non-Invasive Pretty Printing of R Code' diff --git a/DESCRIPTION b/DESCRIPTION index 8c5783a5..5f609502 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -69,7 +69,8 @@ Imports: NHANES, shiny.i18n, stRoke, - data.table + data.table, + viridis Suggests: styler, devtools, diff --git a/R/missings-module.R b/R/missings-module.R index b36c66bf..b1f2264c 100644 --- a/R/missings-module.R +++ b/R/missings-module.R @@ -75,15 +75,15 @@ data_missings_server <- function(id, shiny::req(data()) vectorSelectInput( inputId = ns("missings_method"), - label = i18n$t("Select missings analysis to apply"), + label = i18n$t("Analysis method for missingness overview"), choices = setNames( c( "predictors", "outcome" ), c( - i18n$t("Variables"), - i18n$t("By outcome") + i18n$t("Overview of missings across variables"), + i18n$t("Overview of difference in variables by missing status in outcome") ) ) ) @@ -96,15 +96,19 @@ data_missings_server <- function(id, shiny::req(input$missings_method) # browser() if (input$missings_method == "predictors") { + label <- i18n$t("Select a variable for grouped overview") df <- data_type_filter(data(), type = c("categorical", "dichotomous")) + col_subset <- c("none", names(df)) } else { + label <- i18n$t("Select outcome variable for overview") df <- datar()[apply(datar(), 2, anyNA)] + col_subset <- names(df) } columnSelectInput( inputId = ns("missings_var"), - label = i18n$t("Select variable to stratify analysis"), + label = label, data = df, - col_subset = c("none", names(df)), + col_subset = col_subset, none_label = i18n$t("No variable") ) }) @@ -144,7 +148,11 @@ data_missings_server <- function(id, # if (is.null(variabler()) || variabler() == "" || !variabler() %in% names(data()) || variabler() == "none") { # tbl <- rv$data() if (anyNA(datar())) { - title <- i18n$t("No variable chosen for analysis") + if (input$missings_method == "predictors") { + title <- i18n$t("Overview of missing observations") + } else { + title <- i18n$t("No outcome measure chosen") + } } else { title <- i18n$t("No missing observations") } diff --git a/R/sysdata.rda b/R/sysdata.rda index 425f5085..82e7a81d 100644 Binary files a/R/sysdata.rda and b/R/sysdata.rda differ diff --git a/R/validation.R b/R/validation.R index 2d7f21bb..2ea65d76 100644 --- a/R/validation.R +++ b/R/validation.R @@ -335,7 +335,7 @@ validation_lib <- function(name = NULL) { "mcar" = function(x, y) { ### Placeholder for missingness validation list( - string = i18n$t("There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nnonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}."), + string = i18n$t("There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}."), summary.fun = mcar_validate, summary.fun.args = list( data = x, diff --git a/SESSION.md b/SESSION.md index 87b32f00..a61071fa 100644 --- a/SESSION.md +++ b/SESSION.md @@ -44,6 +44,7 @@ |cardx |0.3.1 |2025-12-04 |CRAN (R 4.4.3) | |caTools |1.18.3 |2024-09-04 |CRAN (R 4.4.1) | |cellranger |1.1.0 |2016-07-27 |CRAN (R 4.4.0) | +|cffr |1.2.0 |2025-01-25 |CRAN (R 4.4.1) | |checkmate |2.3.3 |2025-08-18 |CRAN (R 4.4.1) | |class |7.3-23 |2025-01-01 |CRAN (R 4.4.1) | |classInt |0.4-11 |2025-01-08 |CRAN (R 4.4.1) | @@ -53,6 +54,7 @@ |colorspace |2.1-2 |2025-09-22 |CRAN (R 4.4.1) | |commonmark |2.0.0 |2025-07-07 |CRAN (R 4.4.1) | |crayon |1.5.3 |2024-06-20 |CRAN (R 4.4.1) | +|curl |7.0.0 |2025-08-19 |CRAN (R 4.4.1) | |data.table |1.17.8 |2025-07-10 |CRAN (R 4.4.1) | |datamods |1.5.3 |2024-10-02 |CRAN (R 4.4.1) | |datawizard |1.3.0 |2025-10-11 |CRAN (R 4.4.1) | @@ -111,6 +113,7 @@ |iterators |1.0.14 |2022-02-05 |CRAN (R 4.4.1) | |jquerylib |0.1.4 |2021-04-26 |CRAN (R 4.4.0) | |jsonlite |2.0.0 |2025-03-27 |CRAN (R 4.4.1) | +|jsonvalidate |1.5.0 |2025-02-07 |CRAN (R 4.4.1) | |KernSmooth |2.23-26 |2025-01-01 |CRAN (R 4.4.1) | |keyring |1.4.1 |2025-06-15 |CRAN (R 4.4.1) | |knitr |1.50 |2025-03-16 |CRAN (R 4.4.1) | @@ -138,6 +141,7 @@ |openssl |2.3.4 |2025-09-30 |CRAN (R 4.4.1) | |openxlsx2 |1.22 |2025-12-07 |CRAN (R 4.4.3) | |otel |0.2.0 |2025-08-29 |CRAN (R 4.4.1) | +|pak |0.9.1 |2025-12-01 |CRAN (R 4.4.3) | |parameters |0.28.3 |2025-11-25 |CRAN (R 4.4.3) | |patchwork |1.3.2 |2025-08-25 |CRAN (R 4.4.1) | |pbmcapply |1.5.1 |2022-04-28 |CRAN (R 4.4.1) | @@ -165,6 +169,7 @@ |R6 |2.6.1 |2025-02-15 |CRAN (R 4.4.1) | |ragg |1.5.0 |2025-09-02 |CRAN (R 4.4.1) | |rankinPlot |1.1.0 |2023-01-30 |CRAN (R 4.4.0) | +|rappdirs |0.3.3 |2021-01-31 |CRAN (R 4.4.1) | |rbibutils |2.4 |2025-11-07 |CRAN (R 4.4.1) | |RColorBrewer |1.1-3 |2022-04-03 |CRAN (R 4.4.1) | |Rcpp |1.1.0 |2025-07-02 |CRAN (R 4.4.1) | @@ -221,7 +226,10 @@ |usethis |3.2.1 |2025-09-06 |CRAN (R 4.4.1) | |utf8 |1.2.6 |2025-06-08 |CRAN (R 4.4.1) | |uuid |1.2-1 |2024-07-29 |CRAN (R 4.4.1) | +|V8 |8.0.1 |2025-10-10 |CRAN (R 4.4.1) | |vctrs |0.6.5 |2023-12-01 |CRAN (R 4.4.0) | +|viridis |0.6.5 |2024-01-29 |CRAN (R 4.4.0) | +|viridisLite |0.4.2 |2023-05-02 |CRAN (R 4.4.1) | |vroom |1.6.7 |2025-11-28 |CRAN (R 4.4.3) | |withr |3.0.2 |2024-10-28 |CRAN (R 4.4.1) | |writexl |1.5.4 |2025-04-15 |CRAN (R 4.4.1) | diff --git a/app_docker/app.R b/app_docker/app.R index a0b72083..f2c7203c 100644 --- a/app_docker/app.R +++ b/app_docker/app.R @@ -1,7 +1,7 @@ ######## -#### Current file: /var/folders/9l/xbc19wxx0g79jdd2sf_0v291mhwh7f/T//RtmpejDCIE/filec7542b7ed14.R +#### Current file: /var/folders/9l/xbc19wxx0g79jdd2sf_0v291mhwh7f/T//RtmpT9sPX5/file6c80650aba81.R ######## i18n_path <- here::here("translations") @@ -49,6 +49,7 @@ library(shiny.i18n) ## Translation init i18n <- shiny.i18n::Translator$new(translation_csvs_path = i18n_path) +# i18n <- shiny.i18n::Translator$new(translation_csvs_path = here::here("inst/translations/")) i18n$set_translation_language("en") @@ -62,7 +63,7 @@ i18n$set_translation_language("en") #### Current file: /Users/au301842/FreesearchR/R//app_version.R ######## -app_version <- function()'25.12.2' +app_version <- function()'25.12.3' ######## @@ -856,8 +857,18 @@ make_choices_with_infos <- function(data) { #' @importFrom shiny selectizeInput #' @export #' -columnSelectInput <- function(inputId, label, data, selected = "", ..., - col_subset = NULL, placeholder = "", onInitialize, none_label="No variable selected",maxItems=NULL) { +columnSelectInput <- function( + inputId, + label, + data, + selected = "", + ..., + col_subset = NULL, + placeholder = "", + onInitialize, + none_label = "No variable selected", + maxItems = NULL +) { datar <- if (is.reactive(data)) data else reactive(data) col_subsetr <- if (is.reactive(col_subset)) col_subset else reactive(col_subset) @@ -877,8 +888,8 @@ columnSelectInput <- function(inputId, label, data, selected = "", ..., ) }, col = names(datar())) - if (!"none" %in% names(datar())){ - labels <- c("none"=list(sprintf('\n {\n \"name\": \"none\",\n \"label\": \"%s\",\n \"dataclass\": \"\",\n \"datatype\": \"\"\n }',none_label)),labels) + if (!"none" %in% names(datar())) { + labels <- c("none" = list(sprintf('\n {\n \"name\": \"none\",\n \"label\": \"%s\",\n \"dataclass\": \"\",\n \"datatype\": \"\"\n }', none_label)), labels) choices <- setNames(names(labels), labels) choices <- choices[match(if (length(col_subsetr()) == 0 || isTRUE(col_subsetr() == "")) names(datar()) else col_subsetr(), choices)] } else { @@ -922,7 +933,7 @@ columnSelectInput <- function(inputId, label, data, selected = "", ..., ''; } }")), - if (!is.null(maxItems)) list(maxItems=maxItems) + if (!is.null(maxItems)) list(maxItems = maxItems) ) ) } @@ -943,31 +954,31 @@ columnSelectInput <- function(inputId, label, data, selected = "", ..., #' #' @examples #' if (shiny::interactive()) { -#' shinyApp( -#' ui = fluidPage( -#' shiny::uiOutput("select"), -#' tableOutput("data") -#' ), -#' server = function(input, output) { -#' output$select <- shiny::renderUI({ -#' vectorSelectInput( -#' inputId = "variable", label = "Variable:", -#' data = c( -#' "Cylinders" = "cyl", -#' "Transmission" = "am", -#' "Gears" = "gear" +#' shinyApp( +#' ui = fluidPage( +#' shiny::uiOutput("select"), +#' tableOutput("data") +#' ), +#' server = function(input, output) { +#' output$select <- shiny::renderUI({ +#' vectorSelectInput( +#' inputId = "variable", label = "Variable:", +#' data = c( +#' "Cylinders" = "cyl", +#' "Transmission" = "am", +#' "Gears" = "gear" +#' ) #' ) -#' ) -#' }) +#' }) #' -#' output$data <- renderTable( -#' { -#' mtcars[, c("mpg", input$variable), drop = FALSE] -#' }, -#' rownames = TRUE -#' ) -#' } -#' ) +#' output$data <- renderTable( +#' { +#' mtcars[, c("mpg", input$variable), drop = FALSE] +#' }, +#' rownames = TRUE +#' ) +#' } +#' ) #' } vectorSelectInput <- function(inputId, label, @@ -1022,8 +1033,6 @@ vectorSelectInput <- function(inputId, } - - ######## #### Current file: /Users/au301842/FreesearchR/R//cut_var.R ######## @@ -2662,7 +2671,7 @@ create_plot <- function(data, type, pri, sec, ter = NULL, ...) { out } -#' Print label, and if missing print variable name +#' Print label, and if missing print variable name for plots #' #' @param data vector or data frame #' @param var variable name. Optional. @@ -4429,7 +4438,7 @@ data_types <- function() { #### Current file: /Users/au301842/FreesearchR/R//hosted_version.R ######## -hosted_version <- function()'v25.12.2-251203' +hosted_version <- function()'v25.12.3-251211' ######## @@ -5521,18 +5530,46 @@ launch_FreesearchR <- function(...){ #' Data correlations evaluation module #' #' @param id Module id +#' @param ... additional UI elements to show before the table overview #' #' @name data-missings #' @returns Shiny ui module #' @export -data_missings_ui <- function(id) { +data_missings_ui <- function(id, ...) { ns <- shiny::NS(id) - shiny::tagList( - gt::gt_output(outputId = ns("missings_table")) + list( + bslib::layout_sidebar( + sidebar = bslib::sidebar( + bslib::accordion( + id = ns("acc_mis"), + open = "acc_chars", + multiple = FALSE, + bslib::accordion_panel( + value = "acc_pan_mis", + title = "Settings", + icon = bsicons::bs_icon("x-circle"), + shiny::uiOutput(ns("missings_method")), + shiny::uiOutput(ns("missings_var")), + shiny::helpText(i18n$t("Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random.")), + shiny::br(), + shiny::actionButton( + inputId = ns("act_miss"), + label = i18n$t("Evaluate"), + width = "100%", + icon = shiny::icon("calculator"), + disabled = FALSE + ) + ) + ) + ), + ..., + gt::gt_output(outputId = ns("missings_table")) + ) ) } +## This should really just be rebuild to only contain a function #' #' @param data data @@ -5543,108 +5580,200 @@ data_missings_ui <- function(id) { #' @export data_missings_server <- function(id, data, - variable, - max_level=20, + max_level = 20, ...) { shiny::moduleServer( id = id, module = function(input, output, session) { - # ns <- session$ns + ns <- session$ns datar <- if (is.reactive(data)) data else reactive(data) - variabler <- if (is.reactive(variable)) variable else reactive(variable) rv <- shiny::reactiveValues( data = NULL, table = NULL ) - rv$data <- shiny::reactive({ - df_tbl <- datar() - by_var <- variabler() + ## Notes + ## + ## Code export is still missing + ## Direct table export would be nice - tryCatch( - { - out <- compare_missings(df_tbl,by_var,max_level = max_level) - }, - error = function(err) { - showNotification(paste0("Error: ", err), type = "err") - } - ) + shiny::observe( + output$missings_method <- shiny::renderUI({ + shiny::req(data()) + vectorSelectInput( + inputId = ns("missings_method"), + label = i18n$t("Analysis method for missingness overview"), + choices = setNames( + c( + "predictors", + "outcome" + ), + c( + i18n$t("Overview of missings across variables"), + i18n$t("Overview of difference in variables by missing status in outcome") + ) + ) + ) + }) + ) - out - }) - - output$missings_table <- gt::render_gt({ - shiny::req(datar) - shiny::req(variabler) - - if (is.null(variabler()) || variabler() == "" || !variabler() %in% names(datar())) { - tbl <- rv$data() - if (anyNA(datar())){ - title <- i18n$t("No variable chosen for analysis") + shiny::observe({ + output$missings_var <- shiny::renderUI({ + shiny::req(datar()) + shiny::req(input$missings_method) + # browser() + if (input$missings_method == "predictors") { + label <- i18n$t("Select a variable for grouped overview") + df <- data_type_filter(data(), type = c("categorical", "dichotomous")) + col_subset <- c("none", names(df)) } else { - title <- i18n$t("No missing observations") + label <- i18n$t("Select outcome variable for overview") + df <- datar()[apply(datar(), 2, anyNA)] + col_subset <- names(df) } - } else { - tbl <- rv$data()|> - gtsummary::bold_p() - title <- glue::glue(i18n$t("Missing vs non-missing observations in the variable **'{variabler()}'**")) - } - - out <- tbl |> - gtsummary::as_gt() |> - gt::tab_header(title = gt::md(title)) - - rv$table <- out - - out + columnSelectInput( + inputId = ns("missings_var"), + label = label, + data = df, + col_subset = col_subset, + none_label = i18n$t("No variable") + ) + }) }) - return(reactive(rv$table)) + + shiny::observeEvent( + list(input$act_miss), + { + shiny::req(datar()) + shiny::req(input$missings_var) + # browser() + df_tbl <- datar() + by_var <- input$missings_var + + parameters <- list( + by_var = by_var, + max_level = max_level, + type = input$missings_method + ) + + tryCatch( + { + shiny::withProgress(message = i18n$t("Calculating. Hold tight for a moment.."), { + out <- do.call( + compare_missings, + modifyList(parameters, list(data = df_tbl)) + ) + }) + }, + error = function(err) { + showNotification(paste0("Error: ", err), type = "err") + } + ) + + if (is.null(input$missings_var) || input$missings_var == "" || !input$missings_var %in% names(datar()) || input$missings_var == "none") { + # if (is.null(variabler()) || variabler() == "" || !variabler() %in% names(data()) || variabler() == "none") { + # tbl <- rv$data() + if (anyNA(datar())) { + if (input$missings_method == "predictors") { + title <- i18n$t("Overview of missing observations") + } else { + title <- i18n$t("No outcome measure chosen") + } + } else { + title <- i18n$t("No missing observations") + } + } else { + ## Due to reactivity, the table updates too quickly. this mitigates that issue.. + + + if (input$missings_var == "predictors") { + title <- glue::glue(i18n$t("Missings across variables by the variable **'{input$missings_var}'**")) + } else { + title <- glue::glue(i18n$t("Missing vs non-missing observations in the variable **'{input$missings_var}'**")) + } + } + + attr(out, "tbl_title") <- title + + rv$data <- shiny::reactive(out) + } + ) + + shiny::observeEvent( + list( + # input$act_miss + rv$data + ), + { + output$missings_table <- gt::render_gt({ + shiny::req(rv$data) + # shiny::req(input$missings_var) + # browser() + if ("p.value" %in% names(rv$data()[["table_body"]])) { + tbl <- rv$data() |> + gtsummary::bold_p() + } else { + tbl <- rv$data() + } + + + out <- tbl |> + gtsummary::as_gt() |> + gt::tab_header(title = gt::md(attr(tbl, "tbl_title"))) + + attr(out, "strat_var") <- input$missings_var + + rv$table <- out + + out + }) + } + ) + + return(shiny::reactive(rv$table)) } ) } missing_demo_app <- function() { - ui <- shiny::fluidPage( - shiny::actionButton( - inputId = "modal_missings", - label = "Browse data", - width = "100%", - disabled = FALSE - ), - shiny::selectInput( - inputId = "missings_var", - label = "Select variable to stratify analysis", choices = c("cyl", "vs") - ), - data_missings_ui("data") + ui <- do.call( + bslib::page, + c( + list( + title = i18n$t("Missings"), + icon = bsicons::bs_icon("x-circle") + ), + data_missings_ui(id = "data") + ) ) server <- function(input, output, session) { data_demo <- mtcars data_demo[sample(1:32, 10), "cyl"] <- NA data_demo[sample(1:32, 8), "vs"] <- NA - data_missings_server(id = "data", data = data_demo, variable = shiny::reactive(input$missings_var)) + data_missings_server(id = "data", data = data_demo) - visual_summary_server(id = "visual", data = data_demo) + # visual_summary_server(id = "visual", data = data_demo) - observeEvent(input$modal_missings, { - tryCatch( - { - modal_visual_summary(id = "visual") - }, - error = function(err) { - showNotification(paste0("We encountered the following error browsing your data: ", err), type = "err") - } - ) - }) + # observeEvent(input$modal_missings, { + # tryCatch( + # { + # modal_visual_summary(id = "visual") + # }, + # error = function(err) { + # showNotification(paste0("We encountered the following error browsing your data: ", err), type = "err") + # } + # ) + # }) } shiny::shinyApp(ui, server) } -missing_demo_app() +# missing_demo_app() #' Pairwise comparison of missings across covariables #' @@ -5654,28 +5783,80 @@ missing_demo_app() #' @returns gtsummary list object #' @export #' -compare_missings <- function(data,by_var,max_level=20){ +compare_missings <- function( + data, + by_var, + max_level = 20, + type = c("predictors", "outcome") +) { + type <- match.arg(type) + if (!is.null(by_var) && by_var != "" && by_var %in% names(data)) { data <- data |> lapply(\(.x){ - # browser() - if (is.factor(.x)){ - cut_var(.x,breaks=20,type="top") + if (is.factor(.x)) { + cut_var(.x, breaks = 20, type = "top") } else { .x } - }) |> dplyr::bind_cols() + }) |> + dplyr::bind_cols() - data[[by_var]] <- ifelse(is.na(data[[by_var]]), "Missing", "Non-missing") + if (type == "predictors") { + data <- missings_logic_across(data, exclude = by_var) + } else { + data[[by_var]] <- ifelse(is.na(data[[by_var]]), "Missing", "Non-missing") + } out <- gtsummary::tbl_summary(data, by = by_var) |> gtsummary::add_p() } else { + if (type == "predictors") { + data <- missings_logic_across(data) + } + out <- gtsummary::tbl_summary(data) } + out } +#' Converting all variables to logicals by missing status +#' +#' @param data data +#' @param exclude character vector of variable names to be excluded +#' +#' @returns data frame +#' @export +#' +#' @examples +#' mtcars |> missings_logic_across("cyl") +#' ## gtsummary::trial |> +#' ## missings_logic_across() |> +#' ## gtsummary::tbl_summary() +missings_logic_across <- function(data, exclude = NULL) { + # This function includes a approach way to preserve variable labels + names(data) |> + lapply(\(.x){ + # browser() + # Saving original labels + lab <- REDCapCAST::get_attr(data[[.x]], attr = "label") + if (!.x %in% exclude) { + out <- is.na(data[[.x]]) + } else { + out <- data[[.x]] + } + if (!is.na(lab)) { + # Restoring original labels, if not NA + REDCapCAST::set_attr(data = out, label = lab, attr = "label", overwrite = TRUE) + } else { + out + } + }) |> + dplyr::bind_cols(.name_repair = "unique_quiet") |> + setNames(names(data)) +} + ######## #### Current file: /Users/au301842/FreesearchR/R//plot_bar.R @@ -10156,26 +10337,15 @@ ui_elements <- function(selection) { data_correlations_ui(id = "correlations", height = 600) ) ), - bslib::nav_panel( - title = i18n$t("Missings"), - icon = bsicons::bs_icon("x-circle"), - bslib::layout_sidebar( - sidebar = bslib::sidebar( - bslib::accordion( - id = "acc_mis", - open = "acc_chars", - multiple = FALSE, - bslib::accordion_panel( - value = "acc_pan_mis", - title = "Settings", - icon = bsicons::bs_icon("x-circle"), - shiny::uiOutput("missings_var"), - shiny::helpText(i18n$t("To consider if data is missing by random, choose the outcome/dependent variable (only variables with any missings are available). If there is a significant difference across other variables depending on missing observations, it may not be missing at random.")) - ) - ) + do.call( + bslib::nav_panel, + c( + list( + title = i18n$t("Missings"), + icon = bsicons::bs_icon("x-circle") ), - validation_ui("validation_mcar"), - data_missings_ui(id = "missingness") + data_missings_ui(id = "missingness", + validation_ui("validation_mcar")) ) ) ), @@ -11438,7 +11608,7 @@ convert_to <- function(data, #' Get variable(s) to convert #' -#' @param vars Output of [summary_vars()] +#' @param vars variables, output from summary_vars() function #' @param classes_input List of inputs containing new classes #' #' @return a `data.table`. @@ -11671,6 +11841,9 @@ validation_server <- function(id, purrr::list_flatten() } else if (length(to_validate) > 0) { out <- make_validation_alerts(to_validate) + } else { + ## Defaulting to an emptu output vector + out <- character() } valid_ui$x <- tagList(out) } @@ -11894,7 +12067,7 @@ validation_lib <- function(name = NULL) { "mcar" = function(x, y) { ### Placeholder for missingness validation list( - string = i18n$t("There is a significant correlation between {n_nonmcar} variables and missing observations in the outcome variable {outcome}."), + string = i18n$t("There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}."), summary.fun = mcar_validate, summary.fun.args = list( data = x, @@ -12923,6 +13096,7 @@ server <- function(input, output, session) { shiny::updateActionButton(inputId = "modal_browse", disabled = TRUE) shiny::updateActionButton(inputId = "modal_visual_overview", disabled = TRUE) shiny::updateActionButton(inputId = "act_eval", disabled = TRUE) + # shiny::updateActionButton(inputId = "act_miss", disabled = TRUE) # bslib::nav_hide(id = "main_panel", # target = "nav_visuals") @@ -12931,6 +13105,7 @@ server <- function(input, output, session) { shiny::updateActionButton(inputId = "modal_browse", disabled = FALSE) shiny::updateActionButton(inputId = "modal_visual_overview", disabled = FALSE) shiny::updateActionButton(inputId = "act_eval", disabled = FALSE) + # shiny::updateActionButton(inputId = "act_miss", disabled = FALSE) # bslib::nav_show(id = "main_panel", # target = "nav_visuals") @@ -12946,7 +13121,6 @@ server <- function(input, output, session) { }) - ############################################################################## ######### ######### Data modification section @@ -13185,12 +13359,13 @@ server <- function(input, output, session) { # mcar_validate(data=rv$missings()[["_data"]],outcome = input$missings_var) if (!is.null(rv$missings())) { req(rv$missings()) - req(input$missings_var) + # req(input$missings_var) + # browser() rv_validations$mcar <- make_validation( ls = validation_lib("mcar"), list( x = rv$missings()[["_data"]], - y = input$missings_var + y = attr(rv$missings(), "strat_var") ) ) } @@ -13523,8 +13698,6 @@ server <- function(input, output, session) { # }) - - shiny::observeEvent( list( input$act_eval @@ -13536,7 +13709,6 @@ server <- function(input, output, session) { shiny::req(rv$list$data) - parameters <- list( by.var = input$strat_var, add.p = input$add_p == "yes", @@ -13617,25 +13789,16 @@ server <- function(input, output, session) { cutoff = shiny::reactive(input$cor_cutoff) ) - shiny::observe( - output$missings_var <- shiny::renderUI({ - columnSelectInput( - inputId = "missings_var", - label = i18n$t("Select variable to stratify analysis"), - data = shiny::reactive({ - shiny::req(rv$data_filtered) - rv$data_filtered[apply(rv$data_filtered, 2, anyNA)] - })() - ) - }) - ) + ## Missingness evaluation + rv$missings <- data_missings_server( id = "missingness", - data = shiny::reactive(rv$data_filtered), - variable = shiny::reactive(input$missings_var) + data = shiny::reactive(rv$data_filtered) ) + + # shiny::observe({ # req(rv$missings()) # browser() diff --git a/app_docker/renv.lock b/app_docker/renv.lock index 548bff24..22b9f3d9 100644 --- a/app_docker/renv.lock +++ b/app_docker/renv.lock @@ -92,40 +92,40 @@ }, "DT": { "Package": "DT", - "Version": "0.33", + "Version": "0.34.0", "Source": "Repository", "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\")) )", + "Authors@R": "c( person(\"Yihui\", \"Xie\", role = \"aut\"), person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"), person(\"Xianying\", \"Tan\", role = \"aut\"), person(\"Garrick\", \"Aden-Buie\", , \"garrick@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-7111-0077\")), 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 = \"ctb\"), person(\"William\", \"Holmes\", role = \"ctb\"), person(\"Mikko\", \"Marttila\", role = \"ctb\"), person(\"Andres\", \"Quintero\", role = \"ctb\"), person(\"Stéphane\", \"Laurent\", role = \"ctb\"), person(\"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'.", + "License": "MIT + file LICENSE", "URL": "https://github.com/rstudio/DT", "BugReports": "https://github.com/rstudio/DT/issues", - "License": "GPL-3 | file LICENSE", "Imports": [ + "crosstalk", "htmltools (>= 0.3.6)", "htmlwidgets (>= 1.3)", - "httpuv", + "jquerylib", "jsonlite (>= 0.9.16)", "magrittr", - "crosstalk", - "jquerylib", "promises" ], "Suggests": [ + "bslib", + "future", + "httpuv", "knitr (>= 1.8)", "rmarkdown", "shiny (>= 1.6)", - "bslib", - "future", "testit", "tibble" ], "VignetteBuilder": "knitr", - "RoxygenNote": "7.3.1", "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", "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 ", + "Author": "Yihui Xie [aut], Joe Cheng [aut], Xianying Tan [aut], Garrick Aden-Buie [aut, cre] (ORCID: ), 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": "Garrick Aden-Buie ", "Repository": "CRAN" }, "Formula": { @@ -148,31 +148,32 @@ }, "GenSA": { "Package": "GenSA", - "Version": "1.1.14.1", + "Version": "1.1.15", "Source": "Repository", "Type": "Package", "Title": "R Functions for Generalized Simulated Annealing", - "Date": "2024-01-22", - "Author": "Sylvain Gubian, Yang Xiang, Brian Suomela, Julia Hoeng, PMP SA.", + "Date": "2025-11-16", + "Authors@R": "c(person(given = \"Sylvain\", family = \"Gubian\", role = c(\"aut\", \"cre\"), email = \"DL.RSupport@pmi.com\"), person(given = \"Yang\", family = \"Xiang\", role = \"aut\"), person(given = \"Brian\", family = \"Suomela\", role = \"aut\"), person(given = \"Julia\", family = \"Hoeng\", role = \"aut\"), person(given = \"PMP\", family = \"SA.\", role = \"aut\"))", "Maintainer": "Sylvain Gubian ", "Depends": [ "R (>= 2.12.0)" ], "Description": "Performs search for global minimum of a very complex non-linear objective function with a very large number of optima.", "License": "GPL-2", + "Encoding": "UTF-8", "LazyLoad": "yes", "NeedsCompilation": "yes", "Repository": "CRAN", - "RoxygenNote": "7.2.3" + "RoxygenNote": "7.3.3", + "Author": "Sylvain Gubian [aut, cre], Yang Xiang [aut], Brian Suomela [aut], Julia Hoeng [aut], PMP SA. [aut]" }, "Hmisc": { "Package": "Hmisc", - "Version": "5.2-3", + "Version": "5.2-4", "Source": "Repository", - "Date": "2025-03-16", + "Date": "2025-10-02", "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 ", + "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 = \"Cole\", family = \"Beck\", role = c(\"ctb\"), email = \"cole.beck@vumc.org\" ), person(given = \"Charles\", family = \"Dupont\", role = \"ctb\") )", "Depends": [ "R (>= 4.2.0)" ], @@ -188,7 +189,7 @@ "gridExtra", "data.table", "htmlTable (>= 1.11.0)", - "viridis", + "viridisLite", "htmltools", "base64enc", "colorspace", @@ -207,7 +208,6 @@ "tables", "plotly (>= 4.5.6)", "rlang", - "plyr", "VGAM", "leaps", "pcaPP", @@ -227,16 +227,18 @@ "getPass", "keyring", "safer", - "htm2txt" + "htm2txt", + "boot" ], "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", + "RoxygenNote": "7.3.3", "NeedsCompilation": "yes", - "Author": "Frank E Harrell Jr [aut, cre] (), Charles Dupont [ctb] (contributed several functions and maintains latex functions)", + "Author": "Frank E Harrell Jr [aut, cre] (ORCID: ), Cole Beck [ctb], Charles Dupont [ctb]", + "Maintainer": "Frank E Harrell Jr ", "Repository": "CRAN" }, "IDEAFilter": { @@ -343,10 +345,10 @@ }, "Matrix": { "Package": "Matrix", - "Version": "1.7-3", + "Version": "1.7-4", "Source": "Repository", "VersionNote": "do also bump src/version.h, inst/include/Matrix/version.h", - "Date": "2025-03-05", + "Date": "2025-08-27", "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.", @@ -382,7 +384,7 @@ "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)", + "Author": "Douglas Bates [aut] (ORCID: ), Martin Maechler [aut, cre] (ORCID: ), Mikael Jagan [aut] (ORCID: ), Timothy A. Davis [ctb] (ORCID: , SuiteSparse libraries, collaborators listed in dir(system.file(\"doc\", \"SuiteSparse\", package=\"Matrix\"), pattern=\"License\", full.names=TRUE, recursive=TRUE)), George Karypis [ctb] (ORCID: , METIS library, Copyright: Regents of the University of Minnesota), Jason Riedy [ctb] (ORCID: , GNU Octave's condest() and onenormest(), Copyright: Regents of the University of California), Jens Oehlschlägel [ctb] (initial nearPD()), R Core Team [ctb] (ROR: , base R's matrix implementation)", "Maintainer": "Martin Maechler ", "Repository": "CRAN" }, @@ -597,7 +599,7 @@ }, "REDCapR": { "Package": "REDCapR", - "Version": "1.5.0", + "Version": "1.6.0", "Source": "Repository", "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.", @@ -605,7 +607,7 @@ "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 (>= 4.1.0)" + "R(>= 3.5.0)" ], "Imports": [ "checkmate (>= 2.0)", @@ -636,7 +638,7 @@ "License": "MIT + file LICENSE", "VignetteBuilder": "knitr", "Encoding": "UTF-8", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Config/testthat/edition": "3", "Language": "en-US", "NeedsCompilation": "no", @@ -675,13 +677,13 @@ }, "RcppArmadillo": { "Package": "RcppArmadillo", - "Version": "14.6.0-1", + "Version": "15.2.2-1", "Source": "Repository", "Type": "Package", "Title": "'Rcpp' Integration for the 'Armadillo' Templated Linear Algebra Library", - "Date": "2025-07-02", + "Date": "2025-11-21", "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(\"Doug\", \"Bates\", role = \"aut\", comment = c(ORCID = \"0000-0001-8316-9503\")), person(\"Binxiang\", \"Ni\", role = \"aut\"), person(\"Conrad\", \"Sanderson\", role = \"aut\", comment = c(ORCID = \"0000-0002-0049-4501\")))", - "Description": "'Armadillo' is a templated C++ linear algebra library (by Conrad Sanderson) that aims towards a good balance between speed and ease of use. Integer, floating point and complex numbers are supported, as well as a subset of trigonometric and statistics functions. Various matrix decompositions are provided through optional integration with LAPACK and ATLAS libraries. The 'RcppArmadillo' package includes the header files from the templated 'Armadillo' library. Thus users do not need to install 'Armadillo' itself in order to use 'RcppArmadillo'. From release 7.800.0 on, 'Armadillo' is licensed under Apache License 2; previous releases were under licensed as MPL 2.0 from version 3.800.0 onwards and LGPL-3 prior to that; 'RcppArmadillo' (the 'Rcpp' bindings/bridge to Armadillo) is licensed under the GNU GPL version 2 or later, as is the rest of 'Rcpp'.", + "Description": "'Armadillo' is a templated C++ linear algebra library aiming towards a good balance between speed and ease of use. It provides high-level syntax and functionality deliberately similar to Matlab. It is useful for algorithm development directly in C++, or quick conversion of research code into production environments. It provides efficient classes for vectors, matrices and cubes where dense and sparse matrices are supported. Integer, floating point and complex numbers are supported. A sophisticated expression evaluator (based on template meta-programming) automatically combines several operations to increase speed and efficiency. Dynamic evaluation automatically chooses optimal code paths based on detected matrix structures. Matrix decompositions are provided through integration with LAPACK, or one of its high performance drop-in replacements (such as 'MKL' or 'OpenBLAS'). It can automatically use 'OpenMP' multi-threading (parallelisation) to speed up computationally expensive operations. . The 'RcppArmadillo' package includes the header files from the 'Armadillo' library; users do not need to install 'Armadillo' itself in order to use 'RcppArmadillo'. Starting from release 15.0.0, the minimum compilation standard is C++14 so 'Armadillo' version 14.6.3 is included as a fallback when an R package forces the C++11 standard. Package authors should set a '#define' to select the 'current' version, or select the 'legacy' version (also chosen as default) if they must. See 'GitHub issue #475' for details. . Since release 7.800.0, 'Armadillo' is licensed under Apache License 2; previous releases were under licensed as MPL 2.0 from version 3.800.0 onwards and LGPL-3 prior to that; 'RcppArmadillo' (the 'Rcpp' bindings/bridge to Armadillo) is licensed under the GNU GPL version 2 or later, as is the rest of 'Rcpp'.", "License": "GPL (>= 2)", "LazyLoad": "yes", "Depends": [ @@ -782,14 +784,53 @@ "Maintainer": "Georgi N. Boshnakov ", "Repository": "CRAN" }, + "S7": { + "Package": "S7", + "Version": "0.2.1", + "Source": "Repository", + "Title": "An Object Oriented System Meant to Become a Successor to S3 and S4", + "Authors@R": "c( person(\"Object-Oriented Programming Working Group\", role = \"cph\"), person(\"Davis\", \"Vaughan\", role = \"aut\"), person(\"Jim\", \"Hester\", role = \"aut\", comment = c(ORCID = \"0000-0002-2739-7082\")), person(\"Tomasz\", \"Kalinowski\", role = \"aut\"), person(\"Will\", \"Landau\", role = \"aut\"), person(\"Michael\", \"Lawrence\", role = \"aut\"), person(\"Martin\", \"Maechler\", role = \"aut\", comment = c(ORCID = \"0000-0002-8685-9910\")), person(\"Luke\", \"Tierney\", role = \"aut\"), person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-4757-117X\")) )", + "Description": "A new object oriented programming system designed to be a successor to S3 and S4. It includes formal class, generic, and method specification, and a limited form of multiple dispatch. It has been designed and implemented collaboratively by the R Consortium Object-Oriented Programming Working Group, which includes representatives from R-Core, 'Bioconductor', 'Posit'/'tidyverse', and the wider R community.", + "License": "MIT + file LICENSE", + "URL": "https://rconsortium.github.io/S7/, https://github.com/RConsortium/S7", + "BugReports": "https://github.com/RConsortium/S7/issues", + "Depends": [ + "R (>= 3.5.0)" + ], + "Imports": [ + "utils" + ], + "Suggests": [ + "bench", + "callr", + "covr", + "knitr", + "methods", + "rmarkdown", + "testthat (>= 3.2.0)", + "tibble" + ], + "VignetteBuilder": "knitr", + "Config/build/compilation-database": "true", + "Config/Needs/website": "sloop", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "TRUE", + "Config/testthat/start-first": "external-generic", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.3", + "NeedsCompilation": "yes", + "Author": "Object-Oriented Programming Working Group [cph], Davis Vaughan [aut], Jim Hester [aut] (ORCID: ), Tomasz Kalinowski [aut], Will Landau [aut], Michael Lawrence [aut], Martin Maechler [aut] (ORCID: ), Luke Tierney [aut], Hadley Wickham [aut, cre] (ORCID: )", + "Maintainer": "Hadley Wickham ", + "Repository": "CRAN" + }, "V8": { "Package": "V8", - "Version": "6.0.6", + "Version": "8.0.1", "Source": "Repository", "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.", + "Authors@R": "c( person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\", comment = c(ORCID = \"0000-0002-4035-0289\")), person(\"George\", \"Stagg\", role = \"ctb\", comment = c(ORCID = \"0009-0006-3173-9846\")), 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 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", @@ -814,7 +855,7 @@ "Language": "en-US", "Encoding": "UTF-8", "Biarch": "true", - "Author": "Jeroen Ooms [aut, cre] (ORCID: ), Jan Marvin Garbuszus [ctb]", + "Author": "Jeroen Ooms [aut, cre] (ORCID: ), George Stagg [ctb] (ORCID: ), Jan Marvin Garbuszus [ctb]", "Maintainer": "Jeroen Ooms ", "Repository": "CRAN" }, @@ -989,7 +1030,7 @@ }, "bayestestR": { "Package": "bayestestR", - "Version": "0.16.1", + "Version": "0.17.0", "Source": "Repository", "Type": "Package", "Title": "Understand and Describe Bayesian Models and Posterior Distributions", @@ -1000,8 +1041,8 @@ "R (>= 3.6)" ], "Imports": [ - "insight (>= 1.3.1)", - "datawizard (>= 1.1.0)", + "insight (>= 1.4.1)", + "datawizard (>= 1.2.0)", "graphics", "methods", "stats", @@ -1030,7 +1071,7 @@ "lavaan", "lme4", "logspline (>= 2.1.21)", - "marginaleffects (>= 0.26.0)", + "marginaleffects (>= 0.29.0)", "MASS", "mclust", "mediation", @@ -1047,6 +1088,7 @@ "rstanarm", "see (>= 0.8.5)", "testthat", + "tinytable", "tweedie", "withr" ], @@ -1178,15 +1220,15 @@ }, "boot": { "Package": "boot", - "Version": "1.3-31", + "Version": "1.3-32", "Source": "Repository", "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\"))", + "Date": "2025-08-29", + "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 = \"Brian.Ripley@R-project.org\", 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)", + "Title": "Bootstrap Functions", "Depends": [ "R (>= 3.0.0)", "graphics", @@ -1201,8 +1243,7 @@ "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": "RSPM", - "Encoding": "UTF-8" + "Repository": "CRAN" }, "brio": { "Package": "brio", @@ -1232,11 +1273,11 @@ }, "broom": { "Package": "broom", - "Version": "1.0.9", + "Version": "1.0.11", "Source": "Repository", "Type": "Package", "Title": "Convert Statistical Objects into Tidy Tibbles", - "Authors@R": "c( person(\"David\", \"Robinson\", , \"admiral.david@gmail.com\", role = \"aut\"), person(\"Alex\", \"Hayes\", , \"alexpghayes@gmail.com\", role = \"aut\", comment = c(ORCID = \"0000-0002-4985-5160\")), person(\"Simon\", \"Couch\", , \"simon.couch@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0001-5676-5107\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")), person(\"Indrajeet\", \"Patil\", , \"patilindrajeet.science@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(\"Derek\", \"Chiu\", , \"dchiu@bccrc.ca\", role = \"ctb\"), person(\"Matthieu\", \"Gomez\", , \"mattg@princeton.edu\", role = \"ctb\"), person(\"Boris\", \"Demeshev\", , \"boris.demeshev@gmail.com\", role = \"ctb\"), person(\"Dieter\", \"Menne\", , \"dieter.menne@menne-biomed.de\", role = \"ctb\"), person(\"Benjamin\", \"Nutter\", , \"nutter@battelle.org\", role = \"ctb\"), person(\"Luke\", \"Johnston\", , \"luke.johnston@mail.utoronto.ca\", role = \"ctb\"), person(\"Ben\", \"Bolker\", , \"bolker@mcmaster.ca\", role = \"ctb\"), person(\"Francois\", \"Briatte\", , \"f.briatte@gmail.com\", role = \"ctb\"), person(\"Jeffrey\", \"Arnold\", , \"jeffrey.arnold@gmail.com\", role = \"ctb\"), person(\"Jonah\", \"Gabry\", , \"jsg2201@columbia.edu\", role = \"ctb\"), person(\"Luciano\", \"Selzer\", , \"luciano.selzer@gmail.com\", role = \"ctb\"), person(\"Gavin\", \"Simpson\", , \"ucfagls@gmail.com\", role = \"ctb\"), person(\"Jens\", \"Preussner\", , \"jens.preussner@mpi-bn.mpg.de\", role = \"ctb\"), person(\"Jay\", \"Hesselberth\", , \"jay.hesselberth@gmail.com\", role = \"ctb\"), person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"ctb\"), person(\"Matthew\", \"Lincoln\", , \"matthew.d.lincoln@gmail.com\", role = \"ctb\"), person(\"Alessandro\", \"Gasparini\", , \"ag475@leicester.ac.uk\", role = \"ctb\"), person(\"Lukasz\", \"Komsta\", , \"lukasz.komsta@umlub.pl\", role = \"ctb\"), person(\"Frederick\", \"Novometsky\", role = \"ctb\"), person(\"Wilson\", \"Freitas\", role = \"ctb\"), person(\"Michelle\", \"Evans\", role = \"ctb\"), person(\"Jason Cory\", \"Brunson\", , \"cornelioid@gmail.com\", role = \"ctb\"), person(\"Simon\", \"Jackson\", , \"drsimonjackson@gmail.com\", role = \"ctb\"), person(\"Ben\", \"Whalley\", , \"ben.whalley@plymouth.ac.uk\", role = \"ctb\"), person(\"Karissa\", \"Whiting\", , \"karissa.whiting@gmail.com\", role = \"ctb\"), person(\"Yves\", \"Rosseel\", , \"yrosseel@gmail.com\", role = \"ctb\"), person(\"Michael\", \"Kuehn\", , \"mkuehn10@gmail.com\", role = \"ctb\"), person(\"Jorge\", \"Cimentada\", , \"cimentadaj@gmail.com\", role = \"ctb\"), person(\"Erle\", \"Holgersen\", , \"erle.holgersen@gmail.com\", role = \"ctb\"), person(\"Karl\", \"Dunkle Werner\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0523-7309\")), person(\"Ethan\", \"Christensen\", , \"christensen.ej@gmail.com\", role = \"ctb\"), person(\"Steven\", \"Pav\", , \"shabbychef@gmail.com\", role = \"ctb\"), person(\"Paul\", \"PJ\", , \"pjpaul.stephens@gmail.com\", role = \"ctb\"), person(\"Ben\", \"Schneider\", , \"benjamin.julius.schneider@gmail.com\", role = \"ctb\"), person(\"Patrick\", \"Kennedy\", , \"pkqstr@protonmail.com\", role = \"ctb\"), person(\"Lily\", \"Medina\", , \"lilymiru@gmail.com\", role = \"ctb\"), person(\"Brian\", \"Fannin\", , \"captain@pirategrunt.com\", role = \"ctb\"), person(\"Jason\", \"Muhlenkamp\", , \"jason.muhlenkamp@gmail.com\", role = \"ctb\"), person(\"Matt\", \"Lehman\", role = \"ctb\"), person(\"Bill\", \"Denney\", , \"wdenney@humanpredictions.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-5759-428X\")), person(\"Nic\", \"Crane\", role = \"ctb\"), person(\"Andrew\", \"Bates\", role = \"ctb\"), person(\"Vincent\", \"Arel-Bundock\", , \"vincent.arel-bundock@umontreal.ca\", role = \"ctb\", comment = c(ORCID = \"0000-0003-2042-7063\")), person(\"Hideaki\", \"Hayashi\", role = \"ctb\"), person(\"Luis\", \"Tobalina\", role = \"ctb\"), person(\"Annie\", \"Wang\", , \"anniewang.uc@gmail.com\", role = \"ctb\"), person(\"Wei Yang\", \"Tham\", , \"weiyang.tham@gmail.com\", role = \"ctb\"), person(\"Clara\", \"Wang\", , \"clara.wang.94@gmail.com\", role = \"ctb\"), person(\"Abby\", \"Smith\", , \"als1@u.northwestern.edu\", role = \"ctb\", comment = c(ORCID = \"0000-0002-3207-0375\")), person(\"Jasper\", \"Cooper\", , \"jaspercooper@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8639-3188\")), person(\"E Auden\", \"Krauska\", , \"krauskae@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-1466-5850\")), person(\"Alex\", \"Wang\", , \"x249wang@uwaterloo.ca\", role = \"ctb\"), person(\"Malcolm\", \"Barrett\", , \"malcolmbarrett@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0299-5825\")), person(\"Charles\", \"Gray\", , \"charlestigray@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-9978-011X\")), person(\"Jared\", \"Wilber\", role = \"ctb\"), person(\"Vilmantas\", \"Gegzna\", , \"GegznaV@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-9500-5167\")), person(\"Eduard\", \"Szoecs\", , \"eduardszoecs@gmail.com\", role = \"ctb\"), person(\"Frederik\", \"Aust\", , \"frederik.aust@uni-koeln.de\", role = \"ctb\", comment = c(ORCID = \"0000-0003-4900-788X\")), person(\"Angus\", \"Moore\", , \"angusmoore9@gmail.com\", role = \"ctb\"), person(\"Nick\", \"Williams\", , \"ntwilliams.personal@gmail.com\", role = \"ctb\"), person(\"Marius\", \"Barth\", , \"marius.barth.uni.koeln@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-3421-6665\")), person(\"Bruna\", \"Wundervald\", , \"brunadaviesw@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0001-8163-220X\")), person(\"Joyce\", \"Cahoon\", , \"joyceyu48@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0001-7217-4702\")), person(\"Grant\", \"McDermott\", , \"grantmcd@uoregon.edu\", role = \"ctb\", comment = c(ORCID = \"0000-0001-7883-8573\")), person(\"Kevin\", \"Zarca\", , \"kevin.zarca@gmail.com\", role = \"ctb\"), person(\"Shiro\", \"Kuriwaki\", , \"shirokuriwaki@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-5687-2647\")), person(\"Lukas\", \"Wallrich\", , \"lukas.wallrich@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0003-2121-5177\")), person(\"James\", \"Martherus\", , \"james@martherus.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8285-3300\")), person(\"Chuliang\", \"Xiao\", , \"cxiao@umich.edu\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8466-9398\")), person(\"Joseph\", \"Larmarange\", , \"joseph@larmarange.net\", role = \"ctb\"), person(\"Max\", \"Kuhn\", , \"max@posit.co\", role = \"ctb\"), person(\"Michal\", \"Bojanowski\", , \"michal2992@gmail.com\", role = \"ctb\"), person(\"Hakon\", \"Malmedal\", , \"hmalmedal@gmail.com\", role = \"ctb\"), person(\"Clara\", \"Wang\", role = \"ctb\"), person(\"Sergio\", \"Oller\", , \"sergioller@gmail.com\", role = \"ctb\"), person(\"Luke\", \"Sonnet\", , \"luke.sonnet@gmail.com\", role = \"ctb\"), person(\"Jim\", \"Hester\", , \"jim.hester@posit.co\", role = \"ctb\"), person(\"Ben\", \"Schneider\", , \"benjamin.julius.schneider@gmail.com\", role = \"ctb\"), person(\"Bernie\", \"Gray\", , \"bfgray3@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0001-9190-6032\")), person(\"Mara\", \"Averick\", , \"mara@posit.co\", role = \"ctb\"), person(\"Aaron\", \"Jacobs\", , \"atheriel@gmail.com\", role = \"ctb\"), person(\"Andreas\", \"Bender\", , \"bender.at.R@gmail.com\", role = \"ctb\"), person(\"Sven\", \"Templer\", , \"sven.templer@gmail.com\", role = \"ctb\"), person(\"Paul-Christian\", \"Buerkner\", , \"paul.buerkner@gmail.com\", role = \"ctb\"), person(\"Matthew\", \"Kay\", , \"mjskay@umich.edu\", role = \"ctb\"), person(\"Erwan\", \"Le Pennec\", , \"lepennec@gmail.com\", role = \"ctb\"), person(\"Johan\", \"Junkka\", , \"johan.junkka@umu.se\", role = \"ctb\"), person(\"Hao\", \"Zhu\", , \"haozhu233@gmail.com\", role = \"ctb\"), person(\"Benjamin\", \"Soltoff\", , \"soltoffbc@uchicago.edu\", role = \"ctb\"), person(\"Zoe\", \"Wilkinson Saldana\", , \"zoewsaldana@gmail.com\", role = \"ctb\"), person(\"Tyler\", \"Littlefield\", , \"tylurp1@gmail.com\", role = \"ctb\"), person(\"Charles T.\", \"Gray\", , \"charlestigray@gmail.com\", role = \"ctb\"), person(\"Shabbh E.\", \"Banks\", role = \"ctb\"), person(\"Serina\", \"Robinson\", , \"robi0916@umn.edu\", role = \"ctb\"), person(\"Roger\", \"Bivand\", , \"Roger.Bivand@nhh.no\", role = \"ctb\"), person(\"Riinu\", \"Ots\", , \"riinuots@gmail.com\", role = \"ctb\"), person(\"Nicholas\", \"Williams\", , \"ntwilliams.personal@gmail.com\", role = \"ctb\"), person(\"Nina\", \"Jakobsen\", role = \"ctb\"), person(\"Michael\", \"Weylandt\", , \"michael.weylandt@gmail.com\", role = \"ctb\"), person(\"Lisa\", \"Lendway\", , \"llendway@macalester.edu\", role = \"ctb\"), person(\"Karl\", \"Hailperin\", , \"khailper@gmail.com\", role = \"ctb\"), person(\"Josue\", \"Rodriguez\", , \"jerrodriguez@ucdavis.edu\", role = \"ctb\"), person(\"Jenny\", \"Bryan\", , \"jenny@posit.co\", role = \"ctb\"), person(\"Chris\", \"Jarvis\", , \"Christopher1.jarvis@gmail.com\", role = \"ctb\"), person(\"Greg\", \"Macfarlane\", , \"gregmacfarlane@gmail.com\", role = \"ctb\"), person(\"Brian\", \"Mannakee\", , \"bmannakee@gmail.com\", role = \"ctb\"), person(\"Drew\", \"Tyre\", , \"atyre2@unl.edu\", role = \"ctb\"), person(\"Shreyas\", \"Singh\", , \"shreyas.singh.298@gmail.com\", role = \"ctb\"), person(\"Laurens\", \"Geffert\", , \"laurensgeffert@gmail.com\", role = \"ctb\"), person(\"Hong\", \"Ooi\", , \"hongooi@microsoft.com\", role = \"ctb\"), person(\"Henrik\", \"Bengtsson\", , \"henrikb@braju.com\", role = \"ctb\"), person(\"Eduard\", \"Szocs\", , \"eduardszoecs@gmail.com\", role = \"ctb\"), person(\"David\", \"Hugh-Jones\", , \"davidhughjones@gmail.com\", role = \"ctb\"), person(\"Matthieu\", \"Stigler\", , \"Matthieu.Stigler@gmail.com\", role = \"ctb\"), person(\"Hugo\", \"Tavares\", , \"hm533@cam.ac.uk\", role = \"ctb\", comment = c(ORCID = \"0000-0001-9373-2726\")), person(\"R. Willem\", \"Vervoort\", , \"Willemvervoort@gmail.com\", role = \"ctb\"), person(\"Brenton M.\", \"Wiernik\", , \"brenton@wiernik.org\", role = \"ctb\"), person(\"Josh\", \"Yamamoto\", , \"joshuayamamoto5@gmail.com\", role = \"ctb\"), person(\"Jasme\", \"Lee\", role = \"ctb\"), person(\"Taren\", \"Sanders\", , \"taren.sanders@acu.edu.au\", role = \"ctb\", comment = c(ORCID = \"0000-0002-4504-6008\")), person(\"Ilaria\", \"Prosdocimi\", , \"prosdocimi.ilaria@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0001-8565-094X\")), person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0862-2018\")), person(\"Alex\", \"Reinhart\", , \"areinhar@stat.cmu.edu\", role = \"ctb\", comment = c(ORCID = \"0000-0002-6658-514X\")) )", + "Authors@R": "c( person(\"David\", \"Robinson\", , \"admiral.david@gmail.com\", role = \"aut\"), person(\"Alex\", \"Hayes\", , \"alexpghayes@gmail.com\", role = \"aut\", comment = c(ORCID = \"0000-0002-4985-5160\")), person(\"Simon\", \"Couch\", , \"simon.couch@posit.co\", role = c(\"aut\"), comment = c(ORCID = \"0000-0001-5676-5107\")), person(\"Emil\", \"Hvitfeldt\", , \"emil.hvitfeldt@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-0679-1945\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")), person(\"Indrajeet\", \"Patil\", , \"patilindrajeet.science@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(\"Derek\", \"Chiu\", , \"dchiu@bccrc.ca\", role = \"ctb\"), person(\"Matthieu\", \"Gomez\", , \"mattg@princeton.edu\", role = \"ctb\"), person(\"Boris\", \"Demeshev\", , \"boris.demeshev@gmail.com\", role = \"ctb\"), person(\"Dieter\", \"Menne\", , \"dieter.menne@menne-biomed.de\", role = \"ctb\"), person(\"Benjamin\", \"Nutter\", , \"nutter@battelle.org\", role = \"ctb\"), person(\"Luke\", \"Johnston\", , \"luke.johnston@mail.utoronto.ca\", role = \"ctb\"), person(\"Ben\", \"Bolker\", , \"bolker@mcmaster.ca\", role = \"ctb\"), person(\"Francois\", \"Briatte\", , \"f.briatte@gmail.com\", role = \"ctb\"), person(\"Jeffrey\", \"Arnold\", , \"jeffrey.arnold@gmail.com\", role = \"ctb\"), person(\"Jonah\", \"Gabry\", , \"jsg2201@columbia.edu\", role = \"ctb\"), person(\"Luciano\", \"Selzer\", , \"luciano.selzer@gmail.com\", role = \"ctb\"), person(\"Gavin\", \"Simpson\", , \"ucfagls@gmail.com\", role = \"ctb\"), person(\"Jens\", \"Preussner\", , \"jens.preussner@mpi-bn.mpg.de\", role = \"ctb\"), person(\"Jay\", \"Hesselberth\", , \"jay.hesselberth@gmail.com\", role = \"ctb\"), person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"ctb\"), person(\"Matthew\", \"Lincoln\", , \"matthew.d.lincoln@gmail.com\", role = \"ctb\"), person(\"Alessandro\", \"Gasparini\", , \"ag475@leicester.ac.uk\", role = \"ctb\"), person(\"Lukasz\", \"Komsta\", , \"lukasz.komsta@umlub.pl\", role = \"ctb\"), person(\"Frederick\", \"Novometsky\", role = \"ctb\"), person(\"Wilson\", \"Freitas\", role = \"ctb\"), person(\"Michelle\", \"Evans\", role = \"ctb\"), person(\"Jason Cory\", \"Brunson\", , \"cornelioid@gmail.com\", role = \"ctb\"), person(\"Simon\", \"Jackson\", , \"drsimonjackson@gmail.com\", role = \"ctb\"), person(\"Ben\", \"Whalley\", , \"ben.whalley@plymouth.ac.uk\", role = \"ctb\"), person(\"Karissa\", \"Whiting\", , \"karissa.whiting@gmail.com\", role = \"ctb\"), person(\"Yves\", \"Rosseel\", , \"yrosseel@gmail.com\", role = \"ctb\"), person(\"Michael\", \"Kuehn\", , \"mkuehn10@gmail.com\", role = \"ctb\"), person(\"Jorge\", \"Cimentada\", , \"cimentadaj@gmail.com\", role = \"ctb\"), person(\"Erle\", \"Holgersen\", , \"erle.holgersen@gmail.com\", role = \"ctb\"), person(\"Karl\", \"Dunkle Werner\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0523-7309\")), person(\"Ethan\", \"Christensen\", , \"christensen.ej@gmail.com\", role = \"ctb\"), person(\"Steven\", \"Pav\", , \"shabbychef@gmail.com\", role = \"ctb\"), person(\"Paul\", \"PJ\", , \"pjpaul.stephens@gmail.com\", role = \"ctb\"), person(\"Ben\", \"Schneider\", , \"benjamin.julius.schneider@gmail.com\", role = \"ctb\"), person(\"Patrick\", \"Kennedy\", , \"pkqstr@protonmail.com\", role = \"ctb\"), person(\"Lily\", \"Medina\", , \"lilymiru@gmail.com\", role = \"ctb\"), person(\"Brian\", \"Fannin\", , \"captain@pirategrunt.com\", role = \"ctb\"), person(\"Jason\", \"Muhlenkamp\", , \"jason.muhlenkamp@gmail.com\", role = \"ctb\"), person(\"Matt\", \"Lehman\", role = \"ctb\"), person(\"Bill\", \"Denney\", , \"wdenney@humanpredictions.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-5759-428X\")), person(\"Nic\", \"Crane\", role = \"ctb\"), person(\"Andrew\", \"Bates\", role = \"ctb\"), person(\"Vincent\", \"Arel-Bundock\", , \"vincent.arel-bundock@umontreal.ca\", role = \"ctb\", comment = c(ORCID = \"0000-0003-2042-7063\")), person(\"Hideaki\", \"Hayashi\", role = \"ctb\"), person(\"Luis\", \"Tobalina\", role = \"ctb\"), person(\"Annie\", \"Wang\", , \"anniewang.uc@gmail.com\", role = \"ctb\"), person(\"Wei Yang\", \"Tham\", , \"weiyang.tham@gmail.com\", role = \"ctb\"), person(\"Clara\", \"Wang\", , \"clara.wang.94@gmail.com\", role = \"ctb\"), person(\"Abby\", \"Smith\", , \"als1@u.northwestern.edu\", role = \"ctb\", comment = c(ORCID = \"0000-0002-3207-0375\")), person(\"Jasper\", \"Cooper\", , \"jaspercooper@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8639-3188\")), person(\"E Auden\", \"Krauska\", , \"krauskae@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-1466-5850\")), person(\"Alex\", \"Wang\", , \"x249wang@uwaterloo.ca\", role = \"ctb\"), person(\"Malcolm\", \"Barrett\", , \"malcolmbarrett@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0299-5825\")), person(\"Charles\", \"Gray\", , \"charlestigray@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-9978-011X\")), person(\"Jared\", \"Wilber\", role = \"ctb\"), person(\"Vilmantas\", \"Gegzna\", , \"GegznaV@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-9500-5167\")), person(\"Eduard\", \"Szoecs\", , \"eduardszoecs@gmail.com\", role = \"ctb\"), person(\"Frederik\", \"Aust\", , \"frederik.aust@uni-koeln.de\", role = \"ctb\", comment = c(ORCID = \"0000-0003-4900-788X\")), person(\"Angus\", \"Moore\", , \"angusmoore9@gmail.com\", role = \"ctb\"), person(\"Nick\", \"Williams\", , \"ntwilliams.personal@gmail.com\", role = \"ctb\"), person(\"Marius\", \"Barth\", , \"marius.barth.uni.koeln@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-3421-6665\")), person(\"Bruna\", \"Wundervald\", , \"brunadaviesw@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0001-8163-220X\")), person(\"Joyce\", \"Cahoon\", , \"joyceyu48@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0001-7217-4702\")), person(\"Grant\", \"McDermott\", , \"grantmcd@uoregon.edu\", role = \"ctb\", comment = c(ORCID = \"0000-0001-7883-8573\")), person(\"Kevin\", \"Zarca\", , \"kevin.zarca@gmail.com\", role = \"ctb\"), person(\"Shiro\", \"Kuriwaki\", , \"shirokuriwaki@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-5687-2647\")), person(\"Lukas\", \"Wallrich\", , \"lukas.wallrich@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0003-2121-5177\")), person(\"James\", \"Martherus\", , \"james@martherus.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8285-3300\")), person(\"Chuliang\", \"Xiao\", , \"cxiao@umich.edu\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8466-9398\")), person(\"Joseph\", \"Larmarange\", , \"joseph@larmarange.net\", role = \"ctb\"), person(\"Max\", \"Kuhn\", , \"max@posit.co\", role = \"ctb\"), person(\"Michal\", \"Bojanowski\", , \"michal2992@gmail.com\", role = \"ctb\"), person(\"Hakon\", \"Malmedal\", , \"hmalmedal@gmail.com\", role = \"ctb\"), person(\"Clara\", \"Wang\", role = \"ctb\"), person(\"Sergio\", \"Oller\", , \"sergioller@gmail.com\", role = \"ctb\"), person(\"Luke\", \"Sonnet\", , \"luke.sonnet@gmail.com\", role = \"ctb\"), person(\"Jim\", \"Hester\", , \"jim.hester@posit.co\", role = \"ctb\"), person(\"Ben\", \"Schneider\", , \"benjamin.julius.schneider@gmail.com\", role = \"ctb\"), person(\"Bernie\", \"Gray\", , \"bfgray3@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0001-9190-6032\")), person(\"Mara\", \"Averick\", , \"mara@posit.co\", role = \"ctb\"), person(\"Aaron\", \"Jacobs\", , \"atheriel@gmail.com\", role = \"ctb\"), person(\"Andreas\", \"Bender\", , \"bender.at.R@gmail.com\", role = \"ctb\"), person(\"Sven\", \"Templer\", , \"sven.templer@gmail.com\", role = \"ctb\"), person(\"Paul-Christian\", \"Buerkner\", , \"paul.buerkner@gmail.com\", role = \"ctb\"), person(\"Matthew\", \"Kay\", , \"mjskay@umich.edu\", role = \"ctb\"), person(\"Erwan\", \"Le Pennec\", , \"lepennec@gmail.com\", role = \"ctb\"), person(\"Johan\", \"Junkka\", , \"johan.junkka@umu.se\", role = \"ctb\"), person(\"Hao\", \"Zhu\", , \"haozhu233@gmail.com\", role = \"ctb\"), person(\"Benjamin\", \"Soltoff\", , \"soltoffbc@uchicago.edu\", role = \"ctb\"), person(\"Zoe\", \"Wilkinson Saldana\", , \"zoewsaldana@gmail.com\", role = \"ctb\"), person(\"Tyler\", \"Littlefield\", , \"tylurp1@gmail.com\", role = \"ctb\"), person(\"Charles T.\", \"Gray\", , \"charlestigray@gmail.com\", role = \"ctb\"), person(\"Shabbh E.\", \"Banks\", role = \"ctb\"), person(\"Serina\", \"Robinson\", , \"robi0916@umn.edu\", role = \"ctb\"), person(\"Roger\", \"Bivand\", , \"Roger.Bivand@nhh.no\", role = \"ctb\"), person(\"Riinu\", \"Ots\", , \"riinuots@gmail.com\", role = \"ctb\"), person(\"Nicholas\", \"Williams\", , \"ntwilliams.personal@gmail.com\", role = \"ctb\"), person(\"Nina\", \"Jakobsen\", role = \"ctb\"), person(\"Michael\", \"Weylandt\", , \"michael.weylandt@gmail.com\", role = \"ctb\"), person(\"Lisa\", \"Lendway\", , \"llendway@macalester.edu\", role = \"ctb\"), person(\"Karl\", \"Hailperin\", , \"khailper@gmail.com\", role = \"ctb\"), person(\"Josue\", \"Rodriguez\", , \"jerrodriguez@ucdavis.edu\", role = \"ctb\"), person(\"Jenny\", \"Bryan\", , \"jenny@posit.co\", role = \"ctb\"), person(\"Chris\", \"Jarvis\", , \"Christopher1.jarvis@gmail.com\", role = \"ctb\"), person(\"Greg\", \"Macfarlane\", , \"gregmacfarlane@gmail.com\", role = \"ctb\"), person(\"Brian\", \"Mannakee\", , \"bmannakee@gmail.com\", role = \"ctb\"), person(\"Drew\", \"Tyre\", , \"atyre2@unl.edu\", role = \"ctb\"), person(\"Shreyas\", \"Singh\", , \"shreyas.singh.298@gmail.com\", role = \"ctb\"), person(\"Laurens\", \"Geffert\", , \"laurensgeffert@gmail.com\", role = \"ctb\"), person(\"Hong\", \"Ooi\", , \"hongooi@microsoft.com\", role = \"ctb\"), person(\"Henrik\", \"Bengtsson\", , \"henrikb@braju.com\", role = \"ctb\"), person(\"Eduard\", \"Szocs\", , \"eduardszoecs@gmail.com\", role = \"ctb\"), person(\"David\", \"Hugh-Jones\", , \"davidhughjones@gmail.com\", role = \"ctb\"), person(\"Matthieu\", \"Stigler\", , \"Matthieu.Stigler@gmail.com\", role = \"ctb\"), person(\"Hugo\", \"Tavares\", , \"hm533@cam.ac.uk\", role = \"ctb\", comment = c(ORCID = \"0000-0001-9373-2726\")), person(\"R. Willem\", \"Vervoort\", , \"Willemvervoort@gmail.com\", role = \"ctb\"), person(\"Brenton M.\", \"Wiernik\", , \"brenton@wiernik.org\", role = \"ctb\"), person(\"Josh\", \"Yamamoto\", , \"joshuayamamoto5@gmail.com\", role = \"ctb\"), person(\"Jasme\", \"Lee\", role = \"ctb\"), person(\"Taren\", \"Sanders\", , \"taren.sanders@acu.edu.au\", role = \"ctb\", comment = c(ORCID = \"0000-0002-4504-6008\")), person(\"Ilaria\", \"Prosdocimi\", , \"prosdocimi.ilaria@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0001-8565-094X\")), person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0862-2018\")), person(\"Alex\", \"Reinhart\", , \"areinhar@stat.cmu.edu\", role = \"ctb\", 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", @@ -1331,6 +1372,7 @@ "spdep (>= 1.1)", "speedglm", "spelling", + "stats4", "survey", "survival (>= 3.6-4)", "systemfit", @@ -1345,16 +1387,16 @@ "Config/usethis/last-upkeep": "2025-04-25", "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Collate": "'aaa-documentation-helper.R' 'null-and-default.R' 'aer.R' 'auc.R' 'base.R' 'bbmle.R' 'betareg.R' 'biglm.R' 'bingroup.R' 'boot.R' 'broom-package.R' 'broom.R' 'btergm.R' 'car.R' 'caret.R' 'cluster.R' 'cmprsk.R' 'data-frame.R' 'deprecated-0-7-0.R' 'drc.R' 'emmeans.R' 'epiR.R' 'ergm.R' 'fixest.R' 'gam.R' 'geepack.R' 'glmnet-cv-glmnet.R' 'glmnet-glmnet.R' 'gmm.R' 'hmisc.R' 'import-standalone-obj-type.R' 'import-standalone-types-check.R' 'joinerml.R' 'kendall.R' 'ks.R' 'lavaan.R' 'leaps.R' 'lfe.R' 'list-irlba.R' 'list-optim.R' 'list-svd.R' 'list-xyz.R' 'list.R' 'lm-beta.R' 'lmodel2.R' 'lmtest.R' 'maps.R' 'margins.R' 'mass-fitdistr.R' 'mass-negbin.R' 'mass-polr.R' 'mass-ridgelm.R' 'stats-lm.R' 'mass-rlm.R' 'mclust.R' 'mediation.R' 'metafor.R' 'mfx.R' 'mgcv.R' 'mlogit.R' 'muhaz.R' 'multcomp.R' 'nnet.R' 'nobs.R' 'ordinal-clm.R' 'ordinal-clmm.R' 'plm.R' 'polca.R' 'psych.R' 'stats-nls.R' 'quantreg-nlrq.R' 'quantreg-rq.R' 'quantreg-rqs.R' 'robust-glmrob.R' 'robust-lmrob.R' 'robustbase-glmrob.R' 'robustbase-lmrob.R' 'sp.R' 'spdep.R' 'speedglm-speedglm.R' 'speedglm-speedlm.R' 'stats-anova.R' 'stats-arima.R' 'stats-decompose.R' 'stats-factanal.R' 'stats-glm.R' 'stats-htest.R' 'stats-kmeans.R' 'stats-loess.R' 'stats-mlm.R' 'stats-prcomp.R' 'stats-smooth.spline.R' 'stats-summary-lm.R' 'stats-time-series.R' 'survey.R' 'survival-aareg.R' 'survival-cch.R' 'survival-coxph.R' 'survival-pyears.R' 'survival-survdiff.R' 'survival-survexp.R' 'survival-survfit.R' 'survival-survreg.R' 'systemfit.R' 'tseries.R' 'utilities.R' 'vars.R' 'zoo.R' 'zzz.R'", "NeedsCompilation": "no", - "Author": "David Robinson [aut], Alex Hayes [aut] (ORCID: ), Simon Couch [aut, cre] (ORCID: ), Posit Software, PBC [cph, fnd] (ROR: ), Indrajeet Patil [ctb] (ORCID: ), 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] (ORCID: ), 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] (ORCID: ), Nic Crane [ctb], Andrew Bates [ctb], Vincent Arel-Bundock [ctb] (ORCID: ), Hideaki Hayashi [ctb], Luis Tobalina [ctb], Annie Wang [ctb], Wei Yang Tham [ctb], Clara Wang [ctb], Abby Smith [ctb] (ORCID: ), Jasper Cooper [ctb] (ORCID: ), E Auden Krauska [ctb] (ORCID: ), Alex Wang [ctb], Malcolm Barrett [ctb] (ORCID: ), Charles Gray [ctb] (ORCID: ), Jared Wilber [ctb], Vilmantas Gegzna [ctb] (ORCID: ), Eduard Szoecs [ctb], Frederik Aust [ctb] (ORCID: ), Angus Moore [ctb], Nick Williams [ctb], Marius Barth [ctb] (ORCID: ), Bruna Wundervald [ctb] (ORCID: ), Joyce Cahoon [ctb] (ORCID: ), Grant McDermott [ctb] (ORCID: ), Kevin Zarca [ctb], Shiro Kuriwaki [ctb] (ORCID: ), Lukas Wallrich [ctb] (ORCID: ), James Martherus [ctb] (ORCID: ), Chuliang Xiao [ctb] (ORCID: ), 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] (ORCID: ), 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] (ORCID: ), R. Willem Vervoort [ctb], Brenton M. Wiernik [ctb], Josh Yamamoto [ctb], Jasme Lee [ctb], Taren Sanders [ctb] (ORCID: ), Ilaria Prosdocimi [ctb] (ORCID: ), Daniel D. Sjoberg [ctb] (ORCID: ), Alex Reinhart [ctb] (ORCID: )", - "Maintainer": "Simon Couch ", + "Author": "David Robinson [aut], Alex Hayes [aut] (ORCID: ), Simon Couch [aut] (ORCID: ), Emil Hvitfeldt [aut, cre] (ORCID: ), Posit Software, PBC [cph, fnd] (ROR: ), Indrajeet Patil [ctb] (ORCID: ), 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] (ORCID: ), 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] (ORCID: ), Nic Crane [ctb], Andrew Bates [ctb], Vincent Arel-Bundock [ctb] (ORCID: ), Hideaki Hayashi [ctb], Luis Tobalina [ctb], Annie Wang [ctb], Wei Yang Tham [ctb], Clara Wang [ctb], Abby Smith [ctb] (ORCID: ), Jasper Cooper [ctb] (ORCID: ), E Auden Krauska [ctb] (ORCID: ), Alex Wang [ctb], Malcolm Barrett [ctb] (ORCID: ), Charles Gray [ctb] (ORCID: ), Jared Wilber [ctb], Vilmantas Gegzna [ctb] (ORCID: ), Eduard Szoecs [ctb], Frederik Aust [ctb] (ORCID: ), Angus Moore [ctb], Nick Williams [ctb], Marius Barth [ctb] (ORCID: ), Bruna Wundervald [ctb] (ORCID: ), Joyce Cahoon [ctb] (ORCID: ), Grant McDermott [ctb] (ORCID: ), Kevin Zarca [ctb], Shiro Kuriwaki [ctb] (ORCID: ), Lukas Wallrich [ctb] (ORCID: ), James Martherus [ctb] (ORCID: ), Chuliang Xiao [ctb] (ORCID: ), 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] (ORCID: ), 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] (ORCID: ), R. Willem Vervoort [ctb], Brenton M. Wiernik [ctb], Josh Yamamoto [ctb], Jasme Lee [ctb], Taren Sanders [ctb] (ORCID: ), Ilaria Prosdocimi [ctb] (ORCID: ), Daniel D. Sjoberg [ctb] (ORCID: ), Alex Reinhart [ctb] (ORCID: )", + "Maintainer": "Emil Hvitfeldt ", "Repository": "CRAN" }, "broom.helpers": { "Package": "broom.helpers", - "Version": "1.21.0", + "Version": "1.22.0", "Source": "Repository", "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\")) )", @@ -1422,6 +1464,7 @@ "patchwork", "plm", "pscl", + "quantreg", "rmarkdown", "rstanarm", "scales", @@ -1438,10 +1481,10 @@ "Encoding": "UTF-8", "Language": "en-US", "LazyData": "true", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Config/testthat/edition": "3", "NeedsCompilation": "no", - "Author": "Joseph Larmarange [aut, cre] (), Daniel D. Sjoberg [aut] ()", + "Author": "Joseph Larmarange [aut, cre] (ORCID: ), Daniel D. Sjoberg [aut] (ORCID: )", "Maintainer": "Joseph Larmarange ", "Repository": "CRAN" }, @@ -1624,10 +1667,10 @@ }, "cards": { "Package": "cards", - "Version": "0.6.1", + "Version": "0.7.1", "Source": "Repository", "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\") )", + "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\", comment = c(ORCID = \"0009-0000-8738-5561\")), person(\"Malan\", \"Bosman\", , \"malanbos@gmail.com\", role = \"aut\", comment = c(ORCID = \"0000-0002-3020-195X\")), 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/", @@ -1636,37 +1679,37 @@ "R (>= 4.1)" ], "Imports": [ - "cli (>= 3.6.1)", - "dplyr (>= 1.1.2)", - "glue (>= 1.6.2)", - "lifecycle (>= 1.0.3)", - "rlang (>= 1.1.1)", - "tidyr (>= 1.3.0)", - "tidyselect (>= 1.2.0)" + "cli (>= 3.6.5)", + "dplyr (>= 1.1.4)", + "glue (>= 1.8.0)", + "lifecycle (>= 1.0.4)", + "rlang (>= 1.1.6)", + "tidyr (>= 1.3.1)", + "tidyselect (>= 1.2.1)" ], "Suggests": [ - "testthat (>= 3.2.0)", + "testthat (>= 3.2.3)", "withr (>= 3.0.0)" ], "Config/Needs/coverage": "hms", - "Config/Needs/website": "rmarkdown, jsonlite, yaml, ddsjoberg/gtsummary, tfrmt, cardx, gt, fontawesome, insightsengineering/nesttemplate", + "Config/Needs/website": "rmarkdown, jsonlite, yaml, gtsummary, tfrmt, cardx, gt, fontawesome, insightsengineering/crane, insightsengineering/nesttemplate", "Config/testthat/edition": "3", "Config/testthat/parallel": "true", "Encoding": "UTF-8", "Language": "en-US", "LazyData": "true", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "NeedsCompilation": "no", - "Author": "Daniel D. Sjoberg [aut, cre] (ORCID: ), Becca Krouse [aut], Emily de la Rua [aut], F. Hoffmann-La Roche AG [cph, fnd], GlaxoSmithKline Research & Development Limited [cph]", + "Author": "Daniel D. Sjoberg [aut, cre] (ORCID: ), Becca Krouse [aut], Emily de la Rua [aut] (ORCID: ), Malan Bosman [aut] (ORCID: ), F. Hoffmann-La Roche AG [cph, fnd], GlaxoSmithKline Research & Development Limited [cph]", "Maintainer": "Daniel D. Sjoberg ", "Repository": "CRAN" }, "cardx": { "Package": "cardx", - "Version": "0.2.5", + "Version": "0.3.1", "Source": "Repository", "Title": "Extra Analysis Results Data Utilities", - "Authors@R": "c( person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-0862-2018\")), 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\")) )", + "Authors@R": "c( person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-0862-2018\")), 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(\"Malcolm\", \"Barrett\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0299-5825\")), 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://github.com/insightsengineering/cardx, https://insightsengineering.github.io/cardx/", @@ -1675,7 +1718,7 @@ "R (>= 4.2)" ], "Imports": [ - "cards (>= 0.6.1)", + "cards (>= 0.7.0)", "cli (>= 3.6.1)", "dplyr (>= 1.1.2)", "glue (>= 1.6.2)", @@ -1706,9 +1749,9 @@ "Config/testthat/parallel": "true", "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "NeedsCompilation": "no", - "Author": "Daniel D. Sjoberg [aut, cre] (ORCID: ), Abinaya Yogasekaram [aut], Emily de la Rua [aut], F. Hoffmann-La Roche AG [cph, fnd]", + "Author": "Daniel D. Sjoberg [aut, cre] (ORCID: ), Abinaya Yogasekaram [aut], Emily de la Rua [aut], Malcolm Barrett [ctb] (ORCID: ), F. Hoffmann-La Roche AG [cph, fnd]", "Maintainer": "Daniel D. Sjoberg ", "Repository": "CRAN" }, @@ -1745,7 +1788,7 @@ }, "checkmate": { "Package": "checkmate", - "Version": "2.3.2", + "Version": "2.3.3", "Source": "Repository", "Type": "Package", "Title": "Fast and Versatile Argument Checks", @@ -1782,7 +1825,7 @@ "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] ()", + "Author": "Michel Lang [cre, aut] (ORCID: ), Bernd Bischl [ctb], Dénes Tóth [ctb] (ORCID: )", "Maintainer": "Michel Lang ", "Repository": "CRAN" }, @@ -1987,9 +2030,9 @@ }, "colorspace": { "Package": "colorspace", - "Version": "2.1-1", + "Version": "2.1-2", "Source": "Repository", - "Date": "2024-07-26", + "Date": "2025-09-22", "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, ).", @@ -2033,9 +2076,9 @@ "BugReports": "https://colorspace.R-Forge.R-project.org/contact.html", "LazyData": "yes", "Encoding": "UTF-8", - "RoxygenNote": "7.3.1", + "RoxygenNote": "7.3.2", "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] ()", + "Author": "Ross Ihaka [aut], Paul Murrell [aut] (ORCID: ), Kurt Hornik [aut] (ORCID: ), Jason C. Fisher [aut] (ORCID: ), Reto Stauffer [aut] (ORCID: ), Claus O. Wilke [aut] (ORCID: ), Claire D. McWhite [aut] (ORCID: ), Achim Zeileis [aut, cre] (ORCID: )", "Maintainer": "Achim Zeileis ", "Repository": "CRAN" }, @@ -2200,13 +2243,15 @@ }, "crosstalk": { "Package": "crosstalk", - "Version": "1.2.1", + "Version": "1.2.2", "Source": "Repository", "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\") )", + "Authors@R": "c( person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"), person(\"Carson\", \"Sievert\", , \"carson@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(, \"jQuery Foundation\", role = \"cph\", comment = \"jQuery library and jQuery UI library\"), person(, \"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(, \"Bootstrap contributors\", role = \"ctb\", comment = \"Bootstrap library\"), person(, \"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(, \"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", + "URL": "https://rstudio.github.io/crosstalk/, https://github.com/rstudio/crosstalk", + "BugReports": "https://github.com/rstudio/crosstalk/issues", "Imports": [ "htmltools (>= 0.3.6)", "jsonlite", @@ -2214,24 +2259,23 @@ "R6" ], "Suggests": [ - "shiny", + "bslib", "ggplot2", - "testthat (>= 2.1.0)", "sass", - "bslib" + "shiny", + "testthat (>= 2.1.0)" ], - "URL": "https://rstudio.github.io/crosstalk/, https://github.com/rstudio/crosstalk", - "BugReports": "https://github.com/rstudio/crosstalk/issues", - "RoxygenNote": "7.2.3", + "Config/Needs/website": "jcheng5/d3scatter, DT, leaflet, rmarkdown", "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", "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)", + "Author": "Joe Cheng [aut], Carson Sievert [aut, cre] (ORCID: ), 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.4.0", + "Version": "7.0.0", "Source": "Repository", "Type": "Package", "Title": "A Modern and Flexible Web Client for R", @@ -2255,7 +2299,7 @@ "Depends": [ "R (>= 3.0.0)" ], - "RoxygenNote": "7.3.2.9000", + "RoxygenNote": "7.3.2", "Encoding": "UTF-8", "Language": "en-US", "NeedsCompilation": "yes", @@ -2348,7 +2392,7 @@ }, "datawizard": { "Package": "datawizard", - "Version": "1.2.0", + "Version": "1.3.0", "Source": "Repository", "Type": "Package", "Title": "Easy Data Wrangling and Statistical Transformations", @@ -2362,7 +2406,7 @@ "R (>= 4.0)" ], "Imports": [ - "insight (>= 1.3.1)", + "insight (>= 1.4.2)", "stats", "utils" ], @@ -2399,12 +2443,13 @@ "testthat (>= 3.2.1)", "tibble", "tidyr", + "tinytable (>= 0.13.0)", "withr" ], "VignetteBuilder": "knitr", "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Config/testthat/edition": "3", "Config/testthat/parallel": "true", "Config/Needs/website": "easystats/easystatstemplate", @@ -2452,13 +2497,13 @@ }, "digest": { "Package": "digest", - "Version": "0.6.37", + "Version": "0.6.39", "Source": "Repository", - "Authors@R": "c(person(\"Dirk\", \"Eddelbuettel\", role = c(\"aut\", \"cre\"), email = \"edd@debian.org\", comment = c(ORCID = \"0000-0001-6419-907X\")), person(\"Antoine\", \"Lucas\", role=\"ctb\"), person(\"Jarek\", \"Tuszynski\", role=\"ctb\"), person(\"Henrik\", \"Bengtsson\", role=\"ctb\", comment = c(ORCID = \"0000-0002-7579-5165\")), person(\"Simon\", \"Urbanek\", role=\"ctb\", comment = c(ORCID = \"0000-0003-2297-1732\")), person(\"Mario\", \"Frasca\", role=\"ctb\"), person(\"Bryan\", \"Lewis\", role=\"ctb\"), person(\"Murray\", \"Stokely\", role=\"ctb\"), person(\"Hannes\", \"Muehleisen\", role=\"ctb\"), person(\"Duncan\", \"Murdoch\", role=\"ctb\"), person(\"Jim\", \"Hester\", role=\"ctb\"), person(\"Wush\", \"Wu\", role=\"ctb\", comment = c(ORCID = \"0000-0001-5180-0567\")), person(\"Qiang\", \"Kou\", role=\"ctb\", comment = c(ORCID = \"0000-0001-6786-5453\")), person(\"Thierry\", \"Onkelinx\", role=\"ctb\", comment = c(ORCID = \"0000-0001-8804-4216\")), person(\"Michel\", \"Lang\", role=\"ctb\", comment = c(ORCID = \"0000-0001-9754-0393\")), person(\"Viliam\", \"Simko\", role=\"ctb\"), person(\"Kurt\", \"Hornik\", role=\"ctb\", comment = c(ORCID = \"0000-0003-4198-9911\")), person(\"Radford\", \"Neal\", role=\"ctb\", comment = c(ORCID = \"0000-0002-2473-3407\")), person(\"Kendon\", \"Bell\", role=\"ctb\", comment = c(ORCID = \"0000-0002-9093-8312\")), person(\"Matthew\", \"de Queljoe\", role=\"ctb\"), person(\"Dmitry\", \"Selivanov\", role=\"ctb\"), person(\"Ion\", \"Suruceanu\", role=\"ctb\"), person(\"Bill\", \"Denney\", role=\"ctb\"), person(\"Dirk\", \"Schumacher\", role=\"ctb\"), person(\"András\", \"Svraka\", role=\"ctb\"), person(\"Sergey\", \"Fedorov\", role=\"ctb\"), person(\"Will\", \"Landau\", role=\"ctb\", comment = c(ORCID = \"0000-0003-1878-3253\")), person(\"Floris\", \"Vanderhaeghe\", role=\"ctb\", comment = c(ORCID = \"0000-0002-6378-6229\")), person(\"Kevin\", \"Tappe\", role=\"ctb\"), person(\"Harris\", \"McGehee\", role=\"ctb\"), person(\"Tim\", \"Mastny\", role=\"ctb\"), person(\"Aaron\", \"Peikert\", role=\"ctb\", comment = c(ORCID = \"0000-0001-7813-818X\")), person(\"Mark\", \"van der Loo\", role=\"ctb\", comment = c(ORCID = \"0000-0002-9807-4686\")), person(\"Chris\", \"Muir\", role=\"ctb\", comment = c(ORCID = \"0000-0003-2555-3878\")), person(\"Moritz\", \"Beller\", role=\"ctb\", comment = c(ORCID = \"0000-0003-4852-0526\")), person(\"Sebastian\", \"Campbell\", role=\"ctb\"), person(\"Winston\", \"Chang\", role=\"ctb\", comment = c(ORCID = \"0000-0002-1576-2126\")), person(\"Dean\", \"Attali\", role=\"ctb\", comment = c(ORCID = \"0000-0002-5645-3493\")), person(\"Michael\", \"Chirico\", role=\"ctb\", comment = c(ORCID = \"0000-0003-0787-087X\")), person(\"Kevin\", \"Ushey\", role=\"ctb\"))", - "Date": "2024-08-19", + "Authors@R": "c(person(\"Dirk\", \"Eddelbuettel\", role = c(\"aut\", \"cre\"), email = \"edd@debian.org\", comment = c(ORCID = \"0000-0001-6419-907X\")), person(\"Antoine\", \"Lucas\", role=\"ctb\", comment = c(ORCID = \"0000-0002-8059-9767\")), person(\"Jarek\", \"Tuszynski\", role=\"ctb\"), person(\"Henrik\", \"Bengtsson\", role=\"ctb\", comment = c(ORCID = \"0000-0002-7579-5165\")), person(\"Simon\", \"Urbanek\", role=\"ctb\", comment = c(ORCID = \"0000-0003-2297-1732\")), person(\"Mario\", \"Frasca\", role=\"ctb\"), person(\"Bryan\", \"Lewis\", role=\"ctb\"), person(\"Murray\", \"Stokely\", role=\"ctb\"), person(\"Hannes\", \"Muehleisen\", role=\"ctb\", comment = c(ORCID = \"0000-0001-8552-0029\")), person(\"Duncan\", \"Murdoch\", role=\"ctb\"), person(\"Jim\", \"Hester\", role=\"ctb\", comment = c(ORCID = \"0000-0002-2739-7082\")), person(\"Wush\", \"Wu\", role=\"ctb\", comment = c(ORCID = \"0000-0001-5180-0567\")), person(\"Qiang\", \"Kou\", role=\"ctb\", comment = c(ORCID = \"0000-0001-6786-5453\")), person(\"Thierry\", \"Onkelinx\", role=\"ctb\", comment = c(ORCID = \"0000-0001-8804-4216\")), person(\"Michel\", \"Lang\", role=\"ctb\", comment = c(ORCID = \"0000-0001-9754-0393\")), person(\"Viliam\", \"Simko\", role=\"ctb\"), person(\"Kurt\", \"Hornik\", role=\"ctb\", comment = c(ORCID = \"0000-0003-4198-9911\")), person(\"Radford\", \"Neal\", role=\"ctb\", comment = c(ORCID = \"0000-0002-2473-3407\")), person(\"Kendon\", \"Bell\", role=\"ctb\", comment = c(ORCID = \"0000-0002-9093-8312\")), person(\"Matthew\", \"de Queljoe\", role=\"ctb\"), person(\"Dmitry\", \"Selivanov\", role=\"ctb\", comment = c(ORCID = \"0000-0003-0492-6647\")), person(\"Ion\", \"Suruceanu\", role=\"ctb\", comment = c(ORCID = \"0009-0005-6446-4909\")), person(\"Bill\", \"Denney\", role=\"ctb\", comment = c(ORCID = \"0000-0002-5759-428X\")), person(\"Dirk\", \"Schumacher\", role=\"ctb\"), person(\"András\", \"Svraka\", role=\"ctb\", comment = c(ORCID = \"0009-0008-8480-1329\")), person(\"Sergey\", \"Fedorov\", role=\"ctb\", comment = c(ORCID = \"0000-0002-5970-7233\")), person(\"Will\", \"Landau\", role=\"ctb\", comment = c(ORCID = \"0000-0003-1878-3253\")), person(\"Floris\", \"Vanderhaeghe\", role=\"ctb\", comment = c(ORCID = \"0000-0002-6378-6229\")), person(\"Kevin\", \"Tappe\", role=\"ctb\"), person(\"Harris\", \"McGehee\", role=\"ctb\"), person(\"Tim\", \"Mastny\", role=\"ctb\"), person(\"Aaron\", \"Peikert\", role=\"ctb\", comment = c(ORCID = \"0000-0001-7813-818X\")), person(\"Mark\", \"van der Loo\", role=\"ctb\", comment = c(ORCID = \"0000-0002-9807-4686\")), person(\"Chris\", \"Muir\", role=\"ctb\", comment = c(ORCID = \"0000-0003-2555-3878\")), person(\"Moritz\", \"Beller\", role=\"ctb\", comment = c(ORCID = \"0000-0003-4852-0526\")), person(\"Sebastian\", \"Campbell\", role=\"ctb\", comment = c(ORCID = \"0009-0000-5948-4503\")), person(\"Winston\", \"Chang\", role=\"ctb\", comment = c(ORCID = \"0000-0002-1576-2126\")), person(\"Dean\", \"Attali\", role=\"ctb\", comment = c(ORCID = \"0000-0002-5645-3493\")), person(\"Michael\", \"Chirico\", role=\"ctb\", comment = c(ORCID = \"0000-0003-0787-087X\")), person(\"Kevin\", \"Ushey\", role=\"ctb\", comment = c(ORCID = \"0000-0003-2880-7407\")), person(\"Carl\", \"Pearson\", role=\"ctb\", comment = c(ORCID = \"0000-0003-0701-7860\")))", + "Date": "2025-11-19", "Title": "Create Compact Hash Digests of R Objects", - "Description": "Implementation of a function 'digest()' for the creation of hash digests of arbitrary R objects (using the 'md5', 'sha-1', 'sha-256', 'crc32', 'xxhash', 'murmurhash', 'spookyhash', 'blake3', 'crc32c', 'xxh3_64', and 'xxh3_128' algorithms) permitting easy comparison of R language objects, as well as functions such as'hmac()' to create hash-based message authentication code. Please note that this package is not meant to be deployed for cryptographic purposes for which more comprehensive (and widely tested) libraries such as 'OpenSSL' should be used.", - "URL": "https://github.com/eddelbuettel/digest, https://dirk.eddelbuettel.com/code/digest.html", + "Description": "Implementation of a function 'digest()' for the creation of hash digests of arbitrary R objects (using the 'md5', 'sha-1', 'sha-256', 'crc32', 'xxhash', 'murmurhash', 'spookyhash', 'blake3', 'crc32c', 'xxh3_64', and 'xxh3_128' algorithms) permitting easy comparison of R language objects, as well as functions such as 'hmac()' to create hash-based message authentication code. Please note that this package is not meant to be deployed for cryptographic purposes for which more comprehensive (and widely tested) libraries such as 'OpenSSL' should be used.", + "URL": "https://github.com/eddelbuettel/digest, https://eddelbuettel.github.io/digest/, https://dirk.eddelbuettel.com/code/digest.html", "BugReports": "https://github.com/eddelbuettel/digest/issues", "Depends": [ "R (>= 3.3.0)" @@ -2469,12 +2514,13 @@ "License": "GPL (>= 2)", "Suggests": [ "tinytest", - "simplermarkdown" + "simplermarkdown", + "rbenchmark" ], "VignetteBuilder": "simplermarkdown", "Encoding": "UTF-8", "NeedsCompilation": "yes", - "Author": "Dirk Eddelbuettel [aut, cre] (), Antoine Lucas [ctb], Jarek Tuszynski [ctb], Henrik Bengtsson [ctb] (), Simon Urbanek [ctb] (), Mario Frasca [ctb], Bryan Lewis [ctb], Murray Stokely [ctb], Hannes Muehleisen [ctb], Duncan Murdoch [ctb], Jim Hester [ctb], Wush Wu [ctb] (), Qiang Kou [ctb] (), Thierry Onkelinx [ctb] (), Michel Lang [ctb] (), Viliam Simko [ctb], Kurt Hornik [ctb] (), Radford Neal [ctb] (), Kendon Bell [ctb] (), Matthew de Queljoe [ctb], Dmitry Selivanov [ctb], Ion Suruceanu [ctb], Bill Denney [ctb], Dirk Schumacher [ctb], András Svraka [ctb], Sergey Fedorov [ctb], Will Landau [ctb] (), Floris Vanderhaeghe [ctb] (), Kevin Tappe [ctb], Harris McGehee [ctb], Tim Mastny [ctb], Aaron Peikert [ctb] (), Mark van der Loo [ctb] (), Chris Muir [ctb] (), Moritz Beller [ctb] (), Sebastian Campbell [ctb], Winston Chang [ctb] (), Dean Attali [ctb] (), Michael Chirico [ctb] (), Kevin Ushey [ctb]", + "Author": "Dirk Eddelbuettel [aut, cre] (ORCID: ), Antoine Lucas [ctb] (ORCID: ), Jarek Tuszynski [ctb], Henrik Bengtsson [ctb] (ORCID: ), Simon Urbanek [ctb] (ORCID: ), Mario Frasca [ctb], Bryan Lewis [ctb], Murray Stokely [ctb], Hannes Muehleisen [ctb] (ORCID: ), Duncan Murdoch [ctb], Jim Hester [ctb] (ORCID: ), Wush Wu [ctb] (ORCID: ), Qiang Kou [ctb] (ORCID: ), Thierry Onkelinx [ctb] (ORCID: ), Michel Lang [ctb] (ORCID: ), Viliam Simko [ctb], Kurt Hornik [ctb] (ORCID: ), Radford Neal [ctb] (ORCID: ), Kendon Bell [ctb] (ORCID: ), Matthew de Queljoe [ctb], Dmitry Selivanov [ctb] (ORCID: ), Ion Suruceanu [ctb] (ORCID: ), Bill Denney [ctb] (ORCID: ), Dirk Schumacher [ctb], András Svraka [ctb] (ORCID: ), Sergey Fedorov [ctb] (ORCID: ), Will Landau [ctb] (ORCID: ), Floris Vanderhaeghe [ctb] (ORCID: ), Kevin Tappe [ctb], Harris McGehee [ctb], Tim Mastny [ctb], Aaron Peikert [ctb] (ORCID: ), Mark van der Loo [ctb] (ORCID: ), Chris Muir [ctb] (ORCID: ), Moritz Beller [ctb] (ORCID: ), Sebastian Campbell [ctb] (ORCID: ), Winston Chang [ctb] (ORCID: ), Dean Attali [ctb] (ORCID: ), Michael Chirico [ctb] (ORCID: ), Kevin Ushey [ctb] (ORCID: ), Carl Pearson [ctb] (ORCID: )", "Maintainer": "Dirk Eddelbuettel ", "Repository": "CRAN" }, @@ -2512,7 +2558,7 @@ }, "downlit": { "Package": "downlit", - "Version": "0.4.4", + "Version": "0.4.5", "Source": "Repository", "Title": "Syntax Highlighting and Automatic Linking", "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", @@ -2549,7 +2595,7 @@ "Config/Needs/website": "tidyverse/tidytemplate", "Config/testthat/edition": "3", "Encoding": "UTF-8", - "RoxygenNote": "7.3.1", + "RoxygenNote": "7.3.3", "NeedsCompilation": "no", "Author": "Hadley Wickham [aut, cre], Posit Software, PBC [cph, fnd]", "Maintainer": "Hadley Wickham ", @@ -2773,12 +2819,13 @@ }, "emmeans": { "Package": "emmeans", - "Version": "1.11.2", + "Version": "2.0.0", "Source": "Repository", "Type": "Package", "Title": "Estimated Marginal Means, aka Least-Squares Means", - "Date": "2025-07-11", - "Authors@R": "c(person(\"Russell V.\", \"Lenth\", role = c(\"aut\", \"cre\", \"cph\"), email = \"russell-lenth@uiowa.edu\"), person(\"Balazs\", \"Banfai\", role = \"ctb\"), person(\"Ben\", \"Bolker\", role = \"ctb\"), person(\"Paul\", \"Buerkner\", role = \"ctb\"), person(\"Iago\", \"Giné-Vázquez\", role = \"ctb\"), person(\"Maxime\", \"Herve\", role = \"ctb\"), person(\"Maarten\", \"Jung\", role = \"ctb\"), person(\"Jonathon\", \"Love\", role = \"ctb\"), person(\"Fernando\", \"Miguez\", role = \"ctb\"), person(\"Julia\", \"Piaskowski\", role = \"ctb\"), person(\"Hannes\", \"Riebl\", role = \"ctb\"), person(\"Henrik\", \"Singmann\", role = \"ctb\"))", + "Date": "2025-10-24", + "Authors@R": "c(person(\"Russell V.\", \"Lenth\", role = c(\"aut\", \"cph\"), email = \"russell-lenth@uiowa.edu\"), person(\"Julia\", \"Piaskowski\", role = c(\"cre\", \"aut\"), email = \"julia.piask@gmail.com\"), person(\"Balazs\", \"Banfai\", role = \"ctb\"), person(\"Ben\", \"Bolker\", role = \"ctb\"), person(\"Paul\", \"Buerkner\", role = \"ctb\"), person(\"Iago\", \"Giné-Vázquez\", role = \"ctb\"), person(\"Maxime\", \"Hervé\", role = \"ctb\"), person(\"Maarten\", \"Jung\", role = \"ctb\"), person(\"Jonathon\", \"Love\", role = \"ctb\"), person(\"Fernando\", \"Miguez\", role = \"ctb\"), person(\"Hannes\", \"Riebl\", role = \"ctb\"), person(\"Henrik\", \"Singmann\", role = \"ctb\"))", + "Maintainer": "Julia Piaskowski ", "Depends": [ "R (>= 4.1.0)" ], @@ -2788,6 +2835,7 @@ "methods", "mvtnorm", "numDeriv", + "rlang", "stats", "utils" ], @@ -2815,6 +2863,7 @@ "ordinal (>= 2014.11-12)", "pbkrtest (>= 0.4-1)", "rmarkdown", + "robmixglm", "rsm", "sandwich", "scales", @@ -2844,11 +2893,10 @@ "Description": "Obtain estimated marginal means (EMMs) for many linear, generalized linear, and mixed models. Compute contrasts or linear functions of EMMs, trends, and comparisons of slopes. Plots and other displays. Least-squares means are discussed, and the term \"estimated marginal means\" is suggested, in Searle, Speed, and Milliken (1980) Population marginal means in the linear model: An alternative to least squares means, The American Statistician 34(4), 216-221 .", "License": "GPL-2 | GPL-3", "Encoding": "UTF-8", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "VignetteBuilder": "knitr", "NeedsCompilation": "no", - "Author": "Russell V. Lenth [aut, cre, cph], Balazs Banfai [ctb], Ben Bolker [ctb], Paul Buerkner [ctb], Iago Giné-Vázquez [ctb], Maxime Herve [ctb], Maarten Jung [ctb], Jonathon Love [ctb], Fernando Miguez [ctb], Julia Piaskowski [ctb], Hannes Riebl [ctb], Henrik Singmann [ctb]", - "Maintainer": "Russell V. Lenth ", + "Author": "Russell V. Lenth [aut, cph], Julia Piaskowski [cre, aut], Balazs Banfai [ctb], Ben Bolker [ctb], Paul Buerkner [ctb], Iago Giné-Vázquez [ctb], Maxime Hervé [ctb], Maarten Jung [ctb], Jonathon Love [ctb], Fernando Miguez [ctb], Hannes Riebl [ctb], Henrik Singmann [ctb]", "Repository": "CRAN" }, "esquisse": { @@ -2927,7 +2975,7 @@ }, "eulerr": { "Package": "eulerr", - "Version": "7.0.2", + "Version": "7.0.4", "Source": "Repository", "Title": "Area-Proportional Euler and Venn Diagrams with Ellipses", "Authors@R": "c(person(\"Johan\", \"Larsson\", email = \"johanlarsson@outlook.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-4029-5945\")), person(\"A. Jonathan R.\", \"Godfrey\", role = \"ctb\"), person(\"Peter\", \"Gustafsson\", role = \"ctb\"), person(\"David H.\", \"Eberly\", role = \"ctb\", comment = \"geometric algorithms\"), person(\"Emanuel\", \"Huber\", role = \"ctb\", comment = \"root solver code\"), person(\"Florian\", \"Privé\", role = \"ctb\"))", @@ -2969,13 +3017,13 @@ "RoxygenNote": "7.2.3", "Language": "en-US", "NeedsCompilation": "yes", - "Author": "Johan Larsson [aut, cre] (), A. Jonathan R. Godfrey [ctb], Peter Gustafsson [ctb], David H. Eberly [ctb] (geometric algorithms), Emanuel Huber [ctb] (root solver code), Florian Privé [ctb]", + "Author": "Johan Larsson [aut, cre] (ORCID: ), A. Jonathan R. Godfrey [ctb], Peter Gustafsson [ctb], David H. Eberly [ctb] (geometric algorithms), Emanuel Huber [ctb] (root solver code), Florian Privé [ctb]", "Maintainer": "Johan Larsson ", "Repository": "CRAN" }, "evaluate": { "Package": "evaluate", - "Version": "1.0.4", + "Version": "1.0.5", "Source": "Repository", "Type": "Package", "Title": "Parsing and Evaluation Tools that Provide More Details than the Default", @@ -3011,11 +3059,11 @@ }, "fansi": { "Package": "fansi", - "Version": "1.0.6", + "Version": "1.0.7", "Source": "Repository", "Title": "ANSI Control Sequence Aware String Functions", "Description": "Counterparts to R string manipulation functions that account for the effects of ANSI text formatting control sequences.", - "Authors@R": "c( person(\"Brodie\", \"Gaslam\", email=\"brodie.gaslam@yahoo.com\", role=c(\"aut\", \"cre\")), person(\"Elliott\", \"Sales De Andrade\", role=\"ctb\"), person(family=\"R Core Team\", email=\"R-core@r-project.org\", role=\"cph\", comment=\"UTF8 byte length calcs from src/util.c\" ))", + "Authors@R": "c( person(\"Brodie\", \"Gaslam\", email=\"brodie.gaslam@yahoo.com\", role=c(\"aut\", \"cre\")), person(\"Elliott\", \"Sales De Andrade\", role=\"ctb\"), person(given=\"R Core Team\", email=\"R-core@r-project.org\", role=\"cph\", comment=\"UTF8 byte length calcs from src/util.c\" ), person(\"Michael\",\"Chirico\", role=\"ctb\", email=\"michaelchirico4@gmail.com\", comment = c(ORCID=\"0000-0003-0787-087X\") ), person(given = \"Unicode, Inc.\", role = c(\"cph\", \"dtc\"), comment = \"Unicode Character Database derivative data in src/width.c\") )", "Depends": [ "R (>= 3.1.0)" ], @@ -3032,11 +3080,11 @@ "grDevices", "utils" ], - "RoxygenNote": "7.2.3", + "RoxygenNote": "7.3.3", "Encoding": "UTF-8", "Collate": "'constants.R' 'fansi-package.R' 'internal.R' 'load.R' 'misc.R' 'nchar.R' 'strwrap.R' 'strtrim.R' 'strsplit.R' 'substr2.R' 'trimws.R' 'tohtml.R' 'unhandled.R' 'normalize.R' 'sgr.R'", "NeedsCompilation": "yes", - "Author": "Brodie Gaslam [aut, cre], Elliott Sales De Andrade [ctb], R Core Team [cph] (UTF8 byte length calcs from src/util.c)", + "Author": "Brodie Gaslam [aut, cre], Elliott Sales De Andrade [ctb], R Core Team [cph] (UTF8 byte length calcs from src/util.c), Michael Chirico [ctb] (ORCID: ), Unicode, Inc. [cph, dtc] (Unicode Character Database derivative data in src/width.c)", "Maintainer": "Brodie Gaslam ", "Repository": "CRAN" }, @@ -3112,7 +3160,7 @@ }, "flextable": { "Package": "flextable", - "Version": "0.9.9", + "Version": "0.9.10", "Source": "Repository", "Type": "Package", "Title": "Functions for Tabular Reporting", @@ -3277,16 +3325,16 @@ }, "forcats": { "Package": "forcats", - "Version": "1.0.0", + "Version": "1.0.1", "Source": "Repository", "Title": "Tools for Working with Categorical Variables (Factors)", - "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = c(\"aut\", \"cre\")), person(\"RStudio\", role = c(\"cph\", \"fnd\")) )", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")) )", "Description": "Helpers for reordering factor levels (including moving specified levels to front, ordering by first appearance, reversing, and randomly shuffling), and tools for modifying factor levels (including collapsing rare levels into other, 'anonymising', and manually 'recoding').", "License": "MIT + file LICENSE", "URL": "https://forcats.tidyverse.org/, https://github.com/tidyverse/forcats", "BugReports": "https://github.com/tidyverse/forcats/issues", "Depends": [ - "R (>= 3.4)" + "R (>= 4.1)" ], "Imports": [ "cli (>= 3.4.0)", @@ -3311,10 +3359,10 @@ "Config/testthat/edition": "3", "Encoding": "UTF-8", "LazyData": "true", - "RoxygenNote": "7.2.3", + "RoxygenNote": "7.3.3", "NeedsCompilation": "no", - "Author": "Hadley Wickham [aut, cre], RStudio [cph, fnd]", - "Maintainer": "Hadley Wickham ", + "Author": "Hadley Wickham [aut, cre], Posit Software, PBC [cph, fnd] (ROR: )", + "Maintainer": "Hadley Wickham ", "Repository": "CRAN" }, "foreach": { @@ -3523,7 +3571,7 @@ }, "gdtools": { "Package": "gdtools", - "Version": "0.4.2", + "Version": "0.4.4", "Source": "Repository", "Title": "Utilities for Graphical Rendering and Fonts Management", "Authors@R": "c( person(\"David\", \"Gohel\", , \"david.gohel@ardata.fr\", role = c(\"aut\", \"cre\")), person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = \"aut\"), person(\"Lionel\", \"Henry\", , \"lionel@rstudio.com\", role = \"aut\"), person(\"Jeroen\", \"Ooms\", , \"jeroen@berkeley.edu\", role = \"aut\", comment = c(ORCID = \"0000-0002-4035-0289\")), person(\"Yixuan\", \"Qiu\", role = \"ctb\"), person(\"R Core Team\", role = \"cph\", comment = \"Cairo code from X11 device\"), person(\"ArData\", role = \"cph\"), person(\"RStudio\", role = \"cph\") )", @@ -3538,7 +3586,7 @@ "fontquiver (>= 0.2.0)", "htmltools", "Rcpp (>= 0.12.12)", - "systemfonts (>= 1.1.0)", + "systemfonts (>= 1.3.1)", "tools" ], "Suggests": [ @@ -3551,10 +3599,10 @@ "Rcpp" ], "Encoding": "UTF-8", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "SystemRequirements": "cairo, freetype2, fontconfig", "NeedsCompilation": "yes", - "Author": "David Gohel [aut, cre], Hadley Wickham [aut], Lionel Henry [aut], Jeroen Ooms [aut] (), Yixuan Qiu [ctb], R Core Team [cph] (Cairo code from X11 device), ArData [cph], RStudio [cph]", + "Author": "David Gohel [aut, cre], Hadley Wickham [aut], Lionel Henry [aut], Jeroen Ooms [aut] (ORCID: ), Yixuan Qiu [ctb], R Core Team [cph] (Cairo code from X11 device), ArData [cph], RStudio [cph]", "Maintainer": "David Gohel ", "Repository": "CRAN" }, @@ -3725,76 +3773,80 @@ }, "ggplot2": { "Package": "ggplot2", - "Version": "3.5.2", + "Version": "4.0.1", "Source": "Repository", "Title": "Create Elegant Data Visualisations Using the Grammar of Graphics", - "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-4757-117X\")), person(\"Winston\", \"Chang\", role = \"aut\", comment = c(ORCID = \"0000-0002-1576-2126\")), person(\"Lionel\", \"Henry\", role = \"aut\"), person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-5147-4711\")), person(\"Kohske\", \"Takahashi\", role = \"aut\"), person(\"Claus\", \"Wilke\", role = \"aut\", comment = c(ORCID = \"0000-0002-7470-9261\")), person(\"Kara\", \"Woo\", role = \"aut\", comment = c(ORCID = \"0000-0002-5125-4188\")), person(\"Hiroaki\", \"Yutani\", role = \"aut\", comment = c(ORCID = \"0000-0002-3385-7233\")), person(\"Dewey\", \"Dunnington\", role = \"aut\", comment = c(ORCID = \"0000-0002-9415-4582\")), person(\"Teun\", \"van den Brand\", role = \"aut\", comment = c(ORCID = \"0000-0002-9335-7468\")), person(\"Posit, PBC\", role = c(\"cph\", \"fnd\")) )", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-4757-117X\")), person(\"Winston\", \"Chang\", role = \"aut\", comment = c(ORCID = \"0000-0002-1576-2126\")), person(\"Lionel\", \"Henry\", role = \"aut\"), person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-5147-4711\")), person(\"Kohske\", \"Takahashi\", role = \"aut\"), person(\"Claus\", \"Wilke\", role = \"aut\", comment = c(ORCID = \"0000-0002-7470-9261\")), person(\"Kara\", \"Woo\", role = \"aut\", comment = c(ORCID = \"0000-0002-5125-4188\")), person(\"Hiroaki\", \"Yutani\", role = \"aut\", comment = c(ORCID = \"0000-0002-3385-7233\")), person(\"Dewey\", \"Dunnington\", role = \"aut\", comment = c(ORCID = \"0000-0002-9415-4582\")), person(\"Teun\", \"van den Brand\", role = \"aut\", comment = c(ORCID = \"0000-0002-9335-7468\")), person(\"Posit, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")) )", "Description": "A system for 'declaratively' creating graphics, based on \"The Grammar of Graphics\". You provide the data, tell 'ggplot2' how to map variables to aesthetics, what graphical primitives to use, and it takes care of the details.", "License": "MIT + file LICENSE", "URL": "https://ggplot2.tidyverse.org, https://github.com/tidyverse/ggplot2", "BugReports": "https://github.com/tidyverse/ggplot2/issues", "Depends": [ - "R (>= 3.5)" + "R (>= 4.1)" ], "Imports": [ "cli", - "glue", "grDevices", "grid", - "gtable (>= 0.1.1)", + "gtable (>= 0.3.6)", "isoband", "lifecycle (> 1.0.1)", - "MASS", - "mgcv", "rlang (>= 1.1.0)", - "scales (>= 1.3.0)", + "S7", + "scales (>= 1.4.0)", "stats", - "tibble", "vctrs (>= 0.6.0)", "withr (>= 2.5.0)" ], "Suggests": [ + "broom", "covr", "dplyr", "ggplot2movies", "hexbin", "Hmisc", + "hms", "knitr", "mapproj", "maps", + "MASS", + "mgcv", "multcomp", "munsell", "nlme", "profvis", "quantreg", + "quarto", "ragg (>= 1.2.6)", "RColorBrewer", - "rmarkdown", + "roxygen2", "rpart", "sf (>= 0.7-3)", "svglite (>= 2.1.2)", - "testthat (>= 3.1.2)", + "testthat (>= 3.1.5)", + "tibble", "vdiffr (>= 1.0.6)", "xml2" ], "Enhances": [ "sp" ], - "VignetteBuilder": "knitr", + "VignetteBuilder": "quarto", "Config/Needs/website": "ggtext, tidyr, forcats, tidyverse/tidytemplate", "Config/testthat/edition": "3", + "Config/usethis/last-upkeep": "2025-04-23", "Encoding": "UTF-8", "LazyData": "true", - "RoxygenNote": "7.3.2", - "Collate": "'ggproto.R' 'ggplot-global.R' 'aaa-.R' 'aes-colour-fill-alpha.R' 'aes-evaluation.R' 'aes-group-order.R' 'aes-linetype-size-shape.R' 'aes-position.R' 'compat-plyr.R' 'utilities.R' 'aes.R' 'utilities-checks.R' 'legend-draw.R' 'geom-.R' 'annotation-custom.R' 'annotation-logticks.R' 'geom-polygon.R' 'geom-map.R' 'annotation-map.R' 'geom-raster.R' 'annotation-raster.R' 'annotation.R' 'autolayer.R' 'autoplot.R' 'axis-secondary.R' 'backports.R' 'bench.R' 'bin.R' 'coord-.R' 'coord-cartesian-.R' 'coord-fixed.R' 'coord-flip.R' 'coord-map.R' 'coord-munch.R' 'coord-polar.R' 'coord-quickmap.R' 'coord-radial.R' 'coord-sf.R' 'coord-transform.R' 'data.R' 'docs_layer.R' 'facet-.R' 'facet-grid-.R' 'facet-null.R' 'facet-wrap.R' 'fortify-lm.R' 'fortify-map.R' 'fortify-multcomp.R' 'fortify-spatial.R' 'fortify.R' 'stat-.R' 'geom-abline.R' 'geom-rect.R' 'geom-bar.R' 'geom-bin2d.R' 'geom-blank.R' 'geom-boxplot.R' 'geom-col.R' 'geom-path.R' 'geom-contour.R' 'geom-count.R' 'geom-crossbar.R' 'geom-segment.R' 'geom-curve.R' 'geom-defaults.R' 'geom-ribbon.R' 'geom-density.R' 'geom-density2d.R' 'geom-dotplot.R' 'geom-errorbar.R' 'geom-errorbarh.R' 'geom-freqpoly.R' 'geom-function.R' 'geom-hex.R' 'geom-histogram.R' 'geom-hline.R' 'geom-jitter.R' 'geom-label.R' 'geom-linerange.R' 'geom-point.R' 'geom-pointrange.R' 'geom-quantile.R' 'geom-rug.R' 'geom-sf.R' 'geom-smooth.R' 'geom-spoke.R' 'geom-text.R' 'geom-tile.R' 'geom-violin.R' 'geom-vline.R' 'ggplot2-package.R' 'grob-absolute.R' 'grob-dotstack.R' 'grob-null.R' 'grouping.R' 'theme-elements.R' 'guide-.R' 'guide-axis.R' 'guide-axis-logticks.R' 'guide-axis-stack.R' 'guide-axis-theta.R' 'guide-legend.R' 'guide-bins.R' 'guide-colorbar.R' 'guide-colorsteps.R' 'guide-custom.R' 'layer.R' 'guide-none.R' 'guide-old.R' 'guides-.R' 'guides-grid.R' 'hexbin.R' 'import-standalone-obj-type.R' 'import-standalone-types-check.R' 'labeller.R' 'labels.R' 'layer-sf.R' 'layout.R' 'limits.R' 'margins.R' 'performance.R' 'plot-build.R' 'plot-construction.R' 'plot-last.R' 'plot.R' 'position-.R' 'position-collide.R' 'position-dodge.R' 'position-dodge2.R' 'position-identity.R' 'position-jitter.R' 'position-jitterdodge.R' 'position-nudge.R' 'position-stack.R' 'quick-plot.R' 'reshape-add-margins.R' 'save.R' 'scale-.R' 'scale-alpha.R' 'scale-binned.R' 'scale-brewer.R' 'scale-colour.R' 'scale-continuous.R' 'scale-date.R' 'scale-discrete-.R' 'scale-expansion.R' 'scale-gradient.R' 'scale-grey.R' 'scale-hue.R' 'scale-identity.R' 'scale-linetype.R' 'scale-linewidth.R' 'scale-manual.R' 'scale-shape.R' 'scale-size.R' 'scale-steps.R' 'scale-type.R' 'scale-view.R' 'scale-viridis.R' 'scales-.R' 'stat-align.R' 'stat-bin.R' 'stat-bin2d.R' 'stat-bindot.R' 'stat-binhex.R' 'stat-boxplot.R' 'stat-contour.R' 'stat-count.R' 'stat-density-2d.R' 'stat-density.R' 'stat-ecdf.R' 'stat-ellipse.R' 'stat-function.R' 'stat-identity.R' 'stat-qq-line.R' 'stat-qq.R' 'stat-quantilemethods.R' 'stat-sf-coordinates.R' 'stat-sf.R' 'stat-smooth-methods.R' 'stat-smooth.R' 'stat-sum.R' 'stat-summary-2d.R' 'stat-summary-bin.R' 'stat-summary-hex.R' 'stat-summary.R' 'stat-unique.R' 'stat-ydensity.R' 'summarise-plot.R' 'summary.R' 'theme.R' 'theme-defaults.R' 'theme-current.R' 'utilities-break.R' 'utilities-grid.R' 'utilities-help.R' 'utilities-matrix.R' 'utilities-patterns.R' 'utilities-resolution.R' 'utilities-tidy-eval.R' 'zxx.R' 'zzz.R'", + "RoxygenNote": "7.3.3", + "Collate": "'ggproto.R' 'ggplot-global.R' 'aaa-.R' 'aes-colour-fill-alpha.R' 'aes-evaluation.R' 'aes-group-order.R' 'aes-linetype-size-shape.R' 'aes-position.R' 'all-classes.R' 'compat-plyr.R' 'utilities.R' 'aes.R' 'annotation-borders.R' 'utilities-checks.R' 'legend-draw.R' 'geom-.R' 'annotation-custom.R' 'annotation-logticks.R' 'scale-type.R' 'layer.R' 'make-constructor.R' 'geom-polygon.R' 'geom-map.R' 'annotation-map.R' 'geom-raster.R' 'annotation-raster.R' 'annotation.R' 'autolayer.R' 'autoplot.R' 'axis-secondary.R' 'backports.R' 'bench.R' 'bin.R' 'coord-.R' 'coord-cartesian-.R' 'coord-fixed.R' 'coord-flip.R' 'coord-map.R' 'coord-munch.R' 'coord-polar.R' 'coord-quickmap.R' 'coord-radial.R' 'coord-sf.R' 'coord-transform.R' 'data.R' 'docs_layer.R' 'facet-.R' 'facet-grid-.R' 'facet-null.R' 'facet-wrap.R' 'fortify-map.R' 'fortify-models.R' 'fortify-spatial.R' 'fortify.R' 'stat-.R' 'geom-abline.R' 'geom-rect.R' 'geom-bar.R' 'geom-tile.R' 'geom-bin2d.R' 'geom-blank.R' 'geom-boxplot.R' 'geom-col.R' 'geom-path.R' 'geom-contour.R' 'geom-point.R' 'geom-count.R' 'geom-crossbar.R' 'geom-segment.R' 'geom-curve.R' 'geom-defaults.R' 'geom-ribbon.R' 'geom-density.R' 'geom-density2d.R' 'geom-dotplot.R' 'geom-errorbar.R' 'geom-freqpoly.R' 'geom-function.R' 'geom-hex.R' 'geom-histogram.R' 'geom-hline.R' 'geom-jitter.R' 'geom-label.R' 'geom-linerange.R' 'geom-pointrange.R' 'geom-quantile.R' 'geom-rug.R' 'geom-sf.R' 'geom-smooth.R' 'geom-spoke.R' 'geom-text.R' 'geom-violin.R' 'geom-vline.R' 'ggplot2-package.R' 'grob-absolute.R' 'grob-dotstack.R' 'grob-null.R' 'grouping.R' 'properties.R' 'margins.R' 'theme-elements.R' 'guide-.R' 'guide-axis.R' 'guide-axis-logticks.R' 'guide-axis-stack.R' 'guide-axis-theta.R' 'guide-legend.R' 'guide-bins.R' 'guide-colorbar.R' 'guide-colorsteps.R' 'guide-custom.R' 'guide-none.R' 'guide-old.R' 'guides-.R' 'guides-grid.R' 'hexbin.R' 'import-standalone-obj-type.R' 'import-standalone-types-check.R' 'labeller.R' 'labels.R' 'layer-sf.R' 'layout.R' 'limits.R' 'performance.R' 'plot-build.R' 'plot-construction.R' 'plot-last.R' 'plot.R' 'position-.R' 'position-collide.R' 'position-dodge.R' 'position-dodge2.R' 'position-identity.R' 'position-jitter.R' 'position-jitterdodge.R' 'position-nudge.R' 'position-stack.R' 'quick-plot.R' 'reshape-add-margins.R' 'save.R' 'scale-.R' 'scale-alpha.R' 'scale-binned.R' 'scale-brewer.R' 'scale-colour.R' 'scale-continuous.R' 'scale-date.R' 'scale-discrete-.R' 'scale-expansion.R' 'scale-gradient.R' 'scale-grey.R' 'scale-hue.R' 'scale-identity.R' 'scale-linetype.R' 'scale-linewidth.R' 'scale-manual.R' 'scale-shape.R' 'scale-size.R' 'scale-steps.R' 'scale-view.R' 'scale-viridis.R' 'scales-.R' 'stat-align.R' 'stat-bin.R' 'stat-summary-2d.R' 'stat-bin2d.R' 'stat-bindot.R' 'stat-binhex.R' 'stat-boxplot.R' 'stat-connect.R' 'stat-contour.R' 'stat-count.R' 'stat-density-2d.R' 'stat-density.R' 'stat-ecdf.R' 'stat-ellipse.R' 'stat-function.R' 'stat-identity.R' 'stat-manual.R' 'stat-qq-line.R' 'stat-qq.R' 'stat-quantilemethods.R' 'stat-sf-coordinates.R' 'stat-sf.R' 'stat-smooth-methods.R' 'stat-smooth.R' 'stat-sum.R' 'stat-summary-bin.R' 'stat-summary-hex.R' 'stat-summary.R' 'stat-unique.R' 'stat-ydensity.R' 'summarise-plot.R' 'summary.R' 'theme.R' 'theme-defaults.R' 'theme-current.R' 'theme-sub.R' 'utilities-break.R' 'utilities-grid.R' 'utilities-help.R' 'utilities-patterns.R' 'utilities-resolution.R' 'utilities-tidy-eval.R' 'zxx.R' 'zzz.R'", "NeedsCompilation": "no", - "Author": "Hadley Wickham [aut] (), Winston Chang [aut] (), Lionel Henry [aut], Thomas Lin Pedersen [aut, cre] (), Kohske Takahashi [aut], Claus Wilke [aut] (), Kara Woo [aut] (), Hiroaki Yutani [aut] (), Dewey Dunnington [aut] (), Teun van den Brand [aut] (), Posit, PBC [cph, fnd]", + "Author": "Hadley Wickham [aut] (ORCID: ), Winston Chang [aut] (ORCID: ), Lionel Henry [aut], Thomas Lin Pedersen [aut, cre] (ORCID: ), Kohske Takahashi [aut], Claus Wilke [aut] (ORCID: ), Kara Woo [aut] (ORCID: ), Hiroaki Yutani [aut] (ORCID: ), Dewey Dunnington [aut] (ORCID: ), Teun van den Brand [aut] (ORCID: ), Posit, PBC [cph, fnd] (ROR: )", "Maintainer": "Thomas Lin Pedersen ", "Repository": "CRAN" }, "ggridges": { "Package": "ggridges", - "Version": "0.5.6", + "Version": "0.5.7", "Source": "Repository", "Type": "Package", "Title": "Ridgeline Plots in 'ggplot2'", @@ -3806,7 +3858,7 @@ "R (>= 3.2)" ], "Imports": [ - "ggplot2 (>= 3.4.0)", + "ggplot2 (>= 3.5.0)", "grid (>= 3.0.0)", "scales (>= 0.4.1)", "withr (>= 2.1.1)" @@ -3826,16 +3878,16 @@ ], "VignetteBuilder": "knitr", "Collate": "'data.R' 'ggridges.R' 'geoms.R' 'geomsv.R' 'geoms-gradient.R' 'geom-density-line.R' 'position.R' 'scale-cyclical.R' 'scale-point.R' 'scale-vline.R' 'stats.R' 'theme.R' 'utils_ggplot2.R' 'utils.R'", - "RoxygenNote": "7.2.3", + "RoxygenNote": "7.3.2", "Encoding": "UTF-8", "NeedsCompilation": "no", - "Author": "Claus O. Wilke [aut, cre] ()", + "Author": "Claus O. Wilke [aut, cre] (ORCID: )", "Maintainer": "Claus O. Wilke ", "Repository": "CRAN" }, "ggstats": { "Package": "ggstats", - "Version": "0.10.0", + "Version": "0.11.0", "Source": "Repository", "Type": "Package", "Title": "Extension to 'ggplot2' for Plotting Stats", @@ -3851,7 +3903,7 @@ "cli", "dplyr", "forcats", - "ggplot2 (>= 3.4.0)", + "ggplot2 (>= 4.0.0)", "lifecycle", "patchwork", "purrr", @@ -3965,7 +4017,7 @@ }, "gt": { "Package": "gt", - "Version": "1.0.0", + "Version": "1.1.0", "Source": "Repository", "Type": "Package", "Title": "Easily Create Presentation-Ready Display Tables", @@ -4000,6 +4052,7 @@ "xml2 (>= 1.3.6)" ], "Suggests": [ + "farver", "fontawesome (>= 0.5.2)", "ggplot2", "grid", @@ -4028,7 +4081,7 @@ "LazyData": "true", "RoxygenNote": "7.3.2", "NeedsCompilation": "no", - "Author": "Richard Iannone [aut, cre] (), Joe Cheng [aut], Barret Schloerke [aut] (), Ellis Hughes [aut] (), Alexandra Lauer [aut] (), JooYoung Seo [aut] (), Ken Brevoort [aut] (), Olivier Roy [aut], Posit Software, PBC [cph, fnd]", + "Author": "Richard Iannone [aut, cre] (ORCID: ), Joe Cheng [aut], Barret Schloerke [aut] (ORCID: ), Ellis Hughes [aut] (ORCID: ), Alexandra Lauer [aut] (ORCID: ), JooYoung Seo [aut] (ORCID: ), Ken Brevoort [aut] (ORCID: ), Olivier Roy [aut], Posit Software, PBC [cph, fnd]", "Maintainer": "Richard Iannone ", "Repository": "CRAN" }, @@ -4074,10 +4127,10 @@ }, "gtsummary": { "Package": "gtsummary", - "Version": "2.3.0", + "Version": "2.5.0", "Source": "Repository", "Title": "Presentation-Ready Data Summary and Analytic Result Tables", - "Authors@R": "c( person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-0862-2018\")), person(\"Joseph\", \"Larmarange\", role = \"aut\", comment = c(ORCID = \"0000-0001-7097-700X\")), person(\"Michael\", \"Curry\", role = \"aut\", comment = c(ORCID = \"0000-0002-0261-4044\")), person(\"Emily\", \"de la Rua\", , role = \"aut\", comment = c(ORCID = \"0009-0000-8738-5561\")), person(\"Jessica\", \"Lavery\", role = \"aut\", comment = c(ORCID = \"0000-0002-2746-5647\")), person(\"Karissa\", \"Whiting\", role = \"aut\", comment = c(ORCID = \"0000-0002-4683-1868\")), person(\"Emily C.\", \"Zabor\", role = \"aut\", comment = c(ORCID = \"0000-0002-1402-4498\")), person(\"Xing\", \"Bai\", role = \"ctb\"), person(\"Esther\", \"Drill\", role = \"ctb\", comment = c(ORCID = \"0000-0002-3315-4538\")), person(\"Jessica\", \"Flynn\", role = \"ctb\", comment = c(ORCID = \"0000-0001-8310-6684\")), person(\"Margie\", \"Hannum\", role = \"ctb\", comment = c(ORCID = \"0000-0002-2953-0449\")), person(\"Stephanie\", \"Lobaugh\", role = \"ctb\"), person(\"Shannon\", \"Pileggi\", role = \"ctb\", comment = c(ORCID = \"0000-0002-7732-4164\")), person(\"Amy\", \"Tin\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8005-0694\")), person(\"Gustavo\", \"Zapata Wainberg\", role = \"ctb\", comment = c(ORCID = \"0000-0002-2524-3637\")) )", + "Authors@R": "c( person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-0862-2018\")), person(\"Joseph\", \"Larmarange\", role = \"aut\", comment = c(ORCID = \"0000-0001-7097-700X\")), person(\"Michael\", \"Curry\", role = \"aut\", comment = c(ORCID = \"0000-0002-0261-4044\")), person(\"Emily\", \"de la Rua\", , role = \"aut\", comment = c(ORCID = \"0009-0000-8738-5561\")), person(\"Jessica\", \"Lavery\", role = \"aut\", comment = c(ORCID = \"0000-0002-2746-5647\")), person(\"Karissa\", \"Whiting\", role = \"aut\", comment = c(ORCID = \"0000-0002-4683-1868\")), person(\"Emily C.\", \"Zabor\", role = \"aut\", comment = c(ORCID = \"0000-0002-1402-4498\")), person(\"Xing\", \"Bai\", role = \"ctb\"), person(\"Malcolm\", \"Barrett\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0299-5825\")), person(\"Esther\", \"Drill\", role = \"ctb\", comment = c(ORCID = \"0000-0002-3315-4538\")), person(\"Jessica\", \"Flynn\", role = \"ctb\", comment = c(ORCID = \"0000-0001-8310-6684\")), person(\"Margie\", \"Hannum\", role = \"ctb\", comment = c(ORCID = \"0000-0002-2953-0449\")), person(\"Stephanie\", \"Lobaugh\", role = \"ctb\"), person(\"Shannon\", \"Pileggi\", role = \"ctb\", comment = c(ORCID = \"0000-0002-7732-4164\")), person(\"Amy\", \"Tin\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8005-0694\")), person(\"Gustavo\", \"Zapata Wainberg\", role = \"ctb\", comment = c(ORCID = \"0000-0002-2524-3637\")) )", "Description": "Creates presentation-ready tables summarizing data sets, regression models, and more. The code to create the tables is concise and highly customizable. Data frames can be summarized with any function, e.g. mean(), median(), even user-written functions. Regression models are summarized and include the reference rows for categorical variables. Common regression models, such as logistic regression and Cox proportional hazards regression, are automatically identified and the tables are pre-filled with appropriate column headers.", "License": "MIT + file LICENSE", "URL": "https://github.com/ddsjoberg/gtsummary, https://www.danieldsjoberg.com/gtsummary/", @@ -4086,7 +4139,8 @@ "R (>= 4.2)" ], "Imports": [ - "cards (>= 0.6.1)", + "cards (>= 0.7.1)", + "cardx (>= 0.3.1)", "cli (>= 3.6.3)", "dplyr (>= 1.1.3)", "glue (>= 1.8.0)", @@ -4102,7 +4156,6 @@ "broom.helpers (>= 1.20.0)", "broom.mixed (>= 0.2.9)", "car (>= 3.0-11)", - "cardx (>= 0.2.5)", "cmprsk", "effectsize (>= 0.6.0)", "emmeans (>= 1.7.3)", @@ -4137,9 +4190,9 @@ "Encoding": "UTF-8", "Language": "en-US", "LazyData": "true", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "NeedsCompilation": "no", - "Author": "Daniel D. Sjoberg [aut, cre] (ORCID: ), Joseph Larmarange [aut] (ORCID: ), Michael Curry [aut] (ORCID: ), Emily de la Rua [aut] (ORCID: ), Jessica Lavery [aut] (ORCID: ), Karissa Whiting [aut] (ORCID: ), Emily C. Zabor [aut] (ORCID: ), Xing Bai [ctb], Esther Drill [ctb] (ORCID: ), Jessica Flynn [ctb] (ORCID: ), Margie Hannum [ctb] (ORCID: ), Stephanie Lobaugh [ctb], Shannon Pileggi [ctb] (ORCID: ), Amy Tin [ctb] (ORCID: ), Gustavo Zapata Wainberg [ctb] (ORCID: )", + "Author": "Daniel D. Sjoberg [aut, cre] (ORCID: ), Joseph Larmarange [aut] (ORCID: ), Michael Curry [aut] (ORCID: ), Emily de la Rua [aut] (ORCID: ), Jessica Lavery [aut] (ORCID: ), Karissa Whiting [aut] (ORCID: ), Emily C. Zabor [aut] (ORCID: ), Xing Bai [ctb], Malcolm Barrett [ctb] (ORCID: ), Esther Drill [ctb] (ORCID: ), Jessica Flynn [ctb] (ORCID: ), Margie Hannum [ctb] (ORCID: ), Stephanie Lobaugh [ctb], Shannon Pileggi [ctb] (ORCID: ), Amy Tin [ctb] (ORCID: ), Gustavo Zapata Wainberg [ctb] (ORCID: )", "Maintainer": "Daniel D. Sjoberg ", "Repository": "CRAN" }, @@ -4194,17 +4247,17 @@ }, "here": { "Package": "here", - "Version": "1.0.1", + "Version": "1.0.2", "Source": "Repository", "Title": "A Simpler Way to Find Your Files", - "Date": "2020-12-13", - "Authors@R": "c(person(given = \"Kirill\", family = \"M\\u00fcller\", role = c(\"aut\", \"cre\"), email = \"krlmlr+r@mailbox.org\", comment = c(ORCID = \"0000-0002-1416-3412\")), person(given = \"Jennifer\", family = \"Bryan\", role = \"ctb\", email = \"jenny@rstudio.com\", comment = c(ORCID = \"0000-0002-6983-2759\")))", + "Date": "2025-09-06", + "Authors@R": "c(person(given = \"Kirill\", family = \"M\\u00fcller\", role = c(\"aut\", \"cre\"), email = \"kirill@cynkra.com\", comment = c(ORCID = \"0000-0002-1416-3412\")), person(given = \"Jennifer\", family = \"Bryan\", role = \"ctb\", email = \"jenny@rstudio.com\", comment = c(ORCID = \"0000-0002-6983-2759\")))", "Description": "Constructs paths to your project's files. Declare the relative path of a file within your project with 'i_am()'. Use the 'here()' function as a drop-in replacement for 'file.path()', it will always locate the files relative to your project root.", "License": "MIT + file LICENSE", "URL": "https://here.r-lib.org/, https://github.com/r-lib/here", "BugReports": "https://github.com/r-lib/here/issues", "Imports": [ - "rprojroot (>= 2.0.2)" + "rprojroot (>= 2.1.0)" ], "Suggests": [ "conflicted", @@ -4222,12 +4275,12 @@ ], "VignetteBuilder": "knitr", "Encoding": "UTF-8", - "LazyData": "true", - "RoxygenNote": "7.1.1.9000", + "RoxygenNote": "7.3.3.9000", "Config/testthat/edition": "3", + "Config/Needs/website": "tidyverse/tidytemplate", "NeedsCompilation": "no", - "Author": "Kirill Müller [aut, cre] (), Jennifer Bryan [ctb] ()", - "Maintainer": "Kirill Müller ", + "Author": "Kirill Müller [aut, cre] (ORCID: ), Jennifer Bryan [ctb] (ORCID: )", + "Maintainer": "Kirill Müller ", "Repository": "CRAN" }, "highr": { @@ -4262,13 +4315,17 @@ }, "hms": { "Package": "hms", - "Version": "1.1.3", + "Version": "1.1.4", "Source": "Repository", "Title": "Pretty Time of Day", - "Date": "2023-03-21", - "Authors@R": "c( person(\"Kirill\", \"Müller\", role = c(\"aut\", \"cre\"), email = \"kirill@cynkra.com\", comment = c(ORCID = \"0000-0002-1416-3412\")), person(\"R Consortium\", role = \"fnd\"), person(\"RStudio\", role = \"fnd\") )", + "Date": "2025-10-11", + "Authors@R": "c( person(\"Kirill\", \"Müller\", , \"kirill@cynkra.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-1416-3412\")), person(\"R Consortium\", role = \"fnd\"), person(\"Posit Software, PBC\", role = \"fnd\", comment = c(ROR = \"03wc8by49\")) )", "Description": "Implements an S3 class for storing and formatting time-of-day values, based on the 'difftime' class.", + "License": "MIT + file LICENSE", + "URL": "https://hms.tidyverse.org/, https://github.com/tidyverse/hms", + "BugReports": "https://github.com/tidyverse/hms/issues", "Imports": [ + "cli", "lifecycle", "methods", "pkgconfig", @@ -4281,17 +4338,12 @@ "pillar (>= 1.1.0)", "testthat (>= 3.0.0)" ], - "License": "MIT + file LICENSE", - "Encoding": "UTF-8", - "URL": "https://hms.tidyverse.org/, https://github.com/tidyverse/hms", - "BugReports": "https://github.com/tidyverse/hms/issues", - "RoxygenNote": "7.2.3", - "Config/testthat/edition": "3", - "Config/autostyle/scope": "line_breaks", - "Config/autostyle/strict": "false", "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.3.9000", "NeedsCompilation": "no", - "Author": "Kirill Müller [aut, cre] (), R Consortium [fnd], RStudio [fnd]", + "Author": "Kirill Müller [aut, cre] (ORCID: ), R Consortium [fnd], Posit Software, PBC [fnd] (ROR: )", "Maintainer": "Kirill Müller ", "Repository": "CRAN" }, @@ -4345,7 +4397,7 @@ }, "htmltools": { "Package": "htmltools", - "Version": "0.5.8.1", + "Version": "0.5.9", "Source": "Repository", "Type": "Package", "Title": "Tools for HTML", @@ -4379,10 +4431,10 @@ "Config/Needs/check": "knitr", "Config/Needs/website": "rstudio/quillt, bench", "Encoding": "UTF-8", - "RoxygenNote": "7.3.1", + "RoxygenNote": "7.3.3", "Collate": "'colors.R' 'fill.R' 'html_dependency.R' 'html_escape.R' 'html_print.R' 'htmltools-package.R' 'images.R' 'known_tags.R' 'selector.R' 'staticimports.R' 'tag_query.R' 'utils.R' 'tags.R' 'template.R'", "NeedsCompilation": "yes", - "Author": "Joe Cheng [aut], Carson Sievert [aut, cre] (), Barret Schloerke [aut] (), Winston Chang [aut] (), Yihui Xie [aut], Jeff Allen [aut], Posit Software, PBC [cph, fnd]", + "Author": "Joe Cheng [aut], Carson Sievert [aut, cre] (ORCID: ), Barret Schloerke [aut] (ORCID: ), Winston Chang [aut] (ORCID: ), Yihui Xie [aut], Jeff Allen [aut], Posit Software, PBC [cph, fnd]", "Maintainer": "Carson Sievert ", "Repository": "CRAN" }, @@ -4502,7 +4554,7 @@ }, "insight": { "Package": "insight", - "Version": "1.4.0", + "Version": "1.4.4", "Source": "Repository", "Type": "Package", "Title": "Easy Access to Model Information for Various Model Objects", @@ -4530,7 +4582,6 @@ "bbmle", "bdsmatrix", "betareg", - "bife", "biglm", "BH", "blavaan (>= 0.5-5)", @@ -4567,7 +4618,7 @@ "geepack", "geoR", "GLMMadaptive", - "glmmTMB (>= 1.1.10)", + "glmmTMB (>= 1.1.12)", "glmtoolbox", "gmnl", "grDevices", @@ -4580,13 +4631,14 @@ "knitr", "lavaan", "lavaSearch2", + "lcmm", "lfe", "lme4", "lmerTest", "lmtest", "logistf", "logitr", - "marginaleffects (>= 0.26.0)", + "marginaleffects (>= 0.29.0)", "MASS", "Matrix", "mclogit", @@ -4598,6 +4650,7 @@ "metafor", "metaplus", "mgcv", + "mhurdle", "mice (>= 3.17.0)", "mlogit", "mmrm", @@ -4611,7 +4664,7 @@ "nonnest2", "ordinal", "panelr", - "parameters", + "parameters (>= 0.28.0)", "parsnip", "pbkrtest", "performance", @@ -4643,7 +4696,7 @@ "survival", "svylme", "testthat", - "tinytable (>= 0.8.0)", + "tinytable (>= 0.13.0)", "TMB", "truncreg", "tune", @@ -4655,7 +4708,7 @@ "VignetteBuilder": "knitr", "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Config/testthat/edition": "3", "Config/testthat/parallel": "true", "Config/Needs/website": "easystats/easystatstemplate", @@ -4666,16 +4719,18 @@ }, "isoband": { "Package": "isoband", - "Version": "0.2.7", + "Version": "0.3.0", "Source": "Repository", "Title": "Generate Isolines and Isobands from Regularly Spaced Elevation Grids", - "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-4757-117X\")), person(\"Claus O.\", \"Wilke\", , \"wilke@austin.utexas.edu\", role = \"aut\", comment = c(\"Original author\", ORCID = \"0000-0002-7470-9261\")), person(\"Thomas Lin\", \"Pedersen\", , \"thomasp85@gmail.com\", role = \"aut\", comment = c(ORCID = \"0000-0002-5147-4711\")) )", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-4757-117X\")), person(\"Claus O.\", \"Wilke\", , \"wilke@austin.utexas.edu\", role = \"aut\", comment = c(\"Original author\", ORCID = \"0000-0002-7470-9261\")), person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-5147-4711\")), person(\"Posit, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")) )", "Description": "A fast C++ implementation to generate contour lines (isolines) and contour polygons (isobands) from regularly spaced grids containing elevation data.", "License": "MIT + file LICENSE", - "URL": "https://isoband.r-lib.org", + "URL": "https://isoband.r-lib.org, https://github.com/r-lib/isoband", "BugReports": "https://github.com/r-lib/isoband/issues", "Imports": [ + "cli", "grid", + "rlang", "utils" ], "Suggests": [ @@ -4683,21 +4738,25 @@ "ggplot2", "knitr", "magick", - "microbenchmark", + "bench", "rmarkdown", "sf", - "testthat", + "testthat (>= 3.0.0)", "xml2" ], "VignetteBuilder": "knitr", "Config/Needs/website": "tidyverse/tidytemplate", "Config/testthat/edition": "3", + "Config/usethis/last-upkeep": "2025-12-05", "Encoding": "UTF-8", - "RoxygenNote": "7.2.3", - "SystemRequirements": "C++11", + "RoxygenNote": "7.3.3", + "Config/build/compilation-database": "true", + "LinkingTo": [ + "cpp11" + ], "NeedsCompilation": "yes", - "Author": "Hadley Wickham [aut, cre] (), Claus O. Wilke [aut] (Original author, ), Thomas Lin Pedersen [aut] ()", - "Maintainer": "Hadley Wickham ", + "Author": "Hadley Wickham [aut] (ORCID: ), Claus O. Wilke [aut] (Original author, ORCID: ), Thomas Lin Pedersen [aut, cre] (ORCID: ), Posit, PBC [cph, fnd] (ROR: )", + "Maintainer": "Thomas Lin Pedersen ", "Repository": "CRAN" }, "iterators": { @@ -4924,7 +4983,7 @@ }, "labelled": { "Package": "labelled", - "Version": "2.14.1", + "Version": "2.16.0", "Source": "Repository", "Type": "Package", "Title": "Manipulating Labelled Data", @@ -4944,16 +5003,19 @@ "rlang (>= 1.1.0)", "vctrs", "stringr", - "tidyr", + "tidyr (>= 1.3.0)", "tidyselect" ], "Suggests": [ - "testthat (>= 3.2.0)", + "gt", "knitr", "rmarkdown", + "purrr", "questionr", "snakecase", - "spelling" + "spelling", + "survey", + "testthat (>= 3.2.0)" ], "Enhances": [ "memisc" @@ -4962,7 +5024,7 @@ "BugReports": "https://github.com/larmarange/labelled/issues", "VignetteBuilder": "knitr", "LazyData": "true", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Language": "en-US", "Config/testthat/edition": "3", "Config/Needs/check": "memisc", @@ -4972,35 +5034,37 @@ }, "later": { "Package": "later", - "Version": "1.4.2", + "Version": "1.4.4", "Source": "Repository", "Type": "Package", "Title": "Utilities for Scheduling Functions to Execute Later with Event Loops", - "Authors@R": "c( person(\"Winston\", \"Chang\", role = c(\"aut\", \"cre\"), email = \"winston@posit.co\"), person(\"Joe\", \"Cheng\", role = c(\"aut\"), email = \"joe@posit.co\"), person(\"Charlie\", \"Gao\", role = c(\"aut\"), email = \"charlie.gao@shikokuchuo.net\", comment = c(ORCID = \"0000-0002-0750-061X\")), person(family = \"Posit Software, PBC\", role = \"cph\"), person(\"Marcus\", \"Geelnard\", role = c(\"ctb\", \"cph\"), comment = \"TinyCThread library, https://tinycthread.github.io/\"), person(\"Evan\", \"Nemerson\", role = c(\"ctb\", \"cph\"), comment = \"TinyCThread library, https://tinycthread.github.io/\") )", + "Authors@R": "c( person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = \"aut\"), person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"), person(\"Charlie\", \"Gao\", , \"charlie.gao@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-0750-061X\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")), person(\"Marcus\", \"Geelnard\", role = c(\"ctb\", \"cph\"), comment = \"TinyCThread library, https://tinycthread.github.io/\"), person(\"Evan\", \"Nemerson\", role = c(\"ctb\", \"cph\"), comment = \"TinyCThread library, https://tinycthread.github.io/\") )", "Description": "Executes arbitrary R or C functions some time after the current time, after the R execution stack has emptied. The functions are scheduled in an event loop.", - "URL": "https://r-lib.github.io/later/, https://github.com/r-lib/later", - "BugReports": "https://github.com/r-lib/later/issues", "License": "MIT + file LICENSE", + "URL": "https://later.r-lib.org, https://github.com/r-lib/later", + "BugReports": "https://github.com/r-lib/later/issues", "Imports": [ "Rcpp (>= 0.12.9)", "rlang" ], - "LinkingTo": [ - "Rcpp" - ], - "RoxygenNote": "7.3.2", "Suggests": [ "knitr", "nanonext", - "R6", "rmarkdown", - "testthat (>= 2.1.0)" + "testthat (>= 3.0.0)" + ], + "LinkingTo": [ + "Rcpp" ], "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/usethis/last-upkeep": "2025-07-18", "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", "NeedsCompilation": "yes", - "Author": "Winston Chang [aut, cre], Joe Cheng [aut], Charlie Gao [aut] (), Posit Software, PBC [cph], Marcus Geelnard [ctb, cph] (TinyCThread library, https://tinycthread.github.io/), Evan Nemerson [ctb, cph] (TinyCThread library, https://tinycthread.github.io/)", - "Maintainer": "Winston Chang ", + "Author": "Winston Chang [aut], Joe Cheng [aut], Charlie Gao [aut, cre] (ORCID: ), Posit Software, PBC [cph, fnd] (ROR: ), Marcus Geelnard [ctb, cph] (TinyCThread library, https://tinycthread.github.io/), Evan Nemerson [ctb, cph] (TinyCThread library, https://tinycthread.github.io/)", + "Maintainer": "Charlie Gao ", "Repository": "CRAN" }, "lattice": { @@ -5110,7 +5174,7 @@ }, "litedown": { "Package": "litedown", - "Version": "0.7", + "Version": "0.8", "Source": "Repository", "Type": "Package", "Title": "A Lightweight Version of R Markdown", @@ -5121,8 +5185,8 @@ ], "Imports": [ "utils", - "commonmark (>= 1.9.5)", - "xfun (>= 0.52)" + "commonmark (>= 2.0.0)", + "xfun (>= 0.54)" ], "Suggests": [ "rbibutils", @@ -5133,19 +5197,19 @@ "URL": "https://github.com/yihui/litedown", "BugReports": "https://github.com/yihui/litedown/issues", "VignetteBuilder": "litedown", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Encoding": "UTF-8", "NeedsCompilation": "no", - "Author": "Yihui Xie [aut, cre] (, https://yihui.org), Tim Taylor [ctb] ()", + "Author": "Yihui Xie [aut, cre] (ORCID: , URL: https://yihui.org), Tim Taylor [ctb] (ORCID: )", "Maintainer": "Yihui Xie ", "Repository": "CRAN" }, "lme4": { "Package": "lme4", - "Version": "1.1-37", + "Version": "1.1-38", "Source": "Repository", "Title": "Linear Mixed-Effects Models using 'Eigen' and S4", - "Authors@R": "c( person(\"Douglas\",\"Bates\", role=\"aut\", comment=c(ORCID=\"0000-0001-8316-9503\")), person(\"Martin\",\"Maechler\", role=\"aut\", comment=c(ORCID=\"0000-0002-8685-9910\")), person(\"Ben\",\"Bolker\",email=\"bbolker+lme4@gmail.com\", role=c(\"aut\",\"cre\"), comment=c(ORCID=\"0000-0002-2127-0443\")), person(\"Steven\",\"Walker\",role=\"aut\", comment=c(ORCID=\"0000-0002-4394-9078\")), person(\"Rune Haubo Bojesen\",\"Christensen\", role=\"ctb\", comment=c(ORCID=\"0000-0002-4494-3399\")), person(\"Henrik\",\"Singmann\", role=\"ctb\", comment=c(ORCID=\"0000-0002-4842-3657\")), person(\"Bin\", \"Dai\", role=\"ctb\"), person(\"Fabian\", \"Scheipl\", role=\"ctb\", comment=c(ORCID=\"0000-0001-8172-3603\")), person(\"Gabor\", \"Grothendieck\", role=\"ctb\"), person(\"Peter\", \"Green\", role=\"ctb\", comment=c(ORCID=\"0000-0002-0238-9852\")), person(\"John\", \"Fox\", role=\"ctb\"), person(\"Alexander\", \"Bauer\", role=\"ctb\"), person(\"Pavel N.\", \"Krivitsky\", role=c(\"ctb\",\"cph\"), comment=c(ORCID=\"0000-0002-9101-3362\", \"shared copyright on simulate.formula\")), person(\"Emi\", \"Tanaka\", role = \"ctb\", comment = c(ORCID=\"0000-0002-1455-259X\")), person(\"Mikael\", \"Jagan\", role = \"ctb\", comment = c(ORCID=\"0000-0002-3542-2938\")), person(\"Ross D.\", \"Boylan\", email=\"ross.boylan@ucsf.edu\", role=(\"ctb\"), comment = c(ORCID=\"0009-0003-4123-8090\")) )", + "Authors@R": "c( person(\"Douglas\",\"Bates\", role=\"aut\", comment=c(ORCID=\"0000-0001-8316-9503\")), person(\"Martin\",\"Maechler\", role=\"aut\", comment=c(ORCID=\"0000-0002-8685-9910\")), person(\"Ben\",\"Bolker\",email=\"bbolker+lme4@gmail.com\", role=c(\"aut\",\"cre\"), comment=c(ORCID=\"0000-0002-2127-0443\")), person(\"Steven\",\"Walker\",role=\"aut\", comment=c(ORCID=\"0000-0002-4394-9078\")), person(\"Rune Haubo Bojesen\",\"Christensen\", role=\"ctb\", comment=c(ORCID=\"0000-0002-4494-3399\")), person(\"Henrik\",\"Singmann\", role=\"ctb\", comment=c(ORCID=\"0000-0002-4842-3657\")), person(\"Bin\", \"Dai\", role=\"ctb\"), person(\"Fabian\", \"Scheipl\", role=\"ctb\", comment=c(ORCID=\"0000-0001-8172-3603\")), person(\"Gabor\", \"Grothendieck\", role=\"ctb\"), person(\"Peter\", \"Green\", role=\"ctb\", comment=c(ORCID=\"0000-0002-0238-9852\")), person(\"John\", \"Fox\", role=\"ctb\"), person(\"Alexander\", \"Bauer\", role=\"ctb\"), person(\"Pavel N.\", \"Krivitsky\", role=c(\"ctb\",\"cph\"), comment=c(ORCID=\"0000-0002-9101-3362\", \"shared copyright on simulate.formula\")), person(\"Emi\", \"Tanaka\", role = \"ctb\", comment = c(ORCID=\"0000-0002-1455-259X\")), person(\"Mikael\", \"Jagan\", role = \"ctb\", comment = c(ORCID=\"0000-0002-3542-2938\")), person(\"Ross D.\", \"Boylan\", email=\"ross.boylan@ucsf.edu\", role=(\"ctb\"), comment = c(ORCID=\"0009-0003-4123-8090\")), person(\"Anna\", \"Ly\", role = \"ctb\", comment = c(ORCID = \"0000-0002-0210-0342\")) )", "Description": "Fit linear and generalized linear mixed-effects models. The models and their components are represented using S4 classes and methods. The core computational algorithms are implemented using the 'Eigen' C++ library for numerical linear algebra and 'RcppEigen' \"glue\".", "Depends": [ "R (>= 3.6.0)", @@ -5156,7 +5220,7 @@ "LinkingTo": [ "Rcpp (>= 0.10.5)", "RcppEigen (>= 0.3.3.9.4)", - "Matrix (>= 1.2-3)" + "Matrix (>= 1.5-0)" ], "Imports": [ "graphics", @@ -5170,8 +5234,11 @@ "nlme (>= 3.1-123)", "minqa (>= 1.1.15)", "nloptr (>= 1.0.4)", - "reformulas (>= 0.3.0)" + "reformulas (>= 0.3.0)", + "rlang", + "Rdpack" ], + "RdMacros": "Rdpack", "Suggests": [ "knitr", "rmarkdown", @@ -5193,6 +5260,10 @@ "tibble", "merDeriv" ], + "Enhances": [ + "DHARMa", + "performance" + ], "VignetteBuilder": "knitr", "LazyData": "yes", "License": "GPL (>= 2)", @@ -5200,7 +5271,7 @@ "BugReports": "https://github.com/lme4/lme4/issues", "Encoding": "UTF-8", "NeedsCompilation": "yes", - "Author": "Douglas Bates [aut] (), Martin Maechler [aut] (), Ben Bolker [aut, cre] (), Steven Walker [aut] (), Rune Haubo Bojesen Christensen [ctb] (), Henrik Singmann [ctb] (), Bin Dai [ctb], Fabian Scheipl [ctb] (), Gabor Grothendieck [ctb], Peter Green [ctb] (), John Fox [ctb], Alexander Bauer [ctb], Pavel N. Krivitsky [ctb, cph] (, shared copyright on simulate.formula), Emi Tanaka [ctb] (), Mikael Jagan [ctb] (), Ross D. Boylan [ctb] ()", + "Author": "Douglas Bates [aut] (ORCID: ), Martin Maechler [aut] (ORCID: ), Ben Bolker [aut, cre] (ORCID: ), Steven Walker [aut] (ORCID: ), Rune Haubo Bojesen Christensen [ctb] (ORCID: ), Henrik Singmann [ctb] (ORCID: ), Bin Dai [ctb], Fabian Scheipl [ctb] (ORCID: ), Gabor Grothendieck [ctb], Peter Green [ctb] (ORCID: ), John Fox [ctb], Alexander Bauer [ctb], Pavel N. Krivitsky [ctb, cph] (ORCID: , shared copyright on simulate.formula), Emi Tanaka [ctb] (ORCID: ), Mikael Jagan [ctb] (ORCID: ), Ross D. Boylan [ctb] (ORCID: ), Anna Ly [ctb] (ORCID: )", "Maintainer": "Ben Bolker ", "Repository": "CRAN" }, @@ -5284,11 +5355,11 @@ }, "magrittr": { "Package": "magrittr", - "Version": "2.0.3", + "Version": "2.0.4", "Source": "Repository", "Type": "Package", "Title": "A Forward-Pipe Operator for R", - "Authors@R": "c( person(\"Stefan Milton\", \"Bache\", , \"stefan@stefanbache.dk\", role = c(\"aut\", \"cph\"), comment = \"Original author and creator of magrittr\"), person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = \"aut\"), person(\"Lionel\", \"Henry\", , \"lionel@rstudio.com\", role = \"cre\"), person(\"RStudio\", role = c(\"cph\", \"fnd\")) )", + "Authors@R": "c( person(\"Stefan Milton\", \"Bache\", , \"stefan@stefanbache.dk\", role = c(\"aut\", \"cph\"), comment = \"Original author and creator of magrittr\"), person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"), person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = \"cre\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")) )", "Description": "Provides a mechanism for chaining commands with a new forward-pipe operator, %>%. This operator will forward a value, or the result of an expression, into the next function call/expression. There is flexible support for the type of right-hand side expressions. For more information, see package vignette. To quote Rene Magritte, \"Ceci n'est pas un pipe.\"", "License": "MIT + file LICENSE", "URL": "https://magrittr.tidyverse.org, https://github.com/tidyverse/magrittr", @@ -5307,10 +5378,10 @@ "ByteCompile": "Yes", "Config/Needs/website": "tidyverse/tidytemplate", "Encoding": "UTF-8", - "RoxygenNote": "7.1.2", + "RoxygenNote": "7.3.3", "NeedsCompilation": "yes", - "Author": "Stefan Milton Bache [aut, cph] (Original author and creator of magrittr), Hadley Wickham [aut], Lionel Henry [cre], RStudio [cph, fnd]", - "Maintainer": "Lionel Henry ", + "Author": "Stefan Milton Bache [aut, cph] (Original author and creator of magrittr), Hadley Wickham [aut], Lionel Henry [cre], Posit Software, PBC [cph, fnd] (ROR: )", + "Maintainer": "Lionel Henry ", "Repository": "CRAN" }, "markdown": { @@ -5377,14 +5448,14 @@ }, "mgcv": { "Package": "mgcv", - "Version": "1.9-3", + "Version": "1.9-4", "Source": "Repository", "Authors@R": "person(given = \"Simon\", family = \"Wood\", role = c(\"aut\", \"cre\"), email = \"simon.wood@r-project.org\")", "Title": "Mixed GAM Computation Vehicle with Automatic Smoothness Estimation", - "Description": "Generalized additive (mixed) models, some of their extensions and other generalized ridge regression with multiple smoothing parameter estimation by (Restricted) Marginal Likelihood, Generalized Cross Validation and similar, or using iterated nested Laplace approximation for fully Bayesian inference. See Wood (2017) for an overview. Includes a gam() function, a wide variety of smoothers, 'JAGS' support and distributions beyond the exponential family.", + "Description": "Generalized additive (mixed) models, some of their extensions and other generalized ridge regression with multiple smoothing parameter estimation by (Restricted) Marginal Likelihood, Cross Validation and similar, or using iterated nested Laplace approximation for fully Bayesian inference. See Wood (2025) for an overview. Includes a gam() function, a wide variety of smoothers, 'JAGS' support and distributions beyond the exponential family.", "Priority": "recommended", "Depends": [ - "R (>= 3.6.0)", + "R (>= 4.4.0)", "nlme (>= 3.1-64)" ], "Imports": [ @@ -5492,7 +5563,7 @@ }, "modelbased": { "Package": "modelbased", - "Version": "0.12.0", + "Version": "0.13.1", "Source": "Repository", "Type": "Package", "Title": "Estimation of Model-Based Predictions, Contrasts and Means", @@ -5503,13 +5574,13 @@ "URL": "https://easystats.github.io/modelbased/", "BugReports": "https://github.com/easystats/modelbased/issues", "Depends": [ - "R (>= 3.6)" + "R (>= 4.0)" ], "Imports": [ - "bayestestR (>= 0.16.1)", - "datawizard (>= 1.1.0)", - "insight (>= 1.3.1)", - "parameters (>= 0.27.0)", + "bayestestR (>= 0.17.0)", + "datawizard (>= 1.3.0)", + "insight (>= 1.4.3)", + "parameters (>= 0.28.3)", "graphics", "stats", "tools", @@ -5526,6 +5597,7 @@ "coda", "collapse", "correlation", + "coxme", "curl", "discovr", "easystats", @@ -5535,15 +5607,16 @@ "gamm4", "gganimate", "ggplot2", - "glmmTMB", + "glmmTMB (>= 1.1.12)", "httr2", "knitr", "lme4", "lmerTest", "logspline", "MASS", + "MatchIt", "Matrix", - "marginaleffects (>= 0.26.0)", + "marginaleffects (>= 0.29.0)", "mice", "mgcv", "mvtnorm", @@ -5557,22 +5630,26 @@ "poorman", "pscl", "RcppEigen", + "Rdatasets", "report", "rmarkdown", "rstanarm", "rtdists", "RWiener", "sandwich", + "scales", "see (>= 0.11.0)", "survival", "testthat (>= 3.2.1)", + "tinyplot (>= 0.6.0)", + "tinytable", "vdiffr", "withr" ], "VignetteBuilder": "knitr", "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Config/testthat/edition": "3", "Config/testthat/parallel": "true", "Config/Needs/check": "stan-dev/cmdstanr", @@ -5714,7 +5791,7 @@ }, "officer": { "Package": "officer", - "Version": "0.6.10", + "Version": "0.7.2", "Source": "Repository", "Type": "Package", "Title": "Manipulation of Microsoft Word and PowerPoint Documents", @@ -5725,12 +5802,14 @@ "BugReports": "https://github.com/davidgohel/officer/issues", "Imports": [ "cli", + "dplyr", "graphics", "grDevices", "openssl", "R6", "ragg", "stats", + "tidyr", "utils", "uuid", "xml2 (>= 1.1.0)", @@ -5749,8 +5828,8 @@ "withr" ], "Encoding": "UTF-8", - "RoxygenNote": "7.3.2", - "Collate": "'core_properties.R' 'custom_properties.R' 'defunct.R' 'dev-utils.R' 'docx_add.R' 'docx_comments.R' 'docx_cursor.R' 'docx_part.R' 'docx_replace.R' 'docx_section.R' 'docx_settings.R' 'empty_content.R' 'formatting_properties.R' 'fortify_docx.R' 'fortify_pptx.R' 'knitr_utils.R' 'officer.R' 'ooxml.R' 'ooxml_block_objects.R' 'ooxml_run_objects.R' 'openxml_content_type.R' 'openxml_document.R' 'pack_folder.R' 'ph_location.R' 'post-proc.R' 'ppt_class_dir_collection.R' 'ppt_classes.R' 'ppt_notes.R' 'ppt_ph_dedupe_layout.R' 'ppt_ph_manipulate.R' 'ppt_ph_rename_layout.R' 'ppt_ph_with_methods.R' 'pptx_informations.R' 'pptx_layout_helper.R' 'pptx_matrix.R' 'utils.R' 'pptx_slide_manip.R' 'read_docx.R' 'read_docx_styles.R' 'read_pptx.R' 'read_xlsx.R' 'relationship.R' 'rtf.R' 'shape_properties.R' 'shorcuts.R' 'docx_append_context.R' 'utils-xml.R' 'deprecated.R'", + "RoxygenNote": "7.3.3", + "Collate": "'core_properties.R' 'custom_properties.R' 'defunct.R' 'dev-utils.R' 'docx_add.R' 'docx_comments.R' 'docx_cursor.R' 'docx_part.R' 'docx_replace.R' 'docx_section.R' 'docx_settings.R' 'docx_styles.R' 'docx_utils_funs.R' 'empty_content.R' 'formatting_properties.R' 'fortify_docx.R' 'fortify_pptx.R' 'knitr_utils.R' 'officer.R' 'ooxml.R' 'ooxml_block_objects.R' 'ooxml_run_objects.R' 'openxml_content_type.R' 'openxml_document.R' 'pack_folder.R' 'ph_location.R' 'post-proc.R' 'ppt_class_dir_collection.R' 'ppt_classes.R' 'ppt_notes.R' 'ppt_ph_dedupe_layout.R' 'ppt_ph_manipulate.R' 'ppt_ph_rename_layout.R' 'ppt_ph_with_methods.R' 'pptx_informations.R' 'pptx_layout_helper.R' 'pptx_matrix.R' 'utils.R' 'pptx_slide_manip.R' 'read_docx.R' 'docx_write.R' 'read_docx_styles.R' 'read_pptx.R' 'read_xlsx.R' 'relationship.R' 'rtf.R' 'shape_properties.R' 'shorcuts.R' 'docx_append_context.R' 'utils-xml.R' 'deprecated.R' 'zzz.R'", "NeedsCompilation": "no", "Author": "David Gohel [aut, cre], Stefan Moog [aut], Mark Heckmann [aut] (ORCID: ), ArData [cph], Frank Hangler [ctb] (function body_replace_all_text), Liz Sander [ctb] (several documentation fixes), Anton Victorson [ctb] (fixes xml structures), Jon Calder [ctb] (update vignettes), John Harrold [ctb] (function annotate_base), John Muschelli [ctb] (google doc compatibility), Bill Denney [ctb] (ORCID: , function as.matrix.rpptx), Nikolai Beck [ctb] (set speaker notes for .pptx documents), Greg Leleu [ctb] (fields functionality in ppt), Majid Eismann [ctb], Hongyuan Jia [ctb] (ORCID: ), Michael Stackhouse [ctb]", "Maintainer": "David Gohel ", @@ -5792,7 +5871,7 @@ }, "openssl": { "Package": "openssl", - "Version": "2.3.3", + "Version": "2.3.4", "Source": "Repository", "Type": "Package", "Title": "Toolkit for Encryption, Signatures and Certificates Based on OpenSSL", @@ -5825,7 +5904,7 @@ }, "openxlsx2": { "Package": "openxlsx2", - "Version": "1.18", + "Version": "1.22", "Source": "Repository", "Type": "Package", "Title": "Read, Write and Edit 'xlsx' Files", @@ -5842,10 +5921,8 @@ "R6", "Rcpp", "grDevices", - "magrittr", "stringi", - "utils", - "zip" + "utils" ], "LinkingTo": [ "Rcpp" @@ -5857,21 +5934,57 @@ "rmarkdown", "rvg", "testthat (>= 3.0.0)", - "waldo" + "waldo", + "zip" ], "VignetteBuilder": "knitr", "Encoding": "UTF-8", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Config/testthat/edition": "3", - "Config/testthat/parallel": "true", "NeedsCompilation": "yes", "Author": "Jordan Mark Barbone [aut] (ORCID: ), Jan Marvin Garbuszus [aut, cre], Olivier Roy [ctb], openxlsx authors [cph] (openxlsx package), Arseny Kapoulkine [ctb, cph] (Author of included pugixml code)", "Maintainer": "Jan Marvin Garbuszus ", "Repository": "CRAN" }, + "otel": { + "Package": "otel", + "Version": "0.2.0", + "Source": "Repository", + "Title": "OpenTelemetry R API", + "Authors@R": "person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\"))", + "Description": "High-quality, ubiquitous, and portable telemetry to enable effective observability. OpenTelemetry is a collection of tools, APIs, and SDKs used to instrument, generate, collect, and export telemetry data (metrics, logs, and traces) for analysis in order to understand your software's performance and behavior. This package implements the OpenTelemetry API: . Use this package as a dependency if you want to instrument your R package for OpenTelemetry.", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2.9000", + "Depends": [ + "R (>= 3.6.0)" + ], + "Suggests": [ + "callr", + "cli", + "glue", + "jsonlite", + "otelsdk", + "processx", + "shiny", + "spelling", + "testthat (>= 3.0.0)", + "utils", + "withr" + ], + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "URL": "https://otel.r-lib.org, https://github.com/r-lib/otel", + "Additional_repositories": "https://github.com/r-lib/otelsdk/releases/download/devel", + "BugReports": "https://github.com/r-lib/otel/issues", + "NeedsCompilation": "no", + "Author": "Gábor Csárdi [aut, cre]", + "Maintainer": "Gábor Csárdi ", + "Repository": "CRAN" + }, "parameters": { "Package": "parameters", - "Version": "0.27.0", + "Version": "0.28.3", "Source": "Repository", "Type": "Package", "Title": "Processing of Model Parameters", @@ -5885,9 +5998,9 @@ "R (>= 3.6)" ], "Imports": [ - "bayestestR (>= 0.16.1)", - "datawizard (>= 1.1.0)", - "insight (>= 1.3.1)", + "bayestestR (>= 0.17.0)", + "datawizard (>= 1.3.0)", + "insight (>= 1.4.2)", "graphics", "methods", "stats", @@ -5929,7 +6042,7 @@ "domir (>= 0.2.0)", "drc", "DRR", - "effectsize (>= 0.8.6)", + "effectsize (>= 1.0.1)", "EGAnet", "emmeans (>= 1.7.0)", "epiR", @@ -5946,7 +6059,7 @@ "geepack", "ggplot2", "GLMMadaptive", - "glmmTMB (>= 1.1.10)", + "glmmTMB (>= 1.1.12)", "glmtoolbox", "GPArotation", "gt", @@ -5956,6 +6069,7 @@ "ivreg", "knitr", "lavaan", + "lcmm", "lfe", "lm.beta", "lme4", @@ -5966,7 +6080,7 @@ "logspline", "lqmm", "M3C", - "marginaleffects (>= 0.26.0)", + "marginaleffects (>= 0.29.0)", "modelbased (>= 0.9.0)", "MASS", "Matrix", @@ -6010,6 +6124,7 @@ "rms", "rstan", "rstanarm", + "sampleSelection", "sandwich", "see (>= 0.8.1)", "serp", @@ -6019,7 +6134,7 @@ "svylme", "testthat (>= 3.2.1)", "tidyselect", - "tinytable (>= 0.1.0)", + "tinytable (>= 0.13.0)", "TMB", "truncreg", "vdiffr", @@ -6031,7 +6146,7 @@ "VignetteBuilder": "knitr", "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Config/testthat/edition": "3", "Config/testthat/parallel": "true", "Config/Needs/website": "easystats/easystatstemplate", @@ -6043,7 +6158,7 @@ }, "patchwork": { "Package": "patchwork", - "Version": "1.3.1", + "Version": "1.3.2", "Source": "Repository", "Type": "Package", "Title": "The Composer of Plots", @@ -6108,11 +6223,11 @@ }, "performance": { "Package": "performance", - "Version": "0.15.0", + "Version": "0.15.3", "Source": "Repository", "Type": "Package", "Title": "Assessment of Regression Models Performance", - "Authors@R": "c(person(given = \"Daniel\", family = \"Lüdecke\", role = c(\"aut\", \"cre\"), email = \"officialeasystats@gmail.com\", comment = c(ORCID = \"0000-0002-8895-3206\")), person(given = \"Dominique\", family = \"Makowski\", role = c(\"aut\", \"ctb\"), email = \"dom.makowski@gmail.com\", comment = c(ORCID = \"0000-0001-5375-9967\")), person(given = \"Mattan S.\", family = \"Ben-Shachar\", role = c(\"aut\", \"ctb\"), email = \"matanshm@post.bgu.ac.il\", comment = c(ORCID = \"0000-0002-4287-4801\")), person(given = \"Indrajeet\", family = \"Patil\", role = c(\"aut\", \"ctb\"), email = \"patilindrajeet.science@gmail.com\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(given = \"Philip\", family = \"Waggoner\", role = c(\"aut\", \"ctb\"), email = \"philip.waggoner@gmail.com\", comment = c(ORCID = \"0000-0002-7825-7573\")), person(given = \"Brenton M.\", family = \"Wiernik\", role = c(\"aut\", \"ctb\"), email = \"brenton@wiernik.org\", comment = c(ORCID = \"0000-0001-9560-6336\")), person(given = \"Rémi\", family = \"Thériault\", role = c(\"aut\", \"ctb\"), email = \"remi.theriault@mail.mcgill.ca\", comment = c(ORCID = \"0000-0003-4315-6788\")), person(given = \"Vincent\", family = \"Arel-Bundock\", email = \"vincent.arel-bundock@umontreal.ca\", role = \"ctb\", comment = c(ORCID = \"0000-0003-2042-7063\")), person(given = \"Martin\", family = \"Jullum\", role = \"rev\"), person(given = \"gjo11\", role = \"rev\"), person(given = \"Etienne\", family = \"Bacher\", , email = \"etienne.bacher@protonmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-9271-5075\")), person(given = \"Joseph\", family = \"Luchman\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8886-9717\")))", + "Authors@R": "c(person(given = \"Daniel\", family = \"Lüdecke\", role = c(\"aut\", \"cre\"), email = \"officialeasystats@gmail.com\", comment = c(ORCID = \"0000-0002-8895-3206\")), person(given = \"Dominique\", family = \"Makowski\", role = c(\"aut\", \"ctb\"), email = \"dom.makowski@gmail.com\", comment = c(ORCID = \"0000-0001-5375-9967\")), person(given = \"Mattan S.\", family = \"Ben-Shachar\", role = c(\"aut\", \"ctb\"), email = \"matanshm@post.bgu.ac.il\", comment = c(ORCID = \"0000-0002-4287-4801\")), person(given = \"Indrajeet\", family = \"Patil\", role = c(\"aut\", \"ctb\"), email = \"patilindrajeet.science@gmail.com\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(given = \"Philip\", family = \"Waggoner\", role = c(\"aut\", \"ctb\"), email = \"philip.waggoner@gmail.com\", comment = c(ORCID = \"0000-0002-7825-7573\")), person(given = \"Brenton M.\", family = \"Wiernik\", role = c(\"aut\", \"ctb\"), email = \"brenton@wiernik.org\", comment = c(ORCID = \"0000-0001-9560-6336\")), person(given = \"Rémi\", family = \"Thériault\", role = c(\"aut\", \"ctb\"), email = \"remi.theriault@mail.mcgill.ca\", comment = c(ORCID = \"0000-0003-4315-6788\")), person(given = \"Vincent\", family = \"Arel-Bundock\", email = \"vincent.arel-bundock@umontreal.ca\", role = \"ctb\", comment = c(ORCID = \"0000-0003-2042-7063\")), person(given = \"Martin\", family = \"Jullum\", role = \"rev\"), person(given = \"gjo11\", role = \"rev\"), person(given = \"Etienne\", family = \"Bacher\", email = \"etienne.bacher@protonmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-9271-5075\")), person(given = \"Joseph\", family = \"Luchman\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8886-9717\")))", "Maintainer": "Daniel Lüdecke ", "Description": "Utilities for computing measures to assess model quality, which are not directly provided by R's 'base' or 'stats' packages. These include e.g. measures like r-squared, intraclass correlation coefficient (Nakagawa, Johnson & Schielzeth (2017) ), root mean squared error or functions to check models for overdispersion, singularity or zero-inflation and more. Functions apply to a large variety of regression models, including generalized linear models, mixed effects models and Bayesian models. References: Lüdecke et al. (2021) .", "License": "GPL-3", @@ -6122,9 +6237,9 @@ "R (>= 4.0)" ], "Imports": [ - "bayestestR (>= 0.16.0)", - "insight (>= 1.3.1)", - "datawizard (>= 1.1.0)", + "bayestestR (>= 0.17.0)", + "insight (>= 1.4.2)", + "datawizard (>= 1.3.0)", "stats", "methods", "utils" @@ -6156,7 +6271,7 @@ "ftExtra", "gamm4", "ggdag", - "glmmTMB (>= 1.1.10)", + "glmmTMB (>= 1.1.12)", "GPArotation", "graphics", "Hmisc", @@ -6177,7 +6292,7 @@ "metafor", "mgcv", "mlogit", - "modelbased", + "modelbased (>= 0.12.0)", "multimode", "nestedLogit", "nlme", @@ -6185,7 +6300,7 @@ "nonnest2", "ordinal", "parallel", - "parameters (>= 0.27.0)", + "parameters (>= 0.28.0)", "patchwork", "pscl", "psych", @@ -6210,7 +6325,7 @@ ], "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Config/testthat/edition": "3", "Config/testthat/parallel": "true", "Config/Needs/website": "rstudio/bslib, r-lib/pkgdown, easystats/easystatstemplate", @@ -6249,7 +6364,7 @@ }, "pillar": { "Package": "pillar", - "Version": "1.11.0", + "Version": "1.11.1", "Source": "Repository", "Title": "Coloured Formatting for Columns", "Authors@R": "c(person(given = \"Kirill\", family = \"M\\u00fcller\", role = c(\"aut\", \"cre\"), email = \"kirill@cynkra.com\", comment = c(ORCID = \"0000-0002-1416-3412\")), person(given = \"Hadley\", family = \"Wickham\", role = \"aut\"), person(given = \"RStudio\", role = \"cph\"))", @@ -6291,7 +6406,7 @@ ], "VignetteBuilder": "knitr", "Encoding": "UTF-8", - "RoxygenNote": "7.3.2.9000", + "RoxygenNote": "7.3.3.9000", "Config/testthat/edition": "3", "Config/testthat/parallel": "true", "Config/testthat/start-first": "format_multi_fuzz, format_multi_fuzz_2, format_multi, ctl_colonnade, ctl_colonnade_1, ctl_colonnade_2", @@ -6499,10 +6614,10 @@ }, "pracma": { "Package": "pracma", - "Version": "2.4.4", + "Version": "2.4.6", "Source": "Repository", "Type": "Package", - "Date": "2023-11-08", + "Date": "2025-10-20", "Title": "Practical Numerical Math Functions", "Authors@R": "person(\"Hans W.\", \"Borchers\", email=\"hwborchers@googlemail.com\", role=c(\"aut\", \"cre\"))", "Depends": [ @@ -6627,47 +6742,49 @@ }, "promises": { "Package": "promises", - "Version": "1.3.3", + "Version": "1.5.0", "Source": "Repository", "Type": "Package", "Title": "Abstractions for Promise-Based Asynchronous Programming", - "Authors@R": "c( person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = c(\"aut\", \"cre\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")) )", + "Authors@R": "c( person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"), person(\"Barret\", \"Schloerke\", , \"barret@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0001-9986-114X\")), person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0002-1576-2126\")), person(\"Charlie\", \"Gao\", , \"charlie.gao@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0002-0750-061X\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")) )", "Description": "Provides fundamental abstractions for doing asynchronous programming in R using promises. Asynchronous programming is useful for allowing a single R process to orchestrate multiple tasks in the background while also attending to something else. Semantics are similar to 'JavaScript' promises, but with a syntax that is idiomatic R.", "License": "MIT + file LICENSE", "URL": "https://rstudio.github.io/promises/, https://github.com/rstudio/promises", "BugReports": "https://github.com/rstudio/promises/issues", + "Depends": [ + "R (>= 4.1.0)" + ], "Imports": [ "fastmap (>= 1.1.0)", "later", + "lifecycle", "magrittr (>= 1.5)", + "otel (>= 0.2.0)", "R6", - "Rcpp", - "rlang", - "stats" + "rlang" ], "Suggests": [ "future (>= 1.21.0)", "knitr", + "mirai", + "otelsdk (>= 0.2.0)", "purrr", + "Rcpp", "rmarkdown", "spelling", "testthat (>= 3.0.0)", "vembedr" ], - "LinkingTo": [ - "later", - "Rcpp" - ], "VignetteBuilder": "knitr", "Config/Needs/website": "rsconnect, tidyverse/tidytemplate", "Config/testthat/edition": "3", "Config/usethis/last-upkeep": "2025-05-27", "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.3.2", - "NeedsCompilation": "yes", - "Author": "Joe Cheng [aut, cre], Posit Software, PBC [cph, fnd] (ROR: )", - "Maintainer": "Joe Cheng ", + "RoxygenNote": "7.3.3", + "NeedsCompilation": "no", + "Author": "Joe Cheng [aut], Barret Schloerke [aut, cre] (ORCID: ), Winston Chang [aut] (ORCID: ), Charlie Gao [aut] (ORCID: ), Posit Software, PBC [cph, fnd] (ROR: )", + "Maintainer": "Barret Schloerke ", "Repository": "CRAN" }, "proxy": { @@ -6736,7 +6853,7 @@ }, "purrr": { "Package": "purrr", - "Version": "1.1.0", + "Version": "1.2.0", "Source": "Repository", "Title": "Functional Programming Tools", "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-4757-117X\")), person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"https://ror.org/03wc8by49\")) )", @@ -6755,13 +6872,13 @@ "vctrs (>= 0.6.3)" ], "Suggests": [ - "carrier (>= 0.2.0)", + "carrier (>= 0.3.0)", "covr", "dplyr (>= 0.7.8)", "httr", "knitr", "lubridate", - "mirai (>= 2.4.0)", + "mirai (>= 2.5.1)", "rmarkdown", "testthat (>= 3.0.0)", "tibble", @@ -6777,7 +6894,7 @@ "Config/testthat/edition": "3", "Config/testthat/parallel": "TRUE", "Encoding": "UTF-8", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "NeedsCompilation": "yes", "Author": "Hadley Wickham [aut, cre] (ORCID: ), Lionel Henry [aut], Posit Software, PBC [cph, fnd] (ROR: )", "Maintainer": "Hadley Wickham ", @@ -6858,7 +6975,7 @@ }, "qqplotr": { "Package": "qqplotr", - "Version": "0.0.6", + "Version": "0.0.7", "Source": "Repository", "Type": "Package", "Title": "Quantile-Quantile Plot Extensions for 'ggplot2'", @@ -6869,7 +6986,7 @@ "License": "GPL-3 | file LICENSE", "Encoding": "UTF-8", "LazyData": "true", - "RoxygenNote": "7.2.2", + "RoxygenNote": "7.3.2", "Collate": "'data.R' 'geom_qq_band.R' 'qqplotr.R' 'runShinyExample.R' 'stat_pp_band.R' 'stat_pp_line.R' 'stat_pp_point.R' 'stat_qq_line.R' 'stat_qq_band.R' 'stat_qq_point.R'", "VignetteBuilder": "knitr", "Depends": [ @@ -6898,7 +7015,7 @@ }, "quarto": { "Package": "quarto", - "Version": "1.5.0", + "Version": "1.5.1", "Source": "Repository", "Title": "R Interface to 'Quarto' Markdown Publishing System", "Authors@R": "c( person(\"JJ\", \"Allaire\", , \"jj@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-0174-9868\")), person(\"Christophe\", \"Dervieux\", , \"cderv@posit.co\", role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0003-4474-2498\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(\"Gordon\", \"Woodhull\", role = \"ctb\") )", @@ -6961,11 +7078,11 @@ }, "ragg": { "Package": "ragg", - "Version": "1.4.0", + "Version": "1.5.0", "Source": "Repository", "Type": "Package", "Title": "Graphic Devices Based on AGG", - "Authors@R": "c( person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0002-5147-4711\")), person(\"Maxim\", \"Shemanarev\", role = c(\"aut\", \"cph\"), comment = \"Author of AGG\"), person(\"Tony\", \"Juricic\", , \"tonygeek@yahoo.com\", role = c(\"ctb\", \"cph\"), comment = \"Contributor to AGG\"), person(\"Milan\", \"Marusinec\", , \"milan@marusinec.sk\", role = c(\"ctb\", \"cph\"), comment = \"Contributor to AGG\"), person(\"Spencer\", \"Garrett\", role = \"ctb\", comment = \"Contributor to AGG\"), person(\"Posit, PBC\", role = c(\"cph\", \"fnd\")) )", + "Authors@R": "c( person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0002-5147-4711\")), person(\"Maxim\", \"Shemanarev\", role = c(\"aut\", \"cph\"), comment = \"Author of AGG\"), person(\"Tony\", \"Juricic\", , \"tonygeek@yahoo.com\", role = c(\"ctb\", \"cph\"), comment = \"Contributor to AGG\"), person(\"Milan\", \"Marusinec\", , \"milan@marusinec.sk\", role = c(\"ctb\", \"cph\"), comment = \"Contributor to AGG\"), person(\"Spencer\", \"Garrett\", role = \"ctb\", comment = \"Contributor to AGG\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")) )", "Maintainer": "Thomas Lin Pedersen ", "Description": "Anti-Grain Geometry (AGG) is a high-quality and high-performance 2D drawing library. The 'ragg' package provides a set of graphic devices based on AGG to use as alternative to the raster devices provided through the 'grDevices' package.", "License": "MIT + file LICENSE", @@ -6985,14 +7102,15 @@ "systemfonts", "textshaping" ], + "Config/build/compilation-database": "true", "Config/Needs/website": "ggplot2, devoid, magick, bench, tidyr, ggridges, hexbin, sessioninfo, pkgdown, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/usethis/last-upkeep": "2025-04-25", "Encoding": "UTF-8", "RoxygenNote": "7.3.2", - "SystemRequirements": "freetype2, libpng, libtiff, libjpeg", - "Config/testthat/edition": "3", - "Config/build/compilation-database": "true", + "SystemRequirements": "freetype2, libpng, libtiff, libjpeg, libwebp, libwebpmux", "NeedsCompilation": "yes", - "Author": "Thomas Lin Pedersen [cre, aut] (), Maxim Shemanarev [aut, cph] (Author of AGG), Tony Juricic [ctb, cph] (Contributor to AGG), Milan Marusinec [ctb, cph] (Contributor to AGG), Spencer Garrett [ctb] (Contributor to AGG), Posit, PBC [cph, fnd]", + "Author": "Thomas Lin Pedersen [cre, aut] (ORCID: ), Maxim Shemanarev [aut, cph] (Author of AGG), Tony Juricic [ctb, cph] (Contributor to AGG), Milan Marusinec [ctb, cph] (Contributor to AGG), Spencer Garrett [ctb] (Contributor to AGG), Posit Software, PBC [cph, fnd] (ROR: )", "Repository": "CRAN" }, "rankinPlot": { @@ -7053,11 +7171,11 @@ }, "rbibutils": { "Package": "rbibutils", - "Version": "2.3", + "Version": "2.4", "Source": "Repository", "Type": "Package", "Title": "Read 'Bibtex' Files and Convert Between Bibliography Formats", - "Authors@R": "c( person(given = c(\"Georgi\", \"N.\"), family = \"Boshnakov\", role = c(\"aut\", \"cre\"), \t email = \"georgi.boshnakov@manchester.ac.uk\", comment = \"R port, R code, new C code and modifications to bibutils' C code, conversion to Bibentry (R and C code)\" ), person(given = \"Chris\", family = \"Putman\", role = \"aut\", comment = \"src/*, author of the bibutils libraries, https://sourceforge.net/projects/bibutils/\"), person(given = \"Richard\", family = \"Mathar\", role = \"ctb\", comment = \"src/addsout.c\"), person(given = \"Johannes\", family = \"Wilm\", role = \"ctb\", comment = \"src/biblatexin.c, src/bltypes.c\"), person(\"R Core Team\", role = \"ctb\", comment = \"base R's bibentry and bibstyle implementation\") )", + "Authors@R": "c( person(given = c(\"Georgi\", \"N.\"), family = \"Boshnakov\", role = c(\"aut\", \"cre\"), \t email = \"georgi.boshnakov@manchester.ac.uk\", comment = c(\"R port, R code, new C code and modifications to bibutils' C code, conversion to Bibentry (R and C code)\", comment = c(ORCID = \"0000-0003-2839-346X\")) ), person(given = \"Chris\", family = \"Putman\", role = \"aut\", comment = \"src/*, author of the bibutils libraries, https://sourceforge.net/projects/bibutils/\"), person(given = \"Richard\", family = \"Mathar\", role = \"ctb\", comment = \"src/addsout.c\"), person(given = \"Johannes\", family = \"Wilm\", role = \"ctb\", comment = \"src/biblatexin.c, src/bltypes.c\"), person(\"R Core Team\", role = \"ctb\", comment = \"base R's bibentry and bibstyle implementation\") )", "Description": "Read and write 'Bibtex' files. Convert between bibliography formats, including 'Bibtex', 'Biblatex', 'PubMed', 'Endnote', and 'Bibentry'. Includes a port of the 'bibutils' utilities by Chris Putnam . Supports all bibliography formats and character encodings implemented in 'bibutils'.", "License": "GPL-2", "URL": "https://geobosh.github.io/rbibutils/ (doc), https://github.com/GeoBosh/rbibutils (devel)", @@ -7075,7 +7193,7 @@ "Encoding": "UTF-8", "NeedsCompilation": "yes", "Config/Needs/memcheck": "devtools, rcmdcheck", - "Author": "Georgi N. Boshnakov [aut, cre] (R port, R code, new C code and modifications to bibutils' C code, conversion to Bibentry (R and C code)), Chris Putman [aut] (src/*, author of the bibutils libraries, https://sourceforge.net/projects/bibutils/), Richard Mathar [ctb] (src/addsout.c), Johannes Wilm [ctb] (src/biblatexin.c, src/bltypes.c), R Core Team [ctb] (base R's bibentry and bibstyle implementation)", + "Author": "Georgi N. Boshnakov [aut, cre] (R port, R code, new C code and modifications to bibutils' C code, conversion to Bibentry (R and C code), comment.ORCID: 0000-0003-2839-346X), Chris Putman [aut] (src/*, author of the bibutils libraries, https://sourceforge.net/projects/bibutils/), Richard Mathar [ctb] (src/addsout.c), Johannes Wilm [ctb] (src/biblatexin.c, src/bltypes.c), R Core Team [ctb] (base R's bibentry and bibstyle implementation)", "Maintainer": "Georgi N. Boshnakov ", "Repository": "CRAN" }, @@ -7113,7 +7231,7 @@ }, "reactable": { "Package": "reactable", - "Version": "0.4.4", + "Version": "0.4.5", "Source": "Repository", "Type": "Package", "Title": "Interactive Data Tables for R", @@ -7202,7 +7320,7 @@ }, "readr": { "Package": "readr", - "Version": "2.1.5", + "Version": "2.1.6", "Source": "Repository", "Title": "Read Rectangular Text Data", "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"), person(\"Jim\", \"Hester\", role = \"aut\"), person(\"Romain\", \"Francois\", role = \"ctb\"), person(\"Jennifer\", \"Bryan\", , \"jenny@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-6983-2759\")), person(\"Shelby\", \"Bearrows\", role = \"ctb\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(\"https://github.com/mandreyel/\", role = \"cph\", comment = \"mio library\"), person(\"Jukka\", \"Jylänki\", role = c(\"ctb\", \"cph\"), comment = \"grisu3 implementation\"), person(\"Mikkel\", \"Jørgensen\", role = c(\"ctb\", \"cph\"), comment = \"grisu3 implementation\") )", @@ -7250,9 +7368,9 @@ "Config/testthat/parallel": "false", "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.2.3", + "RoxygenNote": "7.3.3", "NeedsCompilation": "yes", - "Author": "Hadley Wickham [aut], Jim Hester [aut], Romain Francois [ctb], Jennifer Bryan [aut, cre] (), Shelby Bearrows [ctb], Posit Software, PBC [cph, fnd], https://github.com/mandreyel/ [cph] (mio library), Jukka Jylänki [ctb, cph] (grisu3 implementation), Mikkel Jørgensen [ctb, cph] (grisu3 implementation)", + "Author": "Hadley Wickham [aut], Jim Hester [aut], Romain Francois [ctb], Jennifer Bryan [aut, cre] (ORCID: ), Shelby Bearrows [ctb], Posit Software, PBC [cph, fnd], https://github.com/mandreyel/ [cph] (mio library), Jukka Jylänki [ctb, cph] (grisu3 implementation), Mikkel Jørgensen [ctb, cph] (grisu3 implementation)", "Maintainer": "Jennifer Bryan ", "Repository": "CRAN" }, @@ -7298,7 +7416,7 @@ }, "reformulas": { "Package": "reformulas", - "Version": "0.4.1", + "Version": "0.4.2", "Source": "Repository", "Title": "Machinery for Processing Random Effect Formulas", "Authors@R": "person(given = \"Ben\", family = \"Bolker\", role = c(\"aut\", \"cre\"), email = \"bolker@mcmaster.ca\", comment=c(ORCID=\"0000-0002-2127-0443\"))", @@ -7346,10 +7464,10 @@ }, "rempsyc": { "Package": "rempsyc", - "Version": "0.1.9", + "Version": "0.2.0", "Source": "Repository", "Title": "Convenience Functions for Psychology", - "Date": "2025-02-01", + "Date": "2025-09-14", "Authors@R": "person(\"Rémi\", \"Thériault\", , \"remi.theriault@mail.mcgill.ca\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-4315-6788\"))", "Description": "Make your workflow faster and easier. Easily customizable plots (via 'ggplot2'), nice APA tables (following the style of the *American Psychological Association*) exportable to Word (via 'flextable'), easily run statistical tests or check assumptions, and automatize various other tasks.", "License": "GPL (>= 3)", @@ -7398,9 +7516,9 @@ "VignetteBuilder": "knitr", "Config/testthat/edition": "3", "Encoding": "UTF-8", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "NeedsCompilation": "no", - "Author": "Rémi Thériault [aut, cre] ()", + "Author": "Rémi Thériault [aut, cre] (ORCID: )", "Maintainer": "Rémi Thériault ", "Repository": "CRAN" }, @@ -7460,7 +7578,7 @@ }, "report": { "Package": "report", - "Version": "0.6.1", + "Version": "0.6.2", "Source": "Repository", "Type": "Package", "Title": "Automated Reporting of Results and Statistical Models", @@ -7474,12 +7592,12 @@ "R (>= 3.6)" ], "Imports": [ - "bayestestR (>= 0.15.0)", - "effectsize (>= 1.0.0)", - "insight (>= 1.0.1)", - "parameters (>= 0.24.1)", - "performance (>= 0.13.0)", - "datawizard (>= 1.0.0)", + "bayestestR (>= 0.17.0)", + "effectsize (>= 1.0.1)", + "insight (>= 1.4.1)", + "parameters (>= 0.28.1)", + "performance (>= 0.15.1)", + "datawizard (>= 1.2.0)", "stats", "tools", "utils" @@ -7488,10 +7606,14 @@ "BayesFactor", "brms", "collapse", + "GLMMadaptive", + "glmmTMB", "ivreg", "knitr", "lavaan", "lme4", + "loo", + "nlme", "dplyr", "Formula", "rmarkdown", @@ -7507,21 +7629,20 @@ "VignetteBuilder": "knitr", "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Config/testthat/edition": "3", "Config/Needs/website": "rstudio/bslib, r-lib/pkgdown, easystats/easystatstemplate", "Collate": "'cite_easystats.R' 'format_algorithm.R' 'format_citation.R' 'format_formula.R' 'format_model.R' 'reexports.R' 'report-package.R' 'report.BFBayesFactor.R' 'utils_combine_tables.R' 'report.lm.R' 'report.MixMod.R' 'report_text.R' 'report.R' 'report.htest.R' 'report.aov.R' 'report.bayesfactor_models.R' 'report.lme4.R' 'report.stanreg.R' 'report.brmsfit.R' 'report.character.R' 'report.compare.loo.R' 'report.compare_performance.R' 'report.coxph.R' 'report.data.frame.R' 'report.default.R' 'report.estimate_contrasts.R' 'report.factor.R' 'report.glm.R' 'report.glmmTMB.R' 'report.ivreg.R' 'report.lavaan.R' 'report.lme.R' 'report.numeric.R' 'report.sessionInfo.R' 'report.survreg.R' 'report.test_performance.R' 'report.zeroinfl.R' 'report_effectsize.R' 'report_htest_chi2.R' 'report_htest_cor.R' 'report_htest_fisher.R' 'report_htest_friedman.R' 'report_htest_kruskal.R' 'report_htest_ttest.R' 'report_htest_wilcox.R' 'report_info.R' 'report_intercept.R' 'report_misc.R' 'report_model.R' 'report_parameters.R' 'report_participants.R' 'report_performance.R' 'report_priors.R' 'report_random.R' 'report_s.R' 'report_sample.R' 'report_statistics.R' 'report_table.R' 'utils_error_message.R' 'utils_grouped_df.R' 'utils_misspelled_variables.R' 'zzz.R'", "NeedsCompilation": "no", - "Author": "Dominique Makowski [aut] (), Daniel Lüdecke [aut] (), Indrajeet Patil [aut] (), Rémi Thériault [aut, cre] (), Mattan S. Ben-Shachar [aut] (), Brenton M. Wiernik [aut] (), Rudolf Siegel [ctb] (), Camden Bock [ctb] ()", + "Author": "Dominique Makowski [aut] (ORCID: ), Daniel Lüdecke [aut] (ORCID: ), Indrajeet Patil [aut] (ORCID: ), Rémi Thériault [aut, cre] (ORCID: ), Mattan S. Ben-Shachar [aut] (ORCID: ), Brenton M. Wiernik [aut] (ORCID: ), Rudolf Siegel [ctb] (ORCID: ), Camden Bock [ctb] (ORCID: )", "Repository": "CRAN" }, "reshape2": { "Package": "reshape2", - "Version": "1.4.4", + "Version": "1.4.5", "Source": "Repository", "Title": "Flexibly Reshape Data: A Reboot of the Reshape Package", - "Author": "Hadley Wickham ", - "Maintainer": "Hadley Wickham ", + "Authors@R": "person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\"))", "Description": "Flexibly restructure and aggregate data using just two functions: melt and 'dcast' (or 'acast').", "License": "MIT + file LICENSE", "URL": "https://github.com/hadley/reshape", @@ -7537,24 +7658,27 @@ "Suggests": [ "covr", "lattice", - "testthat (>= 0.8.0)" + "testthat (>= 3.0.0)" ], "LinkingTo": [ "Rcpp" ], + "Config/testthat/edition": "3", "Encoding": "UTF-8", "LazyData": "true", - "RoxygenNote": "7.1.0", + "RoxygenNote": "7.3.3", "NeedsCompilation": "yes", + "Author": "Hadley Wickham [aut, cre]", + "Maintainer": "Hadley Wickham ", "Repository": "CRAN" }, "rio": { "Package": "rio", - "Version": "1.2.3", + "Version": "1.2.4", "Source": "Repository", "Type": "Package", "Title": "A Swiss-Army Knife for Data I/O", - "Authors@R": "c(person(\"Jason\", \"Becker\", role = \"aut\", email = \"jason@jbecker.co\"), person(\"Chung-hong\", \"Chan\", role = c(\"aut\", \"cre\"), email = \"chainsawtiney@gmail.com\", comment = c(ORCID = \"0000-0002-6232-7530\")), person(\"David\", \"Schoch\", email = \"david@schochastics.net\", role = c(\"aut\"), comment = c(ORCID = \"0000-0003-2952-4812\")), person(\"Geoffrey CH\", \"Chan\", role = \"ctb\", email = \"gefchchan@gmail.com\"), person(\"Thomas J.\", \"Leeper\", role = \"aut\", email = \"thosjleeper@gmail.com\", comment = c(ORCID = \"0000-0003-4097-6326\")), person(\"Christopher\", \"Gandrud\", role = \"ctb\"), person(\"Andrew\", \"MacDonald\", role = \"ctb\"), person(\"Ista\", \"Zahn\", role = \"ctb\"), person(\"Stanislaus\", \"Stadlmann\", role = \"ctb\"), person(\"Ruaridh\", \"Williamson\", role = \"ctb\", email = \"ruaridh.williamson@gmail.com\"), person(\"Patrick\", \"Kennedy\", role = \"ctb\"), person(\"Ryan\", \"Price\", email = \"ryapric@gmail.com\", role = \"ctb\"), person(\"Trevor L\", \"Davis\", email = \"trevor.l.davis@gmail.com\", role = \"ctb\"), person(\"Nathan\", \"Day\", email = \"nathancday@gmail.com\", role = \"ctb\"), person(\"Bill\", \"Denney\", email=\"wdenney@humanpredictions.com\", role=\"ctb\", comment=c(ORCID=\"0000-0002-5759-428X\")), person(\"Alex\", \"Bokov\", email = \"alex.bokov@gmail.com\", role = \"ctb\", comment=c(ORCID=\"0000-0002-0511-9815\")), person(\"Hugo\", \"Gruson\", role = \"ctb\", comment = c(ORCID = \"0000-0002-4094-1476\")) )", + "Authors@R": "c(person(\"Jason\", \"Becker\", role = \"aut\", email = \"jason@jbecker.co\"), person(\"Chung-hong\", \"Chan\", role = c(\"aut\", \"cre\"), email = \"chainsawtiney@gmail.com\", comment = c(ORCID = \"0000-0002-6232-7530\")), person(\"David\", \"Schoch\", email = \"david@schochastics.net\", role = c(\"aut\"), comment = c(ORCID = \"0000-0003-2952-4812\")), person(\"Geoffrey CH\", \"Chan\", role = \"ctb\", email = \"gefchchan@gmail.com\"), person(\"Thomas J.\", \"Leeper\", role = \"aut\", email = \"thosjleeper@gmail.com\", comment = c(ORCID = \"0000-0003-4097-6326\")), person(\"Christopher\", \"Gandrud\", role = \"ctb\"), person(\"Andrew\", \"MacDonald\", role = \"ctb\"), person(\"Ista\", \"Zahn\", role = \"ctb\"), person(\"Stanislaus\", \"Stadlmann\", role = \"ctb\"), person(\"Ruaridh\", \"Williamson\", role = \"ctb\", email = \"ruaridh.williamson@gmail.com\"), person(\"Patrick\", \"Kennedy\", role = \"ctb\"), person(\"Ryan\", \"Price\", email = \"ryapric@gmail.com\", role = \"ctb\"), person(\"Trevor L\", \"Davis\", email = \"trevor.l.davis@gmail.com\", role = \"ctb\"), person(\"Nathan\", \"Day\", email = \"nathancday@gmail.com\", role = \"ctb\"), person(\"Bill\", \"Denney\", email=\"wdenney@humanpredictions.com\", role=\"ctb\", comment=c(ORCID=\"0000-0002-5759-428X\")), person(\"Alex\", \"Bokov\", email = \"alex.bokov@gmail.com\", role = \"ctb\", comment=c(ORCID=\"0000-0002-0511-9815\")), person(\"Hugo\", \"Gruson\", role = \"ctb\", comment = c(ORCID = \"0000-0002-4094-1476\")), person(\"Jacob\", \"Mears\", role = \"ctb\"))", "Description": "Streamlined data import and export by making assumptions that the user is probably willing to make: 'import()' and 'export()' determine the data format from the file extension, reasonable defaults are used for data import and export, web-based import is natively supported (including from SSL/HTTPS), compressed files can be read directly, and fast import packages are used where appropriate. An additional convenience function, 'convert()', provides a simple method for converting between file types.", "URL": "https://gesistsa.github.io/rio/, https://github.com/gesistsa/rio", "BugReports": "https://github.com/gesistsa/rio/issues", @@ -7596,15 +7720,16 @@ "arrow (>= 0.17.0)", "stringi", "withr", - "nanoparquet" + "nanoparquet", + "qs2 (>= 0.1.5)" ], "License": "GPL-2", "VignetteBuilder": "knitr", "Encoding": "UTF-8", - "RoxygenNote": "7.3.1", + "RoxygenNote": "7.3.2", "Config/Needs/website": "gesistsa/tsatemplate", "NeedsCompilation": "no", - "Author": "Jason Becker [aut], Chung-hong Chan [aut, cre] (), David Schoch [aut] (), Geoffrey CH Chan [ctb], Thomas J. Leeper [aut] (), Christopher Gandrud [ctb], Andrew MacDonald [ctb], Ista Zahn [ctb], Stanislaus Stadlmann [ctb], Ruaridh Williamson [ctb], Patrick Kennedy [ctb], Ryan Price [ctb], Trevor L Davis [ctb], Nathan Day [ctb], Bill Denney [ctb] (), Alex Bokov [ctb] (), Hugo Gruson [ctb] ()", + "Author": "Jason Becker [aut], Chung-hong Chan [aut, cre] (ORCID: ), David Schoch [aut] (ORCID: ), Geoffrey CH Chan [ctb], Thomas J. Leeper [aut] (ORCID: ), Christopher Gandrud [ctb], Andrew MacDonald [ctb], Ista Zahn [ctb], Stanislaus Stadlmann [ctb], Ruaridh Williamson [ctb], Patrick Kennedy [ctb], Ryan Price [ctb], Trevor L Davis [ctb], Nathan Day [ctb], Bill Denney [ctb] (ORCID: ), Alex Bokov [ctb] (ORCID: ), Hugo Gruson [ctb] (ORCID: ), Jacob Mears [ctb]", "Maintainer": "Chung-hong Chan ", "Repository": "CRAN" }, @@ -7661,7 +7786,7 @@ }, "rmarkdown": { "Package": "rmarkdown", - "Version": "2.29", + "Version": "2.30", "Source": "Repository", "Type": "Package", "Title": "Dynamic Documents for R", @@ -7711,16 +7836,16 @@ "RoxygenNote": "7.3.2", "SystemRequirements": "pandoc (>= 1.14) - http://pandoc.org", "NeedsCompilation": "no", - "Author": "JJ Allaire [aut], Yihui Xie [aut, cre] (), Christophe Dervieux [aut] (), Jonathan McPherson [aut], Javier Luraschi [aut], Kevin Ushey [aut], Aron Atkins [aut], Hadley Wickham [aut], Joe Cheng [aut], Winston Chang [aut], Richard Iannone [aut] (), Andrew Dunning [ctb] (), Atsushi Yasumoto [ctb, cph] (, Number sections Lua filter), Barret Schloerke [ctb], Carson Sievert [ctb] (), Devon Ryan [ctb] (), Frederik Aust [ctb] (), Jeff Allen [ctb], JooYoung Seo [ctb] (), Malcolm Barrett [ctb], Rob Hyndman [ctb], Romain Lesur [ctb], Roy Storey [ctb], Ruben Arslan [ctb], Sergio Oller [ctb], Posit Software, PBC [cph, fnd], jQuery UI contributors [ctb, cph] (jQuery UI library; authors listed in inst/rmd/h/jqueryui/AUTHORS.txt), Mark Otto [ctb] (Bootstrap library), Jacob Thornton [ctb] (Bootstrap library), Bootstrap contributors [ctb] (Bootstrap library), Twitter, Inc [cph] (Bootstrap library), Alexander Farkas [ctb, cph] (html5shiv library), Scott Jehl [ctb, cph] (Respond.js library), Ivan Sagalaev [ctb, cph] (highlight.js library), Greg Franko [ctb, cph] (tocify library), John MacFarlane [ctb, cph] (Pandoc templates), Google, Inc. [ctb, cph] (ioslides library), Dave Raggett [ctb] (slidy library), W3C [cph] (slidy library), Dave Gandy [ctb, cph] (Font-Awesome), Ben Sperry [ctb] (Ionicons), Drifty [cph] (Ionicons), Aidan Lister [ctb, cph] (jQuery StickyTabs), Benct Philip Jonsson [ctb, cph] (pagebreak Lua filter), Albert Krewinkel [ctb, cph] (pagebreak Lua filter)", + "Author": "JJ Allaire [aut], Yihui Xie [aut, cre] (ORCID: ), Christophe Dervieux [aut] (ORCID: ), Jonathan McPherson [aut], Javier Luraschi [aut], Kevin Ushey [aut], Aron Atkins [aut], Hadley Wickham [aut], Joe Cheng [aut], Winston Chang [aut], Richard Iannone [aut] (ORCID: ), Andrew Dunning [ctb] (ORCID: ), Atsushi Yasumoto [ctb, cph] (ORCID: , cph: Number sections Lua filter), Barret Schloerke [ctb], Carson Sievert [ctb] (ORCID: ), Devon Ryan [ctb] (ORCID: ), Frederik Aust [ctb] (ORCID: ), Jeff Allen [ctb], JooYoung Seo [ctb] (ORCID: ), Malcolm Barrett [ctb], Rob Hyndman [ctb], Romain Lesur [ctb], Roy Storey [ctb], Ruben Arslan [ctb], Sergio Oller [ctb], Posit Software, PBC [cph, fnd], jQuery UI contributors [ctb, cph] (jQuery UI library; authors listed in inst/rmd/h/jqueryui/AUTHORS.txt), Mark Otto [ctb] (Bootstrap library), Jacob Thornton [ctb] (Bootstrap library), Bootstrap contributors [ctb] (Bootstrap library), Twitter, Inc [cph] (Bootstrap library), Alexander Farkas [ctb, cph] (html5shiv library), Scott Jehl [ctb, cph] (Respond.js library), Ivan Sagalaev [ctb, cph] (highlight.js library), Greg Franko [ctb, cph] (tocify library), John MacFarlane [ctb, cph] (Pandoc templates), Google, Inc. [ctb, cph] (ioslides library), Dave Raggett [ctb] (slidy library), W3C [cph] (slidy library), Dave Gandy [ctb, cph] (Font-Awesome), Ben Sperry [ctb] (Ionicons), Drifty [cph] (Ionicons), Aidan Lister [ctb, cph] (jQuery StickyTabs), Benct Philip Jonsson [ctb, cph] (pagebreak Lua filter), Albert Krewinkel [ctb, cph] (pagebreak Lua filter)", "Maintainer": "Yihui Xie ", "Repository": "CRAN" }, "robustbase": { "Package": "robustbase", - "Version": "0.99-4-1", + "Version": "0.99-6", "Source": "Repository", - "VersionNote": "Released 0.99-4 on 2024-08-19, 0.99-3 on 2024-07-01 and 0.99-2 on 2024-01-27 to CRAN", - "Date": "2024-09-24", + "VersionNote": "Released 0.99-5 on 2024-11-01, 0.99-4-1 on 2024-09-24, 0.99-4 on 2024-08-19, 0.99-3 on 2024-07-01 to CRAN", + "Date": "2025-09-03", "Title": "Basic Robust Statistics", "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=\"ctb\", comment = \"Qn and Sn\") , person(\"Christophe\", \"Croux\", role=\"ctb\", comment = \"Qn and Sn\") , person(\"Valentin\", \"Todorov\", role = \"aut\", email = \"valentin.todorov@chello.at\", comment = \"most robust Cov\") , person(\"Andreas\", \"Ruckstuhl\", role = \"aut\", email = \"andreas.ruckstuhl@zhaw.ch\", comment = \"nlrob, anova, glmrob\") , person(\"Matias\", \"Salibian-Barrera\", role = \"aut\", email = \"matias@stat.ubc.ca\", comment = \"lmrob orig.\") , person(\"Tobias\", \"Verbeke\", role = c(\"ctb\",\"fnd\"), email = \"tobias.verbeke@openanalytics.eu\", comment = \"mc, adjbox\") , person(\"Manuel\", \"Koller\", role = \"aut\", email = \"koller.manuel@gmail.com\", comment = \"mc, lmrob, psi-func.\") , person(c(\"Eduardo\", \"L. T.\"), \"Conceicao\", role = \"aut\", email = \"mail@eduardoconceicao.org\", comment = \"MM-, tau-, CM-, and MTL- nlrob\") , person(\"Maria\", \"Anna di Palma\", role = \"ctb\", comment = \"initial version of Comedian\") )", "URL": "https://robustbase.R-forge.R-project.org/, https://R-forge.R-project.org/R/?group_id=59, https://R-forge.R-project.org/scm/viewvc.php/pkg/robustbase/?root=robustbase, svn://svn.r-forge.r-project.org/svnroot/robustbase/pkg/robustbase", @@ -7769,7 +7894,7 @@ "LazyData": "yes", "NeedsCompilation": "yes", "License": "GPL (>= 2)", - "Author": "Martin Maechler [aut, cre] (), Peter Rousseeuw [ctb] (Qn and Sn), Christophe Croux [ctb] (Qn and Sn), Valentin Todorov [aut] (most robust Cov), Andreas Ruckstuhl [aut] (nlrob, anova, glmrob), Matias Salibian-Barrera [aut] (lmrob orig.), Tobias Verbeke [ctb, fnd] (mc, adjbox), Manuel Koller [aut] (mc, lmrob, psi-func.), Eduardo L. T. Conceicao [aut] (MM-, tau-, CM-, and MTL- nlrob), Maria Anna di Palma [ctb] (initial version of Comedian)", + "Author": "Martin Maechler [aut, cre] (ORCID: ), Peter Rousseeuw [ctb] (Qn and Sn), Christophe Croux [ctb] (Qn and Sn), Valentin Todorov [aut] (most robust Cov), Andreas Ruckstuhl [aut] (nlrob, anova, glmrob), Matias Salibian-Barrera [aut] (lmrob orig.), Tobias Verbeke [ctb, fnd] (mc, adjbox), Manuel Koller [aut] (mc, lmrob, psi-func.), Eduardo L. T. Conceicao [aut] (MM-, tau-, CM-, and MTL- nlrob), Maria Anna di Palma [ctb] (initial version of Comedian)", "Maintainer": "Martin Maechler ", "Repository": "CRAN" }, @@ -7803,7 +7928,7 @@ }, "rprojroot": { "Package": "rprojroot", - "Version": "2.1.0", + "Version": "2.1.1", "Source": "Repository", "Title": "Finding Files in Project Subdirectories", "Authors@R": "person(given = \"Kirill\", family = \"M\\u00fcller\", role = c(\"aut\", \"cre\"), email = \"kirill@cynkra.com\", comment = c(ORCID = \"0000-0002-1416-3412\"))", @@ -7942,11 +8067,11 @@ }, "see": { "Package": "see", - "Version": "0.11.0", + "Version": "0.12.0", "Source": "Repository", "Type": "Package", "Title": "Model Visualisation Toolbox for 'easystats' and 'ggplot2'", - "Authors@R": "c(person(given = \"Daniel\", family = \"Lüdecke\", role = c(\"aut\", \"ctb\"), email = \"d.luedecke@uke.de\", comment = c(ORCID = \"0000-0002-8895-3206\")), person(given = \"Dominique\", family = \"Makowski\", role = c(\"aut\", \"inv\"), email = \"dom.makowski@gmail.com\", comment = c(ORCID = \"0000-0001-5375-9967\")), person(given = \"Indrajeet\", family = \"Patil\", role = c(\"aut\", \"cre\"), email = \"patilindrajeet.science@gmail.com\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(given = \"Mattan S.\", family = \"Ben-Shachar\", role = c(\"aut\", \"ctb\"), email = \"matanshm@post.bgu.ac.il\", comment = c(ORCID = \"0000-0002-4287-4801\")), person(given = \"Brenton M.\", family = \"Wiernik\", role = c(\"aut\", \"ctb\"), email = \"brenton@wiernik.org\", comment = c(ORCID = \"0000-0001-9560-6336\")), person(given = \"Philip\", family = \"Waggoner\", role = c(\"aut\", \"ctb\"), email = \"philip.waggoner@gmail.com\", comment = c(ORCID = \"0000-0002-7825-7573\")), person(given = \"Jeffrey R.\", family = \"Stevens\", role = \"ctb\", email = \"jeffrey.r.stevens@gmail.com\", comment = c(ORCID = \"0000-0003-2375-1360\")), person(given = \"Matthew\", family = \"Smith\", role = \"rev\", email = \"M.Smith3@napier.ac.uk\"), person(given = \"Jakob\", family = \"Bossek\", role = \"rev\", email = \"bossek@wi.uni-muenster.de\"))", + "Authors@R": "c(person(given = \"Daniel\", family = \"Lüdecke\", role = c(\"aut\", \"ctb\"), email = \"d.luedecke@uke.de\", comment = c(ORCID = \"0000-0002-8895-3206\")), person(given = \"Dominique\", family = \"Makowski\", role = c(\"aut\", \"inv\"), email = \"dom.makowski@gmail.com\", comment = c(ORCID = \"0000-0001-5375-9967\")), person(given = \"Indrajeet\", family = \"Patil\", role = c(\"aut\", \"cre\"), email = \"patilindrajeet.science@gmail.com\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(given = \"Mattan S.\", family = \"Ben-Shachar\", role = c(\"aut\", \"ctb\"), email = \"matanshm@post.bgu.ac.il\", comment = c(ORCID = \"0000-0002-4287-4801\")), person(given = \"Brenton M.\", family = \"Wiernik\", role = c(\"aut\", \"ctb\"), email = \"brenton@wiernik.org\", comment = c(ORCID = \"0000-0001-9560-6336\")), person(given = \"Rémi\", family = \"Thériault\", role = c(\"aut\", \"ctb\"), email = \"remi.theriault@mail.mcgill.ca\", comment = c(ORCID = \"0000-0003-4315-6788\")), person(given = \"Philip\", family = \"Waggoner\", role = c(\"aut\", \"ctb\"), email = \"philip.waggoner@gmail.com\", comment = c(ORCID = \"0000-0002-7825-7573\")), person(given = \"Jeffrey R.\", family = \"Stevens\", role = \"ctb\", email = \"jeffrey.r.stevens@gmail.com\", comment = c(ORCID = \"0000-0003-2375-1360\")), person(given = \"Matthew\", family = \"Smith\", role = \"rev\", email = \"M.Smith3@napier.ac.uk\"), person(given = \"Jakob\", family = \"Bossek\", role = \"rev\", email = \"bossek@wi.uni-muenster.de\"))", "Maintainer": "Indrajeet Patil ", "Description": "Provides plotting utilities supporting packages in the 'easystats' ecosystem () and some extra themes, geoms, and scales for 'ggplot2'. Color scales are based on . References: Lüdecke et al. (2021) .", "License": "MIT + file LICENSE", @@ -7955,20 +8080,20 @@ "Depends": [ "graphics", "grDevices", - "R (>= 4.0)", + "R (>= 4.1)", "stats" ], "Imports": [ - "bayestestR (>= 0.15.2)", - "correlation (>= 0.8.7)", - "datawizard (>= 1.0.1)", - "effectsize (>= 1.0.0)", - "ggplot2 (>= 3.5.1)", - "insight (>= 1.1.0)", - "modelbased (>= 0.10.0)", - "patchwork (>= 1.3.0)", - "parameters (>= 0.24.2)", - "performance (>= 0.13.0)" + "bayestestR (>= 0.17.0)", + "correlation (>= 0.8.8)", + "datawizard (>= 1.2.0)", + "effectsize (>= 1.0.1)", + "ggplot2 (>= 4.0.0)", + "insight (>= 1.4.1)", + "modelbased (>= 0.13.0)", + "patchwork (>= 1.3.2)", + "parameters (>= 0.28.1)", + "performance (>= 0.15.1)" ], "Suggests": [ "BH", @@ -7976,6 +8101,7 @@ "collapse", "curl", "DHARMa", + "discovr", "emmeans", "factoextra", "Formula", @@ -8007,7 +8133,7 @@ "rlang", "rmarkdown", "rstanarm", - "scales (>= 1.3.0)", + "scales (>= 1.4.0)", "splines", "testthat (>= 3.2.1)", "tidygraph", @@ -8015,83 +8141,85 @@ ], "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Config/testthat/edition": "3", "Config/testthat/parallel": "true", "Config/Needs/website": "easystats/easystatstemplate", "Config/rcmdcheck/ignore-inconsequential-notes": "true", "NeedsCompilation": "no", - "Author": "Daniel Lüdecke [aut, ctb] (), Dominique Makowski [aut, inv] (), Indrajeet Patil [aut, cre] (), Mattan S. Ben-Shachar [aut, ctb] (), Brenton M. Wiernik [aut, ctb] (), Philip Waggoner [aut, ctb] (), Jeffrey R. Stevens [ctb] (), Matthew Smith [rev], Jakob Bossek [rev]", + "Author": "Daniel Lüdecke [aut, ctb] (ORCID: ), Dominique Makowski [aut, inv] (ORCID: ), Indrajeet Patil [aut, cre] (ORCID: ), Mattan S. Ben-Shachar [aut, ctb] (ORCID: ), Brenton M. Wiernik [aut, ctb] (ORCID: ), Rémi Thériault [aut, ctb] (ORCID: ), Philip Waggoner [aut, ctb] (ORCID: ), Jeffrey R. Stevens [ctb] (ORCID: ), Matthew Smith [rev], Jakob Bossek [rev]", "Repository": "CRAN" }, "shiny": { "Package": "shiny", - "Version": "1.11.1", + "Version": "1.12.1", "Source": "Repository", "Type": "Package", "Title": "Web Application Framework for R", - "Authors@R": "c( person(\"Winston\", \"Chang\", role = c(\"aut\", \"cre\"), email = \"winston@posit.co\", comment = c(ORCID = \"0000-0002-1576-2126\")), person(\"Joe\", \"Cheng\", role = \"aut\", email = \"joe@posit.co\"), person(\"JJ\", \"Allaire\", role = \"aut\", email = \"jj@posit.co\"), person(\"Carson\", \"Sievert\", role = \"aut\", email = \"carson@posit.co\", comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Barret\", \"Schloerke\", role = \"aut\", email = \"barret@posit.co\", comment = c(ORCID = \"0000-0001-9986-114X\")), person(\"Yihui\", \"Xie\", role = \"aut\", email = \"yihui@posit.co\"), person(\"Jeff\", \"Allen\", role = \"aut\"), person(\"Jonathan\", \"McPherson\", role = \"aut\", email = \"jonathan@posit.co\"), person(\"Alan\", \"Dipert\", role = \"aut\"), person(\"Barbara\", \"Borges\", role = \"aut\"), 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(family = \"jQuery UI contributors\", role = c(\"ctb\", \"cph\"), comment = \"jQuery UI library; authors listed in inst/www/shared/jqueryui/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(\"Prem Nawaz\", \"Khan\", role = \"ctb\", comment = \"Bootstrap accessibility plugin\"), person(\"Victor\", \"Tsaran\", role = \"ctb\", comment = \"Bootstrap accessibility plugin\"), person(\"Dennis\", \"Lembree\", role = \"ctb\", comment = \"Bootstrap accessibility plugin\"), person(\"Srinivasu\", \"Chakravarthula\", role = \"ctb\", comment = \"Bootstrap accessibility plugin\"), person(\"Cathy\", \"O'Connor\", role = \"ctb\", comment = \"Bootstrap accessibility plugin\"), person(family = \"PayPal, Inc\", role = \"cph\", comment = \"Bootstrap accessibility plugin\"), person(\"Stefan\", \"Petre\", role = c(\"ctb\", \"cph\"), comment = \"Bootstrap-datepicker library\"), person(\"Andrew\", \"Rowls\", role = c(\"ctb\", \"cph\"), comment = \"Bootstrap-datepicker library\"), person(\"Brian\", \"Reavis\", role = c(\"ctb\", \"cph\"), comment = \"selectize.js library\"), person(\"Salmen\", \"Bejaoui\", role = c(\"ctb\", \"cph\"), comment = \"selectize-plugin-a11y library\"), person(\"Denis\", \"Ineshin\", role = c(\"ctb\", \"cph\"), comment = \"ion.rangeSlider library\"), person(\"Sami\", \"Samhuri\", role = c(\"ctb\", \"cph\"), comment = \"Javascript strftime library\"), person(family = \"SpryMedia Limited\", role = c(\"ctb\", \"cph\"), comment = \"DataTables library\"), person(\"John\", \"Fraser\", role = c(\"ctb\", \"cph\"), comment = \"showdown.js library\"), person(\"John\", \"Gruber\", role = c(\"ctb\", \"cph\"), comment = \"showdown.js library\"), person(\"Ivan\", \"Sagalaev\", role = c(\"ctb\", \"cph\"), comment = \"highlight.js library\"), person(given = \"R Core Team\", role = c(\"ctb\", \"cph\"), comment = \"tar implementation from R\") )", + "Authors@R": "c( person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0002-1576-2126\")), person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"), person(\"JJ\", \"Allaire\", , \"jj@posit.co\", role = \"aut\"), person(\"Carson\", \"Sievert\", , \"carson@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Barret\", \"Schloerke\", , \"barret@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0001-9986-114X\")), person(\"Garrick\", \"Aden-Buie\", , \"garrick@adenbuie.com\", role = \"aut\", comment = c(ORCID = \"0000-0002-7111-0077\")), person(\"Yihui\", \"Xie\", , \"yihui@posit.co\", role = \"aut\"), person(\"Jeff\", \"Allen\", role = \"aut\"), person(\"Jonathan\", \"McPherson\", , \"jonathan@posit.co\", role = \"aut\"), person(\"Alan\", \"Dipert\", role = \"aut\"), person(\"Barbara\", \"Borges\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")), person(, \"jQuery Foundation\", role = \"cph\", comment = \"jQuery library and jQuery UI library\"), person(, \"jQuery contributors\", role = c(\"ctb\", \"cph\"), comment = \"jQuery library; authors listed in inst/www/shared/jquery-AUTHORS.txt\"), person(, \"jQuery UI contributors\", role = c(\"ctb\", \"cph\"), comment = \"jQuery UI library; authors listed in inst/www/shared/jqueryui/AUTHORS.txt\"), person(\"Mark\", \"Otto\", role = \"ctb\", comment = \"Bootstrap library\"), person(\"Jacob\", \"Thornton\", role = \"ctb\", comment = \"Bootstrap library\"), person(, \"Bootstrap contributors\", role = \"ctb\", comment = \"Bootstrap library\"), person(, \"Twitter, Inc\", role = \"cph\", comment = \"Bootstrap library\"), person(\"Prem Nawaz\", \"Khan\", role = \"ctb\", comment = \"Bootstrap accessibility plugin\"), person(\"Victor\", \"Tsaran\", role = \"ctb\", comment = \"Bootstrap accessibility plugin\"), person(\"Dennis\", \"Lembree\", role = \"ctb\", comment = \"Bootstrap accessibility plugin\"), person(\"Srinivasu\", \"Chakravarthula\", role = \"ctb\", comment = \"Bootstrap accessibility plugin\"), person(\"Cathy\", \"O'Connor\", role = \"ctb\", comment = \"Bootstrap accessibility plugin\"), person(, \"PayPal, Inc\", role = \"cph\", comment = \"Bootstrap accessibility plugin\"), person(\"Stefan\", \"Petre\", role = c(\"ctb\", \"cph\"), comment = \"Bootstrap-datepicker library\"), person(\"Andrew\", \"Rowls\", role = c(\"ctb\", \"cph\"), comment = \"Bootstrap-datepicker library\"), person(\"Brian\", \"Reavis\", role = c(\"ctb\", \"cph\"), comment = \"selectize.js library\"), person(\"Salmen\", \"Bejaoui\", role = c(\"ctb\", \"cph\"), comment = \"selectize-plugin-a11y library\"), person(\"Denis\", \"Ineshin\", role = c(\"ctb\", \"cph\"), comment = \"ion.rangeSlider library\"), person(\"Sami\", \"Samhuri\", role = c(\"ctb\", \"cph\"), comment = \"Javascript strftime library\"), person(, \"SpryMedia Limited\", role = c(\"ctb\", \"cph\"), comment = \"DataTables library\"), person(\"Ivan\", \"Sagalaev\", role = c(\"ctb\", \"cph\"), comment = \"highlight.js library\"), person(\"R Core Team\", role = c(\"ctb\", \"cph\"), comment = \"tar implementation from R\") )", "Description": "Makes it incredibly easy to build interactive web applications with R. Automatic \"reactive\" binding between inputs and outputs and extensive prebuilt widgets make it possible to build beautiful, responsive, and powerful applications with minimal effort.", "License": "GPL-3 | file LICENSE", + "URL": "https://shiny.posit.co/, https://github.com/rstudio/shiny", + "BugReports": "https://github.com/rstudio/shiny/issues", "Depends": [ - "R (>= 3.0.2)", - "methods" + "methods", + "R (>= 3.0.2)" ], "Imports": [ - "utils", - "grDevices", - "httpuv (>= 1.5.2)", - "mime (>= 0.3)", - "jsonlite (>= 0.9.16)", - "xtable", - "fontawesome (>= 0.4.0)", - "htmltools (>= 0.5.4)", - "R6 (>= 2.0)", - "sourcetools", - "later (>= 1.0.0)", - "promises (>= 1.3.2)", - "tools", - "cli", - "rlang (>= 0.4.10)", - "fastmap (>= 1.1.1)", - "withr", - "commonmark (>= 1.7)", - "glue (>= 1.3.2)", "bslib (>= 0.6.0)", "cachem (>= 1.1.0)", - "lifecycle (>= 0.2.0)" + "cli", + "commonmark (>= 2.0.0)", + "fastmap (>= 1.1.1)", + "fontawesome (>= 0.4.0)", + "glue (>= 1.3.2)", + "grDevices", + "htmltools (>= 0.5.4)", + "httpuv (>= 1.5.2)", + "jsonlite (>= 0.9.16)", + "later (>= 1.0.0)", + "lifecycle (>= 0.2.0)", + "mime (>= 0.3)", + "otel", + "promises (>= 1.5.0)", + "R6 (>= 2.0)", + "rlang (>= 0.4.10)", + "sourcetools", + "tools", + "utils", + "withr", + "xtable" ], "Suggests": [ + "Cairo (>= 1.5-5)", "coro (>= 1.1.0)", "datasets", "DT", - "Cairo (>= 1.5-5)", - "testthat (>= 3.2.1)", - "knitr (>= 1.6)", - "markdown", - "rmarkdown", - "ggplot2", - "reactlog (>= 1.0.0)", - "magrittr", - "yaml", - "mirai", - "future", "dygraphs", + "future", + "ggplot2", + "knitr (>= 1.6)", + "magrittr", + "markdown", + "mirai", + "otelsdk (>= 0.2.0)", "ragg", - "showtext", + "reactlog (>= 1.0.0)", + "rmarkdown", "sass", - "watcher" + "showtext", + "testthat (>= 3.2.1)", + "watcher", + "yaml" ], - "URL": "https://shiny.posit.co/, https://github.com/rstudio/shiny", - "BugReports": "https://github.com/rstudio/shiny/issues", - "Collate": "'globals.R' 'app-state.R' 'app_template.R' 'bind-cache.R' 'bind-event.R' 'bookmark-state-local.R' 'bookmark-state.R' 'bootstrap-deprecated.R' 'bootstrap-layout.R' 'conditions.R' 'map.R' 'utils.R' 'bootstrap.R' 'busy-indicators-spinners.R' 'busy-indicators.R' 'cache-utils.R' 'deprecated.R' 'devmode.R' 'diagnose.R' 'extended-task.R' 'fileupload.R' 'graph.R' 'reactives.R' 'reactive-domains.R' 'history.R' 'hooks.R' 'html-deps.R' 'image-interact-opts.R' 'image-interact.R' 'imageutils.R' 'input-action.R' 'input-checkbox.R' 'input-checkboxgroup.R' 'input-date.R' 'input-daterange.R' 'input-file.R' 'input-numeric.R' 'input-password.R' 'input-radiobuttons.R' 'input-select.R' 'input-slider.R' 'input-submit.R' 'input-text.R' 'input-textarea.R' 'input-utils.R' 'insert-tab.R' 'insert-ui.R' 'jqueryui.R' 'knitr.R' 'middleware-shiny.R' 'middleware.R' 'timer.R' 'shiny.R' 'mock-session.R' 'modal.R' 'modules.R' 'notifications.R' 'priorityqueue.R' 'progress.R' 'react.R' 'reexports.R' 'render-cached-plot.R' 'render-plot.R' 'render-table.R' 'run-url.R' 'runapp.R' 'serializers.R' 'server-input-handlers.R' 'server-resource-paths.R' 'server.R' 'shiny-options.R' 'shiny-package.R' 'shinyapp.R' 'shinyui.R' 'shinywrappers.R' 'showcase.R' 'snapshot.R' 'staticimports.R' 'tar.R' 'test-export.R' 'test-server.R' 'test.R' 'update-input.R' 'utils-lang.R' 'version_bs_date_picker.R' 'version_ion_range_slider.R' 'version_jquery.R' 'version_jqueryui.R' 'version_selectize.R' 'version_strftime.R' 'viewer.R'", - "RoxygenNote": "7.3.2", - "Encoding": "UTF-8", - "Config/testthat/edition": "3", "Config/Needs/check": "shinytest2", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.3", + "Collate": "'globals.R' 'app-state.R' 'app_template.R' 'bind-cache.R' 'bind-event.R' 'bookmark-state-local.R' 'bookmark-state.R' 'bootstrap-deprecated.R' 'bootstrap-layout.R' 'conditions.R' 'map.R' 'utils.R' 'bootstrap.R' 'busy-indicators-spinners.R' 'busy-indicators.R' 'cache-utils.R' 'deprecated.R' 'devmode.R' 'diagnose.R' 'extended-task.R' 'fileupload.R' 'graph.R' 'reactives.R' 'reactive-domains.R' 'history.R' 'hooks.R' 'html-deps.R' 'image-interact-opts.R' 'image-interact.R' 'imageutils.R' 'input-action.R' 'input-checkbox.R' 'input-checkboxgroup.R' 'input-date.R' 'input-daterange.R' 'input-file.R' 'input-numeric.R' 'input-password.R' 'input-radiobuttons.R' 'input-select.R' 'input-slider.R' 'input-submit.R' 'input-text.R' 'input-textarea.R' 'input-utils.R' 'insert-tab.R' 'insert-ui.R' 'jqueryui.R' 'knitr.R' 'middleware-shiny.R' 'middleware.R' 'timer.R' 'shiny.R' 'mock-session.R' 'modal.R' 'modules.R' 'notifications.R' 'otel-attr-srcref.R' 'otel-collect.R' 'otel-enable.R' 'otel-error.R' 'otel-label.R' 'otel-reactive-update.R' 'otel-session.R' 'otel-shiny.R' 'otel-with.R' 'priorityqueue.R' 'progress.R' 'react.R' 'reexports.R' 'render-cached-plot.R' 'render-plot.R' 'render-table.R' 'run-url.R' 'runapp.R' 'serializers.R' 'server-input-handlers.R' 'server-resource-paths.R' 'server.R' 'shiny-options.R' 'shiny-package.R' 'shinyapp.R' 'shinyui.R' 'shinywrappers.R' 'showcase.R' 'snapshot.R' 'staticimports.R' 'tar.R' 'test-export.R' 'test-server.R' 'test.R' 'update-input.R' 'utils-lang.R' 'utils-tags.R' 'version_bs_date_picker.R' 'version_ion_range_slider.R' 'version_jquery.R' 'version_jqueryui.R' 'version_selectize.R' 'version_strftime.R' 'viewer.R'", "NeedsCompilation": "no", - "Author": "Winston Chang [aut, cre] (ORCID: ), Joe Cheng [aut], JJ Allaire [aut], Carson Sievert [aut] (ORCID: ), Barret Schloerke [aut] (ORCID: ), Yihui Xie [aut], Jeff Allen [aut], Jonathan McPherson [aut], Alan Dipert [aut], Barbara Borges [aut], 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), jQuery UI contributors [ctb, cph] (jQuery UI library; authors listed in inst/www/shared/jqueryui/AUTHORS.txt), Mark Otto [ctb] (Bootstrap library), Jacob Thornton [ctb] (Bootstrap library), Bootstrap contributors [ctb] (Bootstrap library), Twitter, Inc [cph] (Bootstrap library), Prem Nawaz Khan [ctb] (Bootstrap accessibility plugin), Victor Tsaran [ctb] (Bootstrap accessibility plugin), Dennis Lembree [ctb] (Bootstrap accessibility plugin), Srinivasu Chakravarthula [ctb] (Bootstrap accessibility plugin), Cathy O'Connor [ctb] (Bootstrap accessibility plugin), PayPal, Inc [cph] (Bootstrap accessibility plugin), Stefan Petre [ctb, cph] (Bootstrap-datepicker library), Andrew Rowls [ctb, cph] (Bootstrap-datepicker library), Brian Reavis [ctb, cph] (selectize.js library), Salmen Bejaoui [ctb, cph] (selectize-plugin-a11y library), Denis Ineshin [ctb, cph] (ion.rangeSlider library), Sami Samhuri [ctb, cph] (Javascript strftime library), SpryMedia Limited [ctb, cph] (DataTables library), John Fraser [ctb, cph] (showdown.js library), John Gruber [ctb, cph] (showdown.js library), Ivan Sagalaev [ctb, cph] (highlight.js library), R Core Team [ctb, cph] (tar implementation from R)", - "Maintainer": "Winston Chang ", + "Author": "Winston Chang [aut] (ORCID: ), Joe Cheng [aut], JJ Allaire [aut], Carson Sievert [aut, cre] (ORCID: ), Barret Schloerke [aut] (ORCID: ), Garrick Aden-Buie [aut] (ORCID: ), Yihui Xie [aut], Jeff Allen [aut], Jonathan McPherson [aut], Alan Dipert [aut], Barbara Borges [aut], Posit Software, PBC [cph, fnd] (ROR: ), jQuery Foundation [cph] (jQuery library and jQuery UI library), jQuery contributors [ctb, cph] (jQuery library; authors listed in inst/www/shared/jquery-AUTHORS.txt), jQuery UI contributors [ctb, cph] (jQuery UI library; authors listed in inst/www/shared/jqueryui/AUTHORS.txt), Mark Otto [ctb] (Bootstrap library), Jacob Thornton [ctb] (Bootstrap library), Bootstrap contributors [ctb] (Bootstrap library), Twitter, Inc [cph] (Bootstrap library), Prem Nawaz Khan [ctb] (Bootstrap accessibility plugin), Victor Tsaran [ctb] (Bootstrap accessibility plugin), Dennis Lembree [ctb] (Bootstrap accessibility plugin), Srinivasu Chakravarthula [ctb] (Bootstrap accessibility plugin), Cathy O'Connor [ctb] (Bootstrap accessibility plugin), PayPal, Inc [cph] (Bootstrap accessibility plugin), Stefan Petre [ctb, cph] (Bootstrap-datepicker library), Andrew Rowls [ctb, cph] (Bootstrap-datepicker library), Brian Reavis [ctb, cph] (selectize.js library), Salmen Bejaoui [ctb, cph] (selectize-plugin-a11y library), Denis Ineshin [ctb, cph] (ion.rangeSlider library), Sami Samhuri [ctb, cph] (Javascript strftime library), SpryMedia Limited [ctb, cph] (DataTables library), Ivan Sagalaev [ctb, cph] (highlight.js library), R Core Team [ctb, cph] (tar implementation from R)", + "Maintainer": "Carson Sievert ", "Repository": "CRAN" }, "shiny.i18n": { @@ -8373,7 +8501,7 @@ }, "stringr": { "Package": "stringr", - "Version": "1.5.1", + "Version": "1.6.0", "Source": "Repository", "Title": "Simple, Consistent Wrappers for Common String Operations", "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\", \"cph\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", @@ -8382,7 +8510,7 @@ "URL": "https://stringr.tidyverse.org, https://github.com/tidyverse/stringr", "BugReports": "https://github.com/tidyverse/stringr/issues", "Depends": [ - "R (>= 3.6)" + "R (>= 4.1.0)" ], "Imports": [ "cli", @@ -8406,10 +8534,11 @@ ], "VignetteBuilder": "knitr", "Config/Needs/website": "tidyverse/tidytemplate", + "Config/potools/style": "explicit", "Config/testthat/edition": "3", "Encoding": "UTF-8", "LazyData": "true", - "RoxygenNote": "7.2.3", + "RoxygenNote": "7.3.3", "NeedsCompilation": "no", "Author": "Hadley Wickham [aut, cre, cph], Posit Software, PBC [cph, fnd]", "Maintainer": "Hadley Wickham ", @@ -8441,7 +8570,7 @@ }, "systemfonts": { "Package": "systemfonts", - "Version": "1.2.3", + "Version": "1.3.1", "Source": "Repository", "Type": "Package", "Title": "System Native Font Finding", @@ -8464,9 +8593,12 @@ "Suggests": [ "covr", "farver", + "ggplot2", "graphics", "knitr", + "ragg", "rmarkdown", + "svglite", "testthat (>= 2.1.0)" ], "LinkingTo": [ @@ -8486,11 +8618,11 @@ }, "textshaping": { "Package": "textshaping", - "Version": "1.0.1", + "Version": "1.0.4", "Source": "Repository", "Title": "Bindings to the 'HarfBuzz' and 'Fribidi' Libraries for Text Shaping", "Authors@R": "c( person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0002-5147-4711\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")) )", - "Description": "Provides access to the text shaping functionality in the 'HarfBuzz' library and the bidirectional algorithm in the 'Fribidi' library. 'textshaping' is a low-level utility package mainly for graphic devices that expands upon the font tool-set provided by the 'systemfonts' package.", + "Description": "Provides access to the text shaping functionality in the 'HarfBuzz' library and the bidirectional algorithm in the 'Fribidi' library. 'textshaping' is a low-level utility package mainly for graphic devices that expands upon the font tool-set provided by the 'systemfonts' package.", "License": "MIT + file LICENSE", "URL": "https://github.com/r-lib/textshaping", "BugReports": "https://github.com/r-lib/textshaping/issues", @@ -8501,7 +8633,7 @@ "lifecycle", "stats", "stringi", - "systemfonts (>= 1.1.0)", + "systemfonts (>= 1.3.0)", "utils" ], "Suggests": [ @@ -8530,7 +8662,7 @@ }, "thematic": { "Package": "thematic", - "Version": "0.1.7", + "Version": "0.1.8", "Source": "Repository", "Title": "Unified and Automatic 'Theming' of 'ggplot2', 'lattice', and 'base' R Graphics", "Authors@R": "c( person(\"Carson\", \"Sievert\", , \"carson@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Barret\", \"Schloerke\", , \"barret@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0001-9986-114X\")), person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", @@ -8543,7 +8675,7 @@ ], "Imports": [ "farver", - "ggplot2 (>= 3.3.0)", + "ggplot2 (>= 3.5.2)", "graphics", "grDevices", "grid", @@ -8575,12 +8707,12 @@ "vdiffr (>= 1.0.0)", "withr" ], - "Config/testthat/edition": "3", "Config/Needs/check": "shinytest2, callr, sf, ggthemes, patchwork, gridExtra, tinytex, devtools, rversions", "Config/Needs/routine": "ggrepel, r-lib/evaluate", "Config/Needs/website": "GGally, RColorBrewer, patchwork, apreshill/quillt, r-lib/evaluate", + "Config/testthat/edition": "3", "Encoding": "UTF-8", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "Collate": "'auto.R' 'base.R' 'cache.R' 'gfonts.R' 'ggplot.R' 'globals.R' 'hooks.R' 'knitr.R' 'lattice.R' 'onLoad.R' 'thematic-package.R' 'thematic-save-plot.R' 'thematic.R' 'utils.R'", "NeedsCompilation": "no", "Author": "Carson Sievert [aut, cre] (ORCID: ), Barret Schloerke [aut] (ORCID: ), Joe Cheng [aut], Posit Software, PBC [cph, fnd]", @@ -8774,7 +8906,7 @@ }, "tinytex": { "Package": "tinytex", - "Version": "0.57", + "Version": "0.58", "Source": "Repository", "Type": "Package", "Title": "Helper Functions to Install and Maintain TeX Live, and Compile LaTeX Documents", @@ -8791,9 +8923,9 @@ "URL": "https://github.com/rstudio/tinytex", "BugReports": "https://github.com/rstudio/tinytex/issues", "Encoding": "UTF-8", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "NeedsCompilation": "no", - "Author": "Yihui Xie [aut, cre, cph] (), Posit Software, PBC [cph, fnd], Christophe Dervieux [ctb] (), Devon Ryan [ctb] (), Ethan Heinzen [ctb], Fernando Cagua [ctb]", + "Author": "Yihui Xie [aut, cre, cph] (ORCID: ), Posit Software, PBC [cph, fnd], Christophe Dervieux [ctb] (ORCID: ), Devon Ryan [ctb] (ORCID: ), Ethan Heinzen [ctb], Fernando Cagua [ctb]", "Maintainer": "Yihui Xie ", "Repository": "CRAN" }, @@ -9098,16 +9230,16 @@ }, "vroom": { "Package": "vroom", - "Version": "1.6.5", + "Version": "1.6.7", "Source": "Repository", "Title": "Read and Write Rectangular Text Data Quickly", - "Authors@R": "c( person(\"Jim\", \"Hester\", role = \"aut\", comment = c(ORCID = \"0000-0002-2739-7082\")), person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-4757-117X\")), person(\"Jennifer\", \"Bryan\", , \"jenny@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-6983-2759\")), person(\"Shelby\", \"Bearrows\", role = \"ctb\"), person(\"https://github.com/mandreyel/\", role = \"cph\", comment = \"mio library\"), person(\"Jukka\", \"Jylänki\", role = \"cph\", comment = \"grisu3 implementation\"), person(\"Mikkel\", \"Jørgensen\", role = \"cph\", comment = \"grisu3 implementation\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Authors@R": "c( person(\"Jim\", \"Hester\", role = \"aut\", comment = c(ORCID = \"0000-0002-2739-7082\")), person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-4757-117X\")), person(\"Jennifer\", \"Bryan\", , \"jenny@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-6983-2759\")), person(\"Shelby\", \"Bearrows\", role = \"ctb\"), person(\"https://github.com/mandreyel/\", role = \"cph\", comment = \"mio library\"), person(\"Jukka\", \"Jylänki\", role = \"cph\", comment = \"grisu3 implementation\"), person(\"Mikkel\", \"Jørgensen\", role = \"cph\", comment = \"grisu3 implementation\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")) )", "Description": "The goal of 'vroom' is to read and write data (like 'csv', 'tsv' and 'fwf') quickly. When reading it uses a quick initial indexing step, then reads the values lazily , so only the data you actually use needs to be read. The writer formats the data in parallel and writes to disk asynchronously from formatting.", "License": "MIT + file LICENSE", "URL": "https://vroom.r-lib.org, https://github.com/tidyverse/vroom", "BugReports": "https://github.com/tidyverse/vroom/issues", "Depends": [ - "R (>= 3.6)" + "R (>= 4.1)" ], "Imports": [ "bit64", @@ -9150,19 +9282,20 @@ ], "LinkingTo": [ "cpp11 (>= 0.2.0)", - "progress (>= 1.2.1)", + "progress (>= 1.2.3)", "tzdb (>= 0.1.1)" ], "VignetteBuilder": "knitr", "Config/Needs/website": "nycflights13, tidyverse/tidytemplate", "Config/testthat/edition": "3", "Config/testthat/parallel": "false", + "Config/usethis/last-upkeep": "2025-11-25", "Copyright": "file COPYRIGHTS", "Encoding": "UTF-8", "Language": "en-US", - "RoxygenNote": "7.2.3.9000", + "RoxygenNote": "7.3.3", "NeedsCompilation": "yes", - "Author": "Jim Hester [aut] (), Hadley Wickham [aut] (), Jennifer Bryan [aut, cre] (), Shelby Bearrows [ctb], https://github.com/mandreyel/ [cph] (mio library), Jukka Jylänki [cph] (grisu3 implementation), Mikkel Jørgensen [cph] (grisu3 implementation), Posit Software, PBC [cph, fnd]", + "Author": "Jim Hester [aut] (ORCID: ), Hadley Wickham [aut] (ORCID: ), Jennifer Bryan [aut, cre] (ORCID: ), Shelby Bearrows [ctb], https://github.com/mandreyel/ [cph] (mio library), Jukka Jylänki [cph] (grisu3 implementation), Mikkel Jørgensen [cph] (grisu3 implementation), Posit Software, PBC [cph, fnd] (ROR: )", "Maintainer": "Jennifer Bryan ", "Repository": "CRAN" }, @@ -9233,7 +9366,7 @@ }, "xfun": { "Package": "xfun", - "Version": "0.52", + "Version": "0.54", "Source": "Repository", "Type": "Package", "Title": "Supporting Functions for Packages Maintained by 'Yihui Xie'", @@ -9255,7 +9388,7 @@ "rstudioapi", "tinytex (>= 0.30)", "mime", - "litedown (>= 0.4)", + "litedown (>= 0.6)", "commonmark", "knitr (>= 1.50)", "remotes", @@ -9265,22 +9398,23 @@ "jsonlite", "magick", "yaml", + "data.table", "qs" ], "License": "MIT + file LICENSE", "URL": "https://github.com/yihui/xfun", "BugReports": "https://github.com/yihui/xfun/issues", "Encoding": "UTF-8", - "RoxygenNote": "7.3.2", + "RoxygenNote": "7.3.3", "VignetteBuilder": "litedown", "NeedsCompilation": "yes", - "Author": "Yihui Xie [aut, cre, cph] (, https://yihui.org), Wush Wu [ctb], Daijiang Li [ctb], Xianying Tan [ctb], Salim Brüggemann [ctb] (), Christophe Dervieux [ctb]", + "Author": "Yihui Xie [aut, cre, cph] (ORCID: , URL: https://yihui.org), Wush Wu [ctb], Daijiang Li [ctb], Xianying Tan [ctb], Salim Brüggemann [ctb] (ORCID: ), Christophe Dervieux [ctb]", "Maintainer": "Yihui Xie ", "Repository": "CRAN" }, "xml2": { "Package": "xml2", - "Version": "1.3.8", + "Version": "1.5.1", "Source": "Repository", "Title": "Parse XML", "Authors@R": "c( person(\"Hadley\", \"Wickham\", role = \"aut\"), person(\"Jim\", \"Hester\", role = \"aut\"), person(\"Jeroen\", \"Ooms\", email = \"jeroenooms@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(\"R Foundation\", role = \"ctb\", comment = \"Copy of R-project homepage cached as example\") )", @@ -9301,7 +9435,6 @@ "curl", "httr", "knitr", - "magrittr", "mockery", "rmarkdown", "testthat (>= 3.2.0)", @@ -9310,7 +9443,7 @@ "VignetteBuilder": "knitr", "Config/Needs/website": "tidyverse/tidytemplate", "Encoding": "UTF-8", - "RoxygenNote": "7.2.3", + "RoxygenNote": "7.3.3", "SystemRequirements": "libxml2: libxml2-dev (deb), libxml2-devel (rpm)", "Collate": "'S4.R' 'as_list.R' 'xml_parse.R' 'as_xml_document.R' 'classes.R' 'format.R' 'import-standalone-obj-type.R' 'import-standalone-purrr.R' 'import-standalone-types-check.R' 'init.R' 'nodeset_apply.R' 'paths.R' 'utils.R' 'xml2-package.R' 'xml_attr.R' 'xml_children.R' 'xml_document.R' 'xml_find.R' 'xml_missing.R' 'xml_modify.R' 'xml_name.R' 'xml_namespaces.R' 'xml_node.R' 'xml_nodeset.R' 'xml_path.R' 'xml_schema.R' 'xml_serialize.R' 'xml_structure.R' 'xml_text.R' 'xml_type.R' 'xml_url.R' 'xml_write.R' 'zzz.R'", "Config/testthat/edition": "3", @@ -9350,21 +9483,22 @@ }, "yaml": { "Package": "yaml", - "Version": "2.3.10", + "Version": "2.3.11", "Source": "Repository", "Type": "Package", "Title": "Methods to Convert R Data to YAML and Back", - "Date": "2024-07-22", + "Date": "2025-11-06", "Suggests": [ "RUnit" ], - "Author": "Shawn P Garbett [aut], Jeremy Stephens [aut, cre], Kirill Simonov [aut], Yihui Xie [ctb], Zhuoer Dong [ctb], Hadley Wickham [ctb], Jeffrey Horner [ctb], reikoch [ctb], Will Beasley [ctb], Brendan O'Connor [ctb], Gregory R. Warnes [ctb], Michael Quinn [ctb], Zhian N. Kamvar [ctb], Charlie Gao [ctb]", + "Authors@R": "c( person(\"Shawn\", \"Garbett\", role = c(\"cre\",\"ctb\"), email = \"shawn.garbett@vumc.org\", comment = c(ORCID=\"0000-0003-4079-5621\") ), person(\"Jeremy\", \"Stephens\", role = c(\"aut\", \"ctb\")), person(\"Kirill\", \"Simonov\", role = \"aut\"), person(\"Yihui\", \"Xie\", role = \"ctb\", comment = c(ORCID=\"0000-0003-0645-5666\")), person(\"Zhuoer\", \"Dong\", role = \"ctb\"), person(\"Hadley\", \"Wickham\", role = \"ctb\", comment = c(ORCID=\"0000-0003-4757-117X\")), person(\"Jeffrey\", \"Horner\", role = \"ctb\"), person(\"reikoch\", role = \"ctb\"), person(\"Will\", \"Beasley\", role = \"ctb\", comment = c(ORCID=\"0000-0002-5613-5006\")), person(\"Brendan\", \"O'Connor\", role = \"ctb\"), person(\"Michael\", \"Quinn\", role = \"ctb\"), person(\"Charlie\", \"Gao\", role = \"ctb\"), person(c(\"Gregory\", \"R.\"), \"Warnes\", role = \"ctb\"), person(c(\"Zhian\", \"N.\"), \"Kamvar\", role = \"ctb\") )", "Maintainer": "Shawn Garbett ", "License": "BSD_3_clause + file LICENSE", "Description": "Implements the 'libyaml' 'YAML' 1.1 parser and emitter () for R.", "URL": "https://github.com/vubiostat/r-yaml/", "BugReports": "https://github.com/vubiostat/r-yaml/issues", "NeedsCompilation": "yes", + "Author": "Shawn Garbett [cre, ctb] (ORCID: ), Jeremy Stephens [aut, ctb], Kirill Simonov [aut], Yihui Xie [ctb] (ORCID: ), Zhuoer Dong [ctb], Hadley Wickham [ctb] (ORCID: ), Jeffrey Horner [ctb], reikoch [ctb], Will Beasley [ctb] (ORCID: ), Brendan O'Connor [ctb], Michael Quinn [ctb], Charlie Gao [ctb], Gregory R. Warnes [ctb], Zhian N. Kamvar [ctb]", "Repository": "CRAN" }, "zip": { diff --git a/app_docker/translations/translation_da.csv b/app_docker/translations/translation_da.csv index e639f6c9..6eff561d 100644 --- a/app_docker/translations/translation_da.csv +++ b/app_docker/translations/translation_da.csv @@ -150,10 +150,7 @@ "Settings","Indstillinger" "The following error occured on determining correlations:","Følgende fejl opstod i forbindelse med korrelationsanalysen:" "We encountered the following error creating your report:","Følgende fejl opstod, da rapporten blev dannet:" -"No variable chosen for analysis","Ingen variabel er valgt til analysen" "No missing observations","Ingen manglende observationer" -"Missing vs non-missing observations in the variable **'{variabler()}'**","Manglende vs ikke-manglende observationer i variablen **'{variabler()}'**" -"There is a significant correlation between {n_nonmcar} variables and missing observations in the outcome variable {outcome}.","Der er en betydelig korrelation blandt {n_nonmcar} variabler sammenlignet efter manglende observationer i {outcome}." "There is a total of {p_miss} % missing observations.","Der er i alt {p_miss} % manglende observationer." "Median:","Median:" "Restore original data","Gendan originale data" @@ -246,11 +243,9 @@ "Data characteristics table","Oversigtstabel" "The dataset without text variables","Datasættet uden variabler formateret som tekst" "Creating the table. Hold on for a moment..","Opretter tabellen. Vent et øjeblik.." -"Select variable to stratify analysis","Vælg variabler til at stratificere analysen" "Generating the report. Hold on for a moment..","Opretter rapporten. Vent et øjeblik.." "We encountered the following error showing missingness:","Under analysen af manglende observationer opstod følgende fejl:" "We encountered the following error browsing your data:","I forsøget på at vise en dataoversigt opstod følgende fejl:" -"To consider if data is missing by random, choose the outcome/dependent variable (only variables with any missings are available). If there is a significant difference across other variables depending on missing observations, it may not be missing at random.","Vælg svarvariablen, for at få hjælp til at vurdere om manglende observationer manglende tilfældigt eller ej (kun variabler med manglende data kan vælges). Hvis der er statistisk signifikant forskel mellem nogle af de øvrige variabler i forhold til manglende data i den valgte variable kan det være et udtryk for at data ikke mangler tilfældigt." "Choose a name for the column to be created or modified, then enter an expression before clicking on the button below to create the variable, or cancel to exit without saving anything.","Vælg et navn til den nye variabel, skriv din formel og tryk så på knappen for at gemme variablen, eller annuler for at lukke uden at gemme." "Please fill in web address and API token, then press 'Connect'.","Udfyld serveradresse og API-nøgle, og tryk så 'Fobind'." "Other","Other" @@ -299,3 +294,15 @@ "Words","Words" "Shorten to first letters","Shorten to first letters" "Shorten to first words","Shorten to first words" +"Missings across variables by the variable **'{input$missings_var}'**","Missings across variables by the variable **'{input$missings_var}'**" +"Missing vs non-missing observations in the variable **'{input$missings_var}'**","Missing vs non-missing observations in the variable **'{input$missings_var}'**" +"Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random.","Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random." +"Calculating. Hold tight for a moment..","Calculating. Hold tight for a moment.." +"Overview of missing observations","Overview of missing observations" +"Analysis method for missingness overview","Analysis method for missingness overview" +"Overview of missings across variables","Overview of missings across variables" +"Overview of difference in variables by missing status in outcome","Overview of difference in variables by missing status in outcome" +"Select a variable for grouped overview","Select a variable for grouped overview" +"Select outcome variable for overview","Select outcome variable for overview" +"No outcome measure chosen","No outcome measure chosen" +"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." diff --git a/app_docker/translations/translation_de.csv b/app_docker/translations/translation_de.csv index 682e35bf..9bdb216e 100644 --- a/app_docker/translations/translation_de.csv +++ b/app_docker/translations/translation_de.csv @@ -103,9 +103,7 @@ "You can choose between these file types:","You can choose between these file types:" "You can import {file_extensions_text} files","You can import {file_extensions_text} files" "First five rows are shown below:","First five rows are shown below:" -"No variable chosen for analysis","No variable chosen for analysis" "No missing observations","No missing observations" -"Missing vs non-missing observations in the variable **'{variabler()}'**","Missing vs non-missing observations in the variable **'{variabler()}'**" "Grouped by {get_label(data,ter)}","Grouped by {get_label(data,ter)}" "Import data from REDCap","Import data from REDCap" "REDCap server","REDCap server" @@ -207,7 +205,6 @@ "Correlation cut-off","Correlation cut-off" "Set the cut-off for considered 'highly correlated'.","Set the cut-off for considered 'highly correlated'." "Missings","Missings" -"To consider if data is missing by random, choose the outcome/dependent variable (only variables with any missings are available). If there is a significant difference across other variables depending on missing observations, it may not be missing at random.","To consider if data is missing by random, choose the outcome/dependent variable (only variables with any missings are available). If there is a significant difference across other variables depending on missing observations, it may not be missing at random." "Visuals","Visuals" "Analysis validation","Analysis validation" "Report","Report" @@ -230,7 +227,6 @@ "You removed {p_out} % of observations.","You removed {p_out} % of observations." "You removed {p_out} % of variables.","You removed {p_out} % of variables." "There is a total of {p_miss} % missing observations.","There is a total of {p_miss} % missing observations." -"There is a significant correlation between {n_nonmcar} variables and missing observations in the outcome variable {outcome}.","There is a significant correlation between {n_nonmcar} variables and missing observations in the outcome variable {outcome}." "Data includes {n_pairs} pairs of highly correlated variables.","Data includes {n_pairs} pairs of highly correlated variables." "Class","Class" "Observations","Observations" @@ -267,7 +263,6 @@ "The dataset without text variables","The dataset without text variables" "The data includes {n_col} variables. Please limit to 100.","The data includes {n_col} variables. Please limit to 100." "Creating the table. Hold on for a moment..","Creating the table. Hold on for a moment.." -"Select variable to stratify analysis","Select variable to stratify analysis" "Generating the report. Hold on for a moment..","Generating the report. Hold on for a moment.." "We encountered the following error creating your report:","We encountered the following error creating your report:" "There are more advanced options to modify factor/categorical variables as well as create new factor from an existing variable or new variables with R code. At the bottom you can restore the original data.","There are more advanced options to modify factor/categorical variables as well as create new factor from an existing variable or new variables with R code. At the bottom you can restore the original data." @@ -299,3 +294,15 @@ "Words","Words" "Shorten to first letters","Shorten to first letters" "Shorten to first words","Shorten to first words" +"Missings across variables by the variable **'{input$missings_var}'**","Missings across variables by the variable **'{input$missings_var}'**" +"Missing vs non-missing observations in the variable **'{input$missings_var}'**","Missing vs non-missing observations in the variable **'{input$missings_var}'**" +"Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random.","Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random." +"Calculating. Hold tight for a moment..","Calculating. Hold tight for a moment.." +"Overview of missing observations","Overview of missing observations" +"Analysis method for missingness overview","Analysis method for missingness overview" +"Overview of missings across variables","Overview of missings across variables" +"Overview of difference in variables by missing status in outcome","Overview of difference in variables by missing status in outcome" +"Select a variable for grouped overview","Select a variable for grouped overview" +"Select outcome variable for overview","Select outcome variable for overview" +"No outcome measure chosen","No outcome measure chosen" +"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." diff --git a/app_docker/translations/translation_sv.csv b/app_docker/translations/translation_sv.csv index 47fca535..4383f3b4 100644 --- a/app_docker/translations/translation_sv.csv +++ b/app_docker/translations/translation_sv.csv @@ -103,9 +103,7 @@ "You can choose between these file types:","You can choose between these file types:" "You can import {file_extensions_text} files","You can import {file_extensions_text} files" "First five rows are shown below:","First five rows are shown below:" -"No variable chosen for analysis","No variable chosen for analysis" "No missing observations","No missing observations" -"Missing vs non-missing observations in the variable **'{variabler()}'**","Missing vs non-missing observations in the variable **'{variabler()}'**" "Grouped by {get_label(data,ter)}","Grouped by {get_label(data,ter)}" "Import data from REDCap","Import data from REDCap" "REDCap server","REDCap server" @@ -207,7 +205,6 @@ "Correlation cut-off","Correlation cut-off" "Set the cut-off for considered 'highly correlated'.","Set the cut-off for considered 'highly correlated'." "Missings","Missings" -"To consider if data is missing by random, choose the outcome/dependent variable (only variables with any missings are available). If there is a significant difference across other variables depending on missing observations, it may not be missing at random.","To consider if data is missing by random, choose the outcome/dependent variable (only variables with any missings are available). If there is a significant difference across other variables depending on missing observations, it may not be missing at random." "Visuals","Visuals" "Analysis validation","Analysis validation" "Report","Report" @@ -230,7 +227,6 @@ "You removed {p_out} % of observations.","You removed {p_out} % of observations." "You removed {p_out} % of variables.","You removed {p_out} % of variables." "There is a total of {p_miss} % missing observations.","There is a total of {p_miss} % missing observations." -"There is a significant correlation between {n_nonmcar} variables and missing observations in the outcome variable {outcome}.","There is a significant correlation between {n_nonmcar} variables and missing observations in the outcome variable {outcome}." "Data includes {n_pairs} pairs of highly correlated variables.","Data includes {n_pairs} pairs of highly correlated variables." "Class","Class" "Observations","Observations" @@ -267,7 +263,6 @@ "The dataset without text variables","The dataset without text variables" "The data includes {n_col} variables. Please limit to 100.","The data includes {n_col} variables. Please limit to 100." "Creating the table. Hold on for a moment..","Creating the table. Hold on for a moment.." -"Select variable to stratify analysis","Select variable to stratify analysis" "Generating the report. Hold on for a moment..","Generating the report. Hold on for a moment.." "We encountered the following error creating your report:","We encountered the following error creating your report:" "There are more advanced options to modify factor/categorical variables as well as create new factor from an existing variable or new variables with R code. At the bottom you can restore the original data.","There are more advanced options to modify factor/categorical variables as well as create new factor from an existing variable or new variables with R code. At the bottom you can restore the original data." @@ -299,3 +294,15 @@ "Words","Words" "Shorten to first letters","Shorten to first letters" "Shorten to first words","Shorten to first words" +"Missings across variables by the variable **'{input$missings_var}'**","Missings across variables by the variable **'{input$missings_var}'**" +"Missing vs non-missing observations in the variable **'{input$missings_var}'**","Missing vs non-missing observations in the variable **'{input$missings_var}'**" +"Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random.","Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random." +"Calculating. Hold tight for a moment..","Calculating. Hold tight for a moment.." +"Overview of missing observations","Overview of missing observations" +"Analysis method for missingness overview","Analysis method for missingness overview" +"Overview of missings across variables","Overview of missings across variables" +"Overview of difference in variables by missing status in outcome","Overview of difference in variables by missing status in outcome" +"Select a variable for grouped overview","Select a variable for grouped overview" +"Select outcome variable for overview","Select outcome variable for overview" +"No outcome measure chosen","No outcome measure chosen" +"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." diff --git a/app_docker/translations/translation_sw.csv b/app_docker/translations/translation_sw.csv index 5fa91537..227ce09e 100644 --- a/app_docker/translations/translation_sw.csv +++ b/app_docker/translations/translation_sw.csv @@ -150,10 +150,7 @@ "Settings","Settings" "The following error occured on determining correlations:","The following error occured on determining correlations:" "We encountered the following error creating your report:","We encountered the following error creating your report:" -"No variable chosen for analysis","No variable chosen for analysis" "No missing observations","No missing observations" -"Missing vs non-missing observations in the variable **'{variabler()}'**","Missing vs non-missing observations in the variable **'{variabler()}'**" -"There is a significant correlation between {n_nonmcar} variables and missing observations in the outcome variable {outcome}.","There is a significant correlation between {n_nonmcar} variables and missing observations in the outcome variable {outcome}." "There is a total of {p_miss} % missing observations.","There is a total of {p_miss} % missing observations." "Median:","Median:" "Restore original data","Restore original data" @@ -246,11 +243,9 @@ "Data characteristics table","Data characteristics table" "The dataset without text variables","The dataset without text variables" "Creating the table. Hold on for a moment..","Creating the table. Hold on for a moment.." -"Select variable to stratify analysis","Select variable to stratify analysis" "Generating the report. Hold on for a moment..","Generating the report. Hold on for a moment.." "We encountered the following error showing missingness:","We encountered the following error showing missingness:" "We encountered the following error browsing your data:","We encountered the following error browsing your data:" -"To consider if data is missing by random, choose the outcome/dependent variable (only variables with any missings are available). If there is a significant difference across other variables depending on missing observations, it may not be missing at random.","To consider if data is missing by random, choose the outcome/dependent variable (only variables with any missings are available). If there is a significant difference across other variables depending on missing observations, it may not be missing at random." "Choose a name for the column to be created or modified, then enter an expression before clicking on the button below to create the variable, or cancel to exit without saving anything.","Choose a name for the column to be created or modified, then enter an expression before clicking on the button below to create the variable, or cancel to exit without saving anything." "Other","Other" "Hour of the day","Hour of the day" @@ -299,3 +294,15 @@ "Words","Words" "Shorten to first letters","Shorten to first letters" "Shorten to first words","Shorten to first words" +"Missings across variables by the variable **'{input$missings_var}'**","Missings across variables by the variable **'{input$missings_var}'**" +"Missing vs non-missing observations in the variable **'{input$missings_var}'**","Missing vs non-missing observations in the variable **'{input$missings_var}'**" +"Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random.","Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random." +"Calculating. Hold tight for a moment..","Calculating. Hold tight for a moment.." +"Overview of missing observations","Overview of missing observations" +"Analysis method for missingness overview","Analysis method for missingness overview" +"Overview of missings across variables","Overview of missings across variables" +"Overview of difference in variables by missing status in outcome","Overview of difference in variables by missing status in outcome" +"Select a variable for grouped overview","Select a variable for grouped overview" +"Select outcome variable for overview","Select outcome variable for overview" +"No outcome measure chosen","No outcome measure chosen" +"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." diff --git a/app_docker/www/scripts.js b/app_docker/www/scripts.js index 6330bf0b..b7145a7e 100644 --- a/app_docker/www/scripts.js +++ b/app_docker/www/scripts.js @@ -91,3 +91,12 @@ $(document).on('focus', '.smart-dropdown .selectize-control input', function() { } }); +// window.addEventListener('beforeunload', function (e) { +// // Cancel the event +// e.preventDefault(); +// // Chrome requires returnValue to be set +// e.returnValue = ''; +// // Some browsers display this message, others show a generic one +// return 'Are you sure you want to leave? Any unsaved changes will be lost.'; +// }); + diff --git a/inst/apps/FreesearchR/app.R b/inst/apps/FreesearchR/app.R index e3c8aca9..592665b8 100644 --- a/inst/apps/FreesearchR/app.R +++ b/inst/apps/FreesearchR/app.R @@ -1,7 +1,7 @@ ######## -#### Current file: /var/folders/9l/xbc19wxx0g79jdd2sf_0v291mhwh7f/T//RtmpejDCIE/filec7541d50b50.R +#### Current file: /var/folders/9l/xbc19wxx0g79jdd2sf_0v291mhwh7f/T//RtmpT9sPX5/file6c8068b55910.R ######## i18n_path <- system.file("translations", package = "FreesearchR") @@ -49,6 +49,7 @@ library(shiny.i18n) ## Translation init i18n <- shiny.i18n::Translator$new(translation_csvs_path = i18n_path) +# i18n <- shiny.i18n::Translator$new(translation_csvs_path = here::here("inst/translations/")) i18n$set_translation_language("en") @@ -62,7 +63,7 @@ i18n$set_translation_language("en") #### Current file: /Users/au301842/FreesearchR/R//app_version.R ######## -app_version <- function()'25.12.2' +app_version <- function()'25.12.3' ######## @@ -856,8 +857,18 @@ make_choices_with_infos <- function(data) { #' @importFrom shiny selectizeInput #' @export #' -columnSelectInput <- function(inputId, label, data, selected = "", ..., - col_subset = NULL, placeholder = "", onInitialize, none_label="No variable selected",maxItems=NULL) { +columnSelectInput <- function( + inputId, + label, + data, + selected = "", + ..., + col_subset = NULL, + placeholder = "", + onInitialize, + none_label = "No variable selected", + maxItems = NULL +) { datar <- if (is.reactive(data)) data else reactive(data) col_subsetr <- if (is.reactive(col_subset)) col_subset else reactive(col_subset) @@ -877,8 +888,8 @@ columnSelectInput <- function(inputId, label, data, selected = "", ..., ) }, col = names(datar())) - if (!"none" %in% names(datar())){ - labels <- c("none"=list(sprintf('\n {\n \"name\": \"none\",\n \"label\": \"%s\",\n \"dataclass\": \"\",\n \"datatype\": \"\"\n }',none_label)),labels) + if (!"none" %in% names(datar())) { + labels <- c("none" = list(sprintf('\n {\n \"name\": \"none\",\n \"label\": \"%s\",\n \"dataclass\": \"\",\n \"datatype\": \"\"\n }', none_label)), labels) choices <- setNames(names(labels), labels) choices <- choices[match(if (length(col_subsetr()) == 0 || isTRUE(col_subsetr() == "")) names(datar()) else col_subsetr(), choices)] } else { @@ -922,7 +933,7 @@ columnSelectInput <- function(inputId, label, data, selected = "", ..., ''; } }")), - if (!is.null(maxItems)) list(maxItems=maxItems) + if (!is.null(maxItems)) list(maxItems = maxItems) ) ) } @@ -943,31 +954,31 @@ columnSelectInput <- function(inputId, label, data, selected = "", ..., #' #' @examples #' if (shiny::interactive()) { -#' shinyApp( -#' ui = fluidPage( -#' shiny::uiOutput("select"), -#' tableOutput("data") -#' ), -#' server = function(input, output) { -#' output$select <- shiny::renderUI({ -#' vectorSelectInput( -#' inputId = "variable", label = "Variable:", -#' data = c( -#' "Cylinders" = "cyl", -#' "Transmission" = "am", -#' "Gears" = "gear" +#' shinyApp( +#' ui = fluidPage( +#' shiny::uiOutput("select"), +#' tableOutput("data") +#' ), +#' server = function(input, output) { +#' output$select <- shiny::renderUI({ +#' vectorSelectInput( +#' inputId = "variable", label = "Variable:", +#' data = c( +#' "Cylinders" = "cyl", +#' "Transmission" = "am", +#' "Gears" = "gear" +#' ) #' ) -#' ) -#' }) +#' }) #' -#' output$data <- renderTable( -#' { -#' mtcars[, c("mpg", input$variable), drop = FALSE] -#' }, -#' rownames = TRUE -#' ) -#' } -#' ) +#' output$data <- renderTable( +#' { +#' mtcars[, c("mpg", input$variable), drop = FALSE] +#' }, +#' rownames = TRUE +#' ) +#' } +#' ) #' } vectorSelectInput <- function(inputId, label, @@ -1022,8 +1033,6 @@ vectorSelectInput <- function(inputId, } - - ######## #### Current file: /Users/au301842/FreesearchR/R//cut_var.R ######## @@ -2662,7 +2671,7 @@ create_plot <- function(data, type, pri, sec, ter = NULL, ...) { out } -#' Print label, and if missing print variable name +#' Print label, and if missing print variable name for plots #' #' @param data vector or data frame #' @param var variable name. Optional. @@ -4429,7 +4438,7 @@ data_types <- function() { #### Current file: /Users/au301842/FreesearchR/R//hosted_version.R ######## -hosted_version <- function()'v25.12.2-251203' +hosted_version <- function()'v25.12.3-251211' ######## @@ -5521,18 +5530,46 @@ launch_FreesearchR <- function(...){ #' Data correlations evaluation module #' #' @param id Module id +#' @param ... additional UI elements to show before the table overview #' #' @name data-missings #' @returns Shiny ui module #' @export -data_missings_ui <- function(id) { +data_missings_ui <- function(id, ...) { ns <- shiny::NS(id) - shiny::tagList( - gt::gt_output(outputId = ns("missings_table")) + list( + bslib::layout_sidebar( + sidebar = bslib::sidebar( + bslib::accordion( + id = ns("acc_mis"), + open = "acc_chars", + multiple = FALSE, + bslib::accordion_panel( + value = "acc_pan_mis", + title = "Settings", + icon = bsicons::bs_icon("x-circle"), + shiny::uiOutput(ns("missings_method")), + shiny::uiOutput(ns("missings_var")), + shiny::helpText(i18n$t("Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random.")), + shiny::br(), + shiny::actionButton( + inputId = ns("act_miss"), + label = i18n$t("Evaluate"), + width = "100%", + icon = shiny::icon("calculator"), + disabled = FALSE + ) + ) + ) + ), + ..., + gt::gt_output(outputId = ns("missings_table")) + ) ) } +## This should really just be rebuild to only contain a function #' #' @param data data @@ -5543,108 +5580,200 @@ data_missings_ui <- function(id) { #' @export data_missings_server <- function(id, data, - variable, - max_level=20, + max_level = 20, ...) { shiny::moduleServer( id = id, module = function(input, output, session) { - # ns <- session$ns + ns <- session$ns datar <- if (is.reactive(data)) data else reactive(data) - variabler <- if (is.reactive(variable)) variable else reactive(variable) rv <- shiny::reactiveValues( data = NULL, table = NULL ) - rv$data <- shiny::reactive({ - df_tbl <- datar() - by_var <- variabler() + ## Notes + ## + ## Code export is still missing + ## Direct table export would be nice - tryCatch( - { - out <- compare_missings(df_tbl,by_var,max_level = max_level) - }, - error = function(err) { - showNotification(paste0("Error: ", err), type = "err") - } - ) + shiny::observe( + output$missings_method <- shiny::renderUI({ + shiny::req(data()) + vectorSelectInput( + inputId = ns("missings_method"), + label = i18n$t("Analysis method for missingness overview"), + choices = setNames( + c( + "predictors", + "outcome" + ), + c( + i18n$t("Overview of missings across variables"), + i18n$t("Overview of difference in variables by missing status in outcome") + ) + ) + ) + }) + ) - out - }) - - output$missings_table <- gt::render_gt({ - shiny::req(datar) - shiny::req(variabler) - - if (is.null(variabler()) || variabler() == "" || !variabler() %in% names(datar())) { - tbl <- rv$data() - if (anyNA(datar())){ - title <- i18n$t("No variable chosen for analysis") + shiny::observe({ + output$missings_var <- shiny::renderUI({ + shiny::req(datar()) + shiny::req(input$missings_method) + # browser() + if (input$missings_method == "predictors") { + label <- i18n$t("Select a variable for grouped overview") + df <- data_type_filter(data(), type = c("categorical", "dichotomous")) + col_subset <- c("none", names(df)) } else { - title <- i18n$t("No missing observations") + label <- i18n$t("Select outcome variable for overview") + df <- datar()[apply(datar(), 2, anyNA)] + col_subset <- names(df) } - } else { - tbl <- rv$data()|> - gtsummary::bold_p() - title <- glue::glue(i18n$t("Missing vs non-missing observations in the variable **'{variabler()}'**")) - } - - out <- tbl |> - gtsummary::as_gt() |> - gt::tab_header(title = gt::md(title)) - - rv$table <- out - - out + columnSelectInput( + inputId = ns("missings_var"), + label = label, + data = df, + col_subset = col_subset, + none_label = i18n$t("No variable") + ) + }) }) - return(reactive(rv$table)) + + shiny::observeEvent( + list(input$act_miss), + { + shiny::req(datar()) + shiny::req(input$missings_var) + # browser() + df_tbl <- datar() + by_var <- input$missings_var + + parameters <- list( + by_var = by_var, + max_level = max_level, + type = input$missings_method + ) + + tryCatch( + { + shiny::withProgress(message = i18n$t("Calculating. Hold tight for a moment.."), { + out <- do.call( + compare_missings, + modifyList(parameters, list(data = df_tbl)) + ) + }) + }, + error = function(err) { + showNotification(paste0("Error: ", err), type = "err") + } + ) + + if (is.null(input$missings_var) || input$missings_var == "" || !input$missings_var %in% names(datar()) || input$missings_var == "none") { + # if (is.null(variabler()) || variabler() == "" || !variabler() %in% names(data()) || variabler() == "none") { + # tbl <- rv$data() + if (anyNA(datar())) { + if (input$missings_method == "predictors") { + title <- i18n$t("Overview of missing observations") + } else { + title <- i18n$t("No outcome measure chosen") + } + } else { + title <- i18n$t("No missing observations") + } + } else { + ## Due to reactivity, the table updates too quickly. this mitigates that issue.. + + + if (input$missings_var == "predictors") { + title <- glue::glue(i18n$t("Missings across variables by the variable **'{input$missings_var}'**")) + } else { + title <- glue::glue(i18n$t("Missing vs non-missing observations in the variable **'{input$missings_var}'**")) + } + } + + attr(out, "tbl_title") <- title + + rv$data <- shiny::reactive(out) + } + ) + + shiny::observeEvent( + list( + # input$act_miss + rv$data + ), + { + output$missings_table <- gt::render_gt({ + shiny::req(rv$data) + # shiny::req(input$missings_var) + # browser() + if ("p.value" %in% names(rv$data()[["table_body"]])) { + tbl <- rv$data() |> + gtsummary::bold_p() + } else { + tbl <- rv$data() + } + + + out <- tbl |> + gtsummary::as_gt() |> + gt::tab_header(title = gt::md(attr(tbl, "tbl_title"))) + + attr(out, "strat_var") <- input$missings_var + + rv$table <- out + + out + }) + } + ) + + return(shiny::reactive(rv$table)) } ) } missing_demo_app <- function() { - ui <- shiny::fluidPage( - shiny::actionButton( - inputId = "modal_missings", - label = "Browse data", - width = "100%", - disabled = FALSE - ), - shiny::selectInput( - inputId = "missings_var", - label = "Select variable to stratify analysis", choices = c("cyl", "vs") - ), - data_missings_ui("data") + ui <- do.call( + bslib::page, + c( + list( + title = i18n$t("Missings"), + icon = bsicons::bs_icon("x-circle") + ), + data_missings_ui(id = "data") + ) ) server <- function(input, output, session) { data_demo <- mtcars data_demo[sample(1:32, 10), "cyl"] <- NA data_demo[sample(1:32, 8), "vs"] <- NA - data_missings_server(id = "data", data = data_demo, variable = shiny::reactive(input$missings_var)) + data_missings_server(id = "data", data = data_demo) - visual_summary_server(id = "visual", data = data_demo) + # visual_summary_server(id = "visual", data = data_demo) - observeEvent(input$modal_missings, { - tryCatch( - { - modal_visual_summary(id = "visual") - }, - error = function(err) { - showNotification(paste0("We encountered the following error browsing your data: ", err), type = "err") - } - ) - }) + # observeEvent(input$modal_missings, { + # tryCatch( + # { + # modal_visual_summary(id = "visual") + # }, + # error = function(err) { + # showNotification(paste0("We encountered the following error browsing your data: ", err), type = "err") + # } + # ) + # }) } shiny::shinyApp(ui, server) } -missing_demo_app() +# missing_demo_app() #' Pairwise comparison of missings across covariables #' @@ -5654,28 +5783,80 @@ missing_demo_app() #' @returns gtsummary list object #' @export #' -compare_missings <- function(data,by_var,max_level=20){ +compare_missings <- function( + data, + by_var, + max_level = 20, + type = c("predictors", "outcome") +) { + type <- match.arg(type) + if (!is.null(by_var) && by_var != "" && by_var %in% names(data)) { data <- data |> lapply(\(.x){ - # browser() - if (is.factor(.x)){ - cut_var(.x,breaks=20,type="top") + if (is.factor(.x)) { + cut_var(.x, breaks = 20, type = "top") } else { .x } - }) |> dplyr::bind_cols() + }) |> + dplyr::bind_cols() - data[[by_var]] <- ifelse(is.na(data[[by_var]]), "Missing", "Non-missing") + if (type == "predictors") { + data <- missings_logic_across(data, exclude = by_var) + } else { + data[[by_var]] <- ifelse(is.na(data[[by_var]]), "Missing", "Non-missing") + } out <- gtsummary::tbl_summary(data, by = by_var) |> gtsummary::add_p() } else { + if (type == "predictors") { + data <- missings_logic_across(data) + } + out <- gtsummary::tbl_summary(data) } + out } +#' Converting all variables to logicals by missing status +#' +#' @param data data +#' @param exclude character vector of variable names to be excluded +#' +#' @returns data frame +#' @export +#' +#' @examples +#' mtcars |> missings_logic_across("cyl") +#' ## gtsummary::trial |> +#' ## missings_logic_across() |> +#' ## gtsummary::tbl_summary() +missings_logic_across <- function(data, exclude = NULL) { + # This function includes a approach way to preserve variable labels + names(data) |> + lapply(\(.x){ + # browser() + # Saving original labels + lab <- REDCapCAST::get_attr(data[[.x]], attr = "label") + if (!.x %in% exclude) { + out <- is.na(data[[.x]]) + } else { + out <- data[[.x]] + } + if (!is.na(lab)) { + # Restoring original labels, if not NA + REDCapCAST::set_attr(data = out, label = lab, attr = "label", overwrite = TRUE) + } else { + out + } + }) |> + dplyr::bind_cols(.name_repair = "unique_quiet") |> + setNames(names(data)) +} + ######## #### Current file: /Users/au301842/FreesearchR/R//plot_bar.R @@ -10156,26 +10337,15 @@ ui_elements <- function(selection) { data_correlations_ui(id = "correlations", height = 600) ) ), - bslib::nav_panel( - title = i18n$t("Missings"), - icon = bsicons::bs_icon("x-circle"), - bslib::layout_sidebar( - sidebar = bslib::sidebar( - bslib::accordion( - id = "acc_mis", - open = "acc_chars", - multiple = FALSE, - bslib::accordion_panel( - value = "acc_pan_mis", - title = "Settings", - icon = bsicons::bs_icon("x-circle"), - shiny::uiOutput("missings_var"), - shiny::helpText(i18n$t("To consider if data is missing by random, choose the outcome/dependent variable (only variables with any missings are available). If there is a significant difference across other variables depending on missing observations, it may not be missing at random.")) - ) - ) + do.call( + bslib::nav_panel, + c( + list( + title = i18n$t("Missings"), + icon = bsicons::bs_icon("x-circle") ), - validation_ui("validation_mcar"), - data_missings_ui(id = "missingness") + data_missings_ui(id = "missingness", + validation_ui("validation_mcar")) ) ) ), @@ -11438,7 +11608,7 @@ convert_to <- function(data, #' Get variable(s) to convert #' -#' @param vars Output of [summary_vars()] +#' @param vars variables, output from summary_vars() function #' @param classes_input List of inputs containing new classes #' #' @return a `data.table`. @@ -11671,6 +11841,9 @@ validation_server <- function(id, purrr::list_flatten() } else if (length(to_validate) > 0) { out <- make_validation_alerts(to_validate) + } else { + ## Defaulting to an emptu output vector + out <- character() } valid_ui$x <- tagList(out) } @@ -11894,7 +12067,7 @@ validation_lib <- function(name = NULL) { "mcar" = function(x, y) { ### Placeholder for missingness validation list( - string = i18n$t("There is a significant correlation between {n_nonmcar} variables and missing observations in the outcome variable {outcome}."), + string = i18n$t("There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}."), summary.fun = mcar_validate, summary.fun.args = list( data = x, @@ -12923,6 +13096,7 @@ server <- function(input, output, session) { shiny::updateActionButton(inputId = "modal_browse", disabled = TRUE) shiny::updateActionButton(inputId = "modal_visual_overview", disabled = TRUE) shiny::updateActionButton(inputId = "act_eval", disabled = TRUE) + # shiny::updateActionButton(inputId = "act_miss", disabled = TRUE) # bslib::nav_hide(id = "main_panel", # target = "nav_visuals") @@ -12931,6 +13105,7 @@ server <- function(input, output, session) { shiny::updateActionButton(inputId = "modal_browse", disabled = FALSE) shiny::updateActionButton(inputId = "modal_visual_overview", disabled = FALSE) shiny::updateActionButton(inputId = "act_eval", disabled = FALSE) + # shiny::updateActionButton(inputId = "act_miss", disabled = FALSE) # bslib::nav_show(id = "main_panel", # target = "nav_visuals") @@ -12946,7 +13121,6 @@ server <- function(input, output, session) { }) - ############################################################################## ######### ######### Data modification section @@ -13185,12 +13359,13 @@ server <- function(input, output, session) { # mcar_validate(data=rv$missings()[["_data"]],outcome = input$missings_var) if (!is.null(rv$missings())) { req(rv$missings()) - req(input$missings_var) + # req(input$missings_var) + # browser() rv_validations$mcar <- make_validation( ls = validation_lib("mcar"), list( x = rv$missings()[["_data"]], - y = input$missings_var + y = attr(rv$missings(), "strat_var") ) ) } @@ -13523,8 +13698,6 @@ server <- function(input, output, session) { # }) - - shiny::observeEvent( list( input$act_eval @@ -13536,7 +13709,6 @@ server <- function(input, output, session) { shiny::req(rv$list$data) - parameters <- list( by.var = input$strat_var, add.p = input$add_p == "yes", @@ -13617,25 +13789,16 @@ server <- function(input, output, session) { cutoff = shiny::reactive(input$cor_cutoff) ) - shiny::observe( - output$missings_var <- shiny::renderUI({ - columnSelectInput( - inputId = "missings_var", - label = i18n$t("Select variable to stratify analysis"), - data = shiny::reactive({ - shiny::req(rv$data_filtered) - rv$data_filtered[apply(rv$data_filtered, 2, anyNA)] - })() - ) - }) - ) + ## Missingness evaluation + rv$missings <- data_missings_server( id = "missingness", - data = shiny::reactive(rv$data_filtered), - variable = shiny::reactive(input$missings_var) + data = shiny::reactive(rv$data_filtered) ) + + # shiny::observe({ # req(rv$missings()) # browser() diff --git a/inst/apps/FreesearchR/www/scripts.js b/inst/apps/FreesearchR/www/scripts.js index 6330bf0b..b7145a7e 100644 --- a/inst/apps/FreesearchR/www/scripts.js +++ b/inst/apps/FreesearchR/www/scripts.js @@ -91,3 +91,12 @@ $(document).on('focus', '.smart-dropdown .selectize-control input', function() { } }); +// window.addEventListener('beforeunload', function (e) { +// // Cancel the event +// e.preventDefault(); +// // Chrome requires returnValue to be set +// e.returnValue = ''; +// // Some browsers display this message, others show a generic one +// return 'Are you sure you want to leave? Any unsaved changes will be lost.'; +// }); + diff --git a/inst/assets/js/FreesearchR.js b/inst/assets/js/FreesearchR.js index 6330bf0b..b7145a7e 100644 --- a/inst/assets/js/FreesearchR.js +++ b/inst/assets/js/FreesearchR.js @@ -91,3 +91,12 @@ $(document).on('focus', '.smart-dropdown .selectize-control input', function() { } }); +// window.addEventListener('beforeunload', function (e) { +// // Cancel the event +// e.preventDefault(); +// // Chrome requires returnValue to be set +// e.returnValue = ''; +// // Some browsers display this message, others show a generic one +// return 'Are you sure you want to leave? Any unsaved changes will be lost.'; +// }); + diff --git a/inst/translations/translation_da.csv b/inst/translations/translation_da.csv index aae55287..6eff561d 100644 --- a/inst/translations/translation_da.csv +++ b/inst/translations/translation_da.csv @@ -150,7 +150,6 @@ "Settings","Indstillinger" "The following error occured on determining correlations:","Følgende fejl opstod i forbindelse med korrelationsanalysen:" "We encountered the following error creating your report:","Følgende fejl opstod, da rapporten blev dannet:" -"No variable chosen for analysis","Ingen variabel er valgt til analysen" "No missing observations","Ingen manglende observationer" "There is a total of {p_miss} % missing observations.","Der er i alt {p_miss} % manglende observationer." "Median:","Median:" @@ -244,7 +243,6 @@ "Data characteristics table","Oversigtstabel" "The dataset without text variables","Datasættet uden variabler formateret som tekst" "Creating the table. Hold on for a moment..","Opretter tabellen. Vent et øjeblik.." -"Select variable to stratify analysis","Vælg variabler til at stratificere analysen" "Generating the report. Hold on for a moment..","Opretter rapporten. Vent et øjeblik.." "We encountered the following error showing missingness:","Under analysen af manglende observationer opstod følgende fejl:" "We encountered the following error browsing your data:","I forsøget på at vise en dataoversigt opstod følgende fejl:" @@ -296,11 +294,15 @@ "Words","Words" "Shorten to first letters","Shorten to first letters" "Shorten to first words","Shorten to first words" -"Select missings analysis to apply","Select missings analysis to apply" -"Variables","Variables" -"By outcome","By outcome" "Missings across variables by the variable **'{input$missings_var}'**","Missings across variables by the variable **'{input$missings_var}'**" "Missing vs non-missing observations in the variable **'{input$missings_var}'**","Missing vs non-missing observations in the variable **'{input$missings_var}'**" "Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random.","Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random." "Calculating. Hold tight for a moment..","Calculating. Hold tight for a moment.." -"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nnonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nnonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." +"Overview of missing observations","Overview of missing observations" +"Analysis method for missingness overview","Analysis method for missingness overview" +"Overview of missings across variables","Overview of missings across variables" +"Overview of difference in variables by missing status in outcome","Overview of difference in variables by missing status in outcome" +"Select a variable for grouped overview","Select a variable for grouped overview" +"Select outcome variable for overview","Select outcome variable for overview" +"No outcome measure chosen","No outcome measure chosen" +"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." diff --git a/inst/translations/translation_de.csv b/inst/translations/translation_de.csv index 12431760..9bdb216e 100644 --- a/inst/translations/translation_de.csv +++ b/inst/translations/translation_de.csv @@ -103,7 +103,6 @@ "You can choose between these file types:","You can choose between these file types:" "You can import {file_extensions_text} files","You can import {file_extensions_text} files" "First five rows are shown below:","First five rows are shown below:" -"No variable chosen for analysis","No variable chosen for analysis" "No missing observations","No missing observations" "Grouped by {get_label(data,ter)}","Grouped by {get_label(data,ter)}" "Import data from REDCap","Import data from REDCap" @@ -264,7 +263,6 @@ "The dataset without text variables","The dataset without text variables" "The data includes {n_col} variables. Please limit to 100.","The data includes {n_col} variables. Please limit to 100." "Creating the table. Hold on for a moment..","Creating the table. Hold on for a moment.." -"Select variable to stratify analysis","Select variable to stratify analysis" "Generating the report. Hold on for a moment..","Generating the report. Hold on for a moment.." "We encountered the following error creating your report:","We encountered the following error creating your report:" "There are more advanced options to modify factor/categorical variables as well as create new factor from an existing variable or new variables with R code. At the bottom you can restore the original data.","There are more advanced options to modify factor/categorical variables as well as create new factor from an existing variable or new variables with R code. At the bottom you can restore the original data." @@ -296,11 +294,15 @@ "Words","Words" "Shorten to first letters","Shorten to first letters" "Shorten to first words","Shorten to first words" -"Select missings analysis to apply","Select missings analysis to apply" -"Variables","Variables" -"By outcome","By outcome" "Missings across variables by the variable **'{input$missings_var}'**","Missings across variables by the variable **'{input$missings_var}'**" "Missing vs non-missing observations in the variable **'{input$missings_var}'**","Missing vs non-missing observations in the variable **'{input$missings_var}'**" "Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random.","Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random." "Calculating. Hold tight for a moment..","Calculating. Hold tight for a moment.." -"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nnonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nnonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." +"Overview of missing observations","Overview of missing observations" +"Analysis method for missingness overview","Analysis method for missingness overview" +"Overview of missings across variables","Overview of missings across variables" +"Overview of difference in variables by missing status in outcome","Overview of difference in variables by missing status in outcome" +"Select a variable for grouped overview","Select a variable for grouped overview" +"Select outcome variable for overview","Select outcome variable for overview" +"No outcome measure chosen","No outcome measure chosen" +"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." diff --git a/inst/translations/translation_sv.csv b/inst/translations/translation_sv.csv index 5c4d36b7..4383f3b4 100644 --- a/inst/translations/translation_sv.csv +++ b/inst/translations/translation_sv.csv @@ -103,7 +103,6 @@ "You can choose between these file types:","You can choose between these file types:" "You can import {file_extensions_text} files","You can import {file_extensions_text} files" "First five rows are shown below:","First five rows are shown below:" -"No variable chosen for analysis","No variable chosen for analysis" "No missing observations","No missing observations" "Grouped by {get_label(data,ter)}","Grouped by {get_label(data,ter)}" "Import data from REDCap","Import data from REDCap" @@ -264,7 +263,6 @@ "The dataset without text variables","The dataset without text variables" "The data includes {n_col} variables. Please limit to 100.","The data includes {n_col} variables. Please limit to 100." "Creating the table. Hold on for a moment..","Creating the table. Hold on for a moment.." -"Select variable to stratify analysis","Select variable to stratify analysis" "Generating the report. Hold on for a moment..","Generating the report. Hold on for a moment.." "We encountered the following error creating your report:","We encountered the following error creating your report:" "There are more advanced options to modify factor/categorical variables as well as create new factor from an existing variable or new variables with R code. At the bottom you can restore the original data.","There are more advanced options to modify factor/categorical variables as well as create new factor from an existing variable or new variables with R code. At the bottom you can restore the original data." @@ -296,11 +294,15 @@ "Words","Words" "Shorten to first letters","Shorten to first letters" "Shorten to first words","Shorten to first words" -"Select missings analysis to apply","Select missings analysis to apply" -"Variables","Variables" -"By outcome","By outcome" "Missings across variables by the variable **'{input$missings_var}'**","Missings across variables by the variable **'{input$missings_var}'**" "Missing vs non-missing observations in the variable **'{input$missings_var}'**","Missing vs non-missing observations in the variable **'{input$missings_var}'**" "Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random.","Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random." "Calculating. Hold tight for a moment..","Calculating. Hold tight for a moment.." -"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nnonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nnonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." +"Overview of missing observations","Overview of missing observations" +"Analysis method for missingness overview","Analysis method for missingness overview" +"Overview of missings across variables","Overview of missings across variables" +"Overview of difference in variables by missing status in outcome","Overview of difference in variables by missing status in outcome" +"Select a variable for grouped overview","Select a variable for grouped overview" +"Select outcome variable for overview","Select outcome variable for overview" +"No outcome measure chosen","No outcome measure chosen" +"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." diff --git a/inst/translations/translation_sw.csv b/inst/translations/translation_sw.csv index 35e3be45..227ce09e 100644 --- a/inst/translations/translation_sw.csv +++ b/inst/translations/translation_sw.csv @@ -150,7 +150,6 @@ "Settings","Settings" "The following error occured on determining correlations:","The following error occured on determining correlations:" "We encountered the following error creating your report:","We encountered the following error creating your report:" -"No variable chosen for analysis","No variable chosen for analysis" "No missing observations","No missing observations" "There is a total of {p_miss} % missing observations.","There is a total of {p_miss} % missing observations." "Median:","Median:" @@ -244,7 +243,6 @@ "Data characteristics table","Data characteristics table" "The dataset without text variables","The dataset without text variables" "Creating the table. Hold on for a moment..","Creating the table. Hold on for a moment.." -"Select variable to stratify analysis","Select variable to stratify analysis" "Generating the report. Hold on for a moment..","Generating the report. Hold on for a moment.." "We encountered the following error showing missingness:","We encountered the following error showing missingness:" "We encountered the following error browsing your data:","We encountered the following error browsing your data:" @@ -296,11 +294,15 @@ "Words","Words" "Shorten to first letters","Shorten to first letters" "Shorten to first words","Shorten to first words" -"Select missings analysis to apply","Select missings analysis to apply" -"Variables","Variables" -"By outcome","By outcome" "Missings across variables by the variable **'{input$missings_var}'**","Missings across variables by the variable **'{input$missings_var}'**" "Missing vs non-missing observations in the variable **'{input$missings_var}'**","Missing vs non-missing observations in the variable **'{input$missings_var}'**" "Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random.","Evaluate missingness by either comparing missing values across variables (optionally grouped by af categorical or dichotomous variable) or compare variables grouped by the missing status (missing or not) of an outcome variable. If there is a significant difference i the missingness, this may cause a bias in you data and should be considered carefully interpreting the data and analyses as data may not be missing at random." "Calculating. Hold tight for a moment..","Calculating. Hold tight for a moment.." -"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nnonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nnonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." +"Overview of missing observations","Overview of missing observations" +"Analysis method for missingness overview","Analysis method for missingness overview" +"Overview of missings across variables","Overview of missings across variables" +"Overview of difference in variables by missing status in outcome","Overview of difference in variables by missing status in outcome" +"Select a variable for grouped overview","Select a variable for grouped overview" +"Select outcome variable for overview","Select outcome variable for overview" +"No outcome measure chosen","No outcome measure chosen" +"There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}.","There is a significant difference in data missingness in {n_nonmcar} {ifelse(n_nonmcar==1,'variable','variables')} grouped by the selected outcome/grouping variable {outcome}." diff --git a/renv.lock b/renv.lock index 5291336b..22b9f3d9 100644 --- a/renv.lock +++ b/renv.lock @@ -9154,6 +9154,52 @@ "Maintainer": "Davis Vaughan ", "Repository": "CRAN" }, + "viridis": { + "Package": "viridis", + "Version": "0.6.5", + "Source": "Repository", + "Type": "Package", + "Title": "Colorblind-Friendly Color Maps for R", + "Date": "2024-01-28", + "Authors@R": "c( person(\"Simon\", \"Garnier\", email = \"garnier@njit.edu\", role = c(\"aut\", \"cre\")), person(\"Noam\", \"Ross\", email = \"noam.ross@gmail.com\", role = c(\"ctb\", \"cph\")), person(\"Bob\", \"Rudis\", email = \"bob@rud.is\", role = c(\"ctb\", \"cph\")), person(\"Marco\", \"Sciaini\", email = \"sciaini.marco@gmail.com\", role = c(\"ctb\", \"cph\")), person(\"Antônio Pedro\", \"Camargo\", role = c(\"ctb\", \"cph\")), person(\"Cédric\", \"Scherer\", email = \"scherer@izw-berlin.de\", role = c(\"ctb\", \"cph\")) )", + "Maintainer": "Simon Garnier ", + "Description": "Color maps designed to improve graph readability for readers with common forms of color blindness and/or color vision deficiency. The color maps are also perceptually-uniform, both in regular form and also when converted to black-and-white for printing. This package also contains 'ggplot2' bindings for discrete and continuous color and fill scales. A lean version of the package called 'viridisLite' that does not include the 'ggplot2' bindings can be found at .", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "Depends": [ + "R (>= 2.10)", + "viridisLite (>= 0.4.0)" + ], + "Imports": [ + "ggplot2 (>= 1.0.1)", + "gridExtra" + ], + "Suggests": [ + "hexbin (>= 1.27.0)", + "scales", + "MASS", + "knitr", + "dichromat", + "colorspace", + "httr", + "mapproj", + "vdiffr", + "svglite (>= 1.2.0)", + "testthat", + "covr", + "rmarkdown", + "maps", + "terra" + ], + "LazyData": "true", + "VignetteBuilder": "knitr", + "URL": "https://sjmgarnier.github.io/viridis/, https://github.com/sjmgarnier/viridis/", + "BugReports": "https://github.com/sjmgarnier/viridis/issues", + "RoxygenNote": "7.3.1", + "NeedsCompilation": "no", + "Author": "Simon Garnier [aut, cre], Noam Ross [ctb, cph], Bob Rudis [ctb, cph], Marco Sciaini [ctb, cph], Antônio Pedro Camargo [ctb, cph], Cédric Scherer [ctb, cph]", + "Repository": "CRAN" + }, "viridisLite": { "Package": "viridisLite", "Version": "0.4.2",